repo_name
stringlengths 9
74
| language
stringclasses 1
value | length_bytes
int64 11
9.34M
| extension
stringclasses 2
values | content
stringlengths 11
9.34M
|
---|---|---|---|---|
AdaCore/libadalang | Ada | 250 | adb | procedure Test is
generic
type T is private;
type U is private;
package Pkg is
end Pkg;
generic
with package P_Inst is new Pkg (Integer, <>);
package Foo is
end Foo;
pragma Test_Block;
begin
null;
end Test;
|
zhmu/ananas | Ada | 3,250 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- G N A T . O S _ L I B --
-- --
-- S p e c --
-- --
-- Copyright (C) 1995-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. --
-- --
------------------------------------------------------------------------------
-- Operating system interface facilities
-- This package contains types and procedures for interfacing to the
-- underlying OS. It is used by the GNAT compiler and by tools associated
-- with the GNAT compiler, and therefore works for the various operating
-- systems to which GNAT has been ported. This package will undoubtedly grow
-- as new services are needed by various tools.
-- This package tends to use fairly low-level Ada in order to not bring in
-- large portions of the RTL. For example, functions return access to string
-- as part of avoiding functions returning unconstrained types.
-- Except where specifically noted, these routines are portable across all
-- GNAT implementations on all supported operating systems.
-- See file s-os_lib.ads for full documentation of the interface
with System.OS_Lib;
package GNAT.OS_Lib renames System.OS_Lib;
|
SayCV/rtems-addon-packages | Ada | 4,078 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding --
-- --
-- Terminal_Interface.Curses.Text_IO.Enumeration_IO --
-- --
-- B O D Y --
-- --
------------------------------------------------------------------------------
-- Copyright (c) 1998-2003,2009 Free Software Foundation, Inc. --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining a --
-- copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, distribute with modifications, sublicense, and/or sell --
-- copies of the Software, and to permit persons to whom the Software is --
-- furnished to do so, subject to the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be included --
-- in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS --
-- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, --
-- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR --
-- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR --
-- THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
-- --
-- Except as contained in this notice, the name(s) of the above copyright --
-- holders shall not be used in advertising or otherwise to promote the --
-- sale, use or other dealings in this Software without prior written --
-- authorization. --
------------------------------------------------------------------------------
-- Author: Juergen Pfeifer, 1996
-- Version Control:
-- $Revision$
-- Binding Version 01.00
------------------------------------------------------------------------------
with Ada.Text_IO;
with Ada.Characters.Handling; use Ada.Characters.Handling;
with Terminal_Interface.Curses.Text_IO.Aux;
package body Terminal_Interface.Curses.Text_IO.Enumeration_IO is
package Aux renames Terminal_Interface.Curses.Text_IO.Aux;
package EIO is new Ada.Text_IO.Enumeration_IO (Enum);
procedure Put
(Win : Window;
Item : Enum;
Width : Field := Default_Width;
Set : Type_Set := Default_Setting)
is
Buf : String (1 .. Field'Last);
Tset : Ada.Text_IO.Type_Set;
begin
if Set /= Mixed_Case then
Tset := Ada.Text_IO.Type_Set'Val (Type_Set'Pos (Set));
else
Tset := Ada.Text_IO.Lower_Case;
end if;
EIO.Put (Buf, Item, Tset);
if Set = Mixed_Case then
Buf (Buf'First) := To_Upper (Buf (Buf'First));
end if;
Aux.Put_Buf (Win, Buf, Width, True, True);
end Put;
procedure Put
(Item : Enum;
Width : Field := Default_Width;
Set : Type_Set := Default_Setting)
is
begin
Put (Get_Window, Item, Width, Set);
end Put;
end Terminal_Interface.Curses.Text_IO.Enumeration_IO;
|
mitchelhaan/ncurses | Ada | 4,055 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding --
-- --
-- Terminal_Interface.Curses.Forms.Field_Types.RegExp --
-- --
-- B O D Y --
-- --
------------------------------------------------------------------------------
-- Copyright (c) 1998 Free Software Foundation, Inc. --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining a --
-- copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, distribute with modifications, sublicense, and/or sell --
-- copies of the Software, and to permit persons to whom the Software is --
-- furnished to do so, subject to the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be included --
-- in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS --
-- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, --
-- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR --
-- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR --
-- THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
-- --
-- Except as contained in this notice, the name(s) of the above copyright --
-- holders shall not be used in advertising or otherwise to promote the --
-- sale, use or other dealings in this Software without prior written --
-- authorization. --
------------------------------------------------------------------------------
-- Author: Juergen Pfeifer <[email protected]> 1996
-- Version Control:
-- $Revision: 1.3 $
-- Binding Version 00.93
------------------------------------------------------------------------------
with Interfaces.C; use Interfaces.C;
with Terminal_Interface.Curses.Aux; use Terminal_Interface.Curses.Aux;
package body Terminal_Interface.Curses.Forms.Field_Types.RegExp is
procedure Set_Field_Type (Fld : in Field;
Typ : in Regular_Expression_Field)
is
type Char_Ptr is access all Interfaces.C.Char;
C_Regexp_Field_Type : C_Field_Type;
pragma Import (C, C_Regexp_Field_Type, "TYPE_REGEXP");
function Set_Ftyp (F : Field := Fld;
Cft : C_Field_Type := C_Regexp_Field_Type;
Arg1 : Char_Ptr) return C_Int;
pragma Import (C, Set_Ftyp, "set_field_type");
Txt : char_array (0 .. Typ.Regular_Expression.all'Length);
Len : size_t;
Res : Eti_Error;
begin
To_C (Typ.Regular_Expression.all, Txt, Len);
Res := Set_Ftyp (Arg1 => Txt (Txt'First)'Access);
if Res /= E_Ok then
Eti_Exception (Res);
end if;
Wrap_Builtin (Fld, Typ);
end Set_Field_Type;
end Terminal_Interface.Curses.Forms.Field_Types.RegExp;
|
reznikmm/matreshka | Ada | 4,163 | 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_Font_Independent_Line_Spacing_Attributes;
package Matreshka.ODF_Style.Font_Independent_Line_Spacing_Attributes is
type Style_Font_Independent_Line_Spacing_Attribute_Node is
new Matreshka.ODF_Style.Abstract_Style_Attribute_Node
and ODF.DOM.Style_Font_Independent_Line_Spacing_Attributes.ODF_Style_Font_Independent_Line_Spacing_Attribute
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Style_Font_Independent_Line_Spacing_Attribute_Node;
overriding function Get_Local_Name
(Self : not null access constant Style_Font_Independent_Line_Spacing_Attribute_Node)
return League.Strings.Universal_String;
end Matreshka.ODF_Style.Font_Independent_Line_Spacing_Attributes;
|
sungyeon/drake | Ada | 36 | ads | ../machine-apple-darwin/s-termin.ads |
stcarrez/ada-keystore | Ada | 2,044 | ads | -----------------------------------------------------------------------
-- akt-commands-edit -- Edit content in keystore
-- 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 AKT.Commands.Drivers;
private package AKT.Commands.Edit is
type Command_Type is new AKT.Commands.Drivers.Command_Type with private;
-- Get the editor command to launch.
function Get_Editor (Command : in Command_Type) return String;
-- Get the directory where the editor's file can be created.
function Get_Directory (Command : in Command_Type;
Context : in out Context_Type) return String;
-- Edit a value from the keystore by using an external editor.
overriding
procedure Execute (Command : in out Command_Type;
Name : in String;
Args : in Argument_List'Class;
Context : in out Context_Type);
-- Setup the command before parsing the arguments and executing it.
overriding
procedure Setup (Command : in out Command_Type;
Config : in out GNAT.Command_Line.Command_Line_Configuration;
Context : in out Context_Type);
private
type Command_Type is new AKT.Commands.Drivers.Command_Type with record
Editor : aliased GNAT.Strings.String_Access;
end record;
end AKT.Commands.Edit;
|
reznikmm/matreshka | Ada | 4,687 | 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.Stay_On_Top_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Presentation_Stay_On_Top_Attribute_Node is
begin
return Self : Presentation_Stay_On_Top_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_Stay_On_Top_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Stay_On_Top_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Presentation_URI,
Matreshka.ODF_String_Constants.Stay_On_Top_Attribute,
Presentation_Stay_On_Top_Attribute_Node'Tag);
end Matreshka.ODF_Presentation.Stay_On_Top_Attributes;
|
faelys/natools | Ada | 221 | ads | -- Generated at 2014-11-09 20:46:38 +0000 by Natools.Static_Hash_Maps
-- from src/natools-static_hash_maps-s_expressions-hash_maps.sx
function Natools.Static_Hash_Maps.S_Expressions.Command_Maps.Test
return Boolean;
|
reznikmm/matreshka | Ada | 3,995 | 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.Xhtml_Property_Attributes;
package Matreshka.ODF_Xhtml.Property_Attributes is
type Xhtml_Property_Attribute_Node is
new Matreshka.ODF_Xhtml.Abstract_Xhtml_Attribute_Node
and ODF.DOM.Xhtml_Property_Attributes.ODF_Xhtml_Property_Attribute
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Xhtml_Property_Attribute_Node;
overriding function Get_Local_Name
(Self : not null access constant Xhtml_Property_Attribute_Node)
return League.Strings.Universal_String;
end Matreshka.ODF_Xhtml.Property_Attributes;
|
docandrew/troodon | Ada | 1,334 | ads | pragma Ada_2012;
pragma Style_Checks (Off);
with Interfaces.C; use Interfaces.C;
package bits_uintn_identity_h is
-- Inline functions to return unsigned integer values unchanged.
-- Copyright (C) 2017-2021 Free Software Foundation, Inc.
-- This file is part of the GNU C Library.
-- The GNU C Library is free software; you can redistribute it and/or
-- modify it under the terms of the GNU Lesser General Public
-- License as published by the Free Software Foundation; either
-- version 2.1 of the License, or (at your option) any later version.
-- The GNU C Library is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU
-- Lesser General Public License for more details.
-- You should have received a copy of the GNU Lesser General Public
-- License along with the GNU C Library; if not, see
-- <https://www.gnu.org/licenses/>.
-- These inline functions are to ensure the appropriate type
-- conversions and associated diagnostics from macros that convert to
-- a given endianness.
-- skipped func __uint16_identity
-- skipped func __uint32_identity
-- skipped func __uint64_identity
end bits_uintn_identity_h;
|
reznikmm/matreshka | Ada | 3,981 | 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_Style_Attributes;
package Matreshka.ODF_Number.Style_Attributes is
type Number_Style_Attribute_Node is
new Matreshka.ODF_Number.Abstract_Number_Attribute_Node
and ODF.DOM.Number_Style_Attributes.ODF_Number_Style_Attribute
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Number_Style_Attribute_Node;
overriding function Get_Local_Name
(Self : not null access constant Number_Style_Attribute_Node)
return League.Strings.Universal_String;
end Matreshka.ODF_Number.Style_Attributes;
|
jscparker/math_packages | Ada | 7,782 | ads |
---------------------------------------------------------------------------------
-- package Banded_LU, LU decomposition, equation solving for banded matrices
-- Copyright (C) 1995-2018 Jonathan S. Parker
--
-- Permission to use, copy, modify, and/or distribute this software for any
-- purpose with or without fee is hereby granted, provided that the above
-- copyright notice and this permission notice appear in all copies.
-- THE SOFTWARE IS PROVIDED "AS IS" AND THE AUTHOR DISCLAIMS ALL WARRANTIES
-- WITH REGARD TO THIS SOFTWARE INCLUDING ALL IMPLIED WARRANTIES OF
-- MERCHANTABILITY AND FITNESS. IN NO EVENT SHALL THE AUTHOR BE LIABLE FOR
-- ANY SPECIAL, DIRECT, INDIRECT, OR CONSEQUENTIAL DAMAGES OR ANY DAMAGES
-- WHATSOEVER RESULTING FROM LOSS OF USE, DATA OR PROFITS, WHETHER IN AN
-- ACTION OF CONTRACT, NEGLIGENCE OR OTHER TORTIOUS ACTION, ARISING OUT OF
-- OR IN CONNECTION WITH THE USE OR PERFORMANCE OF THIS SOFTWARE.
---------------------------------------------------------------------------------
-- PACKAGE Banded_LU
--
-- LU decomposition and linear equation solving for banded matrices.
-- Uses Crout's method for LU decomposition of real valued matrices.
-- There's no pivoting, so iterative refinement is provided.
-- Iterative refinement can improve accuracy of equation solving
-- in cases in which the matrices are not diagonally dominant.
--
-- The decomposition can be performed on diagonal sub-blocks of
-- the matrix. (The block size must be > bandwidwidth of the matrix
-- or Constraint_Error is raised.)
--
-- Diagonally dominant matrices are a special class that doesn't need
-- pivoting in LU decomposition. A matrix is diagonally dominant if and
-- only if the absolute val of each diagonal element is > or = the sum
-- of the absolute vals of each off-diagonal on the same row as that diagonal
-- element.
--
-- In many cases non diagonally-dominant matrices are successfully
-- handled by this package, but more error accumulates than would
-- be present if we could do pivoting.
-- Procedure Refine_Solution does Newton iterations to reduce the error
-- in these solutions. Examples are provided in the test procedure.
--
-- The banded matrix is constructed as an array of row vectors.
-- Typically, the length of the row is very much smaller than the number
-- of rows. For example, if the matrix is tri-diagonal, then each row vector
-- has only three element. The middle element is the central diagonal of the
-- matrix.
--
-- The LU form of A can then be used to solve simultaneous linear
-- equations of the form A X = B. The column vector B is input
-- into procedure Solve, and the solution is returned as X.
--
--
-- PROCEDURE LU_decompose
--
-- matrix A:
-- To correctly construct A remember that the 1st index identifies the
-- row of the matrix element. The 2nd index of A is
-- is the Diagonal_ID, which is 0 for the central diagonal, and
-- negative for the lower diagonals. Diagonal_ID - Col - Row.
--
-- Final_Index:
-- The routine operates on a subset of full matrix. The subset
-- matrix starts at Starting_Index, and ends at Final_Index.
-- The matrix to be decomposed is logically (M X M) where
-- M = Final_Index - Starting_Index + 1. It is assumed that all
-- off-diagonals beyond No_Of_Off_Diagonals are 0.0.
--
--
-- PROCEDURE Solve
--
-- Solves for X in the equation A X = B. The matrix A_LU is
-- LU of A. In other words L*U = A, L is stored in the lower triangular
-- regions of A_LU, and U in the upper. (The original matrix A was written
-- over with LU.) The output of LU_Decompose is in suitable form for "Solve".
--
--
-- BANDED MATRIX FORMAT
--
-- You translate (Row, Col) to (I, Diagonal_id)
-- using the formula: I = Row, and Diagonal_id = Col - Row.
--
-- The banded matrix looks like:
--
-- Matrix (Row)(Diagonal_id)
--
-- where Diagonal_id is in
--
-- type Diag_Index is range -No_Of_Off_Diagonals..No_Of_Off_Diagonals;
--
-- and the matrix element at (Row, Col) has Diagonal_id = Col - Row.
--
-- Here is matrix-vector multiplication:
--
-- for Row in Index loop
-- Sum := 0.0;
-- Start := Max(Diag_Index'First + Row, Index'First)
-- Finish := Min(Diag_Index'Last + Row, Index'Last)
-- for Col in Start..Finish loop
-- Sum := Sum + Matrix(Row)(Col - Row) * Vector(Col);
-- end loop;
-- Result(Row) = Sum;
-- end loop;
--
-- Notice the outer index varies fastest this way, as Ada prefers.
--
generic
type Real is digits <>;
Max_Size_Of_Matrix : Positive;
No_Of_Off_Diagonals : Positive;
-- If this is 1, then if the matrix is tri-diagonal. Must be less than
-- Max_Size_Of_Matrix. If it equals or excedes Max_Size_Of_Matrix, then
-- an assertion will detect failure. Notice 0 off_diagonals not allowed.
package Banded_LU is
pragma Assert (No_Of_Off_Diagonals < Max_Size_Of_Matrix);
-- Number of off-diagonals must be less than size of matrix.
subtype Index is Integer range 0..Max_Size_Of_Matrix-1;
subtype Diag_Index is Integer range
-No_Of_Off_Diagonals..No_Of_Off_Diagonals;
-- There's arithmetic between these 2 indices, so we make them both type
-- Integer. We also use fact that Diagonal_ID is symmetric about 0.
type Row_Vector is array(Diag_Index) of Real;
type Banded_Matrix is array(Index) of Row_Vector;
-- The (Row, Col) element of the matrix is found at Matrix(Row)(Col - Row).
type Column is array(Index) of Real;
-- A column vector.
procedure LU_Decompose
(A : in out Banded_Matrix;
Diag_Inverse : out Column;
Final_Index : in Index := Index'Last;
Starting_Index : in Index := Index'First);
procedure Solve
(X : out Column;
B : in Column;
A_LU : in Banded_Matrix;
Diag_Inverse : in Column;
Final_Index : in Index := Index'Last;
Starting_Index : in Index := Index'First);
-- Solves for X in A*X = B. A_LU is the LU decomp of A, as returned by
-- LU_Decompose in matrix A.
procedure Refine_Solution
(X : out Column;
B : in Column;
A_LU : in Banded_Matrix;
Diag_Inverse : in Column;
A : in Banded_Matrix;
No_Of_Iterations : in Natural := 1;
Final_Index : in Index := Index'Last;
Starting_Index : in Index := Index'First);
-- Attempts to improve the numerical quality of solution of the linear
-- equations by use of Newton iteration.
-- (No pivoting is done in this version.)
function Matrix_Val
(A : Banded_Matrix;
Row : Index;
Col : Index)
return Real;
-- Given (Row, Column) the function returns the matrix element at
-- that location. Translates (Row, Col) to (I, Diagonal_id) using
-- the formula I = Row, and Diagonal_id = Col - Row.
--
-- Banded Matrices are by definition 0 everywhere except on the diagonal
-- bands. So 0 is returned if (Row, Col) is not in the banded region.
function Product
(A : in Banded_Matrix;
X : in Column;
Final_Index : in Index := Index'Last;
Starting_Index : in Index := Index'First)
return Column;
-- Multiplies a banded matrix by a column vector X.
-- Operates only on the diagonal block bounded by
-- Starting_Row = Starting_Index, and Final_Row = Final_Index.
private
Zero : constant Real := +0.0;
One : constant Real := +1.0;
Two : constant Real := +2.0;
Min_Allowed_Real : constant Real := Two ** (Real'Machine_Emin/4 + 2);
end Banded_LU;
|
sungyeon/drake | Ada | 1,130 | ads | pragma License (Unrestricted);
-- overridable runtime unit specialized for Windows (i386)
package System.Unwind.Mapping is
pragma Preelaborate;
-- signal alt stack
type Signal_Stack_Type is private;
-- register signal handler (init.c/seh_init.c)
procedure Install_Exception_Handler (SEH : Address)
with Export, -- for weak linking
Convention => Ada,
External_Name => "__drake_install_exception_handler";
pragma No_Inline (Install_Exception_Handler);
procedure Install_Task_Exception_Handler (
SEH : Address;
Signal_Stack : not null access Signal_Stack_Type)
with Export,
Convention => Ada,
External_Name => "__drake_install_task_exception_handler";
pragma No_Inline (Install_Task_Exception_Handler);
procedure Reinstall_Exception_Handler
with Export,
Convention => Ada,
External_Name => "__drake_reinstall_exception_handler";
pragma No_Inline (Reinstall_Exception_Handler);
private
type Signal_Stack_Type is null record;
pragma Suppress_Initialization (Signal_Stack_Type);
end System.Unwind.Mapping;
|
AdaCore/langkit | Ada | 1,768 | adb | -- Test the behavior of the ``Langkit_Support.Diagnostic.Output`` module, and
-- more specifically of the ``Print_Diagnostic`` procedure.
with Ada.Text_IO; use Ada.Text_IO;
with Langkit_Support.Diagnostics.Output;
use Langkit_Support.Diagnostics;
with Langkit_Support.Slocs; use Langkit_Support.Slocs;
with Langkit_Support.Text; use Langkit_Support.Text;
procedure Main is
type Lines_Array is array (Positive range <>) of Unbounded_Text_Type;
type Simple_Buffer (Size : Positive) is new Text_Buffer_Ifc with record
Lines : Lines_Array (1 .. Size);
end record;
overriding function Get_Line
(Self : Simple_Buffer; Line_Number : Positive) return Text_Type;
--------------
-- Get_Line --
--------------
overriding function Get_Line
(Self : Simple_Buffer; Line_Number : Positive) return Text_Type is
begin
return To_Text (Self.Lines (Line_Number));
end;
B : constant Simple_Buffer :=
(Size => 1,
Lines => (1 => To_Unbounded_Text ("A simple line")));
begin
Put_Line ("Regular diagnostic case");
Output.Print_Diagnostic
(Diagnostic'
(Sloc_Range => Source_Location_Range'(1, 1, 3, 9),
Message => To_Unbounded_Text ("Test message")),
B, "main.adb");
Put_Line ("Single-character range message");
Output.Print_Diagnostic
(Diagnostic'
(Sloc_Range => Source_Location_Range'(1, 1, 3, 4),
Message => To_Unbounded_Text ("Test message")),
B, "main.adb");
Put_Line ("Beginning of line no range message");
Output.Print_Diagnostic
(Diagnostic'
(Sloc_Range => Source_Location_Range'(1, 1, 1, 1),
Message => To_Unbounded_Text ("Test message")),
B, "main.adb");
Put_Line ("Done.");
end Main;
|
reznikmm/matreshka | Ada | 3,955 | 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 message event specifies the receipt by an object of either a call or a
-- signal.
------------------------------------------------------------------------------
with AMF.UML.Events;
package AMF.UML.Message_Events is
pragma Preelaborate;
type UML_Message_Event is limited interface
and AMF.UML.Events.UML_Event;
type UML_Message_Event_Access is
access all UML_Message_Event'Class;
for UML_Message_Event_Access'Storage_Size use 0;
end AMF.UML.Message_Events;
|
MatrixMike/AdaDemo1 | Ada | 126 | adb | --with Ada.Text_IO;
--use Ada.Text_IO;
with xample1;
use xample1;
procedure xercise is
begin
SayWelcome(6);
end xercise;
|
AdaCore/gpr | Ada | 1,847 | adb | --
-- Copyright (C) 2019-2023, AdaCore
--
-- SPDX-License-Identifier: Apache-2.0
--
with Ada.Strings.Fixed;
with Ada.Text_IO;
with GPR2.Context;
with GPR2.Path_Name;
with GPR2.Project.Source.Set;
with GPR2.Project.View;
with GPR2.Project.Tree;
with GPR2.Source;
procedure Main is
use Ada;
use GPR2;
use GPR2.Project;
procedure Check (Project_Name : Name_Type);
-- Do check the given project's sources
procedure Output_Filename (Filename : Path_Name.Full_Name);
-- Remove the leading tmp directory
-----------
-- Check --
-----------
procedure Check (Project_Name : Name_Type) is
Prj : Project.Tree.Object;
Ctx : Context.Object;
View : Project.View.Object;
begin
Project.Tree.Load (Prj, Create (Project_Name), Ctx);
View := Prj.Root_Project;
Text_IO.Put_Line ("Project: " & String (View.Name));
for Source of View.Sources loop
declare
S : constant GPR2.Source.Object := Source.Source;
begin
Output_Filename (S.Path_Name.Value);
Text_IO.Set_Col (16);
Text_IO.Put (" language: " & String (S.Language));
Text_IO.Set_Col (33);
Text_IO.Put (" Kind: " & GPR2.Library_Unit_Type'Image (S.Kind));
if S.Has_Units then
Text_IO.Put (" unit: " & String (S.Unit_Name));
end if;
Text_IO.New_Line;
end;
end loop;
end Check;
---------------------
-- Output_Filename --
---------------------
procedure Output_Filename (Filename : Path_Name.Full_Name) is
I : constant Positive := Strings.Fixed.Index (Filename, "source1");
begin
Text_IO.Put (" > " & Filename (I + 8 .. Filename'Last));
end Output_Filename;
begin
Check ("demo1.gpr");
Check ("demo2.gpr");
end Main;
|
twdroeger/ada-awa | Ada | 33,922 | ads | -----------------------------------------------------------------------
-- AWA.Users.Models -- AWA.Users.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 ADO.Audits;
pragma Warnings (On);
package AWA.Users.Models is
pragma Style_Checks ("-mr");
type Key_Type is (RESET_PASSWORD_KEY, SIGNUP_KEY, INVITATION_KEY);
for Key_Type use (RESET_PASSWORD_KEY => 0, SIGNUP_KEY => 1, INVITATION_KEY => 2);
package Key_Type_Objects is
new Util.Beans.Objects.Enums (Key_Type);
type Nullable_Key_Type is record
Is_Null : Boolean := True;
Value : Key_Type;
end record;
type MailDeliveryStatus is (UNKNOWN, VALID, SOFT_BOUNCE, HARD_BOUNCE);
for MailDeliveryStatus use (UNKNOWN => 0, VALID => 1, SOFT_BOUNCE => 2, HARD_BOUNCE => 3);
package MailDeliveryStatus_Objects is
new Util.Beans.Objects.Enums (MailDeliveryStatus);
type Nullable_MailDeliveryStatus is record
Is_Null : Boolean := True;
Value : MailDeliveryStatus;
end record;
-- --------------------
-- The Auth_Session is created when a user is authentified.
-- The Connect_Session is created each time the user establishes a session on
-- the application. The Connect_Session is always associated with an Auth_Session.
-- --------------------
type Session_Type is (CONNECT_SESSION, AUTH_SESSION, USED_SESSION);
for Session_Type use (CONNECT_SESSION => 0, AUTH_SESSION => 1, USED_SESSION => 2);
package Session_Type_Objects is
new Util.Beans.Objects.Enums (Session_Type);
type Nullable_Session_Type is record
Is_Null : Boolean := True;
Value : Session_Type;
end record;
type Email_Ref is new ADO.Objects.Object_Ref with null record;
type User_Ref is new ADO.Objects.Object_Ref with null record;
type Access_Key_Ref is new ADO.Objects.Object_Ref with null record;
type Session_Ref is new ADO.Objects.Object_Ref with null record;
-- --------------------
-- The Email entity defines the user email addresses.
-- The user has a primary email address that is obtained
-- from the registration process (either through a form
-- submission or through OpenID authentication).
-- --------------------
-- Create an object key for Email.
function Email_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key;
-- Create an object key for Email from a string.
-- Raises Constraint_Error if the string cannot be converted into the object key.
function Email_Key (Id : in String) return ADO.Objects.Object_Key;
Null_Email : constant Email_Ref;
function "=" (Left, Right : Email_Ref'Class) return Boolean;
-- Set the email address.
procedure Set_Email (Object : in out Email_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Email (Object : in out Email_Ref;
Value : in String);
-- Get the email address.
function Get_Email (Object : in Email_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Email (Object : in Email_Ref)
return String;
-- Set the last mail delivery status (if known).
procedure Set_Status (Object : in out Email_Ref;
Value : in AWA.Users.Models.MailDeliveryStatus);
-- Get the last mail delivery status (if known).
function Get_Status (Object : in Email_Ref)
return AWA.Users.Models.MailDeliveryStatus;
-- Set the date when the last email error was detected.
procedure Set_Last_Error_Date (Object : in out Email_Ref;
Value : in Ada.Calendar.Time);
-- Get the date when the last email error was detected.
function Get_Last_Error_Date (Object : in Email_Ref)
return Ada.Calendar.Time;
--
function Get_Version (Object : in Email_Ref)
return Integer;
-- Set the email primary key.
procedure Set_Id (Object : in out Email_Ref;
Value : in ADO.Identifier);
-- Get the email primary key.
function Get_Id (Object : in Email_Ref)
return ADO.Identifier;
-- Set the user.
procedure Set_User_Id (Object : in out Email_Ref;
Value : in ADO.Identifier);
-- Get the user.
function Get_User_Id (Object : in Email_Ref)
return ADO.Identifier;
-- Load the entity identified by 'Id'.
-- Raises the NOT_FOUND exception if it does not exist.
procedure Load (Object : in out Email_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 Email_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 Email_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 Email_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
-- Delete the entity.
overriding
procedure Delete (Object : in out Email_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
function Get_Value (From : in Email_Ref;
Name : in String) return Util.Beans.Objects.Object;
-- Table definition
EMAIL_TABLE : constant ADO.Schemas.Class_Mapping_Access;
-- Internal method to allocate the Object_Record instance
overriding
procedure Allocate (Object : in out Email_Ref);
-- Copy of the object.
procedure Copy (Object : in Email_Ref;
Into : in out Email_Ref);
-- --------------------
-- The User entity represents a user that can access and use the application.
-- --------------------
-- Create an object key for User.
function User_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key;
-- Create an object key for User from a string.
-- Raises Constraint_Error if the string cannot be converted into the object key.
function User_Key (Id : in String) return ADO.Objects.Object_Key;
Null_User : constant User_Ref;
function "=" (Left, Right : User_Ref'Class) return Boolean;
-- Set the user first name.
procedure Set_First_Name (Object : in out User_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_First_Name (Object : in out User_Ref;
Value : in String);
-- Get the user first name.
function Get_First_Name (Object : in User_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_First_Name (Object : in User_Ref)
return String;
-- Set the user last name.
procedure Set_Last_Name (Object : in out User_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Last_Name (Object : in out User_Ref;
Value : in String);
-- Get the user last name.
function Get_Last_Name (Object : in User_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Last_Name (Object : in User_Ref)
return String;
-- Set the user password hash.
procedure Set_Password (Object : in out User_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Password (Object : in out User_Ref;
Value : in String);
-- Get the user password hash.
function Get_Password (Object : in User_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Password (Object : in User_Ref)
return String;
-- Set the user OpenID identifier.
procedure Set_Open_Id (Object : in out User_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Open_Id (Object : in out User_Ref;
Value : in String);
-- Get the user OpenID identifier.
function Get_Open_Id (Object : in User_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Open_Id (Object : in User_Ref)
return String;
-- Set the user country.
procedure Set_Country (Object : in out User_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Country (Object : in out User_Ref;
Value : in String);
-- Get the user country.
function Get_Country (Object : in User_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Country (Object : in User_Ref)
return String;
-- Set the user display name.
procedure Set_Name (Object : in out User_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Name (Object : in out User_Ref;
Value : in String);
-- Get the user display name.
function Get_Name (Object : in User_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Name (Object : in User_Ref)
return String;
-- Get version number.
function Get_Version (Object : in User_Ref)
return Integer;
-- Set the user identifier.
procedure Set_Id (Object : in out User_Ref;
Value : in ADO.Identifier);
-- Get the user identifier.
function Get_Id (Object : in User_Ref)
return ADO.Identifier;
-- Set the password salt.
procedure Set_Salt (Object : in out User_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Salt (Object : in out User_Ref;
Value : in String);
-- Get the password salt.
function Get_Salt (Object : in User_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Salt (Object : in User_Ref)
return String;
--
procedure Set_Email (Object : in out User_Ref;
Value : in AWA.Users.Models.Email_Ref'Class);
--
function Get_Email (Object : in User_Ref)
return AWA.Users.Models.Email_Ref'Class;
-- Load the entity identified by 'Id'.
-- Raises the NOT_FOUND exception if it does not exist.
procedure Load (Object : in out User_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier);
-- Load the entity identified by 'Id'.
-- Returns True in <b>Found</b> if the object was found and False if it does not exist.
procedure Load (Object : in out User_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 User_Ref;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
-- Save the entity. If the entity does not have an identifier, an identifier is allocated
-- and it is inserted in the table. Otherwise, only data fields which have been changed
-- are updated.
overriding
procedure Save (Object : in out User_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
-- Delete the entity.
overriding
procedure Delete (Object : in out User_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
function Get_Value (From : in User_Ref;
Name : in String) return Util.Beans.Objects.Object;
-- Table definition
USER_TABLE : constant ADO.Schemas.Class_Mapping_Access;
-- Internal method to allocate the Object_Record instance
overriding
procedure Allocate (Object : in out User_Ref);
-- Copy of the object.
procedure Copy (Object : in User_Ref;
Into : in out User_Ref);
-- Create an object key for Access_Key.
function Access_Key_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key;
-- Create an object key for Access_Key from a string.
-- Raises Constraint_Error if the string cannot be converted into the object key.
function Access_Key_Key (Id : in String) return ADO.Objects.Object_Key;
Null_Access_Key : constant Access_Key_Ref;
function "=" (Left, Right : Access_Key_Ref'Class) return Boolean;
-- Set the secure access key.
procedure Set_Access_Key (Object : in out Access_Key_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Access_Key (Object : in out Access_Key_Ref;
Value : in String);
-- Get the secure access key.
function Get_Access_Key (Object : in Access_Key_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Access_Key (Object : in Access_Key_Ref)
return String;
-- Set the access key expiration date.
procedure Set_Expire_Date (Object : in out Access_Key_Ref;
Value : in Ada.Calendar.Time);
-- Get the access key expiration date.
function Get_Expire_Date (Object : in Access_Key_Ref)
return Ada.Calendar.Time;
-- Set the access key identifier.
procedure Set_Id (Object : in out Access_Key_Ref;
Value : in ADO.Identifier);
-- Get the access key identifier.
function Get_Id (Object : in Access_Key_Ref)
return ADO.Identifier;
--
function Get_Version (Object : in Access_Key_Ref)
return Integer;
-- Set the access key type.
procedure Set_Kind (Object : in out Access_Key_Ref;
Value : in AWA.Users.Models.Key_Type);
-- Get the access key type.
function Get_Kind (Object : in Access_Key_Ref)
return AWA.Users.Models.Key_Type;
--
procedure Set_User (Object : in out Access_Key_Ref;
Value : in AWA.Users.Models.User_Ref'Class);
--
function Get_User (Object : in Access_Key_Ref)
return AWA.Users.Models.User_Ref'Class;
-- Load the entity identified by 'Id'.
-- Raises the NOT_FOUND exception if it does not exist.
procedure Load (Object : in out Access_Key_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 Access_Key_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 Access_Key_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 Access_Key_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
-- Delete the entity.
overriding
procedure Delete (Object : in out Access_Key_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
function Get_Value (From : in Access_Key_Ref;
Name : in String) return Util.Beans.Objects.Object;
-- Table definition
ACCESS_KEY_TABLE : constant ADO.Schemas.Class_Mapping_Access;
-- Internal method to allocate the Object_Record instance
overriding
procedure Allocate (Object : in out Access_Key_Ref);
-- Copy of the object.
procedure Copy (Object : in Access_Key_Ref;
Into : in out Access_Key_Ref);
-- Create an object key for Session.
function Session_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key;
-- Create an object key for Session from a string.
-- Raises Constraint_Error if the string cannot be converted into the object key.
function Session_Key (Id : in String) return ADO.Objects.Object_Key;
Null_Session : constant Session_Ref;
function "=" (Left, Right : Session_Ref'Class) return Boolean;
--
procedure Set_Start_Date (Object : in out Session_Ref;
Value : in Ada.Calendar.Time);
--
function Get_Start_Date (Object : in Session_Ref)
return Ada.Calendar.Time;
--
procedure Set_End_Date (Object : in out Session_Ref;
Value : in ADO.Nullable_Time);
--
function Get_End_Date (Object : in Session_Ref)
return ADO.Nullable_Time;
--
procedure Set_Ip_Address (Object : in out Session_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Ip_Address (Object : in out Session_Ref;
Value : in String);
--
function Get_Ip_Address (Object : in Session_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Ip_Address (Object : in Session_Ref)
return String;
--
procedure Set_Stype (Object : in out Session_Ref;
Value : in AWA.Users.Models.Session_Type);
--
function Get_Stype (Object : in Session_Ref)
return AWA.Users.Models.Session_Type;
--
function Get_Version (Object : in Session_Ref)
return Integer;
--
procedure Set_Server_Id (Object : in out Session_Ref;
Value : in Integer);
--
function Get_Server_Id (Object : in Session_Ref)
return Integer;
--
procedure Set_Id (Object : in out Session_Ref;
Value : in ADO.Identifier);
--
function Get_Id (Object : in Session_Ref)
return ADO.Identifier;
--
procedure Set_Auth (Object : in out Session_Ref;
Value : in AWA.Users.Models.Session_Ref'Class);
--
function Get_Auth (Object : in Session_Ref)
return AWA.Users.Models.Session_Ref'Class;
--
procedure Set_User (Object : in out Session_Ref;
Value : in AWA.Users.Models.User_Ref'Class);
--
function Get_User (Object : in Session_Ref)
return AWA.Users.Models.User_Ref'Class;
-- Load the entity identified by 'Id'.
-- Raises the NOT_FOUND exception if it does not exist.
procedure Load (Object : in out Session_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 Session_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 Session_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 Session_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
-- Delete the entity.
overriding
procedure Delete (Object : in out Session_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
function Get_Value (From : in Session_Ref;
Name : in String) return Util.Beans.Objects.Object;
-- Table definition
SESSION_TABLE : constant ADO.Schemas.Class_Mapping_Access;
-- Internal method to allocate the Object_Record instance
overriding
procedure Allocate (Object : in out Session_Ref);
-- Copy of the object.
procedure Copy (Object : in Session_Ref;
Into : in out Session_Ref);
private
EMAIL_NAME : aliased constant String := "awa_email";
COL_0_1_NAME : aliased constant String := "email";
COL_1_1_NAME : aliased constant String := "status";
COL_2_1_NAME : aliased constant String := "last_error_date";
COL_3_1_NAME : aliased constant String := "version";
COL_4_1_NAME : aliased constant String := "id";
COL_5_1_NAME : aliased constant String := "user_id";
EMAIL_DEF : aliased constant ADO.Schemas.Class_Mapping :=
(Count => 6,
Table => EMAIL_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,
6 => COL_5_1_NAME'Access)
);
EMAIL_TABLE : constant ADO.Schemas.Class_Mapping_Access
:= EMAIL_DEF'Access;
Null_Email : constant Email_Ref
:= Email_Ref'(ADO.Objects.Object_Ref with null record);
type Email_Impl is
new ADO.Objects.Object_Record (Key_Type => ADO.Objects.KEY_INTEGER,
Of_Class => EMAIL_DEF'Access)
with record
Email : Ada.Strings.Unbounded.Unbounded_String;
Status : AWA.Users.Models.MailDeliveryStatus;
Last_Error_Date : Ada.Calendar.Time;
Version : Integer;
User_Id : ADO.Identifier;
end record;
type Email_Access is access all Email_Impl;
overriding
procedure Destroy (Object : access Email_Impl);
overriding
procedure Find (Object : in out Email_Impl;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
overriding
procedure Load (Object : in out Email_Impl;
Session : in out ADO.Sessions.Session'Class);
procedure Load (Object : in out Email_Impl;
Stmt : in out ADO.Statements.Query_Statement'Class;
Session : in out ADO.Sessions.Session'Class);
overriding
procedure Save (Object : in out Email_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Create (Object : in out Email_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Delete (Object : in out Email_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Set_Field (Object : in out Email_Ref'Class;
Impl : out Email_Access);
USER_NAME : aliased constant String := "awa_user";
COL_0_2_NAME : aliased constant String := "first_name";
COL_1_2_NAME : aliased constant String := "last_name";
COL_2_2_NAME : aliased constant String := "password";
COL_3_2_NAME : aliased constant String := "open_id";
COL_4_2_NAME : aliased constant String := "country";
COL_5_2_NAME : aliased constant String := "name";
COL_6_2_NAME : aliased constant String := "version";
COL_7_2_NAME : aliased constant String := "id";
COL_8_2_NAME : aliased constant String := "salt";
COL_9_2_NAME : aliased constant String := "email_id";
USER_DEF : aliased constant ADO.Schemas.Class_Mapping :=
(Count => 10,
Table => USER_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,
6 => COL_5_2_NAME'Access,
7 => COL_6_2_NAME'Access,
8 => COL_7_2_NAME'Access,
9 => COL_8_2_NAME'Access,
10 => COL_9_2_NAME'Access)
);
USER_TABLE : constant ADO.Schemas.Class_Mapping_Access
:= USER_DEF'Access;
USER_AUDIT_DEF : aliased constant ADO.Audits.Auditable_Mapping :=
(Count => 4,
Of_Class => USER_DEF'Access,
Members => (
1 => 0,
2 => 1,
3 => 4,
4 => 5)
);
USER_AUDIT_TABLE : constant ADO.Audits.Auditable_Mapping_Access
:= USER_AUDIT_DEF'Access;
Null_User : constant User_Ref
:= User_Ref'(ADO.Objects.Object_Ref with null record);
type User_Impl is
new ADO.Audits.Auditable_Object_Record (Key_Type => ADO.Objects.KEY_INTEGER,
Of_Class => USER_DEF'Access,
With_Audit => USER_AUDIT_DEF'Access)
with record
First_Name : Ada.Strings.Unbounded.Unbounded_String;
Last_Name : Ada.Strings.Unbounded.Unbounded_String;
Password : Ada.Strings.Unbounded.Unbounded_String;
Open_Id : Ada.Strings.Unbounded.Unbounded_String;
Country : Ada.Strings.Unbounded.Unbounded_String;
Name : Ada.Strings.Unbounded.Unbounded_String;
Version : Integer;
Salt : Ada.Strings.Unbounded.Unbounded_String;
Email : AWA.Users.Models.Email_Ref;
end record;
type User_Access is access all User_Impl;
overriding
procedure Destroy (Object : access User_Impl);
overriding
procedure Find (Object : in out User_Impl;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
overriding
procedure Load (Object : in out User_Impl;
Session : in out ADO.Sessions.Session'Class);
procedure Load (Object : in out User_Impl;
Stmt : in out ADO.Statements.Query_Statement'Class;
Session : in out ADO.Sessions.Session'Class);
overriding
procedure Save (Object : in out User_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Create (Object : in out User_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Delete (Object : in out User_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Set_Field (Object : in out User_Ref'Class;
Impl : out User_Access);
ACCESS_KEY_NAME : aliased constant String := "awa_access_key";
COL_0_3_NAME : aliased constant String := "access_key";
COL_1_3_NAME : aliased constant String := "expire_date";
COL_2_3_NAME : aliased constant String := "id";
COL_3_3_NAME : aliased constant String := "version";
COL_4_3_NAME : aliased constant String := "kind";
COL_5_3_NAME : aliased constant String := "user_id";
ACCESS_KEY_DEF : aliased constant ADO.Schemas.Class_Mapping :=
(Count => 6,
Table => ACCESS_KEY_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)
);
ACCESS_KEY_TABLE : constant ADO.Schemas.Class_Mapping_Access
:= ACCESS_KEY_DEF'Access;
Null_Access_Key : constant Access_Key_Ref
:= Access_Key_Ref'(ADO.Objects.Object_Ref with null record);
type Access_Key_Impl is
new ADO.Objects.Object_Record (Key_Type => ADO.Objects.KEY_INTEGER,
Of_Class => ACCESS_KEY_DEF'Access)
with record
Access_Key : Ada.Strings.Unbounded.Unbounded_String;
Expire_Date : Ada.Calendar.Time;
Version : Integer;
Kind : AWA.Users.Models.Key_Type;
User : AWA.Users.Models.User_Ref;
end record;
type Access_Key_Access is access all Access_Key_Impl;
overriding
procedure Destroy (Object : access Access_Key_Impl);
overriding
procedure Find (Object : in out Access_Key_Impl;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
overriding
procedure Load (Object : in out Access_Key_Impl;
Session : in out ADO.Sessions.Session'Class);
procedure Load (Object : in out Access_Key_Impl;
Stmt : in out ADO.Statements.Query_Statement'Class;
Session : in out ADO.Sessions.Session'Class);
overriding
procedure Save (Object : in out Access_Key_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Create (Object : in out Access_Key_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Delete (Object : in out Access_Key_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Set_Field (Object : in out Access_Key_Ref'Class;
Impl : out Access_Key_Access);
SESSION_NAME : aliased constant String := "awa_session";
COL_0_4_NAME : aliased constant String := "start_date";
COL_1_4_NAME : aliased constant String := "end_date";
COL_2_4_NAME : aliased constant String := "ip_address";
COL_3_4_NAME : aliased constant String := "stype";
COL_4_4_NAME : aliased constant String := "version";
COL_5_4_NAME : aliased constant String := "server_id";
COL_6_4_NAME : aliased constant String := "id";
COL_7_4_NAME : aliased constant String := "auth_id";
COL_8_4_NAME : aliased constant String := "user_id";
SESSION_DEF : aliased constant ADO.Schemas.Class_Mapping :=
(Count => 9,
Table => SESSION_NAME'Access,
Members => (
1 => COL_0_4_NAME'Access,
2 => COL_1_4_NAME'Access,
3 => COL_2_4_NAME'Access,
4 => COL_3_4_NAME'Access,
5 => COL_4_4_NAME'Access,
6 => COL_5_4_NAME'Access,
7 => COL_6_4_NAME'Access,
8 => COL_7_4_NAME'Access,
9 => COL_8_4_NAME'Access)
);
SESSION_TABLE : constant ADO.Schemas.Class_Mapping_Access
:= SESSION_DEF'Access;
Null_Session : constant Session_Ref
:= Session_Ref'(ADO.Objects.Object_Ref with null record);
type Session_Impl is
new ADO.Objects.Object_Record (Key_Type => ADO.Objects.KEY_INTEGER,
Of_Class => SESSION_DEF'Access)
with record
Start_Date : Ada.Calendar.Time;
End_Date : ADO.Nullable_Time;
Ip_Address : Ada.Strings.Unbounded.Unbounded_String;
Stype : AWA.Users.Models.Session_Type;
Version : Integer;
Server_Id : Integer;
Auth : AWA.Users.Models.Session_Ref;
User : AWA.Users.Models.User_Ref;
end record;
type Session_Access is access all Session_Impl;
overriding
procedure Destroy (Object : access Session_Impl);
overriding
procedure Find (Object : in out Session_Impl;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
overriding
procedure Load (Object : in out Session_Impl;
Session : in out ADO.Sessions.Session'Class);
procedure Load (Object : in out Session_Impl;
Stmt : in out ADO.Statements.Query_Statement'Class;
Session : in out ADO.Sessions.Session'Class);
overriding
procedure Save (Object : in out Session_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Create (Object : in out Session_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Delete (Object : in out Session_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Set_Field (Object : in out Session_Ref'Class;
Impl : out Session_Access);
end AWA.Users.Models;
|
reznikmm/matreshka | Ada | 4,279 | 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.Border_Model.Internals is
------------
-- Create --
------------
function Create
(Node : Matreshka.ODF_Attributes.Table.Border_Model.Table_Border_Model_Access)
return ODF.DOM.Attributes.Table.Border_Model.ODF_Table_Border_Model 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.Border_Model.Table_Border_Model_Access)
return ODF.DOM.Attributes.Table.Border_Model.ODF_Table_Border_Model is
begin
return
(XML.DOM.Attributes.Internals.Wrap
(Matreshka.DOM_Nodes.Attribute_Access (Node)) with null record);
end Wrap;
end ODF.DOM.Attributes.Table.Border_Model.Internals;
|
ellamosi/Ada_BMP_Library | Ada | 3,709 | 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 Ada.Streams;
with Ada.Streams.Stream_IO;
with GNAT.MD5; use GNAT.MD5;
package body Compare_Files is
package Hash renames GNAT.MD5;
function Binnary_Equal (A_Path, B_Path : String) return Boolean is
function Compute_Hash (Path : String) return Message_Digest;
function Compute_Hash (Path : String) return Message_Digest
is
Context : aliased GNAT.MD5.Context := GNAT.MD5.Initial_Context;
File : Ada.Streams.Stream_IO.File_Type;
Buffer : Ada.Streams.Stream_Element_Array (1 .. 4096);
Last : Ada.Streams.Stream_Element_Offset;
use type Ada.Streams.Stream_Element_Offset;
begin
Ada.Streams.Stream_IO.Open (File,
Mode => Ada.Streams.Stream_IO.In_File,
Name => Path);
loop
Ada.Streams.Stream_IO.Read (File, Item => Buffer, Last => Last);
Hash.Update (Context, Buffer (1 .. Last));
Ada.Streams.Stream_IO.Read (File, Item => Buffer, Last => Last);
exit when Last < Buffer'Last;
end loop;
Ada.Streams.Stream_IO.Close (File);
return Hash.Digest (Context);
end Compute_Hash;
begin
return Compute_Hash (A_Path) = Compute_Hash (B_Path);
end Binnary_Equal;
end Compare_Files;
|
zhmu/ananas | Ada | 52,292 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M . S T R E A M _ A T T R I B U T E S . X D R --
-- --
-- B o d y --
-- --
-- Copyright (C) 1996-2022, Free Software Foundation, Inc. --
-- --
-- GARLIC is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Ada.IO_Exceptions;
with Ada.Streams; use Ada.Streams;
with Ada.Unchecked_Conversion;
package body System.Stream_Attributes.XDR is
pragma Suppress (Range_Check);
pragma Suppress (Overflow_Check);
use UST;
Data_Error : exception renames Ada.IO_Exceptions.End_Error;
-- Exception raised if insufficient data read (End_Error is mandated by
-- AI95-00132).
SU : constant := System.Storage_Unit;
-- The code in this body assumes that SU = 8
BB : constant := 2 ** SU; -- Byte base
BL : constant := 2 ** SU - 1; -- Byte last
BS : constant := 2 ** (SU - 1); -- Byte sign
US : constant := Unsigned'Size; -- Unsigned size
UB : constant := (US - 1) / SU + 1; -- Unsigned byte
UL : constant := 2 ** US - 1; -- Unsigned last
subtype SE is Ada.Streams.Stream_Element;
subtype SEA is Ada.Streams.Stream_Element_Array;
subtype SEO is Ada.Streams.Stream_Element_Offset;
type Field_Type is record
E_Size : Integer; -- Exponent bit size
E_Bias : Integer; -- Exponent bias
F_Size : Integer; -- Fraction bit size
E_Last : Integer; -- Max exponent value
F_Mask : SE; -- Mask to apply on first fraction byte
E_Bytes : SEO; -- N. of exponent bytes completely used
F_Bytes : SEO; -- N. of fraction bytes completely used
F_Bits : Integer; -- N. of bits used on first fraction word
end record;
type Precision is (Single, Double, Quadruple);
Fields : constant array (Precision) of Field_Type := [
-- Single precision
[E_Size => 8,
E_Bias => 127,
F_Size => 23,
E_Last => 2 ** 8 - 1,
F_Mask => 16#7F#, -- 2 ** 7 - 1,
E_Bytes => 2,
F_Bytes => 3,
F_Bits => 23 mod US],
-- Double precision
[E_Size => 11,
E_Bias => 1023,
F_Size => 52,
E_Last => 2 ** 11 - 1,
F_Mask => 16#0F#, -- 2 ** 4 - 1,
E_Bytes => 2,
F_Bytes => 7,
F_Bits => 52 mod US],
-- Quadruple precision
[E_Size => 15,
E_Bias => 16383,
F_Size => 112,
E_Last => 2 ** 8 - 1,
F_Mask => 16#FF#, -- 2 ** 8 - 1,
E_Bytes => 2,
F_Bytes => 14,
F_Bits => 112 mod US]];
-- The representation of all items requires a multiple of four bytes
-- (or 32 bits) of data. The bytes are numbered 0 through n-1. The bytes
-- are read or written to some byte stream such that byte m always
-- precedes byte m+1. If the n bytes needed to contain the data are not
-- a multiple of four, then the n bytes are followed by enough (0 to 3)
-- residual zero bytes, r, to make the total byte count a multiple of 4.
-- An XDR signed integer is a 32-bit datum that encodes an integer
-- in the range [-2147483648,2147483647]. The integer is represented
-- in two's complement notation. The most and least significant bytes
-- are 0 and 3, respectively. Integers are declared as follows:
-- (MSB) (LSB)
-- +-------+-------+-------+-------+
-- |byte 0 |byte 1 |byte 2 |byte 3 |
-- +-------+-------+-------+-------+
-- <------------32 bits------------>
SSI_L : constant := 1;
SI_L : constant := 2;
I24_L : constant := 3;
I_L : constant := 4;
LI_L : constant := 8;
LLI_L : constant := 8;
subtype XDR_S_SSI is SEA (1 .. SSI_L);
subtype XDR_S_SI is SEA (1 .. SI_L);
subtype XDR_S_I24 is SEA (1 .. I24_L);
subtype XDR_S_I is SEA (1 .. I_L);
subtype XDR_S_LI is SEA (1 .. LI_L);
subtype XDR_S_LLI is SEA (1 .. LLI_L);
function Short_Short_Integer_To_XDR_S_SSI is
new Ada.Unchecked_Conversion (Short_Short_Integer, XDR_S_SSI);
function XDR_S_SSI_To_Short_Short_Integer is
new Ada.Unchecked_Conversion (XDR_S_SSI, Short_Short_Integer);
function Short_Integer_To_XDR_S_SI is
new Ada.Unchecked_Conversion (Short_Integer, XDR_S_SI);
function XDR_S_SI_To_Short_Integer is
new Ada.Unchecked_Conversion (XDR_S_SI, Short_Integer);
function Integer_To_XDR_S_I24 is
new Ada.Unchecked_Conversion (Integer_24, XDR_S_I24);
function XDR_S_I24_To_Integer is
new Ada.Unchecked_Conversion (XDR_S_I24, Integer_24);
function Integer_To_XDR_S_I is
new Ada.Unchecked_Conversion (Integer, XDR_S_I);
function XDR_S_I_To_Integer is
new Ada.Unchecked_Conversion (XDR_S_I, Integer);
function Long_Long_Integer_To_XDR_S_LI is
new Ada.Unchecked_Conversion (Long_Long_Integer, XDR_S_LI);
function XDR_S_LI_To_Long_Long_Integer is
new Ada.Unchecked_Conversion (XDR_S_LI, Long_Long_Integer);
function Long_Long_Integer_To_XDR_S_LLI is
new Ada.Unchecked_Conversion (Long_Long_Integer, XDR_S_LLI);
function XDR_S_LLI_To_Long_Long_Integer is
new Ada.Unchecked_Conversion (XDR_S_LLI, Long_Long_Integer);
-- An XDR unsigned integer is a 32-bit datum that encodes a nonnegative
-- integer in the range [0,4294967295]. It is represented by an unsigned
-- binary number whose most and least significant bytes are 0 and 3,
-- respectively. An unsigned integer is declared as follows:
-- (MSB) (LSB)
-- +-------+-------+-------+-------+
-- |byte 0 |byte 1 |byte 2 |byte 3 |
-- +-------+-------+-------+-------+
-- <------------32 bits------------>
SSU_L : constant := 1;
SU_L : constant := 2;
U24_L : constant := 3;
U_L : constant := 4;
LU_L : constant := 8;
LLU_L : constant := 8;
subtype XDR_S_SSU is SEA (1 .. SSU_L);
subtype XDR_S_SU is SEA (1 .. SU_L);
subtype XDR_S_U24 is SEA (1 .. U24_L);
subtype XDR_S_U is SEA (1 .. U_L);
subtype XDR_S_LU is SEA (1 .. LU_L);
subtype XDR_S_LLU is SEA (1 .. LLU_L);
type XDR_SSU is mod BB ** SSU_L;
type XDR_SU is mod BB ** SU_L;
type XDR_U is mod BB ** U_L;
type XDR_U24 is mod BB ** U24_L;
function Short_Unsigned_To_XDR_S_SU is
new Ada.Unchecked_Conversion (Short_Unsigned, XDR_S_SU);
function XDR_S_SU_To_Short_Unsigned is
new Ada.Unchecked_Conversion (XDR_S_SU, Short_Unsigned);
function Unsigned_To_XDR_S_U24 is
new Ada.Unchecked_Conversion (Unsigned_24, XDR_S_U24);
function XDR_S_U24_To_Unsigned is
new Ada.Unchecked_Conversion (XDR_S_U24, Unsigned_24);
function Unsigned_To_XDR_S_U is
new Ada.Unchecked_Conversion (Unsigned, XDR_S_U);
function XDR_S_U_To_Unsigned is
new Ada.Unchecked_Conversion (XDR_S_U, Unsigned);
function Long_Long_Unsigned_To_XDR_S_LU is
new Ada.Unchecked_Conversion (Long_Long_Unsigned, XDR_S_LU);
function XDR_S_LU_To_Long_Long_Unsigned is
new Ada.Unchecked_Conversion (XDR_S_LU, Long_Long_Unsigned);
function Long_Long_Unsigned_To_XDR_S_LLU is
new Ada.Unchecked_Conversion (Long_Long_Unsigned, XDR_S_LLU);
function XDR_S_LLU_To_Long_Long_Unsigned is
new Ada.Unchecked_Conversion (XDR_S_LLU, Long_Long_Unsigned);
-- The standard defines the floating-point data type "float" (32 bits
-- or 4 bytes). The encoding used is the IEEE standard for normalized
-- single-precision floating-point numbers.
-- The standard defines the encoding used for the double-precision
-- floating-point data type "double" (64 bits or 8 bytes). The encoding
-- used is the IEEE standard for normalized double-precision floating-point
-- numbers.
SF_L : constant := 4; -- Single precision
F_L : constant := 4; -- Single precision
LF_L : constant := 8; -- Double precision
LLF_L : constant := 16; -- Quadruple precision
TM_L : constant := 8;
subtype XDR_S_TM is SEA (1 .. TM_L);
type XDR_TM is mod BB ** TM_L;
type XDR_SA is mod 2 ** Standard'Address_Size;
function To_XDR_SA is new Ada.Unchecked_Conversion (System.Address, XDR_SA);
function To_XDR_SA is new Ada.Unchecked_Conversion (XDR_SA, System.Address);
-- Enumerations have the same representation as signed integers.
-- Enumerations are handy for describing subsets of the integers.
-- Booleans are important enough and occur frequently enough to warrant
-- their own explicit type in the standard. Booleans are declared as
-- an enumeration, with FALSE = 0 and TRUE = 1.
-- The standard defines a string of n (numbered 0 through n-1) ASCII
-- bytes to be the number n encoded as an unsigned integer (as described
-- above), and followed by the n bytes of the string. Byte m of the string
-- always precedes byte m+1 of the string, and byte 0 of the string always
-- follows the string's length. If n is not a multiple of four, then the
-- n bytes are followed by enough (0 to 3) residual zero bytes, r, to make
-- the total byte count a multiple of four.
-- To fit with XDR string, do not consider character as an enumeration
-- type.
C_L : constant := 1;
subtype XDR_S_C is SEA (1 .. C_L);
-- Consider Wide_Character as an enumeration type
WC_L : constant := 4;
subtype XDR_S_WC is SEA (1 .. WC_L);
type XDR_WC is mod BB ** WC_L;
-- Consider Wide_Wide_Character as an enumeration type
WWC_L : constant := 8;
subtype XDR_S_WWC is SEA (1 .. WWC_L);
type XDR_WWC is mod BB ** WWC_L;
-- Optimization: if we already have the correct Bit_Order, then some
-- computations can be avoided since the source and the target will be
-- identical anyway. They will be replaced by direct unchecked
-- conversions.
Optimize_Integers : constant Boolean :=
Default_Bit_Order = High_Order_First;
----------
-- I_AD --
----------
function I_AD (Stream : not null access RST) return Fat_Pointer is
FP : Fat_Pointer;
begin
FP.P1 := I_AS (Stream).P1;
FP.P2 := I_AS (Stream).P1;
return FP;
end I_AD;
----------
-- I_AS --
----------
function I_AS (Stream : not null access RST) return Thin_Pointer is
S : XDR_S_TM;
L : SEO;
U : XDR_TM := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
else
for N in S'Range loop
U := U * BB + XDR_TM (S (N));
end loop;
return (P1 => To_XDR_SA (XDR_SA (U)));
end if;
end I_AS;
---------
-- I_B --
---------
function I_B (Stream : not null access RST) return Boolean is
begin
case I_SSU (Stream) is
when 0 => return False;
when 1 => return True;
when others => raise Data_Error;
end case;
end I_B;
---------
-- I_C --
---------
function I_C (Stream : not null access RST) return Character is
S : XDR_S_C;
L : SEO;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
else
-- Use Ada requirements on Character representation clause
return Character'Val (S (1));
end if;
end I_C;
---------
-- I_F --
---------
function I_F (Stream : not null access RST) return Float is
I : constant Precision := Single;
E_Size : Integer renames Fields (I).E_Size;
E_Bias : Integer renames Fields (I).E_Bias;
E_Last : Integer renames Fields (I).E_Last;
F_Mask : SE renames Fields (I).F_Mask;
E_Bytes : SEO renames Fields (I).E_Bytes;
F_Bytes : SEO renames Fields (I).F_Bytes;
F_Size : Integer renames Fields (I).F_Size;
Is_Positive : Boolean;
Exponent : Long_Unsigned;
Fraction : Long_Unsigned;
Result : Float;
S : SEA (1 .. F_L);
L : SEO;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
end if;
-- Extract Fraction, Sign and Exponent
Fraction := Long_Unsigned (S (F_L + 1 - F_Bytes) and F_Mask);
for N in F_L + 2 - F_Bytes .. F_L loop
Fraction := Fraction * BB + Long_Unsigned (S (N));
end loop;
Result := Float'Scaling (Float (Fraction), -F_Size);
if BS <= S (1) then
Is_Positive := False;
Exponent := Long_Unsigned (S (1) - BS);
else
Is_Positive := True;
Exponent := Long_Unsigned (S (1));
end if;
for N in 2 .. E_Bytes loop
Exponent := Exponent * BB + Long_Unsigned (S (N));
end loop;
Exponent := Shift_Right (Exponent, Integer (E_Bytes) * SU - E_Size - 1);
-- NaN or Infinities
if Integer (Exponent) = E_Last then
raise Constraint_Error;
elsif Exponent = 0 then
-- Signed zeros
if Fraction = 0 then
null;
-- Denormalized float
else
Result := Float'Scaling (Result, 1 - E_Bias);
end if;
-- Normalized float
else
Result := Float'Scaling
(1.0 + Result, Integer (Exponent) - E_Bias);
end if;
if not Is_Positive then
Result := -Result;
end if;
return Result;
end I_F;
---------
-- I_I --
---------
function I_I (Stream : not null access RST) return Integer is
S : XDR_S_I;
L : SEO;
U : XDR_U := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
elsif Optimize_Integers then
return XDR_S_I_To_Integer (S);
else
for N in S'Range loop
U := U * BB + XDR_U (S (N));
end loop;
-- Test sign and apply two complement notation
if S (1) < BL then
return Integer (U);
else
return Integer (-((XDR_U'Last xor U) + 1));
end if;
end if;
end I_I;
-----------
-- I_I24 --
-----------
function I_I24 (Stream : not null access RST) return Integer_24 is
S : XDR_S_I24;
L : SEO;
U : XDR_U24 := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
elsif Optimize_Integers then
return XDR_S_I24_To_Integer (S);
else
for N in S'Range loop
U := U * BB + XDR_U24 (S (N));
end loop;
-- Test sign and apply two complement notation
if S (1) < BL then
return Integer_24 (U);
else
return Integer_24 (-((XDR_U24'Last xor U) + 1));
end if;
end if;
end I_I24;
----------
-- I_LF --
----------
function I_LF (Stream : not null access RST) return Long_Float is
I : constant Precision := Double;
E_Size : Integer renames Fields (I).E_Size;
E_Bias : Integer renames Fields (I).E_Bias;
E_Last : Integer renames Fields (I).E_Last;
F_Mask : SE renames Fields (I).F_Mask;
E_Bytes : SEO renames Fields (I).E_Bytes;
F_Bytes : SEO renames Fields (I).F_Bytes;
F_Size : Integer renames Fields (I).F_Size;
Is_Positive : Boolean;
Exponent : Long_Unsigned;
Fraction : Long_Long_Unsigned;
Result : Long_Float;
S : SEA (1 .. LF_L);
L : SEO;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
end if;
-- Extract Fraction, Sign and Exponent
Fraction := Long_Long_Unsigned (S (LF_L + 1 - F_Bytes) and F_Mask);
for N in LF_L + 2 - F_Bytes .. LF_L loop
Fraction := Fraction * BB + Long_Long_Unsigned (S (N));
end loop;
Result := Long_Float'Scaling (Long_Float (Fraction), -F_Size);
if BS <= S (1) then
Is_Positive := False;
Exponent := Long_Unsigned (S (1) - BS);
else
Is_Positive := True;
Exponent := Long_Unsigned (S (1));
end if;
for N in 2 .. E_Bytes loop
Exponent := Exponent * BB + Long_Unsigned (S (N));
end loop;
Exponent := Shift_Right (Exponent, Integer (E_Bytes) * SU - E_Size - 1);
-- NaN or Infinities
if Integer (Exponent) = E_Last then
raise Constraint_Error;
elsif Exponent = 0 then
-- Signed zeros
if Fraction = 0 then
null;
-- Denormalized float
else
Result := Long_Float'Scaling (Result, 1 - E_Bias);
end if;
-- Normalized float
else
Result := Long_Float'Scaling
(1.0 + Result, Integer (Exponent) - E_Bias);
end if;
if not Is_Positive then
Result := -Result;
end if;
return Result;
end I_LF;
----------
-- I_LI --
----------
function I_LI (Stream : not null access RST) return Long_Integer is
S : XDR_S_LI;
L : SEO;
U : Unsigned := 0;
X : Long_Unsigned := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
elsif Optimize_Integers then
return Long_Integer (XDR_S_LI_To_Long_Long_Integer (S));
else
-- Compute using machine unsigned
-- rather than long_long_unsigned
for N in S'Range loop
U := U * BB + Unsigned (S (N));
-- We have filled an unsigned
if N mod UB = 0 then
X := Shift_Left (X, US) + Long_Unsigned (U);
U := 0;
end if;
end loop;
-- Test sign and apply two complement notation
if S (1) < BL then
return Long_Integer (X);
else
return Long_Integer (-((Long_Unsigned'Last xor X) + 1));
end if;
end if;
end I_LI;
-----------
-- I_LLF --
-----------
function I_LLF (Stream : not null access RST) return Long_Long_Float is
I : constant Precision := Quadruple;
E_Size : Integer renames Fields (I).E_Size;
E_Bias : Integer renames Fields (I).E_Bias;
E_Last : Integer renames Fields (I).E_Last;
E_Bytes : SEO renames Fields (I).E_Bytes;
F_Bytes : SEO renames Fields (I).F_Bytes;
F_Size : Integer renames Fields (I).F_Size;
Is_Positive : Boolean;
Exponent : Long_Unsigned;
Fraction_1 : Long_Long_Unsigned := 0;
Fraction_2 : Long_Long_Unsigned := 0;
Result : Long_Long_Float;
HF : constant Natural := F_Size / 2;
S : SEA (1 .. LLF_L);
L : SEO;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
end if;
-- Extract Fraction, Sign and Exponent
for I in LLF_L - F_Bytes + 1 .. LLF_L - 7 loop
Fraction_1 := Fraction_1 * BB + Long_Long_Unsigned (S (I));
end loop;
for I in SEO (LLF_L - 6) .. SEO (LLF_L) loop
Fraction_2 := Fraction_2 * BB + Long_Long_Unsigned (S (I));
end loop;
Result := Long_Long_Float'Scaling (Long_Long_Float (Fraction_2), -HF);
Result := Long_Long_Float (Fraction_1) + Result;
Result := Long_Long_Float'Scaling (Result, HF - F_Size);
if BS <= S (1) then
Is_Positive := False;
Exponent := Long_Unsigned (S (1) - BS);
else
Is_Positive := True;
Exponent := Long_Unsigned (S (1));
end if;
for N in 2 .. E_Bytes loop
Exponent := Exponent * BB + Long_Unsigned (S (N));
end loop;
Exponent := Shift_Right (Exponent, Integer (E_Bytes) * SU - E_Size - 1);
-- NaN or Infinities
if Integer (Exponent) = E_Last then
raise Constraint_Error;
elsif Exponent = 0 then
-- Signed zeros
if Fraction_1 = 0 and then Fraction_2 = 0 then
null;
-- Denormalized float
else
Result := Long_Long_Float'Scaling (Result, 1 - E_Bias);
end if;
-- Normalized float
else
Result := Long_Long_Float'Scaling
(1.0 + Result, Integer (Exponent) - E_Bias);
end if;
if not Is_Positive then
Result := -Result;
end if;
return Result;
end I_LLF;
-----------
-- I_LLI --
-----------
function I_LLI (Stream : not null access RST) return Long_Long_Integer is
S : XDR_S_LLI;
L : SEO;
U : Unsigned := 0;
X : Long_Long_Unsigned := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
elsif Optimize_Integers then
return XDR_S_LLI_To_Long_Long_Integer (S);
else
-- Compute using machine unsigned for computing
-- rather than long_long_unsigned.
for N in S'Range loop
U := U * BB + Unsigned (S (N));
-- We have filled an unsigned
if N mod UB = 0 then
X := Shift_Left (X, US) + Long_Long_Unsigned (U);
U := 0;
end if;
end loop;
-- Test sign and apply two complement notation
if S (1) < BL then
return Long_Long_Integer (X);
else
return Long_Long_Integer (-((Long_Long_Unsigned'Last xor X) + 1));
end if;
end if;
end I_LLI;
-----------
-- I_LLU --
-----------
function I_LLU (Stream : not null access RST) return Long_Long_Unsigned is
S : XDR_S_LLU;
L : SEO;
U : Unsigned := 0;
X : Long_Long_Unsigned := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
elsif Optimize_Integers then
return XDR_S_LLU_To_Long_Long_Unsigned (S);
else
-- Compute using machine unsigned
-- rather than long_long_unsigned.
for N in S'Range loop
U := U * BB + Unsigned (S (N));
-- We have filled an unsigned
if N mod UB = 0 then
X := Shift_Left (X, US) + Long_Long_Unsigned (U);
U := 0;
end if;
end loop;
return X;
end if;
end I_LLU;
----------
-- I_LU --
----------
function I_LU (Stream : not null access RST) return Long_Unsigned is
S : XDR_S_LU;
L : SEO;
U : Unsigned := 0;
X : Long_Unsigned := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
elsif Optimize_Integers then
return Long_Unsigned (XDR_S_LU_To_Long_Long_Unsigned (S));
else
-- Compute using machine unsigned
-- rather than long_unsigned.
for N in S'Range loop
U := U * BB + Unsigned (S (N));
-- We have filled an unsigned
if N mod UB = 0 then
X := Shift_Left (X, US) + Long_Unsigned (U);
U := 0;
end if;
end loop;
return X;
end if;
end I_LU;
----------
-- I_SF --
----------
function I_SF (Stream : not null access RST) return Short_Float is
I : constant Precision := Single;
E_Size : Integer renames Fields (I).E_Size;
E_Bias : Integer renames Fields (I).E_Bias;
E_Last : Integer renames Fields (I).E_Last;
F_Mask : SE renames Fields (I).F_Mask;
E_Bytes : SEO renames Fields (I).E_Bytes;
F_Bytes : SEO renames Fields (I).F_Bytes;
F_Size : Integer renames Fields (I).F_Size;
Exponent : Long_Unsigned;
Fraction : Long_Unsigned;
Is_Positive : Boolean;
Result : Short_Float;
S : SEA (1 .. SF_L);
L : SEO;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
end if;
-- Extract Fraction, Sign and Exponent
Fraction := Long_Unsigned (S (SF_L + 1 - F_Bytes) and F_Mask);
for N in SF_L + 2 - F_Bytes .. SF_L loop
Fraction := Fraction * BB + Long_Unsigned (S (N));
end loop;
Result := Short_Float'Scaling (Short_Float (Fraction), -F_Size);
if BS <= S (1) then
Is_Positive := False;
Exponent := Long_Unsigned (S (1) - BS);
else
Is_Positive := True;
Exponent := Long_Unsigned (S (1));
end if;
for N in 2 .. E_Bytes loop
Exponent := Exponent * BB + Long_Unsigned (S (N));
end loop;
Exponent := Shift_Right (Exponent, Integer (E_Bytes) * SU - E_Size - 1);
-- NaN or Infinities
if Integer (Exponent) = E_Last then
raise Constraint_Error;
elsif Exponent = 0 then
-- Signed zeros
if Fraction = 0 then
null;
-- Denormalized float
else
Result := Short_Float'Scaling (Result, 1 - E_Bias);
end if;
-- Normalized float
else
Result := Short_Float'Scaling
(1.0 + Result, Integer (Exponent) - E_Bias);
end if;
if not Is_Positive then
Result := -Result;
end if;
return Result;
end I_SF;
----------
-- I_SI --
----------
function I_SI (Stream : not null access RST) return Short_Integer is
S : XDR_S_SI;
L : SEO;
U : XDR_SU := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
elsif Optimize_Integers then
return XDR_S_SI_To_Short_Integer (S);
else
for N in S'Range loop
U := U * BB + XDR_SU (S (N));
end loop;
-- Test sign and apply two complement notation
if S (1) < BL then
return Short_Integer (U);
else
return Short_Integer (-((XDR_SU'Last xor U) + 1));
end if;
end if;
end I_SI;
-----------
-- I_SSI --
-----------
function I_SSI (Stream : not null access RST) return Short_Short_Integer is
S : XDR_S_SSI;
L : SEO;
U : XDR_SSU;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
elsif Optimize_Integers then
return XDR_S_SSI_To_Short_Short_Integer (S);
else
U := XDR_SSU (S (1));
-- Test sign and apply two complement notation
if S (1) < BL then
return Short_Short_Integer (U);
else
return Short_Short_Integer (-((XDR_SSU'Last xor U) + 1));
end if;
end if;
end I_SSI;
-----------
-- I_SSU --
-----------
function I_SSU (Stream : not null access RST) return Short_Short_Unsigned is
S : XDR_S_SSU;
L : SEO;
U : XDR_SSU := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
else
U := XDR_SSU (S (1));
return Short_Short_Unsigned (U);
end if;
end I_SSU;
----------
-- I_SU --
----------
function I_SU (Stream : not null access RST) return Short_Unsigned is
S : XDR_S_SU;
L : SEO;
U : XDR_SU := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
elsif Optimize_Integers then
return XDR_S_SU_To_Short_Unsigned (S);
else
for N in S'Range loop
U := U * BB + XDR_SU (S (N));
end loop;
return Short_Unsigned (U);
end if;
end I_SU;
---------
-- I_U --
---------
function I_U (Stream : not null access RST) return Unsigned is
S : XDR_S_U;
L : SEO;
U : XDR_U := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
elsif Optimize_Integers then
return XDR_S_U_To_Unsigned (S);
else
for N in S'Range loop
U := U * BB + XDR_U (S (N));
end loop;
return Unsigned (U);
end if;
end I_U;
-----------
-- I_U24 --
-----------
function I_U24 (Stream : not null access RST) return Unsigned_24 is
S : XDR_S_U24;
L : SEO;
U : XDR_U24 := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
elsif Optimize_Integers then
return XDR_S_U24_To_Unsigned (S);
else
for N in S'Range loop
U := U * BB + XDR_U24 (S (N));
end loop;
return Unsigned_24 (U);
end if;
end I_U24;
----------
-- I_WC --
----------
function I_WC (Stream : not null access RST) return Wide_Character is
S : XDR_S_WC;
L : SEO;
U : XDR_WC := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
else
for N in S'Range loop
U := U * BB + XDR_WC (S (N));
end loop;
-- Use Ada requirements on Wide_Character representation clause
return Wide_Character'Val (U);
end if;
end I_WC;
-----------
-- I_WWC --
-----------
function I_WWC (Stream : not null access RST) return Wide_Wide_Character is
S : XDR_S_WWC;
L : SEO;
U : XDR_WWC := 0;
begin
Ada.Streams.Read (Stream.all, S, L);
if L /= S'Last then
raise Data_Error;
else
for N in S'Range loop
U := U * BB + XDR_WWC (S (N));
end loop;
-- Use Ada requirements on Wide_Wide_Character representation clause
return Wide_Wide_Character'Val (U);
end if;
end I_WWC;
----------
-- W_AD --
----------
procedure W_AD (Stream : not null access RST; Item : Fat_Pointer) is
S : XDR_S_TM;
U : XDR_TM;
begin
U := XDR_TM (To_XDR_SA (Item.P1));
for N in reverse S'Range loop
S (N) := SE (U mod BB);
U := U / BB;
end loop;
Ada.Streams.Write (Stream.all, S);
U := XDR_TM (To_XDR_SA (Item.P2));
for N in reverse S'Range loop
S (N) := SE (U mod BB);
U := U / BB;
end loop;
Ada.Streams.Write (Stream.all, S);
if U /= 0 then
raise Data_Error;
end if;
end W_AD;
----------
-- W_AS --
----------
procedure W_AS (Stream : not null access RST; Item : Thin_Pointer) is
S : XDR_S_TM;
U : XDR_TM := XDR_TM (To_XDR_SA (Item.P1));
begin
for N in reverse S'Range loop
S (N) := SE (U mod BB);
U := U / BB;
end loop;
Ada.Streams.Write (Stream.all, S);
if U /= 0 then
raise Data_Error;
end if;
end W_AS;
---------
-- W_B --
---------
procedure W_B (Stream : not null access RST; Item : Boolean) is
begin
if Item then
W_SSU (Stream, 1);
else
W_SSU (Stream, 0);
end if;
end W_B;
---------
-- W_C --
---------
procedure W_C (Stream : not null access RST; Item : Character) is
S : XDR_S_C;
pragma Assert (C_L = 1);
begin
-- Use Ada requirements on Character representation clause
S (1) := SE (Character'Pos (Item));
Ada.Streams.Write (Stream.all, S);
end W_C;
---------
-- W_F --
---------
procedure W_F (Stream : not null access RST; Item : Float) is
I : constant Precision := Single;
E_Size : Integer renames Fields (I).E_Size;
E_Bias : Integer renames Fields (I).E_Bias;
E_Bytes : SEO renames Fields (I).E_Bytes;
F_Bytes : SEO renames Fields (I).F_Bytes;
F_Size : Integer renames Fields (I).F_Size;
F_Mask : SE renames Fields (I).F_Mask;
Exponent : Long_Unsigned;
Fraction : Long_Unsigned;
Is_Positive : Boolean;
E : Integer;
F : Float;
S : SEA (1 .. F_L) := [others => 0];
begin
if not Item'Valid then
raise Constraint_Error;
end if;
-- Compute Sign
Is_Positive := (0.0 <= Item);
F := abs (Item);
-- Signed zero
if F = 0.0 then
Exponent := 0;
Fraction := 0;
else
E := Float'Exponent (F) - 1;
-- Denormalized float
if E <= -E_Bias then
F := Float'Scaling (F, F_Size + E_Bias - 1);
E := -E_Bias;
else
F := Float'Scaling (Float'Fraction (F), F_Size + 1);
end if;
-- Compute Exponent and Fraction
Exponent := Long_Unsigned (E + E_Bias);
Fraction := Long_Unsigned (F * 2.0) / 2;
end if;
-- Store Fraction
for I in reverse F_L - F_Bytes + 1 .. F_L loop
S (I) := SE (Fraction mod BB);
Fraction := Fraction / BB;
end loop;
-- Remove implicit bit
S (F_L - F_Bytes + 1) := S (F_L - F_Bytes + 1) and F_Mask;
-- Store Exponent (not always at the beginning of a byte)
Exponent := Shift_Left (Exponent, Integer (E_Bytes) * SU - E_Size - 1);
for N in reverse 1 .. E_Bytes loop
S (N) := SE (Exponent mod BB) + S (N);
Exponent := Exponent / BB;
end loop;
-- Store Sign
if not Is_Positive then
S (1) := S (1) + BS;
end if;
Ada.Streams.Write (Stream.all, S);
end W_F;
---------
-- W_I --
---------
procedure W_I (Stream : not null access RST; Item : Integer) is
S : XDR_S_I;
U : XDR_U;
begin
if Optimize_Integers then
S := Integer_To_XDR_S_I (Item);
else
-- Test sign and apply two complement notation
U := (if Item < 0
then XDR_U'Last xor XDR_U (-(Item + 1))
else XDR_U (Item));
for N in reverse S'Range loop
S (N) := SE (U mod BB);
U := U / BB;
end loop;
if U /= 0 then
raise Data_Error;
end if;
end if;
Ada.Streams.Write (Stream.all, S);
end W_I;
-----------
-- W_I24 --
-----------
procedure W_I24 (Stream : not null access RST; Item : Integer_24) is
S : XDR_S_I24;
U : XDR_U24;
begin
if Optimize_Integers then
S := Integer_To_XDR_S_I24 (Item);
else
-- Test sign and apply two complement notation
U := (if Item < 0
then XDR_U24'Last xor XDR_U24 (-(Item + 1))
else XDR_U24 (Item));
for N in reverse S'Range loop
S (N) := SE (U mod BB);
U := U / BB;
end loop;
if U /= 0 then
raise Data_Error;
end if;
end if;
Ada.Streams.Write (Stream.all, S);
end W_I24;
----------
-- W_LF --
----------
procedure W_LF (Stream : not null access RST; Item : Long_Float) is
I : constant Precision := Double;
E_Size : Integer renames Fields (I).E_Size;
E_Bias : Integer renames Fields (I).E_Bias;
E_Bytes : SEO renames Fields (I).E_Bytes;
F_Bytes : SEO renames Fields (I).F_Bytes;
F_Size : Integer renames Fields (I).F_Size;
F_Mask : SE renames Fields (I).F_Mask;
Exponent : Long_Unsigned;
Fraction : Long_Long_Unsigned;
Is_Positive : Boolean;
E : Integer;
F : Long_Float;
S : SEA (1 .. LF_L) := [others => 0];
begin
if not Item'Valid then
raise Constraint_Error;
end if;
-- Compute Sign
Is_Positive := (0.0 <= Item);
F := abs (Item);
-- Signed zero
if F = 0.0 then
Exponent := 0;
Fraction := 0;
else
E := Long_Float'Exponent (F) - 1;
-- Denormalized float
if E <= -E_Bias then
E := -E_Bias;
F := Long_Float'Scaling (F, F_Size + E_Bias - 1);
else
F := Long_Float'Scaling (F, F_Size - E);
end if;
-- Compute Exponent and Fraction
Exponent := Long_Unsigned (E + E_Bias);
Fraction := Long_Long_Unsigned (F * 2.0) / 2;
end if;
-- Store Fraction
for I in reverse LF_L - F_Bytes + 1 .. LF_L loop
S (I) := SE (Fraction mod BB);
Fraction := Fraction / BB;
end loop;
-- Remove implicit bit
S (LF_L - F_Bytes + 1) := S (LF_L - F_Bytes + 1) and F_Mask;
-- Store Exponent (not always at the beginning of a byte)
Exponent := Shift_Left (Exponent, Integer (E_Bytes) * SU - E_Size - 1);
for N in reverse 1 .. E_Bytes loop
S (N) := SE (Exponent mod BB) + S (N);
Exponent := Exponent / BB;
end loop;
-- Store Sign
if not Is_Positive then
S (1) := S (1) + BS;
end if;
Ada.Streams.Write (Stream.all, S);
end W_LF;
----------
-- W_LI --
----------
procedure W_LI (Stream : not null access RST; Item : Long_Integer) is
S : XDR_S_LI;
U : Unsigned := 0;
X : Long_Unsigned;
begin
if Optimize_Integers then
S := Long_Long_Integer_To_XDR_S_LI (Long_Long_Integer (Item));
else
-- Test sign and apply two complement notation
if Item < 0 then
X := Long_Unsigned'Last xor Long_Unsigned (-(Item + 1));
else
X := Long_Unsigned (Item);
end if;
-- Compute using machine unsigned rather than long_unsigned
for N in reverse S'Range loop
-- We have filled an unsigned
if (LU_L - N) mod UB = 0 then
U := Unsigned (X and UL);
X := Shift_Right (X, US);
end if;
S (N) := SE (U mod BB);
U := U / BB;
end loop;
if U /= 0 then
raise Data_Error;
end if;
end if;
Ada.Streams.Write (Stream.all, S);
end W_LI;
-----------
-- W_LLF --
-----------
procedure W_LLF (Stream : not null access RST; Item : Long_Long_Float) is
I : constant Precision := Quadruple;
E_Size : Integer renames Fields (I).E_Size;
E_Bias : Integer renames Fields (I).E_Bias;
E_Bytes : SEO renames Fields (I).E_Bytes;
F_Bytes : SEO renames Fields (I).F_Bytes;
F_Size : Integer renames Fields (I).F_Size;
HFS : constant Integer := F_Size / 2;
Exponent : Long_Unsigned;
Fraction_1 : Long_Long_Unsigned;
Fraction_2 : Long_Long_Unsigned;
Is_Positive : Boolean;
E : Integer;
F : Long_Long_Float := Item;
S : SEA (1 .. LLF_L) := [others => 0];
begin
if not Item'Valid then
raise Constraint_Error;
end if;
-- Compute Sign
Is_Positive := (0.0 <= Item);
if F < 0.0 then
F := -Item;
end if;
-- Signed zero
if F = 0.0 then
Exponent := 0;
Fraction_1 := 0;
Fraction_2 := 0;
else
E := Long_Long_Float'Exponent (F) - 1;
-- Denormalized float
if E <= -E_Bias then
F := Long_Long_Float'Scaling (F, E_Bias - 1);
E := -E_Bias;
else
F := Long_Long_Float'Scaling
(Long_Long_Float'Fraction (F), 1);
end if;
-- Compute Exponent and Fraction
Exponent := Long_Unsigned (E + E_Bias);
F := Long_Long_Float'Scaling (F, F_Size - HFS);
Fraction_1 := Long_Long_Unsigned (Long_Long_Float'Floor (F));
F := F - Long_Long_Float (Fraction_1);
F := Long_Long_Float'Scaling (F, HFS);
Fraction_2 := Long_Long_Unsigned (Long_Long_Float'Floor (F));
end if;
-- Store Fraction_1
for I in reverse LLF_L - F_Bytes + 1 .. LLF_L - 7 loop
S (I) := SE (Fraction_1 mod BB);
Fraction_1 := Fraction_1 / BB;
end loop;
-- Store Fraction_2
for I in reverse LLF_L - 6 .. LLF_L loop
S (SEO (I)) := SE (Fraction_2 mod BB);
Fraction_2 := Fraction_2 / BB;
end loop;
-- Store Exponent (not always at the beginning of a byte)
Exponent := Shift_Left (Exponent, Integer (E_Bytes) * SU - E_Size - 1);
for N in reverse 1 .. E_Bytes loop
S (N) := SE (Exponent mod BB) + S (N);
Exponent := Exponent / BB;
end loop;
-- Store Sign
if not Is_Positive then
S (1) := S (1) + BS;
end if;
Ada.Streams.Write (Stream.all, S);
end W_LLF;
-----------
-- W_LLI --
-----------
procedure W_LLI
(Stream : not null access RST;
Item : Long_Long_Integer)
is
S : XDR_S_LLI;
U : Unsigned := 0;
X : Long_Long_Unsigned;
begin
if Optimize_Integers then
S := Long_Long_Integer_To_XDR_S_LLI (Item);
else
-- Test sign and apply two complement notation
if Item < 0 then
X := Long_Long_Unsigned'Last xor Long_Long_Unsigned (-(Item + 1));
else
X := Long_Long_Unsigned (Item);
end if;
-- Compute using machine unsigned rather than long_long_unsigned
for N in reverse S'Range loop
-- We have filled an unsigned
if (LLU_L - N) mod UB = 0 then
U := Unsigned (X and UL);
X := Shift_Right (X, US);
end if;
S (N) := SE (U mod BB);
U := U / BB;
end loop;
if U /= 0 then
raise Data_Error;
end if;
end if;
Ada.Streams.Write (Stream.all, S);
end W_LLI;
-----------
-- W_LLU --
-----------
procedure W_LLU
(Stream : not null access RST;
Item : Long_Long_Unsigned)
is
S : XDR_S_LLU;
U : Unsigned := 0;
X : Long_Long_Unsigned := Item;
begin
if Optimize_Integers then
S := Long_Long_Unsigned_To_XDR_S_LLU (Item);
else
-- Compute using machine unsigned rather than long_long_unsigned
for N in reverse S'Range loop
-- We have filled an unsigned
if (LLU_L - N) mod UB = 0 then
U := Unsigned (X and UL);
X := Shift_Right (X, US);
end if;
S (N) := SE (U mod BB);
U := U / BB;
end loop;
if U /= 0 then
raise Data_Error;
end if;
end if;
Ada.Streams.Write (Stream.all, S);
end W_LLU;
----------
-- W_LU --
----------
procedure W_LU (Stream : not null access RST; Item : Long_Unsigned) is
S : XDR_S_LU;
U : Unsigned := 0;
X : Long_Unsigned := Item;
begin
if Optimize_Integers then
S := Long_Long_Unsigned_To_XDR_S_LU (Long_Long_Unsigned (Item));
else
-- Compute using machine unsigned rather than long_unsigned
for N in reverse S'Range loop
-- We have filled an unsigned
if (LU_L - N) mod UB = 0 then
U := Unsigned (X and UL);
X := Shift_Right (X, US);
end if;
S (N) := SE (U mod BB);
U := U / BB;
end loop;
if U /= 0 then
raise Data_Error;
end if;
end if;
Ada.Streams.Write (Stream.all, S);
end W_LU;
----------
-- W_SF --
----------
procedure W_SF (Stream : not null access RST; Item : Short_Float) is
I : constant Precision := Single;
E_Size : Integer renames Fields (I).E_Size;
E_Bias : Integer renames Fields (I).E_Bias;
E_Bytes : SEO renames Fields (I).E_Bytes;
F_Bytes : SEO renames Fields (I).F_Bytes;
F_Size : Integer renames Fields (I).F_Size;
F_Mask : SE renames Fields (I).F_Mask;
Exponent : Long_Unsigned;
Fraction : Long_Unsigned;
Is_Positive : Boolean;
E : Integer;
F : Short_Float;
S : SEA (1 .. SF_L) := [others => 0];
begin
if not Item'Valid then
raise Constraint_Error;
end if;
-- Compute Sign
Is_Positive := (0.0 <= Item);
F := abs (Item);
-- Signed zero
if F = 0.0 then
Exponent := 0;
Fraction := 0;
else
E := Short_Float'Exponent (F) - 1;
-- Denormalized float
if E <= -E_Bias then
E := -E_Bias;
F := Short_Float'Scaling (F, F_Size + E_Bias - 1);
else
F := Short_Float'Scaling (F, F_Size - E);
end if;
-- Compute Exponent and Fraction
Exponent := Long_Unsigned (E + E_Bias);
Fraction := Long_Unsigned (F * 2.0) / 2;
end if;
-- Store Fraction
for I in reverse SF_L - F_Bytes + 1 .. SF_L loop
S (I) := SE (Fraction mod BB);
Fraction := Fraction / BB;
end loop;
-- Remove implicit bit
S (SF_L - F_Bytes + 1) := S (SF_L - F_Bytes + 1) and F_Mask;
-- Store Exponent (not always at the beginning of a byte)
Exponent := Shift_Left (Exponent, Integer (E_Bytes) * SU - E_Size - 1);
for N in reverse 1 .. E_Bytes loop
S (N) := SE (Exponent mod BB) + S (N);
Exponent := Exponent / BB;
end loop;
-- Store Sign
if not Is_Positive then
S (1) := S (1) + BS;
end if;
Ada.Streams.Write (Stream.all, S);
end W_SF;
----------
-- W_SI --
----------
procedure W_SI (Stream : not null access RST; Item : Short_Integer) is
S : XDR_S_SI;
U : XDR_SU;
begin
if Optimize_Integers then
S := Short_Integer_To_XDR_S_SI (Item);
else
-- Test sign and apply two complement's notation
U := (if Item < 0
then XDR_SU'Last xor XDR_SU (-(Item + 1))
else XDR_SU (Item));
for N in reverse S'Range loop
S (N) := SE (U mod BB);
U := U / BB;
end loop;
if U /= 0 then
raise Data_Error;
end if;
end if;
Ada.Streams.Write (Stream.all, S);
end W_SI;
-----------
-- W_SSI --
-----------
procedure W_SSI
(Stream : not null access RST;
Item : Short_Short_Integer)
is
S : XDR_S_SSI;
U : XDR_SSU;
begin
if Optimize_Integers then
S := Short_Short_Integer_To_XDR_S_SSI (Item);
else
-- Test sign and apply two complement's notation
U := (if Item < 0
then XDR_SSU'Last xor XDR_SSU (-(Item + 1))
else XDR_SSU (Item));
S (1) := SE (U);
end if;
Ada.Streams.Write (Stream.all, S);
end W_SSI;
-----------
-- W_SSU --
-----------
procedure W_SSU
(Stream : not null access RST;
Item : Short_Short_Unsigned)
is
U : constant XDR_SSU := XDR_SSU (Item);
S : XDR_S_SSU;
begin
S (1) := SE (U);
Ada.Streams.Write (Stream.all, S);
end W_SSU;
----------
-- W_SU --
----------
procedure W_SU (Stream : not null access RST; Item : Short_Unsigned) is
S : XDR_S_SU;
U : XDR_SU := XDR_SU (Item);
begin
if Optimize_Integers then
S := Short_Unsigned_To_XDR_S_SU (Item);
else
for N in reverse S'Range loop
S (N) := SE (U mod BB);
U := U / BB;
end loop;
if U /= 0 then
raise Data_Error;
end if;
end if;
Ada.Streams.Write (Stream.all, S);
end W_SU;
---------
-- W_U --
---------
procedure W_U (Stream : not null access RST; Item : Unsigned) is
S : XDR_S_U;
U : XDR_U := XDR_U (Item);
begin
if Optimize_Integers then
S := Unsigned_To_XDR_S_U (Item);
else
for N in reverse S'Range loop
S (N) := SE (U mod BB);
U := U / BB;
end loop;
if U /= 0 then
raise Data_Error;
end if;
end if;
Ada.Streams.Write (Stream.all, S);
end W_U;
-----------
-- W_U24 --
-----------
procedure W_U24 (Stream : not null access RST; Item : Unsigned_24) is
S : XDR_S_U24;
U : XDR_U24 := XDR_U24 (Item);
begin
if Optimize_Integers then
S := Unsigned_To_XDR_S_U24 (Item);
else
for N in reverse S'Range loop
S (N) := SE (U mod BB);
U := U / BB;
end loop;
if U /= 0 then
raise Data_Error;
end if;
end if;
Ada.Streams.Write (Stream.all, S);
end W_U24;
----------
-- W_WC --
----------
procedure W_WC (Stream : not null access RST; Item : Wide_Character) is
S : XDR_S_WC;
U : XDR_WC;
begin
-- Use Ada requirements on Wide_Character representation clause
U := XDR_WC (Wide_Character'Pos (Item));
for N in reverse S'Range loop
S (N) := SE (U mod BB);
U := U / BB;
end loop;
Ada.Streams.Write (Stream.all, S);
if U /= 0 then
raise Data_Error;
end if;
end W_WC;
-----------
-- W_WWC --
-----------
procedure W_WWC
(Stream : not null access RST; Item : Wide_Wide_Character)
is
S : XDR_S_WWC;
U : XDR_WWC;
begin
-- Use Ada requirements on Wide_Wide_Character representation clause
U := XDR_WWC (Wide_Wide_Character'Pos (Item));
for N in reverse S'Range loop
S (N) := SE (U mod BB);
U := U / BB;
end loop;
Ada.Streams.Write (Stream.all, S);
if U /= 0 then
raise Data_Error;
end if;
end W_WWC;
end System.Stream_Attributes.XDR;
|
reznikmm/matreshka | Ada | 4,649 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.DOM_Documents;
with Matreshka.ODF_String_Constants;
with ODF.DOM.Iterators;
with ODF.DOM.Visitors;
package body Matreshka.ODF_Number.Format_Source_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Number_Format_Source_Attribute_Node is
begin
return Self : Number_Format_Source_Attribute_Node do
Matreshka.ODF_Number.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Number_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Number_Format_Source_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Format_Source_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Number_URI,
Matreshka.ODF_String_Constants.Format_Source_Attribute,
Number_Format_Source_Attribute_Node'Tag);
end Matreshka.ODF_Number.Format_Source_Attributes;
|
reznikmm/matreshka | Ada | 4,864 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with XML.DOM.Visitors;
with ODF.DOM.Config_Config_Item_Map_Named_Elements;
package Matreshka.ODF_Config.Config_Item_Map_Named_Elements is
type Config_Config_Item_Map_Named_Element_Node is
new Matreshka.ODF_Config.Abstract_Config_Element_Node
and ODF.DOM.Config_Config_Item_Map_Named_Elements.ODF_Config_Config_Item_Map_Named
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters)
return Config_Config_Item_Map_Named_Element_Node;
overriding function Get_Local_Name
(Self : not null access constant Config_Config_Item_Map_Named_Element_Node)
return League.Strings.Universal_String;
overriding procedure Enter_Node
(Self : not null access Config_Config_Item_Map_Named_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control);
overriding procedure Leave_Node
(Self : not null access Config_Config_Item_Map_Named_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control);
overriding procedure Visit_Node
(Self : not null access Config_Config_Item_Map_Named_Element_Node;
Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control);
end Matreshka.ODF_Config.Config_Item_Map_Named_Elements;
|
io7m/coreland-sqlite3-ada | Ada | 649 | adb | with Ada.Strings.Unbounded;
with Ada.Text_IO;
with SQLite3;
package body rowdump is
package IO renames Ada.Text_IO;
package US renames Ada.Strings.Unbounded;
procedure Row_Callback
(Column_Names : SQLite3_API.Column_Names_t;
Column_Values : SQLite3_API.Column_Values_t;
User_Data : Int_Access_t)
is
pragma Assert (User_Data /= null);
begin
IO.Put_Line ("-- row start");
for Index in Column_Names'Range loop
IO.Put_Line
(US.To_String (Column_Names (Index)) & "|" &
US.To_String (Column_Values (Index)));
end loop;
IO.Put_Line ("-- row end");
end Row_Callback;
end rowdump;
|
reznikmm/cvsweb2git | Ada | 3,725 | adb | -- BSD 3-Clause License
--
-- Copyright (c) 2017, Maxim Reznik
-- 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 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 League.Application;
with League.Calendars.ISO_8601;
with League.String_Vectors;
with League.Strings;
with CvsWeb.Loaders;
with CvsWeb.Pushers;
procedure CvsWeb2git is
function To_Date return League.Calendars.Date_Time;
Args : constant League.String_Vectors.Universal_String_Vector :=
League.Application.Arguments;
function To_Date return League.Calendars.Date_Time is
Result : League.Calendars.Date_Time :=
League.Calendars.ISO_8601.Create
(Year => 1999,
Month => 1,
Day => 1,
Hour => 0,
Minute => 0,
Second => 0,
Nanosecond_100 => 0);
begin
if Args.Length > 2 then
declare
use League.Calendars.ISO_8601;
List : constant League.String_Vectors.Universal_String_Vector :=
Args.Element (3).Split ('.');
begin
Result := League.Calendars.ISO_8601.Create
(Year => Year_Number'Wide_Wide_Value
(List (1).To_Wide_Wide_String),
Month => Month_Number'Wide_Wide_Value
(List (2).To_Wide_Wide_String),
Day => Day_Number'Wide_Wide_Value
(List (3).To_Wide_Wide_String),
Hour => Hour_Number'Wide_Wide_Value
(List (4).To_Wide_Wide_String),
Minute => Minute_Number'Wide_Wide_Value
(List (5).To_Wide_Wide_String),
Second => Second_Number'Wide_Wide_Value
(List (6).To_Wide_Wide_String),
Nanosecond_100 => 0);
end;
end if;
return Result;
end To_Date;
URL : League.Strings.Universal_String;
Root : League.Strings.Universal_String;
Loader : CvsWeb.Loaders.Loader;
Pusher : CvsWeb.Pushers.Pusher;
begin
URL := Args.Element (1);
Root := Args.Element (2);
Loader.Initialize (URL);
Pusher.Initialize (Root);
Pusher.Push (Loader, Skip => To_Date);
end CvsWeb2git;
|
reznikmm/matreshka | Ada | 5,394 | 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.Activity_Parameter_Nodes.Collections is
pragma Preelaborate;
package UML_Activity_Parameter_Node_Collections is
new AMF.Generic_Collections
(UML_Activity_Parameter_Node,
UML_Activity_Parameter_Node_Access);
type Set_Of_UML_Activity_Parameter_Node is
new UML_Activity_Parameter_Node_Collections.Set with null record;
Empty_Set_Of_UML_Activity_Parameter_Node : constant Set_Of_UML_Activity_Parameter_Node;
type Ordered_Set_Of_UML_Activity_Parameter_Node is
new UML_Activity_Parameter_Node_Collections.Ordered_Set with null record;
Empty_Ordered_Set_Of_UML_Activity_Parameter_Node : constant Ordered_Set_Of_UML_Activity_Parameter_Node;
type Bag_Of_UML_Activity_Parameter_Node is
new UML_Activity_Parameter_Node_Collections.Bag with null record;
Empty_Bag_Of_UML_Activity_Parameter_Node : constant Bag_Of_UML_Activity_Parameter_Node;
type Sequence_Of_UML_Activity_Parameter_Node is
new UML_Activity_Parameter_Node_Collections.Sequence with null record;
Empty_Sequence_Of_UML_Activity_Parameter_Node : constant Sequence_Of_UML_Activity_Parameter_Node;
private
Empty_Set_Of_UML_Activity_Parameter_Node : constant Set_Of_UML_Activity_Parameter_Node
:= (UML_Activity_Parameter_Node_Collections.Set with null record);
Empty_Ordered_Set_Of_UML_Activity_Parameter_Node : constant Ordered_Set_Of_UML_Activity_Parameter_Node
:= (UML_Activity_Parameter_Node_Collections.Ordered_Set with null record);
Empty_Bag_Of_UML_Activity_Parameter_Node : constant Bag_Of_UML_Activity_Parameter_Node
:= (UML_Activity_Parameter_Node_Collections.Bag with null record);
Empty_Sequence_Of_UML_Activity_Parameter_Node : constant Sequence_Of_UML_Activity_Parameter_Node
:= (UML_Activity_Parameter_Node_Collections.Sequence with null record);
end AMF.UML.Activity_Parameter_Nodes.Collections;
|
reznikmm/matreshka | Ada | 4,576 | 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.Print_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Style_Print_Attribute_Node is
begin
return Self : Style_Print_Attribute_Node do
Matreshka.ODF_Style.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Style_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Style_Print_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Print_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Style_URI,
Matreshka.ODF_String_Constants.Print_Attribute,
Style_Print_Attribute_Node'Tag);
end Matreshka.ODF_Style.Print_Attributes;
|
optikos/oasis | Ada | 4,569 | adb | -- Copyright (c) 2019 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
package body Program.Nodes.Formal_Discrete_Type_Definitions is
function Create
(Left_Bracket_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Box_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Right_Bracket_Token : not null Program.Lexical_Elements
.Lexical_Element_Access)
return Formal_Discrete_Type_Definition is
begin
return Result : Formal_Discrete_Type_Definition :=
(Left_Bracket_Token => Left_Bracket_Token, Box_Token => Box_Token,
Right_Bracket_Token => Right_Bracket_Token, Enclosing_Element => null)
do
Initialize (Result);
end return;
end Create;
function Create
(Is_Part_Of_Implicit : Boolean := False;
Is_Part_Of_Inherited : Boolean := False;
Is_Part_Of_Instance : Boolean := False)
return Implicit_Formal_Discrete_Type_Definition is
begin
return Result : Implicit_Formal_Discrete_Type_Definition :=
(Is_Part_Of_Implicit => Is_Part_Of_Implicit,
Is_Part_Of_Inherited => Is_Part_Of_Inherited,
Is_Part_Of_Instance => Is_Part_Of_Instance, Enclosing_Element => null)
do
Initialize (Result);
end return;
end Create;
overriding function Left_Bracket_Token
(Self : Formal_Discrete_Type_Definition)
return not null Program.Lexical_Elements.Lexical_Element_Access is
begin
return Self.Left_Bracket_Token;
end Left_Bracket_Token;
overriding function Box_Token
(Self : Formal_Discrete_Type_Definition)
return not null Program.Lexical_Elements.Lexical_Element_Access is
begin
return Self.Box_Token;
end Box_Token;
overriding function Right_Bracket_Token
(Self : Formal_Discrete_Type_Definition)
return not null Program.Lexical_Elements.Lexical_Element_Access is
begin
return Self.Right_Bracket_Token;
end Right_Bracket_Token;
overriding function Is_Part_Of_Implicit
(Self : Implicit_Formal_Discrete_Type_Definition)
return Boolean is
begin
return Self.Is_Part_Of_Implicit;
end Is_Part_Of_Implicit;
overriding function Is_Part_Of_Inherited
(Self : Implicit_Formal_Discrete_Type_Definition)
return Boolean is
begin
return Self.Is_Part_Of_Inherited;
end Is_Part_Of_Inherited;
overriding function Is_Part_Of_Instance
(Self : Implicit_Formal_Discrete_Type_Definition)
return Boolean is
begin
return Self.Is_Part_Of_Instance;
end Is_Part_Of_Instance;
procedure Initialize
(Self : aliased in out Base_Formal_Discrete_Type_Definition'Class) is
begin
null;
end Initialize;
overriding function Is_Formal_Discrete_Type_Definition_Element
(Self : Base_Formal_Discrete_Type_Definition)
return Boolean is
pragma Unreferenced (Self);
begin
return True;
end Is_Formal_Discrete_Type_Definition_Element;
overriding function Is_Formal_Type_Definition_Element
(Self : Base_Formal_Discrete_Type_Definition)
return Boolean is
pragma Unreferenced (Self);
begin
return True;
end Is_Formal_Type_Definition_Element;
overriding function Is_Definition_Element
(Self : Base_Formal_Discrete_Type_Definition)
return Boolean is
pragma Unreferenced (Self);
begin
return True;
end Is_Definition_Element;
overriding procedure Visit
(Self : not null access Base_Formal_Discrete_Type_Definition;
Visitor : in out Program.Element_Visitors.Element_Visitor'Class) is
begin
Visitor.Formal_Discrete_Type_Definition (Self);
end Visit;
overriding function To_Formal_Discrete_Type_Definition_Text
(Self : aliased in out Formal_Discrete_Type_Definition)
return Program.Elements.Formal_Discrete_Type_Definitions
.Formal_Discrete_Type_Definition_Text_Access is
begin
return Self'Unchecked_Access;
end To_Formal_Discrete_Type_Definition_Text;
overriding function To_Formal_Discrete_Type_Definition_Text
(Self : aliased in out Implicit_Formal_Discrete_Type_Definition)
return Program.Elements.Formal_Discrete_Type_Definitions
.Formal_Discrete_Type_Definition_Text_Access is
pragma Unreferenced (Self);
begin
return null;
end To_Formal_Discrete_Type_Definition_Text;
end Program.Nodes.Formal_Discrete_Type_Definitions;
|
reznikmm/matreshka | Ada | 13,009 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with AMF.CMOF.Elements.Collections;
package body AMF.Visitors.Generic_CMOF_Containment is
procedure Visit_Owned_Elements
(Self : in out CMOF_Containment_Iterator'Class;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null access AMF.CMOF.Elements.CMOF_Element'Class;
Control : in out Traverse_Control);
-- Visit members of ownedElement of the element.
-----------------------
-- Visit_Association --
-----------------------
overriding procedure Visit_Association
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Associations.CMOF_Association_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Association;
-----------------
-- Visit_Class --
-----------------
overriding procedure Visit_Class
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Classes.CMOF_Class_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Class;
-------------------
-- Visit_Comment --
-------------------
overriding procedure Visit_Comment
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Comments.CMOF_Comment_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Comment;
----------------------
-- Visit_Constraint --
----------------------
overriding procedure Visit_Constraint
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Constraints.CMOF_Constraint_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Constraint;
---------------------
-- Visit_Data_Type --
---------------------
overriding procedure Visit_Data_Type
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Data_Types.CMOF_Data_Type_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Data_Type;
--------------------------
-- Visit_Element_Import --
--------------------------
overriding procedure Visit_Element_Import
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Element_Imports.CMOF_Element_Import_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Element_Import;
-----------------------
-- Visit_Enumeration --
-----------------------
overriding procedure Visit_Enumeration
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Enumerations.CMOF_Enumeration_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Enumeration;
-------------------------------
-- Visit_Enumeration_Literal --
-------------------------------
overriding procedure Visit_Enumeration_Literal
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Enumeration_Literals.CMOF_Enumeration_Literal_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Enumeration_Literal;
----------------------
-- Visit_Expression --
----------------------
overriding procedure Visit_Expression
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Expressions.CMOF_Expression_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Expression;
-----------------------------
-- Visit_Opaque_Expression --
-----------------------------
overriding procedure Visit_Opaque_Expression
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Opaque_Expressions.CMOF_Opaque_Expression_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Opaque_Expression;
---------------------
-- Visit_Operation --
---------------------
overriding procedure Visit_Operation
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Operations.CMOF_Operation_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Operation;
--------------------------
-- Visit_Owned_Elements --
--------------------------
procedure Visit_Owned_Elements
(Self : in out CMOF_Containment_Iterator'Class;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null access AMF.CMOF.Elements.CMOF_Element'Class;
Control : in out Traverse_Control)
is
Owned_Element : constant
AMF.CMOF.Elements.Collections.Set_Of_CMOF_Element
:= Element.Get_Owned_Element;
begin
for J in 1 .. Owned_Element.Length loop
AMF.Visitors.Visit
(Self,
Visitor,
AMF.Elements.Element_Access (Owned_Element.Element (J)),
Control);
case Control is
when Continue =>
null;
when Abandon_Children =>
Control := Continue;
when Abandon_Sibling =>
Control := Continue;
exit;
when Terminate_Immediately =>
exit;
end case;
end loop;
end Visit_Owned_Elements;
-------------------
-- Visit_Package --
-------------------
overriding procedure Visit_Package
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Packages.CMOF_Package_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Package;
--------------------------
-- Visit_Package_Import --
--------------------------
overriding procedure Visit_Package_Import
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Package_Imports.CMOF_Package_Import_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Package_Import;
-------------------------
-- Visit_Package_Merge --
-------------------------
overriding procedure Visit_Package_Merge
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Package_Merges.CMOF_Package_Merge_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Package_Merge;
---------------------
-- Visit_Parameter --
---------------------
overriding procedure Visit_Parameter
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Parameters.CMOF_Parameter_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Parameter;
--------------------------
-- Visit_Primitive_Type --
--------------------------
overriding procedure Visit_Primitive_Type
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Primitive_Types.CMOF_Primitive_Type_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Primitive_Type;
--------------------
-- Visit_Property --
--------------------
overriding procedure Visit_Property
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Properties.CMOF_Property_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Property;
---------------
-- Visit_Tag --
---------------
overriding procedure Visit_Tag
(Self : in out CMOF_Containment_Iterator;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Element : not null AMF.CMOF.Tags.CMOF_Tag_Access;
Control : in out AMF.Visitors.Traverse_Control) is
begin
Self.Visit_Owned_Elements (Visitor, Element, Control);
end Visit_Tag;
end AMF.Visitors.Generic_CMOF_Containment;
|
reznikmm/matreshka | Ada | 3,724 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with XML.DOM.Attributes;
package ODF.DOM.Style_Auto_Update_Attributes is
pragma Preelaborate;
type ODF_Style_Auto_Update_Attribute is limited interface
and XML.DOM.Attributes.DOM_Attribute;
type ODF_Style_Auto_Update_Attribute_Access is
access all ODF_Style_Auto_Update_Attribute'Class
with Storage_Size => 0;
end ODF.DOM.Style_Auto_Update_Attributes;
|
klampworks/hanael | Ada | 205 | ads | with Ada.Strings.Bounded;
package Randomise is
package R_String is new Ada.Strings.Bounded.Generic_Bounded_Length(80);
procedure Randomise_String(S : in out R_String.Bounded_String);
end Randomise;
|
AdaCore/libadalang | Ada | 54 | ads | with Bar;
package Foo is
procedure Proc;
end Foo;
|
Skyfold/aws_sorter | Ada | 3,734 | adb | with GNAT.Sockets;
with common_types; use common_types;
with Ada.Text_IO;
with Ada.Containers.Vectors;
procedure server is
----------------------
-- Socket Variables --
----------------------
Server_Socket : GNAT.Sockets.Socket_Type;
Server_Address : GNAT.Sockets.Sock_Addr_Type;
Client_Socket : GNAT.Sockets.Socket_Type;
Client_Address : GNAT.Sockets.Sock_Addr_Type;
-----------------------------------------------------
-- Protected Put_Line for use by the Client_Task's --
-----------------------------------------------------
protected Protected_Put is
procedure Protected_Put_Line (S : String);
end Protected_Put;
protected body Protected_Put is
procedure Protected_Put_Line (S : String) is begin Ada.Text_IO.Put_Line (S); end Protected_Put_Line;
end Protected_Put;
------------------------
-- Define Client_Task --
------------------------
task type Client_Task is
entry Enter_Client_Info (Client_Socket_in : in GNAT.Sockets.Socket_Type;
Client_Number_in : in Positive);
end Client_Task;
type Client_Task_p is access all Client_Task;
task body Client_Task is
Client_Socket : GNAT.Sockets.Socket_Type;
Client_Stream : GNAT.Sockets.Stream_Access;
Client_Number : Positive;
Swap_String : Bounded_300.Bounded_String;
begin
-- Get the Socket to talk to the client
accept Enter_Client_Info (Client_Socket_in : in GNAT.Sockets.Socket_Type;
Client_Number_in : in Positive) do
Client_Socket := Client_Socket_in;
Client_Number := Client_Number_in;
end Enter_Client_Info;
-- Convert the Socket into a Stream
Client_Stream := GNAT.Sockets.Stream (Client_Socket);
-- Tell the client their number
Positive'Write (Client_Stream, Client_Number);
-- Continually get Strings. Stop on empty string.
loop
Bounded_300.Bounded_String'Read (Client_Stream, Swap_String);
exit when Bounded_300.Length (Swap_String) = 0;
Protected_Put.Protected_Put_Line ("Client" & Positive'Image (Client_Number) & ": " & Bounded_300.To_String (Swap_String));
end loop;
end Client_Task;
------------------------------------------
-- Swap Variable for creating new tasks --
------------------------------------------
Client_Task_Swap : Client_Task_p;
Client_Task_Counter : Natural := 0;
begin
-- Start the server socket --
GNAT.Sockets.Initialize;
GNAT.Sockets.Create_Socket (Server_Socket);
Server_Address.Addr := GNAT.Sockets.Inet_Addr ("0.0.0.0");
Server_Address.Port := 6789;
GNAT.Sockets.Set_Socket_Option (Socket => Server_Socket,
Level => GNAT.Sockets.Socket_Level,
Option => (GNAT.Sockets.Reuse_Address, True));
-- Open the Port --
GNAT.Sockets.Bind_Socket (Socket => Server_Socket,
Address => Server_Address);
loop
-- Listen for a client --
GNAT.Sockets.Listen_Socket (Server_Socket);
GNAT.Sockets.Accept_Socket (Server => Server_Socket,
Socket => Client_Socket,
Address => Client_Address);
-- Start a new task to cater for this client --
Client_Task_Swap := new Client_Task;
Client_Task_Counter := Natural'Succ (Client_Task_Counter);
-- Give the task the client socket --
Client_Task_Swap.Enter_Client_Info (Client_Socket_in => Client_Socket,
Client_Number_in => Client_Task_Counter);
end loop;
-- GNAT.Sockets.Close_Socket (Server_Socket);
end server;
|
kjseefried/coreland-cgbc | Ada | 2,354 | adb | with Ada.Strings;
with CGBC.Bounded_Strings;
with Test;
procedure T_Bstr_Element_02 is
package BS renames CGBC.Bounded_Strings;
TC : Test.Context_t;
S1 : BS.Bounded_String (8);
Error : Boolean;
begin
Test.Initialize
(Test_Context => TC,
Program => "t_bstr_element_02",
Test_DB => "TEST_DB",
Test_Results => "TEST_RESULTS");
BS.Append (S1, "ABCD");
pragma Assert (BS.Length (S1) = 4);
BS.Replace_Element
(Source => S1,
Index => 1,
By => '0');
Test.Check (TC, 256, BS.Element (S1, 1) = '0', "BS.Element (S1, 1) = '0'");
Test.Check (TC, 257, BS.Element (S1, 2) = 'B', "BS.Element (S1, 2) = 'B'");
Test.Check (TC, 258, BS.Element (S1, 3) = 'C', "BS.Element (S1, 3) = 'C'");
Test.Check (TC, 259, BS.Element (S1, 4) = 'D', "BS.Element (S1, 4) = 'D'");
Test.Check (TC, 260, BS.Length (S1) = 4, "BS.Length (S1) = 4");
Test.Check (TC, 261, BS.Maximum_Length (S1) = 8, "BS.Maximum_Length (S1) = 8");
BS.Replace_Element
(Source => S1,
Index => 2,
By => '1');
Test.Check (TC, 262, BS.Element (S1, 1) = '0', "BS.Element (S1, 1) = '0'");
Test.Check (TC, 263, BS.Element (S1, 2) = '1', "BS.Element (S1, 2) = '1'");
Test.Check (TC, 264, BS.Element (S1, 3) = 'C', "BS.Element (S1, 3) = 'C'");
Test.Check (TC, 265, BS.Element (S1, 4) = 'D', "BS.Element (S1, 4) = 'D'");
BS.Replace_Element
(Source => S1,
Index => 3,
By => '2');
Test.Check (TC, 266, BS.Element (S1, 1) = '0', "BS.Element (S1, 1) = '0'");
Test.Check (TC, 267, BS.Element (S1, 2) = '1', "BS.Element (S1, 2) = '1'");
Test.Check (TC, 268, BS.Element (S1, 3) = '2', "BS.Element (S1, 3) = '2'");
Test.Check (TC, 269, BS.Element (S1, 4) = 'D', "BS.Element (S1, 4) = 'D'");
BS.Replace_Element
(Source => S1,
Index => 4,
By => '3');
Test.Check (TC, 270, BS.Element (S1, 1) = '0', "BS.Element (S1, 1) = '0'");
Test.Check (TC, 271, BS.Element (S1, 2) = '1', "BS.Element (S1, 2) = '1'");
Test.Check (TC, 272, BS.Element (S1, 3) = '2', "BS.Element (S1, 3) = '2'");
Test.Check (TC, 273, BS.Element (S1, 4) = '3', "BS.Element (S1, 4) = '3'");
Error := False;
begin
BS.Replace_Element (S1, 5, 'A');
exception
when Ada.Strings.Index_Error => Error := True;
end;
Test.Check (TC, 274, Error, "Error");
end T_Bstr_Element_02;
|
o-oconnell/minixfromscratch | Ada | 13,132 | adb | ----------------------------------------------------------------
-- ZLib for Ada thick binding. --
-- --
-- Copyright (C) 2002-2003 Dmitriy Anisimkov --
-- --
-- Open source license information is in the zlib.ads file. --
----------------------------------------------------------------
-- $Id$
-- The program has a few aims.
-- 1. Test ZLib.Ada95 thick binding functionality.
-- 2. Show the example of use main functionality of the ZLib.Ada95 binding.
-- 3. Build this program automatically compile all ZLib.Ada95 packages under
-- GNAT Ada95 compiler.
with ZLib.Streams;
with Ada.Streams.Stream_IO;
with Ada.Numerics.Discrete_Random;
with Ada.Text_IO;
with Ada.Calendar;
procedure Test is
use Ada.Streams;
use Stream_IO;
------------------------------------
-- Test configuration parameters --
------------------------------------
File_Size : Count := 100_000;
Continuous : constant Boolean := False;
Header : constant ZLib.Header_Type := ZLib.Default;
-- ZLib.None;
-- ZLib.Auto;
-- ZLib.GZip;
-- Do not use Header other then Default in ZLib versions 1.1.4
-- and older.
Strategy : constant ZLib.Strategy_Type := ZLib.Default_Strategy;
Init_Random : constant := 10;
-- End --
In_File_Name : constant String := "testzlib.in";
-- Name of the input file
Z_File_Name : constant String := "testzlib.zlb";
-- Name of the compressed file.
Out_File_Name : constant String := "testzlib.out";
-- Name of the decompressed file.
File_In : File_Type;
File_Out : File_Type;
File_Back : File_Type;
File_Z : ZLib.Streams.Stream_Type;
Filter : ZLib.Filter_Type;
Time_Stamp : Ada.Calendar.Time;
procedure Generate_File;
-- Generate file of spetsified size with some random data.
-- The random data is repeatable, for the good compression.
procedure Compare_Streams
(Left, Right : in out Root_Stream_Type'Class);
-- The procedure compearing data in 2 streams.
-- It is for compare data before and after compression/decompression.
procedure Compare_Files (Left, Right : String);
-- Compare files. Based on the Compare_Streams.
procedure Copy_Streams
(Source, Target : in out Root_Stream_Type'Class;
Buffer_Size : in Stream_Element_Offset := 1024);
-- Copying data from one stream to another. It is for test stream
-- interface of the library.
procedure Data_In
(Item : out Stream_Element_Array;
Last : out Stream_Element_Offset);
-- this procedure is for generic instantiation of
-- ZLib.Generic_Translate.
-- reading data from the File_In.
procedure Data_Out (Item : in Stream_Element_Array);
-- this procedure is for generic instantiation of
-- ZLib.Generic_Translate.
-- writing data to the File_Out.
procedure Stamp;
-- Store the timestamp to the local variable.
procedure Print_Statistic (Msg : String; Data_Size : ZLib.Count);
-- Print the time statistic with the message.
procedure Translate is new ZLib.Generic_Translate
(Data_In => Data_In,
Data_Out => Data_Out);
-- This procedure is moving data from File_In to File_Out
-- with compression or decompression, depend on initialization of
-- Filter parameter.
-------------------
-- Compare_Files --
-------------------
procedure Compare_Files (Left, Right : String) is
Left_File, Right_File : File_Type;
begin
Open (Left_File, In_File, Left);
Open (Right_File, In_File, Right);
Compare_Streams (Stream (Left_File).all, Stream (Right_File).all);
Close (Left_File);
Close (Right_File);
end Compare_Files;
---------------------
-- Compare_Streams --
---------------------
procedure Compare_Streams
(Left, Right : in out Ada.Streams.Root_Stream_Type'Class)
is
Left_Buffer, Right_Buffer : Stream_Element_Array (0 .. 16#FFF#);
Left_Last, Right_Last : Stream_Element_Offset;
begin
loop
Read (Left, Left_Buffer, Left_Last);
Read (Right, Right_Buffer, Right_Last);
if Left_Last /= Right_Last then
Ada.Text_IO.Put_Line ("Compare error :"
& Stream_Element_Offset'Image (Left_Last)
& " /= "
& Stream_Element_Offset'Image (Right_Last));
raise Constraint_Error;
elsif Left_Buffer (0 .. Left_Last)
/= Right_Buffer (0 .. Right_Last)
then
Ada.Text_IO.Put_Line ("ERROR: IN and OUT files is not equal.");
raise Constraint_Error;
end if;
exit when Left_Last < Left_Buffer'Last;
end loop;
end Compare_Streams;
------------------
-- Copy_Streams --
------------------
procedure Copy_Streams
(Source, Target : in out Ada.Streams.Root_Stream_Type'Class;
Buffer_Size : in Stream_Element_Offset := 1024)
is
Buffer : Stream_Element_Array (1 .. Buffer_Size);
Last : Stream_Element_Offset;
begin
loop
Read (Source, Buffer, Last);
Write (Target, Buffer (1 .. Last));
exit when Last < Buffer'Last;
end loop;
end Copy_Streams;
-------------
-- Data_In --
-------------
procedure Data_In
(Item : out Stream_Element_Array;
Last : out Stream_Element_Offset) is
begin
Read (File_In, Item, Last);
end Data_In;
--------------
-- Data_Out --
--------------
procedure Data_Out (Item : in Stream_Element_Array) is
begin
Write (File_Out, Item);
end Data_Out;
-------------------
-- Generate_File --
-------------------
procedure Generate_File is
subtype Visible_Symbols is Stream_Element range 16#20# .. 16#7E#;
package Random_Elements is
new Ada.Numerics.Discrete_Random (Visible_Symbols);
Gen : Random_Elements.Generator;
Buffer : Stream_Element_Array := (1 .. 77 => 16#20#) & 10;
Buffer_Count : constant Count := File_Size / Buffer'Length;
-- Number of same buffers in the packet.
Density : constant Count := 30; -- from 0 to Buffer'Length - 2;
procedure Fill_Buffer (J, D : in Count);
-- Change the part of the buffer.
-----------------
-- Fill_Buffer --
-----------------
procedure Fill_Buffer (J, D : in Count) is
begin
for K in 0 .. D loop
Buffer
(Stream_Element_Offset ((J + K) mod (Buffer'Length - 1) + 1))
:= Random_Elements.Random (Gen);
end loop;
end Fill_Buffer;
begin
Random_Elements.Reset (Gen, Init_Random);
Create (File_In, Out_File, In_File_Name);
Fill_Buffer (1, Buffer'Length - 2);
for J in 1 .. Buffer_Count loop
Write (File_In, Buffer);
Fill_Buffer (J, Density);
end loop;
-- fill remain size.
Write
(File_In,
Buffer
(1 .. Stream_Element_Offset
(File_Size - Buffer'Length * Buffer_Count)));
Flush (File_In);
Close (File_In);
end Generate_File;
---------------------
-- Print_Statistic --
---------------------
procedure Print_Statistic (Msg : String; Data_Size : ZLib.Count) is
use Ada.Calendar;
use Ada.Text_IO;
package Count_IO is new Integer_IO (ZLib.Count);
Curr_Dur : Duration := Clock - Time_Stamp;
begin
Put (Msg);
Set_Col (20);
Ada.Text_IO.Put ("size =");
Count_IO.Put
(Data_Size,
Width => Stream_IO.Count'Image (File_Size)'Length);
Put_Line (" duration =" & Duration'Image (Curr_Dur));
end Print_Statistic;
-----------
-- Stamp --
-----------
procedure Stamp is
begin
Time_Stamp := Ada.Calendar.Clock;
end Stamp;
begin
Ada.Text_IO.Put_Line ("ZLib " & ZLib.Version);
loop
Generate_File;
for Level in ZLib.Compression_Level'Range loop
Ada.Text_IO.Put_Line ("Level ="
& ZLib.Compression_Level'Image (Level));
-- Test generic interface.
Open (File_In, In_File, In_File_Name);
Create (File_Out, Out_File, Z_File_Name);
Stamp;
-- Deflate using generic instantiation.
ZLib.Deflate_Init
(Filter => Filter,
Level => Level,
Strategy => Strategy,
Header => Header);
Translate (Filter);
Print_Statistic ("Generic compress", ZLib.Total_Out (Filter));
ZLib.Close (Filter);
Close (File_In);
Close (File_Out);
Open (File_In, In_File, Z_File_Name);
Create (File_Out, Out_File, Out_File_Name);
Stamp;
-- Inflate using generic instantiation.
ZLib.Inflate_Init (Filter, Header => Header);
Translate (Filter);
Print_Statistic ("Generic decompress", ZLib.Total_Out (Filter));
ZLib.Close (Filter);
Close (File_In);
Close (File_Out);
Compare_Files (In_File_Name, Out_File_Name);
-- Test stream interface.
-- Compress to the back stream.
Open (File_In, In_File, In_File_Name);
Create (File_Back, Out_File, Z_File_Name);
Stamp;
ZLib.Streams.Create
(Stream => File_Z,
Mode => ZLib.Streams.Out_Stream,
Back => ZLib.Streams.Stream_Access
(Stream (File_Back)),
Back_Compressed => True,
Level => Level,
Strategy => Strategy,
Header => Header);
Copy_Streams
(Source => Stream (File_In).all,
Target => File_Z);
-- Flushing internal buffers to the back stream.
ZLib.Streams.Flush (File_Z, ZLib.Finish);
Print_Statistic ("Write compress",
ZLib.Streams.Write_Total_Out (File_Z));
ZLib.Streams.Close (File_Z);
Close (File_In);
Close (File_Back);
-- Compare reading from original file and from
-- decompression stream.
Open (File_In, In_File, In_File_Name);
Open (File_Back, In_File, Z_File_Name);
ZLib.Streams.Create
(Stream => File_Z,
Mode => ZLib.Streams.In_Stream,
Back => ZLib.Streams.Stream_Access
(Stream (File_Back)),
Back_Compressed => True,
Header => Header);
Stamp;
Compare_Streams (Stream (File_In).all, File_Z);
Print_Statistic ("Read decompress",
ZLib.Streams.Read_Total_Out (File_Z));
ZLib.Streams.Close (File_Z);
Close (File_In);
Close (File_Back);
-- Compress by reading from compression stream.
Open (File_Back, In_File, In_File_Name);
Create (File_Out, Out_File, Z_File_Name);
ZLib.Streams.Create
(Stream => File_Z,
Mode => ZLib.Streams.In_Stream,
Back => ZLib.Streams.Stream_Access
(Stream (File_Back)),
Back_Compressed => False,
Level => Level,
Strategy => Strategy,
Header => Header);
Stamp;
Copy_Streams
(Source => File_Z,
Target => Stream (File_Out).all);
Print_Statistic ("Read compress",
ZLib.Streams.Read_Total_Out (File_Z));
ZLib.Streams.Close (File_Z);
Close (File_Out);
Close (File_Back);
-- Decompress to decompression stream.
Open (File_In, In_File, Z_File_Name);
Create (File_Back, Out_File, Out_File_Name);
ZLib.Streams.Create
(Stream => File_Z,
Mode => ZLib.Streams.Out_Stream,
Back => ZLib.Streams.Stream_Access
(Stream (File_Back)),
Back_Compressed => False,
Header => Header);
Stamp;
Copy_Streams
(Source => Stream (File_In).all,
Target => File_Z);
Print_Statistic ("Write decompress",
ZLib.Streams.Write_Total_Out (File_Z));
ZLib.Streams.Close (File_Z);
Close (File_In);
Close (File_Back);
Compare_Files (In_File_Name, Out_File_Name);
end loop;
Ada.Text_IO.Put_Line (Count'Image (File_Size) & " Ok.");
exit when not Continuous;
File_Size := File_Size + 1;
end loop;
end Test;
|
Letractively/ada-ado | Ada | 1,348 | ads | -----------------------------------------------------------------------
-- ado-parameters-tests -- Test query parameters and SQL expansion
-- Copyright (C) 2011, 2012 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Util.Tests;
package ADO.Parameters.Tests is
procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite);
type Test is new Util.Tests.Test with null record;
-- Test expand SQL with parameters.
procedure Test_Expand_Sql (T : in out Test);
-- Test expand with invalid parameters.
procedure Test_Expand_Error (T : in out Test);
-- Test expand performance.
procedure Test_Expand_Perf (T : in out Test);
end ADO.Parameters.Tests;
|
reznikmm/matreshka | Ada | 4,631 | 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_Dr3d.Ambient_Color_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Dr3d_Ambient_Color_Attribute_Node is
begin
return Self : Dr3d_Ambient_Color_Attribute_Node do
Matreshka.ODF_Dr3d.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Dr3d_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Dr3d_Ambient_Color_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Ambient_Color_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Dr3d_URI,
Matreshka.ODF_String_Constants.Ambient_Color_Attribute,
Dr3d_Ambient_Color_Attribute_Node'Tag);
end Matreshka.ODF_Dr3d.Ambient_Color_Attributes;
|
stcarrez/ada-awa | Ada | 1,121 | ads | -----------------------------------------------------------------------
-- awa-helpers -- Helpers for AWA applications
-- Copyright (C) 2011, 2013 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 ADO;
with Util.Beans.Objects;
package AWA.Helpers is
-- Get the value as an identifier.
-- Returns NO_IDENTIFIER if the value is invalid.
function To_Identifier (Value : in Util.Beans.Objects.Object) return ADO.Identifier;
end AWA.Helpers;
|
reznikmm/matreshka | Ada | 4,607 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.DOM_Documents;
with Matreshka.ODF_String_Constants;
with ODF.DOM.Iterators;
with ODF.DOM.Visitors;
package body Matreshka.ODF_Text.Identifier_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Text_Identifier_Attribute_Node is
begin
return Self : Text_Identifier_Attribute_Node do
Matreshka.ODF_Text.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Text_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Text_Identifier_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Identifier_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Text_URI,
Matreshka.ODF_String_Constants.Identifier_Attribute,
Text_Identifier_Attribute_Node'Tag);
end Matreshka.ODF_Text.Identifier_Attributes;
|
reznikmm/matreshka | Ada | 3,789 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with XML.DOM.Attributes;
package ODF.DOM.Table_Label_Cell_Range_Address_Attributes is
pragma Preelaborate;
type ODF_Table_Label_Cell_Range_Address_Attribute is limited interface
and XML.DOM.Attributes.DOM_Attribute;
type ODF_Table_Label_Cell_Range_Address_Attribute_Access is
access all ODF_Table_Label_Cell_Range_Address_Attribute'Class
with Storage_Size => 0;
end ODF.DOM.Table_Label_Cell_Range_Address_Attributes;
|
twdroeger/ada-awa | Ada | 1,765 | ads | -----------------------------------------------------------------------
-- awa-commands-tests -- Test the AWA.Commands
-- Copyright (C) 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 Util.Tests;
with Ada.Strings.Unbounded;
package AWA.Commands.Tests is
procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite);
type Test is new Util.Tests.Test with null record;
-- Test start and stop command.
procedure Test_Start_Stop (T : in out Test);
procedure Test_List_Tables (T : in out Test);
-- Test the list -u command.
procedure Test_List_Users (T : in out Test);
-- Test the list -s command.
procedure Test_List_Sessions (T : in out Test);
-- Test the list -j command.
procedure Test_List_Jobs (T : in out Test);
procedure Execute (T : in out Test;
Command : in String;
Input : in String;
Output : in String;
Result : out Ada.Strings.Unbounded.Unbounded_String;
Status : in Natural := 0);
end AWA.Commands.Tests;
|
mulander/crawler | Ada | 4,859 | adb | -- Copyright (c) 2012, mulander <[email protected]>
-- All rights reserved.
-- Use of this source code is governed by a BSD-style license that can be
-- found in the LICENSE file.
with Terminal_Interface.Curses;
with Crawler_Interface;
with Crawler.Entities;
procedure Main
is
package Curses renames Terminal_Interface.Curses;
package Entities renames Crawler.Entities;
Key : Curses.Key_Code;
-- Start ncurses
Screen : Crawler_Interface.Screen;
procedure Game_Loop
is
use type Curses.Line_Position;
use type Curses.Column_Position;
Key : Curses.Key_Code := Curses.Key_Home;
-- The C++ implementation doesn't refresh on each
-- tick so we also retrieve the dimensions on start.
-- Lines : Curses.Line_Count := Screen.Get_Height;
-- Columns : Curses.Column_Count := Screen.Get_Width;
Game_Map : Crawler_Interface.Frame;
Viewport : Crawler_Interface.Frame;
begin
-- Create an ncurses window to store the game map. This will be twice the size
-- of the screen and it will be positioned at (0,0) in screen coordinates
Game_Map.Make (Height => 2 * Screen.Get_Height + 1
,Width => 2 * Screen.Get_Width
,Row => 0
,Col => 0);
-- Create an ncurses subwindow of the game map. This will have the size
-- of the user screen and it will be initially postioned at (0, 0)
Viewport.Make_Sub_Window (Parent => Game_Map
,Height => Screen.Get_Height
,Width => Screen.Get_Width
,Row => 0
,Col => 0);
-- Initialize the main character. We are going to put this in the middle of
-- the game map (for now)
declare
Main_Character : Entities.Character := Entities.Make (Symbol => '@',
Row => Game_Map.Get_Height / 2,
Col => Game_Map.Get_Width / 2);
Row : Curses.Line_Position;
Col : Curses.Column_Position;
begin
-- Fill the game map with numbers
Game_Map.Fill_Window;
-- Compared to the original, just one print of the main characer is
-- all we need to update our current position as all of our options
-- are related to the player updating his position.
Game_Map.Add (Character => Main_Character);
-- ,Row => Row
-- ,Col => Col);
Viewport.Center (Character => Main_Character);
Viewport.Refresh;
-- Start the game loop
loop
-- Wait until the user presses a key
Key := Curses.Get_Keystroke; --getch();
Row := Entities.Get_Row (Main_Character);
Col := Entities.Get_Col (Main_Character);
-- Clear the screen
-- Curses.Clear;
-- We have one Erase call as we need to perform it before each move command
-- no need to repeat if four times.
---Erase(Entities.Get_Row(Main_Character),Entities.Get_Col(Main_Character));
-- Compared to the original snippet, we drop refresh()
-- as it seems to be not needed if we don't use the printw family
-- of functions. Refresh draws the 'virtual' screen to the display
-- and it seems to be also done by Curses.Add in our example.
case Key is
when Curses.Real_Key_Code(Character'Pos('q')) | Curses.Real_Key_Code(Character'Pos('Q')) =>
exit;
when Curses.KEY_LEFT =>
Game_Map.add (Main_Character, Row, Col-1);
when Curses.KEY_RIGHT =>
Game_Map.add (Main_Character, Row, Col+1);
when Curses.KEY_UP =>
Game_Map.add (Main_Character, Row-1, Col);
when Curses.KEY_DOWN =>
Game_Map.add (Main_Character, Row+1, Col);
when others => -- If the user choses to stay, show the main character at position (Row,Col)
null;
end case;
Viewport.Center (Character => Main_Character);
Viewport.Refresh;
end loop;
end;
end Game_Loop;
begin
-- Printw is not ported binded by design
-- Print a welcome message on the screen
Screen.Add (Str => "Welcome to RR game." & Standard.ASCII.LF);
Screen.Add (Str => "Press any key to start." & Standard.ASCII.LF);
Screen.Add (Str => "If you want to quit press ""q"" or ""Q""");
Key := Curses.Get_Keystroke;
if Integer(Key) not in Character'Pos('Q')|Character'Pos('q')
then
Curses.Clear;
-- Start the game loop
Game_Loop;
end if;
end Main;
|
wookey-project/ewok-legacy | Ada | 2,875 | 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 system;
package soc.pwr is
-----------------------------------------
-- PWR power control register (PWR_CR) --
-- for STM32F42xxx and STM32F43xxx --
-----------------------------------------
type t_vos is (VOS_SCALE3, VOS_SCALE2, VOS_SCALE1) with size => 2;
for t_vos use
(VOS_SCALE3 => 2#01#,
VOS_SCALE2 => 2#10#,
VOS_SCALE1 => 2#11#);
type t_PWR_CR is record
LPDS : bit;
PDDS : bit;
CWUF : bit;
CSBF : bit;
PVDE : bit;
PLS : bits_3;
DBP : bit;
FPDS : bit;
LPUDS : bit;
MRUDS : bit;
reserved_12_12 : bit;
ADCDC1 : bit;
VOS : t_vos;
ODEN : bit;
ODSWEN : bit;
UDEN : bits_2;
reserved_20_31 : bits_12;
end record
with volatile_full_access, size => 32;
for t_PWR_CR use record
LPDS at 0 range 0 .. 0;
PDDS at 0 range 1 .. 1;
CWUF at 0 range 2 .. 2;
CSBF at 0 range 3 .. 3;
PVDE at 0 range 4 .. 4;
PLS at 0 range 5 .. 7;
DBP at 0 range 8 .. 8;
FPDS at 0 range 9 .. 9;
LPUDS at 0 range 10 .. 10;
MRUDS at 0 range 11 .. 11;
reserved_12_12 at 0 range 12 .. 12;
ADCDC1 at 0 range 13 .. 13;
VOS at 0 range 14 .. 15;
ODEN at 0 range 16 .. 16;
ODSWEN at 0 range 17 .. 17;
UDEN at 0 range 18 .. 19;
reserved_20_31 at 0 range 20 .. 31;
end record;
--------------------
-- PWR peripheral --
--------------------
type t_PWR_peripheral is record
CR : t_PWR_CR;
end record
with volatile;
for t_PWR_peripheral use record
CR at 16#00# range 0 .. 31;
end record;
PWR : t_PWR_peripheral
with
import,
volatile,
address => system'to_address(16#4000_7000#);
end soc.pwr;
|
jscparker/math_packages | Ada | 3,710 | ads |
-- PACKAGE Cholesky_LU
--
-- Cholesky's algorithm for LU decomposition of Real positive-definite
-- square matrices. Positive definite matrices are a special class of
-- symmetric, non-singular matrices for which no pivioting is required
-- in LU decomposition. LU_decompose factors the matrix A into A = L*U,
-- where U = transpose(L). LU_Decompose writes over A with L and U.
-- U is upper triangular, and is placed in the upper triangular part of A.
--
-- The procedure does not test the matrix for positive definiteness.
-- (A good way to test for positive definiteness is to run LU_decompose
-- on it to see if Constraint_Error is raised.) All positive definite
-- matrices are symmetric and their central diagonals have no zero
-- valued elements or negative valued elements.
--
-- A square (N X N) matrix with elements of generic type Real
-- is input as "A" and returned in LU form. A must be symmetric. This
-- isn't tested. Instead only the lower triangle of A is read. It
-- is assumed that the upper triangle of A is the transpose of the lower.
--
-- The LU form of A can be used to solve simultaneous linear
-- equations of the form A*X = B. The column vector B is input
-- into procedure Solve, and the solution is returned as X.
--
generic
type Real is digits <>;
type Index is range <>;
-- Defines the maximum size that the matrix can be.
-- The maximum matrix will be (N X N) where
-- N = Index'Last - Index'First + 1. This is the storage
-- set aside for the matrix, but the user may use the routines
-- below on matrices of any size up to and including (N X N).
type Matrix is array(Index, Index) of Real;
-- Row major form is appropriate for Matrix * Col_Vector_Vector
-- operations, which dominate the algorithm in procedure Solve.
package Cholesky_LU is
type Row_Vector is array(Index) of Real;
subtype Col_Vector is Row_Vector;
procedure LU_Decompose
(A : in out Matrix; -- A is over-written with LU.
Diag_Inverse : out Col_Vector;
Final_Index : in Index := Index'Last;
Starting_Index : in Index := Index'First);
-- Destroys A and writes over it with the LU decomposition of A.
-- Only operates in range Starting_Index .. Final_Index.
-- A must be symmetric (not checked).
-- Constraint_Error is raised if A is not positive definite.
-- Constraint_Error is raised if evidence of singularity is detected.
-- In both cases this evidence may be due to numerical error.
procedure Solve
(X : out Col_Vector;
B : in Col_Vector;
A_LU : in Matrix;
Diag_Inverse : in Col_Vector;
Final_Index : in Index := Index'Last;
Starting_Index : in Index := Index'First);
-- Solves for X in the equation A*X = b. You enter the LU
-- decomposition of A, not A itself. A_Lu and Diag_Inverse are
-- the objects returned by LU_decompose.
function Product
(A : in Matrix;
X : in Col_Vector;
Final_Index : in Index := Index'Last;
Starting_Index : in Index := Index'First)
return Col_Vector;
-- Matrix vector multiplication.
function "-"(A, B : in Col_Vector) return Col_Vector;
private
Zero : constant Real := (+0.0);
One : constant Real := (+1.0);
Two : constant Real := (+2.0);
Min_Allowed_Real : constant Real := Two ** (Real'Machine_Emin + 4);
-- Must be positive. If pivots are found to be smaller than this, then
-- it is taken as evidence that the matrix is not postive definite,
-- and Constraint_Error is raised.
end Cholesky_LU;
|
tum-ei-rcs/StratoX | Ada | 15,143 | adb | with Ada.Real_Time; use Ada.Real_Time;
with Ada.Unchecked_Conversion;
with Ada.Interrupts.Names;
with STM32.Device; use STM32.Device;
with STM32.DMA2D.Interrupt;
with STM32.DMA2D.Polling;
with STM32.GPIO; use STM32.GPIO;
with STM32.DSI; use STM32.DSI;
with STM32.SDRAM; use STM32.SDRAM;
with STM32_SVD.DSIHOST; use STM32_SVD.DSIHOST;
with STM32_SVD.RCC; use STM32_SVD.RCC;
with STM32_SVD.LTDC; use STM32_SVD.LTDC;
package body Framebuffer_OTM8009A is
LCD_XRES : GPIO_Point renames PH7;
PLLSAIN : constant := 417;
PLLSAIR : constant := 5;
PLLSAI_DIVR : constant := 2;
protected Sync is
entry Wait;
procedure Do_Refresh;
private
procedure End_Of_Refresh_Callback;
procedure Tearing_Effect_Callback;
procedure Interrupt
with Attach_Handler => Ada.Interrupts.Names.DSI_Interrupt,
Unreferenced;
Refreshed : Boolean := True;
end Sync;
procedure LCD_Reset;
procedure Initialize_Device (Display : in out Frame_Buffer);
----------
-- Sync --
----------
protected body Sync is
----------
-- Wait --
----------
entry Wait when Refreshed is
begin
null;
end Wait;
----------------
-- Do_Refresh --
----------------
procedure Do_Refresh is
begin
Refreshed := False;
-- Enable the end of refresh interrupt
DSIHOST.DSI_Refresh;
end Do_Refresh;
-----------------------------
-- End_Of_Refresh_Callback --
-----------------------------
procedure End_Of_Refresh_Callback
is
begin
Refreshed := True;
end End_Of_Refresh_Callback;
-----------------------------
-- Tearing_Effect_Callback --
-----------------------------
procedure Tearing_Effect_Callback
is
begin
null;
end Tearing_Effect_Callback;
---------------
-- Interrupt --
---------------
procedure Interrupt
is
begin
if DSIHOST_Periph.DSI_WISR.ERIF then
DSIHOST_Periph.DSI_WIFCR.CERIF := True;
End_Of_Refresh_Callback;
end if;
if DSIHOST_Periph.DSI_WISR.TEIF then
DSIHOST_Periph.DSI_WIFCR.CTEIF := True;
Tearing_Effect_Callback;
end if;
end Interrupt;
end Sync;
---------------
-- LCD_Reset --
---------------
procedure LCD_Reset is
begin
Enable_Clock (LCD_XRES);
Configure_IO (LCD_XRES,
(Mode => Mode_Out,
Output_Type => Open_Drain,
Speed => Speed_50MHz,
Resistors => Floating));
-- Activate XRES active low
Clear (LCD_XRES);
delay until Clock + Microseconds (20);
Set (LCD_XRES);
delay until Clock + Microseconds (10);
end LCD_Reset;
--------------------
-- Get_Max_Layers --
--------------------
overriding function Get_Max_Layers
(Display : Frame_Buffer) return Positive
is
pragma Unreferenced (Display);
begin
return 2;
end Get_Max_Layers;
------------------
-- Is_Supported --
------------------
overriding function Is_Supported
(Display : Frame_Buffer;
Mode : HAL.Framebuffer.FB_Color_Mode) return Boolean
is
pragma Unreferenced (Display, Mode);
begin
-- The LTDC supports all HAL color modes
return True;
end Is_Supported;
---------------
-- Get_Width --
---------------
overriding function Get_Width
(Display : Frame_Buffer) return Positive
is
begin
if not Display.Swapped then
return LCD_Natural_Width;
else
return LCD_Natural_Height;
end if;
end Get_Width;
----------------
-- Get_Height --
----------------
overriding function Get_Height
(Display : Frame_Buffer) return Positive
is
begin
if not Display.Swapped then
return LCD_Natural_Height;
else
return LCD_Natural_Width;
end if;
end Get_Height;
----------------
-- Is_Swapped --
----------------
overriding function Is_Swapped
(Display : Frame_Buffer) return Boolean
is
pragma Unreferenced (Display);
begin
-- The display supports natively the swap of the X/Y coordinates.
-- So to the outside world (e.g. bitmap operations), the buffer always
-- has to be treated as 'native orientation'
return False;
end Is_Swapped;
--------------------
-- Set_Background --
--------------------
overriding procedure Set_Background
(Display : Frame_Buffer; R, G, B : Byte)
is
pragma Unreferenced (Display);
begin
DSIHOST.DSI_Wrapper_Disable;
STM32.LTDC.Set_Background (R, G, B);
DSIHOST.DSI_Wrapper_Enable;
end Set_Background;
-----------------------
-- Initialize_Device --
-----------------------
procedure Initialize_Device (Display : in out Frame_Buffer)
is
begin
DSIHOST.DSI_Deinit;
-- HSE input: 25MHz / IN_Div * N_Div => 1000 MHz = VCO
-- VCO / ODF => 500 MHz
DSIHOST.DSI_Initialize
(Auto_Clock_Lane_Control => True,
TX_Escape_Clock_Division => 4, -- 62500 / 4 = 15625 kHz < 20kHz (max)
Number_Of_Lanes => Two_Data_Lanes,
PLL_N_Div => 125,
PLL_IN_Div => PLL_IN_DIV2,
PLL_OUT_Div => PLL_OUT_DIV1);
DSIHOST.DSI_Setup_Adapted_Command_Mode
(Virtual_Channel => LCD_Channel,
Color_Coding => STM32.DSI.RGB888,
Command_Size => Short (Display.Get_Width),
Tearing_Effect_Source => STM32.DSI.TE_DSI_Link,
Tearing_Effect_Polarity => STM32.DSI.Rising_Edge,
HSync_Polarity => STM32.DSI.Active_High,
VSync_Polarity => STM32.DSI.Active_High,
DataEn_Polarity => STM32.DSI.Active_High,
VSync_Edge => STM32.DSI.Falling_Edge,
Automatic_Refresh => False,
TE_Acknowledge_Request => True);
DSIHOST.DSI_Setup_Command
(LP_Gen_Short_Write_No_P => True,
LP_Gen_Short_Write_One_P => True,
LP_Gen_Short_Write_Two_P => True,
LP_Gen_Short_Read_No_P => True,
LP_Gen_Short_Read_One_P => True,
LP_Gen_Short_Read_Two_P => True,
LP_Gen_Long_Write => True,
LP_DCS_Short_Write_No_P => True,
LP_DCS_Short_Write_One_P => True,
LP_DCS_Short_Read_No_P => True,
LP_DCS_Long_Write => True,
LP_Max_Read_Packet => True,
Acknowledge_Request => False);
STM32.LTDC.Initialize
(Width => Display.Get_Width,
Height => Display.Get_Height,
H_Sync => 2,
H_Back_Porch => 1,
H_Front_Porch => 1,
V_Sync => 2,
V_Back_Porch => 1,
V_Front_Porch => 1,
PLLSAI_N => PLLSAIN,
PLLSAI_R => PLLSAIR,
DivR => PLLSAI_DIVR);
-- Enable the DSI Host and Wrapper
DSIHOST.DSI_Start;
-- LCD panel init
Display.Device.Initialize
(OTM8009A.RGB888,
(if Display.Swapped then OTM8009A.Portrait else OTM8009A.Landscape));
DSIHOST.DSI_Setup_Command
(LP_Gen_Short_Write_No_P => False,
LP_Gen_Short_Write_One_P => False,
LP_Gen_Short_Write_Two_P => False,
LP_Gen_Short_Read_No_P => False,
LP_Gen_Short_Read_One_P => False,
LP_Gen_Short_Read_Two_P => False,
LP_Gen_Long_Write => False,
LP_DCS_Short_Write_No_P => False,
LP_DCS_Short_Write_One_P => False,
LP_DCS_Short_Read_No_P => False,
LP_DCS_Long_Write => False,
LP_Max_Read_Packet => False,
Acknowledge_Request => False);
DSIHOST.DSI_Setup_Flow_Control (Flow_Control_BTA);
DSIHOST.DSI_Refresh;
end Initialize_Device;
----------------
-- Initialize --
----------------
procedure Initialize
(Display : in out Frame_Buffer;
Orientation : HAL.Framebuffer.Display_Orientation := Default;
Mode : HAL.Framebuffer.Wait_Mode := Interrupt)
is
begin
LCD_Reset;
-- Init clocks on DSI, LTDC and DMA2D
RCC_Periph.APB2ENR.LTDCEN := True;
RCC_Periph.APB2RSTR.LTDCRST := True;
RCC_Periph.APB2RSTR.LTDCRST := False;
RCC_Periph.AHB1ENR.DMA2DEN := True;
RCC_Periph.AHB1RSTR.DMA2DRST := True;
RCC_Periph.AHB1RSTR.DMA2DRST := False;
RCC_Periph.APB2ENR.DSIEN := True;
RCC_Periph.APB2RSTR.DSIRST := True;
RCC_Periph.APB2RSTR.DSIRST := False;
-- Make sure the SDRAM is enabled
STM32.SDRAM.Initialize;
if Orientation = Portrait then
Display.Swapped := True;
end if;
Display.Initialize_Device;
case Mode is
when Polling =>
STM32.DMA2D.Polling.Initialize;
when Interrupt =>
STM32.DMA2D.Interrupt.Initialize;
end case;
end Initialize;
-----------------
-- Initialized --
-----------------
overriding function Initialized
(Display : Frame_Buffer) return Boolean
is
pragma Unreferenced (Display);
begin
return STM32.LTDC.Initialized;
end Initialized;
---------------------
-- Set_Orientation --
---------------------
overriding procedure Set_Orientation
(Display : in out Frame_Buffer;
Orientation : HAL.Framebuffer.Display_Orientation)
is
Old : constant Boolean := Display.Swapped;
begin
Display.Swapped := Orientation = Portrait;
if Old = Display.Swapped then
return;
end if;
Initialize_Device (Display);
end Set_Orientation;
--------------
-- Set_Mode --
--------------
overriding procedure Set_Mode
(Display : in out Frame_Buffer;
Mode : HAL.Framebuffer.Wait_Mode)
is
pragma Unreferenced (Display);
begin
case Mode is
when Polling =>
STM32.DMA2D.Polling.Initialize;
when Interrupt =>
STM32.DMA2D.Interrupt.Initialize;
end case;
end Set_Mode;
----------------------
-- Initialize_Layer --
----------------------
overriding procedure Initialize_Layer
(Display : in out Frame_Buffer;
Layer : Positive;
Mode : HAL.Framebuffer.FB_Color_Mode;
X : Natural := 0;
Y : Natural := 0;
Width : Positive := Positive'Last;
Height : Positive := Positive'Last)
is
function To_LTDC_Mode is new Ada.Unchecked_Conversion
(HAL.Framebuffer.FB_Color_Mode, STM32.LTDC.Pixel_Format);
LCD_Layer : constant STM32.LTDC.LCD_Layer :=
(if Layer = 1
then STM32.LTDC.Layer1
else STM32.LTDC.Layer2);
W : Natural := Width;
H : Natural := Height;
begin
if X >= Display.Get_Width then
raise Constraint_Error with "Layer X position outside of screen";
elsif Y >= Display.Get_Height then
raise Constraint_Error with "Layer Y position outside of screen";
end if;
if W = Positive'Last or else X + W > Display.Get_Width then
W := Display.Get_Width - X;
end if;
if H = Positive'Last or else Y + H > Display.Get_Height then
H := Display.Get_Height - Y;
end if;
Display.Buffers (LCD_Layer) :=
(Addr =>
Reserve (Word (HAL.Bitmap.Bits_Per_Pixel (Mode) * W * H / 8)),
Width => W,
Height => H,
Color_Mode => Mode,
Swapped => False);
Display.Buffers (LCD_Layer).Fill (0);
DSIHOST.DSI_Wrapper_Disable;
STM32.LTDC.Layer_Init
(Layer => LCD_Layer,
Config => To_LTDC_Mode (Mode),
Buffer => Display.Buffers (LCD_Layer).Addr,
X => X,
Y => Y,
W => W,
H => H,
Constant_Alpha => 255,
BF => STM32.LTDC.BF_Pixel_Alpha_X_Constant_Alpha);
STM32.LTDC.Reload_Config (True);
DSIHOST.DSI_Wrapper_Enable;
Display.Update_Layers;
end Initialize_Layer;
-----------------
-- Initialized --
-----------------
overriding function Initialized
(Display : Frame_Buffer;
Layer : Positive) return Boolean
is
LCD_Layer : constant STM32.LTDC.LCD_Layer :=
(if Layer = 1
then STM32.LTDC.Layer1
else STM32.LTDC.Layer2);
use type STM32.DMA2D_Bitmap.DMA2D_Bitmap_Buffer;
begin
return
Display.Buffers (LCD_Layer) /= STM32.DMA2D_Bitmap.Null_Buffer;
end Initialized;
------------------
-- Update_Layer --
------------------
overriding procedure Update_Layer
(Display : in out Frame_Buffer;
Layer : Positive;
Copy_Back : Boolean := False)
is
pragma Unreferenced (Layer, Copy_Back);
begin
Display.Update_Layers;
end Update_Layer;
-------------------
-- Update_Layers --
-------------------
overriding procedure Update_Layers
(Display : in out Frame_Buffer)
is
pragma Unreferenced (Display);
begin
STM32.DMA2D.DMA2D_Wait_Transfer;
Sync.Do_Refresh;
Sync.Wait;
end Update_Layers;
--------------------
-- Get_Color_Mode --
--------------------
overriding function Get_Color_Mode
(Display : Frame_Buffer;
Layer : Positive) return HAL.Framebuffer.FB_Color_Mode
is
LCD_Layer : constant STM32.LTDC.LCD_Layer :=
(if Layer = 1
then STM32.LTDC.Layer1
else STM32.LTDC.Layer2);
begin
return Display.Buffers (LCD_Layer).Color_Mode;
end Get_Color_Mode;
-----------------------
-- Get_Hidden_Buffer --
-----------------------
overriding function Get_Hidden_Buffer
(Display : Frame_Buffer;
Layer : Positive) return HAL.Bitmap.Bitmap_Buffer'Class
is
LCD_Layer : constant STM32.LTDC.LCD_Layer :=
(if Layer = 1
then STM32.LTDC.Layer1
else STM32.LTDC.Layer2);
begin
return Display.Buffers (LCD_Layer);
end Get_Hidden_Buffer;
--------------------
-- Get_Pixel_Size --
--------------------
overriding function Get_Pixel_Size
(Display : Frame_Buffer;
Layer : Positive) return Positive
is
LCD_Layer : constant STM32.LTDC.LCD_Layer :=
(if Layer = 1
then STM32.LTDC.Layer1
else STM32.LTDC.Layer2);
begin
return
HAL.Bitmap.Bits_Per_Pixel
(Display.Buffers (LCD_Layer).Color_Mode) / 8;
end Get_Pixel_Size;
end Framebuffer_OTM8009A;
|
charlie5/lace | Ada | 382 | ads | with
openGL.Buffer.general;
package openGL.Buffer.vertex is new openGL.Buffer.general (base_Object => Buffer.array_Object,
Index => Index_t,
Element => Site,
Element_Array => Sites);
|
reznikmm/matreshka | Ada | 4,639 | 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$
------------------------------------------------------------------------------
with AMF.CMOF.Primitive_Types;
with AMF.Internals.CMOF_Data_Types;
with AMF.Visitors;
package AMF.Internals.CMOF_Primitive_Types is
type CMOF_Primitive_Type_Proxy is
limited new AMF.Internals.CMOF_Data_Types.CMOF_Data_Type_Proxy
and AMF.CMOF.Primitive_Types.CMOF_Primitive_Type
with null record;
overriding procedure Enter_Element
(Self : not null access constant CMOF_Primitive_Type_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control);
-- Dispatch call to corresponding subprogram of visitor interface.
overriding procedure Leave_Element
(Self : not null access constant CMOF_Primitive_Type_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control);
-- Dispatch call to corresponding subprogram of visitor interface.
overriding procedure Visit_Element
(Self : not null access constant CMOF_Primitive_Type_Proxy;
Iterator : in out AMF.Visitors.Abstract_Iterator'Class;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control);
-- Dispatch call to corresponding subprogram of iterator interface.
end AMF.Internals.CMOF_Primitive_Types;
|
reznikmm/matreshka | Ada | 3,779 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with XML.DOM.Attributes;
package ODF.DOM.Style_Layout_Grid_Ruby_Below_Attributes is
pragma Preelaborate;
type ODF_Style_Layout_Grid_Ruby_Below_Attribute is limited interface
and XML.DOM.Attributes.DOM_Attribute;
type ODF_Style_Layout_Grid_Ruby_Below_Attribute_Access is
access all ODF_Style_Layout_Grid_Ruby_Below_Attribute'Class
with Storage_Size => 0;
end ODF.DOM.Style_Layout_Grid_Ruby_Below_Attributes;
|
mhanuel26/ada-enet | Ada | 13,641 | ads | -----------------------------------------------------------------------
-- net-buffers -- Network buffers
-- Copyright (C) 2016 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with System;
with Net.Headers;
-- === Network Buffers ===
-- The <b>Net.Buffers</b> package provides support for network buffer management.
-- A network buffer can hold a single packet frame so that it is limited to 1500 bytes
-- of payload with 14 or 16 bytes for the Ethernet header. The network buffers are
-- allocated by the Ethernet driver during the initialization to setup the
-- Ethernet receive queue. The allocation of network buffers for the transmission
-- is under the responsibility of the application.
--
-- Before receiving a packet, the application also has to allocate a network buffer.
-- Upon successful reception of a packet by the <b>Receive</b> procedure, the allocated
-- network buffer will be given to the Ethernet receive queue and the application
-- will get back the received buffer. There is no memory copy.
--
-- The package defines two important types: <b>Buffer_Type</b> and <b>Buffer_List</b>.
-- These two types are limited types to forbid copies and force a strict design to
-- applications. The <b>Buffer_Type</b> describes the packet frame and it provides
-- various operations to access the buffer. The <b>Buffer_List</b> defines a list of buffers.
--
-- The network buffers are kept within a single linked list managed by a protected object.
-- Because interrupt handlers can release a buffer, that protected object has the priority
-- <b>System.Max_Interrupt_Priority</b>. The protected operations are very basic and are
-- in O(1) complexity so that their execution is bounded in time whatever the arguments.
--
-- Before anything, the network buffers have to be allocated. The application can do this
-- by reserving some memory region (using <b>STM32.SDRAM.Reserve</b>) and adding the region with
-- the <b>Add_Region</b> procedure. The region must be a multiple of <b>NET_ALLOC_SIZE</b>
-- constant. To allocate 32 buffers, you can do the following:
--
-- NET_BUFFER_SIZE : constant Interfaces.Unsigned_32 := Net.Buffers.NET_ALLOC_SIZE * 32;
-- ...
-- Net.Buffers.Add_Region (STM32.SDRAM.Reserve (Amount => NET_BUFFER_SIZE), NET_BUFFER_SIZE);
--
-- An application will allocate a buffer by using the <b>Allocate</b> operation and this is as
-- easy as:
--
-- Packet : Net.Buffers.Buffer_Type;
-- ...
-- Net.Buffers.Allocate (Packet);
--
-- What happens if there is no available buffer? No exception is raised because the networks
-- stack is intended to be used in embedded systems where exceptions are not available.
-- You have to check if the allocation succeeded by using the <b>Is_Null</b> function:
--
-- if Packet.Is_Null then
-- null; -- Oops
-- end if;
--
-- === Serialization ===
-- Several serialization operations are provided to build or extract information from a packet.
-- Before proceeding to the serialization, it is necessary to set the packet type. The packet
-- type is necessary to reserve room for the protocol headers. To build a UDP packet, the
-- <tt>UDP_PACKET</tt> type will be used:
--
-- Packet.Set_Type (Net.Buffers.UDP_PACKET);
--
-- Then, several <tt>Put</tt> operations are provided to serialize the data. By default
-- integers are serialized in network byte order. The <tt>Put_Uint8</tt> serializes one byte,
-- the <tt>Put_Uint16</tt> two bytes, the <tt>Put_Uint32</tt> four bytes. The <tt>Put_String</tt>
-- operation will serialize a string. A NUL byte is optional and can be added when the
-- <tt>With_Null</tt> optional parameter is set. The example below creates a DNS query packet:
--
-- Packet.Put_Uint16 (1234); -- XID
-- Packet.Put_Uint16 (16#0100#); -- Flags
-- Packet.Put_Uint16 (1); -- # queries
-- Packet.Put_Uint16 (0);
-- Packet.Put_Uint32 (0);
-- Packet.Put_Uint8 (16#3#); -- Query
-- Packet.Put_String ("www.google.fr", With_Null => True);
-- Packet.Put_Uint16 (16#1#); -- A record
-- Packet.Put_Uint16 (16#1#); -- IN class
--
-- After a packet is serialized, the length get be obtained by using the
--
-- Len : Net.Uint16 := Packet.Get_Data_Length;
package Net.Buffers is
pragma Preelaborate;
-- The size of a packet buffer for memory allocation.
NET_ALLOC_SIZE : constant Uint32;
-- The maximum available size of the packet buffer for the application.
-- We always have NET_BUF_SIZE < NET_ALLOC_SIZE.
NET_BUF_SIZE : constant Uint32;
-- The packet type identifies the content of the packet for the serialization/deserialization.
type Packet_Type is (RAW_PACKET, ETHER_PACKET, ARP_PACKET, IP_PACKET, UDP_PACKET, ICMP_PACKET,
DHCP_PACKET);
type Data_Type is array (Net.Uint16 range 0 .. 1500 + 31) of aliased Uint8 with
Alignment => 32;
type Buffer_Type is tagged limited private;
-- Returns true if the buffer is null (allocation failed).
function Is_Null (Buf : in Buffer_Type) return Boolean;
-- Allocate a buffer from the pool. No exception is raised if there is no available buffer.
-- The <tt>Is_Null</tt> operation must be used to check the buffer allocation.
procedure Allocate (Buf : out Buffer_Type);
-- Release the buffer back to the pool.
procedure Release (Buf : in out Buffer_Type) with
Post => Buf.Is_Null;
-- Transfer the ownership of the buffer from <tt>From</tt> to <tt>To</tt>.
-- If the destination has a buffer, it is first released.
procedure Transfer (To : in out Buffer_Type;
From : in out Buffer_Type) with
Pre => not From.Is_Null,
Post => From.Is_Null and not To.Is_Null;
-- Switch the ownership of the two buffers. The typical usage is on the Ethernet receive
-- ring to peek a received packet and install a new buffer on the ring so that there is
-- always a buffer on the ring.
procedure Switch (To : in out Buffer_Type;
From : in out Buffer_Type) with
Pre => not From.Is_Null and not To.Is_Null,
Post => not From.Is_Null and not To.Is_Null;
--
function Get_Data_Address (Buf : in Buffer_Type) return System.Address;
function Get_Data_Size (Buf : in Buffer_Type;
Kind : in Packet_Type) return Uint16;
procedure Set_Data_Size (Buf : in out Buffer_Type; Size : in Uint16);
function Get_Length (Buf : in Buffer_Type) return Uint16;
procedure Set_Length (Buf : in out Buffer_Type; Size : in Uint16);
-- Set the packet type.
procedure Set_Type (Buf : in out Buffer_Type;
Kind : in Packet_Type);
-- Add a byte to the buffer data, moving the buffer write position.
procedure Put_Uint8 (Buf : in out Buffer_Type;
Value : in Net.Uint8) with
Pre => not Buf.Is_Null;
-- Add a 16-bit value in network byte order to the buffer data,
-- moving the buffer write position.
procedure Put_Uint16 (Buf : in out Buffer_Type;
Value : in Net.Uint16) with
Pre => not Buf.Is_Null;
-- Add a 32-bit value in network byte order to the buffer data,
-- moving the buffer write position.
procedure Put_Uint32 (Buf : in out Buffer_Type;
Value : in Net.Uint32) with
Pre => not Buf.Is_Null;
-- Add a string to the buffer data, moving the buffer write position.
-- When <tt>With_Null</tt> is set, a NUL byte is added after the string.
procedure Put_String (Buf : in out Buffer_Type;
Value : in String;
With_Null : in Boolean := False) with
Pre => not Buf.Is_Null;
-- Add an IP address to the buffer data, moving the buffer write position.
procedure Put_Ip (Buf : in out Buffer_Type;
Value : in Ip_Addr) with
Pre => not Buf.Is_Null;
-- Get a byte from the buffer, moving the buffer read position.
function Get_Uint8 (Buf : in out Buffer_Type) return Net.Uint8 with
Pre => not Buf.Is_Null;
-- Get a 16-bit value in network byte order from the buffer, moving the buffer read position.
function Get_Uint16 (Buf : in out Buffer_Type) return Net.Uint16 with
Pre => not Buf.Is_Null;
-- Get a 32-bit value in network byte order from the buffer, moving the buffer read position.
function Get_Uint32 (Buf : in out Buffer_Type) return Net.Uint32 with
Pre => not Buf.Is_Null;
-- Get an IPv4 value from the buffer, moving the buffer read position.
function Get_Ip (Buf : in out Buffer_Type) return Net.Ip_Addr with
Pre => not Buf.Is_Null;
-- Get a string whose length is specified by the target value.
procedure Get_String (Buf : in out Buffer_Type;
Into : out String) with
Pre => not Buf.Is_Null;
-- Skip a number of bytes in the buffer, moving the buffer position <tt>Size<tt> bytes ahead.
procedure Skip (Buf : in out Buffer_Type;
Size : in Net.Uint16) with
Pre => not Buf.Is_Null;
-- Get access to the Ethernet header.
function Ethernet (Buf : in Buffer_Type) return Net.Headers.Ether_Header_Access with
Pre => not Buf.Is_Null;
-- Get access to the ARP packet.
function Arp (Buf : in Buffer_Type) return Net.Headers.Arp_Packet_Access with
Pre => not Buf.Is_Null;
-- Get access to the IPv4 header.
function IP (Buf : in Buffer_Type) return Net.Headers.IP_Header_Access with
Pre => not Buf.Is_Null;
-- Get access to the UDP header.
function UDP (Buf : in Buffer_Type) return Net.Headers.UDP_Header_Access with
Pre => not Buf.Is_Null;
-- Get access to the TCP header.
function TCP (Buf : in Buffer_Type) return Net.Headers.TCP_Header_Access with
Pre => not Buf.Is_Null;
-- Get access to the IGMP header.
function IGMP (Buf : in Buffer_Type) return Net.Headers.IGMP_Header_Access with
Pre => not Buf.Is_Null;
-- Get access to the ICMP header.
function ICMP (Buf : in Buffer_Type) return Net.Headers.ICMP_Header_Access with
Pre => not Buf.Is_Null;
-- Get access to the DHCP header.
function DHCP (Buf : in Buffer_Type) return Net.Headers.DHCP_Header_Access with
Pre => not Buf.Is_Null;
-- The <tt>Buffer_List</tt> holds a set of network buffers.
type Buffer_List is limited private;
-- Returns True if the list is empty.
function Is_Empty (List : in Buffer_List) return Boolean;
-- Insert the buffer to the list.
procedure Insert (Into : in out Buffer_List;
Buf : in out Buffer_Type) with
Pre => not Buf.Is_Null,
Post => Buf.Is_Null and not Is_Empty (Into);
-- Release all the buffers held by the list.
procedure Release (List : in out Buffer_List);
-- Allocate <tt>Count</tt> buffers and add them to the list.
-- There is no guarantee that the required number of buffers will be allocated.
procedure Allocate (List : in out Buffer_List;
Count : in Natural);
-- Peek a buffer from the list.
procedure Peek (From : in out Buffer_List;
Buf : in out Buffer_Type);
-- Transfer the list of buffers held by <tt>From</tt> at end of the list held
-- by <tt>To</tt>. After the transfer, the <tt>From</tt> list is empty.
-- The complexity is in O(1).
procedure Transfer (To : in out Buffer_List;
From : in out Buffer_List) with
Post => Is_Empty (From);
use type System.Address;
-- Add a memory region to the buffer pool.
procedure Add_Region (Addr : in System.Address;
Size : in Uint32) with
Pre => Size mod NET_ALLOC_SIZE = 0 and Size > 0 and Addr /= System.Null_Address;
-- The STM32 Ethernet driver builds the receive ring in the SDRAM and allocates the
-- memory dynamically. The memory area is not initialized and we need a way to force
-- its initialization by clearing the internal <tt>Size</tt> and <tt>Packet</tt> attributes.
-- Calling this method in another context might result in buffer leak.
procedure Unsafe_Reset (Buffer : in out Buffer_Type) with
Post => Buffer.Is_Null;
private
type Packet_Buffer;
type Packet_Buffer_Access is access all Packet_Buffer;
type Packet_Buffer is limited record
Next : Packet_Buffer_Access;
Size : Uint16;
Data : aliased Data_Type;
end record;
type Buffer_Type is tagged limited record
Kind : Packet_Type := RAW_PACKET;
Size : Uint16 := 0;
Pos : Uint16 := 0;
Packet : Packet_Buffer_Access;
end record;
type Buffer_List is limited record
Head : Packet_Buffer_Access := null;
Tail : Packet_Buffer_Access := null;
end record;
NET_ALLOC_SIZE : constant Uint32 := 4 + (Packet_Buffer'Size / 8);
NET_BUF_SIZE : constant Uint32 := Data_Type'Size / 8;
end Net.Buffers;
|
reznikmm/gela | Ada | 5,503 | adb | ------------------------------------------------------------------------------
-- G E L A A S I S --
-- ASIS implementation for Gela project, a portable Ada compiler --
-- http://www.ten15.org/wiki/Ada --
-- - - - - - - - - - - - - - - - --
-- Read copyright and license at the end of this file --
------------------------------------------------------------------------------
-- Purpose:
-- Implement Asis.Implementation
with Asis.Exceptions;
package body Asis.Implementation is
Initialized : Boolean := False;
Finalized : Boolean := True;
Max_Current : constant := 2048;
Current_Parameters : Wide_String (1 .. Max_Current);
Parameters_Length : Natural := 0;
pragma Unreferenced (Parameters_Length);
Current_Status : Asis.Errors.Error_Kinds;
Current_Diagnosis : Wide_String (1 .. Max_Current);
Diagnosis_Length : Natural := 0;
----------------------
-- ASIS_Implementor --
----------------------
function ASIS_Implementor return Wide_String is
begin
return "Gela: An Ada Compiler";
end ASIS_Implementor;
----------------------------------
-- ASIS_Implementor_Information --
----------------------------------
function ASIS_Implementor_Information return Wide_String is
begin
return "Copyright (C) 2006-2014, Maxim Reznik";
end ASIS_Implementor_Information;
------------------------------
-- ASIS_Implementor_Version --
------------------------------
function ASIS_Implementor_Version return Wide_String is
begin
return "0.4.0";
end ASIS_Implementor_Version;
------------------
-- ASIS_Version --
------------------
function ASIS_Version return Wide_String is
begin
return "ASIS 2.0s";
end ASIS_Version;
---------------
-- Diagnosis --
---------------
function Diagnosis return Wide_String is
begin
return Current_Diagnosis (1 .. Diagnosis_Length);
end Diagnosis;
--------------
-- Finalize --
--------------
procedure Finalize (Parameters : in Wide_String := "") is
pragma Unreferenced (Parameters);
begin
if not Finalized then
Finalized := True;
Initialized := False;
end if;
end Finalize;
----------------
-- Initialize --
----------------
procedure Initialize (Parameters : in Wide_String := "") is
begin
if not Initialized then
Initialized := True;
Finalized := False;
Current_Parameters (1 .. Parameters'Length) := Parameters;
Parameters_Length := Parameters'Length;
end if;
end Initialize;
------------------
-- Is_Finalized --
------------------
function Is_Finalized return Boolean is
begin
return Finalized;
end Is_Finalized;
--------------------
-- Is_Initialized --
--------------------
function Is_Initialized return Boolean is
begin
return Initialized;
end Is_Initialized;
----------------
-- Set_Status --
----------------
procedure Set_Status
(Status : in Asis.Errors.Error_Kinds := Asis.Errors.Not_An_Error;
Diagnosis : in Wide_String := "")
is
use type Asis.Errors.Error_Kinds;
begin
if Status = Errors.Not_An_Error and Diagnosis /= "" then
Current_Status := Errors.Internal_Error;
Diagnosis_Length := 0;
raise Exceptions.ASIS_Failed;
end if;
Current_Status := Status;
Current_Diagnosis (1 .. Diagnosis'Length) := Diagnosis;
Diagnosis_Length := Diagnosis'Length;
end Set_Status;
------------
-- Status --
------------
function Status return Asis.Errors.Error_Kinds is
begin
return Current_Status;
end Status;
end Asis.Implementation;
------------------------------------------------------------------------------
-- Copyright (c) 2006-2013, Maxim Reznik
-- 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.
--
-- 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.
------------------------------------------------------------------------------
|
stcarrez/ada-ado | Ada | 2,131 | ads | with Interfaces.C; use Interfaces.C;
with System;
package Mysql.My_list is
pragma Preelaborate;
-- arg-macro: function list_rest (a)
-- return (a).next;
-- arg-macro: function list_push (a, b)
-- return a):=list_cons((b),(a);
-- Copyright (C) 2000 MySQL AB
-- 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; version 2 of the License.
-- 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, write to the Free Software
-- Foundation, Inc., 59 Temple Place, Suite 330, Boston, MA 02111-1307 USA
-- /usr/include/mysql/my_list.h:24:19
type st_list is record
prev : access st_list;
next : access st_list;
data : System.Address;
end record;
pragma Convention (C, st_list);
subtype LIST is st_list;
type List_Walk_Action is
access function (arg1 : System.Address; arg2 : System.Address) return int;
function list_add (arg1 : access st_list; arg2 : access st_list) return access st_list;
pragma Import (C, list_add, "list_add");
function list_delete (arg1 : access st_list; arg2 : access st_list) return access st_list;
pragma Import (C, list_delete, "list_delete");
function list_cons (arg1 : System.Address; arg2 : access st_list) return access st_list;
pragma Import (C, list_cons, "list_cons");
function list_reverse (arg1 : access st_list) return access st_list;
pragma Import (C, list_reverse, "list_reverse");
procedure list_free (arg1 : access st_list; arg2 : unsigned);
pragma Import (C, list_free, "list_free");
function list_length (arg1 : access st_list) return unsigned;
pragma Import (C, list_length, "list_length");
end Mysql.My_list;
|
adammw/rtp_labs | Ada | 646 | adb | with Ada.Text_Io;
use Ada.Text_Io;
procedure Enum is
type Day_Type is (Monday, Tuesday, Wednesday, Thursday, Friday, Saturday, Sunday);
subtype Weekday is Day_Type range Monday .. Friday;
begin
Put("Days: ");
for Day in Day_Type loop
Put(Day'img & " ");
end loop;
Put_Line("");
Put("Days (reversed): ");
for Day in reverse Day_Type'Range loop
Put(Day'img & " ");
end loop;
Put_Line("");
Put("Weekdays: ");
for Day in Weekday loop
Put(Day'img & " ");
end loop;
Put_Line("");
Put("Letters A-K: ");
for Char in Character range 'A' .. 'K' loop
Put(Char & " ");
end loop;
Put_Line("");
end Enum;
|
ekoeppen/STM32_Generic_Ada_Drivers | Ada | 18,456 | ads | -- This spec has been automatically generated from STM32F0xx.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with System;
package STM32_SVD.DMA is
pragma Preelaborate;
---------------
-- Registers --
---------------
subtype ISR_GIF1_Field is STM32_SVD.Bit;
subtype ISR_TCIF1_Field is STM32_SVD.Bit;
subtype ISR_HTIF1_Field is STM32_SVD.Bit;
subtype ISR_TEIF1_Field is STM32_SVD.Bit;
subtype ISR_GIF2_Field is STM32_SVD.Bit;
subtype ISR_TCIF2_Field is STM32_SVD.Bit;
subtype ISR_HTIF2_Field is STM32_SVD.Bit;
subtype ISR_TEIF2_Field is STM32_SVD.Bit;
subtype ISR_GIF3_Field is STM32_SVD.Bit;
subtype ISR_TCIF3_Field is STM32_SVD.Bit;
subtype ISR_HTIF3_Field is STM32_SVD.Bit;
subtype ISR_TEIF3_Field is STM32_SVD.Bit;
subtype ISR_GIF4_Field is STM32_SVD.Bit;
subtype ISR_TCIF4_Field is STM32_SVD.Bit;
subtype ISR_HTIF4_Field is STM32_SVD.Bit;
subtype ISR_TEIF4_Field is STM32_SVD.Bit;
subtype ISR_GIF5_Field is STM32_SVD.Bit;
subtype ISR_TCIF5_Field is STM32_SVD.Bit;
subtype ISR_HTIF5_Field is STM32_SVD.Bit;
subtype ISR_TEIF5_Field is STM32_SVD.Bit;
subtype ISR_GIF6_Field is STM32_SVD.Bit;
subtype ISR_TCIF6_Field is STM32_SVD.Bit;
subtype ISR_HTIF6_Field is STM32_SVD.Bit;
subtype ISR_TEIF6_Field is STM32_SVD.Bit;
subtype ISR_GIF7_Field is STM32_SVD.Bit;
subtype ISR_TCIF7_Field is STM32_SVD.Bit;
subtype ISR_HTIF7_Field is STM32_SVD.Bit;
subtype ISR_TEIF7_Field is STM32_SVD.Bit;
-- DMA interrupt status register (DMA_ISR)
type ISR_Register is record
-- Read-only. Channel 1 Global interrupt flag
GIF1 : ISR_GIF1_Field;
-- Read-only. Channel 1 Transfer Complete flag
TCIF1 : ISR_TCIF1_Field;
-- Read-only. Channel 1 Half Transfer Complete flag
HTIF1 : ISR_HTIF1_Field;
-- Read-only. Channel 1 Transfer Error flag
TEIF1 : ISR_TEIF1_Field;
-- Read-only. Channel 2 Global interrupt flag
GIF2 : ISR_GIF2_Field;
-- Read-only. Channel 2 Transfer Complete flag
TCIF2 : ISR_TCIF2_Field;
-- Read-only. Channel 2 Half Transfer Complete flag
HTIF2 : ISR_HTIF2_Field;
-- Read-only. Channel 2 Transfer Error flag
TEIF2 : ISR_TEIF2_Field;
-- Read-only. Channel 3 Global interrupt flag
GIF3 : ISR_GIF3_Field;
-- Read-only. Channel 3 Transfer Complete flag
TCIF3 : ISR_TCIF3_Field;
-- Read-only. Channel 3 Half Transfer Complete flag
HTIF3 : ISR_HTIF3_Field;
-- Read-only. Channel 3 Transfer Error flag
TEIF3 : ISR_TEIF3_Field;
-- Read-only. Channel 4 Global interrupt flag
GIF4 : ISR_GIF4_Field;
-- Read-only. Channel 4 Transfer Complete flag
TCIF4 : ISR_TCIF4_Field;
-- Read-only. Channel 4 Half Transfer Complete flag
HTIF4 : ISR_HTIF4_Field;
-- Read-only. Channel 4 Transfer Error flag
TEIF4 : ISR_TEIF4_Field;
-- Read-only. Channel 5 Global interrupt flag
GIF5 : ISR_GIF5_Field;
-- Read-only. Channel 5 Transfer Complete flag
TCIF5 : ISR_TCIF5_Field;
-- Read-only. Channel 5 Half Transfer Complete flag
HTIF5 : ISR_HTIF5_Field;
-- Read-only. Channel 5 Transfer Error flag
TEIF5 : ISR_TEIF5_Field;
-- Read-only. Channel 6 Global interrupt flag
GIF6 : ISR_GIF6_Field;
-- Read-only. Channel 6 Transfer Complete flag
TCIF6 : ISR_TCIF6_Field;
-- Read-only. Channel 6 Half Transfer Complete flag
HTIF6 : ISR_HTIF6_Field;
-- Read-only. Channel 6 Transfer Error flag
TEIF6 : ISR_TEIF6_Field;
-- Read-only. Channel 7 Global interrupt flag
GIF7 : ISR_GIF7_Field;
-- Read-only. Channel 7 Transfer Complete flag
TCIF7 : ISR_TCIF7_Field;
-- Read-only. Channel 7 Half Transfer Complete flag
HTIF7 : ISR_HTIF7_Field;
-- Read-only. Channel 7 Transfer Error flag
TEIF7 : ISR_TEIF7_Field;
-- unspecified
Reserved_28_31 : STM32_SVD.UInt4;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for ISR_Register use record
GIF1 at 0 range 0 .. 0;
TCIF1 at 0 range 1 .. 1;
HTIF1 at 0 range 2 .. 2;
TEIF1 at 0 range 3 .. 3;
GIF2 at 0 range 4 .. 4;
TCIF2 at 0 range 5 .. 5;
HTIF2 at 0 range 6 .. 6;
TEIF2 at 0 range 7 .. 7;
GIF3 at 0 range 8 .. 8;
TCIF3 at 0 range 9 .. 9;
HTIF3 at 0 range 10 .. 10;
TEIF3 at 0 range 11 .. 11;
GIF4 at 0 range 12 .. 12;
TCIF4 at 0 range 13 .. 13;
HTIF4 at 0 range 14 .. 14;
TEIF4 at 0 range 15 .. 15;
GIF5 at 0 range 16 .. 16;
TCIF5 at 0 range 17 .. 17;
HTIF5 at 0 range 18 .. 18;
TEIF5 at 0 range 19 .. 19;
GIF6 at 0 range 20 .. 20;
TCIF6 at 0 range 21 .. 21;
HTIF6 at 0 range 22 .. 22;
TEIF6 at 0 range 23 .. 23;
GIF7 at 0 range 24 .. 24;
TCIF7 at 0 range 25 .. 25;
HTIF7 at 0 range 26 .. 26;
TEIF7 at 0 range 27 .. 27;
Reserved_28_31 at 0 range 28 .. 31;
end record;
subtype IFCR_CGIF1_Field is STM32_SVD.Bit;
subtype IFCR_CTCIF1_Field is STM32_SVD.Bit;
subtype IFCR_CHTIF1_Field is STM32_SVD.Bit;
subtype IFCR_CTEIF1_Field is STM32_SVD.Bit;
subtype IFCR_CGIF2_Field is STM32_SVD.Bit;
subtype IFCR_CTCIF2_Field is STM32_SVD.Bit;
subtype IFCR_CHTIF2_Field is STM32_SVD.Bit;
subtype IFCR_CTEIF2_Field is STM32_SVD.Bit;
subtype IFCR_CGIF3_Field is STM32_SVD.Bit;
subtype IFCR_CTCIF3_Field is STM32_SVD.Bit;
subtype IFCR_CHTIF3_Field is STM32_SVD.Bit;
subtype IFCR_CTEIF3_Field is STM32_SVD.Bit;
subtype IFCR_CGIF4_Field is STM32_SVD.Bit;
subtype IFCR_CTCIF4_Field is STM32_SVD.Bit;
subtype IFCR_CHTIF4_Field is STM32_SVD.Bit;
subtype IFCR_CTEIF4_Field is STM32_SVD.Bit;
subtype IFCR_CGIF5_Field is STM32_SVD.Bit;
subtype IFCR_CTCIF5_Field is STM32_SVD.Bit;
subtype IFCR_CHTIF5_Field is STM32_SVD.Bit;
subtype IFCR_CTEIF5_Field is STM32_SVD.Bit;
subtype IFCR_CGIF6_Field is STM32_SVD.Bit;
subtype IFCR_CTCIF6_Field is STM32_SVD.Bit;
subtype IFCR_CHTIF6_Field is STM32_SVD.Bit;
subtype IFCR_CTEIF6_Field is STM32_SVD.Bit;
subtype IFCR_CGIF7_Field is STM32_SVD.Bit;
subtype IFCR_CTCIF7_Field is STM32_SVD.Bit;
subtype IFCR_CHTIF7_Field is STM32_SVD.Bit;
subtype IFCR_CTEIF7_Field is STM32_SVD.Bit;
-- DMA interrupt flag clear register (DMA_IFCR)
type IFCR_Register is record
-- Write-only. Channel 1 Global interrupt clear
CGIF1 : IFCR_CGIF1_Field := 16#0#;
-- Write-only. Channel 1 Transfer Complete clear
CTCIF1 : IFCR_CTCIF1_Field := 16#0#;
-- Write-only. Channel 1 Half Transfer clear
CHTIF1 : IFCR_CHTIF1_Field := 16#0#;
-- Write-only. Channel 1 Transfer Error clear
CTEIF1 : IFCR_CTEIF1_Field := 16#0#;
-- Write-only. Channel 2 Global interrupt clear
CGIF2 : IFCR_CGIF2_Field := 16#0#;
-- Write-only. Channel 2 Transfer Complete clear
CTCIF2 : IFCR_CTCIF2_Field := 16#0#;
-- Write-only. Channel 2 Half Transfer clear
CHTIF2 : IFCR_CHTIF2_Field := 16#0#;
-- Write-only. Channel 2 Transfer Error clear
CTEIF2 : IFCR_CTEIF2_Field := 16#0#;
-- Write-only. Channel 3 Global interrupt clear
CGIF3 : IFCR_CGIF3_Field := 16#0#;
-- Write-only. Channel 3 Transfer Complete clear
CTCIF3 : IFCR_CTCIF3_Field := 16#0#;
-- Write-only. Channel 3 Half Transfer clear
CHTIF3 : IFCR_CHTIF3_Field := 16#0#;
-- Write-only. Channel 3 Transfer Error clear
CTEIF3 : IFCR_CTEIF3_Field := 16#0#;
-- Write-only. Channel 4 Global interrupt clear
CGIF4 : IFCR_CGIF4_Field := 16#0#;
-- Write-only. Channel 4 Transfer Complete clear
CTCIF4 : IFCR_CTCIF4_Field := 16#0#;
-- Write-only. Channel 4 Half Transfer clear
CHTIF4 : IFCR_CHTIF4_Field := 16#0#;
-- Write-only. Channel 4 Transfer Error clear
CTEIF4 : IFCR_CTEIF4_Field := 16#0#;
-- Write-only. Channel 5 Global interrupt clear
CGIF5 : IFCR_CGIF5_Field := 16#0#;
-- Write-only. Channel 5 Transfer Complete clear
CTCIF5 : IFCR_CTCIF5_Field := 16#0#;
-- Write-only. Channel 5 Half Transfer clear
CHTIF5 : IFCR_CHTIF5_Field := 16#0#;
-- Write-only. Channel 5 Transfer Error clear
CTEIF5 : IFCR_CTEIF5_Field := 16#0#;
-- Write-only. Channel 6 Global interrupt clear
CGIF6 : IFCR_CGIF6_Field := 16#0#;
-- Write-only. Channel 6 Transfer Complete clear
CTCIF6 : IFCR_CTCIF6_Field := 16#0#;
-- Write-only. Channel 6 Half Transfer clear
CHTIF6 : IFCR_CHTIF6_Field := 16#0#;
-- Write-only. Channel 6 Transfer Error clear
CTEIF6 : IFCR_CTEIF6_Field := 16#0#;
-- Write-only. Channel 7 Global interrupt clear
CGIF7 : IFCR_CGIF7_Field := 16#0#;
-- Write-only. Channel 7 Transfer Complete clear
CTCIF7 : IFCR_CTCIF7_Field := 16#0#;
-- Write-only. Channel 7 Half Transfer clear
CHTIF7 : IFCR_CHTIF7_Field := 16#0#;
-- Write-only. Channel 7 Transfer Error clear
CTEIF7 : IFCR_CTEIF7_Field := 16#0#;
-- unspecified
Reserved_28_31 : STM32_SVD.UInt4 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for IFCR_Register use record
CGIF1 at 0 range 0 .. 0;
CTCIF1 at 0 range 1 .. 1;
CHTIF1 at 0 range 2 .. 2;
CTEIF1 at 0 range 3 .. 3;
CGIF2 at 0 range 4 .. 4;
CTCIF2 at 0 range 5 .. 5;
CHTIF2 at 0 range 6 .. 6;
CTEIF2 at 0 range 7 .. 7;
CGIF3 at 0 range 8 .. 8;
CTCIF3 at 0 range 9 .. 9;
CHTIF3 at 0 range 10 .. 10;
CTEIF3 at 0 range 11 .. 11;
CGIF4 at 0 range 12 .. 12;
CTCIF4 at 0 range 13 .. 13;
CHTIF4 at 0 range 14 .. 14;
CTEIF4 at 0 range 15 .. 15;
CGIF5 at 0 range 16 .. 16;
CTCIF5 at 0 range 17 .. 17;
CHTIF5 at 0 range 18 .. 18;
CTEIF5 at 0 range 19 .. 19;
CGIF6 at 0 range 20 .. 20;
CTCIF6 at 0 range 21 .. 21;
CHTIF6 at 0 range 22 .. 22;
CTEIF6 at 0 range 23 .. 23;
CGIF7 at 0 range 24 .. 24;
CTCIF7 at 0 range 25 .. 25;
CHTIF7 at 0 range 26 .. 26;
CTEIF7 at 0 range 27 .. 27;
Reserved_28_31 at 0 range 28 .. 31;
end record;
subtype CCR_EN_Field is STM32_SVD.Bit;
subtype CCR_TCIE_Field is STM32_SVD.Bit;
subtype CCR_HTIE_Field is STM32_SVD.Bit;
subtype CCR_TEIE_Field is STM32_SVD.Bit;
subtype CCR_DIR_Field is STM32_SVD.Bit;
subtype CCR_CIRC_Field is STM32_SVD.Bit;
subtype CCR_PINC_Field is STM32_SVD.Bit;
subtype CCR_MINC_Field is STM32_SVD.Bit;
subtype CCR_PSIZE_Field is STM32_SVD.UInt2;
subtype CCR_MSIZE_Field is STM32_SVD.UInt2;
subtype CCR_PL_Field is STM32_SVD.UInt2;
subtype CCR_MEM2MEM_Field is STM32_SVD.Bit;
-- DMA channel configuration register (DMA_CCR)
type CCR_Register is record
-- Channel enable
EN : CCR_EN_Field := 16#0#;
-- Transfer complete interrupt enable
TCIE : CCR_TCIE_Field := 16#0#;
-- Half Transfer interrupt enable
HTIE : CCR_HTIE_Field := 16#0#;
-- Transfer error interrupt enable
TEIE : CCR_TEIE_Field := 16#0#;
-- Data transfer direction
DIR : CCR_DIR_Field := 16#0#;
-- Circular mode
CIRC : CCR_CIRC_Field := 16#0#;
-- Peripheral increment mode
PINC : CCR_PINC_Field := 16#0#;
-- Memory increment mode
MINC : CCR_MINC_Field := 16#0#;
-- Peripheral size
PSIZE : CCR_PSIZE_Field := 16#0#;
-- Memory size
MSIZE : CCR_MSIZE_Field := 16#0#;
-- Channel Priority level
PL : CCR_PL_Field := 16#0#;
-- Memory to memory mode
MEM2MEM : CCR_MEM2MEM_Field := 16#0#;
-- unspecified
Reserved_15_31 : STM32_SVD.UInt17 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCR_Register use record
EN at 0 range 0 .. 0;
TCIE at 0 range 1 .. 1;
HTIE at 0 range 2 .. 2;
TEIE at 0 range 3 .. 3;
DIR at 0 range 4 .. 4;
CIRC at 0 range 5 .. 5;
PINC at 0 range 6 .. 6;
MINC at 0 range 7 .. 7;
PSIZE at 0 range 8 .. 9;
MSIZE at 0 range 10 .. 11;
PL at 0 range 12 .. 13;
MEM2MEM at 0 range 14 .. 14;
Reserved_15_31 at 0 range 15 .. 31;
end record;
subtype CNDTR_NDT_Field is STM32_SVD.UInt16;
-- DMA channel 1 number of data register
type CNDTR_Register is record
-- Number of data to transfer
NDT : CNDTR_NDT_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CNDTR_Register use record
NDT at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- DMA controller
type DMA_Peripheral is record
-- DMA interrupt status register (DMA_ISR)
ISR : aliased ISR_Register;
-- DMA interrupt flag clear register (DMA_IFCR)
IFCR : aliased IFCR_Register;
-- DMA channel configuration register (DMA_CCR)
CCR1 : aliased CCR_Register;
-- DMA channel 1 number of data register
CNDTR1 : aliased CNDTR_Register;
-- DMA channel 1 peripheral address register
CPAR1 : aliased STM32_SVD.UInt32;
-- DMA channel 1 memory address register
CMAR1 : aliased STM32_SVD.UInt32;
-- DMA channel configuration register (DMA_CCR)
CCR2 : aliased CCR_Register;
-- DMA channel 2 number of data register
CNDTR2 : aliased CNDTR_Register;
-- DMA channel 2 peripheral address register
CPAR2 : aliased STM32_SVD.UInt32;
-- DMA channel 2 memory address register
CMAR2 : aliased STM32_SVD.UInt32;
-- DMA channel configuration register (DMA_CCR)
CCR3 : aliased CCR_Register;
-- DMA channel 3 number of data register
CNDTR3 : aliased CNDTR_Register;
-- DMA channel 3 peripheral address register
CPAR3 : aliased STM32_SVD.UInt32;
-- DMA channel 3 memory address register
CMAR3 : aliased STM32_SVD.UInt32;
-- DMA channel configuration register (DMA_CCR)
CCR4 : aliased CCR_Register;
-- DMA channel 4 number of data register
CNDTR4 : aliased CNDTR_Register;
-- DMA channel 4 peripheral address register
CPAR4 : aliased STM32_SVD.UInt32;
-- DMA channel 4 memory address register
CMAR4 : aliased STM32_SVD.UInt32;
-- DMA channel configuration register (DMA_CCR)
CCR5 : aliased CCR_Register;
-- DMA channel 5 number of data register
CNDTR5 : aliased CNDTR_Register;
-- DMA channel 5 peripheral address register
CPAR5 : aliased STM32_SVD.UInt32;
-- DMA channel 5 memory address register
CMAR5 : aliased STM32_SVD.UInt32;
-- DMA channel configuration register (DMA_CCR)
CCR6 : aliased CCR_Register;
-- DMA channel 6 number of data register
CNDTR6 : aliased CNDTR_Register;
-- DMA channel 6 peripheral address register
CPAR6 : aliased STM32_SVD.UInt32;
-- DMA channel 6 memory address register
CMAR6 : aliased STM32_SVD.UInt32;
-- DMA channel configuration register (DMA_CCR)
CCR7 : aliased CCR_Register;
-- DMA channel 7 number of data register
CNDTR7 : aliased CNDTR_Register;
-- DMA channel 7 peripheral address register
CPAR7 : aliased STM32_SVD.UInt32;
-- DMA channel 7 memory address register
CMAR7 : aliased STM32_SVD.UInt32;
end record
with Volatile;
for DMA_Peripheral use record
ISR at 16#0# range 0 .. 31;
IFCR at 16#4# range 0 .. 31;
CCR1 at 16#8# range 0 .. 31;
CNDTR1 at 16#C# range 0 .. 31;
CPAR1 at 16#10# range 0 .. 31;
CMAR1 at 16#14# range 0 .. 31;
CCR2 at 16#1C# range 0 .. 31;
CNDTR2 at 16#20# range 0 .. 31;
CPAR2 at 16#24# range 0 .. 31;
CMAR2 at 16#28# range 0 .. 31;
CCR3 at 16#30# range 0 .. 31;
CNDTR3 at 16#34# range 0 .. 31;
CPAR3 at 16#38# range 0 .. 31;
CMAR3 at 16#3C# range 0 .. 31;
CCR4 at 16#44# range 0 .. 31;
CNDTR4 at 16#48# range 0 .. 31;
CPAR4 at 16#4C# range 0 .. 31;
CMAR4 at 16#50# range 0 .. 31;
CCR5 at 16#58# range 0 .. 31;
CNDTR5 at 16#5C# range 0 .. 31;
CPAR5 at 16#60# range 0 .. 31;
CMAR5 at 16#64# range 0 .. 31;
CCR6 at 16#6C# range 0 .. 31;
CNDTR6 at 16#70# range 0 .. 31;
CPAR6 at 16#74# range 0 .. 31;
CMAR6 at 16#78# range 0 .. 31;
CCR7 at 16#80# range 0 .. 31;
CNDTR7 at 16#84# range 0 .. 31;
CPAR7 at 16#88# range 0 .. 31;
CMAR7 at 16#8C# range 0 .. 31;
end record;
-- DMA controller
DMA_Periph : aliased DMA_Peripheral
with Import, Address => System'To_Address (16#40020000#);
end STM32_SVD.DMA;
|
Fabien-Chouteau/GESTE | Ada | 13,615 | ads | with GESTE;
with GESTE.Grid;
pragma Style_Checks (Off);
package Game_Assets.track_1 is
-- track_1
Width : constant := 20;
Height : constant := 15;
Tile_Width : constant := 16;
Tile_Height : constant := 16;
-- Background
package Background is
Width : constant := 20;
Height : constant := 20;
Data : aliased GESTE.Grid.Grid_Data :=
(( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106),
( 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106)) ;
end Background;
-- Track
package Track is
Width : constant := 20;
Height : constant := 20;
Data : aliased GESTE.Grid.Grid_Data :=
(( 107, 108, 109, 109, 109, 109, 109, 110, 109, 109, 109, 109, 109, 111, 112),
( 113, 114, 115, 116, 116, 116, 116, 117, 116, 116, 116, 118, 119, 120, 121),
( 122, 123, 124, 125, 126, 127, 127, 127, 127, 127, 126, 128, 129, 122, 123),
( 122, 123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 122, 123),
( 122, 123, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 122, 123),
( 122, 123, 0, 107, 108, 109, 109, 109, 109, 109, 109, 109, 109, 130, 131),
( 122, 123, 0, 113, 114, 126, 126, 126, 126, 126, 126, 126, 126, 132, 133),
( 122, 123, 0, 134, 135, 136, 137, 0, 0, 0, 0, 0, 0, 0, 0),
( 122, 123, 0, 138, 139, 115, 140, 111, 112, 0, 0, 141, 109, 109, 142),
( 143, 144, 145, 0, 0, 124, 125, 120, 121, 0, 0, 122, 114, 120, 123),
( 146, 147, 148, 0, 0, 107, 108, 130, 131, 0, 0, 122, 123, 122, 123),
( 0, 143, 144, 145, 0, 113, 114, 132, 133, 0, 0, 122, 123, 122, 123),
( 0, 146, 147, 148, 0, 134, 135, 109, 109, 136, 137, 122, 123, 122, 123),
( 0, 0, 143, 144, 145, 138, 139, 126, 126, 115, 140, 130, 131, 122, 123),
( 0, 0, 146, 147, 148, 0, 0, 0, 0, 124, 125, 132, 133, 122, 123),
( 0, 0, 0, 122, 123, 0, 0, 149, 150, 136, 137, 0, 0, 122, 123),
( 0, 0, 0, 122, 123, 149, 150, 151, 119, 115, 140, 136, 137, 122, 123),
( 0, 0, 0, 134, 135, 151, 119, 128, 129, 124, 125, 115, 140, 130, 131),
( 0, 0, 0, 138, 139, 128, 129, 0, 0, 0, 0, 124, 125, 132, 133),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0)) ;
end Track;
package gates is
Objects : Object_Array :=
(
0 => (
Kind => RECTANGLE_OBJ,
Id => 1,
Name => new String'("gate1"),
X => 0.00000E+00,
Y => 3.20000E+01,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
),
1 => (
Kind => RECTANGLE_OBJ,
Id => 2,
Name => new String'("gate2"),
X => 3.20000E+01,
Y => 0.00000E+00,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
),
2 => (
Kind => RECTANGLE_OBJ,
Id => 3,
Name => new String'("gate3"),
X => 2.40000E+02,
Y => 4.80000E+01,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
),
3 => (
Kind => RECTANGLE_OBJ,
Id => 4,
Name => new String'("gate4"),
X => 2.40000E+02,
Y => 1.44000E+02,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
),
4 => (
Kind => RECTANGLE_OBJ,
Id => 5,
Name => new String'("gate5"),
X => 2.56000E+02,
Y => 2.08000E+02,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
),
5 => (
Kind => RECTANGLE_OBJ,
Id => 6,
Name => new String'("gate6"),
X => 1.44000E+02,
Y => 2.08000E+02,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
),
6 => (
Kind => RECTANGLE_OBJ,
Id => 7,
Name => new String'("gate7"),
X => 1.44000E+02,
Y => 1.76000E+02,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
),
7 => (
Kind => RECTANGLE_OBJ,
Id => 8,
Name => new String'("gate8"),
X => 2.08000E+02,
Y => 1.60000E+02,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
),
8 => (
Kind => RECTANGLE_OBJ,
Id => 10,
Name => new String'("gate9"),
X => 1.92000E+02,
Y => 1.12000E+02,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
),
9 => (
Kind => RECTANGLE_OBJ,
Id => 11,
Name => new String'("gate10"),
X => 1.44000E+02,
Y => 1.12000E+02,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
),
10 => (
Kind => RECTANGLE_OBJ,
Id => 12,
Name => new String'("gate11"),
X => 8.00000E+01,
Y => 8.00000E+01,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
),
11 => (
Kind => RECTANGLE_OBJ,
Id => 13,
Name => new String'("gate12"),
X => 6.40000E+01,
Y => 2.08000E+02,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
),
12 => (
Kind => RECTANGLE_OBJ,
Id => 14,
Name => new String'("gate13"),
X => 0.00000E+00,
Y => 1.92000E+02,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
),
13 => (
Kind => RECTANGLE_OBJ,
Id => 16,
Name => new String'("gate14"),
X => 0.00000E+00,
Y => 1.12000E+02,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
)
);
gate1 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 1,
Name => new String'("gate1"),
X => 0.00000E+00,
Y => 3.20000E+01,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
);
gate2 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 2,
Name => new String'("gate2"),
X => 3.20000E+01,
Y => 0.00000E+00,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
);
gate3 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 3,
Name => new String'("gate3"),
X => 2.40000E+02,
Y => 4.80000E+01,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
);
gate4 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 4,
Name => new String'("gate4"),
X => 2.40000E+02,
Y => 1.44000E+02,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
);
gate5 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 5,
Name => new String'("gate5"),
X => 2.56000E+02,
Y => 2.08000E+02,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
);
gate6 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 6,
Name => new String'("gate6"),
X => 1.44000E+02,
Y => 2.08000E+02,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
);
gate7 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 7,
Name => new String'("gate7"),
X => 1.44000E+02,
Y => 1.76000E+02,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
);
gate8 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 8,
Name => new String'("gate8"),
X => 2.08000E+02,
Y => 1.60000E+02,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
);
gate9 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 10,
Name => new String'("gate9"),
X => 1.92000E+02,
Y => 1.12000E+02,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
);
gate10 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 11,
Name => new String'("gate10"),
X => 1.44000E+02,
Y => 1.12000E+02,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
);
gate11 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 12,
Name => new String'("gate11"),
X => 8.00000E+01,
Y => 8.00000E+01,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
);
gate12 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 13,
Name => new String'("gate12"),
X => 6.40000E+01,
Y => 2.08000E+02,
Width => 1.60000E+01,
Height => 3.20000E+01,
Tile_Id => 0,
Str => null
);
gate13 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 14,
Name => new String'("gate13"),
X => 0.00000E+00,
Y => 1.92000E+02,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
);
gate14 : aliased constant Object := (
Kind => RECTANGLE_OBJ,
Id => 16,
Name => new String'("gate14"),
X => 0.00000E+00,
Y => 1.12000E+02,
Width => 3.20000E+01,
Height => 1.60000E+01,
Tile_Id => 0,
Str => null
);
end gates;
package Start is
Objects : Object_Array :=
(
0 => (
Kind => POINT_OBJ,
Id => 17,
Name => null,
X => 1.60000E+01,
Y => 1.44000E+02,
Width => 0.00000E+00,
Height => 0.00000E+00,
Tile_Id => 0,
Str => null
)
);
end Start;
package AI is
Objects : Object_Array :=
(
0 => (
Kind => POLYGON_OBJ,
Id => 18,
Name => null,
X => 7.33333E+00,
Y => 9.60000E+01,
Width => 0.00000E+00,
Height => 0.00000E+00,
Tile_Id => 0,
Str => null
)
);
end AI;
end Game_Assets.track_1;
|
gitter-badger/libAnne | Ada | 52,058 | adb | package body Generics.Mathematics.Matrices is
-------------
-- Integer --
-------------
function Integer_Assert_Matrix(Value : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Value;
begin
for R of Result loop
R := +R;
end loop;
return Result;
end Integer_Assert_Matrix;
function Integer_Negate_Matrix(Value : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Value;
begin
for R of Result loop
R := -R;
end loop;
return Result;
end Integer_Negate_Matrix;
function Integer_Absolute_Value_Matrix(Value : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Value;
begin
for R of Result loop
R := abs R;
end loop;
return Result;
end Integer_Absolute_Value_Matrix;
function Integer_Add_Matrix_Matrix(Left : Integer_Matrix_Type; Right : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) + Right(I,J);
end loop;
end loop;
return Result;
end Integer_Add_Matrix_Matrix;
function Integer_Add_Matrix_Scalar(Left : Integer_Matrix_Type; Right : Integer_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Left;
begin
for R of Result loop
R := R + Right;
end loop;
return Result;
end Integer_Add_Matrix_Scalar;
function Integer_Add_Scalar_Matrix(Left : Integer_Type; Right : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Right;
begin
for R of Result loop
R := Left + R;
end loop;
return Result;
end Integer_Add_Scalar_Matrix;
function Integer_Subtract_Matrix_Matrix(Left : Integer_Matrix_Type; Right : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) - Right(I,J);
end loop;
end loop;
return Result;
end Integer_Subtract_Matrix_Matrix;
function Integer_Subtract_Matrix_Scalar(Left : Integer_Matrix_Type; Right : Integer_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Left;
begin
for R of Result loop
R := R - Right;
end loop;
return Result;
end Integer_Subtract_Matrix_Scalar;
function Integer_Subtract_Scalar_Matrix(Left : Integer_Type; Right : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Right;
begin
for R of Result loop
R := Left - R;
end loop;
return Result;
end Integer_Subtract_Scalar_Matrix;
function Integer_Multiply_Matrix_Matrix(Left : Integer_Matrix_Type; Right : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) * Right(I,J);
end loop;
end loop;
return Result;
end Integer_Multiply_Matrix_Matrix;
function Integer_Multiply_Matrix_Scalar(Left : Integer_Matrix_Type; Right : Integer_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Left;
begin
for R of Result loop
R := R * Right;
end loop;
return Result;
end Integer_Multiply_Matrix_Scalar;
function Integer_Multiply_Scalar_Matrix(Left : Integer_Type; Right : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Right;
begin
for R of Result loop
R := Left * R;
end loop;
return Result;
end Integer_Multiply_Scalar_Matrix;
function Integer_Divide_Matrix_Matrix(Left : Integer_Matrix_Type; Right : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) / Right(I,J);
end loop;
end loop;
return Result;
end Integer_Divide_Matrix_Matrix;
function Integer_Divide_Matrix_Scalar(Left : Integer_Matrix_Type; Right : Integer_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Left;
begin
for R of Result loop
R := R / Right;
end loop;
return Result;
end Integer_Divide_Matrix_Scalar;
function Integer_Divide_Scalar_Matrix(Left : Integer_Type; Right : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Right;
begin
for R of Result loop
R := Left / R;
end loop;
return Result;
end Integer_Divide_Scalar_Matrix;
function Integer_Modulus_Matrix_Matrix(Left : Integer_Matrix_Type; Right : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) mod Right(I,J);
end loop;
end loop;
return Result;
end Integer_Modulus_Matrix_Matrix;
function Integer_Modulus_Matrix_Scalar(Left : Integer_Matrix_Type; Right : Integer_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Left;
begin
for R of Result loop
R := R mod Right;
end loop;
return Result;
end Integer_Modulus_Matrix_Scalar;
function Integer_Modulus_Scalar_Matrix(Left : Integer_Type; Right : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Right;
begin
for R of Result loop
R := Left mod R;
end loop;
return Result;
end Integer_Modulus_Scalar_Matrix;
function Integer_Remainder_Matrix_Matrix(Left : Integer_Matrix_Type; Right : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) rem Right(I,J);
end loop;
end loop;
return Result;
end Integer_Remainder_Matrix_Matrix;
function Integer_Remainder_Matrix_Scalar(Left : Integer_Matrix_Type; Right : Integer_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Left;
begin
for R of Result loop
R := R rem Right;
end loop;
return Result;
end Integer_Remainder_Matrix_Scalar;
function Integer_Remainder_Scalar_Matrix(Left : Integer_Type; Right : Integer_Matrix_Type) return Integer_Matrix_Type is
Result : Integer_Matrix_Type := Right;
begin
for R of Result loop
R := Left rem R;
end loop;
return Result;
end Integer_Remainder_Scalar_Matrix;
function Integer_Equal_Matrix_Matrix(Left : Integer_Matrix_Type; Right : Integer_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) /= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Integer_Equal_Matrix_Matrix;
function Integer_Equal_Matrix_Scalar(Left : Integer_Matrix_Type; Right : Integer_Type) return Boolean is
begin
for L of Left loop
if L /= Right then
return False;
end if;
end loop;
return True;
end Integer_Equal_Matrix_Scalar;
function Integer_Equal_Scalar_Matrix(Left : Integer_Type; Right : Integer_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left /= R then
return False;
end if;
end loop;
return True;
end Integer_Equal_Scalar_Matrix;
function Integer_Lesser_Matrix_Matrix(Left : Integer_Matrix_Type; Right : Integer_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) >= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Integer_Lesser_Matrix_Matrix;
function Integer_Lesser_Matrix_Scalar(Left : Integer_Matrix_Type; Right : Integer_Type) return Boolean is
begin
for L of Left loop
if L >= Right then
return False;
end if;
end loop;
return True;
end Integer_Lesser_Matrix_Scalar;
function Integer_Lesser_Scalar_Matrix(Left : Integer_Type; Right : Integer_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left >= R then
return False;
end if;
end loop;
return True;
end Integer_Lesser_Scalar_Matrix;
function Integer_Greater_Matrix_Matrix(Left : Integer_Matrix_Type; Right : Integer_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) <= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Integer_Greater_Matrix_Matrix;
function Integer_Greater_Matrix_Scalar(Left : Integer_Matrix_Type; Right : Integer_Type) return Boolean is
begin
for L of Left loop
if L <= Right then
return False;
end if;
end loop;
return True;
end Integer_Greater_Matrix_Scalar;
function Integer_Greater_Scalar_Matrix(Left : Integer_Type; Right : Integer_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left <= R then
return False;
end if;
end loop;
return True;
end Integer_Greater_Scalar_Matrix;
function Integer_Lesser_Or_Equal_Matrix_Matrix(Left : Integer_Matrix_Type; Right : Integer_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) > Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Integer_Lesser_Or_Equal_Matrix_Matrix;
function Integer_Lesser_Or_Equal_Matrix_Scalar(Left : Integer_Matrix_Type; Right : Integer_Type) return Boolean is
begin
for L of Left loop
if L > Right then
return False;
end if;
end loop;
return True;
end Integer_Lesser_Or_Equal_Matrix_Scalar;
function Integer_Lesser_Or_Equal_Scalar_Matrix(Left : Integer_Type; Right : Integer_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left > R then
return False;
end if;
end loop;
return True;
end Integer_Lesser_Or_Equal_Scalar_Matrix;
function Integer_Greater_Or_Equal_Matrix_Matrix(Left : Integer_Matrix_Type; Right : Integer_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) < Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Integer_Greater_Or_Equal_Matrix_Matrix;
function Integer_Greater_Or_Equal_Matrix_Scalar(Left : Integer_Matrix_Type; Right : Integer_Type) return Boolean is
begin
for L of Left loop
if L < Right then
return False;
end if;
end loop;
return True;
end Integer_Greater_Or_Equal_Matrix_Scalar;
function Integer_Greater_Or_Equal_Scalar_Matrix(Left : Integer_Type; Right : Integer_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left < R then
return False;
end if;
end loop;
return True;
end Integer_Greater_Or_Equal_Scalar_Matrix;
-------------
-- Modular --
-------------
function Modular_Assert_Matrix(Value : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Value;
begin
for R of Result loop
R := +R;
end loop;
return Result;
end Modular_Assert_Matrix;
function Modular_Negate_Matrix(Value : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Value;
begin
for R of Result loop
R := -R;
end loop;
return Result;
end Modular_Negate_Matrix;
function Modular_Absolute_Value_Matrix(Value : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Value;
begin
for R of Result loop
R := abs R;
end loop;
return Result;
end Modular_Absolute_Value_Matrix;
function Modular_Add_Matrix_Matrix(Left : Modular_Matrix_Type; Right : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) + Right(I,J);
end loop;
end loop;
return Result;
end Modular_Add_Matrix_Matrix;
function Modular_Add_Matrix_Scalar(Left : Modular_Matrix_Type; Right : Modular_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Left;
begin
for R of Result loop
R := R + Right;
end loop;
return Result;
end Modular_Add_Matrix_Scalar;
function Modular_Add_Scalar_Matrix(Left : Modular_Type; Right : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Right;
begin
for R of Result loop
R := Left + R;
end loop;
return Result;
end Modular_Add_Scalar_Matrix;
function Modular_Subtract_Matrix_Matrix(Left : Modular_Matrix_Type; Right : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) - Right(I,J);
end loop;
end loop;
return Result;
end Modular_Subtract_Matrix_Matrix;
function Modular_Subtract_Matrix_Scalar(Left : Modular_Matrix_Type; Right : Modular_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Left;
begin
for R of Result loop
R := R - Right;
end loop;
return Result;
end Modular_Subtract_Matrix_Scalar;
function Modular_Subtract_Scalar_Matrix(Left : Modular_Type; Right : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Right;
begin
for R of Result loop
R := Left - R;
end loop;
return Result;
end Modular_Subtract_Scalar_Matrix;
function Modular_Multiply_Matrix_Matrix(Left : Modular_Matrix_Type; Right : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) * Right(I,J);
end loop;
end loop;
return Result;
end Modular_Multiply_Matrix_Matrix;
function Modular_Multiply_Matrix_Scalar(Left : Modular_Matrix_Type; Right : Modular_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Left;
begin
for R of Result loop
R := R * Right;
end loop;
return Result;
end Modular_Multiply_Matrix_Scalar;
function Modular_Multiply_Scalar_Matrix(Left : Modular_Type; Right : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Right;
begin
for R of Result loop
R := Left * R;
end loop;
return Result;
end Modular_Multiply_Scalar_Matrix;
function Modular_Divide_Matrix_Matrix(Left : Modular_Matrix_Type; Right : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) / Right(I,J);
end loop;
end loop;
return Result;
end Modular_Divide_Matrix_Matrix;
function Modular_Divide_Matrix_Scalar(Left : Modular_Matrix_Type; Right : Modular_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Left;
begin
for R of Result loop
R := R / Right;
end loop;
return Result;
end Modular_Divide_Matrix_Scalar;
function Modular_Divide_Scalar_Matrix(Left : Modular_Type; Right : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Right;
begin
for R of Result loop
R := Left / R;
end loop;
return Result;
end Modular_Divide_Scalar_Matrix;
function Modular_Modulus_Matrix_Matrix(Left : Modular_Matrix_Type; Right : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) mod Right(I,J);
end loop;
end loop;
return Result;
end Modular_Modulus_Matrix_Matrix;
function Modular_Modulus_Matrix_Scalar(Left : Modular_Matrix_Type; Right : Modular_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Left;
begin
for R of Result loop
R := R mod Right;
end loop;
return Result;
end Modular_Modulus_Matrix_Scalar;
function Modular_Modulus_Scalar_Matrix(Left : Modular_Type; Right : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Right;
begin
for R of Result loop
R := Left mod R;
end loop;
return Result;
end Modular_Modulus_Scalar_Matrix;
function Modular_Remainder_Matrix_Matrix(Left : Modular_Matrix_Type; Right : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) rem Right(I,J);
end loop;
end loop;
return Result;
end Modular_Remainder_Matrix_Matrix;
function Modular_Remainder_Matrix_Scalar(Left : Modular_Matrix_Type; Right : Modular_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Left;
begin
for R of Result loop
R := R rem Right;
end loop;
return Result;
end Modular_Remainder_Matrix_Scalar;
function Modular_Remainder_Scalar_Matrix(Left : Modular_Type; Right : Modular_Matrix_Type) return Modular_Matrix_Type is
Result : Modular_Matrix_Type := Right;
begin
for R of Result loop
R := Left rem R;
end loop;
return Result;
end Modular_Remainder_Scalar_Matrix;
function Modular_Equal_Matrix_Matrix(Left : Modular_Matrix_Type; Right : Modular_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) /= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Modular_Equal_Matrix_Matrix;
function Modular_Equal_Matrix_Scalar(Left : Modular_Matrix_Type; Right : Modular_Type) return Boolean is
begin
for L of Left loop
if L /= Right then
return False;
end if;
end loop;
return True;
end Modular_Equal_Matrix_Scalar;
function Modular_Equal_Scalar_Matrix(Left : Modular_Type; Right : Modular_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left /= R then
return False;
end if;
end loop;
return True;
end Modular_Equal_Scalar_Matrix;
function Modular_Lesser_Matrix_Matrix(Left : Modular_Matrix_Type; Right : Modular_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) >= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Modular_Lesser_Matrix_Matrix;
function Modular_Lesser_Matrix_Scalar(Left : Modular_Matrix_Type; Right : Modular_Type) return Boolean is
begin
for L of Left loop
if L >= Right then
return False;
end if;
end loop;
return True;
end Modular_Lesser_Matrix_Scalar;
function Modular_Lesser_Scalar_Matrix(Left : Modular_Type; Right : Modular_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left >= R then
return False;
end if;
end loop;
return True;
end Modular_Lesser_Scalar_Matrix;
function Modular_Greater_Matrix_Matrix(Left : Modular_Matrix_Type; Right : Modular_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) <= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Modular_Greater_Matrix_Matrix;
function Modular_Greater_Matrix_Scalar(Left : Modular_Matrix_Type; Right : Modular_Type) return Boolean is
begin
for L of Left loop
if L <= Right then
return False;
end if;
end loop;
return True;
end Modular_Greater_Matrix_Scalar;
function Modular_Greater_Scalar_Matrix(Left : Modular_Type; Right : Modular_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left <= R then
return False;
end if;
end loop;
return True;
end Modular_Greater_Scalar_Matrix;
function Modular_Lesser_Or_Equal_Matrix_Matrix(Left : Modular_Matrix_Type; Right : Modular_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) > Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Modular_Lesser_Or_Equal_Matrix_Matrix;
function Modular_Lesser_Or_Equal_Matrix_Scalar(Left : Modular_Matrix_Type; Right : Modular_Type) return Boolean is
begin
for L of Left loop
if L > Right then
return False;
end if;
end loop;
return True;
end Modular_Lesser_Or_Equal_Matrix_Scalar;
function Modular_Lesser_Or_Equal_Scalar_Matrix(Left : Modular_Type; Right : Modular_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left > R then
return False;
end if;
end loop;
return True;
end Modular_Lesser_Or_Equal_Scalar_Matrix;
function Modular_Greater_Or_Equal_Matrix_Matrix(Left : Modular_Matrix_Type; Right : Modular_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) < Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Modular_Greater_Or_Equal_Matrix_Matrix;
function Modular_Greater_Or_Equal_Matrix_Scalar(Left : Modular_Matrix_Type; Right : Modular_Type) return Boolean is
begin
for L of Left loop
if L < Right then
return False;
end if;
end loop;
return True;
end Modular_Greater_Or_Equal_Matrix_Scalar;
function Modular_Greater_Or_Equal_Scalar_Matrix(Left : Modular_Type; Right : Modular_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left < R then
return False;
end if;
end loop;
return True;
end Modular_Greater_Or_Equal_Scalar_Matrix;
-----------
-- Fixed --
-----------
function Fixed_Assert_Matrix(Value : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Value;
begin
for R of Result loop
R := +R;
end loop;
return Result;
end Fixed_Assert_Matrix;
function Fixed_Negate_Matrix(Value : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Value;
begin
for R of Result loop
R := -R;
end loop;
return Result;
end Fixed_Negate_Matrix;
function Fixed_Absolute_Value_Matrix(Value : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Value;
begin
for R of Result loop
R := abs R;
end loop;
return Result;
end Fixed_Absolute_Value_Matrix;
function Fixed_Add_Matrix_Matrix(Left : Fixed_Matrix_Type; Right : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) + Right(I,J);
end loop;
end loop;
return Result;
end Fixed_Add_Matrix_Matrix;
function Fixed_Add_Matrix_Scalar(Left : Fixed_Matrix_Type; Right : Fixed_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Left;
begin
for R of Result loop
R := R + Right;
end loop;
return Result;
end Fixed_Add_Matrix_Scalar;
function Fixed_Add_Scalar_Matrix(Left : Fixed_Type; Right : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Right;
begin
for R of Result loop
R := Left + R;
end loop;
return Result;
end Fixed_Add_Scalar_Matrix;
function Fixed_Subtract_Matrix_Matrix(Left : Fixed_Matrix_Type; Right : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) - Right(I,J);
end loop;
end loop;
return Result;
end Fixed_Subtract_Matrix_Matrix;
function Fixed_Subtract_Matrix_Scalar(Left : Fixed_Matrix_Type; Right : Fixed_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Left;
begin
for R of Result loop
R := R - Right;
end loop;
return Result;
end Fixed_Subtract_Matrix_Scalar;
function Fixed_Subtract_Scalar_Matrix(Left : Fixed_Type; Right : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Right;
begin
for R of Result loop
R := Left - R;
end loop;
return Result;
end Fixed_Subtract_Scalar_Matrix;
function Fixed_Multiply_Matrix_Matrix(Left : Fixed_Matrix_Type; Right : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) * Right(I,J);
end loop;
end loop;
return Result;
end Fixed_Multiply_Matrix_Matrix;
function Fixed_Multiply_Matrix_Scalar(Left : Fixed_Matrix_Type; Right : Fixed_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Left;
begin
for R of Result loop
R := R * Right;
end loop;
return Result;
end Fixed_Multiply_Matrix_Scalar;
function Fixed_Multiply_Scalar_Matrix(Left : Fixed_Type; Right : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Right;
begin
for R of Result loop
R := Left * R;
end loop;
return Result;
end Fixed_Multiply_Scalar_Matrix;
function Fixed_Divide_Matrix_Matrix(Left : Fixed_Matrix_Type; Right : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) / Right(I,J);
end loop;
end loop;
return Result;
end Fixed_Divide_Matrix_Matrix;
function Fixed_Divide_Matrix_Scalar(Left : Fixed_Matrix_Type; Right : Fixed_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Left;
begin
for R of Result loop
R := R / Right;
end loop;
return Result;
end Fixed_Divide_Matrix_Scalar;
function Fixed_Divide_Scalar_Matrix(Left : Fixed_Type; Right : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Right;
begin
for R of Result loop
R := Left / R;
end loop;
return Result;
end Fixed_Divide_Scalar_Matrix;
function Fixed_Modulus_Matrix_Matrix(Left : Fixed_Matrix_Type; Right : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) mod Right(I,J);
end loop;
end loop;
return Result;
end Fixed_Modulus_Matrix_Matrix;
function Fixed_Modulus_Matrix_Scalar(Left : Fixed_Matrix_Type; Right : Fixed_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Left;
begin
for R of Result loop
R := R mod Right;
end loop;
return Result;
end Fixed_Modulus_Matrix_Scalar;
function Fixed_Modulus_Scalar_Matrix(Left : Fixed_Type; Right : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Right;
begin
for R of Result loop
R := Left mod R;
end loop;
return Result;
end Fixed_Modulus_Scalar_Matrix;
function Fixed_Remainder_Matrix_Matrix(Left : Fixed_Matrix_Type; Right : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) rem Right(I,J);
end loop;
end loop;
return Result;
end Fixed_Remainder_Matrix_Matrix;
function Fixed_Remainder_Matrix_Scalar(Left : Fixed_Matrix_Type; Right : Fixed_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Left;
begin
for R of Result loop
R := R rem Right;
end loop;
return Result;
end Fixed_Remainder_Matrix_Scalar;
function Fixed_Remainder_Scalar_Matrix(Left : Fixed_Type; Right : Fixed_Matrix_Type) return Fixed_Matrix_Type is
Result : Fixed_Matrix_Type := Right;
begin
for R of Result loop
R := Left rem R;
end loop;
return Result;
end Fixed_Remainder_Scalar_Matrix;
function Fixed_Equal_Matrix_Matrix(Left : Fixed_Matrix_Type; Right : Fixed_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) /= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Fixed_Equal_Matrix_Matrix;
function Fixed_Equal_Matrix_Scalar(Left : Fixed_Matrix_Type; Right : Fixed_Type) return Boolean is
begin
for L of Left loop
if L /= Right then
return False;
end if;
end loop;
return True;
end Fixed_Equal_Matrix_Scalar;
function Fixed_Equal_Scalar_Matrix(Left : Fixed_Type; Right : Fixed_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left /= R then
return False;
end if;
end loop;
return True;
end Fixed_Equal_Scalar_Matrix;
function Fixed_Lesser_Matrix_Matrix(Left : Fixed_Matrix_Type; Right : Fixed_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) >= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Fixed_Lesser_Matrix_Matrix;
function Fixed_Lesser_Matrix_Scalar(Left : Fixed_Matrix_Type; Right : Fixed_Type) return Boolean is
begin
for L of Left loop
if L >= Right then
return False;
end if;
end loop;
return True;
end Fixed_Lesser_Matrix_Scalar;
function Fixed_Lesser_Scalar_Matrix(Left : Fixed_Type; Right : Fixed_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left >= R then
return False;
end if;
end loop;
return True;
end Fixed_Lesser_Scalar_Matrix;
function Fixed_Greater_Matrix_Matrix(Left : Fixed_Matrix_Type; Right : Fixed_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) <= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Fixed_Greater_Matrix_Matrix;
function Fixed_Greater_Matrix_Scalar(Left : Fixed_Matrix_Type; Right : Fixed_Type) return Boolean is
begin
for L of Left loop
if L <= Right then
return False;
end if;
end loop;
return True;
end Fixed_Greater_Matrix_Scalar;
function Fixed_Greater_Scalar_Matrix(Left : Fixed_Type; Right : Fixed_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left <= R then
return False;
end if;
end loop;
return True;
end Fixed_Greater_Scalar_Matrix;
function Fixed_Lesser_Or_Equal_Matrix_Matrix(Left : Fixed_Matrix_Type; Right : Fixed_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) > Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Fixed_Lesser_Or_Equal_Matrix_Matrix;
function Fixed_Lesser_Or_Equal_Matrix_Scalar(Left : Fixed_Matrix_Type; Right : Fixed_Type) return Boolean is
begin
for L of Left loop
if L > Right then
return False;
end if;
end loop;
return True;
end Fixed_Lesser_Or_Equal_Matrix_Scalar;
function Fixed_Lesser_Or_Equal_Scalar_Matrix(Left : Fixed_Type; Right : Fixed_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left > R then
return False;
end if;
end loop;
return True;
end Fixed_Lesser_Or_Equal_Scalar_Matrix;
function Fixed_Greater_Or_Equal_Matrix_Matrix(Left : Fixed_Matrix_Type; Right : Fixed_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) < Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Fixed_Greater_Or_Equal_Matrix_Matrix;
function Fixed_Greater_Or_Equal_Matrix_Scalar(Left : Fixed_Matrix_Type; Right : Fixed_Type) return Boolean is
begin
for L of Left loop
if L < Right then
return False;
end if;
end loop;
return True;
end Fixed_Greater_Or_Equal_Matrix_Scalar;
function Fixed_Greater_Or_Equal_Scalar_Matrix(Left : Fixed_Type; Right : Fixed_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left < R then
return False;
end if;
end loop;
return True;
end Fixed_Greater_Or_Equal_Scalar_Matrix;
-------------
-- Decimal --
-------------
function Decimal_Assert_Matrix(Value : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Value;
begin
for R of Result loop
R := +R;
end loop;
return Result;
end Decimal_Assert_Matrix;
function Decimal_Negate_Matrix(Value : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Value;
begin
for R of Result loop
R := -R;
end loop;
return Result;
end Decimal_Negate_Matrix;
function Decimal_Absolute_Value_Matrix(Value : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Value;
begin
for R of Result loop
R := abs R;
end loop;
return Result;
end Decimal_Absolute_Value_Matrix;
function Decimal_Add_Matrix_Matrix(Left : Decimal_Matrix_Type; Right : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) + Right(I,J);
end loop;
end loop;
return Result;
end Decimal_Add_Matrix_Matrix;
function Decimal_Add_Matrix_Scalar(Left : Decimal_Matrix_Type; Right : Decimal_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Left;
begin
for R of Result loop
R := R + Right;
end loop;
return Result;
end Decimal_Add_Matrix_Scalar;
function Decimal_Add_Scalar_Matrix(Left : Decimal_Type; Right : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Right;
begin
for R of Result loop
R := Left + R;
end loop;
return Result;
end Decimal_Add_Scalar_Matrix;
function Decimal_Subtract_Matrix_Matrix(Left : Decimal_Matrix_Type; Right : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) - Right(I,J);
end loop;
end loop;
return Result;
end Decimal_Subtract_Matrix_Matrix;
function Decimal_Subtract_Matrix_Scalar(Left : Decimal_Matrix_Type; Right : Decimal_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Left;
begin
for R of Result loop
R := R - Right;
end loop;
return Result;
end Decimal_Subtract_Matrix_Scalar;
function Decimal_Subtract_Scalar_Matrix(Left : Decimal_Type; Right : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Right;
begin
for R of Result loop
R := Left - R;
end loop;
return Result;
end Decimal_Subtract_Scalar_Matrix;
function Decimal_Multiply_Matrix_Matrix(Left : Decimal_Matrix_Type; Right : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) * Right(I,J);
end loop;
end loop;
return Result;
end Decimal_Multiply_Matrix_Matrix;
function Decimal_Multiply_Matrix_Scalar(Left : Decimal_Matrix_Type; Right : Decimal_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Left;
begin
for R of Result loop
R := R * Right;
end loop;
return Result;
end Decimal_Multiply_Matrix_Scalar;
function Decimal_Multiply_Scalar_Matrix(Left : Decimal_Type; Right : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Right;
begin
for R of Result loop
R := Left * R;
end loop;
return Result;
end Decimal_Multiply_Scalar_Matrix;
function Decimal_Divide_Matrix_Matrix(Left : Decimal_Matrix_Type; Right : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) / Right(I,J);
end loop;
end loop;
return Result;
end Decimal_Divide_Matrix_Matrix;
function Decimal_Divide_Matrix_Scalar(Left : Decimal_Matrix_Type; Right : Decimal_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Left;
begin
for R of Result loop
R := R / Right;
end loop;
return Result;
end Decimal_Divide_Matrix_Scalar;
function Decimal_Divide_Scalar_Matrix(Left : Decimal_Type; Right : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Right;
begin
for R of Result loop
R := Left / R;
end loop;
return Result;
end Decimal_Divide_Scalar_Matrix;
function Decimal_Modulus_Matrix_Matrix(Left : Decimal_Matrix_Type; Right : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) mod Right(I,J);
end loop;
end loop;
return Result;
end Decimal_Modulus_Matrix_Matrix;
function Decimal_Modulus_Matrix_Scalar(Left : Decimal_Matrix_Type; Right : Decimal_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Left;
begin
for R of Result loop
R := R mod Right;
end loop;
return Result;
end Decimal_Modulus_Matrix_Scalar;
function Decimal_Modulus_Scalar_Matrix(Left : Decimal_Type; Right : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Right;
begin
for R of Result loop
R := Left mod R;
end loop;
return Result;
end Decimal_Modulus_Scalar_Matrix;
function Decimal_Remainder_Matrix_Matrix(Left : Decimal_Matrix_Type; Right : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) rem Right(I,J);
end loop;
end loop;
return Result;
end Decimal_Remainder_Matrix_Matrix;
function Decimal_Remainder_Matrix_Scalar(Left : Decimal_Matrix_Type; Right : Decimal_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Left;
begin
for R of Result loop
R := R rem Right;
end loop;
return Result;
end Decimal_Remainder_Matrix_Scalar;
function Decimal_Remainder_Scalar_Matrix(Left : Decimal_Type; Right : Decimal_Matrix_Type) return Decimal_Matrix_Type is
Result : Decimal_Matrix_Type := Right;
begin
for R of Result loop
R := Left rem R;
end loop;
return Result;
end Decimal_Remainder_Scalar_Matrix;
function Decimal_Equal_Matrix_Matrix(Left : Decimal_Matrix_Type; Right : Decimal_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) /= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Decimal_Equal_Matrix_Matrix;
function Decimal_Equal_Matrix_Scalar(Left : Decimal_Matrix_Type; Right : Decimal_Type) return Boolean is
begin
for L of Left loop
if L /= Right then
return False;
end if;
end loop;
return True;
end Decimal_Equal_Matrix_Scalar;
function Decimal_Equal_Scalar_Matrix(Left : Decimal_Type; Right : Decimal_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left /= R then
return False;
end if;
end loop;
return True;
end Decimal_Equal_Scalar_Matrix;
function Decimal_Lesser_Matrix_Matrix(Left : Decimal_Matrix_Type; Right : Decimal_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) >= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Decimal_Lesser_Matrix_Matrix;
function Decimal_Lesser_Matrix_Scalar(Left : Decimal_Matrix_Type; Right : Decimal_Type) return Boolean is
begin
for L of Left loop
if L >= Right then
return False;
end if;
end loop;
return True;
end Decimal_Lesser_Matrix_Scalar;
function Decimal_Lesser_Scalar_Matrix(Left : Decimal_Type; Right : Decimal_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left >= R then
return False;
end if;
end loop;
return True;
end Decimal_Lesser_Scalar_Matrix;
function Decimal_Greater_Matrix_Matrix(Left : Decimal_Matrix_Type; Right : Decimal_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) <= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Decimal_Greater_Matrix_Matrix;
function Decimal_Greater_Matrix_Scalar(Left : Decimal_Matrix_Type; Right : Decimal_Type) return Boolean is
begin
for L of Left loop
if L <= Right then
return False;
end if;
end loop;
return True;
end Decimal_Greater_Matrix_Scalar;
function Decimal_Greater_Scalar_Matrix(Left : Decimal_Type; Right : Decimal_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left <= R then
return False;
end if;
end loop;
return True;
end Decimal_Greater_Scalar_Matrix;
function Decimal_Lesser_Or_Equal_Matrix_Matrix(Left : Decimal_Matrix_Type; Right : Decimal_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) > Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Decimal_Lesser_Or_Equal_Matrix_Matrix;
function Decimal_Lesser_Or_Equal_Matrix_Scalar(Left : Decimal_Matrix_Type; Right : Decimal_Type) return Boolean is
begin
for L of Left loop
if L > Right then
return False;
end if;
end loop;
return True;
end Decimal_Lesser_Or_Equal_Matrix_Scalar;
function Decimal_Lesser_Or_Equal_Scalar_Matrix(Left : Decimal_Type; Right : Decimal_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left > R then
return False;
end if;
end loop;
return True;
end Decimal_Lesser_Or_Equal_Scalar_Matrix;
function Decimal_Greater_Or_Equal_Matrix_Matrix(Left : Decimal_Matrix_Type; Right : Decimal_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) < Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Decimal_Greater_Or_Equal_Matrix_Matrix;
function Decimal_Greater_Or_Equal_Matrix_Scalar(Left : Decimal_Matrix_Type; Right : Decimal_Type) return Boolean is
begin
for L of Left loop
if L < Right then
return False;
end if;
end loop;
return True;
end Decimal_Greater_Or_Equal_Matrix_Scalar;
function Decimal_Greater_Or_Equal_Scalar_Matrix(Left : Decimal_Type; Right : Decimal_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left < R then
return False;
end if;
end loop;
return True;
end Decimal_Greater_Or_Equal_Scalar_Matrix;
-----------
-- Float --
-----------
function Float_Assert_Matrix(Value : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Value;
begin
for R of Result loop
R := +R;
end loop;
return Result;
end Float_Assert_Matrix;
function Float_Negate_Matrix(Value : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Value;
begin
for R of Result loop
R := -R;
end loop;
return Result;
end Float_Negate_Matrix;
function Float_Absolute_Value_Matrix(Value : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Value;
begin
for R of Result loop
R := abs R;
end loop;
return Result;
end Float_Absolute_Value_Matrix;
function Float_Add_Matrix_Matrix(Left : Float_Matrix_Type; Right : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) + Right(I,J);
end loop;
end loop;
return Result;
end Float_Add_Matrix_Matrix;
function Float_Add_Matrix_Scalar(Left : Float_Matrix_Type; Right : Float_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Left;
begin
for R of Result loop
R := R + Right;
end loop;
return Result;
end Float_Add_Matrix_Scalar;
function Float_Add_Scalar_Matrix(Left : Float_Type; Right : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Right;
begin
for R of Result loop
R := Left + R;
end loop;
return Result;
end Float_Add_Scalar_Matrix;
function Float_Subtract_Matrix_Matrix(Left : Float_Matrix_Type; Right : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) - Right(I,J);
end loop;
end loop;
return Result;
end Float_Subtract_Matrix_Matrix;
function Float_Subtract_Matrix_Scalar(Left : Float_Matrix_Type; Right : Float_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Left;
begin
for R of Result loop
R := R - Right;
end loop;
return Result;
end Float_Subtract_Matrix_Scalar;
function Float_Subtract_Scalar_Matrix(Left : Float_Type; Right : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Right;
begin
for R of Result loop
R := Left - R;
end loop;
return Result;
end Float_Subtract_Scalar_Matrix;
function Float_Multiply_Matrix_Matrix(Left : Float_Matrix_Type; Right : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) * Right(I,J);
end loop;
end loop;
return Result;
end Float_Multiply_Matrix_Matrix;
function Float_Multiply_Matrix_Scalar(Left : Float_Matrix_Type; Right : Float_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Left;
begin
for R of Result loop
R := R * Right;
end loop;
return Result;
end Float_Multiply_Matrix_Scalar;
function Float_Multiply_Scalar_Matrix(Left : Float_Type; Right : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Right;
begin
for R of Result loop
R := Left * R;
end loop;
return Result;
end Float_Multiply_Scalar_Matrix;
function Float_Divide_Matrix_Matrix(Left : Float_Matrix_Type; Right : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) / Right(I,J);
end loop;
end loop;
return Result;
end Float_Divide_Matrix_Matrix;
function Float_Divide_Matrix_Scalar(Left : Float_Matrix_Type; Right : Float_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Left;
begin
for R of Result loop
R := R / Right;
end loop;
return Result;
end Float_Divide_Matrix_Scalar;
function Float_Divide_Scalar_Matrix(Left : Float_Type; Right : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Right;
begin
for R of Result loop
R := Left / R;
end loop;
return Result;
end Float_Divide_Scalar_Matrix;
function Float_Modulus_Matrix_Matrix(Left : Float_Matrix_Type; Right : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) mod Right(I,J);
end loop;
end loop;
return Result;
end Float_Modulus_Matrix_Matrix;
function Float_Modulus_Matrix_Scalar(Left : Float_Matrix_Type; Right : Float_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Left;
begin
for R of Result loop
R := R mod Right;
end loop;
return Result;
end Float_Modulus_Matrix_Scalar;
function Float_Modulus_Scalar_Matrix(Left : Float_Type; Right : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Right;
begin
for R of Result loop
R := Left mod R;
end loop;
return Result;
end Float_Modulus_Scalar_Matrix;
function Float_Remainder_Matrix_Matrix(Left : Float_Matrix_Type; Right : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Left;
begin
for I in 1..Result'Length(1) loop
for J in 1..Result'Length(2) loop
Result(I,J) := Left(I,J) rem Right(I,J);
end loop;
end loop;
return Result;
end Float_Remainder_Matrix_Matrix;
function Float_Remainder_Matrix_Scalar(Left : Float_Matrix_Type; Right : Float_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Left;
begin
for R of Result loop
R := R rem Right;
end loop;
return Result;
end Float_Remainder_Matrix_Scalar;
function Float_Remainder_Scalar_Matrix(Left : Float_Type; Right : Float_Matrix_Type) return Float_Matrix_Type is
Result : Float_Matrix_Type := Right;
begin
for R of Result loop
R := Left rem R;
end loop;
return Result;
end Float_Remainder_Scalar_Matrix;
function Float_Equal_Matrix_Matrix(Left : Float_Matrix_Type; Right : Float_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) /= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Float_Equal_Matrix_Matrix;
function Float_Equal_Matrix_Scalar(Left : Float_Matrix_Type; Right : Float_Type) return Boolean is
begin
for L of Left loop
if L /= Right then
return False;
end if;
end loop;
return True;
end Float_Equal_Matrix_Scalar;
function Float_Equal_Scalar_Matrix(Left : Float_Type; Right : Float_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left /= R then
return False;
end if;
end loop;
return True;
end Float_Equal_Scalar_Matrix;
function Float_Lesser_Matrix_Matrix(Left : Float_Matrix_Type; Right : Float_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) >= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Float_Lesser_Matrix_Matrix;
function Float_Lesser_Matrix_Scalar(Left : Float_Matrix_Type; Right : Float_Type) return Boolean is
begin
for L of Left loop
if L >= Right then
return False;
end if;
end loop;
return True;
end Float_Lesser_Matrix_Scalar;
function Float_Lesser_Scalar_Matrix(Left : Float_Type; Right : Float_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left >= R then
return False;
end if;
end loop;
return True;
end Float_Lesser_Scalar_Matrix;
function Float_Greater_Matrix_Matrix(Left : Float_Matrix_Type; Right : Float_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) <= Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Float_Greater_Matrix_Matrix;
function Float_Greater_Matrix_Scalar(Left : Float_Matrix_Type; Right : Float_Type) return Boolean is
begin
for L of Left loop
if L <= Right then
return False;
end if;
end loop;
return True;
end Float_Greater_Matrix_Scalar;
function Float_Greater_Scalar_Matrix(Left : Float_Type; Right : Float_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left <= R then
return False;
end if;
end loop;
return True;
end Float_Greater_Scalar_Matrix;
function Float_Lesser_Or_Equal_Matrix_Matrix(Left : Float_Matrix_Type; Right : Float_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) > Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Float_Lesser_Or_Equal_Matrix_Matrix;
function Float_Lesser_Or_Equal_Matrix_Scalar(Left : Float_Matrix_Type; Right : Float_Type) return Boolean is
begin
for L of Left loop
if L > Right then
return False;
end if;
end loop;
return True;
end Float_Lesser_Or_Equal_Matrix_Scalar;
function Float_Lesser_Or_Equal_Scalar_Matrix(Left : Float_Type; Right : Float_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left > R then
return False;
end if;
end loop;
return True;
end Float_Lesser_Or_Equal_Scalar_Matrix;
function Float_Greater_Or_Equal_Matrix_Matrix(Left : Float_Matrix_Type; Right : Float_Matrix_Type) return Boolean is
begin
for I in 1..Left'Length(1) loop
for J in 1..Left'Length(2) loop
if Left(I,J) < Right(I,J) then
return False;
end if;
end loop;
end loop;
return True;
end Float_Greater_Or_Equal_Matrix_Matrix;
function Float_Greater_Or_Equal_Matrix_Scalar(Left : Float_Matrix_Type; Right : Float_Type) return Boolean is
begin
for L of Left loop
if L < Right then
return False;
end if;
end loop;
return True;
end Float_Greater_Or_Equal_Matrix_Scalar;
function Float_Greater_Or_Equal_Scalar_Matrix(Left : Float_Type; Right : Float_Matrix_Type) return Boolean is
begin
for R of Right loop
if Left < R then
return False;
end if;
end loop;
return True;
end Float_Greater_Or_Equal_Scalar_Matrix;
end Generics.Mathematics.Matrices;
|
DrenfongWong/tkm-rpc | Ada | 1,032 | ads | with Tkmrpc.Types;
with Tkmrpc.Operations.Ike;
package Tkmrpc.Response.Ike.Tkm_Reset is
Data_Size : constant := 0;
Padding_Size : constant := Response.Body_Size - Data_Size;
subtype Padding_Range is Natural range 1 .. Padding_Size;
subtype Padding_Type is Types.Byte_Sequence (Padding_Range);
type Response_Type is record
Header : Response.Header_Type;
Padding : Padding_Type;
end record;
for Response_Type use record
Header at 0 range 0 .. (Response.Header_Size * 8) - 1;
Padding at Response.Header_Size + Data_Size range
0 .. (Padding_Size * 8) - 1;
end record;
for Response_Type'Size use Response.Response_Size * 8;
Null_Response : constant Response_Type :=
Response_Type'
(Header =>
Response.Header_Type'(Operation => Operations.Ike.Tkm_Reset,
Result => Results.Invalid_Operation,
Request_Id => 0),
Padding => Padding_Type'(others => 0));
end Tkmrpc.Response.Ike.Tkm_Reset;
|
mitchelhaan/ncurses | Ada | 5,181 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding --
-- --
-- Terminal_Interface.Curses.Forms.Field_Types.Enumeration --
-- --
-- S P E C --
-- --
------------------------------------------------------------------------------
-- Copyright (c) 1998 Free Software Foundation, Inc. --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining a --
-- copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, distribute with modifications, sublicense, and/or sell --
-- copies of the Software, and to permit persons to whom the Software is --
-- furnished to do so, subject to the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be included --
-- in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS --
-- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, --
-- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR --
-- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR --
-- THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
-- --
-- Except as contained in this notice, the name(s) of the above copyright --
-- holders shall not be used in advertising or otherwise to promote the --
-- sale, use or other dealings in this Software without prior written --
-- authorization. --
------------------------------------------------------------------------------
-- Author: Juergen Pfeifer <[email protected]> 1996
-- Version Control:
-- $Revision: 1.5 $
-- Binding Version 00.93
------------------------------------------------------------------------------
with Interfaces.C.Strings;
package Terminal_Interface.Curses.Forms.Field_Types.Enumeration is
pragma Preelaborate (Enumeration);
type String_Access is access String;
-- Type_Set is used by the child package Ada
type Type_Set is (Lower_Case, Upper_Case, Mixed_Case);
type Enum_Array is array (Positive range <>)
of String_Access;
type Enumeration_Info (C : Positive) is
record
Names : Enum_Array (1 .. C);
Case_Sensitive : Boolean := False;
Match_Must_Be_Unique : Boolean := False;
end record;
type Enumeration_Field is new Field_Type with private;
function Create (Info : Enumeration_Info;
Auto_Release_Names : Boolean := False)
return Enumeration_Field;
-- Make an fieldtype from the info. Enumerations are special, because
-- they normally don't copy the enum values into a private store, so
-- we have to care for the lifetime of the info we provide.
-- The Auto_Release_Names flag may be used to automatically releases
-- the strings in the Names array of the Enumeration_Info.
function Make_Enumeration_Type (Info : Enumeration_Info;
Auto_Release_Names : Boolean := False)
return Enumeration_Field renames Create;
procedure Release (Enum : in out Enumeration_Field);
-- But we may want to release the field to release the memory allocated
-- by it internally. After that the Enumeration field is no longer usable.
-- The next type defintions are all ncurses extensions. They are typically
-- not available in other curses implementations.
procedure Set_Field_Type (Fld : in Field;
Typ : in Enumeration_Field);
pragma Inline (Set_Field_Type);
private
type CPA_Access is access Interfaces.C.Strings.chars_ptr_array;
type Enumeration_Field is new Field_Type with
record
Case_Sensitive : Boolean := False;
Match_Must_Be_Unique : Boolean := False;
Arr : CPA_Access := null;
end record;
end Terminal_Interface.Curses.Forms.Field_Types.Enumeration;
|
strenkml/EE368 | Ada | 1,121 | adb |
package body Benchmark.Matrix.MM is
function Create_MM return Benchmark_Pointer is
begin
return new MM_Type;
end Create_MM;
procedure Run(benchmark : in MM_Type) is
msize : constant Address_Type := Get_Size(benchmark);
srca : constant Address_Type := 0 * msize;
srcb : constant Address_Type := 1 * msize;
dest : constant Address_Type := 2 * msize;
begin
for i in 1 .. benchmark.iterations loop
for a in 0 .. benchmark.size - 1 loop
for b in 0 .. benchmark.size - 1 loop
Write(benchmark, dest, a, b);
Idle(benchmark, benchmark.spacing);
for c in 0 .. benchmark.size - 1 loop
Read(benchmark, srca, b, c);
Idle(benchmark, benchmark.spacing);
Read(benchmark, srcb, c, a);
Idle(benchmark, benchmark.spacing);
Write(benchmark, dest, a, b);
Idle(benchmark, benchmark.spacing);
end loop;
end loop;
end loop;
end loop;
end Run;
end Benchmark.Matrix.MM;
|
Intelligente-sanntidssystemer/Ada-prosjekt | Ada | 210 | ads | package car_priorities is
task type Direction_Steering; --Turning--
task type Motor_Steering; --Forward/Backward --
task type Emergency_Stop; --Sensor and distance checking --
end car_priorities;
|
LiberatorUSA/GUCEF | Ada | 652 | adb | with agar.core.event;
with agar.core;
with agar.gui.widget;
with agar.gui.window;
with agar.gui;
with demo;
with slider_callbacks;
procedure slider is
package gui_event renames agar.core.event;
package gui_widget renames agar.gui.widget;
package gui_window renames agar.gui.window;
begin
demo.init ("slider", window_height => 350);
-- allocate integer-bound slider
slider_callbacks.init (demo.window);
-- quit when closing window
gui_event.set
(object => gui_widget.object (gui_window.widget (demo.window)),
name => "window-close",
handler => slider_callbacks.quit'access);
demo.run;
demo.finish;
end slider;
|
AdaCore/libadalang | Ada | 496 | adb | procedure Sequential_Visibility is
type Int1 is range 1 .. 100;
type Int2 is range 1 .. 10;
B : Int1 := 9;
function Foo (I : Int1) return Int1 is (I);
begin
declare
C : Int1 := Foo (B);
-- What we want to test is that the above resolves to the outer
-- definition of B, not the following one, according to sequential
-- semantics of object declarations.
B : Int1 := C;
begin
null;
end;
pragma Test_Block;
end Sequential_Visibility;
|
reznikmm/matreshka | Ada | 3,663 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
with League.Holders.Generic_Holders;
package AMF.DG.Holders.Path_Commands is
new League.Holders.Generic_Holders
(AMF.DG.DG_Path_Command);
pragma Preelaborate (AMF.DG.Holders.Path_Commands);
|
stcarrez/ada-rest-api-server-benchmark | Ada | 998 | ads | -----------------------------------------------------------------------
-- rest_cb -- REST API callback for AWS
-- Copyright (C) 2017 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with AWS.Response;
with AWS.Status;
package Rest_CB is
function Get_Api (Request : in AWS.Status.Data) return AWS.Response.Data;
end Rest_CB;
|
stcarrez/ada-util | Ada | 12,598 | ads | -----------------------------------------------------------------------
-- util-serialize-io-xml -- XML Serialization Driver
-- Copyright (C) 2011, 2012, 2016, 2017, 2020, 2021, 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 Sax.Exceptions;
with Sax.Locators;
with Sax.Readers;
with Sax.Attributes;
with Unicode.CES;
with Input_Sources;
with Ada.Streams;
with Ada.Strings.Unbounded;
with Util.Streams.Buffered;
with Util.Streams.Texts;
package Util.Serialize.IO.XML is
Parse_Error : exception;
type Parser is new Serialize.IO.Parser with private;
-- Parse the stream using the JSON parser.
overriding
procedure Parse (Handler : in out Parser;
Stream : in out Util.Streams.Buffered.Input_Buffer_Stream'Class;
Sink : in out Reader'Class);
-- Set the XHTML reader to ignore or not the white spaces.
-- When set to True, the ignorable white spaces will not be kept.
procedure Set_Ignore_White_Spaces (Reader : in out Parser;
Value : in Boolean);
-- Set the XHTML reader to ignore empty lines.
procedure Set_Ignore_Empty_Lines (Reader : in out Parser;
Value : in Boolean);
-- Get the current location (file and line) to report an error message.
overriding
function Get_Location (Handler : in Parser) return String;
type Xhtml_Reader is new Sax.Readers.Reader with private;
-- ------------------------------
-- XML Output Stream
-- ------------------------------
-- The <b>Output_Stream</b> provides methods for creating an XML output stream.
-- The stream object takes care of the XML escape rules.
type Output_Stream is limited new Util.Serialize.IO.Output_Stream with private;
-- Set the target output stream.
procedure Initialize (Stream : in out Output_Stream;
Output : in Util.Streams.Texts.Print_Stream_Access);
-- Flush the buffer (if any) to the sink.
overriding
procedure Flush (Stream : in out Output_Stream);
-- Close the sink.
overriding
procedure Close (Stream : in out Output_Stream);
-- Write the buffer array to the output stream.
overriding
procedure Write (Stream : in out Output_Stream;
Buffer : in Ada.Streams.Stream_Element_Array);
-- Write a character on the response stream and escape that character as necessary.
procedure Write_Escape (Stream : in out Output_Stream'Class;
Char : in Wide_Wide_Character);
-- Write the value as a XML string. Special characters are escaped using the XML
-- escape rules.
procedure Write_String (Stream : in out Output_Stream;
Value : in String);
-- Write the value as a XML string. Special characters are escaped using the XML
-- escape rules.
procedure Write_Wide_String (Stream : in out Output_Stream;
Value : in Wide_Wide_String);
-- Write the value as a XML string. Special characters are escaped using the XML
-- escape rules.
procedure Write_String (Stream : in out Output_Stream;
Value : in Util.Beans.Objects.Object);
-- Start a new XML object.
overriding
procedure Start_Entity (Stream : in out Output_Stream;
Name : in String);
-- Terminates the current XML object.
overriding
procedure End_Entity (Stream : in out Output_Stream;
Name : in String);
-- 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);
-- Write a XML name/value attribute.
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);
-- Write a XML name/value entity (see Write_Attribute).
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);
-- Starts a XML array.
overriding
procedure Start_Array (Stream : in out Output_Stream;
Name : in String);
-- Terminates a XML array.
overriding
procedure End_Array (Stream : in out Output_Stream;
Name : in String);
-- Set the indentation level when writing XML entities.
procedure Set_Indentation (Stream : in out Output_Stream;
Count : in Natural);
-- Return the location where the exception was raised.
function Get_Location (Except : Sax.Exceptions.Sax_Parse_Exception'Class)
return String;
private
overriding
procedure Warning (Handler : in out Xhtml_Reader;
Except : in Sax.Exceptions.Sax_Parse_Exception'Class);
overriding
procedure Error (Handler : in out Xhtml_Reader;
Except : in Sax.Exceptions.Sax_Parse_Exception'Class);
overriding
procedure Fatal_Error (Handler : in out Xhtml_Reader;
Except : in Sax.Exceptions.Sax_Parse_Exception'Class);
overriding
procedure Set_Document_Locator (Handler : in out Xhtml_Reader;
Loc : in out Sax.Locators.Locator);
overriding
procedure Start_Document (Handler : in out Xhtml_Reader);
overriding
procedure End_Document (Handler : in out Xhtml_Reader);
overriding
procedure Start_Prefix_Mapping (Handler : in out Xhtml_Reader;
Prefix : in Unicode.CES.Byte_Sequence;
URI : in Unicode.CES.Byte_Sequence);
overriding
procedure End_Prefix_Mapping (Handler : in out Xhtml_Reader;
Prefix : in Unicode.CES.Byte_Sequence);
overriding
procedure Start_Element (Handler : in out Xhtml_Reader;
Namespace_URI : in Unicode.CES.Byte_Sequence := "";
Local_Name : in Unicode.CES.Byte_Sequence := "";
Qname : in Unicode.CES.Byte_Sequence := "";
Atts : in Sax.Attributes.Attributes'Class);
overriding
procedure End_Element (Handler : in out Xhtml_Reader;
Namespace_URI : in Unicode.CES.Byte_Sequence := "";
Local_Name : in Unicode.CES.Byte_Sequence := "";
Qname : in Unicode.CES.Byte_Sequence := "");
overriding
procedure Characters (Handler : in out Xhtml_Reader;
Ch : in Unicode.CES.Byte_Sequence);
overriding
procedure Ignorable_Whitespace (Handler : in out Xhtml_Reader;
Ch : in Unicode.CES.Byte_Sequence);
overriding
procedure Processing_Instruction (Handler : in out Xhtml_Reader;
Target : in Unicode.CES.Byte_Sequence;
Data : in Unicode.CES.Byte_Sequence);
overriding
procedure Skipped_Entity (Handler : in out Xhtml_Reader;
Name : in Unicode.CES.Byte_Sequence);
overriding
procedure Start_Cdata (Handler : in out Xhtml_Reader);
overriding
procedure End_Cdata (Handler : in out Xhtml_Reader);
overriding
function Resolve_Entity (Handler : Xhtml_Reader;
Public_Id : Unicode.CES.Byte_Sequence;
System_Id : Unicode.CES.Byte_Sequence)
return Input_Sources.Input_Source_Access;
overriding
procedure Start_DTD (Handler : in out Xhtml_Reader;
Name : Unicode.CES.Byte_Sequence;
Public_Id : Unicode.CES.Byte_Sequence := "";
System_Id : Unicode.CES.Byte_Sequence := "");
procedure Collect_Text (Handler : in out Xhtml_Reader;
Content : Unicode.CES.Byte_Sequence);
type Xhtml_Reader is new Sax.Readers.Reader with record
Stack_Pos : Natural := 0;
Handler : access Parser'Class;
Text : Ada.Strings.Unbounded.Unbounded_String;
-- Whether white spaces can be ignored.
Ignore_White_Spaces : Boolean := True;
-- Whether empty lines should be ignored (when white spaces are kept).
Ignore_Empty_Lines : Boolean := True;
Sink : access Reader'Class;
end record;
type Parser is new Util.Serialize.IO.Parser with record
-- The SAX locator to find the current file and line number.
Locator : Sax.Locators.Locator;
Has_Pending_Char : Boolean := False;
Pending_Char : Character;
-- Whether white spaces can be ignored.
Ignore_White_Spaces : Boolean := True;
-- Whether empty lines should be ignored (when white spaces are kept).
Ignore_Empty_Lines : Boolean := True;
end record;
type Output_Stream is limited new Util.Serialize.IO.Output_Stream with record
Close_Start : Boolean := False;
Is_Closed : Boolean := False;
Level : Natural := 0;
Indent : Natural := 0;
Stream : Util.Streams.Texts.Print_Stream_Access;
end record;
end Util.Serialize.IO.XML;
|
eqcola/ada-ado | Ada | 30,183 | ads | -----------------------------------------------------------------------
-- ADO Mysql -- Mysql Interface
-- Copyright (C) 2009, 2010 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Interfaces.C; use Interfaces.C;
with System;
with Interfaces.C.Strings;
package Mysql.Com is
pragma Preelaborate;
pragma Warnings (Off);
pragma Warnings (Off, "*style*");
subtype my_socket is int; -- /usr/include/mysql/mysql.h:66:13
NAME_LEN : constant := 64; -- /usr/include/mysql/mysql_com.h:23
HOSTNAME_LENGTH : constant := 60; -- /usr/include/mysql/mysql_com.h:24
USERNAME_LENGTH : constant := 16; -- /usr/include/mysql/mysql_com.h:25
SERVER_VERSION_LENGTH : constant := 60; -- /usr/include/mysql/mysql_com.h:26
SQLSTATE_LENGTH : constant := 5; -- /usr/include/mysql/mysql_com.h:27
-- unsupported macro: USER_HOST_BUFF_SIZE HOSTNAME_LENGTH + USERNAME_LENGTH + 2
LOCAL_HOST : aliased constant String := "localhost" & ASCII.NUL; -- /usr/include/mysql/mysql_com.h:37
LOCAL_HOST_NAMEDPIPE : aliased constant String := "." & ASCII.NUL; -- /usr/include/mysql/mysql_com.h:38
SCRAMBLE_LENGTH : constant := 20; -- /usr/include/mysql/mysql_com.h:71
SCRAMBLE_LENGTH_323 : constant := 8; -- /usr/include/mysql/mysql_com.h:72
-- unsupported macro: SCRAMBLED_PASSWORD_CHAR_LENGTH (SCRAMBLE_LENGTH*2+1)
-- unsupported macro: SCRAMBLED_PASSWORD_CHAR_LENGTH_323 (SCRAMBLE_LENGTH_323*2)
NOT_NULL_FLAG : constant := 1; -- /usr/include/mysql/mysql_com.h:78
PRI_KEY_FLAG : constant := 2; -- /usr/include/mysql/mysql_com.h:79
UNIQUE_KEY_FLAG : constant := 4; -- /usr/include/mysql/mysql_com.h:80
MULTIPLE_KEY_FLAG : constant := 8; -- /usr/include/mysql/mysql_com.h:81
BLOB_FLAG : constant := 16; -- /usr/include/mysql/mysql_com.h:82
UNSIGNED_FLAG : constant := 32; -- /usr/include/mysql/mysql_com.h:83
ZEROFILL_FLAG : constant := 64; -- /usr/include/mysql/mysql_com.h:84
BINARY_FLAG : constant := 128; -- /usr/include/mysql/mysql_com.h:85
ENUM_FLAG : constant := 256; -- /usr/include/mysql/mysql_com.h:88
AUTO_INCREMENT_FLAG : constant := 512; -- /usr/include/mysql/mysql_com.h:89
TIMESTAMP_FLAG : constant := 1024; -- /usr/include/mysql/mysql_com.h:90
SET_FLAG : constant := 2048; -- /usr/include/mysql/mysql_com.h:91
NO_DEFAULT_VALUE_FLAG : constant := 4096; -- /usr/include/mysql/mysql_com.h:92
NUM_FLAG : constant := 32768; -- /usr/include/mysql/mysql_com.h:93
PART_KEY_FLAG : constant := 16384; -- /usr/include/mysql/mysql_com.h:94
GROUP_FLAG : constant := 32768; -- /usr/include/mysql/mysql_com.h:95
UNIQUE_FLAG : constant := 65536; -- /usr/include/mysql/mysql_com.h:96
BINCMP_FLAG : constant := 131072; -- /usr/include/mysql/mysql_com.h:97
REFRESH_GRANT : constant := 1; -- /usr/include/mysql/mysql_com.h:99
REFRESH_LOG : constant := 2; -- /usr/include/mysql/mysql_com.h:100
REFRESH_TABLES : constant := 4; -- /usr/include/mysql/mysql_com.h:101
REFRESH_HOSTS : constant := 8; -- /usr/include/mysql/mysql_com.h:102
REFRESH_STATUS : constant := 16; -- /usr/include/mysql/mysql_com.h:103
REFRESH_THREADS : constant := 32; -- /usr/include/mysql/mysql_com.h:104
REFRESH_SLAVE : constant := 64; -- /usr/include/mysql/mysql_com.h:105
REFRESH_MASTER : constant := 128; -- /usr/include/mysql/mysql_com.h:107
REFRESH_READ_LOCK : constant := 16384; -- /usr/include/mysql/mysql_com.h:111
REFRESH_FAST : constant := 32768; -- /usr/include/mysql/mysql_com.h:112
REFRESH_QUERY_CACHE : constant := 65536; -- /usr/include/mysql/mysql_com.h:115
REFRESH_QUERY_CACHE_FREE : constant := 16#20000#; -- /usr/include/mysql/mysql_com.h:116
REFRESH_DES_KEY_FILE : constant := 16#40000#; -- /usr/include/mysql/mysql_com.h:117
REFRESH_USER_RESOURCES : constant := 16#80000#; -- /usr/include/mysql/mysql_com.h:118
CLIENT_LONG_PASSWORD : constant := 1; -- /usr/include/mysql/mysql_com.h:120
CLIENT_FOUND_ROWS : constant := 2; -- /usr/include/mysql/mysql_com.h:121
CLIENT_LONG_FLAG : constant := 4; -- /usr/include/mysql/mysql_com.h:122
CLIENT_CONNECT_WITH_DB : constant := 8; -- /usr/include/mysql/mysql_com.h:123
CLIENT_NO_SCHEMA : constant := 16; -- /usr/include/mysql/mysql_com.h:124
CLIENT_COMPRESS : constant := 32; -- /usr/include/mysql/mysql_com.h:125
CLIENT_ODBC : constant := 64; -- /usr/include/mysql/mysql_com.h:126
CLIENT_LOCAL_FILES : constant := 128; -- /usr/include/mysql/mysql_com.h:127
CLIENT_IGNORE_SPACE : constant := 256; -- /usr/include/mysql/mysql_com.h:128
CLIENT_PROTOCOL_41 : constant := 512; -- /usr/include/mysql/mysql_com.h:129
CLIENT_INTERACTIVE : constant := 1024; -- /usr/include/mysql/mysql_com.h:130
CLIENT_SSL : constant := 2048; -- /usr/include/mysql/mysql_com.h:131
CLIENT_IGNORE_SIGPIPE : constant := 4096; -- /usr/include/mysql/mysql_com.h:132
CLIENT_TRANSACTIONS : constant := 8192; -- /usr/include/mysql/mysql_com.h:133
CLIENT_RESERVED : constant := 16384; -- /usr/include/mysql/mysql_com.h:134
CLIENT_SECURE_CONNECTION : constant := 32768; -- /usr/include/mysql/mysql_com.h:135
CLIENT_MULTI_STATEMENTS : constant := (1 ** 16); -- /usr/include/mysql/mysql_com.h:136
CLIENT_MULTI_RESULTS : constant := (1 ** 17); -- /usr/include/mysql/mysql_com.h:137
CLIENT_SSL_VERIFY_SERVER_CERT : constant := (1 ** 30); -- /usr/include/mysql/mysql_com.h:139
CLIENT_REMEMBER_OPTIONS : constant := (1 ** 31); -- /usr/include/mysql/mysql_com.h:140
SERVER_STATUS_IN_TRANS : constant := 1; -- /usr/include/mysql/mysql_com.h:142
SERVER_STATUS_AUTOCOMMIT : constant := 2; -- /usr/include/mysql/mysql_com.h:143
SERVER_MORE_RESULTS_EXISTS : constant := 8; -- /usr/include/mysql/mysql_com.h:144
SERVER_QUERY_NO_GOOD_INDEX_USED : constant := 16; -- /usr/include/mysql/mysql_com.h:145
SERVER_QUERY_NO_INDEX_USED : constant := 32; -- /usr/include/mysql/mysql_com.h:146
SERVER_STATUS_CURSOR_EXISTS : constant := 64; -- /usr/include/mysql/mysql_com.h:152
SERVER_STATUS_LAST_ROW_SENT : constant := 128; -- /usr/include/mysql/mysql_com.h:157
SERVER_STATUS_DB_DROPPED : constant := 256; -- /usr/include/mysql/mysql_com.h:158
SERVER_STATUS_NO_BACKSLASH_ESCAPES : constant := 512; -- /usr/include/mysql/mysql_com.h:159
MYSQL_ERRMSG_SIZE : constant := 512; -- /usr/include/mysql/mysql_com.h:161
NET_READ_TIMEOUT : constant := 30; -- /usr/include/mysql/mysql_com.h:162
NET_WRITE_TIMEOUT : constant := 60; -- /usr/include/mysql/mysql_com.h:163
-- unsupported macro: NET_WAIT_TIMEOUT 8*60*60
ONLY_KILL_QUERY : constant := 1; -- /usr/include/mysql/mysql_com.h:166
MAX_TINYINT_WIDTH : constant := 3; -- /usr/include/mysql/mysql_com.h:171
MAX_SMALLINT_WIDTH : constant := 5; -- /usr/include/mysql/mysql_com.h:172
MAX_MEDIUMINT_WIDTH : constant := 8; -- /usr/include/mysql/mysql_com.h:173
MAX_INT_WIDTH : constant := 10; -- /usr/include/mysql/mysql_com.h:174
MAX_BIGINT_WIDTH : constant := 20; -- /usr/include/mysql/mysql_com.h:175
MAX_CHAR_WIDTH : constant := 255; -- /usr/include/mysql/mysql_com.h:176
MAX_BLOB_WIDTH : constant := 8192; -- /usr/include/mysql/mysql_com.h:177
-- unsupported macro: packet_error (~(unsigned long) 0)
-- unsupported macro: CLIENT_MULTI_QUERIES CLIENT_MULTI_STATEMENTS
-- unsupported macro: FIELD_TYPE_DECIMAL MYSQL_TYPE_DECIMAL
-- unsupported macro: FIELD_TYPE_NEWDECIMAL MYSQL_TYPE_NEWDECIMAL
-- unsupported macro: FIELD_TYPE_TINY MYSQL_TYPE_TINY
-- unsupported macro: FIELD_TYPE_SHORT MYSQL_TYPE_SHORT
-- unsupported macro: FIELD_TYPE_LONG MYSQL_TYPE_LONG
-- unsupported macro: FIELD_TYPE_FLOAT MYSQL_TYPE_FLOAT
-- unsupported macro: FIELD_TYPE_DOUBLE MYSQL_TYPE_DOUBLE
-- unsupported macro: FIELD_TYPE_NULL MYSQL_TYPE_NULL
-- unsupported macro: FIELD_TYPE_TIMESTAMP MYSQL_TYPE_TIMESTAMP
-- unsupported macro: FIELD_TYPE_LONGLONG MYSQL_TYPE_LONGLONG
-- unsupported macro: FIELD_TYPE_INT24 MYSQL_TYPE_INT24
-- unsupported macro: FIELD_TYPE_DATE MYSQL_TYPE_DATE
-- unsupported macro: FIELD_TYPE_TIME MYSQL_TYPE_TIME
-- unsupported macro: FIELD_TYPE_DATETIME MYSQL_TYPE_DATETIME
-- unsupported macro: FIELD_TYPE_YEAR MYSQL_TYPE_YEAR
-- unsupported macro: FIELD_TYPE_NEWDATE MYSQL_TYPE_NEWDATE
-- unsupported macro: FIELD_TYPE_ENUM MYSQL_TYPE_ENUM
-- unsupported macro: FIELD_TYPE_SET MYSQL_TYPE_SET
-- unsupported macro: FIELD_TYPE_TINY_BLOB MYSQL_TYPE_TINY_BLOB
-- unsupported macro: FIELD_TYPE_MEDIUM_BLOB MYSQL_TYPE_MEDIUM_BLOB
-- unsupported macro: FIELD_TYPE_LONG_BLOB MYSQL_TYPE_LONG_BLOB
-- unsupported macro: FIELD_TYPE_BLOB MYSQL_TYPE_BLOB
-- unsupported macro: FIELD_TYPE_VAR_STRING MYSQL_TYPE_VAR_STRING
-- unsupported macro: FIELD_TYPE_STRING MYSQL_TYPE_STRING
-- unsupported macro: FIELD_TYPE_CHAR MYSQL_TYPE_TINY
-- unsupported macro: FIELD_TYPE_INTERVAL MYSQL_TYPE_ENUM
-- unsupported macro: FIELD_TYPE_GEOMETRY MYSQL_TYPE_GEOMETRY
-- unsupported macro: FIELD_TYPE_BIT MYSQL_TYPE_BIT
-- unsupported macro: MYSQL_SHUTDOWN_KILLABLE_CONNECT (unsigned char)(1 << 0)
-- unsupported macro: MYSQL_SHUTDOWN_KILLABLE_TRANS (unsigned char)(1 << 1)
-- unsupported macro: MYSQL_SHUTDOWN_KILLABLE_LOCK_TABLE (unsigned char)(1 << 2)
-- unsupported macro: MYSQL_SHUTDOWN_KILLABLE_UPDATE (unsigned char)(1 << 3)
-- arg-macro: function net_new_transaction (net)
-- return (net).pkt_nr:=0;
NET_HEADER_SIZE : constant := 4; -- /usr/include/mysql/mysql_com.h:402
COMP_HEADER_SIZE : constant := 3; -- /usr/include/mysql/mysql_com.h:403
-- unsupported macro: NULL_LENGTH ((unsigned long) ~0)
MYSQL_STMT_HEADER : constant := 4; -- /usr/include/mysql/mysql_com.h:464
MYSQL_LONG_DATA_HEADER : constant := 6; -- /usr/include/mysql/mysql_com.h:465
-- Copyright (C) 2000 MySQL AB
-- 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; version 2 of the License.
-- 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, write to the Free Software
-- Foundation, Inc., 59 Temple Place, Suite 330, Boston, MA 02111-1307 USA
--** Common definition between mysql server & client
--
-- USER_HOST_BUFF_SIZE -- length of string buffer, that is enough to contain
-- username and hostname parts of the user identifier with trailing zero in
-- MySQL standard format:
-- user_name_part@host_name_part\0
--
-- You should add new commands to the end of this list, otherwise old
-- servers won't be able to handle them as 'unsupported'.
--
subtype enum_server_command is unsigned;
COM_SLEEP : constant enum_server_command := 0;
COM_QUIT : constant enum_server_command := 1;
COM_INIT_DB : constant enum_server_command := 2;
COM_QUERY : constant enum_server_command := 3;
COM_FIELD_LIST : constant enum_server_command := 4;
COM_CREATE_DB : constant enum_server_command := 5;
COM_DROP_DB : constant enum_server_command := 6;
COM_REFRESH : constant enum_server_command := 7;
COM_SHUTDOWN : constant enum_server_command := 8;
COM_STATISTICS : constant enum_server_command := 9;
COM_PROCESS_INFO : constant enum_server_command := 10;
COM_CONNECT : constant enum_server_command := 11;
COM_PROCESS_KILL : constant enum_server_command := 12;
COM_DEBUG : constant enum_server_command := 13;
COM_PING : constant enum_server_command := 14;
COM_TIME : constant enum_server_command := 15;
COM_DELAYED_INSERT : constant enum_server_command := 16;
COM_CHANGE_USER : constant enum_server_command := 17;
COM_BINLOG_DUMP : constant enum_server_command := 18;
COM_TABLE_DUMP : constant enum_server_command := 19;
COM_CONNECT_OUT : constant enum_server_command := 20;
COM_REGISTER_SLAVE : constant enum_server_command := 21;
COM_STMT_PREPARE : constant enum_server_command := 22;
COM_STMT_EXECUTE : constant enum_server_command := 23;
COM_STMT_SEND_LONG_DATA : constant enum_server_command := 24;
COM_STMT_CLOSE : constant enum_server_command := 25;
COM_STMT_RESET : constant enum_server_command := 26;
COM_SET_OPTION : constant enum_server_command := 27;
COM_STMT_FETCH : constant enum_server_command := 28;
COM_END : constant enum_server_command := 29; -- /usr/include/mysql/mysql_com.h:52:1
-- don't forget to update const char *command_name[] in sql_parse.cc
-- Must be last
-- Length of random string sent by server on handshake; this is also length of
-- obfuscated password, recieved from client
--
-- length of password stored in the db: new passwords are preceeded with '*'
-- The following are only sent to new clients
-- The following can't be set with mysql_refresh()
-- RESET (remove all queries) from query cache
-- The server was able to fulfill the clients request and opened a
-- read-only non-scrollable cursor for a query. This flag comes
-- in reply to COM_STMT_EXECUTE and COM_STMT_FETCH commands.
--
-- This flag is sent when a read-only cursor is exhausted, in reply to
-- COM_STMT_FETCH command.
--
-- Only C
-- skipped empty struct st_vio
-- skipped empty struct Vio
type anon1416_anon1442_array is array (0 .. 511) of aliased char;
type anon1416_anon1443_array is array (0 .. 5) of aliased char;
type st_net is record
the_vio : System.Address; -- /usr/include/mysql/mysql_com.h:181:8
buff : access unsigned_char; -- /usr/include/mysql/mysql_com.h:182:18
buff_end : access unsigned_char; -- /usr/include/mysql/mysql_com.h:182:24
write_pos : access unsigned_char; -- /usr/include/mysql/mysql_com.h:182:34
read_pos : access unsigned_char; -- /usr/include/mysql/mysql_com.h:182:45
fd : aliased my_socket; -- /usr/include/mysql/mysql_com.h:183:13
max_packet : aliased unsigned_long; -- /usr/include/mysql/mysql_com.h:184:17
max_packet_size : aliased unsigned_long; -- /usr/include/mysql/mysql_com.h:184:28
pkt_nr : aliased unsigned; -- /usr/include/mysql/mysql_com.h:185:16
compress_pkt_nr : aliased unsigned; -- /usr/include/mysql/mysql_com.h:185:23
write_timeout : aliased unsigned; -- /usr/include/mysql/mysql_com.h:186:16
read_timeout : aliased unsigned; -- /usr/include/mysql/mysql_com.h:186:31
retry_count : aliased unsigned; -- /usr/include/mysql/mysql_com.h:186:45
fcntl : aliased int; -- /usr/include/mysql/mysql_com.h:187:7
compress : aliased char; -- /usr/include/mysql/mysql_com.h:188:11
remain_in_buf : aliased unsigned_long; -- /usr/include/mysql/mysql_com.h:194:17
length : aliased unsigned_long; -- /usr/include/mysql/mysql_com.h:194:31
buf_length : aliased unsigned_long; -- /usr/include/mysql/mysql_com.h:194:39
where_b : aliased unsigned_long; -- /usr/include/mysql/mysql_com.h:194:51
return_status : access unsigned; -- /usr/include/mysql/mysql_com.h:195:17
reading_or_writing : aliased unsigned_char; -- /usr/include/mysql/mysql_com.h:196:17
save_char : aliased char; -- /usr/include/mysql/mysql_com.h:197:8
no_send_ok : aliased char; -- /usr/include/mysql/mysql_com.h:198:11
no_send_eof : aliased char; -- /usr/include/mysql/mysql_com.h:199:11
no_send_error : aliased char; -- /usr/include/mysql/mysql_com.h:204:11
last_error : aliased anon1416_anon1442_array; -- /usr/include/mysql/mysql_com.h:210:8
sqlstate : aliased anon1416_anon1443_array; -- /usr/include/mysql/mysql_com.h:210:39
last_errno : aliased unsigned; -- /usr/include/mysql/mysql_com.h:211:16
error : aliased unsigned_char; -- /usr/include/mysql/mysql_com.h:212:17
query_cache_query : Interfaces.C.Strings.chars_ptr; -- mysql_mysql_h.gptr; -- /usr/include/mysql/mysql_com.h:218:8
report_error : aliased char; -- /usr/include/mysql/mysql_com.h:220:11
return_errno : aliased char; -- /usr/include/mysql/mysql_com.h:221:11
end record;
pragma Convention (C, st_net); -- /usr/include/mysql/mysql_com.h:179:16
-- For Perl DBI/dbd
-- The following variable is set if we are doing several queries in one
-- command ( as in LOAD TABLE ... FROM MASTER ),
-- and do not want to confuse the client with OK at the wrong time
--
-- For SPs and other things that do multiple stmts
-- For SPs' first version read-only cursors
-- Set if OK packet is already sent, and we do not need to send error
-- messages
--
-- Pointer to query object in query cache, do not equal NULL (0) for
-- queries in cache that have not stored its results yet
--
-- 'query_cache_query' should be accessed only via query cache
-- functions and methods to maintain proper locking.
--
-- We should report error (we have unreported error)
subtype NET is st_net;
subtype enum_field_types is unsigned;
MYSQL_TYPE_DECIMAL : constant enum_field_types := 0;
MYSQL_TYPE_TINY : constant enum_field_types := 1;
MYSQL_TYPE_SHORT : constant enum_field_types := 2;
MYSQL_TYPE_LONG : constant enum_field_types := 3;
MYSQL_TYPE_FLOAT : constant enum_field_types := 4;
MYSQL_TYPE_DOUBLE : constant enum_field_types := 5;
MYSQL_TYPE_NULL : constant enum_field_types := 6;
MYSQL_TYPE_TIMESTAMP : constant enum_field_types := 7;
MYSQL_TYPE_LONGLONG : constant enum_field_types := 8;
MYSQL_TYPE_INT24 : constant enum_field_types := 9;
MYSQL_TYPE_DATE : constant enum_field_types := 10;
MYSQL_TYPE_TIME : constant enum_field_types := 11;
MYSQL_TYPE_DATETIME : constant enum_field_types := 12;
MYSQL_TYPE_YEAR : constant enum_field_types := 13;
MYSQL_TYPE_NEWDATE : constant enum_field_types := 14;
MYSQL_TYPE_VARCHAR : constant enum_field_types := 15;
MYSQL_TYPE_BIT : constant enum_field_types := 16;
MYSQL_TYPE_NEWDECIMAL : constant enum_field_types := 246;
MYSQL_TYPE_ENUM : constant enum_field_types := 247;
MYSQL_TYPE_SET : constant enum_field_types := 248;
MYSQL_TYPE_TINY_BLOB : constant enum_field_types := 249;
MYSQL_TYPE_MEDIUM_BLOB : constant enum_field_types := 250;
MYSQL_TYPE_LONG_BLOB : constant enum_field_types := 251;
MYSQL_TYPE_BLOB : constant enum_field_types := 252;
MYSQL_TYPE_VAR_STRING : constant enum_field_types := 253;
MYSQL_TYPE_STRING : constant enum_field_types := 254;
MYSQL_TYPE_GEOMETRY : constant enum_field_types := 255; -- /usr/include/mysql/mysql_com.h:226:6
-- For backward compatibility
-- Shutdown/kill enums and constants
-- Bits for THD::killable.
subtype mysql_enum_shutdown_level is unsigned;
SHUTDOWN_DEFAULT : constant mysql_enum_shutdown_level := 0;
SHUTDOWN_WAIT_CONNECTIONS : constant mysql_enum_shutdown_level := 1;
SHUTDOWN_WAIT_TRANSACTIONS : constant mysql_enum_shutdown_level := 2;
SHUTDOWN_WAIT_UPDATES : constant mysql_enum_shutdown_level := 8;
SHUTDOWN_WAIT_ALL_BUFFERS : constant mysql_enum_shutdown_level := 16;
SHUTDOWN_WAIT_CRITICAL_BUFFERS : constant mysql_enum_shutdown_level := 17;
KILL_QUERY : constant mysql_enum_shutdown_level := 254;
KILL_CONNECTION : constant mysql_enum_shutdown_level := 255; -- /usr/include/mysql/mysql_com.h:288:6
-- We want levels to be in growing order of hardness (because we use number
-- comparisons). Note that DEFAULT does not respect the growing property, but
-- it's ok.
--
-- wait for existing connections to finish
-- wait for existing trans to finish
-- wait for existing updates to finish (=> no partial MyISAM update)
-- flush InnoDB buffers and other storage engines' buffers
-- don't flush InnoDB buffers, flush other storage engines' buffers
-- Now the 2 levels of the KILL command
subtype enum_cursor_type is unsigned;
CURSOR_TYPE_NO_CURSOR : constant enum_cursor_type := 0;
CURSOR_TYPE_READ_ONLY : constant enum_cursor_type := 1;
CURSOR_TYPE_FOR_UPDATE : constant enum_cursor_type := 2;
CURSOR_TYPE_SCROLLABLE : constant enum_cursor_type := 4; -- /usr/include/mysql/mysql_com.h:314:1
-- options for mysql_set_option
subtype enum_mysql_set_option is unsigned;
MYSQL_OPTION_MULTI_STATEMENTS_ON : constant enum_mysql_set_option := 0;
MYSQL_OPTION_MULTI_STATEMENTS_OFF : constant enum_mysql_set_option := 1; -- /usr/include/mysql/mysql_com.h:324:1
function my_net_init (arg1 : access st_net; arg2 : System.Address) return char; -- /usr/include/mysql/mysql_com.h:335:9
pragma Import (C, my_net_init, "my_net_init");
procedure my_net_local_init (arg1 : access st_net); -- /usr/include/mysql/mysql_com.h:336:6
pragma Import (C, my_net_local_init, "my_net_local_init");
procedure net_end (arg1 : access st_net); -- /usr/include/mysql/mysql_com.h:337:6
pragma Import (C, net_end, "net_end");
procedure net_clear (arg1 : access st_net); -- /usr/include/mysql/mysql_com.h:338:6
pragma Import (C, net_clear, "net_clear");
function net_realloc (arg1 : access st_net; arg2 : unsigned_long) return char; -- /usr/include/mysql/mysql_com.h:339:9
pragma Import (C, net_realloc, "net_realloc");
function net_flush (arg1 : access st_net) return char; -- /usr/include/mysql/mysql_com.h:340:9
pragma Import (C, net_flush, "net_flush");
function my_net_write
(arg1 : access st_net;
arg2 : Interfaces.C.Strings.chars_ptr;
arg3 : unsigned_long) return char; -- /usr/include/mysql/mysql_com.h:341:9
pragma Import (C, my_net_write, "my_net_write");
function net_write_command
(arg1 : access st_net;
arg2 : unsigned_char;
arg3 : Interfaces.C.Strings.chars_ptr;
arg4 : unsigned_long;
arg5 : Interfaces.C.Strings.chars_ptr;
arg6 : unsigned_long) return char; -- /usr/include/mysql/mysql_com.h:342:9
pragma Import (C, net_write_command, "net_write_command");
function net_real_write
(arg1 : access st_net;
arg2 : Interfaces.C.Strings.chars_ptr;
arg3 : unsigned_long) return int; -- /usr/include/mysql/mysql_com.h:345:5
pragma Import (C, net_real_write, "net_real_write");
function my_net_read (arg1 : access st_net) return unsigned_long; -- /usr/include/mysql/mysql_com.h:346:15
pragma Import (C, my_net_read, "my_net_read");
-- The following function is not meant for normal usage
-- Currently it's used internally by manager.c
--
-- skipped empty struct sockaddr
function my_connect
(arg1 : my_socket;
arg2 : System.Address;
arg3 : unsigned;
arg4 : unsigned) return int; -- /usr/include/mysql/mysql_com.h:358:5
pragma Import (C, my_connect, "my_connect");
type rand_struct is record
seed1 : aliased unsigned_long;
seed2 : aliased unsigned_long;
max_value : aliased unsigned_long;
max_value_dbl : aliased double;
end record;
pragma Convention (C, rand_struct);
-- The following is for user defined functions
subtype Item_result is unsigned;
STRING_RESULT : constant Item_result := 0;
REAL_RESULT : constant Item_result := 1;
INT_RESULT : constant Item_result := 2;
ROW_RESULT : constant Item_result := 3;
DECIMAL_RESULT : constant Item_result := 4;
-- Number of arguments
type st_udf_args is record
arg_count : aliased unsigned;
arg_type : access Item_result;
args : System.Address;
lengths : access unsigned_long;
maybe_null : Interfaces.C.Strings.chars_ptr;
attributes : System.Address;
attribute_lengths : access unsigned_long;
end record;
pragma Convention (C, st_udf_args);
-- Pointer to item_results
-- Pointer to argument
-- Length of string arguments
-- Set to 1 for all maybe_null args
-- Pointer to attribute name
-- Length of attribute arguments
subtype UDF_ARGS is st_udf_args;
-- This holds information about the result
-- 1 if function can return NULL
type st_udf_init is record
maybe_null : aliased char;
decimals : aliased unsigned;
max_length : aliased unsigned_long;
ptr : Interfaces.C.Strings.chars_ptr;
const_item : aliased char;
end record;
pragma Convention (C, st_udf_init);
-- for real functions
-- For string functions
-- free pointer for function data
-- 1 if function always returns the same value
subtype UDF_INIT is st_udf_init;
--
-- TODO: add a notion for determinism of the UDF.
-- See Item_udf_func::update_used_tables ()
--
-- Constants when using compression
-- Prototypes to password functions
-- These functions are used for authentication by client and server and
-- implemented in sql/password.c
--
procedure randominit
(arg1 : access rand_struct;
arg2 : unsigned_long;
arg3 : unsigned_long);
pragma Import (C, randominit, "randominit");
function my_rnd (arg1 : access rand_struct) return double;
pragma Import (C, my_rnd, "my_rnd");
procedure create_random_string
(arg1 : Interfaces.C.Strings.chars_ptr;
arg2 : unsigned;
arg3 : access rand_struct);
pragma Import (C, create_random_string, "create_random_string");
procedure hash_password
(arg1 : access unsigned_long;
arg2 : Interfaces.C.Strings.chars_ptr;
arg3 : unsigned);
pragma Import (C, hash_password, "hash_password");
procedure Make_Scrambled_Password_323 (Arg1 : Interfaces.C.Strings.chars_ptr;
arg2 : Interfaces.C.Strings.chars_ptr);
pragma Import (C, make_scrambled_password_323, "make_scrambled_password_323");
procedure scramble_323
(arg1 : Interfaces.C.Strings.chars_ptr;
arg2 : Interfaces.C.Strings.chars_ptr;
arg3 : Interfaces.C.Strings.chars_ptr);
pragma Import (C, scramble_323, "scramble_323");
function check_scramble_323
(arg1 : Interfaces.C.Strings.chars_ptr;
arg2 : Interfaces.C.Strings.chars_ptr;
arg3 : access unsigned_long) return char;
pragma Import (C, check_scramble_323, "check_scramble_323");
procedure Get_Salt_From_Password_323 (Arg1 : access Unsigned_Long;
arg2 : Interfaces.C.Strings.chars_ptr);
pragma Import (C, get_salt_from_password_323, "get_salt_from_password_323");
procedure Make_Password_From_Salt_323 (Arg1 : Interfaces.C.Strings.chars_ptr;
arg2 : access unsigned_long);
pragma Import (C, make_password_from_salt_323, "make_password_from_salt_323");
procedure Make_Scrambled_Password (Arg1 : Interfaces.C.Strings.chars_ptr;
arg2 : Interfaces.C.Strings.chars_ptr);
pragma Import (C, make_scrambled_password, "make_scrambled_password");
procedure scramble
(arg1 : Interfaces.C.Strings.chars_ptr;
arg2 : Interfaces.C.Strings.chars_ptr;
arg3 : Interfaces.C.Strings.chars_ptr);
pragma Import (C, scramble, "scramble");
function check_scramble
(arg1 : Interfaces.C.Strings.chars_ptr;
arg2 : Interfaces.C.Strings.chars_ptr;
arg3 : access unsigned_char) return char;
pragma Import (C, check_scramble, "check_scramble");
procedure Get_Salt_From_Password (Arg1 : access Unsigned_Char;
arg2 : Interfaces.C.Strings.chars_ptr);
pragma Import (C, get_salt_from_password, "get_salt_from_password");
procedure Make_Password_From_Salt (Arg1 : Interfaces.C.Strings.chars_ptr;
arg2 : access unsigned_char);
pragma Import (C, make_password_from_salt, "make_password_from_salt");
function octet2hex
(arg1 : Interfaces.C.Strings.chars_ptr;
arg2 : Interfaces.C.Strings.chars_ptr;
arg3 : unsigned) return Interfaces.C.Strings.chars_ptr;
pragma Import (C, octet2hex, "octet2hex");
-- end of password.c
function Get_Tty_Password (Arg1 : Interfaces.C.Strings.chars_ptr)
return Interfaces.C.Strings.chars_ptr;
pragma Import (C, get_tty_password, "get_tty_password");
function mysql_errno_to_sqlstate (arg1 : unsigned) return Interfaces.C.Strings.chars_ptr;
pragma Import (C, mysql_errno_to_sqlstate, "mysql_errno_to_sqlstate");
-- Some other useful functions
function my_init return char;
pragma Import (C, my_init, "my_init");
function modify_defaults_file
(arg1 : Interfaces.C.Strings.chars_ptr;
arg2 : Interfaces.C.Strings.chars_ptr;
arg3 : Interfaces.C.Strings.chars_ptr;
arg4 : Interfaces.C.Strings.chars_ptr;
arg5 : int) return int;
pragma Import (C, modify_defaults_file, "modify_defaults_file");
function load_defaults
(arg1 : Interfaces.C.Strings.chars_ptr;
arg2 : System.Address;
arg3 : access int;
arg4 : System.Address) return int;
pragma Import (C, load_defaults, "load_defaults");
function my_thread_init return char;
pragma Import (C, my_thread_init, "my_thread_init");
procedure my_thread_end;
pragma Import (C, my_thread_end, "my_thread_end");
end Mysql.Com ;
|
faelys/natools | Ada | 979 | adb | with Interfaces; use Interfaces;
package body Natools.S_Expressions.Printers.Pretty.Config.Newline_Enc is
P : constant array (0 .. 1) of Natural :=
(1, 3);
T1 : constant array (0 .. 1) of Unsigned_8 :=
(24, 21);
T2 : constant array (0 .. 1) of Unsigned_8 :=
(5, 8);
G : constant array (0 .. 24) of Unsigned_8 :=
(0, 0, 0, 4, 0, 0, 0, 3, 0, 9, 0, 0, 11, 0, 0, 0, 8, 3, 4, 9, 1, 7, 0,
0, 2);
function Hash (S : String) return Natural is
F : constant Natural := S'First - 1;
L : constant Natural := S'Length;
F1, F2 : Natural := 0;
J : Natural;
begin
for K in P'Range loop
exit when L < P (K);
J := Character'Pos (S (P (K) + F));
F1 := (F1 + Natural (T1 (K)) * J) mod 25;
F2 := (F2 + Natural (T2 (K)) * J) mod 25;
end loop;
return (Natural (G (F1)) + Natural (G (F2))) mod 12;
end Hash;
end Natools.S_Expressions.Printers.Pretty.Config.Newline_Enc;
|
AdaCore/training_material | Ada | 2,038 | ads | -- PragmAda Reusable Component (PragmARC)
-- Copyright (C) 2020 by PragmAda Software Engineering. All rights reserved.
-- Released under the terms of the BSD 3-Clause license; see https://opensource.org/licenses
-- **************************************************************************
--
-- Marsaglia's KISS Random Number Generator
-- Alogirithm taken from www.fortran.com/kiss.f90
-- History:
-- 2020 OCT 15 J. Carter V2.0--Initial Ada-12 version
----------------------------------------------------------------------------
-- 2016 Oct 01 J. Carter V1.1--Pulled out Random_Range into PragmARC.Random_Ranges
-- 2013 Aug 01 J. Carter V1.0--Initial release
--
pragma Assertion_Policy (Check);
pragma Unsuppress (All_Checks);
with Interfaces;
generic
type Result_Subtype is (<>);
package PragmARC.Randomness.KISS is
subtype Raw_Value is Interfaces.Unsigned_32;
subtype Positive_Raw is Raw_Value range 1 .. Raw_Value'Last;
Default_W : constant := 916_191_069;
Default_X : constant := 123_456_789;
Default_Y : constant := 362_436_069;
Default_Z : constant := 521_288_629;
type Generator is tagged limited private;
procedure Set_Seed (State : in out Generator;
New_W : in Raw_Value := Default_W;
New_X : in Positive_Raw := Default_X;
New_Y : in Positive_Raw := Default_Y;
New_Z : in Positive_Raw := Default_Z);
-- Sets the seeds for State to those given
-- The initial values for a Generator are the defaults listed
function Raw (State : in out Generator) return Raw_Value;
-- Returns a random value
function Random (State : in out Generator) return Result_Subtype;
-- Returns a random value
private -- PragmARC.KISS_Random
type Generator is tagged limited record
W : Raw_Value := Default_W;
X : Raw_Value := Default_X;
Y : Raw_Value := Default_Y;
Z : Raw_Value := Default_Z;
end record;
end PragmARC.Randomness.KISS;
|
reznikmm/matreshka | Ada | 3,795 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2013, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.ODF_Attributes.FO.Hyphenate;
package ODF.DOM.Attributes.FO.Hyphenate.Internals is
function Create
(Node : Matreshka.ODF_Attributes.FO.Hyphenate.FO_Hyphenate_Access)
return ODF.DOM.Attributes.FO.Hyphenate.ODF_FO_Hyphenate;
function Wrap
(Node : Matreshka.ODF_Attributes.FO.Hyphenate.FO_Hyphenate_Access)
return ODF.DOM.Attributes.FO.Hyphenate.ODF_FO_Hyphenate;
end ODF.DOM.Attributes.FO.Hyphenate.Internals;
|
onox/orka | Ada | 1,203 | ads | -- SPDX-License-Identifier: Apache-2.0
--
-- Copyright (c) 2019 onox <[email protected]>
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
with Orka.Transforms.SIMD_Vector_Conversions;
generic
with package Conversions is new Orka.Transforms.SIMD_Vector_Conversions (<>);
package Orka.Transforms.SIMD_Matrix_Conversions is
pragma Pure;
function Convert
(Elements : Conversions.From_Matrices.Matrix_Type) return Conversions.To_Matrices.Matrix_Type
is (Conversions.Convert (Elements (X)),
Conversions.Convert (Elements (Y)),
Conversions.Convert (Elements (Z)),
Conversions.Convert (Elements (W)));
end Orka.Transforms.SIMD_Matrix_Conversions;
|
usnistgov/rcslib | Ada | 1,741 | adb | with Nml;
with Nml_Msg; use Nml_Msg;
with Nml_Test_Format_N_Ada;
with Ada.Text_IO;
with Ada.Integer_Text_IO;
with Unchecked_Conversion;
with Interfaces.C;
with Ada.Command_Line;
procedure Nmltest_Write_Ada is
Connection1 : Nml.NmlConnection_Access;
Msg : Nml_Test_Format_N_Ada.Test_Message_Access;
Ok : Integer := 0;
begin
if Ada.Command_Line.Argument_Count < 3 then
Ada.Text_IO.Put("usage: buffername processname cfgsource");
Ada.Text_IO.New_Line;
Ada.Command_Line.Set_Exit_Status(Ada.Command_Line.Failure);
return;
end if;
Connection1 := Nml.CreateConnection(Nml_Test_Format_N_Ada.Format'Access,
Ada.Command_Line.Argument(1),
Ada.Command_Line.Argument(2),
Ada.Command_Line.Argument(3));
if True /= Nml.Valid(Connection1) then
Nml.Free(Connection1);
Ada.Command_Line.Set_Exit_Status(Ada.Command_Line.Failure);
return;
end if;
Msg := new Nml_Test_Format_N_Ada.Test_Message;
Msg.I := 67;
Msg.Ia(1) := 61;
Msg.Ia(4) := 64;
Msg.Ida_Length := 3;
Msg.Ida(1) := 51;
Msg.Ida(3) := 53;
Msg.Ida(4) := 54;
Msg.Ida(8) := 58;
--Msg.AnotherInt := 67;
--Msg.AnIntArray(1):=1;
--Msg.AnIntArray(2):=2;
--Msg.AnIntArray(3):=3;
--Msg.AnIntArray(4):=4;
--Msg.AnIntArray(5):=5;
--Msg.AnIntArray(10):=10;
--Msg.AnIntDla_Length:=3;
--Msg.AnIntDla(1):=1;
--Msg.AnIntDla(2):=2;
--Msg.AnIntDla(3):=3;
--Msg.AnIntDla(4):=4;
--Msg.AnIntDla(5):=5;
--Msg.AnIntDla(10):=10;
Ok := Nml.Write(Connection1,NmlMsg_Access(Msg));
Nml.Free(Connection1);
Nml_Test_Format_N_Ada.Free(Msg);
end Nmltest_Write_Ada;
|
AaronC98/PlaneSystem | Ada | 4,883 | ads | ------------------------------------------------------------------------------
-- Ada Web Server --
-- --
-- Copyright (C) 2003-2013, AdaCore --
-- --
-- This library is free software; you can redistribute it and/or modify --
-- it under terms of the GNU General Public License as published by the --
-- Free Software Foundation; either version 3, or (at your option) any --
-- later version. This library is distributed in the hope that it will be --
-- useful, but WITHOUT ANY WARRANTY; without even the implied warranty of --
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- --
-- --
-- --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- --
-- --
-- --
-- --
-- --
-- --
------------------------------------------------------------------------------
pragma Ada_2012;
-- This API is used as for standard memory stream (see parent package), the
-- only difference is that the stream is compressing/decompressing on append.
with ZLib;
package AWS.Resources.Streams.Memory.ZLib is
package ZL renames Standard.ZLib;
type Stream_Type is new Memory.Stream_Type with private;
subtype Window_Bits_Type is ZL.Window_Bits_Type;
subtype Header_Type is ZL.Header_Type;
subtype Compression_Level is ZL.Compression_Level;
subtype Strategy_Type is ZL.Strategy_Type;
subtype Compression_Method is ZL.Compression_Method;
subtype Memory_Level_Type is ZL.Memory_Level_Type;
Default_Compression : constant Compression_Level := ZL.Default_Compression;
Default_Header : constant Header_Type := ZL.Default;
procedure Deflate_Initialize
(Resource : in out Stream_Type;
Level : Compression_Level := ZL.Default_Compression;
Strategy : Strategy_Type := ZL.Default_Strategy;
Method : Compression_Method := ZL.Deflated;
Window_Bits : Window_Bits_Type := ZL.Default_Window_Bits;
Memory_Level : Memory_Level_Type := ZL.Default_Memory_Level;
Header : Header_Type := ZL.Default)
with Inline;
-- Initialize the compression
procedure Inflate_Initialize
(Resource : in out Stream_Type;
Window_Bits : Window_Bits_Type := ZL.Default_Window_Bits;
Header : Header_Type := ZL.Default)
with Inline;
-- Initialize the decompression
overriding procedure Append
(Resource : in out Stream_Type;
Buffer : Stream_Element_Array;
Trim : Boolean := False);
-- Compress/decompress and Append Buffer into the memory stream
overriding procedure Read
(Resource : in out Stream_Type;
Buffer : out Stream_Element_Array;
Last : out Stream_Element_Offset);
-- Returns a chunck of data in Buffer, Last point to the last element
-- returned in Buffer.
overriding function Size
(Resource : Stream_Type) return Stream_Element_Offset;
-- Returns the number of bytes in the memory stream
overriding procedure Close (Resource : in out Stream_Type);
-- Close the ZLib stream, release all memory associated with the Resource
-- object.
private
type Stream_Access is access all Stream_Type;
type Stream_Type is new Memory.Stream_Type with record
Self : Stream_Access := Stream_Type'Unchecked_Access;
-- We need it for auto flush in the Size routine call
Filter : ZL.Filter_Type;
Flushed : Boolean;
end record;
end AWS.Resources.Streams.Memory.ZLib;
|
damaki/SPARKNaCl | Ada | 534 | ads | package SPARKNaCl.Debug
with SPARK_Mode => On
is
-- as per Boolean'Image (B) but does not violate the
-- No_Enumeration_Maps restriction
function Img (B : in Boolean) return String is
(if B then "TRUE" else "FALSE");
procedure DH (S : in String; D : in Byte_Seq);
procedure DH (S : in String; D : in U32_Seq);
procedure DH (S : in String; D : in Boolean);
procedure DH (S : in String; D : in I64);
-- Same but output in hex
procedure DHH (S : in String; D : in I64);
end SPARKNaCl.Debug;
|
Tim-Tom/project-euler | Ada | 2,453 | adb | with Ada.Text_IO;
with Ada.Containers.Vectors;
package body Problem_40 is
package IO renames Ada.Text_IO;
package Natural_Vector is new Ada.Containers.Vectors(Index_Type => Natural, Element_Type => Natural);
procedure Solve is
bases : Natural_Vector.Vector;
procedure Digit_At(location: in Positive; digit : out Character) is
domain : Natural := 0;
begin
if location > bases.Last_Element then
loop
declare
next_domain : constant Natural := Natural(bases.Last_Index) + 1;
count : constant Positive := 10**next_domain - 10**(next_domain - 1);
begin
bases.Append(count * next_domain + bases.Last_Element);
exit when location <= bases.Last_Element;
end;
end loop;
domain := bases.Last_Index - 1;
else
declare
use Natural_Vector;
cursor : Natural_Vector.Cursor := bases.First;
begin
while cursor /= Natural_Vector.No_Element loop
exit when Natural_Vector.Element(cursor) > location;
domain := Natural_Vector.To_Index(cursor);
Natural_Vector.Next(cursor);
end loop;
end;
end if;
if domain = 0 then
digit := Character'Val(location + Character'Pos('0'));
else
declare
bounded_number : constant Natural := location - bases.Element(domain);
stride : constant Natural := domain + 1;
position : constant Natural := domain - bounded_number mod stride;
number : constant Natural := 10**domain + (bounded_number / stride);
digit_num : constant Natural := (number / 10**position) mod 10;
begin
digit := Character'Val(digit_num + Character'Pos('0'));
end;
end if;
end Digit_At;
type Positive_Array is Array(Positive range <>) of Positive;
locations : constant Positive_Array := (1, 10, 100, 1_000, 10_000, 100_000, 1_000_000);
result : String(locations'Range);
begin
bases.Append(0);
bases.Append(10);
for index in locations'Range loop
Digit_At(locations(index), result(index));
end loop;
IO.Put_Line(result);
end Solve;
end Problem_40;
|
AdaCore/langkit | Ada | 5,895 | ads | --
-- Copyright (C) 2014-2022, AdaCore
-- SPDX-License-Identifier: Apache-2.0
--
with Langkit_Support.Adalog.Logic_Var;
generic
with package Logic_Vars is new Langkit_Support.Adalog.Logic_Var (<>);
package Langkit_Support.Adalog.Solver_Interface is
use Logic_Vars;
-------------------
-- Functor types --
-------------------
-- The solver contains a number of abstract functor types, that are meant
-- to be derived by the client to provide functionality.
--
-- The reason functor types are exposed is if you need to store state along
-- with your function. If you don't, there are convenience constructors
-- that take access to functions.
type Base_Functor_Type is abstract tagged record
Ref_Count : Natural;
-- Functors are generally dynamically allocated and handled through
-- access types. This tracks the number of references to a functor, so
-- that we know when to deallocate it.
end record;
procedure Destroy (Self : in out Base_Functor_Type) is null;
--------------------
-- Predicate_Type --
--------------------
type Predicate_Type is abstract new Base_Functor_Type with record
Cache_Set : Boolean;
Cache_Key : Value_Type;
Cache_Value : Boolean;
end record;
function Call
(Self : Predicate_Type; Val : Value_Type) return Boolean is abstract;
-- Derived types must override this to implement the predicate
function Call_Wrapper
(Self : in out Predicate_Type'Class; Val : Value_Type) return Boolean;
-- Converter users must call this instead of ``Convert`` to use the cache
function Image (Self : Predicate_Type) return String is ("");
function Full_Image
(Self : Predicate_Type; Dummy_Var : Logic_Vars.Logic_Var) return String
is ("");
-- A predicate encapsulates the logic of applying a boolean predicate to a
-- value, returning whether the predicate succeeds.
----------------------
-- N_Predicate_Type --
----------------------
type N_Predicate_Type (N : Positive) is
abstract new Base_Functor_Type with
record
Cache_Set : Boolean;
Cache_Key : Value_Array (1 .. N);
Cache_Value : Boolean;
end record;
-- A predicate encapsulates the logic of applying a boolean predicate to a
-- list of values, returning whether the predicate succeeds.
function Call
(Self : N_Predicate_Type; Vals : Logic_Vars.Value_Array) return Boolean
is abstract;
-- Derived types must override this to implement the predicate
function Call_Wrapper
(Self : in out N_Predicate_Type'Class;
Vals : Logic_Vars.Value_Array) return Boolean;
-- Converter users must call this instead of ``Convert`` to use the cache
function Image (Self : N_Predicate_Type) return String is ("");
function Full_Image
(Self : N_Predicate_Type; Dummy_Vars : Logic_Var_Array) return String
is ("");
--------------------
-- Converter_Type --
--------------------
type Converter_Type is abstract new Base_Functor_Type with record
Cache_Set : Boolean;
Cache_Key, Cache_Value : Value_Type;
end record;
-- Type to convert one value to another
function Convert
(Self : Converter_Type; From : Value_Type) return Value_Type
is abstract;
-- Derived types must override this to implement the conversion
function Convert_Wrapper
(Self : in out Converter_Type; From : Value_Type) return Value_Type;
-- Converter users must call this instead of ``Convert`` to use the cache
function Image (Self : Converter_Type) return String is ("");
function No_Converter return Converter_Type'Class;
-- Return a special converter that just raises a ``Program_Error`` when
-- called.
function Is_No_Converter (Self : Converter_Type'Class) return Boolean;
-- Return whether ``Self`` comes from ``No_Converter``
-------------------
-- Combiner_Type --
-------------------
type Combiner_Type (N : Positive) is
abstract new Base_Functor_Type with
record
Cache_Set : Boolean;
Cache_Key : Value_Array (1 .. N);
Cache_Value : Value_Type;
end record;
-- Type to compute a value from multiple input values
function Combine
(Self : Combiner_Type;
Vals : Logic_Vars.Value_Array) return Value_Type is abstract;
-- Derived types must override this to implement the value computation
function Combine_Wrapper
(Self : in out Combiner_Type'Class;
Vals : Logic_Vars.Value_Array) return Value_Type;
-- Combiner users must call this instead of ``Combine`` to use the cache
function Image (Self : Combiner_Type) return String is ("");
-------------------------------------
-- Stateless functors constructors --
-------------------------------------
-- Those constructors are a shortcut to avoid creating custom functor types
-- when you have no state to store.
function Predicate
(Pred : access function (V : Value_Type) return Boolean;
Pred_Name : String := "Predicate")
return Predicate_Type'Class;
-- Create a Predicate relation. A Predicate relation will solve
-- successfully if the ``Predicate`` applied to the value of
-- ``Logic_Var`` yields ``True``.
function N_Predicate
(Pred : access function (V : Value_Array) return Boolean;
Arity : Positive;
Pred_Name : String := "N_Predicate") return N_Predicate_Type'Class;
function Converter
(Pred : access function (V : Value_Type) return Value_Type;
Pred_Name : String := "Converter") return Converter_Type'Class;
function Combiner
(Comb : access function (V : Value_Array) return Value_Type;
Arity : Positive;
Comb_Name : String := "Combiner") return Combiner_Type'Class;
end Langkit_Support.Adalog.Solver_Interface;
|
zhmu/ananas | Ada | 6,246 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M . P A C K _ 5 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_51 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_51;
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_51 --
------------
function Get_51
(Arr : System.Address;
N : Natural;
Rev_SSO : Boolean) return Bits_51
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_51;
------------
-- Set_51 --
------------
procedure Set_51
(Arr : System.Address;
N : Natural;
E : Bits_51;
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_51;
end System.Pack_51;
|
AdaCore/training_material | Ada | 264 | adb | with Ada.Text_IO; use Ada.Text_IO;
with Priority_Queue;
procedure Main is
begin
-- Push some things onto the queue
-- Pop everything off the queue and print what you popped
-- Push enough things off the queue to overflow it
null;
end Main;
|
reznikmm/matreshka | Ada | 4,631 | 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_Form.Auto_Complete_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Form_Auto_Complete_Attribute_Node is
begin
return Self : Form_Auto_Complete_Attribute_Node do
Matreshka.ODF_Form.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Form_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Form_Auto_Complete_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Auto_Complete_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Form_URI,
Matreshka.ODF_String_Constants.Auto_Complete_Attribute,
Form_Auto_Complete_Attribute_Node'Tag);
end Matreshka.ODF_Form.Auto_Complete_Attributes;
|
vikasbidhuri1995/DW1000 | Ada | 50,971 | ads | -------------------------------------------------------------------------------
-- Copyright (c) 2016 Daniel King
--
-- 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.
-------------------------------------------------------------------------------
pragma Profile (Ravenscar);
pragma Partition_Elaboration_Policy (Sequential);
with Ada.Real_Time;
with DW1000.Constants;
with DW1000.BSP;
with DW1000.Register_Types; use DW1000.Register_Types;
with DW1000.System_Time; use DW1000.System_Time;
with DW1000.Types; use DW1000.Types;
with Interfaces; use Interfaces;
-- This package contains high-level procedures for using the DW1000.
package DW1000.Driver
with SPARK_Mode => On
is
type Result_Type is
(Success,
Error);
type Clocks is
(Enable_All_Seq,
Force_Sys_XTI,
Force_Sys_PLL,
Read_Acc_On,
Read_Acc_Off,
Force_OTP_On,
Force_OTP_Off,
Force_Tx_PLL);
type Data_Rates is
(Data_Rate_110k, -- 110 kbps
Data_Rate_850k, -- 850 kbps
Data_Rate_6M8); -- 6.8 Mbps
for Data_Rates use
(Data_Rate_110k => 2#00#,
Data_Rate_850k => 2#01#,
Data_Rate_6M8 => 2#10#);
type Channel_Number is range 1 .. 7
with Static_Predicate => Channel_Number in 1 .. 5 | 7;
-- Channels 1 .. 5 and 7 are supported by the DW1000.
type PRF_Type is (PRF_16MHz, PRF_64MHz);
for PRF_Type use
(PRF_16MHz => 2#01#,
PRF_64MHz => 2#10#);
type Preamble_Lengths is
(PLEN_64,
PLEN_128,
PLEN_256,
PLEN_512,
PLEN_1024,
PLEN_1536,
PLEN_2048,
PLEN_4096);
type Preamble_Acq_Chunk_Length is
(PAC_8,
PAC_16,
PAC_32,
PAC_64);
type Preamble_Code_Number is new Positive range 1 .. 24;
type Physical_Header_Modes is
(Standard_Frames,
Extended_Frames);
for Physical_Header_Modes use
(Standard_Frames => 2#00#,
Extended_Frames => 2#11#);
type SFD_Timeout_Number is new Natural range 0 .. (2**16) - 1;
type SFD_Length_Number is new Natural range 8 .. 64
with Static_Predicate => SFD_Length_Number in 8 .. 16 | 64;
type AON_Address_Array is array (Index range <>) of AON_ADDR_Field;
-- Array of addresses within the AON address space.
type Rx_Modes is (Normal, Sniff);
type Tx_Power_Config_Type (Smart_Tx_Power_Enabled : Boolean := True) is
record
case Smart_Tx_Power_Enabled is
when True =>
Boost_Normal : TX_POWER_Field;
Boost_500us : TX_POWER_Field;
Boost_250us : TX_POWER_Field;
Boost_125us : TX_POWER_Field;
when False =>
Boost_SHR : TX_POWER_Field;
Boost_PHR : TX_POWER_Field;
end case;
end record;
type Tx_Power_Config_Table is
array (Positive range 1 .. 7, PRF_Type)
of Tx_Power_Config_Type;
function To_Positive (PAC : in Preamble_Acq_Chunk_Length) return Positive
is (case PAC is
when PAC_8 => 8,
when PAC_16 => 16,
when PAC_32 => 32,
when PAC_64 => 64);
function To_Positive (Preamble_Length : in Preamble_Lengths) return Positive
is (case Preamble_Length is
when PLEN_64 => 64,
when PLEN_128 => 128,
when PLEN_256 => 256,
when PLEN_512 => 512,
when PLEN_1024 => 1024,
when PLEN_1536 => 1536,
when PLEN_2048 => 2048,
when PLEN_4096 => 4096);
function Recommended_PAC (Preamble_Length : in Preamble_Lengths)
return Preamble_Acq_Chunk_Length
is (case Preamble_Length is
when PLEN_64 => PAC_8,
when PLEN_128 => PAC_8,
when PLEN_256 => PAC_16,
when PLEN_512 => PAC_16,
when PLEN_1024 => PAC_32,
when PLEN_1536 => PAC_64,
when PLEN_2048 => PAC_64,
when PLEN_4096 => PAC_64);
-- Get the recommended preamble acquisition chunk (PAC) length based
-- on the preamble length.
--
-- These recommendations are from Section 4.1.1 of the DW1000 User Manual.
function Recommended_SFD_Timeout
(Preamble_Length : in Preamble_Lengths;
SFD_Length : in SFD_Length_Number;
PAC : in Preamble_Acq_Chunk_Length)
return SFD_Timeout_Number
is (SFD_Timeout_Number
((To_Positive (Preamble_Length) + Positive (SFD_Length) + 1) -
To_Positive (PAC)));
-- Compute the recommended SFD timeout for a given preamble length, SFD
-- length, and preamble acquisition chunk length.
--
-- For example, with a preable length of 1024 symbols, an SFD length of
-- 64 symbols, and a PAC length of 32 symbols the recommended SFD timeout
-- is 1024 + 64 + 1 - 32 = 1057 symbols.
--
-- @param Preamble_Length The length of the preamble in symbols.
--
-- @param SFD_Length The length of the SFD in symbols. The SFD length
-- depends on whether or not a non-standard SFD is used, and the data
-- rate. For a data rate of 110 kbps the SFD length is 64 symbols for
-- the standard SFD and DecaWave-defined SFD. For a data rate of 850
-- kbps and above the SFD length is 8 symbols for a standard SFD, and 8
-- or 16 symbols for the DecaWave-defined SFD sequence.
--
-- @param PAC The preamble acquisition chunk length.
procedure Load_LDE_From_ROM
with Global => (In_Out => DW1000.BSP.Device_State,
Input => Ada.Real_Time.Clock_Time),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State,
null => Ada.Real_Time.Clock_Time);
-- Loads the leading edge detection (LDE) microcode from ROM.
--
-- The LDE code must be loaded in order to use the LDE algorithm. If the
-- LDE code is not loaded then the LDERUNE bit in the PMSC_CTRL1 register
-- must be set to 0.
--
-- Note: This procedure modifies the clocks setting in PMSC_CTRL0.
procedure Enable_Clocks (Clock : in Clocks)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Clock);
-- Enables and configures the specified clock.
--
-- This procedure configures the following registers:
-- * PMSC_CTRL0
procedure Read_OTP (Address : in OTP_ADDR_Field;
Word : out Bits_32)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => ((DW1000.BSP.Device_State, Word) => (DW1000.BSP.Device_State,
Address));
-- Reads a 32-bit word from the DW1000 one-time programmable (OTP) memory.
--
-- The package DW1000.Constants defines the addresses used to store the
-- various data stored in the OTP memory.
procedure Read_OTP_Tx_Power_Level (Channel : in Channel_Number;
PRF : in PRF_Type;
Power_Level : out TX_POWER_Type)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => (DW1000.BSP.Device_State,
Channel,
PRF),
Power_Level => (DW1000.BSP.Device_State,
Channel,
PRF));
procedure Read_OTP_Antenna_Delay
(Antenna_Delay_16_MHz : out Antenna_Delay_Time;
Antenna_Delay_64_MHz : out Antenna_Delay_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State,
Antenna_Delay_16_MHz => DW1000.BSP.Device_State,
Antenna_Delay_64_MHz => DW1000.BSP.Device_State);
procedure Configure_Tx_Power (Config : Tx_Power_Config_Type)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Config);
-- Configure the transmit power of the DW1000 transmitter.
--
-- This procedure is used to configure both smart transmit power and
-- manual transmit power. The @Smart_Tx_Power_Enabled@ field of the
-- @Tx_Power_Config_Type@ record determines whether or not smart tx is
-- enabled or disabled.
--
-- Depending on whether or not smart transmit power is enabled or disabled
-- the @Tx_Power_Config_Type@ record contains different fields.
--
-- An example of configuring a specific smart transmit power configuration
-- is demonstrated below:
--
-- Configure_Tx_Power (Tx_Power_Config_Type'
-- (Smart_Tx_Power_Enabled => True,
-- Boost_Normal => (Coarse_Gain_Enabled => True,
-- Fine_Gain => 10.5,
-- Coarse_Gain => 9.0),
-- Boost_500us => (Coarse_Gain_Enabled => True,
-- Fine_Gain => 10.5,
-- Coarse_Gain => 12.0),
-- Boost_250us => (Coarse_Gain_Enabled => True,
-- Fine_Gain => 10.5,
-- Coarse_Gain => 15.0),
-- Boost_125us => (Coarse_Gain_Enabled => True,
-- Fine_Gain => 10.5,
-- Coarse_Gain => 18.0)));
--
-- An example manual transmit power configuration is shown below:
--
-- Configure_Tx_Power (Tx_Power_Config_Type'
-- (Smart_Tx_Power_Enabled => False,
-- Boost_SHR => (Coarse_Gain_Enabled => True,
-- Fine_Gain => 3.5,
-- Coarse_Gain => 9.0),
-- Boost_PHR => (Coarse_Gain_Enabled => True,
-- Fine_Gain => 3.5,
-- Coarse_Gain => 9.0));
--
-- @param Config Record containing the transmit power configuration.
procedure Read_EUID (EUID : out Bits_64)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => ((DW1000.BSP.Device_State, EUID) => DW1000.BSP.Device_State);
-- Read the extended unique identifier (EUID).
procedure Write_EUID (EUID : in Bits_64)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ EUID);
-- Write the extended unique identifier (EUID).
procedure Read_PAN_ID (PAN_ID : out Bits_16)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => ((DW1000.BSP.Device_State, PAN_ID) => DW1000.BSP.Device_State);
procedure Write_PAN_ID (PAN_ID : in Bits_16)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ PAN_ID);
procedure Read_Short_Address (Short_Address : out Bits_16)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => ((DW1000.BSP.Device_State,
Short_Address) => DW1000.BSP.Device_State);
procedure Write_Short_Address (Short_Address : in Bits_16)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Short_Address);
procedure Read_PAN_ID_And_Short_Address (PAN_ID : out Bits_16;
Short_Address : out Bits_16)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => ((DW1000.BSP.Device_State,
PAN_ID,
Short_Address) => DW1000.BSP.Device_State);
procedure Write_PAN_ID_And_Short_Address (PAN_ID : in Bits_16;
Short_Address : in Bits_16)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ (PAN_ID, Short_Address));
procedure Read_Tx_Antenna_Delay (Antenna_Delay : out Antenna_Delay_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => ((DW1000.BSP.Device_State,
Antenna_Delay) => DW1000.BSP.Device_State);
-- Read the currently configured Tx antenna delay.
--
-- The antenna delay is a 16-bit value using the same unit as the system
-- time and time stamps, i.e. 499.2 MHz * 128, so the least significant
-- bit is approximately 15.65 picoseconds.
procedure Write_Tx_Antenna_Delay (Antenna_Delay : in Antenna_Delay_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => (DW1000.BSP.Device_State,
Antenna_Delay)),
Pre => Antenna_Delay <= (2.0**16 - 1.0) * Fine_System_Time'Delta;
-- Set the Tx antenna delay.
--
-- The antenna delay is a 16-bit value using the same unit as the system
-- time and time stamps, i.e. 499.2 MHz * 128, so the least significant
-- bit is approximately 15.65 picoseconds.
--
-- This procedure configures the following registers:
-- * TX_ANTD
--
-- @param Antenna_Delay The antenna delay. The maximum allowed value is
-- 1025.625 nanoseconds.
procedure Read_Rx_Antenna_Delay (Antenna_Delay : out Antenna_Delay_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => ((DW1000.BSP.Device_State,
Antenna_Delay) => DW1000.BSP.Device_State);
-- Read the currently configured Rx antenna delay.
--
-- The antenna delay is a 16-bit value using the same unit as the system
-- time and time stamps, i.e. 499.2 MHz * 128, so the least significant
-- bit is approximately 15.65 picoseconds.
procedure Write_Rx_Antenna_Delay (Antenna_Delay : in Antenna_Delay_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => (DW1000.BSP.Device_State,
Antenna_Delay)),
Pre => Antenna_Delay <= (2.0**16 - 1.0) * Fine_System_Time'Delta;
-- Set the Rx antenna delay.
--
-- The antenna delay is a 16-bit value using the same unit as the system
-- time and time stamps, i.e. 499.2 MHz * 128, so the least significant
-- bit is approximately 15.65 picoseconds.
--
-- This procedure configures the following registers:
-- * LDE_RXANTD
--
-- @param Antenna_Delay The antenna delay. The maximum allowed value is
-- 1025.625 nanoseconds.
procedure Configure_LDE (PRF : in PRF_Type;
Rx_Preamble_Code : in Preamble_Code_Number;
Data_Rate : in Data_Rates)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => (DW1000.BSP.Device_State,
PRF,
Rx_Preamble_Code,
Data_Rate));
-- Configures the LDE subsystem for the specified pulse repetition
-- frequency (PRF), receiver preamble code, and data rate.
--
-- This procedure configures the following registers:
-- * LDE_CFG1
-- * LDE_CFG2
-- * LDE_REPC
procedure Configure_PLL (Channel : in Channel_Number)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => (DW1000.BSP.Device_State,
Channel));
-- Configures the PLL subsystem for the specified UWB channel.
--
-- This procedure configures the following registers:
-- * FS_PLLCFG
-- * FS_PLLTUNE
-- * FS_XTALT
procedure Configure_RF (Channel : in Channel_Number)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => (DW1000.BSP.Device_State,
Channel));
-- Configures the RF subsystem for the specified UWB channel.
--
-- This procedure configures the following registers:
-- * RF_RXCTRLH
-- * RF_TXCTRL
procedure Configure_DRX (PRF : in PRF_Type;
Data_Rate : in Data_Rates;
Tx_Preamble_Length : in Preamble_Lengths;
PAC : in Preamble_Acq_Chunk_Length;
SFD_Timeout : in SFD_Timeout_Number;
Nonstandard_SFD : in Boolean)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State
=> (DW1000.BSP.Device_State,
PRF,
Data_Rate,
Tx_Preamble_Length,
PAC,
SFD_Timeout,
Nonstandard_SFD));
-- Configures the DRX subsystem for the specified configuration.
--
-- This procedure configures the following registers:
-- * DRX_TUNE0b
-- * DRX_TUNE1a
-- * DRX_TUNE1b
-- * DRX_TUNE4H
-- * DRX_TUNE2
-- * DRX_SFDTOC
procedure Configure_AGC (PRF : in PRF_Type)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ PRF);
-- Configures the automatic gain control (AGC) subsystem.
--
-- This procedure configures the following registers:
-- * AGC_TUNE2
-- * AGC_TUNE1
procedure Configure_TC (Channel : in Channel_Number)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Channel);
-- Configure the transmit calibration (TC) block for the specified channel.
procedure Configure_TX_FCTRL (Frame_Length : in Natural;
Tx_Data_Rate : in Data_Rates;
Tx_PRF : in PRF_Type;
Ranging : in Boolean;
Preamble_Length : in Preamble_Lengths;
Tx_Buffer_Offset : in Natural;
Inter_Frame_Spacing : in Natural)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => (DW1000.BSP.Device_State,
Frame_Length,
Tx_Data_Rate,
Tx_PRF,
Ranging,
Preamble_Length,
Tx_Buffer_Offset,
Inter_Frame_Spacing)),
Pre =>
(Frame_Length < Constants.TX_BUFFER_Length
and then Tx_Buffer_Offset < Constants.TX_BUFFER_Length
and then Frame_Length + Tx_Buffer_Offset <= Constants.TX_BUFFER_Length
and then Inter_Frame_Spacing < 256);
procedure Configure_CHAN_CTRL
(Tx_Channel : in Channel_Number;
Rx_Channel : in Channel_Number;
Use_DecaWave_SFD : in Boolean;
Use_Tx_User_Defined_SFD : in Boolean;
Use_Rx_User_Defined_SFD : in Boolean;
Rx_PRF : in PRF_Type;
Tx_Preamble_Code : in Preamble_Code_Number;
Rx_Preamble_Code : in Preamble_Code_Number)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => (DW1000.BSP.Device_State,
Tx_Channel,
Rx_Channel,
Use_DecaWave_SFD,
Use_Tx_User_Defined_SFD,
Use_Rx_User_Defined_SFD,
Rx_PRF,
Tx_Preamble_Code,
Rx_Preamble_Code)),
Pre => ((if Use_Tx_User_Defined_SFD then not Use_DecaWave_SFD)
and (if Use_Rx_User_Defined_SFD then not Use_DecaWave_SFD));
procedure Configure_Nonstandard_SFD_Length (Data_Rate : in Data_Rates)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Data_Rate);
-- Configures the length of the non-standard SFD for the specified
-- data rate.
--
-- This procedure configures the following registers:
-- * USR_SFD
procedure Configure_Non_Standard_SFD (Rx_SFD : in String;
Tx_SFD : in String)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ (Rx_SFD, Tx_SFD)),
Pre => (Rx_SFD'Length in 8 .. 16 | 64
and Tx_SFD'Length = Rx_SFD'Length
and (for all I in Rx_SFD'Range => Rx_SFD (I) in '+' | '-' | '0')
and (for all I in Tx_SFD'Range => Tx_SFD (I) in '+' | '-' | '0')
);
-- Configure a non-standard SFD sequence.
--
-- WARNING: Only experts should consider designing their own SFD sequence.
-- Designing an SFD is a complicated task, and is outside the scope of this
-- documentation. It is strongly recommended to use either the standard
-- defined SFD sequence, or the DecaWave defined SFD sequence.
--
-- The Rx_SFD and Tx_SFD strings must be strings containing only '+', '-',
-- and '0' characters. No other characters are permitted.
-- Below is an example of calling this procedure, using the
-- DecaWave defined 16-symbol SFD sequence as an example SFD sequence:
--
-- Configure_Non_Standard_SFD (Rx_SFD => "----+-+--++--+00",
-- Tx_SFD => "----+-+--++--+00");
--
-- Note that the Tx and Rx SFD must have the same length.
--
-- @param Rx_SFD The SFD sequence to use in the receiver.
--
-- @param Tx_SFD The SFD sequence to use in the transmitter.
procedure Set_Frame_Filtering_Enabled (Enable : in Boolean)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Enable);
-- Enable or disable frame filtering.
--
-- Frame filtering allows the DW1000 to automatically reject frames
-- according to certain criterea according to the IEEE 802.15.4-2011
-- MAC layer.
--
-- To configure which frames are accepted or rejected by the DW1000 see the
-- Configure_Frame_Filtering procedure.
--
-- @param Enabled When set to True frame filtering is enabled. Otherwise,
-- it is disabled.
procedure Set_FCS_Check_Enabled (Enable : in Boolean)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Enable);
-- Enable or disable the automatic frame check sequence (FCS) on received
-- frames.
--
-- By default, the DW1000 automatically checks the 16-bit CRC FCS on each
-- received frame. The last two octets in the received frame are assumed
-- as the 16-bit CRC, and is compared against the actual FCS computed
-- against all but the last two octets in the received frame.
--
-- If the DW1000 detects that the actual FCS does not match the FCS in the
-- received frame, then it generates an FCS error. If double-buffered mode
-- is enabled then the received frame is discarded and the buffer re-used
-- for the next received frame.
--
-- This procedure enables or disables the FCS check.
--
-- @param Enabled When True (default after DW1000 reset) the DW1000 will
-- check the FCS of each received frame. Set this to false to disable
-- the FCS check for each packet.
procedure Configure_Frame_Filtering (Behave_As_Coordinator : in Boolean;
Allow_Beacon_Frame : in Boolean;
Allow_Data_Frame : in Boolean;
Allow_Ack_Frame : in Boolean;
Allow_MAC_Cmd_Frame : in Boolean;
Allow_Reserved_Frame : in Boolean;
Allow_Frame_Type_4 : in Boolean;
Allow_Frame_Type_5 : in Boolean)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => (DW1000.BSP.Device_State,
Behave_As_Coordinator,
Allow_Beacon_Frame,
Allow_Data_Frame,
Allow_Ack_Frame,
Allow_MAC_Cmd_Frame,
Allow_Reserved_Frame,
Allow_Frame_Type_4,
Allow_Frame_Type_5));
-- Configure which MAC frame types are automatically filtered by the
-- DW1000.
--
-- Note that the frame filtering configuration only takes effect when
-- frame filtering is enabled (see Set_Frame_Filtering_Enabled).
--
-- @param Behave_As_Coordinator When set to True the DW1000 will accept
-- a frame without a destination address if the source address has
-- the PAN ID matching the coordinator's PAN ID. When set to False
-- and when filtering is enabled the DW1000 will reject these frames.
--
-- @param Allow_Beacon_Frame When set to True the DW1000 will accept
-- frames whose frame type is a beacon frame. When set to False
-- and when filtering is enabled the DW1000 will reject these frames.
--
-- @param Allow_Data_Frame When set to True the DW1000 will accept
-- frames whose frame type is a data frame. When set to False
-- and when filtering is enabled the DW1000 will reject these frames.
--
-- @param Allow_Ack_Frame When set to True the DW1000 will accept frames
-- whose frame type is an acknowledgement frame. When set to False
-- and when filtering is enabled the DW1000 will reject these frames.
--
-- @param Allow_MAC_Cmd_Frame When set to True the DW1000 will accept
-- frames whose frame type is a MAC command frame. When set to False
-- and when filtering is enabled the DW1000 will reject these frames.
--
-- @param Allow_Reserved_Frame When set to True the DW1000 will accept
-- frames whose frame type is set to a reserved value (values 2#100#
-- to 2#111#) as defined by IEEE 802.15.4-2011. When set to False
-- and when filtering is enabled the DW1000 will reject these frames.
--
-- @param Allow_Frame_Type_4 When set to True the DW1000 will accept
-- frames whose frame type is set to the value 2#100#, i.e. 4.
-- When set to False and when frame filtering is enabled the DW1000
-- will reject these frames.
--
-- @param Allow_Frame_Type_5 When set to True the DW1000 will accept
-- frames whose frame type is set to the value 2#101#, i.e. 5.
-- When set to False and when frame filtering is enabled the DW1000
-- will reject these frames.
procedure Set_Smart_Tx_Power (Enable : in Boolean)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Enable);
-- Enables or disables smart Tx power control.
--
-- Regulations for UWB typically specify a maximum transmit power limit of
-- -41.3 dBm / MHz, typically measured with a dwell time of 1 ms. Short
-- frames transmitted at a data rate of 6.8 Mbps and a short preamble
-- length are transmitted in a fraction of a millisecond. If only a single
-- short frame is transmitted with in 1 ms then the frame can be
-- transmitted at a higher power than the -41.3 dBm / MHz regulatory limit.
--
-- When the smart tx power control is enabled then the DW1000 will
-- boost the power for short transmissions. It is the user's responsibility
-- to avoid sending multiple short frames within the same millisecond to
-- remain within the regulatory limits.
--
-- This procedure configures the following registers:
-- * SYS_CFG
procedure Set_Tx_Data (Data : in Types.Byte_Array;
Offset : in Natural)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State
=> (DW1000.BSP.Device_State,
Data,
Offset)),
Pre =>
(Data'Length <= DW1000.Constants.TX_BUFFER_Length
and then Offset < DW1000.Constants.TX_BUFFER_Length
and then Data'Length + Offset <= DW1000.Constants.TX_BUFFER_Length);
-- Write data to the DW1000 TX buffer.
--
-- Before starting the transmission, the frame length and offset must be
-- programmed into the DW1000 separately using the Set_Tx_Frame_Length
-- procedure.
--
-- The frame is not transmitted until the Start_Tx procedure is called.
--
-- This procedure configures the following registers:
-- * TX_BUFFER
procedure Set_Tx_Frame_Length (Length : in Natural;
Offset : in Natural)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ (Length, Offset)),
Pre => (Length < DW1000.Constants.TX_BUFFER_Length
and then Offset < DW1000.Constants.TX_BUFFER_Length
and then Length + Offset <= DW1000.Constants.TX_BUFFER_Length);
-- Configures the frame length and offset within the transmit buffer
-- (TX_BUFFER) to use when transmitting the next packet.
--
-- This procedure configures the following registers:
-- * TX_FCTRL
procedure Read_Rx_Data (Data : out Types.Byte_Array;
Offset : in Natural)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ (Offset, Data),
Data => (DW1000.BSP.Device_State, Offset)),
Pre =>
(Data'Length > 0
and then Data'Length <= DW1000.Constants.RX_BUFFER_Length
and then Offset < DW1000.Constants.RX_BUFFER_Length
and then Data'Length + Offset <= DW1000.Constants.RX_BUFFER_Length);
-- Read the received frame from the Rx buffer.
procedure Start_Tx_Immediate (Rx_After_Tx : in Boolean;
Auto_Append_FCS : in Boolean)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ (Rx_After_Tx, Auto_Append_FCS));
procedure Start_Tx_Delayed (Rx_After_Tx : in Boolean;
Result : out Result_Type)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Rx_After_Tx,
Result => (DW1000.BSP.Device_State,
Rx_After_Tx));
-- Transmit the contents of the TX buffer with a delay.
--
-- The time at which the packet is to be transmitted must be set before
-- calling this procedure by using the Set_Delayed_Tx_Rx_Time procedure.
--
-- When Rx_After_Tx is True then the receiver is automatically enabled
-- after the transmission is completed.
--
-- This procedure configures the following registers:
-- * SYS_CTRL
procedure Set_Delayed_Tx_Rx_Time (Delay_Time : in Coarse_System_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Delay_Time);
-- Set the receive and transmit delay.
--
-- Both Rx and Tx share the same delay. It is not possible for the receiver
-- and transmitter to use different delays simultaneously.
--
-- The delay time is measured in units of 499.2 MHz * 128, i.e. the least
-- significant bit of the delay time is approximately 15.65 ps.
--
-- Note that the 9 low order bits of the input value are ignored by the
-- DW1000, as described in Section 7.2.12 of the DW1000 User Manual
-- (DX_TIME register).
--
-- This procedure configures the following registers:
-- * DX_TIME
procedure Set_Sleep_After_Tx (Enable : in Boolean)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Enable);
-- Configures the DW1000 to enter sleep more (or not) after transmitting a
-- frame.
--
-- When Enable is True, the DW1000 will automatically enter sleep mode
-- after each frame is sent. Otherwise, when Enable is False the DW1000
-- will not enter sleep mode after each frame is sent.
--
-- This procedure configures the following registers:
-- * PMSC_CTRL1
procedure Read_Rx_Adjusted_Timestamp (Timestamp : out Fine_System_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State,
Timestamp => DW1000.BSP.Device_State);
-- Read the corrected timestamp associated with the last received packet.
--
-- This timestamp is the timestamp that has been fully corrected for the
-- time of packet reception. The timestamp is in units of approximately
-- 15.65 picoseconds.
procedure Read_Rx_Raw_Timestamp (Timestamp : out Coarse_System_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State,
Timestamp => DW1000.BSP.Device_State);
-- Read the raw timestamp associated with the last received packet.
--
-- This timestamp is the timestamp before the various corrections for the
-- time of reception have been applied. The timestamp is in units of
-- approximately 8.013 nanoseconds.
procedure Read_Rx_Timestamps (Adjusted : out Fine_System_Time;
Raw : out Coarse_System_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State,
(Adjusted, Raw) => DW1000.BSP.Device_State);
-- Read both the raw and adjusted timestamps for the last received packet.
procedure Read_Tx_Adjusted_Timestamp (Timestamp : out Fine_System_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State,
Timestamp => DW1000.BSP.Device_State);
-- Read the corrected timestamp associated with the last transmitted
-- packet.
--
-- This timestamp is the timestamp that has been fully corrected for the
-- time of packet transmission. The timestamp is in units of approximately
-- 15.65 picoseconds.
procedure Read_Tx_Raw_Timestamp (Timestamp : out Coarse_System_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State,
Timestamp => DW1000.BSP.Device_State);
-- Read the raw timestamp associated with the last transmitted packet.
--
-- This timestamp is the timestamp before the various corrections for the
-- time of transmission have been applied. The timestamp is in units of
-- approximately 8.013 nanoseconds.
procedure Read_Tx_Timestamps (Adjusted : out Fine_System_Time;
Raw : out Coarse_System_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State,
(Adjusted, Raw) => DW1000.BSP.Device_State);
procedure Read_System_Timestamp (Timestamp : out Coarse_System_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State,
Timestamp => DW1000.BSP.Device_State);
-- Read the current value of the DW1000's system timestamp.
--
-- The timestamp is measured in units of 499.2 MHz * 128, i.e. the least
-- significant bit of the timestamp is approximately 15.65 ps.
procedure Check_Overrun (Overrun : out Boolean)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State,
Overrun => DW1000.BSP.Device_State);
-- Check if an overrun condition has occurred.
--
-- An overrun condition occurs if the DW1000 receives a new packet before
-- the host processor has been able to read the previously received packet.
--
-- See Section 4.3.5 of the DW1000 User Manual for more information of the
-- overrun condition.
procedure Force_Tx_Rx_Off
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State);
-- Force off the tranceiver.
--
-- This also clears the status registers.
--
-- Turning off the tranceiver will cancel any pending receive or
-- transmit operation.
procedure Reset_Rx
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State);
-- Perform a soft reset of the receiver only.
procedure Toggle_Host_Side_Rx_Buffer_Pointer
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State);
-- Toggle the host side receive buffer pointer (HSRBP).
--
-- This procedure is only relevant when double-buffer mode is enabled.
-- Calling this procedure signals to the DW1000 that the host IC is
-- finished with the contents of the current double-buffered set.
--
-- It should be called after the host IC has finished reading the receive
-- registers after a packet has been received.
procedure Sync_Rx_Buffer_Pointers
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State);
-- Synchronize the Rx buffer pointers for double-buffer operation.
--
-- This procedure synchronizes the ICRBP and HSRBP bits in the SYS_CTRL
-- register so that they are the same. This is only relevant when the
-- DW1000 is operating in double-buffer mode.
--
-- This procedure configures the following registers:
-- * SYS_CTRL
procedure Start_Rx_Immediate
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State);
-- Enable the receiver immediately (without a delay).
--
-- This procedure configures the following registers:
-- * SYS_CTRL
procedure Start_Rx_Delayed (Result : out Result_Type)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State,
Result => DW1000.BSP.Device_State);
-- Enable the receiver after a delay.
--
-- The receiver is enabled only at the time configured by calling the
-- Set_Tx_Rx_Delay_Time procedure, which must be set before calling this
-- procedure.
--
-- This procedure configures the following registers:
-- * SYS_CTRL
procedure Set_Rx_Mode (Mode : in Rx_Modes;
Rx_On_Time : in RX_SNIFF_SNIFF_ONT_Field;
Rx_Off_Time : in Sniff_Off_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ (Mode, Rx_On_Time, Rx_Off_Time)),
Pre => (if Mode = Sniff then Rx_Off_Time > 0.0);
-- Enables or disables the receiver sniff mode.
--
-- When Mode is set to Normal then when the receiver is turned on (see
-- the Enable_Rx procedure) then it will operate until either a frame is
-- received, or until the receiver timeout time is reached. In the Normal
-- mode the Rx_On_Time and Rx_Off_Time parameters are not used.
--
-- When Mode is set to Sniff then the receiver will be activated for the
-- duration of the Rx_On_Time, searching for a preamble. If a preamble is
-- detected within this duration then the receiver continues operation to
-- try to receive the packet. Otherwise, if no preamble is detected then
-- the receiver is then disabled for the Rx_Off_Time, after which it is
-- re-enabled to repeat the process.
--
-- The Rx_On_Time is measured in units of the preamble acquisition count
-- (PAC) see Section 4.1.1 of the DW100 User Manual for more information.
--
-- The Rx_Off_Time is measured in units of the 128 system clock cycles, or
-- approximately 1 us. If the Mode is set to Sniff then the Rx_Off_Time
-- must be non-zero (a value of 0 would disable the sniff mode on the
-- DW1000).
--
-- The Rx_Off_Time must be less than 15.385 microseconds.
--
-- This procedure configures the following registers:
-- * RX_SNIFF
procedure Set_Auto_Rx_Reenable (Enable : in Boolean)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Enable);
-- Enable or disable the Rx auto re-enable feature.
--
-- This feature has different behaviour depending on whether or not the
-- receiver is operating in double-buffer mode.
--
-- When Rx auto re-enable is disabled the receiver will stop receiving
-- when any receive event happens (e.g. an error occurred, or a frame
-- was received OK).
--
-- When Rx auto re-enable is enabled then the receiver behaviour
-- depends on the double-buffer configuration:
-- * In single-buffer mode the receiver is automatically re-enabled
-- after a receive error occurs (e.g. physical header error),
-- EXCEPT a frame wait timeout error.
-- * In double-buffer mode the receiver is automatically re-enabled
-- when a frame is received, or when an error occurs (e.g. physical
-- header error), EXCEPT a frame wait timeout error.
--
-- This procedure configures the following registers:
-- * SYS_CFG
procedure Set_Rx_Double_Buffer (Enable : in Boolean)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Enable);
-- Configures double-buffer mode.
--
-- By default the DW1000 operates in single-buffer mode. Double-buffer
-- mode can be enabled to allow the host application to read the previously
-- received frame at the same time as the DW1000 is receiving the next
-- frame.
--
-- Also see the Sync_Rx_Buffer_Pointers procedure.
--
-- This procedure configures the following registers:
-- * SYS_CFG
procedure Set_Rx_Frame_Wait_Timeout (Timeout : in Frame_Wait_Timeout_Time)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Timeout);
-- Configure the receive timeout.
--
-- When the receiver is enabled the receive timeout is started.
-- If no complete frame is received within the configured Rx timeout
-- then the receiver is automatically disabled.
--
-- The Rx timeout can be disabled by setting the Timeout to 0.0.
--
-- The Rx timeout is measured in units of 499.2 MHz / 512, i.e. in units
-- of approximately 1.026 us. The maximum timeout is approximately
-- 67.215385 ms.
--
-- This procedure configures the following registers:
-- * SYS_CFG
--
-- @param Timeout The maximum time (in seconds) to wait for a frame.
-- E.g. a value of 0.001 is 1 millisecond. The maximum permitted value
-- is 0.067_215_385, i.e. a little over 67 milliseconds.
procedure Set_Preamble_Detect_Timeout (Timeout : in DRX_PRETOC_Field)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Timeout);
-- Configure the preamble detection timeout.
--
-- When the receiver is enabled the preamble timeout is started.
-- If no preamble is detected within the configured preamble detection
-- timeout then the receiver is automatically disabled.
--
-- The preamble detect timeout can be disabled by setting the Timeout to 0.
--
-- The preamble detect timeout is measured in units of preamble acquisition
-- chunk (PAC) size, which can be 8, 16, 32, or 64. See Section 7.2.40.9 of
-- the DW1000 User Manual for more information.
--
-- This procedure configures the following registers:
-- * DRX_PRETOC
procedure Calibrate_Sleep_Count
(Half_XTAL_Cycles_Per_LP_Osc_Cycle : out Types.Bits_16)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State,
Half_XTAL_Cycles_Per_LP_Osc_Cycle => DW1000.BSP.Device_State);
procedure Upload_AON_Config
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State);
-- Upload the AON block configurations to the AON.
--
-- This uploads the configuration from the AON_CFG0 and AON_CFG1 registers
-- into the AON block.
procedure Save_Registers_To_AON
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State);
-- Copy the user configurations from the host interface register set into
-- the AON memory.
--
-- If enabled to do so, after exiting sleep mode the DW1000 will reload the
-- user configuration from the AON memory into the host interface register
-- set.
--
-- The behaviour of the AON subsystem when exiting sleep or deep-sleep
-- states can be configured via the AON_WCFG register.
procedure Restore_Registers_From_AON
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => DW1000.BSP.Device_State);
-- Load the user configuration from the AON memory into the host interface
-- register set.
procedure AON_Read_Byte (Address : in AON_ADDR_Field;
Data : out Types.Bits_8)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends =>
(DW1000.BSP.Device_State => (DW1000.BSP.Device_State, Address),
Data => (DW1000.BSP.Device_State, Address));
-- Reads a single byte from the Always-On block.
procedure AON_Contiguous_Read (Start_Address : in AON_ADDR_Field;
Data : out Types.Byte_Array)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => (DW1000.BSP.Device_State,
Start_Address,
Data),
Data =>+ (DW1000.BSP.Device_State,
Start_Address)),
Pre => (Data'Length <= 256
and then Natural (Start_Address) + Data'Length <= 256);
-- Reads a contiguous sequence of bytes from the Always-On block.
procedure AON_Scatter_Read (Addresses : in AON_Address_Array;
Data : out Types.Byte_Array)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => (DW1000.BSP.Device_State,
Addresses,
Data),
Data =>+ (DW1000.BSP.Device_State,
Addresses)),
Pre => Addresses'Length = Data'Length;
-- Reads a non-contiguous set of bytes from the Always-on block.
--
-- This procedure reads bytes from the sequence of addresses in the
-- Addresses array, and stores the byte that was read in the corresponding
-- position in the Data array.
procedure Configure_Sleep_Count (Sleep_Count : in AON_CFG0_SLEEP_TIM_Field)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Sleep_Count);
procedure Set_XTAL_Trim (Trim : in FS_XTALT_Field)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State =>+ Trim);
procedure Configure_LEDs (Tx_LED_Enable : in Boolean;
Rx_LED_Enable : in Boolean;
Rx_OK_LED_Enable : in Boolean;
SFD_LED_Enable : in Boolean;
Test_Flash : in Boolean)
with Global => (In_Out => DW1000.BSP.Device_State),
Depends => (DW1000.BSP.Device_State => (DW1000.BSP.Device_State,
Tx_LED_Enable,
Rx_LED_Enable,
Rx_OK_LED_Enable,
SFD_LED_Enable,
Test_Flash));
-- Configure the behaviour of the LEDs.
--
-- @param Tx_LED_Enable When set to True the DW1000 will flash the Tx LED
-- while the transmitter is on.
--
-- @param Rx_LED_Enable When set to True the DW1000 will flash the Rx LED
-- while the receiver is on.
--
-- @param Rx_OK_LED_Enable When set to True the DW1000 will flash the LED
-- when a packet is received without errors.
--
-- @param SFD_LED_Enable When set to True the DW1000 will flash the LED
-- when an SFD is detected.
--
-- @param Test_Flash When set to True the DW1000 will flash the configured
-- LEDs once, immediately after the LEDs are configured.
end DW1000.Driver;
|
AaronC98/PlaneSystem | Ada | 19,859 | ads | ------------------------------------------------------------------------------
-- Ada Web Server --
-- --
-- Copyright (C) 2000-2015, AdaCore --
-- --
-- This library is free software; you can redistribute it and/or modify --
-- it under terms of the GNU General Public License as published by the --
-- Free Software Foundation; either version 3, or (at your option) any --
-- later version. This library is distributed in the hope that it will be --
-- useful, but WITHOUT ANY WARRANTY; without even the implied warranty of --
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- --
-- --
-- --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- --
-- --
-- --
-- --
-- --
-- --
------------------------------------------------------------------------------
pragma Ada_2012;
-- This package is to be used to build answer to be sent to the client
-- browser. It is also used as the object returned from the client API. So
-- it is either a response built on the server side or the response received
-- on the client side.
with Ada.Calendar;
with Ada.Streams;
with Ada.Strings.Unbounded;
with AWS.Headers;
with AWS.Messages;
with AWS.MIME;
with AWS.Net;
with AWS.Resources.Streams;
with AWS.Status;
private with Ada.Finalization;
private with Ada.Unchecked_Deallocation;
package AWS.Response is
use Ada;
use Ada.Streams;
use Ada.Strings.Unbounded;
use type AWS.Messages.Status_Code;
type Data is private;
-- Note that this type use a reference counter which is not thread safe
type Callback is access function (Request : Status.Data) return Data;
-- This is the Web Server Callback procedure. A client must declare and
-- pass such procedure to the HTTP server.
type Data_Mode is
(Header, -- Send only the HTTP header
Message, -- Send a standard HTTP message
File, -- Send a file
File_Once, -- Send a file once, delete it after sending
Stream, -- Send a stream
Socket_Taken, -- Socket has been taken from the server
WebSocket, -- Protocol switched to WebSocket
No_Data); -- No data, this is not a response
type Authentication_Mode is (Unknown, Any, Basic, Digest);
-- The authentication mode.
-- "Basic" and "Digest" mean that server must accept the requested
-- authentication mode. "Any" mean that server could accept any
-- authentication from client.
-- Unknown, means that an unsupported mode has been found.
-- Note the order here should not be changed as it is used in AWS.Client.
subtype Content_Length_Type
is Stream_Element_Offset range -1 .. Stream_Element_Offset'Last;
Undefined_Length : constant Content_Length_Type;
-- Undefined length could be used when we do not know the message length
-- at the start of transfer. The end of message could be determined by the
-- chunked transfer-encoding in the HTTP/1.1, or by the closing connection
-- in the HTTP/1.0.
Default_Moved_Message : constant String;
-- This is a template message, _@_ will be replaced by the Location (see
-- function Build with Location below).
Default_Authenticate_Message : constant String;
-- This is the message that will be displayed on the Web Browser if the
-- authentication process fails or is cancelled.
-----------------------
-- Data Constructors --
-----------------------
function Build
(Content_Type : String;
Message_Body : String;
Status_Code : Messages.Status_Code := Messages.S200;
Cache_Control : Messages.Cache_Option := Messages.Unspecified;
Encoding : Messages.Content_Encoding := Messages.Identity)
return Data
with Post => not Is_Empty (Build'Result)
and then Response.Status_Code (Build'Result) = Status_Code;
function Build
(Content_Type : String;
UString_Message : Unbounded_String;
Status_Code : Messages.Status_Code := Messages.S200;
Cache_Control : Messages.Cache_Option := Messages.Unspecified;
Encoding : Messages.Content_Encoding := Messages.Identity)
return Data
with Post => not Is_Empty (Build'Result)
and then Response.Status_Code (Build'Result) = Status_Code;
-- Return a message whose body is passed into Message_Body. The
-- Content_Type parameter is the MIME type for the message
-- body. Status_Code is the response status (see Messages.Status_Code
-- definition).
function Build
(Content_Type : String;
Message_Body : Stream_Element_Array;
Status_Code : Messages.Status_Code := Messages.S200;
Cache_Control : Messages.Cache_Option := Messages.Unspecified;
Encoding : Messages.Content_Encoding := Messages.Identity)
return Data
with Post => not Is_Empty (Build'Result)
and then Response.Status_Code (Build'Result) = Status_Code;
-- Idem above, but the message body is a stream element array
type Disposition_Mode is (Attachment, Inline, None);
-- Describes the way a file/stream is sent to the browser.
--
-- Attachment : The file is sent as an attachment, the browser
-- wont display the content even if the MIME type
-- is supported (.txt or .doc on IE for example).
--
-- Inline : The file can be displayed inside the browser if
-- MIME type is supported. If not the browser will
-- propose to save this file.
--
-- None : No specific setting is sent to the browser. The
-- browser default setting will be used. Note that in
-- this case the browser determine the filename using
-- the URI. This is the default setting.
function File
(Content_Type : String;
Filename : String;
Status_Code : Messages.Status_Code := Messages.S200;
Cache_Control : Messages.Cache_Option := Messages.Unspecified;
Encoding : Messages.Content_Encoding := Messages.Identity;
Once : Boolean := False;
Disposition : Disposition_Mode := None;
User_Filename : String := "")
return Data
with Post => not Is_Empty (File'Result)
and then Response.Status_Code (File'Result) = Status_Code
and then (if Once
then Mode (File'Result) = File_Once
else Mode (File'Result) = File);
-- Returns a message whose message body is the content of the file. The
-- Content_Type must indicate the MIME type for the file. User_Filename
-- can be used to force the filename on the client side. This can be
-- different from the server side Filename. If Once is set to True the
-- file will be deleted after the download (this includes the case where
-- the download is suspended).
function Stream
(Content_Type : String;
Handle : not null access Resources.Streams.Stream_Type'Class;
Status_Code : Messages.Status_Code := Messages.S200;
Cache_Control : Messages.Cache_Option := Messages.No_Cache;
Encoding : Messages.Content_Encoding := Messages.Identity;
Server_Close : Boolean := True;
Disposition : Disposition_Mode := None;
User_Filename : String := "")
return Data
with Post => not Is_Empty (Stream'Result)
and then Response.Status_Code (Stream'Result) = Status_Code;
-- Returns a message whose message body is the content of the user defined
-- stream. The Content_Type must indicate the MIME type for the data
-- stream, Status_Code is the the header status code which should be send
-- back to client's browser. If Server_Close is set to False the server
-- will not close the stream after sending it, it is then user's
-- responsability to close the stream. User_Filename can be used to force
-- the filename on the client side. This can be different from the server
-- side filename (for file based stream) or can be used to name a non disk
-- based stream. Encoding mean additional encoding would be applied on top
-- of given Handler stream.
------------------------------
-- Redirection Constructors --
------------------------------
function URL
(Location : String;
Cache_Control : Messages.Cache_Option := Messages.Unspecified)
return Data
with Post => not Is_Empty (URL'Result)
and then Status_Code (URL'Result) = Messages.S302
and then Mode (URL'Result) = Header;
-- This ask the server for a redirection to the specified URL. This is
-- a temporary redirection, and the client browser should query the
-- same original URL next time.
function Moved
(Location : String;
Message : String := Default_Moved_Message;
Content_Type : String := AWS.MIME.Text_HTML;
Cache_Control : Messages.Cache_Option := Messages.Unspecified)
return Data
with Post => not Is_Empty (Moved'Result)
and then Status_Code (Moved'Result) = Messages.S301;
-- This send back a moved message (Messages.S301) with the specified
-- message body and content type.
-- This is a permanent redirection, and the client browser is encouraged
-- to update links so that the next query for the URL goes directly to
-- the new location.
------------------------
-- Other Constructors --
------------------------
function Acknowledge
(Status_Code : Messages.Status_Code;
Message_Body : String := "";
Content_Type : String := MIME.Text_HTML) return Data
with Post =>
not Is_Empty (Acknowledge'Result)
and then Response.Status_Code (Acknowledge'Result) = Status_Code
and then (if Message_Body = ""
then Mode (Acknowledge'Result) = Header);
-- Returns a message to the Web browser. This routine must be used to
-- send back an error message to the Web browser. For example if a
-- requested resource cannot be served a message with status code S404
-- must be sent.
function Authenticate
(Realm : String;
Mode : Authentication_Mode := Basic;
Stale : Boolean := False;
Message : String := Default_Authenticate_Message)
return Data
with Post => not Is_Empty (Authenticate'Result)
and then Status_Code (Authenticate'Result) = Messages.S401;
-- Returns an authentication message (Messages.S401), the Web browser
-- will then ask for an authentication. Realm string will be displayed
-- by the Web Browser in the authentication dialog box.
function Socket_Taken return Data with
Post => not Is_Empty (Socket_Taken'Result)
and then Mode (Socket_Taken'Result) = Socket_Taken;
-- Must be used to say that the connection socket has been taken by user
-- inside of user callback. No operations should be performed on this
-- socket, and associated slot should be released for further operations.
function Empty return Data with
Post => Status_Code (Empty'Result) = Messages.S204
and then Mode (Empty'Result) = No_Data;
-- Returns an empty message (Data_Mode = No_Data and Status_Code is 204).
-- It is used to say that user's handlers were not able to do something
-- with the request. This is used by the callback's chain in the
-- dispatchers and should not be used by users.
--
-- API to retrieve response data
--
------------
-- Header --
------------
function Header (D : Data; Name : String; N : Positive) return String
with Inline;
-- Return the N-th value for header Name
function Header (D : Data; Name : String) return String with Inline;
-- Return all values as a comma-separated string for header Name.
-- See [RFC 2616 - 4.2] last paragraph.
function Header (D : Data) return AWS.Headers.List;
function Has_Header (D : Data; Name : String) return Boolean with Inline;
-- Returns True if D headers contains Name
procedure Send_Header (Socket : Net.Socket_Type'Class; D : Data)
with Inline;
-- Send all header lines to the socket
function Status_Code (D : Data) return Messages.Status_Code with Inline;
-- Returns the status code
function Content_Length (D : Data) return Content_Length_Type with Inline;
-- Returns the content length (i.e. the message body length). A value of 0
-- indicate that there is no message body.
function Content_Type (D : Data) return String with Inline;
-- Returns the MIME type for the message body
function Cache_Control (D : Data) return Messages.Cache_Option with Inline;
-- Returns the cache control specified for the response
function Cache_Control (D : Data) return Messages.Cache_Data;
-- As above but returns a structured record of type "Cache_Data (Request)"
-- representing the cache options.
function Expires (D : Data) return Calendar.Time with Inline;
-- Returns the Expires date as a time value
function Location (D : Data) return String with Inline;
-- Returns the location for the new page in the case of a moved
-- message. See Moved constructor above.
----------
-- Data --
----------
function Mode (D : Data) return Data_Mode with Inline;
-- Returns the data mode, either Header, Message or File
function Is_Empty (D : Data) return Boolean with Inline;
-- Returns True if D.Mode is No_Data
function Message_Body (D : Data) return String with Inline;
-- Returns the message body content as a string.
-- Message_Body routines could not be used with user defined streams
-- (see. Stream routine in this package). Constraint_Error would be raised
-- on try to get data by the Message_Body from the user defined streams.
-- For get data from user defined streams routine Create_Resource should
-- be used.
function Message_Body (D : Data) return Unbounded_String;
-- Returns message body content as an unbounded_string
function Message_Body (D : Data) return Stream_Element_Array;
-- Returns message body as a binary content
procedure Message_Body
(D : Data;
File : out AWS.Resources.File_Type);
-- Returns the message body as a stream
function Filename (D : Data) return String with Inline;
-- Returns the filename which should be sent back or the filename which
-- was containing the response for a server response.
--------------------
-- Authentication --
--------------------
function Realm (D : Data) return String with Inline;
-- Returns the Realm for the current authentication request
function Authentication (D : Data) return Authentication_Mode with Inline;
-- Returns the authentication mode requested by server
function Authentication_Stale (D : Data) return Boolean with Inline;
-- Returns the stale parameter for authentication
---------------
-- Resources --
---------------
procedure Create_Resource
(D : in out Data;
File : out AWS.Resources.File_Type;
GZip : Boolean)
with Inline;
-- Creates the resource object (either a file or in-memory object) for
-- the data to be sent to the client. The resource should be closed after
-- use.
-- GZip is true when the http client support GZip decoding,
-- if file or embedded resource is in the GZip format this routine would
-- define Content-Encoding header field value.
function Close_Resource (D : Data) return Boolean;
-- Returns True if the resource stream must be close
function Keep_Alive (D : Data) return Boolean with Inline;
-- Returns True if the user want to keep connection alive
----------------
-- WebSockets --
----------------
function WebSocket return Data with
Post => not Is_Empty (WebSocket'Result)
and then Status_Code (WebSocket'Result) = Messages.S101
and then Mode (WebSocket'Result) = WebSocket;
-- WebSocket handshake from initial WebSocket connection
private
Default_Moved_Message : constant String :=
"Page moved<br><a href=""_@_"">Click here</a>";
CRLF : constant String := ASCII.CR & ASCII.LF;
Default_Authenticate_Message : constant String :=
"<HTML><HEAD>" & CRLF
& "<TITLE>401 Authorization Required</TITLE>" & CRLF
& "</HEAD><BODY>" & CRLF
& "<H1>Authorization Required</H1>" & CRLF
& "This server could not verify that you" & CRLF
& "are authorized to access the document you" & CRLF
& "requested. Either you supplied the wrong" & CRLF
& "credentials (e.g. bad password), or your" & CRLF
& "browser doesn't understand how to supply" & CRLF
& "the credentials required.<P>" & CRLF
& "</BODY></HTML>" & CRLF;
Undefined_Length : constant Content_Length_Type :=
Content_Length_Type (Resources.Undefined_Length);
type Release_Controller is record
Counter : Natural := 1;
-- Data object's Reference counter
Stream_Taken : Boolean := False;
-- Set to True after Create_Resource routine call to not free stream
-- on finalization.
end record;
type Release_Controller_Access is access all Release_Controller;
type Data is new Ada.Finalization.Controlled with record
Ref_Counter : Release_Controller_Access;
Mode : Data_Mode := No_Data;
Status_Code : Messages.Status_Code := Messages.S200;
Filename : Unbounded_String;
Content_Type : Unbounded_String;
Stream : Resources.Streams.Stream_Access;
Header : AWS.Headers.List;
Close_Stream : Boolean := True;
Keep_Alive : Boolean := True;
end record;
overriding procedure Initialize (Object : in out Data);
overriding procedure Adjust (Object : in out Data);
overriding procedure Finalize (Object : in out Data);
procedure Unchecked_Free is new Ada.Unchecked_Deallocation
(Resources.Streams.Stream_Type'Class, Resources.Streams.Stream_Access);
end AWS.Response;
|
zhmu/ananas | Ada | 1,722 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- A D A . D I S P A T C H I N G . R O U N D _ R O B I N --
-- --
-- S p e c --
-- --
-- This specification is derived from the Ada Reference Manual for use with --
-- GNAT. In accordance with the copyright of that document, you can freely --
-- copy and modify this specification, provided that if you redistribute a --
-- modified version, any changes that you have made are clearly indicated. --
-- --
------------------------------------------------------------------------------
with System;
with Ada.Real_Time;
package Ada.Dispatching.Round_Robin is
pragma Unimplemented_Unit;
Default_Quantum : constant Ada.Real_Time.Time_Span :=
Ada.Real_Time.Milliseconds (10);
procedure Set_Quantum
(Pri : System.Priority;
Quantum : Ada.Real_Time.Time_Span);
procedure Set_Quantum
(Low, High : System.Priority;
Quantum : Ada.Real_Time.Time_Span);
function Actual_Quantum
(Pri : System.Priority) return Ada.Real_Time.Time_Span;
function Is_Round_Robin (Pri : System.Priority) return Boolean;
end Ada.Dispatching.Round_Robin;
|
osannolik/ada-canopen | Ada | 6,450 | ads | with ACO.SDO_Sessions;
private with Ada.Synchronous_Task_Control;
private with ACO.Protocols.Network_Management.Masters;
private with ACO.Protocols.Error_Control.Slaves;
private with ACO.Protocols.Service_Data.Clients;
package ACO.Nodes.Remotes is
type Remote
(Id : ACO.Messages.Node_Nr;
Handler : not null access ACO.CANopen.Handler;
Od : not null access ACO.OD.Object_Dictionary'Class)
is new Node_Base with private;
overriding
procedure Set_State
(This : in out Remote;
State : in ACO.States.State);
overriding
function Get_State
(This : Remote)
return ACO.States.State;
overriding
procedure Start
(This : in out Remote);
type SDO_Request
(Node : not null access Remote)
is abstract tagged private;
subtype SDO_Status is ACO.SDO_Sessions.SDO_Status;
subtype SDO_Result is ACO.SDO_Sessions.SDO_Result;
function Is_Complete
(This : SDO_Request)
return Boolean;
procedure Suspend_Until_Result
(This : in out SDO_Request;
Result : out SDO_Result);
function Status
(This : SDO_Request)
return SDO_Status;
type SDO_Read_Request
(Node : not null access Remote;
To_Entry : not null access ACO.OD_Types.Entry_Base'Class)
is new SDO_Request with private;
procedure Suspend_Until_Result
(This : in out SDO_Read_Request;
Result : out SDO_Result);
procedure Get_Entry
(This : in out SDO_Read_Request)
with Pre => This.Is_Complete;
type SDO_Write_Request
(Node : not null access Remote)
is new SDO_Request with private;
overriding
procedure Write
(This : in out Remote;
Index : in ACO.OD_Types.Object_Index;
Subindex : in ACO.OD_Types.Object_Subindex;
An_Entry : in ACO.OD_Types.Entry_Base'Class)
with Pre => This.Od.Entry_Exist (Index, Subindex) and then
This.Od.Is_Entry_Compatible (An_Entry, Index, Subindex);
procedure Write
(This : in out Remote;
Request : in out SDO_Write_Request'Class;
Index : in ACO.OD_Types.Object_Index;
Subindex : in ACO.OD_Types.Object_Subindex;
An_Entry : in ACO.OD_Types.Entry_Base'Class);
overriding
procedure Read
(This : in out Remote;
Index : in ACO.OD_Types.Object_Index;
Subindex : in ACO.OD_Types.Object_Subindex;
To_Entry : out ACO.OD_Types.Entry_Base'Class)
with Pre => This.Od.Entry_Exist (Index, Subindex) and then
This.Od.Is_Entry_Compatible (To_Entry, Index, Subindex);
procedure Read
(This : in out Remote;
Index : in ACO.OD_Types.Object_Index;
Subindex : in ACO.OD_Types.Object_Subindex;
Result : out ACO.Nodes.Remotes.SDO_Result;
To_Entry : out ACO.OD_Types.Entry_Base'Class)
with Pre => This.Od.Entry_Exist (Index, Subindex) and then
This.Od.Is_Entry_Compatible (To_Entry, Index, Subindex);
procedure Read
(This : in out Remote;
Request : in out SDO_Read_Request'Class;
Index : in ACO.OD_Types.Object_Index;
Subindex : in ACO.OD_Types.Object_Subindex);
generic
type Entry_T is new ACO.OD_Types.Entry_Base with private;
function Generic_Read
(This : in out Remote;
Index : ACO.OD_Types.Object_Index;
Subindex : ACO.OD_Types.Object_Subindex)
return Entry_T;
-- with Pre => This.Od.Entry_Exist (Index, Subindex);
-- Above precondition causes compiler error during instantiation. Bug?
procedure Set_Heartbeat_Timeout
(This : in out Remote;
Timeout : in Natural);
Failed_To_Read_Entry_Of_Node : exception;
private
type Request_Type is (Write, Read);
type SDO_Request
(Node : not null access Remote)
is abstract tagged record
Id : ACO.SDO_Sessions.Endpoint_Nr := ACO.SDO_Sessions.No_Endpoint_Id;
end record;
type SDO_Read_Request
(Node : not null access Remote;
To_Entry : not null access ACO.OD_Types.Entry_Base'Class)
is new SDO_Request (Node) with null record;
type SDO_Write_Request
(Node : not null access Remote)
is new SDO_Request (Node) with null record;
type Request_Data is record
Suspension : Ada.Synchronous_Task_Control.Suspension_Object;
Status : ACO.SDO_Sessions.SDO_Status := ACO.SDO_Sessions.Pending;
Operation : Request_Type;
end record;
type SDO_Request_Array is array (ACO.SDO_Sessions.Valid_Endpoint_Nr)
of Request_Data;
procedure On_Message_Dispatch
(This : in out Remote;
Msg : in ACO.Messages.Message);
procedure Periodic_Actions
(This : in out Remote;
T_Now : in Ada.Real_Time.Time);
type Remote_Client
(Id : ACO.Messages.Node_Nr;
Handler : not null access ACO.CANopen.Handler;
Od : not null access ACO.OD.Object_Dictionary'Class)
is new ACO.Protocols.Service_Data.Clients.Client (Handler, Od)
with record
Requests : SDO_Request_Array;
end record;
overriding
procedure Result_Callback
(This : in out Remote_Client;
Session : in ACO.SDO_Sessions.SDO_Session;
Result : in ACO.SDO_Sessions.SDO_Result);
overriding
function Tx_CAN_Id
(This : Remote_Client;
Parameter : ACO.SDO_Sessions.SDO_Parameters)
return ACO.Messages.Id_Type;
overriding
function Rx_CAN_Id
(This : Remote_Client;
Parameter : ACO.SDO_Sessions.SDO_Parameters)
return ACO.Messages.Id_Type;
overriding
function Get_Endpoint
(This : Remote_Client;
Rx_CAN_Id : ACO.Messages.Id_Type)
return ACO.SDO_Sessions.Endpoint_Type;
overriding
function Get_Endpoint
(This : Remote_Client;
Server_Node : ACO.Messages.Node_Nr)
return ACO.SDO_Sessions.Endpoint_Type;
type Remote
(Id : ACO.Messages.Node_Nr;
Handler : not null access ACO.CANopen.Handler;
Od : not null access ACO.OD.Object_Dictionary'Class)
is new Node_Base (Id, Handler, Od) with record
NMT : ACO.Protocols.Network_Management.Masters.Master (Id, Handler, Od);
EC : ACO.Protocols.Error_Control.Slaves.Slave (Id, Od);
SDO : Remote_Client (Id, Handler, Od);
end record;
end ACO.Nodes.Remotes;
|
reznikmm/matreshka | Ada | 6,881 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.DOM_Documents;
with Matreshka.ODF_String_Constants;
with ODF.DOM.Iterators;
with ODF.DOM.Visitors;
package body Matreshka.ODF_Table.Background_Elements is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters)
return Table_Background_Element_Node is
begin
return Self : Table_Background_Element_Node do
Matreshka.ODF_Table.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Table_Prefix);
end return;
end Create;
----------------
-- Enter_Node --
----------------
overriding procedure Enter_Node
(Self : not null access Table_Background_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control) is
begin
if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then
ODF.DOM.Visitors.Abstract_ODF_Visitor'Class
(Visitor).Enter_Table_Background
(ODF.DOM.Table_Background_Elements.ODF_Table_Background_Access
(Self),
Control);
else
Matreshka.DOM_Elements.Abstract_Element_Node
(Self.all).Enter_Node (Visitor, Control);
end if;
end Enter_Node;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Table_Background_Element_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Background_Element;
end Get_Local_Name;
----------------
-- Leave_Node --
----------------
overriding procedure Leave_Node
(Self : not null access Table_Background_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control) is
begin
if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then
ODF.DOM.Visitors.Abstract_ODF_Visitor'Class
(Visitor).Leave_Table_Background
(ODF.DOM.Table_Background_Elements.ODF_Table_Background_Access
(Self),
Control);
else
Matreshka.DOM_Elements.Abstract_Element_Node
(Self.all).Leave_Node (Visitor, Control);
end if;
end Leave_Node;
----------------
-- Visit_Node --
----------------
overriding procedure Visit_Node
(Self : not null access Table_Background_Element_Node;
Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control) is
begin
if Iterator in ODF.DOM.Iterators.Abstract_ODF_Iterator'Class then
ODF.DOM.Iterators.Abstract_ODF_Iterator'Class
(Iterator).Visit_Table_Background
(Visitor,
ODF.DOM.Table_Background_Elements.ODF_Table_Background_Access
(Self),
Control);
else
Matreshka.DOM_Elements.Abstract_Element_Node
(Self.all).Visit_Node (Iterator, Visitor, Control);
end if;
end Visit_Node;
begin
Matreshka.DOM_Documents.Register_Element
(Matreshka.ODF_String_Constants.Table_URI,
Matreshka.ODF_String_Constants.Background_Element,
Table_Background_Element_Node'Tag);
end Matreshka.ODF_Table.Background_Elements;
|
reznikmm/matreshka | Ada | 3,704 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with XML.DOM.Elements;
package ODF.DOM.Style_Ruby_Properties_Elements is
pragma Preelaborate;
type ODF_Style_Ruby_Properties is limited interface
and XML.DOM.Elements.DOM_Element;
type ODF_Style_Ruby_Properties_Access is
access all ODF_Style_Ruby_Properties'Class
with Storage_Size => 0;
end ODF.DOM.Style_Ruby_Properties_Elements;
|
Fabien-Chouteau/GESTE | Ada | 482 | ads | with GESTE;
with GESTE_Config;
package Render is
procedure Push_Pixels (Buffer : GESTE.Output_Buffer);
procedure Set_Drawing_Area (Area : GESTE.Pix_Rect);
procedure Set_Screen_Offset (Pt : GESTE.Pix_Point);
procedure Render_All (Background : GESTE_Config.Output_Color);
procedure Render_Dirty (Background : GESTE_Config.Output_Color);
function Dark_Cyan return GESTE_Config.Output_Color;
function Black return GESTE_Config.Output_Color;
end Render;
|
shintakezou/langkit | Ada | 2,855 | ads | --
-- Copyright (C) 2014-2022, AdaCore
-- SPDX-License-Identifier: Apache-2.0
--
with Ada.Containers;
private with Ada.Strings.Unbounded;
private with Ada.Strings.Unbounded.Hash;
with Langkit_Support.Text; use Langkit_Support.Text;
-- This package provides helpers to deal with names regarding of casing
-- conventions (camel case, lower case, ...). What we call a "name" here is a
-- sequence of at least one word, a word being a sequence of at least one
-- non-blank ASCII alphanumericals. In addition, the first word must start
-- with a letter, and each first alphanumerical in a word must be upper case.
package Langkit_Support.Names is
type Casing_Convention is (Camel_With_Underscores, Camel, Lower, Upper);
-- Designate a specific casing convention for names formatting. For
-- instance, to format the ``HTML_Document_Root`` name::
--
-- Camel_With_Underscores: HTML_Document_Root
-- Camel: HTMLDocumentRoot
-- Lower: html_document_root
-- Upper: HTML_DOCUMENT_ROOT
--
-- Note that ``Camel_With_Underscores`` is the convention which preserves
-- the most information about a name: for instance it is not possible to
-- know from ``HTML_DOCUMENT_ROOT`` (an ``Upper`` formatted name) whether
-- its ``Camel_With_Underscores`` format is ``HTML_Document_ROOT``,
-- ``Html_Document_Root`` or any other casing variation, while the
-- reciprocical is true.
--
-- Because of this, different names can have different formattings in some
-- conventions and same formattings in other conventions.
type Name_Type is private;
Invalid_Name_Error : exception;
function Is_Valid_Name
(Name : Text_Type;
Casing : Casing_Convention := Camel_With_Underscores) return Boolean;
-- Return whether ``Name`` is a valid name in the given casing convention
function Create_Name
(Name : Text_Type;
Casing : Casing_Convention := Camel_With_Underscores) return Name_Type;
-- Create a name, decoding ``Name`` according to the given casing
-- convention. Raise an ``Invalid_Name_Error`` exception if Name is not a
-- valid in this convention.
function Format_Name
(Name : Name_Type; Casing : Casing_Convention) return Text_Type;
-- Format a name to the given casing convention. Raise an
-- ``Invalid_Name_Error`` exception if ``Name`` is not initialized.
function Hash (Name : Name_Type) return Ada.Containers.Hash_Type;
private
use Ada.Strings.Unbounded;
type Name_Type is new Unbounded_String;
-- Internally, we represent names in the equivalent ASCII string in
-- camel-with-underscores convention.
function Hash (Name : Name_Type) return Ada.Containers.Hash_Type
is (Hash (Unbounded_String (Name)));
end Langkit_Support.Names;
|
zhmu/ananas | Ada | 1,021 | adb | -- { dg-do run }
with Text_IO; use Text_IO;
with Ada.Finalization; use Ada.Finalization;
procedure Nested_Controlled_Alloc is
package Controlled_Alloc is
type Fin is new Limited_Controlled with null record;
procedure Finalize (X : in out Fin);
F : Fin;
type T is limited private;
type Ref is access all T;
private
type T is new Limited_Controlled with null record;
procedure Finalize (X : in out T);
end Controlled_Alloc;
package body Controlled_Alloc is
procedure Finalize (X : in out T) is
begin
Put_Line ("Finalize (T)");
end Finalize;
procedure Finalize (X : in out Fin) is
R : Ref;
begin
begin
R := new T;
raise Constraint_Error;
exception
when Program_Error =>
null; -- OK
end;
end Finalize;
end Controlled_Alloc;
begin
null;
end Nested_Controlled_Alloc;
|
PThierry/ewok-kernel | Ada | 15,643 | 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 system;
with soc.devmap;
package soc.rcc
with spark_mode => off
is
-----------------------------------------
-- RCC clock control register (RCC_CR) --
-----------------------------------------
type t_RCC_CR is record
HSION : boolean; -- Internal high-speed clock enable
HSIRDY : boolean; -- Internal high-speed clock ready flag
Reserved_2_2 : bit;
HSITRIM : bits_5; -- Internal high-speed clock trimming
HSICAL : unsigned_8; -- Internal high-speed clock calibration
HSEON : boolean; -- HSE clock enable
HSERDY : boolean; -- HSE clock ready flag
HSEBYP : boolean; -- HSE clock bypassed (with an ext. clock)
CSSON : boolean; -- Clock security system enable
Reserved_20_23 : bits_4;
PLLON : boolean; -- Main PLL enable
PLLRDY : boolean; -- Main PLL clock ready flag
PLLI2SON : boolean; -- PLLI2S enable
PLLI2SRDY : boolean; -- PLLI2S clock ready flag
PLLSAION : boolean; -- PLLSAI enable
PLLSAIRDY : boolean; -- PLLSAI clock ready flag
Reserved_30_31 : bits_2;
end record
with volatile_full_access, size => 32;
for t_RCC_CR use record
HSION at 0 range 0 .. 0;
HSIRDY at 0 range 1 .. 1;
Reserved_2_2 at 0 range 2 .. 2;
HSITRIM at 0 range 3 .. 7;
HSICAL at 0 range 8 .. 15;
HSEON at 0 range 16 .. 16;
HSERDY at 0 range 17 .. 17;
HSEBYP at 0 range 18 .. 18;
CSSON at 0 range 19 .. 19;
Reserved_20_23 at 0 range 20 .. 23;
PLLON at 0 range 24 .. 24;
PLLRDY at 0 range 25 .. 25;
PLLI2SON at 0 range 26 .. 26;
PLLI2SRDY at 0 range 27 .. 27;
PLLSAION at 0 range 28 .. 28;
PLLSAIRDY at 0 range 29 .. 29;
Reserved_30_31 at 0 range 30 .. 31;
end record;
--------------------------------------------------
-- RCC PLL configuration register (RCC_PLLCFGR) --
--------------------------------------------------
type t_PLLP is
(PLLP2, PLLP4, PLLP6, PLLP8)
with size => 2;
for t_PLLP use
(PLLP2 => 2#00#,
PLLP4 => 2#01#,
PLLP6 => 2#10#,
PLLP8 => 2#11#);
type t_RCC_PLLCFGR is record
PLLM : bits_6;
PLLN : bits_9;
PLLP : t_PLLP;
PLLSRC : bit;
PLLQ : bits_4;
end record
with size => 32, volatile_full_access;
for t_RCC_PLLCFGR use record
PLLM at 0 range 0 .. 5;
PLLN at 0 range 6 .. 14;
PLLP at 0 range 16 .. 17;
PLLSRC at 0 range 22 .. 22;
PLLQ at 0 range 24 .. 27;
end record;
PLLCFGR_RESET : constant unsigned_32 := 16#2400_3010#;
-------------------------------------------------
-- RCC clock configuration register (RCC_CFGR) --
-------------------------------------------------
type t_HPRE is
(HPRE_NODIV,
HPRE_DIV2,
HPRE_DIV4,
HPRE_DIV8,
HPRE_DIV16,
HPRE_DIV64,
HPRE_DIV128,
HPRE_DIV256,
HPRE_DIV512)
with size => 4;
for t_HPRE use
(HPRE_NODIV => 2#0000#,
HPRE_DIV2 => 2#1000#,
HPRE_DIV4 => 2#1001#,
HPRE_DIV8 => 2#1010#,
HPRE_DIV16 => 2#1011#,
HPRE_DIV64 => 2#1100#,
HPRE_DIV128 => 2#1101#,
HPRE_DIV256 => 2#1110#,
HPRE_DIV512 => 2#1111#);
type t_PPRE is
(PPRE_NODIV,
PPRE_DIV2,
PPRE_DIV4,
PPRE_DIV8,
PPRE_DIV16)
with size => 3;
for t_PPRE use
(PPRE_NODIV => 2#000#,
PPRE_DIV2 => 2#100#,
PPRE_DIV4 => 2#101#,
PPRE_DIV8 => 2#110#,
PPRE_DIV16 => 2#111#);
type t_RCC_CFGR is record
SW : bits_2; -- System clock switch
SWS : bits_2; -- System clock switch status
HPRE : t_HPRE; -- AHB prescaler
reserved_8_9 : bits_2;
PPRE1 : t_PPRE; -- APB Low speed prescaler (APB1)
PPRE2 : t_PPRE; -- APB high-speed prescaler (APB2)
RTCPRE : bits_5; -- HSE division factor for RTC clock
MCO1 : bits_2; -- Microcontroller clock output 1
I2SSCR : bit; -- I2S clock selection
MCO1PRE : bits_3; -- MCO1 prescaler
MCO2PRE : bits_3; -- MCO2 prescaler
MCO2 : bits_2; -- Microcontroller clock output 2
end record
with size => 32, volatile_full_access;
for t_RCC_CFGR use record
SW at 0 range 0 .. 1;
SWS at 0 range 2 .. 3;
HPRE at 0 range 4 .. 7;
reserved_8_9 at 0 range 8 .. 9;
PPRE1 at 0 range 10 .. 12;
PPRE2 at 0 range 13 .. 15;
RTCPRE at 0 range 16 .. 20;
MCO1 at 0 range 21 .. 22;
I2SSCR at 0 range 23 .. 23;
MCO1PRE at 0 range 24 .. 26;
MCO2PRE at 0 range 27 .. 29;
MCO2 at 0 range 30 .. 31;
end record;
------------------------------------------------------
-- RCC AHB1 peripheral clock register (RCC_AHB1ENR) --
------------------------------------------------------
type t_RCC_AHB1ENR is record
GPIOAEN : boolean; -- IO port A clock enable
GPIOBEN : boolean; -- IO port B clock enable
GPIOCEN : boolean; -- IO port C clock enable
GPIODEN : boolean; -- IO port D clock enable
GPIOEEN : boolean; -- IO port E clock enable
GPIOFEN : boolean; -- IO port F clock enable
GPIOGEN : boolean; -- IO port G clock enable
GPIOHEN : boolean; -- IO port H clock enable
GPIOIEN : boolean; -- IO port I clock enable
reserved_9_11 : bits_3;
CRCEN : boolean; -- CRC clock enable
reserved_13_17 : bits_5;
BKPSRAMEN : boolean; -- Backup SRAM interface clock enable
reserved_19 : bit;
CCMDATARAMEN : boolean; -- CCM data RAM clock enable
DMA1EN : boolean; -- DMA1 clock enable
DMA2EN : boolean; -- DMA2 clock enable
reserved_23_24 : bits_2;
ETHMACEN : boolean; -- Ethernet MAC clock enable
ETHMACTXEN : boolean; -- Ethernet Transmission clock enable
ETHMACRXEN : boolean; -- Ethernet Reception clock enable
ETHMACPTPEN : boolean; -- Ethernet PTP clock enable
OTGHSEN : boolean; -- USB OTG HS clock enable
OTGHSULPIEN : boolean; -- USB OTG HSULPI clock enable
reserved_31 : bit;
end record
with size => 32, volatile_full_access;
for t_RCC_AHB1ENR use record
GPIOAEN at 0 range 0 .. 0;
GPIOBEN at 0 range 1 .. 1;
GPIOCEN at 0 range 2 .. 2;
GPIODEN at 0 range 3 .. 3;
GPIOEEN at 0 range 4 .. 4;
GPIOFEN at 0 range 5 .. 5;
GPIOGEN at 0 range 6 .. 6;
GPIOHEN at 0 range 7 .. 7;
GPIOIEN at 0 range 8 .. 8;
reserved_9_11 at 0 range 9 .. 11;
CRCEN at 0 range 12 .. 12;
reserved_13_17 at 0 range 13 .. 17;
BKPSRAMEN at 0 range 18 .. 18;
reserved_19 at 0 range 19 .. 19;
CCMDATARAMEN at 0 range 20 .. 20;
DMA1EN at 0 range 21 .. 21;
DMA2EN at 0 range 22 .. 22;
reserved_23_24 at 0 range 23 .. 24;
ETHMACEN at 0 range 25 .. 25;
ETHMACTXEN at 0 range 26 .. 26;
ETHMACRXEN at 0 range 27 .. 27;
ETHMACPTPEN at 0 range 28 .. 28;
OTGHSEN at 0 range 29 .. 29;
OTGHSULPIEN at 0 range 30 .. 30;
reserved_31 at 0 range 31 .. 31;
end record;
-------------------------------------------------------------
-- RCC AHB2 peripheral clock enable register (RCC_AHB2ENR) --
-------------------------------------------------------------
type t_RCC_AHB2ENR is record
DCMIEN : boolean; -- DCMI clock enable
reserved_1_3 : bits_3;
CRYPEN : boolean; -- CRYP clock enable
HASHEN : boolean; -- HASH clock enable
RNGEN : boolean; -- RNG clock enable
OTGFSEN : boolean; -- USB OTG Full Speed clock enable
end record
with size => 32, volatile_full_access;
for t_RCC_AHB2ENR use record
DCMIEN at 0 range 0 .. 0;
reserved_1_3 at 0 range 1 .. 3;
CRYPEN at 0 range 4 .. 4;
HASHEN at 0 range 5 .. 5;
RNGEN at 0 range 6 .. 6;
OTGFSEN at 0 range 7 .. 7;
end record;
-------------------------------------------------------------
-- RCC APB1 peripheral clock enable register (RCC_APB1ENR) --
-------------------------------------------------------------
type t_RCC_APB1ENR is record
TIM2EN : boolean; -- TIM2 clock enable
TIM3EN : boolean; -- TIM3 clock enable
TIM4EN : boolean; -- TIM4 clock enable
TIM5EN : boolean; -- TIM5 clock enable
TIM6EN : boolean; -- TIM6 clock enable
TIM7EN : boolean; -- TIM7 clock enable
TIM12EN : boolean; -- TIM12 clock enable
TIM13EN : boolean; -- TIM13 clock enable
TIM14EN : boolean; -- TIM14 clock enable
reserved_9_10 : bits_2;
WWDGEN : boolean; -- Window watchdog clock enable
reserved_12_13 : bits_2;
SPI2EN : boolean; -- SPI2 clock enable
SPI3EN : boolean; -- SPI3 clock enable
reserved_16 : boolean;
USART2EN : boolean; -- USART2 clock enable
USART3EN : boolean; -- USART3 clock enable
UART4EN : boolean; -- UART4 clock enable
UART5EN : boolean; -- UART5 clock enable
I2C1EN : boolean; -- I2C1 clock enable
I2C2EN : boolean; -- I2C2 clock enable
I2C3EN : boolean; -- I2C3 clock enable
reserved_24 : bit;
CAN1EN : boolean; -- CAN 1 clock enable
CAN2EN : boolean; -- CAN 2 clock enable
reserved_27 : bit;
PWREN : boolean; -- Power interface clock enable
DACEN : boolean; -- DAC interface clock enable
reserved_30_31 : boolean;
end record
with size => 32, volatile_full_access;
for t_RCC_APB1ENR use record
TIM2EN at 0 range 0 .. 0;
TIM3EN at 0 range 1 .. 1;
TIM4EN at 0 range 2 .. 2;
TIM5EN at 0 range 3 .. 3;
TIM6EN at 0 range 4 .. 4;
TIM7EN at 0 range 5 .. 5;
TIM12EN at 0 range 6 .. 6;
TIM13EN at 0 range 7 .. 7;
TIM14EN at 0 range 8 .. 8;
reserved_9_10 at 0 range 9 .. 10;
WWDGEN at 0 range 11 .. 11;
reserved_12_13 at 0 range 12 .. 13;
SPI2EN at 0 range 14 .. 14;
SPI3EN at 0 range 15 .. 15;
reserved_16 at 0 range 16 .. 16;
USART2EN at 0 range 17 .. 17;
USART3EN at 0 range 18 .. 18;
UART4EN at 0 range 19 .. 19;
UART5EN at 0 range 20 .. 20;
I2C1EN at 0 range 21 .. 21;
I2C2EN at 0 range 22 .. 22;
I2C3EN at 0 range 23 .. 23;
reserved_24 at 0 range 24 .. 24;
CAN1EN at 0 range 25 .. 25;
CAN2EN at 0 range 26 .. 26;
reserved_27 at 0 range 27 .. 27;
PWREN at 0 range 28 .. 28;
DACEN at 0 range 29 .. 29;
reserved_30_31 at 0 range 30 .. 31;
end record;
-------------------------------------------------------------
-- RCC APB2 peripheral clock enable register (RCC_APB2ENR) --
-------------------------------------------------------------
type t_RCC_APB2ENR is record
TIM1EN : boolean; -- TIM1 clock enable
TIM8EN : boolean; -- TIM8 clock enable
reserved_2_3 : bits_2;
USART1EN : boolean; -- USART1 clock enable
USART6EN : boolean; -- USART6 clock enable
reserved_6_7 : bits_2;
ADC1EN : boolean; -- ADC1 clock enable
ADC2EN : boolean; -- ADC2 clock enable
ADC3EN : boolean; -- ADC3 clock enable
SDIOEN : boolean; -- SDIO clock enable
SPI1EN : boolean; -- SPI1 clock enable
reserved_13 : bit;
SYSCFGEN : boolean;
-- System configuration controller clock enable
reserved_15 : bit;
TIM9EN : boolean; -- TIM9 clock enable
TIM10EN : boolean; -- TIM10 clock enable
TIM11EN : boolean; -- TIM11 clock enable
reserved_19_23 : bits_5;
reserved_24_31 : unsigned_8;
end record
with size => 32, volatile_full_access;
for t_RCC_APB2ENR use record
TIM1EN at 0 range 0 .. 0;
TIM8EN at 0 range 1 .. 1;
reserved_2_3 at 0 range 2 .. 3;
USART1EN at 0 range 4 .. 4;
USART6EN at 0 range 5 .. 5;
reserved_6_7 at 0 range 6 .. 7;
ADC1EN at 0 range 8 .. 8;
ADC2EN at 0 range 9 .. 9;
ADC3EN at 0 range 10 .. 10;
SDIOEN at 0 range 11 .. 11;
SPI1EN at 0 range 12 .. 12;
reserved_13 at 0 range 13 .. 13;
SYSCFGEN at 0 range 14 .. 14;
reserved_15 at 0 range 15 .. 15;
TIM9EN at 0 range 16 .. 16;
TIM10EN at 0 range 17 .. 17;
TIM11EN at 0 range 18 .. 18;
reserved_19_23 at 0 range 19 .. 23;
reserved_24_31 at 0 range 24 .. 31;
end record;
--------------------
-- RCC peripheral --
--------------------
type t_RCC_peripheral is record
CR : t_RCC_CR;
PLLCFGR : t_RCC_PLLCFGR;
CFGR : t_RCC_CFGR;
CIR : unsigned_32;
AHB1ENR : t_RCC_AHB1ENR;
AHB2ENR : t_RCC_AHB2ENR;
APB1ENR : t_RCC_APB1ENR;
APB2ENR : t_RCC_APB2ENR;
end record
with volatile;
for t_RCC_peripheral use record
CR at 16#00# range 0 .. 31;
PLLCFGR at 16#04# range 0 .. 31;
CFGR at 16#08# range 0 .. 31;
CIR at 16#0C# range 0 .. 31;
AHB1ENR at 16#30# range 0 .. 31;
AHB2ENR at 16#34# range 0 .. 31;
APB1ENR at 16#40# range 0 .. 31;
APB2ENR at 16#44# range 0 .. 31;
end record;
RCC : t_RCC_peripheral
with
import,
volatile,
address => system'to_address(16#4002_3800#);
procedure reset;
procedure init;
procedure enable_clock (periph : in soc.devmap.t_periph_id);
end soc.rcc;
|
fengjixuchui/ewok-kernel | Ada | 11,951 | adb | --
-- Copyright 2018 The wookey project team <[email protected]>
-- - Ryad Benadjila
-- - Arnauld Michelizza
-- - Mathieu Renard
-- - Philippe Thierry
-- - Philippe Trebuchet
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
--
--
with ada.unchecked_conversion;
with m4.mpu; use m4.mpu;
with ewok.mpu.handler;
with ewok.layout;
with ewok.debug;
with soc.layout;
with applications; -- generated
package body ewok.mpu
with spark_mode => on
is
procedure init
(success : out boolean)
with spark_mode => off -- handler is not SPARK compatible
is
-- Layout mapping validation of generated constants
pragma assert
(applications.txt_kern_size + applications.txt_kern_region_base
<= applications.txt_user_region_base);
function get_region_size (size : t_region_size) return unsigned_32
is (2**(natural (size) + 1));
region_config : m4.mpu.t_region_config;
begin
-- Testing if there's an MPU
m4.mpu.is_mpu_available (success);
if not success then
pragma DEBUG (debug.log (debug.ERROR, "No MPU!"));
return;
end if;
-- Register memory fault handler
-- Note: unproved because SPARK doesn't allow "'address" attribute
ewok.mpu.handler.init; -- not PARK compatible
-- Disable MPU
m4.mpu.disable;
-- Enable privileged software access (PRIVDEFENA) to default memory map
-- and enable the memory fault exception. When ENABLE and PRIVDEFENA are
-- both set to 1, privileged code can freely access the default memory
-- map. Any access by unprivileged software that does not address an
-- enabled memory region causes a memory management fault.
m4.mpu.init;
-- SHR
if get_region_size (REGION_SIZE_32KB) /= ewok.layout.SHR_SIZE then
pragma DEBUG (debug.log (debug.ERROR, "MPU: invalid 'SHARED' size"));
return;
end if;
region_config :=
(region_number => SHARED_REGION,
addr => ewok.layout.SHR_BASE,
size => REGION_SIZE_32KB,
subregion_mask => 0,
access_perm => REGION_PERM_PRIV_RO_USER_NO,
xn => true,
b => false,
s => false);
-- A memory region must never be mapped RWX
m4.mpu.configure_region (region_config);
-- Kernel code
if get_region_size (REGION_SIZE_64KB) /= ewok.layout.FW1_KERN_SIZE then
pragma DEBUG (debug.log (debug.ERROR, "MPU: invalid 'KERNEL CODE' size"));
return;
end if;
region_config :=
(region_number => KERN_CODE_REGION,
addr => applications.txt_kern_region_base,
size => applications.txt_kern_region_size,
subregion_mask => 0,
access_perm => REGION_PERM_PRIV_RO_USER_NO,
xn => false,
b => false,
s => false);
m4.mpu.configure_region (region_config);
-- Devices
region_config :=
(region_number => DEVICES_REGION,
addr => soc.layout.PERIPH_BASE,
size => REGION_SIZE_512KB,
subregion_mask => 0,
access_perm => REGION_PERM_PRIV_RW_USER_NO,
xn => true,
b => true,
s => true);
m4.mpu.configure_region (region_config);
-- kernel data + stacks
if get_region_size (REGION_SIZE_64KB) /= ewok.layout.KERN_DATA_SIZE then
pragma DEBUG (debug.log (debug.ERROR, "MPU: invalid 'KERNEL DATA' size"));
return;
end if;
region_config :=
(region_number => KERN_DATA_REGION,
addr => ewok.layout.KERN_DATA_BASE,
size => REGION_SIZE_64KB,
subregion_mask => 0,
access_perm => REGION_PERM_PRIV_RW_USER_NO,
xn => true,
b => false,
s => true);
m4.mpu.configure_region (region_config);
-- User data
if get_region_size (REGION_SIZE_128KB) /= ewok.layout.USER_RAM_SIZE then
pragma DEBUG (debug.log (debug.ERROR, "MPU: invalid 'USER DATA' size"));
return;
end if;
region_config :=
(region_number => USER_DATA_REGION,
addr => ewok.layout.USER_DATA_BASE,
size => REGION_SIZE_128KB,
subregion_mask => 0,
access_perm => REGION_PERM_PRIV_RW_USER_RW,
xn => true,
b => false,
s => true);
m4.mpu.configure_region (region_config);
-- USER code area
-- Note: This is for the whole area. Each task will use only a fixed
-- number of sub-regions
if get_region_size (REGION_SIZE_256KB) /= ewok.layout.FW1_USER_SIZE then
pragma DEBUG (debug.log (debug.ERROR, "MPU: invalid 'USER CODE' size"));
return;
end if;
region_config :=
(region_number => USER_CODE_REGION,
addr => applications.txt_user_region_base,
size => applications.txt_user_region_size,
subregion_mask => 0,
access_perm => REGION_PERM_PRIV_RO_USER_RO,
xn => false,
b => false,
s => false);
m4.mpu.configure_region (region_config);
-- User ISR stack
region_config :=
(region_number => ISR_STACK_REGION,
addr => ewok.layout.STACK_BOTTOM_TASK_ISR,
size => REGION_SIZE_4KB,
subregion_mask => 0,
access_perm => REGION_PERM_PRIV_RW_USER_RW,
xn => true,
b => false,
s => true);
m4.mpu.configure_region (region_config);
pragma DEBUG (debug.log (debug.INFO, "MPU is configured"));
m4.mpu.enable;
pragma DEBUG (debug.log (debug.INFO, "MPU is enabled"));
end init;
procedure regions_schedule
(region_number : in m4.mpu.t_region_number;
addr : in system_address;
size : in m4.mpu.t_region_size;
region_type : in t_region_type;
subregion_mask : in unsigned_8)
is
region_config : m4.mpu.t_region_config;
begin
-- A memory region must never be mapped RWX
case (region_type) is
when REGION_TYPE_USER_DEV =>
region_config :=
(region_number => region_number,
addr => addr,
size => size,
subregion_mask => subregion_mask,
access_perm => REGION_PERM_PRIV_RW_USER_RW,
xn => true,
b => true,
s => true);
m4.mpu.configure_region (region_config);
when REGION_TYPE_RO_USER_DEV =>
region_config :=
(region_number => region_number,
addr => addr,
size => size,
subregion_mask => subregion_mask,
access_perm => REGION_PERM_PRIV_RW_USER_RO,
xn => true,
b => true,
s => true);
m4.mpu.configure_region (region_config);
when REGION_TYPE_USER_CODE =>
region_config :=
(region_number => region_number,
addr => addr,
size => size,
subregion_mask => subregion_mask,
access_perm => REGION_PERM_PRIV_RO_USER_RO,
xn => false,
b => false,
s => false);
m4.mpu.update_subregion_mask (region_config);
when REGION_TYPE_USER_DATA =>
region_config :=
(region_number => region_number,
addr => addr,
size => size,
subregion_mask => subregion_mask,
access_perm => REGION_PERM_PRIV_RW_USER_RW,
xn => true,
b => false,
s => true);
m4.mpu.update_subregion_mask (region_config);
when REGION_TYPE_BOOTROM =>
-- MPU makes Boot ROM region unattainable to avoid ROP attacks
region_config :=
(region_number => region_number,
addr => addr,
size => size,
subregion_mask => 0,
access_perm => REGION_PERM_PRIV_NO_USER_NO,
xn => true,
b => false,
s => false);
m4.mpu.configure_region (region_config);
when REGION_TYPE_ISR_DATA =>
region_config :=
(region_number => region_number,
addr => addr,
size => size,
subregion_mask => 0,
access_perm => REGION_PERM_PRIV_RW_USER_RW,
xn => true,
b => false,
s => true);
m4.mpu.configure_region (region_config);
end case;
end regions_schedule;
procedure bytes_to_region_size
(bytes : in unsigned_32;
region_size : out m4.mpu.t_region_size;
success : out boolean)
is
begin
success := true;
case (bytes) is
when 32 => region_size := REGION_SIZE_32B;
when 64 => region_size := REGION_SIZE_64B;
when 128 => region_size := REGION_SIZE_128B;
when 256 => region_size := REGION_SIZE_256B;
when 512 => region_size := REGION_SIZE_512B;
when 1*KBYTE => region_size := REGION_SIZE_1KB;
when 2*KBYTE => region_size := REGION_SIZE_2KB;
when 4*KBYTE => region_size := REGION_SIZE_4KB;
when 8*KBYTE => region_size := REGION_SIZE_8KB;
when 16*KBYTE => region_size := REGION_SIZE_16KB;
when 32*KBYTE => region_size := REGION_SIZE_32KB;
when 64*KBYTE => region_size := REGION_SIZE_64KB;
when 128*KBYTE => region_size := REGION_SIZE_128KB;
when 256*KBYTE => region_size := REGION_SIZE_256KB;
when 512*KBYTE => region_size := REGION_SIZE_512KB;
when 1*MBYTE => region_size := REGION_SIZE_1MB;
when 2*MBYTE => region_size := REGION_SIZE_2MB;
when 4*MBYTE => region_size := REGION_SIZE_4MB;
when 8*MBYTE => region_size := REGION_SIZE_8MB;
when 16*MBYTE => region_size := REGION_SIZE_16MB;
when 32*MBYTE => region_size := REGION_SIZE_32MB;
when 64*MBYTE => region_size := REGION_SIZE_64MB;
when 128*MBYTE => region_size := REGION_SIZE_128MB;
when 256*MBYTE => region_size := REGION_SIZE_256MB;
when 512*MBYTE => region_size := REGION_SIZE_512MB;
when 1*GBYTE => region_size := REGION_SIZE_1GB;
when 2*GBYTE => region_size := REGION_SIZE_2GB;
when others =>
region_size := REGION_SIZE_32B;
success := false;
end case;
end bytes_to_region_size;
end ewok.mpu;
|
ytomino/vampire | Ada | 2,808 | adb | -- The Village of Vampire by YT, このソースコードはNYSLです
with Ada.Hierarchical_File_Names;
procedure Vampire.R3.User_List_Page (
Output : not null access Ada.Streams.Root_Stream_Type'Class;
Form : in Forms.Root_Form_Type'Class;
Template : in String;
HTML_Directory : in String;
Summaries : in Tabula.Villages.Lists.Summary_Maps.Map;
User_List : in Users.Lists.User_Info_Maps.Map;
User_Id : in String;
User_Password : in String)
is
use Users.Lists.User_Info_Maps;
procedure Handle (
Output : not null access Ada.Streams.Root_Stream_Type'Class;
Tag : in String;
Contents : in Web.Producers.Template) is
begin
if Tag = "href_index" then
Forms.Write_Attribute_Name (Output, "href");
Forms.Write_Link (
Output,
Form,
Current_Directory => ".",
Resource => Forms.Self,
Parameters =>
Form.Parameters_To_Index_Page (
User_Id => User_Id,
User_Password => User_Password));
elsif Tag = "href_logindex" then
Forms.Write_Attribute_Name (Output, "href");
Forms.Write_Link (
Output,
Form,
Current_Directory => ".",
Resource =>
Ada.Hierarchical_File_Names.Compose (
Directory => HTML_Directory,
Relative_Name => "")); -- add a trailing path delimiter
elsif Tag = "user" then
for I in User_List.Iterate loop
if Tabula.Villages.Lists.Count_Joined_By (
Summaries,
Key (I),
Filter => (
Tabula.Villages.Prologue | Tabula.Villages.Playing => False,
Tabula.Villages.Epilogue | Tabula.Villages.Closed => True),
Including_Escaped => True) > 0
then
declare
procedure Handle (
Output : not null access Ada.Streams.Root_Stream_Type'Class;
Tag : in String;
Contents : in Web.Producers.Template) is
begin
if Tag = "id" then
Forms.Write_In_HTML (Output, Form, Key (I));
elsif Tag = "joinedcount" then
Forms.Write_In_HTML (
Output,
Form,
Image (
Tabula.Villages.Lists.Count_Joined_By (
Summaries,
Key (I),
Filter => (
Tabula.Villages.Prologue | Tabula.Villages.Playing => False,
Tabula.Villages.Epilogue | Tabula.Villages.Closed => True),
Including_Escaped => False)));
elsif Tag = "renamed" then
Forms.Write_In_HTML (
Output,
Form,
User_List.Constant_Reference (I).Renamed.Constant_Reference);
else
Raise_Unknown_Tag (Tag);
end if;
end Handle;
begin
Web.Producers.Produce (Output, Contents, Handler => Handle'Access);
end;
end if;
end loop;
else
Raise_Unknown_Tag (Tag);
end if;
end Handle;
begin
Web.Producers.Produce (Output, Read (Template), Handler => Handle'Access);
end Vampire.R3.User_List_Page;
|
jorge-real/TTS-Runtime-Ravenscar | Ada | 6,746 | ads | ------------------------------------------------------------
--
-- GNAT RUN-TIME EXTENSIONS
--
-- XADA . DISPATCHING . TIME-TRIGGERED SCHEDULING
--
-- @file x-distts.ads / xada-dispatching-tts.ads
--
-- @package XAda.Dispatching.TTS (SPEC)
--
-- @author Jorge Real <[email protected]>
-- @author Sergio Saez <[email protected]>
--
------------------------------------------------------------
pragma Profile (Ravenscar);
with Ada.Real_Time, System;
private with Ada.Real_Time.Timing_Events;
generic
Number_Of_Work_IDs : Positive;
Number_Of_Sync_IDs : Positive := 1;
TT_Priority : System.Priority := System.Priority'Last;
package XAda.Dispatching.TTS is
-- TT tasks use a Work_Id of this type to identify themselves
-- when they call the scheduler
type TT_Work_Id is new Positive range 1 .. Number_Of_Work_IDs;
-- ET tasks use a Sync_Id of this type to identify themselves
-- when they call the scheduler
type TT_Sync_Id is new Positive range 1 .. Number_Of_Sync_IDs;
-- An abstract time slot in the TT plan.
type Time_Slot is abstract tagged record
Slot_Duration : Ada.Real_Time.Time_Span;
end record;
type Time_Slot_Access is access all Time_Slot'Class;
-- An empty time slot
type Empty_Slot is new Time_Slot with null record;
type Empty_Slot_Access is access all Empty_Slot'Class;
-- A mode change time slot
type Mode_Change_Slot is new Time_Slot with null record;
type Mode_Change_Slot_Access is access all Mode_Change_Slot'Class;
-- A sync slot
type Sync_Slot is new Time_Slot with
record
Sync_Id : TT_Sync_Id;
end record;
type Sync_Slot_Access is access all Sync_Slot'Class;
-- A work slot
type Work_Slot is abstract new Time_Slot with
record
Work_Id : TT_Work_Id;
Is_Continuation : Boolean := False;
Padding : Ada.Real_Time.Time_Span := Ada.Real_Time.Time_Span_Zero;
end record;
type Work_Slot_Access is access all Work_Slot'Class;
-- A regular slot
type Regular_Slot is new Work_Slot with null record;
type Regular_Slot_Access is access all Regular_Slot'Class;
-- An optional work slot
type Optional_Slot is new Work_Slot with null record;
type Optional_Slot_Access is access all Optional_Slot'Class;
-- Types representing/accessing TT plans
type Time_Triggered_Plan is array (Natural range <>) of Time_Slot_Access;
type Time_Triggered_Plan_Access is access all Time_Triggered_Plan;
-- Set new TT plan to start at the end of the next mode change slot
procedure Set_Plan
(TTP : Time_Triggered_Plan_Access);
-- TT works use this procedure to wait for their next assigned slot
-- The When_Was_Released result informs caller of slot starting time
procedure Wait_For_Activation
(Work_Id : TT_Work_Id;
When_Was_Released : out Ada.Real_Time.Time);
-- TT works use this procedure to inform that the critical part
-- of the current slot has been finished. It tranforms the current
-- slot in a continuation slot
procedure Continue_Sliced;
-- TT works use this procedure to inform the TT scheduler that
-- there is no more work to do at TT priority level
procedure Leave_TT_Level;
-- Returns the first time the first slot of the current plan was released.
-- It is equivalent to an Epoch for the current plan.
function Get_First_Plan_Release return Ada.Real_Time.Time;
-- Returns the last time the first slot of the plan was released
function Get_Last_Plan_Release return Ada.Real_Time.Time;
-- ET works use this procedure to wait for their next asigned sync slot
procedure Wait_For_Sync
(Sync_Id : TT_Sync_Id;
When_Was_Released : out Ada.Real_Time.Time);
private
protected Time_Triggered_Scheduler
with Priority => System.Interrupt_Priority'Last is
-- Setting a new TT plan
procedure Set_Plan
(TTP : Time_Triggered_Plan_Access);
-- Prepare work to wait for next activation
procedure Prepare_For_Activation
(Work_Id : TT_Work_Id);
-- Transform current slot in a continuation slot
procedure Continue_Sliced;
-- Inform the scheduler that you have no more work as a TT task
procedure Leave_TT_Level;
-- Returns the first time the first slot of the plan was released
function Get_First_Plan_Release return Ada.Real_Time.Time;
-- Returns the last time the first slot of the plan was released
function Get_Last_Plan_Release return Ada.Real_Time.Time;
-- Prepare work to wait for next synchronization point
procedure Prepare_For_Sync
(Sync_Id : TT_Sync_Id);
private
-- New slot timing event
NS_Event : Ada.Real_Time.Timing_Events.Timing_Event;
-- New slot handler procedure
procedure NS_Handler
(Event : in out Ada.Real_Time.Timing_Events.Timing_Event);
-- This access object is the reason why the scheduler is declared
-- in this private part, given that this is a generic package.
-- It should be a constant, but a PO can't have constant components.
NS_Handler_Access : Ada.Real_Time.Timing_Events.Timing_Event_Handler :=
NS_Handler'Access;
-- Hold timing event
Hold_Event : Ada.Real_Time.Timing_Events.Timing_Event;
-- Padding slot handler procedure
procedure Hold_Handler
(Event : in out Ada.Real_Time.Timing_Events.Timing_Event);
-- This access object is the reason why the scheduler is declared
-- in this private part, given that this is a generic package.
-- It should be a constant, but a PO can't have constant components.
Hold_Handler_Access : Ada.Real_Time.Timing_Events.Timing_Event_Handler :=
Hold_Handler'Access;
-- Procedure to enforce plan change
procedure Change_Plan
(At_Time : Ada.Real_Time.Time);
-- Currently running plan and next plan to switch to, if any
Current_Plan : Time_Triggered_Plan_Access := null;
Next_Plan : Time_Triggered_Plan_Access := null;
-- Index numbers of current and next slots in the plan
Current_Slot_Index : Natural := 0;
Next_Slot_Index : Natural := 0;
-- Start time of next slot
Next_Slot_Release : Ada.Real_Time.Time := Ada.Real_Time.Time_Last;
-- Start time of the current plan
Plan_Start_Pending : Boolean := True;
First_Plan_Release : Ada.Real_Time.Time := Ada.Real_Time.Time_First;
-- Start time of the first slot
First_Slot_Release : Ada.Real_Time.Time := Ada.Real_Time.Time_First;
end Time_Triggered_Scheduler;
end XAda.Dispatching.TTS;
|
reznikmm/matreshka | Ada | 3,655 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2013, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with XML.DOM.Attributes;
package ODF.DOM.Attributes.Style.Display_Name is
type ODF_Style_Display_Name is
new XML.DOM.Attributes.DOM_Attribute with private;
private
type ODF_Style_Display_Name is
new XML.DOM.Attributes.DOM_Attribute with null record;
end ODF.DOM.Attributes.Style.Display_Name;
|
zenharris/ada-bbs | Ada | 4,681 | adb | separate(Formatter.Get)
procedure Format_string (Data : in Contents;
In_The_String : in out String;
Location : in out Natural;
Width : in Natural := 0;
Precision : in Natural := 0;
Left_Justify : in Boolean := False) is
-- ++
--
-- FUNCTIONAL DESCRIPTION:
--
-- Formats data string according to input parameters.
--
-- FORMAL PARAMETERS:
--
-- Data:
-- Input data string contained in variant record.
--
-- In_The_String:
-- Formatted Output String
--
-- Location:
-- Position in output string to place formatted input data string.
--
-- Width:
-- Field width of formatted output.
--
-- Precision:
-- Number of characters of input string to place in formatted output
-- field.
--
-- Left_Justify:
-- Logical (Boolean) switch which specifies to left-justify output
-- formatted string.
--
-- DESIGN:
--
-- If input string is greater than specified output field width then place
-- justified sub-string in output field. Otherwise, place justified string
-- in output field.
--
-- --
-- Local variables
Blanks : String(1..255) := (others => ' ');
Data_Width : integer;
begin
-- Check data type
if Data.Class = String_type then -- Is correct type to convert
if Width = 0 then
-- Put entire string into output buffer
In_the_string(Location..Location + Data.String_value.The_Length - 1) :=
Data.String_value.The_String.All;
Location := Location + Data.String_value.The_Length;
else -- Non-zero field Width specified
Data_Width := Data.String_value.The_Length;
if Data_width > Width then -- Data string too long
if Precision > 0 then -- Sub-string specified
if Left_justify then
In_The_String(Location..Location + Width - 1) :=
Data.String_value.The_String(1..Precision) & Blanks(1..Width - Precision);
Location := Location + Width;
else -- Right-justify
In_The_String(Location..Location + WIDTH - 1) :=
Blanks(1..Width - Precision) & Data.String_value.The_String(1..Precision);
Location := Location + WIDTH;
end if;
else -- Truncate string to fit in width of field
if Left_Justify then -- Take left-most "width" characters
In_the_string (Location..Location + Width - 1) := Data.String_value.The_String(1..Width);
else -- Take right-most "width" characters
In_the_string (Location..Location + Width - 1) := Data.String_value.The_String(Data_Width - Width + 1..Data_Width);
end if;
Location := Location + Width;
end if; -- Long String
else -- String < specified field Width
If Precision > 0 Then -- Sub-String Specified
If Left_justify Then
In_the_string(Location..Location + Width - 1) :=
Data.String_value.The_String(1..Precision) & Blanks(1..Width - Precision);
Location := Location + Width;
Else -- Right-Justify
In_the_string(Location..Location + Width - 1) :=
Blanks(1..Width - Precision) & Data.String_value.The_String(1..Precision);
Location := Location + Width;
end if;
else -- No substring specified
If Left_justify Then
In_the_string(Location..Location + Width - 1) :=
Data.String_value.The_String.All & Blanks(1..Width - Data_width);
Location := Location + Width;
else -- Right justify
In_the_string(Location..Location + Width - 1) :=
Blanks(1..Width - Data_width) & Data.String_value.The_String.All;
Location := Location + Width;
end if; -- Justify test
end if; -- Substring specified
end if; -- Field width test
end if;
else -- Wrong class type for format specifier
-- Uses Global Default_Width constant
Format_Error(In_The_String, Location, Default_Width);
end if; -- Class test
exception
When others =>
-- Uses Global Default_Width constant
Format_Error(In_The_String, Location, Default_Width);
end Format_string;
|
zhmu/ananas | Ada | 566,366 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- E X P _ C H 4 --
-- --
-- B o d y --
-- --
-- Copyright (C) 1992-2022, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License --
-- for more details. You should have received a copy of the GNU General --
-- Public License distributed with GNAT; see file COPYING3. If not, go to --
-- http://www.gnu.org/licenses for a complete copy of the license. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Aspects; use Aspects;
with Atree; use Atree;
with Checks; use Checks;
with Debug; use Debug;
with Einfo; use Einfo;
with Einfo.Entities; use Einfo.Entities;
with Einfo.Utils; use Einfo.Utils;
with Elists; use Elists;
with Errout; use Errout;
with Exp_Aggr; use Exp_Aggr;
with Exp_Atag; use Exp_Atag;
with Exp_Ch3; use Exp_Ch3;
with Exp_Ch6; use Exp_Ch6;
with Exp_Ch7; use Exp_Ch7;
with Exp_Ch9; use Exp_Ch9;
with Exp_Disp; use Exp_Disp;
with Exp_Fixd; use Exp_Fixd;
with Exp_Intr; use Exp_Intr;
with Exp_Pakd; use Exp_Pakd;
with Exp_Tss; use Exp_Tss;
with Exp_Util; use Exp_Util;
with Freeze; use Freeze;
with Inline; use Inline;
with Namet; use Namet;
with Nlists; use Nlists;
with Nmake; use Nmake;
with Opt; use Opt;
with Par_SCO; use Par_SCO;
with Restrict; use Restrict;
with Rident; use Rident;
with Rtsfind; use Rtsfind;
with Sem; use Sem;
with Sem_Aux; use Sem_Aux;
with Sem_Cat; use Sem_Cat;
with Sem_Ch3; use Sem_Ch3;
with Sem_Ch13; use Sem_Ch13;
with Sem_Eval; use Sem_Eval;
with Sem_Res; use Sem_Res;
with Sem_Type; use Sem_Type;
with Sem_Util; use Sem_Util;
with Sem_Warn; use Sem_Warn;
with Sinfo; use Sinfo;
with Sinfo.Nodes; use Sinfo.Nodes;
with Sinfo.Utils; use Sinfo.Utils;
with Snames; use Snames;
with Stand; use Stand;
with SCIL_LL; use SCIL_LL;
with Targparm; use Targparm;
with Tbuild; use Tbuild;
with Ttypes; use Ttypes;
with Uintp; use Uintp;
with Urealp; use Urealp;
with Validsw; use Validsw;
with Warnsw; use Warnsw;
package body Exp_Ch4 is
-----------------------
-- Local Subprograms --
-----------------------
procedure Binary_Op_Validity_Checks (N : Node_Id);
pragma Inline (Binary_Op_Validity_Checks);
-- Performs validity checks for a binary operator
procedure Build_Boolean_Array_Proc_Call
(N : Node_Id;
Op1 : Node_Id;
Op2 : Node_Id);
-- If a boolean array assignment can be done in place, build call to
-- corresponding library procedure.
procedure Displace_Allocator_Pointer (N : Node_Id);
-- Ada 2005 (AI-251): Subsidiary procedure to Expand_N_Allocator and
-- Expand_Allocator_Expression. Allocating class-wide interface objects
-- this routine displaces the pointer to the allocated object to reference
-- the component referencing the corresponding secondary dispatch table.
procedure Expand_Allocator_Expression (N : Node_Id);
-- Subsidiary to Expand_N_Allocator, for the case when the expression
-- is a qualified expression.
procedure Expand_Array_Comparison (N : Node_Id);
-- This routine handles expansion of the comparison operators (N_Op_Lt,
-- N_Op_Le, N_Op_Gt, N_Op_Ge) when operating on an array type. The basic
-- code for these operators is similar, differing only in the details of
-- the actual comparison call that is made. Special processing (call a
-- run-time routine)
function Expand_Array_Equality
(Nod : Node_Id;
Lhs : Node_Id;
Rhs : Node_Id;
Bodies : List_Id;
Typ : Entity_Id) return Node_Id;
-- Expand an array equality into a call to a function implementing this
-- equality, and a call to it. Loc is the location for the generated nodes.
-- Lhs and Rhs are the array expressions to be compared. Bodies is a list
-- on which to attach bodies of local functions that are created in the
-- process. It is the responsibility of the caller to insert those bodies
-- at the right place. Nod provides the Sloc value for the generated code.
-- Normally the types used for the generated equality routine are taken
-- from Lhs and Rhs. However, in some situations of generated code, the
-- Etype fields of Lhs and Rhs are not set yet. In such cases, Typ supplies
-- the type to be used for the formal parameters.
procedure Expand_Boolean_Operator (N : Node_Id);
-- Common expansion processing for Boolean operators (And, Or, Xor) for the
-- case of array type arguments.
procedure Expand_Nonbinary_Modular_Op (N : Node_Id);
-- When generating C code, convert nonbinary modular arithmetic operations
-- into code that relies on the front-end expansion of operator Mod. No
-- expansion is performed if N is not a nonbinary modular operand.
procedure Expand_Short_Circuit_Operator (N : Node_Id);
-- Common expansion processing for short-circuit boolean operators
procedure Expand_Compare_Minimize_Eliminate_Overflow (N : Node_Id);
-- Deal with comparison in MINIMIZED/ELIMINATED overflow mode. This is
-- where we allow comparison of "out of range" values.
function Expand_Composite_Equality
(Nod : Node_Id;
Typ : Entity_Id;
Lhs : Node_Id;
Rhs : Node_Id) return Node_Id;
-- Local recursive function used to expand equality for nested composite
-- types. Used by Expand_Record/Array_Equality. Nod provides the Sloc value
-- for generated code. Lhs and Rhs are the left and right sides for the
-- comparison, and Typ is the type of the objects to compare.
procedure Expand_Concatenate (Cnode : Node_Id; Opnds : List_Id);
-- Routine to expand concatenation of a sequence of two or more operands
-- (in the list Operands) and replace node Cnode with the result of the
-- concatenation. The operands can be of any appropriate type, and can
-- include both arrays and singleton elements.
procedure Expand_Membership_Minimize_Eliminate_Overflow (N : Node_Id);
-- N is an N_In membership test mode, with the overflow check mode set to
-- MINIMIZED or ELIMINATED, and the type of the left operand is a signed
-- integer type. This is a case where top level processing is required to
-- handle overflow checks in subtrees.
procedure Fixup_Universal_Fixed_Operation (N : Node_Id);
-- N is a N_Op_Divide or N_Op_Multiply node whose result is universal
-- fixed. We do not have such a type at runtime, so the purpose of this
-- routine is to find the real type by looking up the tree. We also
-- determine if the operation must be rounded.
function Get_Size_For_Range (Lo, Hi : Uint) return Uint;
-- Return the size of a small signed integer type covering Lo .. Hi, the
-- main goal being to return a size lower than that of standard types.
procedure Insert_Dereference_Action (N : Node_Id);
-- N is an expression whose type is an access. When the type of the
-- associated storage pool is derived from Checked_Pool, generate a
-- call to the 'Dereference' primitive operation.
function Make_Array_Comparison_Op
(Typ : Entity_Id;
Nod : Node_Id) return Node_Id;
-- Comparisons between arrays are expanded in line. This function produces
-- the body of the implementation of (a > b), where a and b are one-
-- dimensional arrays of some discrete type. The original node is then
-- expanded into the appropriate call to this function. Nod provides the
-- Sloc value for the generated code.
function Make_Boolean_Array_Op
(Typ : Entity_Id;
N : Node_Id) return Node_Id;
-- Boolean operations on boolean arrays are expanded in line. This function
-- produce the body for the node N, which is (a and b), (a or b), or (a xor
-- b). It is used only the normal case and not the packed case. The type
-- involved, Typ, is the Boolean array type, and the logical operations in
-- the body are simple boolean operations. Note that Typ is always a
-- constrained type (the caller has ensured this by using
-- Convert_To_Actual_Subtype if necessary).
function Minimized_Eliminated_Overflow_Check (N : Node_Id) return Boolean;
-- For signed arithmetic operations when the current overflow mode is
-- MINIMIZED or ELIMINATED, we must call Apply_Arithmetic_Overflow_Checks
-- as the first thing we do. We then return. We count on the recursive
-- apparatus for overflow checks to call us back with an equivalent
-- operation that is in CHECKED mode, avoiding a recursive entry into this
-- routine, and that is when we will proceed with the expansion of the
-- operator (e.g. converting X+0 to X, or X**2 to X*X). We cannot do
-- these optimizations without first making this check, since there may be
-- operands further down the tree that are relying on the recursive calls
-- triggered by the top level nodes to properly process overflow checking
-- and remaining expansion on these nodes. Note that this call back may be
-- skipped if the operation is done in Bignum mode but that's fine, since
-- the Bignum call takes care of everything.
procedure Narrow_Large_Operation (N : Node_Id);
-- Try to compute the result of a large operation in a narrower type than
-- its nominal type. This is mainly aimed at getting rid of operations done
-- in Universal_Integer that can be generated for attributes.
procedure Optimize_Length_Comparison (N : Node_Id);
-- Given an expression, if it is of the form X'Length op N (or the other
-- way round), where N is known at compile time to be 0 or 1, or something
-- else where the value is known to be nonnegative and in the 32-bit range,
-- and X is a simple entity, and op is a comparison operator, optimizes it
-- into a comparison of X'First and X'Last.
procedure Process_If_Case_Statements (N : Node_Id; Stmts : List_Id);
-- Inspect and process statement list Stmt of if or case expression N for
-- transient objects. If such objects are found, the routine generates code
-- to clean them up when the context of the expression is evaluated.
procedure Process_Transient_In_Expression
(Obj_Decl : Node_Id;
Expr : Node_Id;
Stmts : List_Id);
-- Subsidiary routine to the expansion of expression_with_actions, if and
-- case expressions. Generate all necessary code to finalize a transient
-- object when the enclosing context is elaborated or evaluated. Obj_Decl
-- denotes the declaration of the transient object, which is usually the
-- result of a controlled function call. Expr denotes the expression with
-- actions, if expression, or case expression node. Stmts denotes the
-- statement list which contains Decl, either at the top level or within a
-- nested construct.
procedure Rewrite_Comparison (N : Node_Id);
-- If N is the node for a comparison whose outcome can be determined at
-- compile time, then the node N can be rewritten with True or False. If
-- the outcome cannot be determined at compile time, the call has no
-- effect. If N is a type conversion, then this processing is applied to
-- its expression. If N is neither comparison nor a type conversion, the
-- call has no effect.
procedure Tagged_Membership
(N : Node_Id;
SCIL_Node : out Node_Id;
Result : out Node_Id);
-- Construct the expression corresponding to the tagged membership test.
-- Deals with a second operand being (or not) a class-wide type.
function Safe_In_Place_Array_Op
(Lhs : Node_Id;
Op1 : Node_Id;
Op2 : Node_Id) return Boolean;
-- In the context of an assignment, where the right-hand side is a boolean
-- operation on arrays, check whether operation can be performed in place.
procedure Unary_Op_Validity_Checks (N : Node_Id);
pragma Inline (Unary_Op_Validity_Checks);
-- Performs validity checks for a unary operator
-------------------------------
-- Binary_Op_Validity_Checks --
-------------------------------
procedure Binary_Op_Validity_Checks (N : Node_Id) is
begin
if Validity_Checks_On and Validity_Check_Operands then
Ensure_Valid (Left_Opnd (N));
Ensure_Valid (Right_Opnd (N));
end if;
end Binary_Op_Validity_Checks;
------------------------------------
-- Build_Boolean_Array_Proc_Call --
------------------------------------
procedure Build_Boolean_Array_Proc_Call
(N : Node_Id;
Op1 : Node_Id;
Op2 : Node_Id)
is
Loc : constant Source_Ptr := Sloc (N);
Kind : constant Node_Kind := Nkind (Expression (N));
Target : constant Node_Id :=
Make_Attribute_Reference (Loc,
Prefix => Name (N),
Attribute_Name => Name_Address);
Arg1 : Node_Id := Op1;
Arg2 : Node_Id := Op2;
Call_Node : Node_Id;
Proc_Name : Entity_Id;
begin
if Kind = N_Op_Not then
if Nkind (Op1) in N_Binary_Op then
-- Use negated version of the binary operators
if Nkind (Op1) = N_Op_And then
Proc_Name := RTE (RE_Vector_Nand);
elsif Nkind (Op1) = N_Op_Or then
Proc_Name := RTE (RE_Vector_Nor);
else pragma Assert (Nkind (Op1) = N_Op_Xor);
Proc_Name := RTE (RE_Vector_Xor);
end if;
Call_Node :=
Make_Procedure_Call_Statement (Loc,
Name => New_Occurrence_Of (Proc_Name, Loc),
Parameter_Associations => New_List (
Target,
Make_Attribute_Reference (Loc,
Prefix => Left_Opnd (Op1),
Attribute_Name => Name_Address),
Make_Attribute_Reference (Loc,
Prefix => Right_Opnd (Op1),
Attribute_Name => Name_Address),
Make_Attribute_Reference (Loc,
Prefix => Left_Opnd (Op1),
Attribute_Name => Name_Length)));
else
Proc_Name := RTE (RE_Vector_Not);
Call_Node :=
Make_Procedure_Call_Statement (Loc,
Name => New_Occurrence_Of (Proc_Name, Loc),
Parameter_Associations => New_List (
Target,
Make_Attribute_Reference (Loc,
Prefix => Op1,
Attribute_Name => Name_Address),
Make_Attribute_Reference (Loc,
Prefix => Op1,
Attribute_Name => Name_Length)));
end if;
else
-- We use the following equivalences:
-- (not X) or (not Y) = not (X and Y) = Nand (X, Y)
-- (not X) and (not Y) = not (X or Y) = Nor (X, Y)
-- (not X) xor (not Y) = X xor Y
-- X xor (not Y) = not (X xor Y) = Nxor (X, Y)
if Nkind (Op1) = N_Op_Not then
Arg1 := Right_Opnd (Op1);
Arg2 := Right_Opnd (Op2);
if Kind = N_Op_And then
Proc_Name := RTE (RE_Vector_Nor);
elsif Kind = N_Op_Or then
Proc_Name := RTE (RE_Vector_Nand);
else
Proc_Name := RTE (RE_Vector_Xor);
end if;
else
if Kind = N_Op_And then
Proc_Name := RTE (RE_Vector_And);
elsif Kind = N_Op_Or then
Proc_Name := RTE (RE_Vector_Or);
elsif Nkind (Op2) = N_Op_Not then
Proc_Name := RTE (RE_Vector_Nxor);
Arg2 := Right_Opnd (Op2);
else
Proc_Name := RTE (RE_Vector_Xor);
end if;
end if;
Call_Node :=
Make_Procedure_Call_Statement (Loc,
Name => New_Occurrence_Of (Proc_Name, Loc),
Parameter_Associations => New_List (
Target,
Make_Attribute_Reference (Loc,
Prefix => Arg1,
Attribute_Name => Name_Address),
Make_Attribute_Reference (Loc,
Prefix => Arg2,
Attribute_Name => Name_Address),
Make_Attribute_Reference (Loc,
Prefix => Arg1,
Attribute_Name => Name_Length)));
end if;
Rewrite (N, Call_Node);
Analyze (N);
exception
when RE_Not_Available =>
return;
end Build_Boolean_Array_Proc_Call;
-----------------------
-- Build_Eq_Call --
-----------------------
function Build_Eq_Call
(Typ : Entity_Id;
Loc : Source_Ptr;
Lhs : Node_Id;
Rhs : Node_Id) return Node_Id
is
Prim : Node_Id;
Prim_E : Elmt_Id;
begin
Prim_E := First_Elmt (Collect_Primitive_Operations (Typ));
while Present (Prim_E) loop
Prim := Node (Prim_E);
-- Locate primitive equality with the right signature
if Chars (Prim) = Name_Op_Eq
and then Etype (First_Formal (Prim)) =
Etype (Next_Formal (First_Formal (Prim)))
and then Etype (Prim) = Standard_Boolean
then
if Is_Abstract_Subprogram (Prim) then
return
Make_Raise_Program_Error (Loc,
Reason => PE_Explicit_Raise);
else
return
Make_Function_Call (Loc,
Name => New_Occurrence_Of (Prim, Loc),
Parameter_Associations => New_List (Lhs, Rhs));
end if;
end if;
Next_Elmt (Prim_E);
end loop;
-- If not found, predefined operation will be used
return Empty;
end Build_Eq_Call;
--------------------------------
-- Displace_Allocator_Pointer --
--------------------------------
procedure Displace_Allocator_Pointer (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Orig_Node : constant Node_Id := Original_Node (N);
Dtyp : Entity_Id;
Etyp : Entity_Id;
PtrT : Entity_Id;
begin
-- Do nothing in case of VM targets: the virtual machine will handle
-- interfaces directly.
if not Tagged_Type_Expansion then
return;
end if;
pragma Assert (Nkind (N) = N_Identifier
and then Nkind (Orig_Node) = N_Allocator);
PtrT := Etype (Orig_Node);
Dtyp := Available_View (Designated_Type (PtrT));
Etyp := Etype (Expression (Orig_Node));
if Is_Class_Wide_Type (Dtyp) and then Is_Interface (Dtyp) then
-- If the type of the allocator expression is not an interface type
-- we can generate code to reference the record component containing
-- the pointer to the secondary dispatch table.
if not Is_Interface (Etyp) then
declare
Saved_Typ : constant Entity_Id := Etype (Orig_Node);
begin
-- 1) Get access to the allocated object
Rewrite (N,
Make_Explicit_Dereference (Loc, Relocate_Node (N)));
Set_Etype (N, Etyp);
Set_Analyzed (N);
-- 2) Add the conversion to displace the pointer to reference
-- the secondary dispatch table.
Rewrite (N, Convert_To (Dtyp, Relocate_Node (N)));
Analyze_And_Resolve (N, Dtyp);
-- 3) The 'access to the secondary dispatch table will be used
-- as the value returned by the allocator.
Rewrite (N,
Make_Attribute_Reference (Loc,
Prefix => Relocate_Node (N),
Attribute_Name => Name_Access));
Set_Etype (N, Saved_Typ);
Set_Analyzed (N);
end;
-- If the type of the allocator expression is an interface type we
-- generate a run-time call to displace "this" to reference the
-- component containing the pointer to the secondary dispatch table
-- or else raise Constraint_Error if the actual object does not
-- implement the target interface. This case corresponds to the
-- following example:
-- function Op (Obj : Iface_1'Class) return access Iface_2'Class is
-- begin
-- return new Iface_2'Class'(Obj);
-- end Op;
else
Rewrite (N,
Unchecked_Convert_To (PtrT,
Make_Function_Call (Loc,
Name => New_Occurrence_Of (RTE (RE_Displace), Loc),
Parameter_Associations => New_List (
Unchecked_Convert_To (RTE (RE_Address),
Relocate_Node (N)),
New_Occurrence_Of
(Elists.Node
(First_Elmt
(Access_Disp_Table (Etype (Base_Type (Dtyp))))),
Loc)))));
Analyze_And_Resolve (N, PtrT);
end if;
end if;
end Displace_Allocator_Pointer;
---------------------------------
-- Expand_Allocator_Expression --
---------------------------------
procedure Expand_Allocator_Expression (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Exp : constant Node_Id := Expression (Expression (N));
PtrT : constant Entity_Id := Etype (N);
DesigT : constant Entity_Id := Designated_Type (PtrT);
procedure Apply_Accessibility_Check
(Ref : Node_Id;
Built_In_Place : Boolean := False);
-- Ada 2005 (AI-344): For an allocator with a class-wide designated
-- type, generate an accessibility check to verify that the level of the
-- type of the created object is not deeper than the level of the access
-- type. If the type of the qualified expression is class-wide, then
-- always generate the check (except in the case where it is known to be
-- unnecessary, see comment below). Otherwise, only generate the check
-- if the level of the qualified expression type is statically deeper
-- than the access type.
--
-- Although the static accessibility will generally have been performed
-- as a legality check, it won't have been done in cases where the
-- allocator appears in generic body, so a run-time check is needed in
-- general. One special case is when the access type is declared in the
-- same scope as the class-wide allocator, in which case the check can
-- never fail, so it need not be generated.
--
-- As an open issue, there seem to be cases where the static level
-- associated with the class-wide object's underlying type is not
-- sufficient to perform the proper accessibility check, such as for
-- allocators in nested subprograms or accept statements initialized by
-- class-wide formals when the actual originates outside at a deeper
-- static level. The nested subprogram case might require passing
-- accessibility levels along with class-wide parameters, and the task
-- case seems to be an actual gap in the language rules that needs to
-- be fixed by the ARG. ???
-------------------------------
-- Apply_Accessibility_Check --
-------------------------------
procedure Apply_Accessibility_Check
(Ref : Node_Id;
Built_In_Place : Boolean := False)
is
Pool_Id : constant Entity_Id := Associated_Storage_Pool (PtrT);
Cond : Node_Id;
Fin_Call : Node_Id;
Free_Stmt : Node_Id;
Obj_Ref : Node_Id;
Stmts : List_Id;
begin
if Ada_Version >= Ada_2005
and then Is_Class_Wide_Type (DesigT)
and then Tagged_Type_Expansion
and then not Scope_Suppress.Suppress (Accessibility_Check)
and then not No_Dynamic_Accessibility_Checks_Enabled (Ref)
and then
(Type_Access_Level (Etype (Exp)) > Type_Access_Level (PtrT)
or else
(Is_Class_Wide_Type (Etype (Exp))
and then Scope (PtrT) /= Current_Scope))
then
-- If the allocator was built in place, Ref is already a reference
-- to the access object initialized to the result of the allocator
-- (see Exp_Ch6.Make_Build_In_Place_Call_In_Allocator). We call
-- Remove_Side_Effects for cases where the build-in-place call may
-- still be the prefix of the reference (to avoid generating
-- duplicate calls). Otherwise, it is the entity associated with
-- the object containing the address of the allocated object.
if Built_In_Place then
Remove_Side_Effects (Ref);
Obj_Ref := New_Copy_Tree (Ref);
else
Obj_Ref := New_Occurrence_Of (Ref, Loc);
end if;
-- For access to interface types we must generate code to displace
-- the pointer to the base of the object since the subsequent code
-- references components located in the TSD of the object (which
-- is associated with the primary dispatch table --see a-tags.ads)
-- and also generates code invoking Free, which requires also a
-- reference to the base of the unallocated object.
if Is_Interface (DesigT) and then Tagged_Type_Expansion then
Obj_Ref :=
Unchecked_Convert_To (Etype (Obj_Ref),
Make_Function_Call (Loc,
Name =>
New_Occurrence_Of (RTE (RE_Base_Address), Loc),
Parameter_Associations => New_List (
Unchecked_Convert_To (RTE (RE_Address),
New_Copy_Tree (Obj_Ref)))));
end if;
-- Step 1: Create the object clean up code
Stmts := New_List;
-- Deallocate the object if the accessibility check fails. This
-- is done only on targets or profiles that support deallocation.
-- Free (Obj_Ref);
if RTE_Available (RE_Free) then
Free_Stmt := Make_Free_Statement (Loc, New_Copy_Tree (Obj_Ref));
Set_Storage_Pool (Free_Stmt, Pool_Id);
Append_To (Stmts, Free_Stmt);
-- The target or profile cannot deallocate objects
else
Free_Stmt := Empty;
end if;
-- Finalize the object if applicable. Generate:
-- [Deep_]Finalize (Obj_Ref.all);
if Needs_Finalization (DesigT)
and then not No_Heap_Finalization (PtrT)
then
Fin_Call :=
Make_Final_Call
(Obj_Ref =>
Make_Explicit_Dereference (Loc, New_Copy (Obj_Ref)),
Typ => DesigT);
-- Guard against a missing [Deep_]Finalize when the designated
-- type was not properly frozen.
if No (Fin_Call) then
Fin_Call := Make_Null_Statement (Loc);
end if;
-- When the target or profile supports deallocation, wrap the
-- finalization call in a block to ensure proper deallocation
-- even if finalization fails. Generate:
-- begin
-- <Fin_Call>
-- exception
-- when others =>
-- <Free_Stmt>
-- raise;
-- end;
if Present (Free_Stmt) then
Fin_Call :=
Make_Block_Statement (Loc,
Handled_Statement_Sequence =>
Make_Handled_Sequence_Of_Statements (Loc,
Statements => New_List (Fin_Call),
Exception_Handlers => New_List (
Make_Exception_Handler (Loc,
Exception_Choices => New_List (
Make_Others_Choice (Loc)),
Statements => New_List (
New_Copy_Tree (Free_Stmt),
Make_Raise_Statement (Loc))))));
end if;
Prepend_To (Stmts, Fin_Call);
end if;
-- Signal the accessibility failure through a Program_Error
Append_To (Stmts,
Make_Raise_Program_Error (Loc,
Reason => PE_Accessibility_Check_Failed));
-- Step 2: Create the accessibility comparison
-- Generate:
-- Ref'Tag
Obj_Ref :=
Make_Attribute_Reference (Loc,
Prefix => Obj_Ref,
Attribute_Name => Name_Tag);
-- For tagged types, determine the accessibility level by looking
-- at the type specific data of the dispatch table. Generate:
-- Type_Specific_Data (Address (Ref'Tag)).Access_Level
if Tagged_Type_Expansion then
Cond := Build_Get_Access_Level (Loc, Obj_Ref);
-- Use a runtime call to determine the accessibility level when
-- compiling on virtual machine targets. Generate:
-- Get_Access_Level (Ref'Tag)
else
Cond :=
Make_Function_Call (Loc,
Name =>
New_Occurrence_Of (RTE (RE_Get_Access_Level), Loc),
Parameter_Associations => New_List (Obj_Ref));
end if;
Cond :=
Make_Op_Gt (Loc,
Left_Opnd => Cond,
Right_Opnd => Accessibility_Level (N, Dynamic_Level));
-- Due to the complexity and side effects of the check, utilize an
-- if statement instead of the regular Program_Error circuitry.
Insert_Action (N,
Make_Implicit_If_Statement (N,
Condition => Cond,
Then_Statements => Stmts));
end if;
end Apply_Accessibility_Check;
-- Local variables
Indic : constant Node_Id := Subtype_Mark (Expression (N));
T : constant Entity_Id := Entity (Indic);
Adj_Call : Node_Id;
Aggr_In_Place : Boolean;
Node : Node_Id;
Tag_Assign : Node_Id;
Temp : Entity_Id;
Temp_Decl : Node_Id;
TagT : Entity_Id := Empty;
-- Type used as source for tag assignment
TagR : Node_Id := Empty;
-- Target reference for tag assignment
-- Start of processing for Expand_Allocator_Expression
begin
-- Handle call to C++ constructor
if Is_CPP_Constructor_Call (Exp) then
Make_CPP_Constructor_Call_In_Allocator
(Allocator => N,
Function_Call => Exp);
return;
end if;
-- If we have:
-- type A is access T1;
-- X : A := new T2'(...);
-- T1 and T2 can be different subtypes, and we might need to check
-- both constraints. First check against the type of the qualified
-- expression.
Apply_Constraint_Check (Exp, T, No_Sliding => True);
Apply_Predicate_Check (Exp, T);
-- Check that any anonymous access discriminants are suitable
-- for use in an allocator.
-- Note: This check is performed here instead of during analysis so that
-- we can check against the fully resolved etype of Exp.
if Is_Entity_Name (Exp)
and then Has_Anonymous_Access_Discriminant (Etype (Exp))
and then Static_Accessibility_Level (Exp, Object_Decl_Level)
> Static_Accessibility_Level (N, Object_Decl_Level)
then
-- A dynamic check and a warning are generated when we are within
-- an instance.
if In_Instance then
Insert_Action (N,
Make_Raise_Program_Error (Loc,
Reason => PE_Accessibility_Check_Failed));
Error_Msg_N ("anonymous access discriminant is too deep for use"
& " in allocator<<", N);
Error_Msg_N ("\Program_Error [<<", N);
-- Otherwise, make the error static
else
Error_Msg_N ("anonymous access discriminant is too deep for use"
& " in allocator", N);
end if;
end if;
if Do_Range_Check (Exp) then
Generate_Range_Check (Exp, T, CE_Range_Check_Failed);
end if;
-- A check is also needed in cases where the designated subtype is
-- constrained and differs from the subtype given in the qualified
-- expression. Note that the check on the qualified expression does
-- not allow sliding, but this check does (a relaxation from Ada 83).
if Is_Constrained (DesigT)
and then not Subtypes_Statically_Match (T, DesigT)
then
Apply_Constraint_Check (Exp, DesigT, No_Sliding => False);
Apply_Predicate_Check (Exp, DesigT);
if Do_Range_Check (Exp) then
Generate_Range_Check (Exp, DesigT, CE_Range_Check_Failed);
end if;
end if;
if Nkind (Exp) = N_Raise_Constraint_Error then
Rewrite (N, New_Copy (Exp));
Set_Etype (N, PtrT);
return;
end if;
Aggr_In_Place := Is_Delayed_Aggregate (Exp);
-- Case of tagged type or type requiring finalization
if Is_Tagged_Type (T) or else Needs_Finalization (T) then
-- Ada 2005 (AI-318-02): If the initialization expression is a call
-- to a build-in-place function, then access to the allocated object
-- must be passed to the function.
if Is_Build_In_Place_Function_Call (Exp) then
Make_Build_In_Place_Call_In_Allocator (N, Exp);
Apply_Accessibility_Check (N, Built_In_Place => True);
return;
-- Ada 2005 (AI-318-02): Specialization of the previous case for
-- expressions containing a build-in-place function call whose
-- returned object covers interface types, and Expr has calls to
-- Ada.Tags.Displace to displace the pointer to the returned build-
-- in-place object to reference the secondary dispatch table of a
-- covered interface type.
elsif Present (Unqual_BIP_Iface_Function_Call (Exp)) then
Make_Build_In_Place_Iface_Call_In_Allocator (N, Exp);
Apply_Accessibility_Check (N, Built_In_Place => True);
return;
end if;
-- Actions inserted before:
-- Temp : constant ptr_T := new T'(Expression);
-- Temp._tag = T'tag; -- when not class-wide
-- [Deep_]Adjust (Temp.all);
-- We analyze by hand the new internal allocator to avoid any
-- recursion and inappropriate call to Initialize.
-- We don't want to remove side effects when the expression must be
-- built in place. In the case of a build-in-place function call,
-- that could lead to a duplication of the call, which was already
-- substituted for the allocator.
if not Aggr_In_Place then
Remove_Side_Effects (Exp);
end if;
Temp := Make_Temporary (Loc, 'P', N);
-- For a class wide allocation generate the following code:
-- type Equiv_Record is record ... end record;
-- implicit subtype CW is <Class_Wide_Subytpe>;
-- temp : PtrT := new CW'(CW!(expr));
if Is_Class_Wide_Type (T) then
Expand_Subtype_From_Expr (Empty, T, Indic, Exp);
-- Ada 2005 (AI-251): If the expression is a class-wide interface
-- object we generate code to move up "this" to reference the
-- base of the object before allocating the new object.
-- Note that Exp'Address is recursively expanded into a call
-- to Base_Address (Exp.Tag)
if Is_Class_Wide_Type (Etype (Exp))
and then Is_Interface (Etype (Exp))
and then Tagged_Type_Expansion
then
Set_Expression
(Expression (N),
Unchecked_Convert_To (Entity (Indic),
Make_Explicit_Dereference (Loc,
Unchecked_Convert_To (RTE (RE_Tag_Ptr),
Make_Attribute_Reference (Loc,
Prefix => Exp,
Attribute_Name => Name_Address)))));
else
Set_Expression
(Expression (N),
Unchecked_Convert_To (Entity (Indic), Exp));
end if;
Analyze_And_Resolve (Expression (N), Entity (Indic));
end if;
-- Processing for allocators returning non-interface types
if not Is_Interface (Directly_Designated_Type (PtrT)) then
if Aggr_In_Place then
Temp_Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Temp,
Object_Definition => New_Occurrence_Of (PtrT, Loc),
Expression =>
Make_Allocator (Loc,
Expression =>
New_Occurrence_Of (Etype (Exp), Loc)));
-- Copy the Comes_From_Source flag for the allocator we just
-- built, since logically this allocator is a replacement of
-- the original allocator node. This is for proper handling of
-- restriction No_Implicit_Heap_Allocations.
Preserve_Comes_From_Source
(Expression (Temp_Decl), N);
Set_No_Initialization (Expression (Temp_Decl));
Insert_Action (N, Temp_Decl);
Build_Allocate_Deallocate_Proc (Temp_Decl, True);
Convert_Aggr_In_Allocator (N, Temp_Decl, Exp);
else
Node := Relocate_Node (N);
Set_Analyzed (Node);
Temp_Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Temp,
Constant_Present => True,
Object_Definition => New_Occurrence_Of (PtrT, Loc),
Expression => Node);
Insert_Action (N, Temp_Decl);
Build_Allocate_Deallocate_Proc (Temp_Decl, True);
end if;
-- Ada 2005 (AI-251): Handle allocators whose designated type is an
-- interface type. In this case we use the type of the qualified
-- expression to allocate the object.
else
declare
Def_Id : constant Entity_Id := Make_Temporary (Loc, 'T');
New_Decl : Node_Id;
begin
New_Decl :=
Make_Full_Type_Declaration (Loc,
Defining_Identifier => Def_Id,
Type_Definition =>
Make_Access_To_Object_Definition (Loc,
All_Present => True,
Null_Exclusion_Present => False,
Constant_Present =>
Is_Access_Constant (Etype (N)),
Subtype_Indication =>
New_Occurrence_Of (Etype (Exp), Loc)));
Insert_Action (N, New_Decl);
-- Inherit the allocation-related attributes from the original
-- access type.
Set_Finalization_Master
(Def_Id, Finalization_Master (PtrT));
Set_Associated_Storage_Pool
(Def_Id, Associated_Storage_Pool (PtrT));
-- Declare the object using the previous type declaration
if Aggr_In_Place then
Temp_Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Temp,
Object_Definition => New_Occurrence_Of (Def_Id, Loc),
Expression =>
Make_Allocator (Loc,
New_Occurrence_Of (Etype (Exp), Loc)));
-- Copy the Comes_From_Source flag for the allocator we just
-- built, since logically this allocator is a replacement of
-- the original allocator node. This is for proper handling
-- of restriction No_Implicit_Heap_Allocations.
Set_Comes_From_Source
(Expression (Temp_Decl), Comes_From_Source (N));
Set_No_Initialization (Expression (Temp_Decl));
Insert_Action (N, Temp_Decl);
Build_Allocate_Deallocate_Proc (Temp_Decl, True);
Convert_Aggr_In_Allocator (N, Temp_Decl, Exp);
else
Node := Relocate_Node (N);
Set_Analyzed (Node);
Temp_Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Temp,
Constant_Present => True,
Object_Definition => New_Occurrence_Of (Def_Id, Loc),
Expression => Node);
Insert_Action (N, Temp_Decl);
Build_Allocate_Deallocate_Proc (Temp_Decl, True);
end if;
-- Generate an additional object containing the address of the
-- returned object. The type of this second object declaration
-- is the correct type required for the common processing that
-- is still performed by this subprogram. The displacement of
-- this pointer to reference the component associated with the
-- interface type will be done at the end of common processing.
New_Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Make_Temporary (Loc, 'P'),
Object_Definition => New_Occurrence_Of (PtrT, Loc),
Expression =>
Unchecked_Convert_To (PtrT,
New_Occurrence_Of (Temp, Loc)));
Insert_Action (N, New_Decl);
Temp_Decl := New_Decl;
Temp := Defining_Identifier (New_Decl);
end;
end if;
-- Generate the tag assignment
-- Suppress the tag assignment for VM targets because VM tags are
-- represented implicitly in objects.
if not Tagged_Type_Expansion then
null;
-- Ada 2005 (AI-251): Suppress the tag assignment with class-wide
-- interface objects because in this case the tag does not change.
elsif Is_Interface (Directly_Designated_Type (Etype (N))) then
pragma Assert (Is_Class_Wide_Type
(Directly_Designated_Type (Etype (N))));
null;
elsif Is_Tagged_Type (T) and then not Is_Class_Wide_Type (T) then
TagT := T;
TagR :=
Make_Explicit_Dereference (Loc,
Prefix => New_Occurrence_Of (Temp, Loc));
elsif Is_Private_Type (T)
and then Is_Tagged_Type (Underlying_Type (T))
then
TagT := Underlying_Type (T);
TagR :=
Unchecked_Convert_To (Underlying_Type (T),
Make_Explicit_Dereference (Loc,
Prefix => New_Occurrence_Of (Temp, Loc)));
end if;
if Present (TagT) then
declare
Full_T : constant Entity_Id := Underlying_Type (TagT);
begin
Tag_Assign :=
Make_Assignment_Statement (Loc,
Name =>
Make_Selected_Component (Loc,
Prefix => TagR,
Selector_Name =>
New_Occurrence_Of
(First_Tag_Component (Full_T), Loc)),
Expression =>
Unchecked_Convert_To (RTE (RE_Tag),
New_Occurrence_Of
(Elists.Node
(First_Elmt (Access_Disp_Table (Full_T))), Loc)));
end;
-- The previous assignment has to be done in any case
Set_Assignment_OK (Name (Tag_Assign));
Insert_Action (N, Tag_Assign);
end if;
-- Generate an Adjust call if the object will be moved. In Ada 2005,
-- the object may be inherently limited, in which case there is no
-- Adjust procedure, and the object is built in place. In Ada 95, the
-- object can be limited but not inherently limited if this allocator
-- came from a return statement (we're allocating the result on the
-- secondary stack). In that case, the object will be moved, so we do
-- want to Adjust. However, if it's a nonlimited build-in-place
-- function call, Adjust is not wanted.
--
-- Needs_Finalization (DesigT) can differ from Needs_Finalization (T)
-- if one of the two types is class-wide, and the other is not.
if Needs_Finalization (DesigT)
and then Needs_Finalization (T)
and then not Aggr_In_Place
and then not Is_Limited_View (T)
and then not Alloc_For_BIP_Return (N)
and then not Is_Build_In_Place_Function_Call (Expression (N))
then
-- An unchecked conversion is needed in the classwide case because
-- the designated type can be an ancestor of the subtype mark of
-- the allocator.
Adj_Call :=
Make_Adjust_Call
(Obj_Ref =>
Unchecked_Convert_To (T,
Make_Explicit_Dereference (Loc,
Prefix => New_Occurrence_Of (Temp, Loc))),
Typ => T);
if Present (Adj_Call) then
Insert_Action (N, Adj_Call);
end if;
end if;
-- Note: the accessibility check must be inserted after the call to
-- [Deep_]Adjust to ensure proper completion of the assignment.
Apply_Accessibility_Check (Temp);
Rewrite (N, New_Occurrence_Of (Temp, Loc));
Analyze_And_Resolve (N, PtrT);
-- Ada 2005 (AI-251): Displace the pointer to reference the record
-- component containing the secondary dispatch table of the interface
-- type.
if Is_Interface (Directly_Designated_Type (PtrT)) then
Displace_Allocator_Pointer (N);
end if;
-- Always force the generation of a temporary for aggregates when
-- generating C code, to simplify the work in the code generator.
elsif Aggr_In_Place
or else (Modify_Tree_For_C and then Nkind (Exp) = N_Aggregate)
then
Temp := Make_Temporary (Loc, 'P', N);
Temp_Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Temp,
Object_Definition => New_Occurrence_Of (PtrT, Loc),
Expression =>
Make_Allocator (Loc,
Expression => New_Occurrence_Of (Etype (Exp), Loc)));
-- Copy the Comes_From_Source flag for the allocator we just built,
-- since logically this allocator is a replacement of the original
-- allocator node. This is for proper handling of restriction
-- No_Implicit_Heap_Allocations.
Set_Comes_From_Source
(Expression (Temp_Decl), Comes_From_Source (N));
Set_No_Initialization (Expression (Temp_Decl));
Insert_Action (N, Temp_Decl);
Build_Allocate_Deallocate_Proc (Temp_Decl, True);
Convert_Aggr_In_Allocator (N, Temp_Decl, Exp);
Rewrite (N, New_Occurrence_Of (Temp, Loc));
Analyze_And_Resolve (N, PtrT);
elsif Is_Access_Type (T) and then Can_Never_Be_Null (T) then
Install_Null_Excluding_Check (Exp);
elsif Is_Access_Type (DesigT)
and then Nkind (Exp) = N_Allocator
and then Nkind (Expression (Exp)) /= N_Qualified_Expression
then
-- Apply constraint to designated subtype indication
Apply_Constraint_Check
(Expression (Exp), Designated_Type (DesigT), No_Sliding => True);
if Nkind (Expression (Exp)) = N_Raise_Constraint_Error then
-- Propagate constraint_error to enclosing allocator
Rewrite (Exp, New_Copy (Expression (Exp)));
end if;
else
Build_Allocate_Deallocate_Proc (N, True);
-- For an access to unconstrained packed array, GIGI needs to see an
-- expression with a constrained subtype in order to compute the
-- proper size for the allocator.
if Is_Packed_Array (T)
and then not Is_Constrained (T)
then
declare
ConstrT : constant Entity_Id := Make_Temporary (Loc, 'A');
Internal_Exp : constant Node_Id := Relocate_Node (Exp);
begin
Insert_Action (Exp,
Make_Subtype_Declaration (Loc,
Defining_Identifier => ConstrT,
Subtype_Indication =>
Make_Subtype_From_Expr (Internal_Exp, T)));
Freeze_Itype (ConstrT, Exp);
Rewrite (Exp, OK_Convert_To (ConstrT, Internal_Exp));
end;
end if;
-- Ada 2005 (AI-318-02): If the initialization expression is a call
-- to a build-in-place function, then access to the allocated object
-- must be passed to the function.
if Is_Build_In_Place_Function_Call (Exp) then
Make_Build_In_Place_Call_In_Allocator (N, Exp);
end if;
end if;
exception
when RE_Not_Available =>
return;
end Expand_Allocator_Expression;
-----------------------------
-- Expand_Array_Comparison --
-----------------------------
-- Expansion is only required in the case of array types. For the unpacked
-- case, an appropriate runtime routine is called. For packed cases, and
-- also in some other cases where a runtime routine cannot be called, the
-- form of the expansion is:
-- [body for greater_nn; boolean_expression]
-- The body is built by Make_Array_Comparison_Op, and the form of the
-- Boolean expression depends on the operator involved.
procedure Expand_Array_Comparison (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Op1 : Node_Id := Left_Opnd (N);
Op2 : Node_Id := Right_Opnd (N);
Typ1 : constant Entity_Id := Base_Type (Etype (Op1));
Ctyp : constant Entity_Id := Component_Type (Typ1);
Expr : Node_Id;
Func_Body : Node_Id;
Func_Name : Entity_Id;
Comp : RE_Id;
Byte_Addressable : constant Boolean := System_Storage_Unit = Byte'Size;
-- True for byte addressable target
function Length_Less_Than_4 (Opnd : Node_Id) return Boolean;
-- Returns True if the length of the given operand is known to be less
-- than 4. Returns False if this length is known to be four or greater
-- or is not known at compile time.
------------------------
-- Length_Less_Than_4 --
------------------------
function Length_Less_Than_4 (Opnd : Node_Id) return Boolean is
Otyp : constant Entity_Id := Etype (Opnd);
begin
if Ekind (Otyp) = E_String_Literal_Subtype then
return String_Literal_Length (Otyp) < 4;
else
declare
Ityp : constant Entity_Id := Etype (First_Index (Otyp));
Lo : constant Node_Id := Type_Low_Bound (Ityp);
Hi : constant Node_Id := Type_High_Bound (Ityp);
Lov : Uint;
Hiv : Uint;
begin
if Compile_Time_Known_Value (Lo) then
Lov := Expr_Value (Lo);
else
return False;
end if;
if Compile_Time_Known_Value (Hi) then
Hiv := Expr_Value (Hi);
else
return False;
end if;
return Hiv < Lov + 3;
end;
end if;
end Length_Less_Than_4;
-- Start of processing for Expand_Array_Comparison
begin
-- Deal first with unpacked case, where we can call a runtime routine
-- except that we avoid this for targets for which are not addressable
-- by bytes.
if not Is_Bit_Packed_Array (Typ1) and then Byte_Addressable then
-- The call we generate is:
-- Compare_Array_xn[_Unaligned]
-- (left'address, right'address, left'length, right'length) <op> 0
-- x = U for unsigned, S for signed
-- n = 8,16,32,64,128 for component size
-- Add _Unaligned if length < 4 and component size is 8.
-- <op> is the standard comparison operator
if Component_Size (Typ1) = 8 then
if Length_Less_Than_4 (Op1)
or else
Length_Less_Than_4 (Op2)
then
if Is_Unsigned_Type (Ctyp) then
Comp := RE_Compare_Array_U8_Unaligned;
else
Comp := RE_Compare_Array_S8_Unaligned;
end if;
else
if Is_Unsigned_Type (Ctyp) then
Comp := RE_Compare_Array_U8;
else
Comp := RE_Compare_Array_S8;
end if;
end if;
elsif Component_Size (Typ1) = 16 then
if Is_Unsigned_Type (Ctyp) then
Comp := RE_Compare_Array_U16;
else
Comp := RE_Compare_Array_S16;
end if;
elsif Component_Size (Typ1) = 32 then
if Is_Unsigned_Type (Ctyp) then
Comp := RE_Compare_Array_U32;
else
Comp := RE_Compare_Array_S32;
end if;
elsif Component_Size (Typ1) = 64 then
if Is_Unsigned_Type (Ctyp) then
Comp := RE_Compare_Array_U64;
else
Comp := RE_Compare_Array_S64;
end if;
else pragma Assert (Component_Size (Typ1) = 128);
if Is_Unsigned_Type (Ctyp) then
Comp := RE_Compare_Array_U128;
else
Comp := RE_Compare_Array_S128;
end if;
end if;
if RTE_Available (Comp) then
-- Expand to a call only if the runtime function is available,
-- otherwise fall back to inline code.
Remove_Side_Effects (Op1, Name_Req => True);
Remove_Side_Effects (Op2, Name_Req => True);
Rewrite (Op1,
Make_Function_Call (Sloc (Op1),
Name => New_Occurrence_Of (RTE (Comp), Loc),
Parameter_Associations => New_List (
Make_Attribute_Reference (Loc,
Prefix => Relocate_Node (Op1),
Attribute_Name => Name_Address),
Make_Attribute_Reference (Loc,
Prefix => Relocate_Node (Op2),
Attribute_Name => Name_Address),
Make_Attribute_Reference (Loc,
Prefix => Relocate_Node (Op1),
Attribute_Name => Name_Length),
Make_Attribute_Reference (Loc,
Prefix => Relocate_Node (Op2),
Attribute_Name => Name_Length))));
Rewrite (Op2,
Make_Integer_Literal (Sloc (Op2),
Intval => Uint_0));
Analyze_And_Resolve (Op1, Standard_Integer);
Analyze_And_Resolve (Op2, Standard_Integer);
return;
end if;
end if;
-- Cases where we cannot make runtime call
-- For (a <= b) we convert to not (a > b)
if Chars (N) = Name_Op_Le then
Rewrite (N,
Make_Op_Not (Loc,
Right_Opnd =>
Make_Op_Gt (Loc,
Left_Opnd => Op1,
Right_Opnd => Op2)));
Analyze_And_Resolve (N, Standard_Boolean);
return;
-- For < the Boolean expression is
-- greater__nn (op2, op1)
elsif Chars (N) = Name_Op_Lt then
Func_Body := Make_Array_Comparison_Op (Typ1, N);
-- Switch operands
Op1 := Right_Opnd (N);
Op2 := Left_Opnd (N);
-- For (a >= b) we convert to not (a < b)
elsif Chars (N) = Name_Op_Ge then
Rewrite (N,
Make_Op_Not (Loc,
Right_Opnd =>
Make_Op_Lt (Loc,
Left_Opnd => Op1,
Right_Opnd => Op2)));
Analyze_And_Resolve (N, Standard_Boolean);
return;
-- For > the Boolean expression is
-- greater__nn (op1, op2)
else
pragma Assert (Chars (N) = Name_Op_Gt);
Func_Body := Make_Array_Comparison_Op (Typ1, N);
end if;
Func_Name := Defining_Unit_Name (Specification (Func_Body));
Expr :=
Make_Function_Call (Loc,
Name => New_Occurrence_Of (Func_Name, Loc),
Parameter_Associations => New_List (Op1, Op2));
Insert_Action (N, Func_Body);
Rewrite (N, Expr);
Analyze_And_Resolve (N, Standard_Boolean);
end Expand_Array_Comparison;
---------------------------
-- Expand_Array_Equality --
---------------------------
-- Expand an equality function for multi-dimensional arrays. Here is an
-- example of such a function for Nb_Dimension = 2
-- function Enn (A : atyp; B : btyp) return boolean is
-- begin
-- if (A'length (1) = 0 or else A'length (2) = 0)
-- and then
-- (B'length (1) = 0 or else B'length (2) = 0)
-- then
-- return true; -- RM 4.5.2(22)
-- end if;
-- if A'length (1) /= B'length (1)
-- or else
-- A'length (2) /= B'length (2)
-- then
-- return false; -- RM 4.5.2(23)
-- end if;
-- declare
-- A1 : Index_T1 := A'first (1);
-- B1 : Index_T1 := B'first (1);
-- begin
-- loop
-- declare
-- A2 : Index_T2 := A'first (2);
-- B2 : Index_T2 := B'first (2);
-- begin
-- loop
-- if A (A1, A2) /= B (B1, B2) then
-- return False;
-- end if;
-- exit when A2 = A'last (2);
-- A2 := Index_T2'succ (A2);
-- B2 := Index_T2'succ (B2);
-- end loop;
-- end;
-- exit when A1 = A'last (1);
-- A1 := Index_T1'succ (A1);
-- B1 := Index_T1'succ (B1);
-- end loop;
-- end;
-- return true;
-- end Enn;
-- Note on the formal types used (atyp and btyp). If either of the arrays
-- is of a private type, we use the underlying type, and do an unchecked
-- conversion of the actual. If either of the arrays has a bound depending
-- on a discriminant, then we use the base type since otherwise we have an
-- escaped discriminant in the function.
-- If both arrays are constrained and have the same bounds, we can generate
-- a loop with an explicit iteration scheme using a 'Range attribute over
-- the first array.
function Expand_Array_Equality
(Nod : Node_Id;
Lhs : Node_Id;
Rhs : Node_Id;
Bodies : List_Id;
Typ : Entity_Id) return Node_Id
is
Loc : constant Source_Ptr := Sloc (Nod);
Decls : constant List_Id := New_List;
Index_List1 : constant List_Id := New_List;
Index_List2 : constant List_Id := New_List;
First_Idx : Node_Id;
Formals : List_Id;
Func_Name : Entity_Id;
Func_Body : Node_Id;
A : constant Entity_Id := Make_Defining_Identifier (Loc, Name_uA);
B : constant Entity_Id := Make_Defining_Identifier (Loc, Name_uB);
Ltyp : Entity_Id;
Rtyp : Entity_Id;
-- The parameter types to be used for the formals
New_Lhs : Node_Id;
New_Rhs : Node_Id;
-- The LHS and RHS converted to the parameter types
function Arr_Attr
(Arr : Entity_Id;
Nam : Name_Id;
Dim : Pos) return Node_Id;
-- This builds the attribute reference Arr'Nam (Dim)
function Component_Equality (Typ : Entity_Id) return Node_Id;
-- Create one statement to compare corresponding components, designated
-- by a full set of indexes.
function Get_Arg_Type (N : Node_Id) return Entity_Id;
-- Given one of the arguments, computes the appropriate type to be used
-- for that argument in the corresponding function formal
function Handle_One_Dimension
(N : Pos;
Index : Node_Id) return Node_Id;
-- This procedure returns the following code
--
-- declare
-- An : Index_T := A'First (N);
-- Bn : Index_T := B'First (N);
-- begin
-- loop
-- xxx
-- exit when An = A'Last (N);
-- An := Index_T'Succ (An)
-- Bn := Index_T'Succ (Bn)
-- end loop;
-- end;
--
-- If both indexes are constrained and identical, the procedure
-- returns a simpler loop:
--
-- for An in A'Range (N) loop
-- xxx
-- end loop
--
-- N is the dimension for which we are generating a loop. Index is the
-- N'th index node, whose Etype is Index_Type_n in the above code. The
-- xxx statement is either the loop or declare for the next dimension
-- or if this is the last dimension the comparison of corresponding
-- components of the arrays.
--
-- The actual way the code works is to return the comparison of
-- corresponding components for the N+1 call. That's neater.
function Test_Empty_Arrays return Node_Id;
-- This function constructs the test for both arrays being empty
-- (A'length (1) = 0 or else A'length (2) = 0 or else ...)
-- and then
-- (B'length (1) = 0 or else B'length (2) = 0 or else ...)
function Test_Lengths_Correspond return Node_Id;
-- This function constructs the test for arrays having different lengths
-- in at least one index position, in which case the resulting code is:
-- A'length (1) /= B'length (1)
-- or else
-- A'length (2) /= B'length (2)
-- or else
-- ...
--------------
-- Arr_Attr --
--------------
function Arr_Attr
(Arr : Entity_Id;
Nam : Name_Id;
Dim : Pos) return Node_Id
is
begin
return
Make_Attribute_Reference (Loc,
Attribute_Name => Nam,
Prefix => New_Occurrence_Of (Arr, Loc),
Expressions => New_List (Make_Integer_Literal (Loc, Dim)));
end Arr_Attr;
------------------------
-- Component_Equality --
------------------------
function Component_Equality (Typ : Entity_Id) return Node_Id is
Test : Node_Id;
L, R : Node_Id;
begin
-- if a(i1...) /= b(j1...) then return false; end if;
L :=
Make_Indexed_Component (Loc,
Prefix => Make_Identifier (Loc, Chars (A)),
Expressions => Index_List1);
R :=
Make_Indexed_Component (Loc,
Prefix => Make_Identifier (Loc, Chars (B)),
Expressions => Index_List2);
Test := Expand_Composite_Equality (Nod, Component_Type (Typ), L, R);
-- If some (sub)component is an unchecked_union, the whole operation
-- will raise program error.
if Nkind (Test) = N_Raise_Program_Error then
-- This node is going to be inserted at a location where a
-- statement is expected: clear its Etype so analysis will set
-- it to the expected Standard_Void_Type.
Set_Etype (Test, Empty);
return Test;
else
return
Make_Implicit_If_Statement (Nod,
Condition => Make_Op_Not (Loc, Right_Opnd => Test),
Then_Statements => New_List (
Make_Simple_Return_Statement (Loc,
Expression => New_Occurrence_Of (Standard_False, Loc))));
end if;
end Component_Equality;
------------------
-- Get_Arg_Type --
------------------
function Get_Arg_Type (N : Node_Id) return Entity_Id is
T : Entity_Id;
X : Node_Id;
begin
T := Etype (N);
if No (T) then
return Typ;
else
T := Underlying_Type (T);
X := First_Index (T);
while Present (X) loop
if Denotes_Discriminant (Type_Low_Bound (Etype (X)))
or else
Denotes_Discriminant (Type_High_Bound (Etype (X)))
then
T := Base_Type (T);
exit;
end if;
Next_Index (X);
end loop;
return T;
end if;
end Get_Arg_Type;
--------------------------
-- Handle_One_Dimension --
---------------------------
function Handle_One_Dimension
(N : Pos;
Index : Node_Id) return Node_Id
is
Need_Separate_Indexes : constant Boolean :=
Ltyp /= Rtyp or else not Is_Constrained (Ltyp);
-- If the index types are identical, and we are working with
-- constrained types, then we can use the same index for both
-- of the arrays.
An : constant Entity_Id := Make_Temporary (Loc, 'A');
Bn : Entity_Id;
Index_T : Entity_Id;
Stm_List : List_Id;
Loop_Stm : Node_Id;
begin
if N > Number_Dimensions (Ltyp) then
return Component_Equality (Ltyp);
end if;
-- Case where we generate a loop
Index_T := Base_Type (Etype (Index));
if Need_Separate_Indexes then
Bn := Make_Temporary (Loc, 'B');
else
Bn := An;
end if;
Append (New_Occurrence_Of (An, Loc), Index_List1);
Append (New_Occurrence_Of (Bn, Loc), Index_List2);
Stm_List := New_List (
Handle_One_Dimension (N + 1, Next_Index (Index)));
if Need_Separate_Indexes then
-- Generate guard for loop, followed by increments of indexes
Append_To (Stm_List,
Make_Exit_Statement (Loc,
Condition =>
Make_Op_Eq (Loc,
Left_Opnd => New_Occurrence_Of (An, Loc),
Right_Opnd => Arr_Attr (A, Name_Last, N))));
Append_To (Stm_List,
Make_Assignment_Statement (Loc,
Name => New_Occurrence_Of (An, Loc),
Expression =>
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Index_T, Loc),
Attribute_Name => Name_Succ,
Expressions => New_List (
New_Occurrence_Of (An, Loc)))));
Append_To (Stm_List,
Make_Assignment_Statement (Loc,
Name => New_Occurrence_Of (Bn, Loc),
Expression =>
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Index_T, Loc),
Attribute_Name => Name_Succ,
Expressions => New_List (
New_Occurrence_Of (Bn, Loc)))));
end if;
-- If separate indexes, we need a declare block for An and Bn, and a
-- loop without an iteration scheme.
if Need_Separate_Indexes then
Loop_Stm :=
Make_Implicit_Loop_Statement (Nod, Statements => Stm_List);
return
Make_Block_Statement (Loc,
Declarations => New_List (
Make_Object_Declaration (Loc,
Defining_Identifier => An,
Object_Definition => New_Occurrence_Of (Index_T, Loc),
Expression => Arr_Attr (A, Name_First, N)),
Make_Object_Declaration (Loc,
Defining_Identifier => Bn,
Object_Definition => New_Occurrence_Of (Index_T, Loc),
Expression => Arr_Attr (B, Name_First, N))),
Handled_Statement_Sequence =>
Make_Handled_Sequence_Of_Statements (Loc,
Statements => New_List (Loop_Stm)));
-- If no separate indexes, return loop statement with explicit
-- iteration scheme on its own.
else
Loop_Stm :=
Make_Implicit_Loop_Statement (Nod,
Statements => Stm_List,
Iteration_Scheme =>
Make_Iteration_Scheme (Loc,
Loop_Parameter_Specification =>
Make_Loop_Parameter_Specification (Loc,
Defining_Identifier => An,
Discrete_Subtype_Definition =>
Arr_Attr (A, Name_Range, N))));
return Loop_Stm;
end if;
end Handle_One_Dimension;
-----------------------
-- Test_Empty_Arrays --
-----------------------
function Test_Empty_Arrays return Node_Id is
Alist : Node_Id := Empty;
Blist : Node_Id := Empty;
begin
for J in 1 .. Number_Dimensions (Ltyp) loop
Evolve_Or_Else (Alist,
Make_Op_Eq (Loc,
Left_Opnd => Arr_Attr (A, Name_Length, J),
Right_Opnd => Make_Integer_Literal (Loc, Uint_0)));
Evolve_Or_Else (Blist,
Make_Op_Eq (Loc,
Left_Opnd => Arr_Attr (B, Name_Length, J),
Right_Opnd => Make_Integer_Literal (Loc, Uint_0)));
end loop;
return
Make_And_Then (Loc,
Left_Opnd => Alist,
Right_Opnd => Blist);
end Test_Empty_Arrays;
-----------------------------
-- Test_Lengths_Correspond --
-----------------------------
function Test_Lengths_Correspond return Node_Id is
Result : Node_Id := Empty;
begin
for J in 1 .. Number_Dimensions (Ltyp) loop
Evolve_Or_Else (Result,
Make_Op_Ne (Loc,
Left_Opnd => Arr_Attr (A, Name_Length, J),
Right_Opnd => Arr_Attr (B, Name_Length, J)));
end loop;
return Result;
end Test_Lengths_Correspond;
-- Start of processing for Expand_Array_Equality
begin
Ltyp := Get_Arg_Type (Lhs);
Rtyp := Get_Arg_Type (Rhs);
-- For now, if the argument types are not the same, go to the base type,
-- since the code assumes that the formals have the same type. This is
-- fixable in future ???
if Ltyp /= Rtyp then
Ltyp := Base_Type (Ltyp);
Rtyp := Base_Type (Rtyp);
pragma Assert (Ltyp = Rtyp);
end if;
-- If the array type is distinct from the type of the arguments, it
-- is the full view of a private type. Apply an unchecked conversion
-- to ensure that analysis of the code below succeeds.
if No (Etype (Lhs))
or else Base_Type (Etype (Lhs)) /= Base_Type (Ltyp)
then
New_Lhs := OK_Convert_To (Ltyp, Lhs);
else
New_Lhs := Lhs;
end if;
if No (Etype (Rhs))
or else Base_Type (Etype (Rhs)) /= Base_Type (Rtyp)
then
New_Rhs := OK_Convert_To (Rtyp, Rhs);
else
New_Rhs := Rhs;
end if;
First_Idx := First_Index (Ltyp);
-- If optimization is enabled and the array boils down to a couple of
-- consecutive elements, generate a simple conjunction of comparisons
-- which should be easier to optimize by the code generator.
if Optimization_Level > 0
and then Ltyp = Rtyp
and then Is_Constrained (Ltyp)
and then Number_Dimensions (Ltyp) = 1
and then Compile_Time_Known_Bounds (Ltyp)
and then Expr_Value (Type_High_Bound (Etype (First_Idx))) =
Expr_Value (Type_Low_Bound (Etype (First_Idx))) + 1
then
declare
Ctyp : constant Entity_Id := Component_Type (Ltyp);
Low_B : constant Node_Id :=
Type_Low_Bound (Etype (First_Idx));
High_B : constant Node_Id :=
Type_High_Bound (Etype (First_Idx));
L, R : Node_Id;
TestL, TestH : Node_Id;
begin
L :=
Make_Indexed_Component (Loc,
Prefix => New_Copy_Tree (New_Lhs),
Expressions => New_List (New_Copy_Tree (Low_B)));
R :=
Make_Indexed_Component (Loc,
Prefix => New_Copy_Tree (New_Rhs),
Expressions => New_List (New_Copy_Tree (Low_B)));
TestL := Expand_Composite_Equality (Nod, Ctyp, L, R);
L :=
Make_Indexed_Component (Loc,
Prefix => New_Lhs,
Expressions => New_List (New_Copy_Tree (High_B)));
R :=
Make_Indexed_Component (Loc,
Prefix => New_Rhs,
Expressions => New_List (New_Copy_Tree (High_B)));
TestH := Expand_Composite_Equality (Nod, Ctyp, L, R);
return
Make_And_Then (Loc, Left_Opnd => TestL, Right_Opnd => TestH);
end;
end if;
-- Build list of formals for function
Formals := New_List (
Make_Parameter_Specification (Loc,
Defining_Identifier => A,
Parameter_Type => New_Occurrence_Of (Ltyp, Loc)),
Make_Parameter_Specification (Loc,
Defining_Identifier => B,
Parameter_Type => New_Occurrence_Of (Rtyp, Loc)));
Func_Name := Make_Temporary (Loc, 'E');
-- Build statement sequence for function
Func_Body :=
Make_Subprogram_Body (Loc,
Specification =>
Make_Function_Specification (Loc,
Defining_Unit_Name => Func_Name,
Parameter_Specifications => Formals,
Result_Definition => New_Occurrence_Of (Standard_Boolean, Loc)),
Declarations => Decls,
Handled_Statement_Sequence =>
Make_Handled_Sequence_Of_Statements (Loc,
Statements => New_List (
Make_Implicit_If_Statement (Nod,
Condition => Test_Empty_Arrays,
Then_Statements => New_List (
Make_Simple_Return_Statement (Loc,
Expression =>
New_Occurrence_Of (Standard_True, Loc)))),
Make_Implicit_If_Statement (Nod,
Condition => Test_Lengths_Correspond,
Then_Statements => New_List (
Make_Simple_Return_Statement (Loc,
Expression => New_Occurrence_Of (Standard_False, Loc)))),
Handle_One_Dimension (1, First_Idx),
Make_Simple_Return_Statement (Loc,
Expression => New_Occurrence_Of (Standard_True, Loc)))));
Set_Has_Completion (Func_Name, True);
Set_Is_Inlined (Func_Name);
Append_To (Bodies, Func_Body);
return
Make_Function_Call (Loc,
Name => New_Occurrence_Of (Func_Name, Loc),
Parameter_Associations => New_List (New_Lhs, New_Rhs));
end Expand_Array_Equality;
-----------------------------
-- Expand_Boolean_Operator --
-----------------------------
-- Note that we first get the actual subtypes of the operands, since we
-- always want to deal with types that have bounds.
procedure Expand_Boolean_Operator (N : Node_Id) is
Typ : constant Entity_Id := Etype (N);
begin
-- Special case of bit packed array where both operands are known to be
-- properly aligned. In this case we use an efficient run time routine
-- to carry out the operation (see System.Bit_Ops).
if Is_Bit_Packed_Array (Typ)
and then not Is_Possibly_Unaligned_Object (Left_Opnd (N))
and then not Is_Possibly_Unaligned_Object (Right_Opnd (N))
then
Expand_Packed_Boolean_Operator (N);
return;
end if;
-- For the normal non-packed case, the general expansion is to build
-- function for carrying out the comparison (use Make_Boolean_Array_Op)
-- and then inserting it into the tree. The original operator node is
-- then rewritten as a call to this function. We also use this in the
-- packed case if either operand is a possibly unaligned object.
declare
Loc : constant Source_Ptr := Sloc (N);
L : constant Node_Id := Relocate_Node (Left_Opnd (N));
R : Node_Id := Relocate_Node (Right_Opnd (N));
Func_Body : Node_Id;
Func_Name : Entity_Id;
begin
Convert_To_Actual_Subtype (L);
Convert_To_Actual_Subtype (R);
Ensure_Defined (Etype (L), N);
Ensure_Defined (Etype (R), N);
Apply_Length_Check (R, Etype (L));
if Nkind (N) = N_Op_Xor then
R := Duplicate_Subexpr (R);
Silly_Boolean_Array_Xor_Test (N, R, Etype (L));
end if;
if Nkind (Parent (N)) = N_Assignment_Statement
and then Safe_In_Place_Array_Op (Name (Parent (N)), L, R)
then
Build_Boolean_Array_Proc_Call (Parent (N), L, R);
elsif Nkind (Parent (N)) = N_Op_Not
and then Nkind (N) = N_Op_And
and then Nkind (Parent (Parent (N))) = N_Assignment_Statement
and then Safe_In_Place_Array_Op (Name (Parent (Parent (N))), L, R)
then
return;
else
Func_Body := Make_Boolean_Array_Op (Etype (L), N);
Func_Name := Defining_Unit_Name (Specification (Func_Body));
Insert_Action (N, Func_Body);
-- Now rewrite the expression with a call
if Transform_Function_Array then
declare
Temp_Id : constant Entity_Id := Make_Temporary (Loc, 'T');
Call : Node_Id;
Decl : Node_Id;
begin
-- Generate:
-- Temp : ...;
Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Temp_Id,
Object_Definition =>
New_Occurrence_Of (Etype (L), Loc));
-- Generate:
-- Proc_Call (L, R, Temp);
Call :=
Make_Procedure_Call_Statement (Loc,
Name => New_Occurrence_Of (Func_Name, Loc),
Parameter_Associations =>
New_List (
L,
Make_Type_Conversion
(Loc, New_Occurrence_Of (Etype (L), Loc), R),
New_Occurrence_Of (Temp_Id, Loc)));
Insert_Actions (Parent (N), New_List (Decl, Call));
Rewrite (N, New_Occurrence_Of (Temp_Id, Loc));
end;
else
Rewrite (N,
Make_Function_Call (Loc,
Name => New_Occurrence_Of (Func_Name, Loc),
Parameter_Associations =>
New_List (
L,
Make_Type_Conversion
(Loc, New_Occurrence_Of (Etype (L), Loc), R))));
end if;
Analyze_And_Resolve (N, Typ);
end if;
end;
end Expand_Boolean_Operator;
------------------------------------------------
-- Expand_Compare_Minimize_Eliminate_Overflow --
------------------------------------------------
procedure Expand_Compare_Minimize_Eliminate_Overflow (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Result_Type : constant Entity_Id := Etype (N);
-- Capture result type (could be a derived boolean type)
Llo, Lhi : Uint;
Rlo, Rhi : Uint;
LLIB : constant Entity_Id := Base_Type (Standard_Long_Long_Integer);
-- Entity for Long_Long_Integer'Base
procedure Set_True;
procedure Set_False;
-- These procedures rewrite N with an occurrence of Standard_True or
-- Standard_False, and then makes a call to Warn_On_Known_Condition.
---------------
-- Set_False --
---------------
procedure Set_False is
begin
Rewrite (N, New_Occurrence_Of (Standard_False, Loc));
Warn_On_Known_Condition (N);
end Set_False;
--------------
-- Set_True --
--------------
procedure Set_True is
begin
Rewrite (N, New_Occurrence_Of (Standard_True, Loc));
Warn_On_Known_Condition (N);
end Set_True;
-- Start of processing for Expand_Compare_Minimize_Eliminate_Overflow
begin
-- OK, this is the case we are interested in. First step is to process
-- our operands using the Minimize_Eliminate circuitry which applies
-- this processing to the two operand subtrees.
Minimize_Eliminate_Overflows
(Left_Opnd (N), Llo, Lhi, Top_Level => False);
Minimize_Eliminate_Overflows
(Right_Opnd (N), Rlo, Rhi, Top_Level => False);
-- See if the range information decides the result of the comparison.
-- We can only do this if we in fact have full range information (which
-- won't be the case if either operand is bignum at this stage).
if Present (Llo) and then Present (Rlo) then
case N_Op_Compare (Nkind (N)) is
when N_Op_Eq =>
if Llo = Lhi and then Rlo = Rhi and then Llo = Rlo then
Set_True;
elsif Llo > Rhi or else Lhi < Rlo then
Set_False;
end if;
when N_Op_Ge =>
if Llo >= Rhi then
Set_True;
elsif Lhi < Rlo then
Set_False;
end if;
when N_Op_Gt =>
if Llo > Rhi then
Set_True;
elsif Lhi <= Rlo then
Set_False;
end if;
when N_Op_Le =>
if Llo > Rhi then
Set_False;
elsif Lhi <= Rlo then
Set_True;
end if;
when N_Op_Lt =>
if Llo >= Rhi then
Set_False;
elsif Lhi < Rlo then
Set_True;
end if;
when N_Op_Ne =>
if Llo = Lhi and then Rlo = Rhi and then Llo = Rlo then
Set_False;
elsif Llo > Rhi or else Lhi < Rlo then
Set_True;
end if;
end case;
-- All done if we did the rewrite
if Nkind (N) not in N_Op_Compare then
return;
end if;
end if;
-- Otherwise, time to do the comparison
declare
Ltype : constant Entity_Id := Etype (Left_Opnd (N));
Rtype : constant Entity_Id := Etype (Right_Opnd (N));
begin
-- If the two operands have the same signed integer type we are
-- all set, nothing more to do. This is the case where either
-- both operands were unchanged, or we rewrote both of them to
-- be Long_Long_Integer.
-- Note: Entity for the comparison may be wrong, but it's not worth
-- the effort to change it, since the back end does not use it.
if Is_Signed_Integer_Type (Ltype)
and then Base_Type (Ltype) = Base_Type (Rtype)
then
return;
-- Here if bignums are involved (can only happen in ELIMINATED mode)
elsif Is_RTE (Ltype, RE_Bignum) or else Is_RTE (Rtype, RE_Bignum) then
declare
Left : Node_Id := Left_Opnd (N);
Right : Node_Id := Right_Opnd (N);
-- Bignum references for left and right operands
begin
if not Is_RTE (Ltype, RE_Bignum) then
Left := Convert_To_Bignum (Left);
elsif not Is_RTE (Rtype, RE_Bignum) then
Right := Convert_To_Bignum (Right);
end if;
-- We rewrite our node with:
-- do
-- Bnn : Result_Type;
-- declare
-- M : Mark_Id := SS_Mark;
-- begin
-- Bnn := Big_xx (Left, Right); (xx = EQ, NT etc)
-- SS_Release (M);
-- end;
-- in
-- Bnn
-- end
declare
Blk : constant Node_Id := Make_Bignum_Block (Loc);
Bnn : constant Entity_Id := Make_Temporary (Loc, 'B', N);
Ent : RE_Id;
begin
case N_Op_Compare (Nkind (N)) is
when N_Op_Eq => Ent := RE_Big_EQ;
when N_Op_Ge => Ent := RE_Big_GE;
when N_Op_Gt => Ent := RE_Big_GT;
when N_Op_Le => Ent := RE_Big_LE;
when N_Op_Lt => Ent := RE_Big_LT;
when N_Op_Ne => Ent := RE_Big_NE;
end case;
-- Insert assignment to Bnn into the bignum block
Insert_Before
(First (Statements (Handled_Statement_Sequence (Blk))),
Make_Assignment_Statement (Loc,
Name => New_Occurrence_Of (Bnn, Loc),
Expression =>
Make_Function_Call (Loc,
Name =>
New_Occurrence_Of (RTE (Ent), Loc),
Parameter_Associations => New_List (Left, Right))));
-- Now do the rewrite with expression actions
Rewrite (N,
Make_Expression_With_Actions (Loc,
Actions => New_List (
Make_Object_Declaration (Loc,
Defining_Identifier => Bnn,
Object_Definition =>
New_Occurrence_Of (Result_Type, Loc)),
Blk),
Expression => New_Occurrence_Of (Bnn, Loc)));
Analyze_And_Resolve (N, Result_Type);
end;
end;
-- No bignums involved, but types are different, so we must have
-- rewritten one of the operands as a Long_Long_Integer but not
-- the other one.
-- If left operand is Long_Long_Integer, convert right operand
-- and we are done (with a comparison of two Long_Long_Integers).
elsif Ltype = LLIB then
Convert_To_And_Rewrite (LLIB, Right_Opnd (N));
Analyze_And_Resolve (Right_Opnd (N), LLIB, Suppress => All_Checks);
return;
-- If right operand is Long_Long_Integer, convert left operand
-- and we are done (with a comparison of two Long_Long_Integers).
-- This is the only remaining possibility
else pragma Assert (Rtype = LLIB);
Convert_To_And_Rewrite (LLIB, Left_Opnd (N));
Analyze_And_Resolve (Left_Opnd (N), LLIB, Suppress => All_Checks);
return;
end if;
end;
end Expand_Compare_Minimize_Eliminate_Overflow;
-------------------------------
-- Expand_Composite_Equality --
-------------------------------
-- This function is only called for comparing internal fields of composite
-- types when these fields are themselves composites. This is a special
-- case because it is not possible to respect normal Ada visibility rules.
function Expand_Composite_Equality
(Nod : Node_Id;
Typ : Entity_Id;
Lhs : Node_Id;
Rhs : Node_Id) return Node_Id
is
Loc : constant Source_Ptr := Sloc (Nod);
Full_Type : Entity_Id;
Eq_Op : Entity_Id;
begin
if Is_Private_Type (Typ) then
Full_Type := Underlying_Type (Typ);
else
Full_Type := Typ;
end if;
-- If the private type has no completion the context may be the
-- expansion of a composite equality for a composite type with some
-- still incomplete components. The expression will not be analyzed
-- until the enclosing type is completed, at which point this will be
-- properly expanded, unless there is a bona fide completion error.
if No (Full_Type) then
return Make_Op_Eq (Loc, Left_Opnd => Lhs, Right_Opnd => Rhs);
end if;
Full_Type := Base_Type (Full_Type);
-- When the base type itself is private, use the full view to expand
-- the composite equality.
if Is_Private_Type (Full_Type) then
Full_Type := Underlying_Type (Full_Type);
end if;
-- Case of tagged record types
if Is_Tagged_Type (Full_Type) then
Eq_Op := Find_Primitive_Eq (Typ);
pragma Assert (Present (Eq_Op));
return
Make_Function_Call (Loc,
Name => New_Occurrence_Of (Eq_Op, Loc),
Parameter_Associations =>
New_List
(Unchecked_Convert_To (Etype (First_Formal (Eq_Op)), Lhs),
Unchecked_Convert_To (Etype (First_Formal (Eq_Op)), Rhs)));
-- Case of untagged record types
elsif Is_Record_Type (Full_Type) then
Eq_Op := TSS (Full_Type, TSS_Composite_Equality);
if Present (Eq_Op) then
if Etype (First_Formal (Eq_Op)) /= Full_Type then
-- Inherited equality from parent type. Convert the actuals to
-- match signature of operation.
declare
T : constant Entity_Id := Etype (First_Formal (Eq_Op));
begin
return
Make_Function_Call (Loc,
Name => New_Occurrence_Of (Eq_Op, Loc),
Parameter_Associations => New_List (
OK_Convert_To (T, Lhs),
OK_Convert_To (T, Rhs)));
end;
else
-- Comparison between Unchecked_Union components
if Is_Unchecked_Union (Full_Type) then
declare
Lhs_Type : Node_Id := Full_Type;
Rhs_Type : Node_Id := Full_Type;
Lhs_Discr_Val : Node_Id;
Rhs_Discr_Val : Node_Id;
begin
-- Lhs subtype
if Nkind (Lhs) = N_Selected_Component then
Lhs_Type := Etype (Entity (Selector_Name (Lhs)));
end if;
-- Rhs subtype
if Nkind (Rhs) = N_Selected_Component then
Rhs_Type := Etype (Entity (Selector_Name (Rhs)));
end if;
-- Lhs of the composite equality
if Is_Constrained (Lhs_Type) then
-- Since the enclosing record type can never be an
-- Unchecked_Union (this code is executed for records
-- that do not have variants), we may reference its
-- discriminant(s).
if Nkind (Lhs) = N_Selected_Component
and then Has_Per_Object_Constraint
(Entity (Selector_Name (Lhs)))
then
Lhs_Discr_Val :=
Make_Selected_Component (Loc,
Prefix => Prefix (Lhs),
Selector_Name =>
New_Copy
(Get_Discriminant_Value
(First_Discriminant (Lhs_Type),
Lhs_Type,
Stored_Constraint (Lhs_Type))));
else
Lhs_Discr_Val :=
New_Copy
(Get_Discriminant_Value
(First_Discriminant (Lhs_Type),
Lhs_Type,
Stored_Constraint (Lhs_Type)));
end if;
else
-- It is not possible to infer the discriminant since
-- the subtype is not constrained.
return
Make_Raise_Program_Error (Loc,
Reason => PE_Unchecked_Union_Restriction);
end if;
-- Rhs of the composite equality
if Is_Constrained (Rhs_Type) then
if Nkind (Rhs) = N_Selected_Component
and then Has_Per_Object_Constraint
(Entity (Selector_Name (Rhs)))
then
Rhs_Discr_Val :=
Make_Selected_Component (Loc,
Prefix => Prefix (Rhs),
Selector_Name =>
New_Copy
(Get_Discriminant_Value
(First_Discriminant (Rhs_Type),
Rhs_Type,
Stored_Constraint (Rhs_Type))));
else
Rhs_Discr_Val :=
New_Copy
(Get_Discriminant_Value
(First_Discriminant (Rhs_Type),
Rhs_Type,
Stored_Constraint (Rhs_Type)));
end if;
else
return
Make_Raise_Program_Error (Loc,
Reason => PE_Unchecked_Union_Restriction);
end if;
-- Call the TSS equality function with the inferred
-- discriminant values.
return
Make_Function_Call (Loc,
Name => New_Occurrence_Of (Eq_Op, Loc),
Parameter_Associations => New_List (
Lhs,
Rhs,
Lhs_Discr_Val,
Rhs_Discr_Val));
end;
-- All cases other than comparing Unchecked_Union types
else
declare
T : constant Entity_Id := Etype (First_Formal (Eq_Op));
begin
return
Make_Function_Call (Loc,
Name =>
New_Occurrence_Of (Eq_Op, Loc),
Parameter_Associations => New_List (
OK_Convert_To (T, Lhs),
OK_Convert_To (T, Rhs)));
end;
end if;
end if;
-- Equality composes in Ada 2012 for untagged record types. It also
-- composes for bounded strings, because they are part of the
-- predefined environment. We could make it compose for bounded
-- strings by making them tagged, or by making sure all subcomponents
-- are set to the same value, even when not used. Instead, we have
-- this special case in the compiler, because it's more efficient.
elsif Ada_Version >= Ada_2012 or else Is_Bounded_String (Typ) then
-- If no TSS has been created for the type, check whether there is
-- a primitive equality declared for it.
declare
Op : constant Node_Id := Build_Eq_Call (Typ, Loc, Lhs, Rhs);
begin
-- Use user-defined primitive if it exists, otherwise use
-- predefined equality.
if Present (Op) then
return Op;
else
return Make_Op_Eq (Loc, Lhs, Rhs);
end if;
end;
else
return Expand_Record_Equality (Nod, Full_Type, Lhs, Rhs);
end if;
-- Case of non-record types (always use predefined equality)
else
return Make_Op_Eq (Loc, Left_Opnd => Lhs, Right_Opnd => Rhs);
end if;
end Expand_Composite_Equality;
------------------------
-- Expand_Concatenate --
------------------------
procedure Expand_Concatenate (Cnode : Node_Id; Opnds : List_Id) is
Loc : constant Source_Ptr := Sloc (Cnode);
Atyp : constant Entity_Id := Base_Type (Etype (Cnode));
-- Result type of concatenation
Ctyp : constant Entity_Id := Base_Type (Component_Type (Etype (Cnode)));
-- Component type. Elements of this component type can appear as one
-- of the operands of concatenation as well as arrays.
Istyp : constant Entity_Id := Etype (First_Index (Atyp));
-- Index subtype
Ityp : constant Entity_Id := Base_Type (Istyp);
-- Index type. This is the base type of the index subtype, and is used
-- for all computed bounds (which may be out of range of Istyp in the
-- case of null ranges).
Artyp : Entity_Id;
-- This is the type we use to do arithmetic to compute the bounds and
-- lengths of operands. The choice of this type is a little subtle and
-- is discussed in a separate section at the start of the body code.
Result_May_Be_Null : Boolean := True;
-- Reset to False if at least one operand is encountered which is known
-- at compile time to be non-null. Used for handling the special case
-- of setting the high bound to the last operand high bound for a null
-- result, thus ensuring a proper high bound in the super-flat case.
N : constant Nat := List_Length (Opnds);
-- Number of concatenation operands including possibly null operands
NN : Nat := 0;
-- Number of operands excluding any known to be null, except that the
-- last operand is always retained, in case it provides the bounds for
-- a null result.
Opnd : Node_Id := Empty;
-- Current operand being processed in the loop through operands. After
-- this loop is complete, always contains the last operand (which is not
-- the same as Operands (NN), since null operands are skipped).
-- Arrays describing the operands, only the first NN entries of each
-- array are set (NN < N when we exclude known null operands).
Is_Fixed_Length : array (1 .. N) of Boolean;
-- True if length of corresponding operand known at compile time
Operands : array (1 .. N) of Node_Id;
-- Set to the corresponding entry in the Opnds list (but note that null
-- operands are excluded, so not all entries in the list are stored).
Fixed_Length : array (1 .. N) of Uint;
-- Set to length of operand. Entries in this array are set only if the
-- corresponding entry in Is_Fixed_Length is True.
Opnd_Low_Bound : array (1 .. N) of Node_Id;
-- Set to lower bound of operand. Either an integer literal in the case
-- where the bound is known at compile time, else actual lower bound.
-- The operand low bound is of type Ityp.
Var_Length : array (1 .. N) of Entity_Id;
-- Set to an entity of type Natural that contains the length of an
-- operand whose length is not known at compile time. Entries in this
-- array are set only if the corresponding entry in Is_Fixed_Length
-- is False. The entity is of type Artyp.
Aggr_Length : array (0 .. N) of Node_Id;
-- The J'th entry in an expression node that represents the total length
-- of operands 1 through J. It is either an integer literal node, or a
-- reference to a constant entity with the right value, so it is fine
-- to just do a Copy_Node to get an appropriate copy. The extra zeroth
-- entry always is set to zero. The length is of type Artyp.
Low_Bound : Node_Id := Empty;
-- A tree node representing the low bound of the result (of type Ityp).
-- This is either an integer literal node, or an identifier reference to
-- a constant entity initialized to the appropriate value.
Last_Opnd_Low_Bound : Node_Id := Empty;
-- A tree node representing the low bound of the last operand. This
-- need only be set if the result could be null. It is used for the
-- special case of setting the right low bound for a null result.
-- This is of type Ityp.
Last_Opnd_High_Bound : Node_Id := Empty;
-- A tree node representing the high bound of the last operand. This
-- need only be set if the result could be null. It is used for the
-- special case of setting the right high bound for a null result.
-- This is of type Ityp.
High_Bound : Node_Id := Empty;
-- A tree node representing the high bound of the result (of type Ityp)
Result : Node_Id := Empty;
-- Result of the concatenation (of type Ityp)
Actions : constant List_Id := New_List;
-- Collect actions to be inserted
Known_Non_Null_Operand_Seen : Boolean;
-- Set True during generation of the assignments of operands into
-- result once an operand known to be non-null has been seen.
function Library_Level_Target return Boolean;
-- Return True if the concatenation is within the expression of the
-- declaration of a library-level object.
function Make_Artyp_Literal (Val : Nat) return Node_Id;
-- This function makes an N_Integer_Literal node that is returned in
-- analyzed form with the type set to Artyp. Importantly this literal
-- is not flagged as static, so that if we do computations with it that
-- result in statically detected out of range conditions, we will not
-- generate error messages but instead warning messages.
function To_Artyp (X : Node_Id) return Node_Id;
-- Given a node of type Ityp, returns the corresponding value of type
-- Artyp. For non-enumeration types, this is a plain integer conversion.
-- For enum types, the Pos of the value is returned.
function To_Ityp (X : Node_Id) return Node_Id;
-- The inverse function (uses Val in the case of enumeration types)
--------------------------
-- Library_Level_Target --
--------------------------
function Library_Level_Target return Boolean is
P : Node_Id := Parent (Cnode);
begin
while Present (P) loop
if Nkind (P) = N_Object_Declaration then
return Is_Library_Level_Entity (Defining_Identifier (P));
-- Prevent the search from going too far
elsif Is_Body_Or_Package_Declaration (P) then
return False;
end if;
P := Parent (P);
end loop;
return False;
end Library_Level_Target;
------------------------
-- Make_Artyp_Literal --
------------------------
function Make_Artyp_Literal (Val : Nat) return Node_Id is
Result : constant Node_Id := Make_Integer_Literal (Loc, Val);
begin
Set_Etype (Result, Artyp);
Set_Analyzed (Result, True);
Set_Is_Static_Expression (Result, False);
return Result;
end Make_Artyp_Literal;
--------------
-- To_Artyp --
--------------
function To_Artyp (X : Node_Id) return Node_Id is
begin
if Ityp = Base_Type (Artyp) then
return X;
elsif Is_Enumeration_Type (Ityp) then
return
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Ityp, Loc),
Attribute_Name => Name_Pos,
Expressions => New_List (X));
else
return Convert_To (Artyp, X);
end if;
end To_Artyp;
-------------
-- To_Ityp --
-------------
function To_Ityp (X : Node_Id) return Node_Id is
begin
if Is_Enumeration_Type (Ityp) then
return
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Ityp, Loc),
Attribute_Name => Name_Val,
Expressions => New_List (X));
-- Case where we will do a type conversion
else
if Ityp = Base_Type (Artyp) then
return X;
else
return Convert_To (Ityp, X);
end if;
end if;
end To_Ityp;
-- Local Declarations
Opnd_Typ : Entity_Id;
Subtyp_Ind : Entity_Id;
Ent : Entity_Id;
Len : Uint;
J : Nat;
Clen : Node_Id;
Set : Boolean;
-- Start of processing for Expand_Concatenate
begin
-- Choose an appropriate computational type
-- We will be doing calculations of lengths and bounds in this routine
-- and computing one from the other in some cases, e.g. getting the high
-- bound by adding the length-1 to the low bound.
-- We can't just use the index type, or even its base type for this
-- purpose for two reasons. First it might be an enumeration type which
-- is not suitable for computations of any kind, and second it may
-- simply not have enough range. For example if the index type is
-- -128..+127 then lengths can be up to 256, which is out of range of
-- the type.
-- For enumeration types, we can simply use Standard_Integer, this is
-- sufficient since the actual number of enumeration literals cannot
-- possibly exceed the range of integer (remember we will be doing the
-- arithmetic with POS values, not representation values).
if Is_Enumeration_Type (Ityp) then
Artyp := Standard_Integer;
-- For modular types, we use a 32-bit modular type for types whose size
-- is in the range 1-31 bits. For 32-bit unsigned types, we use the
-- identity type, and for larger unsigned types we use a 64-bit type.
elsif Is_Modular_Integer_Type (Ityp) then
if RM_Size (Ityp) < Standard_Integer_Size then
Artyp := Standard_Unsigned;
elsif RM_Size (Ityp) = Standard_Integer_Size then
Artyp := Ityp;
else
Artyp := Standard_Long_Long_Unsigned;
end if;
-- Similar treatment for signed types
else
if RM_Size (Ityp) < Standard_Integer_Size then
Artyp := Standard_Integer;
elsif RM_Size (Ityp) = Standard_Integer_Size then
Artyp := Ityp;
else
Artyp := Standard_Long_Long_Integer;
end if;
end if;
-- Supply dummy entry at start of length array
Aggr_Length (0) := Make_Artyp_Literal (0);
-- Go through operands setting up the above arrays
J := 1;
while J <= N loop
Opnd := Remove_Head (Opnds);
Opnd_Typ := Etype (Opnd);
-- The parent got messed up when we put the operands in a list,
-- so now put back the proper parent for the saved operand, that
-- is to say the concatenation node, to make sure that each operand
-- is seen as a subexpression, e.g. if actions must be inserted.
Set_Parent (Opnd, Cnode);
-- Set will be True when we have setup one entry in the array
Set := False;
-- Singleton element (or character literal) case
if Base_Type (Opnd_Typ) = Ctyp then
NN := NN + 1;
Operands (NN) := Opnd;
Is_Fixed_Length (NN) := True;
Fixed_Length (NN) := Uint_1;
Result_May_Be_Null := False;
-- Set low bound of operand (no need to set Last_Opnd_High_Bound
-- since we know that the result cannot be null).
Opnd_Low_Bound (NN) :=
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Istyp, Loc),
Attribute_Name => Name_First);
Set := True;
-- String literal case (can only occur for strings of course)
elsif Nkind (Opnd) = N_String_Literal then
Len := String_Literal_Length (Opnd_Typ);
if Len /= 0 then
Result_May_Be_Null := False;
end if;
-- Capture last operand low and high bound if result could be null
if J = N and then Result_May_Be_Null then
Last_Opnd_Low_Bound :=
New_Copy_Tree (String_Literal_Low_Bound (Opnd_Typ));
Last_Opnd_High_Bound :=
Make_Op_Subtract (Loc,
Left_Opnd =>
New_Copy_Tree (String_Literal_Low_Bound (Opnd_Typ)),
Right_Opnd => Make_Integer_Literal (Loc, 1));
end if;
-- Skip null string literal
if J < N and then Len = 0 then
goto Continue;
end if;
NN := NN + 1;
Operands (NN) := Opnd;
Is_Fixed_Length (NN) := True;
-- Set length and bounds
Fixed_Length (NN) := Len;
Opnd_Low_Bound (NN) :=
New_Copy_Tree (String_Literal_Low_Bound (Opnd_Typ));
Set := True;
-- All other cases
else
-- Check constrained case with known bounds
if Is_Constrained (Opnd_Typ) then
declare
Index : constant Node_Id := First_Index (Opnd_Typ);
Indx_Typ : constant Entity_Id := Etype (Index);
Lo : constant Node_Id := Type_Low_Bound (Indx_Typ);
Hi : constant Node_Id := Type_High_Bound (Indx_Typ);
begin
-- Fixed length constrained array type with known at compile
-- time bounds is last case of fixed length operand.
if Compile_Time_Known_Value (Lo)
and then
Compile_Time_Known_Value (Hi)
then
declare
Loval : constant Uint := Expr_Value (Lo);
Hival : constant Uint := Expr_Value (Hi);
Len : constant Uint :=
UI_Max (Hival - Loval + 1, Uint_0);
begin
if Len > 0 then
Result_May_Be_Null := False;
end if;
-- Capture last operand bounds if result could be null
if J = N and then Result_May_Be_Null then
Last_Opnd_Low_Bound :=
Convert_To (Ityp,
Make_Integer_Literal (Loc, Expr_Value (Lo)));
Last_Opnd_High_Bound :=
Convert_To (Ityp,
Make_Integer_Literal (Loc, Expr_Value (Hi)));
end if;
-- Exclude null length case unless last operand
if J < N and then Len = 0 then
goto Continue;
end if;
NN := NN + 1;
Operands (NN) := Opnd;
Is_Fixed_Length (NN) := True;
Fixed_Length (NN) := Len;
Opnd_Low_Bound (NN) :=
To_Ityp
(Make_Integer_Literal (Loc, Expr_Value (Lo)));
Set := True;
end;
end if;
end;
end if;
-- All cases where the length is not known at compile time, or the
-- special case of an operand which is known to be null but has a
-- lower bound other than 1 or is other than a string type.
if not Set then
NN := NN + 1;
-- Capture operand bounds
Opnd_Low_Bound (NN) :=
Make_Attribute_Reference (Loc,
Prefix =>
Duplicate_Subexpr (Opnd, Name_Req => True),
Attribute_Name => Name_First);
-- Capture last operand bounds if result could be null
if J = N and Result_May_Be_Null then
Last_Opnd_Low_Bound :=
Convert_To (Ityp,
Make_Attribute_Reference (Loc,
Prefix =>
Duplicate_Subexpr (Opnd, Name_Req => True),
Attribute_Name => Name_First));
Last_Opnd_High_Bound :=
Convert_To (Ityp,
Make_Attribute_Reference (Loc,
Prefix =>
Duplicate_Subexpr (Opnd, Name_Req => True),
Attribute_Name => Name_Last));
end if;
-- Capture length of operand in entity
Operands (NN) := Opnd;
Is_Fixed_Length (NN) := False;
Var_Length (NN) := Make_Temporary (Loc, 'L');
Append_To (Actions,
Make_Object_Declaration (Loc,
Defining_Identifier => Var_Length (NN),
Constant_Present => True,
Object_Definition => New_Occurrence_Of (Artyp, Loc),
Expression =>
Make_Attribute_Reference (Loc,
Prefix =>
Duplicate_Subexpr (Opnd, Name_Req => True),
Attribute_Name => Name_Length)));
end if;
end if;
-- Set next entry in aggregate length array
-- For first entry, make either integer literal for fixed length
-- or a reference to the saved length for variable length.
if NN = 1 then
if Is_Fixed_Length (1) then
Aggr_Length (1) := Make_Integer_Literal (Loc, Fixed_Length (1));
else
Aggr_Length (1) := New_Occurrence_Of (Var_Length (1), Loc);
end if;
-- If entry is fixed length and only fixed lengths so far, make
-- appropriate new integer literal adding new length.
elsif Is_Fixed_Length (NN)
and then Nkind (Aggr_Length (NN - 1)) = N_Integer_Literal
then
Aggr_Length (NN) :=
Make_Integer_Literal (Loc,
Intval => Fixed_Length (NN) + Intval (Aggr_Length (NN - 1)));
-- All other cases, construct an addition node for the length and
-- create an entity initialized to this length.
else
Ent := Make_Temporary (Loc, 'L');
if Is_Fixed_Length (NN) then
Clen := Make_Integer_Literal (Loc, Fixed_Length (NN));
else
Clen := New_Occurrence_Of (Var_Length (NN), Loc);
end if;
Append_To (Actions,
Make_Object_Declaration (Loc,
Defining_Identifier => Ent,
Constant_Present => True,
Object_Definition => New_Occurrence_Of (Artyp, Loc),
Expression =>
Make_Op_Add (Loc,
Left_Opnd => New_Copy_Tree (Aggr_Length (NN - 1)),
Right_Opnd => Clen)));
Aggr_Length (NN) := Make_Identifier (Loc, Chars => Chars (Ent));
end if;
<<Continue>>
J := J + 1;
end loop;
-- If we have only skipped null operands, return the last operand
if NN = 0 then
Result := Opnd;
goto Done;
end if;
-- If we have only one non-null operand, return it and we are done.
-- There is one case in which this cannot be done, and that is when
-- the sole operand is of the element type, in which case it must be
-- converted to an array, and the easiest way of doing that is to go
-- through the normal general circuit.
if NN = 1 and then Base_Type (Etype (Operands (1))) /= Ctyp then
Result := Operands (1);
goto Done;
end if;
-- Cases where we have a real concatenation
-- Next step is to find the low bound for the result array that we
-- will allocate. The rules for this are in (RM 4.5.6(5-7)).
-- If the ultimate ancestor of the index subtype is a constrained array
-- definition, then the lower bound is that of the index subtype as
-- specified by (RM 4.5.3(6)).
-- The right test here is to go to the root type, and then the ultimate
-- ancestor is the first subtype of this root type.
if Is_Constrained (First_Subtype (Root_Type (Atyp))) then
Low_Bound :=
Make_Attribute_Reference (Loc,
Prefix =>
New_Occurrence_Of (First_Subtype (Root_Type (Atyp)), Loc),
Attribute_Name => Name_First);
-- If the first operand in the list has known length we know that
-- the lower bound of the result is the lower bound of this operand.
elsif Is_Fixed_Length (1) then
Low_Bound := Opnd_Low_Bound (1);
-- OK, we don't know the lower bound, we have to build a horrible
-- if expression node of the form
-- if Cond1'Length /= 0 then
-- Opnd1 low bound
-- else
-- if Opnd2'Length /= 0 then
-- Opnd2 low bound
-- else
-- ...
-- The nesting ends either when we hit an operand whose length is known
-- at compile time, or on reaching the last operand, whose low bound we
-- take unconditionally whether or not it is null. It's easiest to do
-- this with a recursive procedure:
else
declare
function Get_Known_Bound (J : Nat) return Node_Id;
-- Returns the lower bound determined by operands J .. NN
---------------------
-- Get_Known_Bound --
---------------------
function Get_Known_Bound (J : Nat) return Node_Id is
begin
if Is_Fixed_Length (J) or else J = NN then
return New_Copy_Tree (Opnd_Low_Bound (J));
else
return
Make_If_Expression (Loc,
Expressions => New_List (
Make_Op_Ne (Loc,
Left_Opnd =>
New_Occurrence_Of (Var_Length (J), Loc),
Right_Opnd =>
Make_Integer_Literal (Loc, 0)),
New_Copy_Tree (Opnd_Low_Bound (J)),
Get_Known_Bound (J + 1)));
end if;
end Get_Known_Bound;
begin
Ent := Make_Temporary (Loc, 'L');
Append_To (Actions,
Make_Object_Declaration (Loc,
Defining_Identifier => Ent,
Constant_Present => True,
Object_Definition => New_Occurrence_Of (Ityp, Loc),
Expression => Get_Known_Bound (1)));
Low_Bound := New_Occurrence_Of (Ent, Loc);
end;
end if;
pragma Assert (Present (Low_Bound));
-- Now we can safely compute the upper bound, normally
-- Low_Bound + Length - 1.
High_Bound :=
To_Ityp
(Make_Op_Add (Loc,
Left_Opnd => To_Artyp (New_Copy_Tree (Low_Bound)),
Right_Opnd =>
Make_Op_Subtract (Loc,
Left_Opnd => New_Copy_Tree (Aggr_Length (NN)),
Right_Opnd => Make_Artyp_Literal (1))));
-- Note that calculation of the high bound may cause overflow in some
-- very weird cases, so in the general case we need an overflow check on
-- the high bound. We can avoid this for the common case of string types
-- and other types whose index is Positive, since we chose a wider range
-- for the arithmetic type. If checks are suppressed we do not set the
-- flag, and possibly superfluous warnings will be omitted.
if Istyp /= Standard_Positive
and then not Overflow_Checks_Suppressed (Istyp)
then
Activate_Overflow_Check (High_Bound);
end if;
-- Handle the exceptional case where the result is null, in which case
-- case the bounds come from the last operand (so that we get the proper
-- bounds if the last operand is super-flat).
if Result_May_Be_Null then
Low_Bound :=
Make_If_Expression (Loc,
Expressions => New_List (
Make_Op_Eq (Loc,
Left_Opnd => New_Copy_Tree (Aggr_Length (NN)),
Right_Opnd => Make_Artyp_Literal (0)),
Last_Opnd_Low_Bound,
Low_Bound));
High_Bound :=
Make_If_Expression (Loc,
Expressions => New_List (
Make_Op_Eq (Loc,
Left_Opnd => New_Copy_Tree (Aggr_Length (NN)),
Right_Opnd => Make_Artyp_Literal (0)),
Last_Opnd_High_Bound,
High_Bound));
end if;
-- Here is where we insert the saved up actions
Insert_Actions (Cnode, Actions, Suppress => All_Checks);
-- Now we construct an array object with appropriate bounds. We mark
-- the target as internal to prevent useless initialization when
-- Initialize_Scalars is enabled. Also since this is the actual result
-- entity, we make sure we have debug information for the result.
Subtyp_Ind :=
Make_Subtype_Indication (Loc,
Subtype_Mark => New_Occurrence_Of (Atyp, Loc),
Constraint =>
Make_Index_Or_Discriminant_Constraint (Loc,
Constraints => New_List (
Make_Range (Loc,
Low_Bound => Low_Bound,
High_Bound => High_Bound))));
Ent := Make_Temporary (Loc, 'S');
Set_Is_Internal (Ent);
Set_Debug_Info_Needed (Ent);
-- If we are concatenating strings and the current scope already uses
-- the secondary stack, allocate the resulting string also on the
-- secondary stack to avoid putting too much pressure on the primary
-- stack.
-- Don't do this if -gnatd.h is set, as this will break the wrapping of
-- Cnode in an Expression_With_Actions, see Expand_N_Op_Concat.
if Atyp = Standard_String
and then Uses_Sec_Stack (Current_Scope)
and then RTE_Available (RE_SS_Pool)
and then not Debug_Flag_Dot_H
then
-- Generate:
-- subtype Axx is ...;
-- type Ayy is access Axx;
-- Rxx : Ayy := new <subtype> [storage_pool = ss_pool];
-- Sxx : <subtype> renames Rxx.all;
declare
Alloc : Node_Id;
ConstrT : constant Entity_Id := Make_Temporary (Loc, 'A');
Acc_Typ : constant Entity_Id := Make_Temporary (Loc, 'A');
Temp : Entity_Id;
begin
Insert_Action (Cnode,
Make_Subtype_Declaration (Loc,
Defining_Identifier => ConstrT,
Subtype_Indication => Subtyp_Ind),
Suppress => All_Checks);
Freeze_Itype (ConstrT, Cnode);
Insert_Action (Cnode,
Make_Full_Type_Declaration (Loc,
Defining_Identifier => Acc_Typ,
Type_Definition =>
Make_Access_To_Object_Definition (Loc,
Subtype_Indication => New_Occurrence_Of (ConstrT, Loc))),
Suppress => All_Checks);
Alloc :=
Make_Allocator (Loc,
Expression => New_Occurrence_Of (ConstrT, Loc));
-- Allocate on the secondary stack. This is currently done
-- only for type String, which normally doesn't have default
-- initialization, but we need to Set_No_Initialization in case
-- of Initialize_Scalars or Normalize_Scalars; otherwise, the
-- allocator will get transformed and will not use the secondary
-- stack.
Set_Storage_Pool (Alloc, RTE (RE_SS_Pool));
Set_Procedure_To_Call (Alloc, RTE (RE_SS_Allocate));
Set_No_Initialization (Alloc);
Temp := Make_Temporary (Loc, 'R', Alloc);
Insert_Action (Cnode,
Make_Object_Declaration (Loc,
Defining_Identifier => Temp,
Object_Definition => New_Occurrence_Of (Acc_Typ, Loc),
Expression => Alloc),
Suppress => All_Checks);
Insert_Action (Cnode,
Make_Object_Renaming_Declaration (Loc,
Defining_Identifier => Ent,
Subtype_Mark => New_Occurrence_Of (ConstrT, Loc),
Name =>
Make_Explicit_Dereference (Loc,
Prefix => New_Occurrence_Of (Temp, Loc))),
Suppress => All_Checks);
end;
else
-- If the bound is statically known to be out of range, we do not
-- want to abort, we want a warning and a runtime constraint error.
-- Note that we have arranged that the result will not be treated as
-- a static constant, so we won't get an illegality during this
-- insertion.
-- We also enable checks (in particular range checks) in case the
-- bounds of Subtyp_Ind are out of range.
Insert_Action (Cnode,
Make_Object_Declaration (Loc,
Defining_Identifier => Ent,
Object_Definition => Subtyp_Ind));
end if;
-- If the result of the concatenation appears as the initializing
-- expression of an object declaration, we can just rename the
-- result, rather than copying it.
Set_OK_To_Rename (Ent);
-- Catch the static out of range case now
if Raises_Constraint_Error (High_Bound) then
-- Kill warning generated for the declaration of the static out of
-- range high bound, and instead generate a Constraint_Error with
-- an appropriate specific message.
Kill_Dead_Code (Declaration_Node (Entity (High_Bound)));
Apply_Compile_Time_Constraint_Error
(N => Cnode,
Msg => "concatenation result upper bound out of range??",
Reason => CE_Range_Check_Failed);
return;
end if;
-- Now we will generate the assignments to do the actual concatenation
-- There is one case in which we will not do this, namely when all the
-- following conditions are met:
-- The result type is Standard.String
-- There are nine or fewer retained (non-null) operands
-- The optimization level is -O0 or the debug flag gnatd.C is set,
-- and the debug flag gnatd.c is not set.
-- The corresponding System.Concat_n.Str_Concat_n routine is
-- available in the run time.
-- If all these conditions are met then we generate a call to the
-- relevant concatenation routine. The purpose of this is to avoid
-- undesirable code bloat at -O0.
-- If the concatenation is within the declaration of a library-level
-- object, we call the built-in concatenation routines to prevent code
-- bloat, regardless of the optimization level. This is space efficient
-- and prevents linking problems when units are compiled with different
-- optimization levels.
if Atyp = Standard_String
and then NN in 2 .. 9
and then (((Optimization_Level = 0 or else Debug_Flag_Dot_CC)
and then not Debug_Flag_Dot_C)
or else Library_Level_Target)
then
declare
RR : constant array (Nat range 2 .. 9) of RE_Id :=
(RE_Str_Concat_2,
RE_Str_Concat_3,
RE_Str_Concat_4,
RE_Str_Concat_5,
RE_Str_Concat_6,
RE_Str_Concat_7,
RE_Str_Concat_8,
RE_Str_Concat_9);
begin
if RTE_Available (RR (NN)) then
declare
Opnds : constant List_Id :=
New_List (New_Occurrence_Of (Ent, Loc));
begin
for J in 1 .. NN loop
if Is_List_Member (Operands (J)) then
Remove (Operands (J));
end if;
if Base_Type (Etype (Operands (J))) = Ctyp then
Append_To (Opnds,
Make_Aggregate (Loc,
Component_Associations => New_List (
Make_Component_Association (Loc,
Choices => New_List (
Make_Integer_Literal (Loc, 1)),
Expression => Operands (J)))));
else
Append_To (Opnds, Operands (J));
end if;
end loop;
Insert_Action (Cnode,
Make_Procedure_Call_Statement (Loc,
Name => New_Occurrence_Of (RTE (RR (NN)), Loc),
Parameter_Associations => Opnds));
Result := New_Occurrence_Of (Ent, Loc);
goto Done;
end;
end if;
end;
end if;
-- Not special case so generate the assignments
Known_Non_Null_Operand_Seen := False;
for J in 1 .. NN loop
declare
Lo : constant Node_Id :=
Make_Op_Add (Loc,
Left_Opnd => To_Artyp (New_Copy_Tree (Low_Bound)),
Right_Opnd => Aggr_Length (J - 1));
Hi : constant Node_Id :=
Make_Op_Add (Loc,
Left_Opnd => To_Artyp (New_Copy_Tree (Low_Bound)),
Right_Opnd =>
Make_Op_Subtract (Loc,
Left_Opnd => Aggr_Length (J),
Right_Opnd => Make_Artyp_Literal (1)));
begin
-- Singleton case, simple assignment
if Base_Type (Etype (Operands (J))) = Ctyp then
Known_Non_Null_Operand_Seen := True;
Insert_Action (Cnode,
Make_Assignment_Statement (Loc,
Name =>
Make_Indexed_Component (Loc,
Prefix => New_Occurrence_Of (Ent, Loc),
Expressions => New_List (To_Ityp (Lo))),
Expression => Operands (J)),
Suppress => All_Checks);
-- Array case, slice assignment, skipped when argument is fixed
-- length and known to be null.
elsif (not Is_Fixed_Length (J)) or else (Fixed_Length (J) > 0) then
declare
Assign : Node_Id :=
Make_Assignment_Statement (Loc,
Name =>
Make_Slice (Loc,
Prefix =>
New_Occurrence_Of (Ent, Loc),
Discrete_Range =>
Make_Range (Loc,
Low_Bound => To_Ityp (Lo),
High_Bound => To_Ityp (Hi))),
Expression => Operands (J));
begin
if Is_Fixed_Length (J) then
Known_Non_Null_Operand_Seen := True;
elsif not Known_Non_Null_Operand_Seen then
-- Here if operand length is not statically known and no
-- operand known to be non-null has been processed yet.
-- If operand length is 0, we do not need to perform the
-- assignment, and we must avoid the evaluation of the
-- high bound of the slice, since it may underflow if the
-- low bound is Ityp'First.
Assign :=
Make_Implicit_If_Statement (Cnode,
Condition =>
Make_Op_Ne (Loc,
Left_Opnd =>
New_Occurrence_Of (Var_Length (J), Loc),
Right_Opnd => Make_Integer_Literal (Loc, 0)),
Then_Statements => New_List (Assign));
end if;
Insert_Action (Cnode, Assign, Suppress => All_Checks);
end;
end if;
end;
end loop;
-- Finally we build the result, which is a reference to the array object
Result := New_Occurrence_Of (Ent, Loc);
<<Done>>
pragma Assert (Present (Result));
Rewrite (Cnode, Result);
Analyze_And_Resolve (Cnode, Atyp);
end Expand_Concatenate;
---------------------------------------------------
-- Expand_Membership_Minimize_Eliminate_Overflow --
---------------------------------------------------
procedure Expand_Membership_Minimize_Eliminate_Overflow (N : Node_Id) is
pragma Assert (Nkind (N) = N_In);
-- Despite the name, this routine applies only to N_In, not to
-- N_Not_In. The latter is always rewritten as not (X in Y).
Result_Type : constant Entity_Id := Etype (N);
-- Capture result type, may be a derived boolean type
Loc : constant Source_Ptr := Sloc (N);
Lop : constant Node_Id := Left_Opnd (N);
Rop : constant Node_Id := Right_Opnd (N);
-- Note: there are many referencs to Etype (Lop) and Etype (Rop). It
-- is thus tempting to capture these values, but due to the rewrites
-- that occur as a result of overflow checking, these values change
-- as we go along, and it is safe just to always use Etype explicitly.
Restype : constant Entity_Id := Etype (N);
-- Save result type
Lo, Hi : Uint;
-- Bounds in Minimize calls, not used currently
LLIB : constant Entity_Id := Base_Type (Standard_Long_Long_Integer);
-- Entity for Long_Long_Integer'Base
begin
Minimize_Eliminate_Overflows (Lop, Lo, Hi, Top_Level => False);
-- If right operand is a subtype name, and the subtype name has no
-- predicate, then we can just replace the right operand with an
-- explicit range T'First .. T'Last, and use the explicit range code.
if Nkind (Rop) /= N_Range
and then No (Predicate_Function (Etype (Rop)))
then
declare
Rtyp : constant Entity_Id := Etype (Rop);
begin
Rewrite (Rop,
Make_Range (Loc,
Low_Bound =>
Make_Attribute_Reference (Loc,
Attribute_Name => Name_First,
Prefix => New_Occurrence_Of (Rtyp, Loc)),
High_Bound =>
Make_Attribute_Reference (Loc,
Attribute_Name => Name_Last,
Prefix => New_Occurrence_Of (Rtyp, Loc))));
Analyze_And_Resolve (Rop, Rtyp, Suppress => All_Checks);
end;
end if;
-- Here for the explicit range case. Note that the bounds of the range
-- have not been processed for minimized or eliminated checks.
if Nkind (Rop) = N_Range then
Minimize_Eliminate_Overflows
(Low_Bound (Rop), Lo, Hi, Top_Level => False);
Minimize_Eliminate_Overflows
(High_Bound (Rop), Lo, Hi, Top_Level => False);
-- We have A in B .. C, treated as A >= B and then A <= C
-- Bignum case
if Is_RTE (Etype (Lop), RE_Bignum)
or else Is_RTE (Etype (Low_Bound (Rop)), RE_Bignum)
or else Is_RTE (Etype (High_Bound (Rop)), RE_Bignum)
then
declare
Blk : constant Node_Id := Make_Bignum_Block (Loc);
Bnn : constant Entity_Id := Make_Temporary (Loc, 'B', N);
L : constant Entity_Id :=
Make_Defining_Identifier (Loc, Name_uL);
Lopnd : constant Node_Id := Convert_To_Bignum (Lop);
Lbound : constant Node_Id :=
Convert_To_Bignum (Low_Bound (Rop));
Hbound : constant Node_Id :=
Convert_To_Bignum (High_Bound (Rop));
-- Now we rewrite the membership test node to look like
-- do
-- Bnn : Result_Type;
-- declare
-- M : Mark_Id := SS_Mark;
-- L : Bignum := Lopnd;
-- begin
-- Bnn := Big_GE (L, Lbound) and then Big_LE (L, Hbound)
-- SS_Release (M);
-- end;
-- in
-- Bnn
-- end
begin
-- Insert declaration of L into declarations of bignum block
Insert_After
(Last (Declarations (Blk)),
Make_Object_Declaration (Loc,
Defining_Identifier => L,
Object_Definition =>
New_Occurrence_Of (RTE (RE_Bignum), Loc),
Expression => Lopnd));
-- Insert assignment to Bnn into expressions of bignum block
Insert_Before
(First (Statements (Handled_Statement_Sequence (Blk))),
Make_Assignment_Statement (Loc,
Name => New_Occurrence_Of (Bnn, Loc),
Expression =>
Make_And_Then (Loc,
Left_Opnd =>
Make_Function_Call (Loc,
Name =>
New_Occurrence_Of (RTE (RE_Big_GE), Loc),
Parameter_Associations => New_List (
New_Occurrence_Of (L, Loc),
Lbound)),
Right_Opnd =>
Make_Function_Call (Loc,
Name =>
New_Occurrence_Of (RTE (RE_Big_LE), Loc),
Parameter_Associations => New_List (
New_Occurrence_Of (L, Loc),
Hbound)))));
-- Now rewrite the node
Rewrite (N,
Make_Expression_With_Actions (Loc,
Actions => New_List (
Make_Object_Declaration (Loc,
Defining_Identifier => Bnn,
Object_Definition =>
New_Occurrence_Of (Result_Type, Loc)),
Blk),
Expression => New_Occurrence_Of (Bnn, Loc)));
Analyze_And_Resolve (N, Result_Type);
return;
end;
-- Here if no bignums around
else
-- Case where types are all the same
if Base_Type (Etype (Lop)) = Base_Type (Etype (Low_Bound (Rop)))
and then
Base_Type (Etype (Lop)) = Base_Type (Etype (High_Bound (Rop)))
then
null;
-- If types are not all the same, it means that we have rewritten
-- at least one of them to be of type Long_Long_Integer, and we
-- will convert the other operands to Long_Long_Integer.
else
Convert_To_And_Rewrite (LLIB, Lop);
Set_Analyzed (Lop, False);
Analyze_And_Resolve (Lop, LLIB);
-- For the right operand, avoid unnecessary recursion into
-- this routine, we know that overflow is not possible.
Convert_To_And_Rewrite (LLIB, Low_Bound (Rop));
Convert_To_And_Rewrite (LLIB, High_Bound (Rop));
Set_Analyzed (Rop, False);
Analyze_And_Resolve (Rop, LLIB, Suppress => Overflow_Check);
end if;
-- Now the three operands are of the same signed integer type,
-- so we can use the normal expansion routine for membership,
-- setting the flag to prevent recursion into this procedure.
Set_No_Minimize_Eliminate (N);
Expand_N_In (N);
end if;
-- Right operand is a subtype name and the subtype has a predicate. We
-- have to make sure the predicate is checked, and for that we need to
-- use the standard N_In circuitry with appropriate types.
else
pragma Assert (Present (Predicate_Function (Etype (Rop))));
-- If types are "right", just call Expand_N_In preventing recursion
if Base_Type (Etype (Lop)) = Base_Type (Etype (Rop)) then
Set_No_Minimize_Eliminate (N);
Expand_N_In (N);
-- Bignum case
elsif Is_RTE (Etype (Lop), RE_Bignum) then
-- For X in T, we want to rewrite our node as
-- do
-- Bnn : Result_Type;
-- declare
-- M : Mark_Id := SS_Mark;
-- Lnn : Long_Long_Integer'Base
-- Nnn : Bignum;
-- begin
-- Nnn := X;
-- if not Bignum_In_LLI_Range (Nnn) then
-- Bnn := False;
-- else
-- Lnn := From_Bignum (Nnn);
-- Bnn :=
-- Lnn in LLIB (T'Base'First) .. LLIB (T'Base'Last)
-- and then T'Base (Lnn) in T;
-- end if;
-- SS_Release (M);
-- end
-- in
-- Bnn
-- end
-- A bit gruesome, but there doesn't seem to be a simpler way
declare
Blk : constant Node_Id := Make_Bignum_Block (Loc);
Bnn : constant Entity_Id := Make_Temporary (Loc, 'B', N);
Lnn : constant Entity_Id := Make_Temporary (Loc, 'L', N);
Nnn : constant Entity_Id := Make_Temporary (Loc, 'N', N);
T : constant Entity_Id := Etype (Rop);
TB : constant Entity_Id := Base_Type (T);
Nin : Node_Id;
begin
-- Mark the last membership operation to prevent recursion
Nin :=
Make_In (Loc,
Left_Opnd => Convert_To (TB, New_Occurrence_Of (Lnn, Loc)),
Right_Opnd => New_Occurrence_Of (T, Loc));
Set_No_Minimize_Eliminate (Nin);
-- Now decorate the block
Insert_After
(Last (Declarations (Blk)),
Make_Object_Declaration (Loc,
Defining_Identifier => Lnn,
Object_Definition => New_Occurrence_Of (LLIB, Loc)));
Insert_After
(Last (Declarations (Blk)),
Make_Object_Declaration (Loc,
Defining_Identifier => Nnn,
Object_Definition =>
New_Occurrence_Of (RTE (RE_Bignum), Loc)));
Insert_List_Before
(First (Statements (Handled_Statement_Sequence (Blk))),
New_List (
Make_Assignment_Statement (Loc,
Name => New_Occurrence_Of (Nnn, Loc),
Expression => Relocate_Node (Lop)),
Make_Implicit_If_Statement (N,
Condition =>
Make_Op_Not (Loc,
Right_Opnd =>
Make_Function_Call (Loc,
Name =>
New_Occurrence_Of
(RTE (RE_Bignum_In_LLI_Range), Loc),
Parameter_Associations => New_List (
New_Occurrence_Of (Nnn, Loc)))),
Then_Statements => New_List (
Make_Assignment_Statement (Loc,
Name => New_Occurrence_Of (Bnn, Loc),
Expression =>
New_Occurrence_Of (Standard_False, Loc))),
Else_Statements => New_List (
Make_Assignment_Statement (Loc,
Name => New_Occurrence_Of (Lnn, Loc),
Expression =>
Make_Function_Call (Loc,
Name =>
New_Occurrence_Of (RTE (RE_From_Bignum), Loc),
Parameter_Associations => New_List (
New_Occurrence_Of (Nnn, Loc)))),
Make_Assignment_Statement (Loc,
Name => New_Occurrence_Of (Bnn, Loc),
Expression =>
Make_And_Then (Loc,
Left_Opnd =>
Make_In (Loc,
Left_Opnd => New_Occurrence_Of (Lnn, Loc),
Right_Opnd =>
Make_Range (Loc,
Low_Bound =>
Convert_To (LLIB,
Make_Attribute_Reference (Loc,
Attribute_Name => Name_First,
Prefix =>
New_Occurrence_Of (TB, Loc))),
High_Bound =>
Convert_To (LLIB,
Make_Attribute_Reference (Loc,
Attribute_Name => Name_Last,
Prefix =>
New_Occurrence_Of (TB, Loc))))),
Right_Opnd => Nin))))));
-- Now we can do the rewrite
Rewrite (N,
Make_Expression_With_Actions (Loc,
Actions => New_List (
Make_Object_Declaration (Loc,
Defining_Identifier => Bnn,
Object_Definition =>
New_Occurrence_Of (Result_Type, Loc)),
Blk),
Expression => New_Occurrence_Of (Bnn, Loc)));
Analyze_And_Resolve (N, Result_Type);
return;
end;
-- Not bignum case, but types don't match (this means we rewrote the
-- left operand to be Long_Long_Integer).
else
pragma Assert (Base_Type (Etype (Lop)) = LLIB);
-- We rewrite the membership test as (where T is the type with
-- the predicate, i.e. the type of the right operand)
-- Lop in LLIB (T'Base'First) .. LLIB (T'Base'Last)
-- and then T'Base (Lop) in T
declare
T : constant Entity_Id := Etype (Rop);
TB : constant Entity_Id := Base_Type (T);
Nin : Node_Id;
begin
-- The last membership test is marked to prevent recursion
Nin :=
Make_In (Loc,
Left_Opnd => Convert_To (TB, Duplicate_Subexpr (Lop)),
Right_Opnd => New_Occurrence_Of (T, Loc));
Set_No_Minimize_Eliminate (Nin);
-- Now do the rewrite
Rewrite (N,
Make_And_Then (Loc,
Left_Opnd =>
Make_In (Loc,
Left_Opnd => Lop,
Right_Opnd =>
Make_Range (Loc,
Low_Bound =>
Convert_To (LLIB,
Make_Attribute_Reference (Loc,
Attribute_Name => Name_First,
Prefix =>
New_Occurrence_Of (TB, Loc))),
High_Bound =>
Convert_To (LLIB,
Make_Attribute_Reference (Loc,
Attribute_Name => Name_Last,
Prefix =>
New_Occurrence_Of (TB, Loc))))),
Right_Opnd => Nin));
Set_Analyzed (N, False);
Analyze_And_Resolve (N, Restype);
end;
end if;
end if;
end Expand_Membership_Minimize_Eliminate_Overflow;
---------------------------------
-- Expand_Nonbinary_Modular_Op --
---------------------------------
procedure Expand_Nonbinary_Modular_Op (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Etype (N);
procedure Expand_Modular_Addition;
-- Expand the modular addition, handling the special case of adding a
-- constant.
procedure Expand_Modular_Op;
-- Compute the general rule: (lhs OP rhs) mod Modulus
procedure Expand_Modular_Subtraction;
-- Expand the modular addition, handling the special case of subtracting
-- a constant.
-----------------------------
-- Expand_Modular_Addition --
-----------------------------
procedure Expand_Modular_Addition is
begin
-- If this is not the addition of a constant then compute it using
-- the general rule: (lhs + rhs) mod Modulus
if Nkind (Right_Opnd (N)) /= N_Integer_Literal then
Expand_Modular_Op;
-- If this is an addition of a constant, convert it to a subtraction
-- plus a conditional expression since we can compute it faster than
-- computing the modulus.
-- modMinusRhs = Modulus - rhs
-- if lhs < modMinusRhs then lhs + rhs
-- else lhs - modMinusRhs
else
declare
Mod_Minus_Right : constant Uint :=
Modulus (Typ) - Intval (Right_Opnd (N));
Exprs : constant List_Id := New_List;
Cond_Expr : constant Node_Id := New_Op_Node (N_Op_Lt, Loc);
Then_Expr : constant Node_Id := New_Op_Node (N_Op_Add, Loc);
Else_Expr : constant Node_Id := New_Op_Node (N_Op_Subtract,
Loc);
begin
-- To prevent spurious visibility issues, convert all
-- operands to Standard.Unsigned.
Set_Left_Opnd (Cond_Expr,
Unchecked_Convert_To (Standard_Unsigned,
New_Copy_Tree (Left_Opnd (N))));
Set_Right_Opnd (Cond_Expr,
Make_Integer_Literal (Loc, Mod_Minus_Right));
Append_To (Exprs, Cond_Expr);
Set_Left_Opnd (Then_Expr,
Unchecked_Convert_To (Standard_Unsigned,
New_Copy_Tree (Left_Opnd (N))));
Set_Right_Opnd (Then_Expr,
Make_Integer_Literal (Loc, Intval (Right_Opnd (N))));
Append_To (Exprs, Then_Expr);
Set_Left_Opnd (Else_Expr,
Unchecked_Convert_To (Standard_Unsigned,
New_Copy_Tree (Left_Opnd (N))));
Set_Right_Opnd (Else_Expr,
Make_Integer_Literal (Loc, Mod_Minus_Right));
Append_To (Exprs, Else_Expr);
Rewrite (N,
Unchecked_Convert_To (Typ,
Make_If_Expression (Loc, Expressions => Exprs)));
end;
end if;
end Expand_Modular_Addition;
-----------------------
-- Expand_Modular_Op --
-----------------------
procedure Expand_Modular_Op is
Op_Expr : constant Node_Id := New_Op_Node (Nkind (N), Loc);
Mod_Expr : constant Node_Id := New_Op_Node (N_Op_Mod, Loc);
Target_Type : Entity_Id;
begin
-- Convert nonbinary modular type operands into integer values. Thus
-- we avoid never-ending loops expanding them, and we also ensure
-- the back end never receives nonbinary modular type expressions.
if Nkind (N) in N_Op_And | N_Op_Or | N_Op_Xor then
Set_Left_Opnd (Op_Expr,
Unchecked_Convert_To (Standard_Unsigned,
New_Copy_Tree (Left_Opnd (N))));
Set_Right_Opnd (Op_Expr,
Unchecked_Convert_To (Standard_Unsigned,
New_Copy_Tree (Right_Opnd (N))));
Set_Left_Opnd (Mod_Expr,
Unchecked_Convert_To (Standard_Integer, Op_Expr));
else
-- If the modulus of the type is larger than Integer'Last use a
-- larger type for the operands, to prevent spurious constraint
-- errors on large legal literals of the type.
if Modulus (Etype (N)) > Int (Integer'Last) then
Target_Type := Standard_Long_Long_Integer;
else
Target_Type := Standard_Integer;
end if;
Set_Left_Opnd (Op_Expr,
Unchecked_Convert_To (Target_Type,
New_Copy_Tree (Left_Opnd (N))));
Set_Right_Opnd (Op_Expr,
Unchecked_Convert_To (Target_Type,
New_Copy_Tree (Right_Opnd (N))));
-- Link this node to the tree to analyze it
-- If the parent node is an expression with actions we link it to
-- N since otherwise Force_Evaluation cannot identify if this node
-- comes from the Expression and rejects generating the temporary.
if Nkind (Parent (N)) = N_Expression_With_Actions then
Set_Parent (Op_Expr, N);
-- Common case
else
Set_Parent (Op_Expr, Parent (N));
end if;
Analyze (Op_Expr);
-- Force generating a temporary because in the expansion of this
-- expression we may generate code that performs this computation
-- several times.
Force_Evaluation (Op_Expr, Mode => Strict);
Set_Left_Opnd (Mod_Expr, Op_Expr);
end if;
Set_Right_Opnd (Mod_Expr,
Make_Integer_Literal (Loc, Modulus (Typ)));
Rewrite (N,
Unchecked_Convert_To (Typ, Mod_Expr));
end Expand_Modular_Op;
--------------------------------
-- Expand_Modular_Subtraction --
--------------------------------
procedure Expand_Modular_Subtraction is
begin
-- If this is not the addition of a constant then compute it using
-- the general rule: (lhs + rhs) mod Modulus
if Nkind (Right_Opnd (N)) /= N_Integer_Literal then
Expand_Modular_Op;
-- If this is an addition of a constant, convert it to a subtraction
-- plus a conditional expression since we can compute it faster than
-- computing the modulus.
-- modMinusRhs = Modulus - rhs
-- if lhs < rhs then lhs + modMinusRhs
-- else lhs - rhs
else
declare
Mod_Minus_Right : constant Uint :=
Modulus (Typ) - Intval (Right_Opnd (N));
Exprs : constant List_Id := New_List;
Cond_Expr : constant Node_Id := New_Op_Node (N_Op_Lt, Loc);
Then_Expr : constant Node_Id := New_Op_Node (N_Op_Add, Loc);
Else_Expr : constant Node_Id := New_Op_Node (N_Op_Subtract,
Loc);
begin
Set_Left_Opnd (Cond_Expr,
Unchecked_Convert_To (Standard_Unsigned,
New_Copy_Tree (Left_Opnd (N))));
Set_Right_Opnd (Cond_Expr,
Make_Integer_Literal (Loc, Intval (Right_Opnd (N))));
Append_To (Exprs, Cond_Expr);
Set_Left_Opnd (Then_Expr,
Unchecked_Convert_To (Standard_Unsigned,
New_Copy_Tree (Left_Opnd (N))));
Set_Right_Opnd (Then_Expr,
Make_Integer_Literal (Loc, Mod_Minus_Right));
Append_To (Exprs, Then_Expr);
Set_Left_Opnd (Else_Expr,
Unchecked_Convert_To (Standard_Unsigned,
New_Copy_Tree (Left_Opnd (N))));
Set_Right_Opnd (Else_Expr,
Unchecked_Convert_To (Standard_Unsigned,
New_Copy_Tree (Right_Opnd (N))));
Append_To (Exprs, Else_Expr);
Rewrite (N,
Unchecked_Convert_To (Typ,
Make_If_Expression (Loc, Expressions => Exprs)));
end;
end if;
end Expand_Modular_Subtraction;
-- Start of processing for Expand_Nonbinary_Modular_Op
begin
-- No action needed if front-end expansion is not required or if we
-- have a binary modular operand.
if not Expand_Nonbinary_Modular_Ops
or else not Non_Binary_Modulus (Typ)
then
return;
end if;
case Nkind (N) is
when N_Op_Add =>
Expand_Modular_Addition;
when N_Op_Subtract =>
Expand_Modular_Subtraction;
when N_Op_Minus =>
-- Expand -expr into (0 - expr)
Rewrite (N,
Make_Op_Subtract (Loc,
Left_Opnd => Make_Integer_Literal (Loc, 0),
Right_Opnd => Right_Opnd (N)));
Analyze_And_Resolve (N, Typ);
when others =>
Expand_Modular_Op;
end case;
Analyze_And_Resolve (N, Typ);
end Expand_Nonbinary_Modular_Op;
------------------------
-- Expand_N_Allocator --
------------------------
procedure Expand_N_Allocator (N : Node_Id) is
Etyp : constant Entity_Id := Etype (Expression (N));
Loc : constant Source_Ptr := Sloc (N);
PtrT : constant Entity_Id := Etype (N);
procedure Rewrite_Coextension (N : Node_Id);
-- Static coextensions have the same lifetime as the entity they
-- constrain. Such occurrences can be rewritten as aliased objects
-- and their unrestricted access used instead of the coextension.
function Size_In_Storage_Elements (E : Entity_Id) return Node_Id;
-- Given a constrained array type E, returns a node representing the
-- code to compute a close approximation of the size in storage elements
-- for the given type; for indexes that are modular types we compute
-- 'Last - First (instead of 'Length) because for large arrays computing
-- 'Last -'First + 1 causes overflow. This is done without using the
-- attribute 'Size_In_Storage_Elements (which malfunctions for large
-- sizes ???).
-------------------------
-- Rewrite_Coextension --
-------------------------
procedure Rewrite_Coextension (N : Node_Id) is
Temp_Id : constant Node_Id := Make_Temporary (Loc, 'C');
Temp_Decl : Node_Id;
begin
-- Generate:
-- Cnn : aliased Etyp;
Temp_Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Temp_Id,
Aliased_Present => True,
Object_Definition => New_Occurrence_Of (Etyp, Loc));
if Nkind (Expression (N)) = N_Qualified_Expression then
Set_Expression (Temp_Decl, Expression (Expression (N)));
end if;
Insert_Action (N, Temp_Decl);
Rewrite (N,
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Temp_Id, Loc),
Attribute_Name => Name_Unrestricted_Access));
Analyze_And_Resolve (N, PtrT);
end Rewrite_Coextension;
------------------------------
-- Size_In_Storage_Elements --
------------------------------
function Size_In_Storage_Elements (E : Entity_Id) return Node_Id is
Idx : Node_Id := First_Index (E);
Len : Node_Id;
Res : Node_Id := Empty;
begin
-- Logically this just returns E'Max_Size_In_Storage_Elements.
-- However, the reason for the existence of this function is to
-- construct a test for sizes too large, which means near the 32-bit
-- limit on a 32-bit machine, and precisely the trouble is that we
-- get overflows when sizes are greater than 2**31.
-- So what we end up doing for array types is to use the expression:
-- number-of-elements * component_type'Max_Size_In_Storage_Elements
-- which avoids this problem. All this is a bit bogus, but it does
-- mean we catch common cases of trying to allocate arrays that are
-- too large, and which in the absence of a check results in
-- undetected chaos ???
for J in 1 .. Number_Dimensions (E) loop
if not Is_Modular_Integer_Type (Etype (Idx)) then
Len :=
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (E, Loc),
Attribute_Name => Name_Length,
Expressions => New_List (Make_Integer_Literal (Loc, J)));
-- For indexes that are modular types we cannot generate code to
-- compute 'Length since for large arrays 'Last -'First + 1 causes
-- overflow; therefore we compute 'Last - 'First (which is not the
-- exact number of components but it is valid for the purpose of
-- this runtime check on 32-bit targets).
else
declare
Len_Minus_1_Expr : Node_Id;
Test_Gt : Node_Id;
begin
Test_Gt :=
Make_Op_Gt (Loc,
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (E, Loc),
Attribute_Name => Name_Last,
Expressions =>
New_List (Make_Integer_Literal (Loc, J))),
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (E, Loc),
Attribute_Name => Name_First,
Expressions =>
New_List (Make_Integer_Literal (Loc, J))));
Len_Minus_1_Expr :=
Convert_To (Standard_Unsigned,
Make_Op_Subtract (Loc,
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (E, Loc),
Attribute_Name => Name_Last,
Expressions =>
New_List (Make_Integer_Literal (Loc, J))),
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (E, Loc),
Attribute_Name => Name_First,
Expressions =>
New_List (Make_Integer_Literal (Loc, J)))));
-- Handle superflat arrays, i.e. arrays with such bounds as
-- 4 .. 2, to ensure that the result is correct.
-- Generate:
-- (if X'Last > X'First then X'Last - X'First else 0)
Len :=
Make_If_Expression (Loc,
Expressions => New_List (
Test_Gt,
Len_Minus_1_Expr,
Make_Integer_Literal (Loc, Uint_0)));
end;
end if;
if J = 1 then
Res := Len;
else
pragma Assert (Present (Res));
Res :=
Make_Op_Multiply (Loc,
Left_Opnd => Res,
Right_Opnd => Len);
end if;
Next_Index (Idx);
end loop;
return
Make_Op_Multiply (Loc,
Left_Opnd => Len,
Right_Opnd =>
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Component_Type (E), Loc),
Attribute_Name => Name_Max_Size_In_Storage_Elements));
end Size_In_Storage_Elements;
-- Local variables
Dtyp : constant Entity_Id := Available_View (Designated_Type (PtrT));
Desig : Entity_Id;
Nod : Node_Id;
Pool : Entity_Id;
Rel_Typ : Entity_Id;
Temp : Entity_Id;
-- Start of processing for Expand_N_Allocator
begin
-- Warn on the presence of an allocator of an anonymous access type when
-- enabled, except when it's an object declaration at library level.
if Warn_On_Anonymous_Allocators
and then Ekind (PtrT) = E_Anonymous_Access_Type
and then not (Is_Library_Level_Entity (PtrT)
and then Nkind (Associated_Node_For_Itype (PtrT)) =
N_Object_Declaration)
then
Error_Msg_N ("?_a?use of an anonymous access type allocator", N);
end if;
-- RM E.2.2(17). We enforce that the expected type of an allocator
-- shall not be a remote access-to-class-wide-limited-private type.
-- We probably shouldn't be doing this legality check during expansion,
-- but this is only an issue for Annex E users, and is unlikely to be a
-- problem in practice.
Validate_Remote_Access_To_Class_Wide_Type (N);
-- Processing for anonymous access-to-controlled types. These access
-- types receive a special finalization master which appears in the
-- declarations of the enclosing semantic unit. This expansion is done
-- now to ensure that any additional types generated by this routine or
-- Expand_Allocator_Expression inherit the proper type attributes.
if (Ekind (PtrT) = E_Anonymous_Access_Type
or else (Is_Itype (PtrT) and then No (Finalization_Master (PtrT))))
and then Needs_Finalization (Dtyp)
then
-- Detect the allocation of an anonymous controlled object where the
-- type of the context is named. For example:
-- procedure Proc (Ptr : Named_Access_Typ);
-- Proc (new Designated_Typ);
-- Regardless of the anonymous-to-named access type conversion, the
-- lifetime of the object must be associated with the named access
-- type. Use the finalization-related attributes of this type.
if Nkind (Parent (N)) in N_Type_Conversion
| N_Unchecked_Type_Conversion
and then Ekind (Etype (Parent (N))) in E_Access_Subtype
| E_Access_Type
| E_General_Access_Type
then
Rel_Typ := Etype (Parent (N));
else
Rel_Typ := Empty;
end if;
-- Anonymous access-to-controlled types allocate on the global pool.
-- Note that this is a "root type only" attribute.
if No (Associated_Storage_Pool (PtrT)) then
if Present (Rel_Typ) then
Set_Associated_Storage_Pool
(Root_Type (PtrT), Associated_Storage_Pool (Rel_Typ));
else
Set_Associated_Storage_Pool
(Root_Type (PtrT), RTE (RE_Global_Pool_Object));
end if;
end if;
-- The finalization master must be inserted and analyzed as part of
-- the current semantic unit. Note that the master is updated when
-- analysis changes current units. Note that this is a "root type
-- only" attribute.
if Present (Rel_Typ) then
Set_Finalization_Master
(Root_Type (PtrT), Finalization_Master (Rel_Typ));
else
Build_Anonymous_Master (Root_Type (PtrT));
end if;
end if;
-- Set the storage pool and find the appropriate version of Allocate to
-- call. Do not overwrite the storage pool if it is already set, which
-- can happen for build-in-place function returns (see
-- Exp_Ch4.Expand_N_Extended_Return_Statement).
if No (Storage_Pool (N)) then
Pool := Associated_Storage_Pool (Root_Type (PtrT));
if Present (Pool) then
Set_Storage_Pool (N, Pool);
if Is_RTE (Pool, RE_SS_Pool) then
Check_Restriction (No_Secondary_Stack, N);
Set_Procedure_To_Call (N, RTE (RE_SS_Allocate));
-- In the case of an allocator for a simple storage pool, locate
-- and save a reference to the pool type's Allocate routine.
elsif Present (Get_Rep_Pragma
(Etype (Pool), Name_Simple_Storage_Pool_Type))
then
declare
Pool_Type : constant Entity_Id := Base_Type (Etype (Pool));
Alloc_Op : Entity_Id;
begin
Alloc_Op := Get_Name_Entity_Id (Name_Allocate);
while Present (Alloc_Op) loop
if Scope (Alloc_Op) = Scope (Pool_Type)
and then Present (First_Formal (Alloc_Op))
and then Etype (First_Formal (Alloc_Op)) = Pool_Type
then
Set_Procedure_To_Call (N, Alloc_Op);
exit;
else
Alloc_Op := Homonym (Alloc_Op);
end if;
end loop;
end;
elsif Is_Class_Wide_Type (Etype (Pool)) then
Set_Procedure_To_Call (N, RTE (RE_Allocate_Any));
else
Set_Procedure_To_Call (N,
Find_Storage_Op (Etype (Pool), Name_Allocate));
end if;
end if;
end if;
-- Under certain circumstances we can replace an allocator by an access
-- to statically allocated storage. The conditions, as noted in AARM
-- 3.10 (10c) are as follows:
-- Size and initial value is known at compile time
-- Access type is access-to-constant
-- The allocator is not part of a constraint on a record component,
-- because in that case the inserted actions are delayed until the
-- record declaration is fully analyzed, which is too late for the
-- analysis of the rewritten allocator.
if Is_Access_Constant (PtrT)
and then Nkind (Expression (N)) = N_Qualified_Expression
and then Compile_Time_Known_Value (Expression (Expression (N)))
and then Size_Known_At_Compile_Time
(Etype (Expression (Expression (N))))
and then not Is_Record_Type (Current_Scope)
then
-- Here we can do the optimization. For the allocator
-- new x'(y)
-- We insert an object declaration
-- Tnn : aliased x := y;
-- and replace the allocator by Tnn'Unrestricted_Access. Tnn is
-- marked as requiring static allocation.
Temp := Make_Temporary (Loc, 'T', Expression (Expression (N)));
Desig := Subtype_Mark (Expression (N));
-- If context is constrained, use constrained subtype directly,
-- so that the constant is not labelled as having a nominally
-- unconstrained subtype.
if Entity (Desig) = Base_Type (Dtyp) then
Desig := New_Occurrence_Of (Dtyp, Loc);
end if;
Insert_Action (N,
Make_Object_Declaration (Loc,
Defining_Identifier => Temp,
Aliased_Present => True,
Constant_Present => Is_Access_Constant (PtrT),
Object_Definition => Desig,
Expression => Expression (Expression (N))));
Rewrite (N,
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Temp, Loc),
Attribute_Name => Name_Unrestricted_Access));
Analyze_And_Resolve (N, PtrT);
-- We set the variable as statically allocated, since we don't want
-- it going on the stack of the current procedure.
Set_Is_Statically_Allocated (Temp);
return;
end if;
-- Same if the allocator is an access discriminant for a local object:
-- instead of an allocator we create a local value and constrain the
-- enclosing object with the corresponding access attribute.
if Is_Static_Coextension (N) then
Rewrite_Coextension (N);
return;
end if;
-- Check for size too large, we do this because the back end misses
-- proper checks here and can generate rubbish allocation calls when
-- we are near the limit. We only do this for the 32-bit address case
-- since that is from a practical point of view where we see a problem.
if System_Address_Size = 32
and then not Storage_Checks_Suppressed (PtrT)
and then not Storage_Checks_Suppressed (Dtyp)
and then not Storage_Checks_Suppressed (Etyp)
then
-- The check we want to generate should look like
-- if Etyp'Max_Size_In_Storage_Elements > 3.5 gigabytes then
-- raise Storage_Error;
-- end if;
-- where 3.5 gigabytes is a constant large enough to accommodate any
-- reasonable request for. But we can't do it this way because at
-- least at the moment we don't compute this attribute right, and
-- can silently give wrong results when the result gets large. Since
-- this is all about large results, that's bad, so instead we only
-- apply the check for constrained arrays, and manually compute the
-- value of the attribute ???
-- The check on No_Initialization is used here to prevent generating
-- this runtime check twice when the allocator is locally replaced by
-- the expander with another one.
if Is_Array_Type (Etyp) and then not No_Initialization (N) then
declare
Cond : Node_Id;
Ins_Nod : Node_Id := N;
Siz_Typ : Entity_Id := Etyp;
Expr : Node_Id;
begin
-- For unconstrained array types initialized with a qualified
-- expression we use its type to perform this check
if not Is_Constrained (Etyp)
and then not No_Initialization (N)
and then Nkind (Expression (N)) = N_Qualified_Expression
then
Expr := Expression (Expression (N));
Siz_Typ := Etype (Expression (Expression (N)));
-- If the qualified expression has been moved to an internal
-- temporary (to remove side effects) then we must insert
-- the runtime check before its declaration to ensure that
-- the check is performed before the execution of the code
-- computing the qualified expression.
if Nkind (Expr) = N_Identifier
and then Is_Internal_Name (Chars (Expr))
and then
Nkind (Parent (Entity (Expr))) = N_Object_Declaration
then
Ins_Nod := Parent (Entity (Expr));
else
Ins_Nod := Expr;
end if;
end if;
if Is_Constrained (Siz_Typ)
and then Ekind (Siz_Typ) /= E_String_Literal_Subtype
then
-- For CCG targets, the largest array may have up to 2**31-1
-- components (i.e. 2 gigabytes if each array component is
-- one byte). This ensures that fat pointer fields do not
-- overflow, since they are 32-bit integer types, and also
-- ensures that 'Length can be computed at run time.
if Modify_Tree_For_C then
Cond :=
Make_Op_Gt (Loc,
Left_Opnd => Size_In_Storage_Elements (Siz_Typ),
Right_Opnd => Make_Integer_Literal (Loc,
Uint_2 ** 31 - Uint_1));
-- For native targets the largest object is 3.5 gigabytes
else
Cond :=
Make_Op_Gt (Loc,
Left_Opnd => Size_In_Storage_Elements (Siz_Typ),
Right_Opnd => Make_Integer_Literal (Loc,
Uint_7 * (Uint_2 ** 29)));
end if;
Insert_Action (Ins_Nod,
Make_Raise_Storage_Error (Loc,
Condition => Cond,
Reason => SE_Object_Too_Large));
if Entity (Cond) = Standard_True then
Error_Msg_N
("object too large: Storage_Error will be raised at "
& "run time??", N);
end if;
end if;
end;
end if;
end if;
-- If no storage pool has been specified, or the storage pool
-- is System.Pool_Global.Global_Pool_Object, and the restriction
-- No_Standard_Allocators_After_Elaboration is present, then generate
-- a call to Elaboration_Allocators.Check_Standard_Allocator.
if Nkind (N) = N_Allocator
and then (No (Storage_Pool (N))
or else Is_RTE (Storage_Pool (N), RE_Global_Pool_Object))
and then Restriction_Active (No_Standard_Allocators_After_Elaboration)
then
Insert_Action (N,
Make_Procedure_Call_Statement (Loc,
Name =>
New_Occurrence_Of (RTE (RE_Check_Standard_Allocator), Loc)));
end if;
-- Handle case of qualified expression (other than optimization above)
if Nkind (Expression (N)) = N_Qualified_Expression then
Expand_Allocator_Expression (N);
return;
end if;
-- If the allocator is for a type which requires initialization, and
-- there is no initial value (i.e. operand is a subtype indication
-- rather than a qualified expression), then we must generate a call to
-- the initialization routine using an expressions action node:
-- [Pnnn : constant ptr_T := new (T); Init (Pnnn.all,...); Pnnn]
-- Here ptr_T is the pointer type for the allocator, and T is the
-- subtype of the allocator. A special case arises if the designated
-- type of the access type is a task or contains tasks. In this case
-- the call to Init (Temp.all ...) is replaced by code that ensures
-- that tasks get activated (see Exp_Ch9.Build_Task_Allocate_Block
-- for details). In addition, if the type T is a task type, then the
-- first argument to Init must be converted to the task record type.
declare
T : constant Entity_Id := Etype (Expression (N));
Args : List_Id;
Decls : List_Id;
Decl : Node_Id;
Discr : Elmt_Id;
Init : Entity_Id;
Init_Arg1 : Node_Id;
Init_Call : Node_Id;
Temp_Decl : Node_Id;
Temp_Type : Entity_Id;
begin
-- Apply constraint checks against designated subtype (RM 4.8(10/2))
-- but ignore the expression if the No_Initialization flag is set.
-- Discriminant checks will be generated by the expansion below.
if Is_Array_Type (Dtyp) and then not No_Initialization (N) then
Apply_Constraint_Check (Expression (N), Dtyp, No_Sliding => True);
Apply_Predicate_Check (Expression (N), Dtyp);
if Nkind (Expression (N)) = N_Raise_Constraint_Error then
Rewrite (N, New_Copy (Expression (N)));
Set_Etype (N, PtrT);
return;
end if;
end if;
if No_Initialization (N) then
-- Even though this might be a simple allocation, create a custom
-- Allocate if the context requires it.
if Present (Finalization_Master (PtrT)) then
Build_Allocate_Deallocate_Proc
(N => N,
Is_Allocate => True);
end if;
-- Optimize the default allocation of an array object when pragma
-- Initialize_Scalars or Normalize_Scalars is in effect. Construct an
-- in-place initialization aggregate which may be convert into a fast
-- memset by the backend.
elsif Init_Or_Norm_Scalars
and then Is_Array_Type (T)
-- The array must lack atomic components because they are treated
-- as non-static, and as a result the backend will not initialize
-- the memory in one go.
and then not Has_Atomic_Components (T)
-- The array must not be packed because the invalid values in
-- System.Scalar_Values are multiples of Storage_Unit.
and then not Is_Packed (T)
-- The array must have static non-empty ranges, otherwise the
-- backend cannot initialize the memory in one go.
and then Has_Static_Non_Empty_Array_Bounds (T)
-- The optimization is only relevant for arrays of scalar types
and then Is_Scalar_Type (Component_Type (T))
-- Similar to regular array initialization using a type init proc,
-- predicate checks are not performed because the initialization
-- values are intentionally invalid, and may violate the predicate.
and then not Has_Predicates (Component_Type (T))
-- The component type must have a single initialization value
and then Needs_Simple_Initialization
(Typ => Component_Type (T),
Consider_IS => True)
then
Set_Analyzed (N);
Temp := Make_Temporary (Loc, 'P');
-- Generate:
-- Temp : Ptr_Typ := new ...;
Insert_Action
(Assoc_Node => N,
Ins_Action =>
Make_Object_Declaration (Loc,
Defining_Identifier => Temp,
Object_Definition => New_Occurrence_Of (PtrT, Loc),
Expression => Relocate_Node (N)),
Suppress => All_Checks);
-- Generate:
-- Temp.all := (others => ...);
Insert_Action
(Assoc_Node => N,
Ins_Action =>
Make_Assignment_Statement (Loc,
Name =>
Make_Explicit_Dereference (Loc,
Prefix => New_Occurrence_Of (Temp, Loc)),
Expression =>
Get_Simple_Init_Val
(Typ => T,
N => N,
Size => Esize (Component_Type (T)))),
Suppress => All_Checks);
Rewrite (N, New_Occurrence_Of (Temp, Loc));
Analyze_And_Resolve (N, PtrT);
-- Case of no initialization procedure present
elsif not Has_Non_Null_Base_Init_Proc (T) then
-- Case of simple initialization required
if Needs_Simple_Initialization (T) then
Check_Restriction (No_Default_Initialization, N);
Rewrite (Expression (N),
Make_Qualified_Expression (Loc,
Subtype_Mark => New_Occurrence_Of (T, Loc),
Expression => Get_Simple_Init_Val (T, N)));
Analyze_And_Resolve (Expression (Expression (N)), T);
Analyze_And_Resolve (Expression (N), T);
Set_Paren_Count (Expression (Expression (N)), 1);
Expand_N_Allocator (N);
-- No initialization required
else
Build_Allocate_Deallocate_Proc
(N => N,
Is_Allocate => True);
end if;
-- Case of initialization procedure present, must be called
-- NOTE: There is a *huge* amount of code duplication here from
-- Build_Initialization_Call. We should probably refactor???
else
Check_Restriction (No_Default_Initialization, N);
if not Restriction_Active (No_Default_Initialization) then
Init := Base_Init_Proc (T);
Nod := N;
Temp := Make_Temporary (Loc, 'P');
-- Construct argument list for the initialization routine call
Init_Arg1 :=
Make_Explicit_Dereference (Loc,
Prefix =>
New_Occurrence_Of (Temp, Loc));
Set_Assignment_OK (Init_Arg1);
Temp_Type := PtrT;
-- The initialization procedure expects a specific type. if the
-- context is access to class wide, indicate that the object
-- being allocated has the right specific type.
if Is_Class_Wide_Type (Dtyp) then
Init_Arg1 := Unchecked_Convert_To (T, Init_Arg1);
end if;
-- If designated type is a concurrent type or if it is private
-- type whose definition is a concurrent type, the first
-- argument in the Init routine has to be unchecked conversion
-- to the corresponding record type. If the designated type is
-- a derived type, also convert the argument to its root type.
if Is_Concurrent_Type (T) then
Init_Arg1 :=
Unchecked_Convert_To (
Corresponding_Record_Type (T), Init_Arg1);
elsif Is_Private_Type (T)
and then Present (Full_View (T))
and then Is_Concurrent_Type (Full_View (T))
then
Init_Arg1 :=
Unchecked_Convert_To
(Corresponding_Record_Type (Full_View (T)), Init_Arg1);
elsif Etype (First_Formal (Init)) /= Base_Type (T) then
declare
Ftyp : constant Entity_Id := Etype (First_Formal (Init));
begin
Init_Arg1 := OK_Convert_To (Etype (Ftyp), Init_Arg1);
Set_Etype (Init_Arg1, Ftyp);
end;
end if;
Args := New_List (Init_Arg1);
-- For the task case, pass the Master_Id of the access type as
-- the value of the _Master parameter, and _Chain as the value
-- of the _Chain parameter (_Chain will be defined as part of
-- the generated code for the allocator).
-- In Ada 2005, the context may be a function that returns an
-- anonymous access type. In that case the Master_Id has been
-- created when expanding the function declaration.
if Has_Task (T) then
if No (Master_Id (Base_Type (PtrT))) then
-- The designated type was an incomplete type, and the
-- access type did not get expanded. Salvage it now.
if Present (Parent (Base_Type (PtrT))) then
Expand_N_Full_Type_Declaration
(Parent (Base_Type (PtrT)));
-- The only other possibility is an itype. For this
-- case, the master must exist in the context. This is
-- the case when the allocator initializes an access
-- component in an init-proc.
else
pragma Assert (Is_Itype (PtrT));
Build_Master_Renaming (PtrT, N);
end if;
end if;
-- If the context of the allocator is a declaration or an
-- assignment, we can generate a meaningful image for it,
-- even though subsequent assignments might remove the
-- connection between task and entity. We build this image
-- when the left-hand side is a simple variable, a simple
-- indexed assignment or a simple selected component.
if Nkind (Parent (N)) = N_Assignment_Statement then
declare
Nam : constant Node_Id := Name (Parent (N));
begin
if Is_Entity_Name (Nam) then
Decls :=
Build_Task_Image_Decls
(Loc,
New_Occurrence_Of
(Entity (Nam), Sloc (Nam)), T);
elsif Nkind (Nam) in N_Indexed_Component
| N_Selected_Component
and then Is_Entity_Name (Prefix (Nam))
then
Decls :=
Build_Task_Image_Decls
(Loc, Nam, Etype (Prefix (Nam)));
else
Decls := Build_Task_Image_Decls (Loc, T, T);
end if;
end;
elsif Nkind (Parent (N)) = N_Object_Declaration then
Decls :=
Build_Task_Image_Decls
(Loc, Defining_Identifier (Parent (N)), T);
else
Decls := Build_Task_Image_Decls (Loc, T, T);
end if;
if Restriction_Active (No_Task_Hierarchy) then
Append_To
(Args, Make_Integer_Literal (Loc, Library_Task_Level));
else
Append_To (Args,
New_Occurrence_Of
(Master_Id (Base_Type (Root_Type (PtrT))), Loc));
end if;
Append_To (Args, Make_Identifier (Loc, Name_uChain));
Decl := Last (Decls);
Append_To (Args,
New_Occurrence_Of (Defining_Identifier (Decl), Loc));
-- Has_Task is false, Decls not used
else
Decls := No_List;
end if;
-- Add discriminants if discriminated type
declare
Dis : Boolean := False;
Typ : Entity_Id := Empty;
begin
if Has_Discriminants (T) then
Dis := True;
Typ := T;
-- Type may be a private type with no visible discriminants
-- in which case check full view if in scope, or the
-- underlying_full_view if dealing with a type whose full
-- view may be derived from a private type whose own full
-- view has discriminants.
elsif Is_Private_Type (T) then
if Present (Full_View (T))
and then Has_Discriminants (Full_View (T))
then
Dis := True;
Typ := Full_View (T);
elsif Present (Underlying_Full_View (T))
and then Has_Discriminants (Underlying_Full_View (T))
then
Dis := True;
Typ := Underlying_Full_View (T);
end if;
end if;
if Dis then
-- If the allocated object will be constrained by the
-- default values for discriminants, then build a subtype
-- with those defaults, and change the allocated subtype
-- to that. Note that this happens in fewer cases in Ada
-- 2005 (AI-363).
if not Is_Constrained (Typ)
and then Present (Discriminant_Default_Value
(First_Discriminant (Typ)))
and then (Ada_Version < Ada_2005
or else not
Object_Type_Has_Constrained_Partial_View
(Typ, Current_Scope))
then
Typ := Build_Default_Subtype (Typ, N);
Set_Expression (N, New_Occurrence_Of (Typ, Loc));
end if;
Discr := First_Elmt (Discriminant_Constraint (Typ));
while Present (Discr) loop
Nod := Node (Discr);
Append (New_Copy_Tree (Node (Discr)), Args);
-- AI-416: when the discriminant constraint is an
-- anonymous access type make sure an accessibility
-- check is inserted if necessary (3.10.2(22.q/2))
if Ada_Version >= Ada_2005
and then
Ekind (Etype (Nod)) = E_Anonymous_Access_Type
and then not
No_Dynamic_Accessibility_Checks_Enabled (Nod)
then
Apply_Accessibility_Check
(Nod, Typ, Insert_Node => Nod);
end if;
Next_Elmt (Discr);
end loop;
end if;
end;
-- We set the allocator as analyzed so that when we analyze
-- the if expression node, we do not get an unwanted recursive
-- expansion of the allocator expression.
Set_Analyzed (N, True);
Nod := Relocate_Node (N);
-- Here is the transformation:
-- input: new Ctrl_Typ
-- output: Temp : constant Ctrl_Typ_Ptr := new Ctrl_Typ;
-- Ctrl_TypIP (Temp.all, ...);
-- [Deep_]Initialize (Temp.all);
-- Here Ctrl_Typ_Ptr is the pointer type for the allocator, and
-- is the subtype of the allocator.
Temp_Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Temp,
Constant_Present => True,
Object_Definition => New_Occurrence_Of (Temp_Type, Loc),
Expression => Nod);
Set_Assignment_OK (Temp_Decl);
Insert_Action (N, Temp_Decl, Suppress => All_Checks);
Build_Allocate_Deallocate_Proc (Temp_Decl, True);
-- If the designated type is a task type or contains tasks,
-- create block to activate created tasks, and insert
-- declaration for Task_Image variable ahead of call.
if Has_Task (T) then
declare
L : constant List_Id := New_List;
Blk : Node_Id;
begin
Build_Task_Allocate_Block (L, Nod, Args);
Blk := Last (L);
Insert_List_Before (First (Declarations (Blk)), Decls);
Insert_Actions (N, L);
end;
else
Insert_Action (N,
Make_Procedure_Call_Statement (Loc,
Name => New_Occurrence_Of (Init, Loc),
Parameter_Associations => Args));
end if;
if Needs_Finalization (T) then
-- Generate:
-- [Deep_]Initialize (Init_Arg1);
Init_Call :=
Make_Init_Call
(Obj_Ref => New_Copy_Tree (Init_Arg1),
Typ => T);
-- Guard against a missing [Deep_]Initialize when the
-- designated type was not properly frozen.
if Present (Init_Call) then
Insert_Action (N, Init_Call);
end if;
end if;
Rewrite (N, New_Occurrence_Of (Temp, Loc));
Analyze_And_Resolve (N, PtrT);
-- When designated type has Default_Initial_Condition aspects,
-- make a call to the type's DIC procedure to perform the
-- checks. Theoretically this might also be needed for cases
-- where the type doesn't have an init proc, but those should
-- be very uncommon, and for now we only support the init proc
-- case. ???
if Has_DIC (Dtyp)
and then Present (DIC_Procedure (Dtyp))
and then not Has_Null_Body (DIC_Procedure (Dtyp))
then
Insert_Action (N,
Build_DIC_Call (Loc,
Make_Explicit_Dereference (Loc,
Prefix => New_Occurrence_Of (Temp, Loc)),
Dtyp));
end if;
end if;
end if;
end;
-- Ada 2005 (AI-251): If the allocator is for a class-wide interface
-- object that has been rewritten as a reference, we displace "this"
-- to reference properly its secondary dispatch table.
if Nkind (N) = N_Identifier and then Is_Interface (Dtyp) then
Displace_Allocator_Pointer (N);
end if;
exception
when RE_Not_Available =>
return;
end Expand_N_Allocator;
-----------------------
-- Expand_N_And_Then --
-----------------------
procedure Expand_N_And_Then (N : Node_Id)
renames Expand_Short_Circuit_Operator;
------------------------------
-- Expand_N_Case_Expression --
------------------------------
procedure Expand_N_Case_Expression (N : Node_Id) is
function Is_Copy_Type (Typ : Entity_Id) return Boolean;
-- Return True if we can copy objects of this type when expanding a case
-- expression.
------------------
-- Is_Copy_Type --
------------------
function Is_Copy_Type (Typ : Entity_Id) return Boolean is
begin
-- If Minimize_Expression_With_Actions is True, we can afford to copy
-- large objects, as long as they are constrained and not limited.
return
Is_Elementary_Type (Underlying_Type (Typ))
or else
(Minimize_Expression_With_Actions
and then Is_Constrained (Underlying_Type (Typ))
and then not Is_Limited_Type (Underlying_Type (Typ)));
end Is_Copy_Type;
-- Local variables
Loc : constant Source_Ptr := Sloc (N);
Par : constant Node_Id := Parent (N);
Typ : constant Entity_Id := Etype (N);
Acts : List_Id;
Alt : Node_Id;
Case_Stmt : Node_Id;
Decl : Node_Id;
Expr : Node_Id;
Target : Entity_Id := Empty;
Target_Typ : Entity_Id;
In_Predicate : Boolean := False;
-- Flag set when the case expression appears within a predicate
Optimize_Return_Stmt : Boolean := False;
-- Flag set when the case expression can be optimized in the context of
-- a simple return statement.
-- Start of processing for Expand_N_Case_Expression
begin
-- Check for MINIMIZED/ELIMINATED overflow mode
if Minimized_Eliminated_Overflow_Check (N) then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- If the case expression is a predicate specification, and the type
-- to which it applies has a static predicate aspect, do not expand,
-- because it will be converted to the proper predicate form later.
if Ekind (Current_Scope) in E_Function | E_Procedure
and then Is_Predicate_Function (Current_Scope)
then
In_Predicate := True;
if Has_Static_Predicate_Aspect (Etype (First_Entity (Current_Scope)))
then
return;
end if;
end if;
-- When the type of the case expression is elementary, expand
-- (case X is when A => AX, when B => BX ...)
-- into
-- do
-- Target : Typ;
-- case X is
-- when A =>
-- Target := AX;
-- when B =>
-- Target := BX;
-- ...
-- end case;
-- in Target end;
-- In all other cases expand into
-- do
-- type Ptr_Typ is access all Typ;
-- Target : Ptr_Typ;
-- case X is
-- when A =>
-- Target := AX'Unrestricted_Access;
-- when B =>
-- Target := BX'Unrestricted_Access;
-- ...
-- end case;
-- in Target.all end;
-- This approach avoids extra copies of potentially large objects. It
-- also allows handling of values of limited or unconstrained types.
-- Note that we do the copy also for constrained, nonlimited types
-- when minimizing expressions with actions (e.g. when generating C
-- code) since it allows us to do the optimization below in more cases.
-- Small optimization: when the case expression appears in the context
-- of a simple return statement, expand into
-- case X is
-- when A =>
-- return AX;
-- when B =>
-- return BX;
-- ...
-- end case;
Case_Stmt :=
Make_Case_Statement (Loc,
Expression => Expression (N),
Alternatives => New_List);
-- Preserve the original context for which the case statement is being
-- generated. This is needed by the finalization machinery to prevent
-- the premature finalization of controlled objects found within the
-- case statement.
Set_From_Conditional_Expression (Case_Stmt);
Acts := New_List;
-- Scalar/Copy case
if Is_Copy_Type (Typ) then
Target_Typ := Typ;
-- Do not perform the optimization when the return statement is
-- within a predicate function, as this causes spurious errors.
Optimize_Return_Stmt :=
Nkind (Par) = N_Simple_Return_Statement and then not In_Predicate;
-- Otherwise create an access type to handle the general case using
-- 'Unrestricted_Access.
-- Generate:
-- type Ptr_Typ is access all Typ;
else
if Generate_C_Code then
-- We cannot ensure that correct C code will be generated if any
-- temporary is created down the line (to e.g. handle checks or
-- capture values) since we might end up with dangling references
-- to local variables, so better be safe and reject the construct.
Error_Msg_N
("case expression too complex, use case statement instead", N);
end if;
Target_Typ := Make_Temporary (Loc, 'P');
Append_To (Acts,
Make_Full_Type_Declaration (Loc,
Defining_Identifier => Target_Typ,
Type_Definition =>
Make_Access_To_Object_Definition (Loc,
All_Present => True,
Subtype_Indication => New_Occurrence_Of (Typ, Loc))));
end if;
-- Create the declaration of the target which captures the value of the
-- expression.
-- Generate:
-- Target : [Ptr_]Typ;
if not Optimize_Return_Stmt then
Target := Make_Temporary (Loc, 'T');
Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Target,
Object_Definition => New_Occurrence_Of (Target_Typ, Loc));
Set_No_Initialization (Decl);
Append_To (Acts, Decl);
end if;
-- Process the alternatives
Alt := First (Alternatives (N));
while Present (Alt) loop
declare
Alt_Expr : Node_Id := Expression (Alt);
Alt_Loc : constant Source_Ptr := Sloc (Alt_Expr);
LHS : Node_Id;
Stmts : List_Id;
begin
-- Take the unrestricted access of the expression value for non-
-- scalar types. This approach avoids big copies and covers the
-- limited and unconstrained cases.
-- Generate:
-- AX'Unrestricted_Access
if not Is_Copy_Type (Typ) then
Alt_Expr :=
Make_Attribute_Reference (Alt_Loc,
Prefix => Relocate_Node (Alt_Expr),
Attribute_Name => Name_Unrestricted_Access);
end if;
-- Generate:
-- return AX['Unrestricted_Access];
if Optimize_Return_Stmt then
Stmts := New_List (
Make_Simple_Return_Statement (Alt_Loc,
Expression => Alt_Expr));
-- Generate:
-- Target := AX['Unrestricted_Access];
else
LHS := New_Occurrence_Of (Target, Loc);
Set_Assignment_OK (LHS);
Stmts := New_List (
Make_Assignment_Statement (Alt_Loc,
Name => LHS,
Expression => Alt_Expr));
end if;
-- Propagate declarations inserted in the node by Insert_Actions
-- (for example, temporaries generated to remove side effects).
-- These actions must remain attached to the alternative, given
-- that they are generated by the corresponding expression.
if Present (Actions (Alt)) then
Prepend_List (Actions (Alt), Stmts);
end if;
-- Finalize any transient objects on exit from the alternative.
-- This is done only in the return optimization case because
-- otherwise the case expression is converted into an expression
-- with actions which already contains this form of processing.
if Optimize_Return_Stmt then
Process_If_Case_Statements (N, Stmts);
end if;
Append_To
(Alternatives (Case_Stmt),
Make_Case_Statement_Alternative (Sloc (Alt),
Discrete_Choices => Discrete_Choices (Alt),
Statements => Stmts));
end;
Next (Alt);
end loop;
-- Rewrite the parent return statement as a case statement
if Optimize_Return_Stmt then
Rewrite (Par, Case_Stmt);
Analyze (Par);
-- Otherwise convert the case expression into an expression with actions
else
Append_To (Acts, Case_Stmt);
if Is_Copy_Type (Typ) then
Expr := New_Occurrence_Of (Target, Loc);
else
Expr :=
Make_Explicit_Dereference (Loc,
Prefix => New_Occurrence_Of (Target, Loc));
end if;
-- Generate:
-- do
-- ...
-- in Target[.all] end;
Rewrite (N,
Make_Expression_With_Actions (Loc,
Expression => Expr,
Actions => Acts));
Analyze_And_Resolve (N, Typ);
end if;
end Expand_N_Case_Expression;
-----------------------------------
-- Expand_N_Explicit_Dereference --
-----------------------------------
procedure Expand_N_Explicit_Dereference (N : Node_Id) is
begin
-- Insert explicit dereference call for the checked storage pool case
Insert_Dereference_Action (Prefix (N));
-- If the type is an Atomic type for which Atomic_Sync is enabled, then
-- we set the atomic sync flag.
if Is_Atomic (Etype (N))
and then not Atomic_Synchronization_Disabled (Etype (N))
then
Activate_Atomic_Synchronization (N);
end if;
end Expand_N_Explicit_Dereference;
--------------------------------------
-- Expand_N_Expression_With_Actions --
--------------------------------------
procedure Expand_N_Expression_With_Actions (N : Node_Id) is
Acts : constant List_Id := Actions (N);
procedure Force_Boolean_Evaluation (Expr : Node_Id);
-- Force the evaluation of Boolean expression Expr
function Process_Action (Act : Node_Id) return Traverse_Result;
-- Inspect and process a single action of an expression_with_actions for
-- transient objects. If such objects are found, the routine generates
-- code to clean them up when the context of the expression is evaluated
-- or elaborated.
------------------------------
-- Force_Boolean_Evaluation --
------------------------------
procedure Force_Boolean_Evaluation (Expr : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Flag_Decl : Node_Id;
Flag_Id : Entity_Id;
begin
-- Relocate the expression to the actions list by capturing its value
-- in a Boolean flag. Generate:
-- Flag : constant Boolean := Expr;
Flag_Id := Make_Temporary (Loc, 'F');
Flag_Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Flag_Id,
Constant_Present => True,
Object_Definition => New_Occurrence_Of (Standard_Boolean, Loc),
Expression => Relocate_Node (Expr));
Append (Flag_Decl, Acts);
Analyze (Flag_Decl);
-- Replace the expression with a reference to the flag
Rewrite (Expression (N), New_Occurrence_Of (Flag_Id, Loc));
Analyze (Expression (N));
end Force_Boolean_Evaluation;
--------------------
-- Process_Action --
--------------------
function Process_Action (Act : Node_Id) return Traverse_Result is
begin
if Nkind (Act) = N_Object_Declaration
and then Is_Finalizable_Transient (Act, N)
then
Process_Transient_In_Expression (Act, N, Acts);
return Skip;
-- Avoid processing temporary function results multiple times when
-- dealing with nested expression_with_actions.
-- Similarly, do not process temporary function results in loops.
-- This is done by Expand_N_Loop_Statement and Build_Finalizer.
-- Note that we used to wrongly return Abandon instead of Skip here:
-- this is wrong since it means that we were ignoring lots of
-- relevant subsequent statements.
elsif Nkind (Act) in N_Expression_With_Actions | N_Loop_Statement then
return Skip;
end if;
return OK;
end Process_Action;
procedure Process_Single_Action is new Traverse_Proc (Process_Action);
-- Local variables
Act : Node_Id;
-- Start of processing for Expand_N_Expression_With_Actions
begin
-- Do not evaluate the expression when it denotes an entity because the
-- expression_with_actions node will be replaced by the reference.
if Is_Entity_Name (Expression (N)) then
null;
-- Do not evaluate the expression when there are no actions because the
-- expression_with_actions node will be replaced by the expression.
elsif Is_Empty_List (Acts) then
null;
-- Force the evaluation of the expression by capturing its value in a
-- temporary. This ensures that aliases of transient objects do not leak
-- to the expression of the expression_with_actions node:
-- do
-- Trans_Id : Ctrl_Typ := ...;
-- Alias : ... := Trans_Id;
-- in ... Alias ... end;
-- In the example above, Trans_Id cannot be finalized at the end of the
-- actions list because this may affect the alias and the final value of
-- the expression_with_actions. Forcing the evaluation encapsulates the
-- reference to the Alias within the actions list:
-- do
-- Trans_Id : Ctrl_Typ := ...;
-- Alias : ... := Trans_Id;
-- Val : constant Boolean := ... Alias ...;
-- <finalize Trans_Id>
-- in Val end;
-- Once this transformation is performed, it is safe to finalize the
-- transient object at the end of the actions list.
-- Note that Force_Evaluation does not remove side effects in operators
-- because it assumes that all operands are evaluated and side effect
-- free. This is not the case when an operand depends implicitly on the
-- transient object through the use of access types.
elsif Is_Boolean_Type (Etype (Expression (N))) then
Force_Boolean_Evaluation (Expression (N));
-- The expression of an expression_with_actions node may not necessarily
-- be Boolean when the node appears in an if expression. In this case do
-- the usual forced evaluation to encapsulate potential aliasing.
else
Force_Evaluation (Expression (N));
end if;
-- Process all transient objects found within the actions of the EWA
-- node.
Act := First (Acts);
while Present (Act) loop
Process_Single_Action (Act);
Next (Act);
end loop;
-- Deal with case where there are no actions. In this case we simply
-- rewrite the node with its expression since we don't need the actions
-- and the specification of this node does not allow a null action list.
-- Note: we use Rewrite instead of Replace, because Codepeer is using
-- the expanded tree and relying on being able to retrieve the original
-- tree in cases like this. This raises a whole lot of issues of whether
-- we have problems elsewhere, which will be addressed in the future???
if Is_Empty_List (Acts) then
Rewrite (N, Relocate_Node (Expression (N)));
end if;
end Expand_N_Expression_With_Actions;
----------------------------
-- Expand_N_If_Expression --
----------------------------
-- Deal with limited types and condition actions
procedure Expand_N_If_Expression (N : Node_Id) is
Cond : constant Node_Id := First (Expressions (N));
Loc : constant Source_Ptr := Sloc (N);
Thenx : constant Node_Id := Next (Cond);
Elsex : constant Node_Id := Next (Thenx);
Typ : constant Entity_Id := Etype (N);
Actions : List_Id;
Decl : Node_Id;
Expr : Node_Id;
New_If : Node_Id;
New_N : Node_Id;
-- Determine if we are dealing with a special case of a conditional
-- expression used as an actual for an anonymous access type which
-- forces us to transform the if expression into an expression with
-- actions in order to create a temporary to capture the level of the
-- expression in each branch.
Force_Expand : constant Boolean := Is_Anonymous_Access_Actual (N);
-- Start of processing for Expand_N_If_Expression
begin
-- Check for MINIMIZED/ELIMINATED overflow mode.
-- Apply_Arithmetic_Overflow_Check will not deal with Then/Else_Actions
-- so skip this step if any actions are present.
if Minimized_Eliminated_Overflow_Check (N)
and then No (Then_Actions (N))
and then No (Else_Actions (N))
then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- Fold at compile time if condition known. We have already folded
-- static if expressions, but it is possible to fold any case in which
-- the condition is known at compile time, even though the result is
-- non-static.
-- Note that we don't do the fold of such cases in Sem_Elab because
-- it can cause infinite loops with the expander adding a conditional
-- expression, and Sem_Elab circuitry removing it repeatedly.
if Compile_Time_Known_Value (Cond) then
declare
function Fold_Known_Value (Cond : Node_Id) return Boolean;
-- Fold at compile time. Assumes condition known. Return True if
-- folding occurred, meaning we're done.
----------------------
-- Fold_Known_Value --
----------------------
function Fold_Known_Value (Cond : Node_Id) return Boolean is
begin
if Is_True (Expr_Value (Cond)) then
Expr := Thenx;
Actions := Then_Actions (N);
else
Expr := Elsex;
Actions := Else_Actions (N);
end if;
Remove (Expr);
if Present (Actions) then
-- To minimize the use of Expression_With_Actions, just skip
-- the optimization as it is not critical for correctness.
if Minimize_Expression_With_Actions then
return False;
end if;
Rewrite (N,
Make_Expression_With_Actions (Loc,
Expression => Relocate_Node (Expr),
Actions => Actions));
Analyze_And_Resolve (N, Typ);
else
Rewrite (N, Relocate_Node (Expr));
end if;
-- Note that the result is never static (legitimate cases of
-- static if expressions were folded in Sem_Eval).
Set_Is_Static_Expression (N, False);
return True;
end Fold_Known_Value;
begin
if Fold_Known_Value (Cond) then
return;
end if;
end;
end if;
-- If the type is limited, and the back end does not handle limited
-- types, then we expand as follows to avoid the possibility of
-- improper copying.
-- type Ptr is access all Typ;
-- Cnn : Ptr;
-- if cond then
-- <<then actions>>
-- Cnn := then-expr'Unrestricted_Access;
-- else
-- <<else actions>>
-- Cnn := else-expr'Unrestricted_Access;
-- end if;
-- and replace the if expression by a reference to Cnn.all.
-- This special case can be skipped if the back end handles limited
-- types properly and ensures that no incorrect copies are made.
if Is_By_Reference_Type (Typ)
and then not Back_End_Handles_Limited_Types
then
-- When the "then" or "else" expressions involve controlled function
-- calls, generated temporaries are chained on the corresponding list
-- of actions. These temporaries need to be finalized after the if
-- expression is evaluated.
Process_If_Case_Statements (N, Then_Actions (N));
Process_If_Case_Statements (N, Else_Actions (N));
declare
Cnn : constant Entity_Id := Make_Temporary (Loc, 'C', N);
Ptr_Typ : constant Entity_Id := Make_Temporary (Loc, 'A');
begin
-- Generate:
-- type Ann is access all Typ;
Insert_Action (N,
Make_Full_Type_Declaration (Loc,
Defining_Identifier => Ptr_Typ,
Type_Definition =>
Make_Access_To_Object_Definition (Loc,
All_Present => True,
Subtype_Indication => New_Occurrence_Of (Typ, Loc))));
-- Generate:
-- Cnn : Ann;
Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Cnn,
Object_Definition => New_Occurrence_Of (Ptr_Typ, Loc));
-- Generate:
-- if Cond then
-- Cnn := <Thenx>'Unrestricted_Access;
-- else
-- Cnn := <Elsex>'Unrestricted_Access;
-- end if;
New_If :=
Make_Implicit_If_Statement (N,
Condition => Relocate_Node (Cond),
Then_Statements => New_List (
Make_Assignment_Statement (Sloc (Thenx),
Name => New_Occurrence_Of (Cnn, Sloc (Thenx)),
Expression =>
Make_Attribute_Reference (Loc,
Prefix => Relocate_Node (Thenx),
Attribute_Name => Name_Unrestricted_Access))),
Else_Statements => New_List (
Make_Assignment_Statement (Sloc (Elsex),
Name => New_Occurrence_Of (Cnn, Sloc (Elsex)),
Expression =>
Make_Attribute_Reference (Loc,
Prefix => Relocate_Node (Elsex),
Attribute_Name => Name_Unrestricted_Access))));
-- Preserve the original context for which the if statement is
-- being generated. This is needed by the finalization machinery
-- to prevent the premature finalization of controlled objects
-- found within the if statement.
Set_From_Conditional_Expression (New_If);
New_N :=
Make_Explicit_Dereference (Loc,
Prefix => New_Occurrence_Of (Cnn, Loc));
end;
-- If the result is an unconstrained array and the if expression is in a
-- context other than the initializing expression of the declaration of
-- an object, then we pull out the if expression as follows:
-- Cnn : constant typ := if-expression
-- and then replace the if expression with an occurrence of Cnn. This
-- avoids the need in the back end to create on-the-fly variable length
-- temporaries (which it cannot do!)
-- Note that the test for being in an object declaration avoids doing an
-- unnecessary expansion, and also avoids infinite recursion.
elsif Is_Array_Type (Typ) and then not Is_Constrained (Typ)
and then (Nkind (Parent (N)) /= N_Object_Declaration
or else Expression (Parent (N)) /= N)
then
declare
Cnn : constant Node_Id := Make_Temporary (Loc, 'C', N);
begin
Insert_Action (N,
Make_Object_Declaration (Loc,
Defining_Identifier => Cnn,
Constant_Present => True,
Object_Definition => New_Occurrence_Of (Typ, Loc),
Expression => Relocate_Node (N),
Has_Init_Expression => True));
Rewrite (N, New_Occurrence_Of (Cnn, Loc));
return;
end;
-- For other types, we only need to expand if there are other actions
-- associated with either branch or we need to force expansion to deal
-- with if expressions used as an actual of an anonymous access type.
elsif Present (Then_Actions (N))
or else Present (Else_Actions (N))
or else Force_Expand
then
-- We now wrap the actions into the appropriate expression
if Minimize_Expression_With_Actions
and then (Is_Elementary_Type (Underlying_Type (Typ))
or else Is_Constrained (Underlying_Type (Typ)))
then
-- If we can't use N_Expression_With_Actions nodes, then we insert
-- the following sequence of actions (using Insert_Actions):
-- Cnn : typ;
-- if cond then
-- <<then actions>>
-- Cnn := then-expr;
-- else
-- <<else actions>>
-- Cnn := else-expr
-- end if;
-- and replace the if expression by a reference to Cnn
declare
Cnn : constant Node_Id := Make_Temporary (Loc, 'C', N);
begin
Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Cnn,
Object_Definition => New_Occurrence_Of (Typ, Loc));
New_If :=
Make_Implicit_If_Statement (N,
Condition => Relocate_Node (Cond),
Then_Statements => New_List (
Make_Assignment_Statement (Sloc (Thenx),
Name => New_Occurrence_Of (Cnn, Sloc (Thenx)),
Expression => Relocate_Node (Thenx))),
Else_Statements => New_List (
Make_Assignment_Statement (Sloc (Elsex),
Name => New_Occurrence_Of (Cnn, Sloc (Elsex)),
Expression => Relocate_Node (Elsex))));
Set_Assignment_OK (Name (First (Then_Statements (New_If))));
Set_Assignment_OK (Name (First (Else_Statements (New_If))));
New_N := New_Occurrence_Of (Cnn, Loc);
end;
-- Regular path using Expression_With_Actions
else
if Present (Then_Actions (N)) then
Rewrite (Thenx,
Make_Expression_With_Actions (Sloc (Thenx),
Actions => Then_Actions (N),
Expression => Relocate_Node (Thenx)));
Set_Then_Actions (N, No_List);
Analyze_And_Resolve (Thenx, Typ);
end if;
if Present (Else_Actions (N)) then
Rewrite (Elsex,
Make_Expression_With_Actions (Sloc (Elsex),
Actions => Else_Actions (N),
Expression => Relocate_Node (Elsex)));
Set_Else_Actions (N, No_List);
Analyze_And_Resolve (Elsex, Typ);
end if;
-- We must force expansion into an expression with actions when
-- an if expression gets used directly as an actual for an
-- anonymous access type.
if Force_Expand then
declare
Cnn : constant Entity_Id := Make_Temporary (Loc, 'C');
Acts : List_Id;
begin
Acts := New_List;
-- Generate:
-- Cnn : Ann;
Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Cnn,
Object_Definition => New_Occurrence_Of (Typ, Loc));
Append_To (Acts, Decl);
Set_No_Initialization (Decl);
-- Generate:
-- if Cond then
-- Cnn := <Thenx>;
-- else
-- Cnn := <Elsex>;
-- end if;
New_If :=
Make_Implicit_If_Statement (N,
Condition => Relocate_Node (Cond),
Then_Statements => New_List (
Make_Assignment_Statement (Sloc (Thenx),
Name => New_Occurrence_Of (Cnn, Sloc (Thenx)),
Expression => Relocate_Node (Thenx))),
Else_Statements => New_List (
Make_Assignment_Statement (Sloc (Elsex),
Name => New_Occurrence_Of (Cnn, Sloc (Elsex)),
Expression => Relocate_Node (Elsex))));
Append_To (Acts, New_If);
-- Generate:
-- do
-- ...
-- in Cnn end;
Rewrite (N,
Make_Expression_With_Actions (Loc,
Expression => New_Occurrence_Of (Cnn, Loc),
Actions => Acts));
Analyze_And_Resolve (N, Typ);
end;
end if;
return;
end if;
-- For the sake of GNATcoverage, generate an intermediate temporary in
-- the case where the if-expression is a condition in an outer decision,
-- in order to make sure that no branch is shared between the decisions.
elsif Opt.Suppress_Control_Flow_Optimizations
and then Nkind (Original_Node (Parent (N))) in N_Case_Expression
| N_Case_Statement
| N_If_Expression
| N_If_Statement
| N_Goto_When_Statement
| N_Loop_Statement
| N_Return_When_Statement
| N_Short_Circuit
then
declare
Cnn : constant Entity_Id := Make_Temporary (Loc, 'C');
Acts : List_Id;
begin
-- Generate:
-- do
-- Cnn : constant Typ := N;
-- in Cnn end
Acts := New_List (
Make_Object_Declaration (Loc,
Defining_Identifier => Cnn,
Constant_Present => True,
Object_Definition => New_Occurrence_Of (Typ, Loc),
Expression => Relocate_Node (N)));
Rewrite (N,
Make_Expression_With_Actions (Loc,
Expression => New_Occurrence_Of (Cnn, Loc),
Actions => Acts));
Analyze_And_Resolve (N, Typ);
return;
end;
-- If no actions then no expansion needed, gigi will handle it using the
-- same approach as a C conditional expression.
else
return;
end if;
-- Fall through here for either the limited expansion, or the case of
-- inserting actions for nonlimited types. In both these cases, we must
-- move the SLOC of the parent If statement to the newly created one and
-- change it to the SLOC of the expression which, after expansion, will
-- correspond to what is being evaluated.
if Present (Parent (N)) and then Nkind (Parent (N)) = N_If_Statement then
Set_Sloc (New_If, Sloc (Parent (N)));
Set_Sloc (Parent (N), Loc);
end if;
-- Move Then_Actions and Else_Actions, if any, to the new if statement
Insert_List_Before (First (Then_Statements (New_If)), Then_Actions (N));
Insert_List_Before (First (Else_Statements (New_If)), Else_Actions (N));
Insert_Action (N, Decl);
Insert_Action (N, New_If);
Rewrite (N, New_N);
Analyze_And_Resolve (N, Typ);
end Expand_N_If_Expression;
-----------------
-- Expand_N_In --
-----------------
procedure Expand_N_In (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Restyp : constant Entity_Id := Etype (N);
Lop : constant Node_Id := Left_Opnd (N);
Rop : constant Node_Id := Right_Opnd (N);
Static : constant Boolean := Is_OK_Static_Expression (N);
procedure Substitute_Valid_Check;
-- Replaces node N by Lop'Valid. This is done when we have an explicit
-- test for the left operand being in range of its subtype.
----------------------------
-- Substitute_Valid_Check --
----------------------------
procedure Substitute_Valid_Check is
function Is_OK_Object_Reference (Nod : Node_Id) return Boolean;
-- Determine whether arbitrary node Nod denotes a source object that
-- may safely act as prefix of attribute 'Valid.
----------------------------
-- Is_OK_Object_Reference --
----------------------------
function Is_OK_Object_Reference (Nod : Node_Id) return Boolean is
Obj_Ref : Node_Id;
begin
-- Inspect the original operand
Obj_Ref := Original_Node (Nod);
-- The object reference must be a source construct, otherwise the
-- codefix suggestion may refer to nonexistent code from a user
-- perspective.
if Comes_From_Source (Obj_Ref) then
loop
if Nkind (Obj_Ref) in
N_Type_Conversion |
N_Unchecked_Type_Conversion |
N_Qualified_Expression
then
Obj_Ref := Expression (Obj_Ref);
else
exit;
end if;
end loop;
return Is_Object_Reference (Obj_Ref);
end if;
return False;
end Is_OK_Object_Reference;
-- Start of processing for Substitute_Valid_Check
begin
Rewrite (N,
Make_Attribute_Reference (Loc,
Prefix => Relocate_Node (Lop),
Attribute_Name => Name_Valid));
Analyze_And_Resolve (N, Restyp);
-- Emit a warning when the left-hand operand of the membership test
-- is a source object, otherwise the use of attribute 'Valid would be
-- illegal. The warning is not given when overflow checking is either
-- MINIMIZED or ELIMINATED, as the danger of optimization has been
-- eliminated above.
if Is_OK_Object_Reference (Lop)
and then Overflow_Check_Mode not in Minimized_Or_Eliminated
then
Error_Msg_N
("??explicit membership test may be optimized away", N);
Error_Msg_N -- CODEFIX
("\??use ''Valid attribute instead", N);
end if;
end Substitute_Valid_Check;
-- Local variables
Ltyp : Entity_Id;
Rtyp : Entity_Id;
-- Start of processing for Expand_N_In
begin
-- If set membership case, expand with separate procedure
if Present (Alternatives (N)) then
Expand_Set_Membership (N);
return;
end if;
-- Not set membership, proceed with expansion
Ltyp := Etype (Left_Opnd (N));
Rtyp := Etype (Right_Opnd (N));
-- If MINIMIZED/ELIMINATED overflow mode and type is a signed integer
-- type, then expand with a separate procedure. Note the use of the
-- flag No_Minimize_Eliminate to prevent infinite recursion.
if Minimized_Eliminated_Overflow_Check (Left_Opnd (N))
and then not No_Minimize_Eliminate (N)
then
Expand_Membership_Minimize_Eliminate_Overflow (N);
return;
end if;
-- Check case of explicit test for an expression in range of its
-- subtype. This is suspicious usage and we replace it with a 'Valid
-- test and give a warning for scalar types.
if Is_Scalar_Type (Ltyp)
-- Only relevant for source comparisons
and then Comes_From_Source (N)
-- In floating-point this is a standard way to check for finite values
-- and using 'Valid would typically be a pessimization.
and then not Is_Floating_Point_Type (Ltyp)
-- Don't give the message unless right operand is a type entity and
-- the type of the left operand matches this type. Note that this
-- eliminates the cases where MINIMIZED/ELIMINATED mode overflow
-- checks have changed the type of the left operand.
and then Nkind (Rop) in N_Has_Entity
and then Ltyp = Entity (Rop)
-- Skip this for predicated types, where such expressions are a
-- reasonable way of testing if something meets the predicate.
and then not Present (Predicate_Function (Ltyp))
then
Substitute_Valid_Check;
return;
end if;
-- Do validity check on operands
if Validity_Checks_On and Validity_Check_Operands then
Ensure_Valid (Left_Opnd (N));
Validity_Check_Range (Right_Opnd (N));
end if;
-- Case of explicit range
if Nkind (Rop) = N_Range then
declare
Lo : constant Node_Id := Low_Bound (Rop);
Hi : constant Node_Id := High_Bound (Rop);
Lo_Orig : constant Node_Id := Original_Node (Lo);
Hi_Orig : constant Node_Id := Original_Node (Hi);
Lcheck : Compare_Result;
Ucheck : Compare_Result;
Warn1 : constant Boolean :=
Constant_Condition_Warnings
and then Comes_From_Source (N)
and then not In_Instance;
-- This must be true for any of the optimization warnings, we
-- clearly want to give them only for source with the flag on. We
-- also skip these warnings in an instance since it may be the
-- case that different instantiations have different ranges.
Warn2 : constant Boolean :=
Warn1
and then Nkind (Original_Node (Rop)) = N_Range
and then Is_Integer_Type (Etype (Lo));
-- For the case where only one bound warning is elided, we also
-- insist on an explicit range and an integer type. The reason is
-- that the use of enumeration ranges including an end point is
-- common, as is the use of a subtype name, one of whose bounds is
-- the same as the type of the expression.
begin
-- If test is explicit x'First .. x'Last, replace by valid check
if Is_Scalar_Type (Ltyp)
-- And left operand is X'First where X matches left operand
-- type (this eliminates cases of type mismatch, including
-- the cases where ELIMINATED/MINIMIZED mode has changed the
-- type of the left operand.
and then Nkind (Lo_Orig) = N_Attribute_Reference
and then Attribute_Name (Lo_Orig) = Name_First
and then Nkind (Prefix (Lo_Orig)) in N_Has_Entity
and then Entity (Prefix (Lo_Orig)) = Ltyp
-- Same tests for right operand
and then Nkind (Hi_Orig) = N_Attribute_Reference
and then Attribute_Name (Hi_Orig) = Name_Last
and then Nkind (Prefix (Hi_Orig)) in N_Has_Entity
and then Entity (Prefix (Hi_Orig)) = Ltyp
-- Relevant only for source cases
and then Comes_From_Source (N)
then
Substitute_Valid_Check;
goto Leave;
end if;
-- If bounds of type are known at compile time, and the end points
-- are known at compile time and identical, this is another case
-- for substituting a valid test. We only do this for discrete
-- types, since it won't arise in practice for float types.
if Comes_From_Source (N)
and then Is_Discrete_Type (Ltyp)
and then Compile_Time_Known_Value (Type_High_Bound (Ltyp))
and then Compile_Time_Known_Value (Type_Low_Bound (Ltyp))
and then Compile_Time_Known_Value (Lo)
and then Compile_Time_Known_Value (Hi)
and then Expr_Value (Type_High_Bound (Ltyp)) = Expr_Value (Hi)
and then Expr_Value (Type_Low_Bound (Ltyp)) = Expr_Value (Lo)
-- Kill warnings in instances, since they may be cases where we
-- have a test in the generic that makes sense with some types
-- and not with other types.
-- Similarly, do not rewrite membership as a validity check if
-- within the predicate function for the type.
-- Finally, if the original bounds are type conversions, even
-- if they have been folded into constants, there are different
-- types involved and 'Valid is not appropriate.
then
if In_Instance
or else (Ekind (Current_Scope) = E_Function
and then Is_Predicate_Function (Current_Scope))
then
null;
elsif Nkind (Lo_Orig) = N_Type_Conversion
or else Nkind (Hi_Orig) = N_Type_Conversion
then
null;
else
Substitute_Valid_Check;
goto Leave;
end if;
end if;
-- If we have an explicit range, do a bit of optimization based on
-- range analysis (we may be able to kill one or both checks).
Lcheck := Compile_Time_Compare (Lop, Lo, Assume_Valid => False);
Ucheck := Compile_Time_Compare (Lop, Hi, Assume_Valid => False);
-- If either check is known to fail, replace result by False since
-- the other check does not matter. Preserve the static flag for
-- legality checks, because we are constant-folding beyond RM 4.9.
if Lcheck = LT or else Ucheck = GT then
if Warn1 then
Error_Msg_N ("?c?range test optimized away", N);
Error_Msg_N ("\?c?value is known to be out of range", N);
end if;
Rewrite (N, New_Occurrence_Of (Standard_False, Loc));
Analyze_And_Resolve (N, Restyp);
Set_Is_Static_Expression (N, Static);
goto Leave;
-- If both checks are known to succeed, replace result by True,
-- since we know we are in range.
elsif Lcheck in Compare_GE and then Ucheck in Compare_LE then
if Warn1 then
Error_Msg_N ("?c?range test optimized away", N);
Error_Msg_N ("\?c?value is known to be in range", N);
end if;
Rewrite (N, New_Occurrence_Of (Standard_True, Loc));
Analyze_And_Resolve (N, Restyp);
Set_Is_Static_Expression (N, Static);
goto Leave;
-- If lower bound check succeeds and upper bound check is not
-- known to succeed or fail, then replace the range check with
-- a comparison against the upper bound.
elsif Lcheck in Compare_GE then
if Warn2 and then not In_Instance then
Error_Msg_N ("??lower bound test optimized away", Lo);
Error_Msg_N ("\??value is known to be in range", Lo);
end if;
Rewrite (N,
Make_Op_Le (Loc,
Left_Opnd => Lop,
Right_Opnd => High_Bound (Rop)));
Analyze_And_Resolve (N, Restyp);
goto Leave;
-- If upper bound check succeeds and lower bound check is not
-- known to succeed or fail, then replace the range check with
-- a comparison against the lower bound.
elsif Ucheck in Compare_LE then
if Warn2 and then not In_Instance then
Error_Msg_N ("??upper bound test optimized away", Hi);
Error_Msg_N ("\??value is known to be in range", Hi);
end if;
Rewrite (N,
Make_Op_Ge (Loc,
Left_Opnd => Lop,
Right_Opnd => Low_Bound (Rop)));
Analyze_And_Resolve (N, Restyp);
goto Leave;
end if;
-- We couldn't optimize away the range check, but there is one
-- more issue. If we are checking constant conditionals, then we
-- see if we can determine the outcome assuming everything is
-- valid, and if so give an appropriate warning.
if Warn1 and then not Assume_No_Invalid_Values then
Lcheck := Compile_Time_Compare (Lop, Lo, Assume_Valid => True);
Ucheck := Compile_Time_Compare (Lop, Hi, Assume_Valid => True);
-- Result is out of range for valid value
if Lcheck = LT or else Ucheck = GT then
Error_Msg_N
("?c?value can only be in range if it is invalid", N);
-- Result is in range for valid value
elsif Lcheck in Compare_GE and then Ucheck in Compare_LE then
Error_Msg_N
("?c?value can only be out of range if it is invalid", N);
-- Lower bound check succeeds if value is valid
elsif Warn2 and then Lcheck in Compare_GE then
Error_Msg_N
("?c?lower bound check only fails if it is invalid", Lo);
-- Upper bound check succeeds if value is valid
elsif Warn2 and then Ucheck in Compare_LE then
Error_Msg_N
("?c?upper bound check only fails for invalid values", Hi);
end if;
end if;
end;
-- Try to narrow the operation
if Ltyp = Universal_Integer and then Nkind (N) = N_In then
Narrow_Large_Operation (N);
end if;
-- For all other cases of an explicit range, nothing to be done
goto Leave;
-- Here right operand is a subtype mark
else
declare
Typ : Entity_Id := Etype (Rop);
Is_Acc : constant Boolean := Is_Access_Type (Typ);
Check_Null_Exclusion : Boolean;
Cond : Node_Id := Empty;
New_N : Node_Id;
Obj : Node_Id := Lop;
SCIL_Node : Node_Id;
begin
Remove_Side_Effects (Obj);
-- For tagged type, do tagged membership operation
if Is_Tagged_Type (Typ) then
-- No expansion will be performed for VM targets, as the VM
-- back ends will handle the membership tests directly.
if Tagged_Type_Expansion then
Tagged_Membership (N, SCIL_Node, New_N);
Rewrite (N, New_N);
Analyze_And_Resolve (N, Restyp, Suppress => All_Checks);
-- Update decoration of relocated node referenced by the
-- SCIL node.
if Generate_SCIL and then Present (SCIL_Node) then
Set_SCIL_Node (N, SCIL_Node);
end if;
end if;
goto Leave;
-- If type is scalar type, rewrite as x in t'First .. t'Last.
-- This reason we do this is that the bounds may have the wrong
-- type if they come from the original type definition. Also this
-- way we get all the processing above for an explicit range.
-- Don't do this for predicated types, since in this case we
-- want to check the predicate.
elsif Is_Scalar_Type (Typ) then
if No (Predicate_Function (Typ)) then
Rewrite (Rop,
Make_Range (Loc,
Low_Bound =>
Make_Attribute_Reference (Loc,
Attribute_Name => Name_First,
Prefix => New_Occurrence_Of (Typ, Loc)),
High_Bound =>
Make_Attribute_Reference (Loc,
Attribute_Name => Name_Last,
Prefix => New_Occurrence_Of (Typ, Loc))));
Analyze_And_Resolve (N, Restyp);
end if;
goto Leave;
-- Ada 2005 (AI95-0216 amended by AI12-0162): Program_Error is
-- raised when evaluating an individual membership test if the
-- subtype mark denotes a constrained Unchecked_Union subtype
-- and the expression lacks inferable discriminants.
elsif Is_Unchecked_Union (Base_Type (Typ))
and then Is_Constrained (Typ)
and then not Has_Inferable_Discriminants (Lop)
then
Rewrite (N,
Make_Expression_With_Actions (Loc,
Actions =>
New_List (Make_Raise_Program_Error (Loc,
Reason => PE_Unchecked_Union_Restriction)),
Expression =>
New_Occurrence_Of (Standard_False, Loc)));
Analyze_And_Resolve (N, Restyp);
goto Leave;
end if;
-- Here we have a non-scalar type
if Is_Acc then
-- If the null exclusion checks are not compatible, need to
-- perform further checks. In other words, we cannot have
-- Ltyp including null and Typ excluding null. All other cases
-- are OK.
Check_Null_Exclusion :=
Can_Never_Be_Null (Typ) and then not Can_Never_Be_Null (Ltyp);
Typ := Designated_Type (Typ);
end if;
if not Is_Constrained (Typ) then
Cond := New_Occurrence_Of (Standard_True, Loc);
-- For the constrained array case, we have to check the subscripts
-- for an exact match if the lengths are non-zero (the lengths
-- must match in any case).
elsif Is_Array_Type (Typ) then
Check_Subscripts : declare
function Build_Attribute_Reference
(E : Node_Id;
Nam : Name_Id;
Dim : Nat) return Node_Id;
-- Build attribute reference E'Nam (Dim)
-------------------------------
-- Build_Attribute_Reference --
-------------------------------
function Build_Attribute_Reference
(E : Node_Id;
Nam : Name_Id;
Dim : Nat) return Node_Id
is
begin
return
Make_Attribute_Reference (Loc,
Prefix => E,
Attribute_Name => Nam,
Expressions => New_List (
Make_Integer_Literal (Loc, Dim)));
end Build_Attribute_Reference;
-- Start of processing for Check_Subscripts
begin
for J in 1 .. Number_Dimensions (Typ) loop
Evolve_And_Then (Cond,
Make_Op_Eq (Loc,
Left_Opnd =>
Build_Attribute_Reference
(Duplicate_Subexpr_No_Checks (Obj),
Name_First, J),
Right_Opnd =>
Build_Attribute_Reference
(New_Occurrence_Of (Typ, Loc), Name_First, J)));
Evolve_And_Then (Cond,
Make_Op_Eq (Loc,
Left_Opnd =>
Build_Attribute_Reference
(Duplicate_Subexpr_No_Checks (Obj),
Name_Last, J),
Right_Opnd =>
Build_Attribute_Reference
(New_Occurrence_Of (Typ, Loc), Name_Last, J)));
end loop;
end Check_Subscripts;
-- These are the cases where constraint checks may be required,
-- e.g. records with possible discriminants
else
-- Expand the test into a series of discriminant comparisons.
-- The expression that is built is the negation of the one that
-- is used for checking discriminant constraints.
Obj := Relocate_Node (Left_Opnd (N));
if Has_Discriminants (Typ) then
Cond := Make_Op_Not (Loc,
Right_Opnd => Build_Discriminant_Checks (Obj, Typ));
else
Cond := New_Occurrence_Of (Standard_True, Loc);
end if;
end if;
if Is_Acc then
if Check_Null_Exclusion then
Cond := Make_And_Then (Loc,
Left_Opnd =>
Make_Op_Ne (Loc,
Left_Opnd => Obj,
Right_Opnd => Make_Null (Loc)),
Right_Opnd => Cond);
else
Cond := Make_Or_Else (Loc,
Left_Opnd =>
Make_Op_Eq (Loc,
Left_Opnd => Obj,
Right_Opnd => Make_Null (Loc)),
Right_Opnd => Cond);
end if;
end if;
Rewrite (N, Cond);
Analyze_And_Resolve (N, Restyp);
-- Ada 2012 (AI05-0149): Handle membership tests applied to an
-- expression of an anonymous access type. This can involve an
-- accessibility test and a tagged type membership test in the
-- case of tagged designated types.
if Ada_Version >= Ada_2012
and then Is_Acc
and then Ekind (Ltyp) = E_Anonymous_Access_Type
then
declare
Expr_Entity : Entity_Id := Empty;
New_N : Node_Id;
Param_Level : Node_Id;
Type_Level : Node_Id;
begin
if Is_Entity_Name (Lop) then
Expr_Entity := Param_Entity (Lop);
if not Present (Expr_Entity) then
Expr_Entity := Entity (Lop);
end if;
end if;
-- When restriction No_Dynamic_Accessibility_Checks is in
-- effect, expand the membership test to a static value
-- since we cannot rely on dynamic levels.
if No_Dynamic_Accessibility_Checks_Enabled (Lop) then
if Static_Accessibility_Level
(Lop, Object_Decl_Level)
> Type_Access_Level (Rtyp)
then
Rewrite (N, New_Occurrence_Of (Standard_False, Loc));
else
Rewrite (N, New_Occurrence_Of (Standard_True, Loc));
end if;
Analyze_And_Resolve (N, Restyp);
-- If a conversion of the anonymous access value to the
-- tested type would be illegal, then the result is False.
elsif not Valid_Conversion
(Lop, Rtyp, Lop, Report_Errs => False)
then
Rewrite (N, New_Occurrence_Of (Standard_False, Loc));
Analyze_And_Resolve (N, Restyp);
-- Apply an accessibility check if the access object has an
-- associated access level and when the level of the type is
-- less deep than the level of the access parameter. This
-- can only occur for access parameters and stand-alone
-- objects of an anonymous access type.
else
Param_Level := Accessibility_Level
(Expr_Entity, Dynamic_Level);
Type_Level :=
Make_Integer_Literal (Loc, Type_Access_Level (Rtyp));
-- Return True only if the accessibility level of the
-- expression entity is not deeper than the level of
-- the tested access type.
Rewrite (N,
Make_And_Then (Loc,
Left_Opnd => Relocate_Node (N),
Right_Opnd => Make_Op_Le (Loc,
Left_Opnd => Param_Level,
Right_Opnd => Type_Level)));
Analyze_And_Resolve (N);
-- If the designated type is tagged, do tagged membership
-- operation.
if Is_Tagged_Type (Typ) then
-- No expansion will be performed for VM targets, as
-- the VM back ends will handle the membership tests
-- directly.
if Tagged_Type_Expansion then
-- Note that we have to pass Original_Node, because
-- the membership test might already have been
-- rewritten by earlier parts of membership test.
Tagged_Membership
(Original_Node (N), SCIL_Node, New_N);
-- Update decoration of relocated node referenced
-- by the SCIL node.
if Generate_SCIL and then Present (SCIL_Node) then
Set_SCIL_Node (New_N, SCIL_Node);
end if;
Rewrite (N,
Make_And_Then (Loc,
Left_Opnd => Relocate_Node (N),
Right_Opnd => New_N));
Analyze_And_Resolve (N, Restyp);
end if;
end if;
end if;
end;
end if;
end;
end if;
-- At this point, we have done the processing required for the basic
-- membership test, but not yet dealt with the predicate.
<<Leave>>
-- If a predicate is present, then we do the predicate test, but we
-- most certainly want to omit this if we are within the predicate
-- function itself, since otherwise we have an infinite recursion.
-- The check should also not be emitted when testing against a range
-- (the check is only done when the right operand is a subtype; see
-- RM12-4.5.2 (28.1/3-30/3)).
Predicate_Check : declare
function In_Range_Check return Boolean;
-- Within an expanded range check that may raise Constraint_Error do
-- not generate a predicate check as well. It is redundant because
-- the context will add an explicit predicate check, and it will
-- raise the wrong exception if it fails.
--------------------
-- In_Range_Check --
--------------------
function In_Range_Check return Boolean is
P : Node_Id;
begin
P := Parent (N);
while Present (P) loop
if Nkind (P) = N_Raise_Constraint_Error then
return True;
elsif Nkind (P) in N_Statement_Other_Than_Procedure_Call
or else Nkind (P) = N_Procedure_Call_Statement
or else Nkind (P) in N_Declaration
then
return False;
end if;
P := Parent (P);
end loop;
return False;
end In_Range_Check;
-- Local variables
PFunc : constant Entity_Id := Predicate_Function (Rtyp);
R_Op : Node_Id;
-- Start of processing for Predicate_Check
begin
if Present (PFunc)
and then Current_Scope /= PFunc
and then Nkind (Rop) /= N_Range
then
if not In_Range_Check then
R_Op := Make_Predicate_Call (Rtyp, Lop, Mem => True);
else
R_Op := New_Occurrence_Of (Standard_True, Loc);
end if;
Rewrite (N,
Make_And_Then (Loc,
Left_Opnd => Relocate_Node (N),
Right_Opnd => R_Op));
-- Analyze new expression, mark left operand as analyzed to
-- avoid infinite recursion adding predicate calls. Similarly,
-- suppress further range checks on the call.
Set_Analyzed (Left_Opnd (N));
Analyze_And_Resolve (N, Standard_Boolean, Suppress => All_Checks);
-- All done, skip attempt at compile time determination of result
return;
end if;
end Predicate_Check;
end Expand_N_In;
--------------------------------
-- Expand_N_Indexed_Component --
--------------------------------
procedure Expand_N_Indexed_Component (N : Node_Id) is
Wild_Reads_May_Have_Bad_Side_Effects : Boolean
renames Validity_Check_Subscripts;
-- This Boolean needs to be True if reading from a bad address can
-- have a bad side effect (e.g., a segmentation fault that is not
-- transformed into a Storage_Error exception, or interactions with
-- memory-mapped I/O) that needs to be prevented. This refers to the
-- act of reading itself, not to any damage that might be caused later
-- by making use of whatever value was read. We assume here that
-- Validity_Check_Subscripts meets this requirement, but introduce
-- this declaration in order to document this assumption.
function Is_Renamed_Variable_Name (N : Node_Id) return Boolean;
-- Returns True if the given name occurs as part of the renaming
-- of a variable. In this case, the indexing operation should be
-- treated as a write, rather than a read, with respect to validity
-- checking. This is because the renamed variable can later be
-- written to.
function Type_Requires_Subscript_Validity_Checks_For_Reads
(Typ : Entity_Id) return Boolean;
-- If Wild_Reads_May_Have_Bad_Side_Effects is False and we are indexing
-- into an array of characters in order to read an element, it is ok
-- if an invalid index value goes undetected. But if it is an array of
-- pointers or an array of tasks, the consequences of such a read are
-- potentially more severe and so we want to detect an invalid index
-- value. This function captures that distinction; this is intended to
-- be consistent with the "but does not by itself lead to erroneous
-- ... execution" rule of RM 13.9.1(11).
------------------------------
-- Is_Renamed_Variable_Name --
------------------------------
function Is_Renamed_Variable_Name (N : Node_Id) return Boolean is
Rover : Node_Id := N;
begin
if Is_Variable (N) then
loop
declare
Rover_Parent : constant Node_Id := Parent (Rover);
begin
case Nkind (Rover_Parent) is
when N_Object_Renaming_Declaration =>
return Rover = Name (Rover_Parent);
when N_Indexed_Component
| N_Slice
| N_Selected_Component
=>
exit when Rover /= Prefix (Rover_Parent);
Rover := Rover_Parent;
-- No need to check for qualified expressions or type
-- conversions here, mostly because of the Is_Variable
-- test. It is possible to have a view conversion for
-- which Is_Variable yields True and which occurs as
-- part of an object renaming, but only if the type is
-- tagged; in that case this function will not be called.
when others =>
exit;
end case;
end;
end loop;
end if;
return False;
end Is_Renamed_Variable_Name;
-------------------------------------------------------
-- Type_Requires_Subscript_Validity_Checks_For_Reads --
-------------------------------------------------------
function Type_Requires_Subscript_Validity_Checks_For_Reads
(Typ : Entity_Id) return Boolean
is
-- a shorter name for recursive calls
function Needs_Check (Typ : Entity_Id) return Boolean renames
Type_Requires_Subscript_Validity_Checks_For_Reads;
begin
if Is_Access_Type (Typ)
or else Is_Tagged_Type (Typ)
or else Is_Concurrent_Type (Typ)
or else (Is_Array_Type (Typ)
and then Needs_Check (Component_Type (Typ)))
or else (Is_Scalar_Type (Typ)
and then Has_Aspect (Typ, Aspect_Default_Value))
then
return True;
end if;
if Is_Record_Type (Typ) then
declare
Comp : Entity_Id := First_Component_Or_Discriminant (Typ);
begin
while Present (Comp) loop
if Needs_Check (Etype (Comp)) then
return True;
end if;
Next_Component_Or_Discriminant (Comp);
end loop;
end;
end if;
return False;
end Type_Requires_Subscript_Validity_Checks_For_Reads;
-- Local constants
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Etype (N);
P : constant Node_Id := Prefix (N);
T : constant Entity_Id := Etype (P);
-- Start of processing for Expand_N_Indexed_Component
begin
-- A special optimization, if we have an indexed component that is
-- selecting from a slice, then we can eliminate the slice, since, for
-- example, x (i .. j)(k) is identical to x(k). The only difference is
-- the range check required by the slice. The range check for the slice
-- itself has already been generated. The range check for the
-- subscripting operation is ensured by converting the subject to
-- the subtype of the slice.
-- This optimization not only generates better code, avoiding slice
-- messing especially in the packed case, but more importantly bypasses
-- some problems in handling this peculiar case, for example, the issue
-- of dealing specially with object renamings.
if Nkind (P) = N_Slice
-- This optimization is disabled for CodePeer because it can transform
-- an index-check constraint_error into a range-check constraint_error
-- and CodePeer cares about that distinction.
and then not CodePeer_Mode
then
Rewrite (N,
Make_Indexed_Component (Loc,
Prefix => Prefix (P),
Expressions => New_List (
Convert_To
(Etype (First_Index (Etype (P))),
First (Expressions (N))))));
Analyze_And_Resolve (N, Typ);
return;
end if;
-- Ada 2005 (AI-318-02): If the prefix is a call to a build-in-place
-- function, then additional actuals must be passed.
if Is_Build_In_Place_Function_Call (P) then
Make_Build_In_Place_Call_In_Anonymous_Context (P);
-- Ada 2005 (AI-318-02): Specialization of the previous case for prefix
-- containing build-in-place function calls whose returned object covers
-- interface types.
elsif Present (Unqual_BIP_Iface_Function_Call (P)) then
Make_Build_In_Place_Iface_Call_In_Anonymous_Context (P);
end if;
-- Generate index and validity checks
declare
Dims_Checked : Dimension_Set (Dimensions =>
(if Is_Array_Type (T)
then Number_Dimensions (T)
else 1));
-- Dims_Checked is used to avoid generating two checks (one in
-- Generate_Index_Checks, one in Apply_Subscript_Validity_Checks)
-- for the same index value in cases where the index check eliminates
-- the need for the validity check. The Is_Array_Type test avoids
-- cascading errors.
begin
Generate_Index_Checks (N, Checks_Generated => Dims_Checked);
if Validity_Checks_On
and then (Validity_Check_Subscripts
or else Wild_Reads_May_Have_Bad_Side_Effects
or else Type_Requires_Subscript_Validity_Checks_For_Reads
(Typ)
or else Is_Renamed_Variable_Name (N))
then
if Validity_Check_Subscripts then
-- If we index into an array with an uninitialized variable
-- and we generate an index check that passes at run time,
-- passing that check does not ensure that the variable is
-- valid (although it does in the common case where the
-- object's subtype matches the index subtype).
-- Consider an uninitialized variable with subtype 1 .. 10
-- used to index into an array with bounds 1 .. 20 when the
-- value of the uninitialized variable happens to be 15.
-- The index check will succeed but the variable is invalid.
-- If Validity_Check_Subscripts is True then we need to
-- ensure validity, so we adjust Dims_Checked accordingly.
Dims_Checked.Elements := (others => False);
elsif Is_Array_Type (T) then
-- We are only adding extra validity checks here to
-- deal with uninitialized variables (but this includes
-- assigning one uninitialized variable to another). Other
-- ways of producing invalid objects imply erroneousness, so
-- the compiler can do whatever it wants for those cases.
-- If an index type has the Default_Value aspect specified,
-- then we don't have to worry about the possibility of an
-- uninitialized variable, so no need for these extra
-- validity checks.
declare
Idx : Node_Id := First_Index (T);
begin
for No_Check_Needed of Dims_Checked.Elements loop
No_Check_Needed := No_Check_Needed
or else Has_Aspect (Etype (Idx), Aspect_Default_Value);
Next_Index (Idx);
end loop;
end;
end if;
Apply_Subscript_Validity_Checks
(N, No_Check_Needed => Dims_Checked);
end if;
end;
-- If selecting from an array with atomic components, and atomic sync
-- is not suppressed for this array type, set atomic sync flag.
if (Has_Atomic_Components (T)
and then not Atomic_Synchronization_Disabled (T))
or else (Is_Atomic (Typ)
and then not Atomic_Synchronization_Disabled (Typ))
or else (Is_Entity_Name (P)
and then Has_Atomic_Components (Entity (P))
and then not Atomic_Synchronization_Disabled (Entity (P)))
then
Activate_Atomic_Synchronization (N);
end if;
-- All done if the prefix is not a packed array implemented specially
if not (Is_Packed (Etype (Prefix (N)))
and then Present (Packed_Array_Impl_Type (Etype (Prefix (N)))))
then
return;
end if;
-- For packed arrays that are not bit-packed (i.e. the case of an array
-- with one or more index types with a non-contiguous enumeration type),
-- we can always use the normal packed element get circuit.
if not Is_Bit_Packed_Array (Etype (Prefix (N))) then
Expand_Packed_Element_Reference (N);
return;
end if;
-- For a reference to a component of a bit packed array, we convert it
-- to a reference to the corresponding Packed_Array_Impl_Type. We only
-- want to do this for simple references, and not for:
-- Left side of assignment, or prefix of left side of assignment, or
-- prefix of the prefix, to handle packed arrays of packed arrays,
-- This case is handled in Exp_Ch5.Expand_N_Assignment_Statement
-- Renaming objects in renaming associations
-- This case is handled when a use of the renamed variable occurs
-- Actual parameters for a subprogram call
-- This case is handled in Exp_Ch6.Expand_Actuals
-- The second expression in a 'Read attribute reference
-- The prefix of an address or bit or size attribute reference
-- The following circuit detects these exceptions. Note that we need to
-- deal with implicit dereferences when climbing up the parent chain,
-- with the additional difficulty that the type of parents may have yet
-- to be resolved since prefixes are usually resolved first.
declare
Child : Node_Id := N;
Parnt : Node_Id := Parent (N);
begin
loop
if Nkind (Parnt) = N_Unchecked_Expression then
null;
elsif Nkind (Parnt) = N_Object_Renaming_Declaration then
return;
elsif Nkind (Parnt) in N_Subprogram_Call
or else (Nkind (Parnt) = N_Parameter_Association
and then Nkind (Parent (Parnt)) in N_Subprogram_Call)
then
return;
elsif Nkind (Parnt) = N_Attribute_Reference
and then Attribute_Name (Parnt) in Name_Address
| Name_Bit
| Name_Size
and then Prefix (Parnt) = Child
then
return;
elsif Nkind (Parnt) = N_Assignment_Statement
and then Name (Parnt) = Child
then
return;
-- If the expression is an index of an indexed component, it must
-- be expanded regardless of context.
elsif Nkind (Parnt) = N_Indexed_Component
and then Child /= Prefix (Parnt)
then
Expand_Packed_Element_Reference (N);
return;
elsif Nkind (Parent (Parnt)) = N_Assignment_Statement
and then Name (Parent (Parnt)) = Parnt
then
return;
elsif Nkind (Parnt) = N_Attribute_Reference
and then Attribute_Name (Parnt) = Name_Read
and then Next (First (Expressions (Parnt))) = Child
then
return;
elsif Nkind (Parnt) = N_Indexed_Component
and then Prefix (Parnt) = Child
then
null;
elsif Nkind (Parnt) = N_Selected_Component
and then Prefix (Parnt) = Child
and then not (Present (Etype (Selector_Name (Parnt)))
and then
Is_Access_Type (Etype (Selector_Name (Parnt))))
then
null;
-- If the parent is a dereference, either implicit or explicit,
-- then the packed reference needs to be expanded.
else
Expand_Packed_Element_Reference (N);
return;
end if;
-- Keep looking up tree for unchecked expression, or if we are the
-- prefix of a possible assignment left side.
Child := Parnt;
Parnt := Parent (Child);
end loop;
end;
end Expand_N_Indexed_Component;
---------------------
-- Expand_N_Not_In --
---------------------
-- Replace a not in b by not (a in b) so that the expansions for (a in b)
-- can be done. This avoids needing to duplicate this expansion code.
procedure Expand_N_Not_In (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Etype (N);
Cfs : constant Boolean := Comes_From_Source (N);
begin
Rewrite (N,
Make_Op_Not (Loc,
Right_Opnd =>
Make_In (Loc,
Left_Opnd => Left_Opnd (N),
Right_Opnd => Right_Opnd (N))));
-- If this is a set membership, preserve list of alternatives
Set_Alternatives (Right_Opnd (N), Alternatives (Original_Node (N)));
-- We want this to appear as coming from source if original does (see
-- transformations in Expand_N_In).
Set_Comes_From_Source (N, Cfs);
Set_Comes_From_Source (Right_Opnd (N), Cfs);
-- Now analyze transformed node
Analyze_And_Resolve (N, Typ);
end Expand_N_Not_In;
-------------------
-- Expand_N_Null --
-------------------
-- The only replacement required is for the case of a null of a type that
-- is an access to protected subprogram, or a subtype thereof. We represent
-- such access values as a record, and so we must replace the occurrence of
-- null by the equivalent record (with a null address and a null pointer in
-- it), so that the back end creates the proper value.
procedure Expand_N_Null (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Base_Type (Etype (N));
Agg : Node_Id;
begin
if Is_Access_Protected_Subprogram_Type (Typ) then
Agg :=
Make_Aggregate (Loc,
Expressions => New_List (
New_Occurrence_Of (RTE (RE_Null_Address), Loc),
Make_Null (Loc)));
Rewrite (N, Agg);
Analyze_And_Resolve (N, Equivalent_Type (Typ));
-- For subsequent semantic analysis, the node must retain its type.
-- Gigi in any case replaces this type by the corresponding record
-- type before processing the node.
Set_Etype (N, Typ);
end if;
exception
when RE_Not_Available =>
return;
end Expand_N_Null;
---------------------
-- Expand_N_Op_Abs --
---------------------
procedure Expand_N_Op_Abs (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Expr : constant Node_Id := Right_Opnd (N);
Typ : constant Entity_Id := Etype (N);
begin
Unary_Op_Validity_Checks (N);
-- Check for MINIMIZED/ELIMINATED overflow mode
if Minimized_Eliminated_Overflow_Check (N) then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- Try to narrow the operation
if Typ = Universal_Integer then
Narrow_Large_Operation (N);
if Nkind (N) /= N_Op_Abs then
return;
end if;
end if;
-- Deal with software overflow checking
if Is_Signed_Integer_Type (Typ)
and then Do_Overflow_Check (N)
then
-- The only case to worry about is when the argument is equal to the
-- largest negative number, so what we do is to insert the check:
-- [constraint_error when Expr = typ'Base'First]
-- with the usual Duplicate_Subexpr use coding for expr
Insert_Action (N,
Make_Raise_Constraint_Error (Loc,
Condition =>
Make_Op_Eq (Loc,
Left_Opnd => Duplicate_Subexpr (Expr),
Right_Opnd =>
Make_Attribute_Reference (Loc,
Prefix =>
New_Occurrence_Of (Base_Type (Etype (Expr)), Loc),
Attribute_Name => Name_First)),
Reason => CE_Overflow_Check_Failed));
Set_Do_Overflow_Check (N, False);
end if;
end Expand_N_Op_Abs;
---------------------
-- Expand_N_Op_Add --
---------------------
procedure Expand_N_Op_Add (N : Node_Id) is
Typ : constant Entity_Id := Etype (N);
begin
Binary_Op_Validity_Checks (N);
-- Check for MINIMIZED/ELIMINATED overflow mode
if Minimized_Eliminated_Overflow_Check (N) then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- N + 0 = 0 + N = N for integer types
if Is_Integer_Type (Typ) then
if Compile_Time_Known_Value (Right_Opnd (N))
and then Expr_Value (Right_Opnd (N)) = Uint_0
then
Rewrite (N, Left_Opnd (N));
return;
elsif Compile_Time_Known_Value (Left_Opnd (N))
and then Expr_Value (Left_Opnd (N)) = Uint_0
then
Rewrite (N, Right_Opnd (N));
return;
end if;
end if;
-- Try to narrow the operation
if Typ = Universal_Integer then
Narrow_Large_Operation (N);
if Nkind (N) /= N_Op_Add then
return;
end if;
end if;
-- Arithmetic overflow checks for signed integer/fixed point types
if Is_Signed_Integer_Type (Typ) or else Is_Fixed_Point_Type (Typ) then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- Overflow checks for floating-point if -gnateF mode active
Check_Float_Op_Overflow (N);
Expand_Nonbinary_Modular_Op (N);
end Expand_N_Op_Add;
---------------------
-- Expand_N_Op_And --
---------------------
procedure Expand_N_Op_And (N : Node_Id) is
Typ : constant Entity_Id := Etype (N);
begin
Binary_Op_Validity_Checks (N);
if Is_Array_Type (Etype (N)) then
Expand_Boolean_Operator (N);
elsif Is_Boolean_Type (Etype (N)) then
Adjust_Condition (Left_Opnd (N));
Adjust_Condition (Right_Opnd (N));
Set_Etype (N, Standard_Boolean);
Adjust_Result_Type (N, Typ);
elsif Is_Intrinsic_Subprogram (Entity (N)) then
Expand_Intrinsic_Call (N, Entity (N));
end if;
Expand_Nonbinary_Modular_Op (N);
end Expand_N_Op_And;
------------------------
-- Expand_N_Op_Concat --
------------------------
procedure Expand_N_Op_Concat (N : Node_Id) is
Opnds : List_Id;
-- List of operands to be concatenated
Cnode : Node_Id;
-- Node which is to be replaced by the result of concatenating the nodes
-- in the list Opnds.
begin
-- Ensure validity of both operands
Binary_Op_Validity_Checks (N);
-- If we are the left operand of a concatenation higher up the tree,
-- then do nothing for now, since we want to deal with a series of
-- concatenations as a unit.
if Nkind (Parent (N)) = N_Op_Concat
and then N = Left_Opnd (Parent (N))
then
return;
end if;
-- We get here with a concatenation whose left operand may be a
-- concatenation itself with a consistent type. We need to process
-- these concatenation operands from left to right, which means
-- from the deepest node in the tree to the highest node.
Cnode := N;
while Nkind (Left_Opnd (Cnode)) = N_Op_Concat loop
Cnode := Left_Opnd (Cnode);
end loop;
-- Now Cnode is the deepest concatenation, and its parents are the
-- concatenation nodes above, so now we process bottom up, doing the
-- operands.
-- The outer loop runs more than once if more than one concatenation
-- type is involved.
Outer : loop
Opnds := New_List (Left_Opnd (Cnode), Right_Opnd (Cnode));
Set_Parent (Opnds, N);
-- The inner loop gathers concatenation operands
Inner : while Cnode /= N
and then Base_Type (Etype (Cnode)) =
Base_Type (Etype (Parent (Cnode)))
loop
Cnode := Parent (Cnode);
Append (Right_Opnd (Cnode), Opnds);
end loop Inner;
-- Note: The following code is a temporary workaround for N731-034
-- and N829-028 and will be kept until the general issue of internal
-- symbol serialization is addressed. The workaround is kept under a
-- debug switch to avoid permiating into the general case.
-- Wrap the node to concatenate into an expression actions node to
-- keep it nicely packaged. This is useful in the case of an assert
-- pragma with a concatenation where we want to be able to delete
-- the concatenation and all its expansion stuff.
if Debug_Flag_Dot_H then
declare
Cnod : constant Node_Id := New_Copy_Tree (Cnode);
Typ : constant Entity_Id := Base_Type (Etype (Cnode));
begin
-- Note: use Rewrite rather than Replace here, so that for
-- example Why_Not_Static can find the original concatenation
-- node OK!
Rewrite (Cnode,
Make_Expression_With_Actions (Sloc (Cnode),
Actions => New_List (Make_Null_Statement (Sloc (Cnode))),
Expression => Cnod));
Expand_Concatenate (Cnod, Opnds);
Analyze_And_Resolve (Cnode, Typ);
end;
-- Default case
else
Expand_Concatenate (Cnode, Opnds);
end if;
exit Outer when Cnode = N;
Cnode := Parent (Cnode);
end loop Outer;
end Expand_N_Op_Concat;
------------------------
-- Expand_N_Op_Divide --
------------------------
procedure Expand_N_Op_Divide (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Lopnd : constant Node_Id := Left_Opnd (N);
Ropnd : constant Node_Id := Right_Opnd (N);
Ltyp : constant Entity_Id := Etype (Lopnd);
Rtyp : constant Entity_Id := Etype (Ropnd);
Typ : Entity_Id := Etype (N);
Rknow : constant Boolean := Is_Integer_Type (Typ)
and then
Compile_Time_Known_Value (Ropnd);
Rval : Uint;
begin
Binary_Op_Validity_Checks (N);
-- Check for MINIMIZED/ELIMINATED overflow mode
if Minimized_Eliminated_Overflow_Check (N) then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- Otherwise proceed with expansion of division
if Rknow then
Rval := Expr_Value (Ropnd);
end if;
-- N / 1 = N for integer types
if Rknow and then Rval = Uint_1 then
Rewrite (N, Lopnd);
return;
end if;
-- Try to narrow the operation
if Typ = Universal_Integer then
Narrow_Large_Operation (N);
if Nkind (N) /= N_Op_Divide then
return;
end if;
end if;
-- Convert x / 2 ** y to Shift_Right (x, y). Note that the fact that
-- Is_Power_Of_2_For_Shift is set means that we know that our left
-- operand is an unsigned integer, as required for this to work.
if Nkind (Ropnd) = N_Op_Expon
and then Is_Power_Of_2_For_Shift (Ropnd)
-- We cannot do this transformation in configurable run time mode if we
-- have 64-bit integers and long shifts are not available.
and then (Esize (Ltyp) <= 32 or else Support_Long_Shifts_On_Target)
then
Rewrite (N,
Make_Op_Shift_Right (Loc,
Left_Opnd => Lopnd,
Right_Opnd =>
Convert_To (Standard_Natural, Right_Opnd (Ropnd))));
Analyze_And_Resolve (N, Typ);
return;
end if;
-- Do required fixup of universal fixed operation
if Typ = Universal_Fixed then
Fixup_Universal_Fixed_Operation (N);
Typ := Etype (N);
end if;
-- Divisions with fixed-point results
if Is_Fixed_Point_Type (Typ) then
if Is_Integer_Type (Rtyp) then
Expand_Divide_Fixed_By_Integer_Giving_Fixed (N);
else
Expand_Divide_Fixed_By_Fixed_Giving_Fixed (N);
end if;
-- Deal with divide-by-zero check if back end cannot handle them
-- and the flag is set indicating that we need such a check. Note
-- that we don't need to bother here with the case of mixed-mode
-- (Right operand an integer type), since these will be rewritten
-- with conversions to a divide with a fixed-point right operand.
if Nkind (N) = N_Op_Divide
and then Do_Division_Check (N)
and then not Backend_Divide_Checks_On_Target
and then not Is_Integer_Type (Rtyp)
then
Set_Do_Division_Check (N, False);
Insert_Action (N,
Make_Raise_Constraint_Error (Loc,
Condition =>
Make_Op_Eq (Loc,
Left_Opnd => Duplicate_Subexpr_Move_Checks (Ropnd),
Right_Opnd => Make_Real_Literal (Loc, Ureal_0)),
Reason => CE_Divide_By_Zero));
end if;
-- Other cases of division of fixed-point operands
elsif Is_Fixed_Point_Type (Ltyp) or else Is_Fixed_Point_Type (Rtyp) then
if Is_Integer_Type (Typ) then
Expand_Divide_Fixed_By_Fixed_Giving_Integer (N);
else
pragma Assert (Is_Floating_Point_Type (Typ));
Expand_Divide_Fixed_By_Fixed_Giving_Float (N);
end if;
-- Mixed-mode operations can appear in a non-static universal context,
-- in which case the integer argument must be converted explicitly.
elsif Typ = Universal_Real and then Is_Integer_Type (Rtyp) then
Rewrite (Ropnd,
Convert_To (Universal_Real, Relocate_Node (Ropnd)));
Analyze_And_Resolve (Ropnd, Universal_Real);
elsif Typ = Universal_Real and then Is_Integer_Type (Ltyp) then
Rewrite (Lopnd,
Convert_To (Universal_Real, Relocate_Node (Lopnd)));
Analyze_And_Resolve (Lopnd, Universal_Real);
-- Non-fixed point cases, do integer zero divide and overflow checks
elsif Is_Integer_Type (Typ) then
Apply_Divide_Checks (N);
end if;
-- Overflow checks for floating-point if -gnateF mode active
Check_Float_Op_Overflow (N);
Expand_Nonbinary_Modular_Op (N);
end Expand_N_Op_Divide;
--------------------
-- Expand_N_Op_Eq --
--------------------
procedure Expand_N_Op_Eq (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Etype (N);
Lhs : constant Node_Id := Left_Opnd (N);
Rhs : constant Node_Id := Right_Opnd (N);
Bodies : constant List_Id := New_List;
A_Typ : constant Entity_Id := Etype (Lhs);
procedure Build_Equality_Call (Eq : Entity_Id);
-- If a constructed equality exists for the type or for its parent,
-- build and analyze call, adding conversions if the operation is
-- inherited.
function Is_Equality (Subp : Entity_Id;
Typ : Entity_Id := Empty) return Boolean;
-- Determine whether arbitrary Entity_Id denotes a function with the
-- right name and profile for an equality op, specifically for the
-- base type Typ if Typ is nonempty.
function Find_Equality (Prims : Elist_Id) return Entity_Id;
-- Find a primitive equality function within primitive operation list
-- Prims.
function User_Defined_Primitive_Equality_Op
(Typ : Entity_Id) return Entity_Id;
-- Find a user-defined primitive equality function for a given untagged
-- record type, ignoring visibility. Return Empty if no such op found.
function Has_Unconstrained_UU_Component (Typ : Entity_Id) return Boolean;
-- Determines whether a type has a subcomponent of an unconstrained
-- Unchecked_Union subtype. Typ is a record type.
-------------------------
-- Build_Equality_Call --
-------------------------
procedure Build_Equality_Call (Eq : Entity_Id) is
Op_Type : constant Entity_Id := Etype (First_Formal (Eq));
L_Exp : Node_Id := Relocate_Node (Lhs);
R_Exp : Node_Id := Relocate_Node (Rhs);
begin
-- Adjust operands if necessary to comparison type
if Base_Type (Op_Type) /= Base_Type (A_Typ)
and then not Is_Class_Wide_Type (A_Typ)
then
L_Exp := OK_Convert_To (Op_Type, L_Exp);
R_Exp := OK_Convert_To (Op_Type, R_Exp);
end if;
-- If we have an Unchecked_Union, we need to add the inferred
-- discriminant values as actuals in the function call. At this
-- point, the expansion has determined that both operands have
-- inferable discriminants.
if Is_Unchecked_Union (Op_Type) then
declare
Lhs_Type : constant Entity_Id := Etype (L_Exp);
Rhs_Type : constant Entity_Id := Etype (R_Exp);
Lhs_Discr_Vals : Elist_Id;
-- List of inferred discriminant values for left operand.
Rhs_Discr_Vals : Elist_Id;
-- List of inferred discriminant values for right operand.
Discr : Entity_Id;
begin
Lhs_Discr_Vals := New_Elmt_List;
Rhs_Discr_Vals := New_Elmt_List;
-- Per-object constrained selected components require special
-- attention. If the enclosing scope of the component is an
-- Unchecked_Union, we cannot reference its discriminants
-- directly. This is why we use the extra parameters of the
-- equality function of the enclosing Unchecked_Union.
-- type UU_Type (Discr : Integer := 0) is
-- . . .
-- end record;
-- pragma Unchecked_Union (UU_Type);
-- 1. Unchecked_Union enclosing record:
-- type Enclosing_UU_Type (Discr : Integer := 0) is record
-- . . .
-- Comp : UU_Type (Discr);
-- . . .
-- end Enclosing_UU_Type;
-- pragma Unchecked_Union (Enclosing_UU_Type);
-- Obj1 : Enclosing_UU_Type;
-- Obj2 : Enclosing_UU_Type (1);
-- [. . .] Obj1 = Obj2 [. . .]
-- Generated code:
-- if not (uu_typeEQ (obj1.comp, obj2.comp, a, b)) then
-- A and B are the formal parameters of the equality function
-- of Enclosing_UU_Type. The function always has two extra
-- formals to capture the inferred discriminant values for
-- each discriminant of the type.
-- 2. Non-Unchecked_Union enclosing record:
-- type
-- Enclosing_Non_UU_Type (Discr : Integer := 0)
-- is record
-- . . .
-- Comp : UU_Type (Discr);
-- . . .
-- end Enclosing_Non_UU_Type;
-- Obj1 : Enclosing_Non_UU_Type;
-- Obj2 : Enclosing_Non_UU_Type (1);
-- ... Obj1 = Obj2 ...
-- Generated code:
-- if not (uu_typeEQ (obj1.comp, obj2.comp,
-- obj1.discr, obj2.discr)) then
-- In this case we can directly reference the discriminants of
-- the enclosing record.
-- Process left operand of equality
if Nkind (Lhs) = N_Selected_Component
and then
Has_Per_Object_Constraint (Entity (Selector_Name (Lhs)))
then
-- If enclosing record is an Unchecked_Union, use formals
-- corresponding to each discriminant. The name of the
-- formal is that of the discriminant, with added suffix,
-- see Exp_Ch3.Build_Record_Equality for details.
if Is_Unchecked_Union (Scope (Entity (Selector_Name (Lhs))))
then
Discr :=
First_Discriminant
(Scope (Entity (Selector_Name (Lhs))));
while Present (Discr) loop
Append_Elmt
(Make_Identifier (Loc,
Chars => New_External_Name (Chars (Discr), 'A')),
To => Lhs_Discr_Vals);
Next_Discriminant (Discr);
end loop;
-- If enclosing record is of a non-Unchecked_Union type, it
-- is possible to reference its discriminants directly.
else
Discr := First_Discriminant (Lhs_Type);
while Present (Discr) loop
Append_Elmt
(Make_Selected_Component (Loc,
Prefix => Prefix (Lhs),
Selector_Name =>
New_Copy
(Get_Discriminant_Value (Discr,
Lhs_Type,
Stored_Constraint (Lhs_Type)))),
To => Lhs_Discr_Vals);
Next_Discriminant (Discr);
end loop;
end if;
-- Otherwise operand is on object with a constrained type.
-- Infer the discriminant values from the constraint.
else
Discr := First_Discriminant (Lhs_Type);
while Present (Discr) loop
Append_Elmt
(New_Copy
(Get_Discriminant_Value (Discr,
Lhs_Type,
Stored_Constraint (Lhs_Type))),
To => Lhs_Discr_Vals);
Next_Discriminant (Discr);
end loop;
end if;
-- Similar processing for right operand of equality
if Nkind (Rhs) = N_Selected_Component
and then
Has_Per_Object_Constraint (Entity (Selector_Name (Rhs)))
then
if Is_Unchecked_Union
(Scope (Entity (Selector_Name (Rhs))))
then
Discr :=
First_Discriminant
(Scope (Entity (Selector_Name (Rhs))));
while Present (Discr) loop
Append_Elmt
(Make_Identifier (Loc,
Chars => New_External_Name (Chars (Discr), 'B')),
To => Rhs_Discr_Vals);
Next_Discriminant (Discr);
end loop;
else
Discr := First_Discriminant (Rhs_Type);
while Present (Discr) loop
Append_Elmt
(Make_Selected_Component (Loc,
Prefix => Prefix (Rhs),
Selector_Name =>
New_Copy (Get_Discriminant_Value
(Discr,
Rhs_Type,
Stored_Constraint (Rhs_Type)))),
To => Rhs_Discr_Vals);
Next_Discriminant (Discr);
end loop;
end if;
else
Discr := First_Discriminant (Rhs_Type);
while Present (Discr) loop
Append_Elmt
(New_Copy (Get_Discriminant_Value
(Discr,
Rhs_Type,
Stored_Constraint (Rhs_Type))),
To => Rhs_Discr_Vals);
Next_Discriminant (Discr);
end loop;
end if;
-- Now merge the list of discriminant values so that values
-- of corresponding discriminants are adjacent.
declare
Params : List_Id;
L_Elmt : Elmt_Id;
R_Elmt : Elmt_Id;
begin
Params := New_List (L_Exp, R_Exp);
L_Elmt := First_Elmt (Lhs_Discr_Vals);
R_Elmt := First_Elmt (Rhs_Discr_Vals);
while Present (L_Elmt) loop
Append_To (Params, Node (L_Elmt));
Append_To (Params, Node (R_Elmt));
Next_Elmt (L_Elmt);
Next_Elmt (R_Elmt);
end loop;
Rewrite (N,
Make_Function_Call (Loc,
Name => New_Occurrence_Of (Eq, Loc),
Parameter_Associations => Params));
end;
end;
-- Normal case, not an unchecked union
else
Rewrite (N,
Make_Function_Call (Loc,
Name => New_Occurrence_Of (Eq, Loc),
Parameter_Associations => New_List (L_Exp, R_Exp)));
end if;
Analyze_And_Resolve (N, Standard_Boolean, Suppress => All_Checks);
end Build_Equality_Call;
-----------------
-- Is_Equality --
-----------------
function Is_Equality (Subp : Entity_Id;
Typ : Entity_Id := Empty) return Boolean is
Formal_1 : Entity_Id;
Formal_2 : Entity_Id;
begin
-- The equality function carries name "=", returns Boolean, and has
-- exactly two formal parameters of an identical type.
if Ekind (Subp) = E_Function
and then Chars (Subp) = Name_Op_Eq
and then Base_Type (Etype (Subp)) = Standard_Boolean
then
Formal_1 := First_Formal (Subp);
Formal_2 := Empty;
if Present (Formal_1) then
Formal_2 := Next_Formal (Formal_1);
end if;
return
Present (Formal_1)
and then Present (Formal_2)
and then No (Next_Formal (Formal_2))
and then Base_Type (Etype (Formal_1)) =
Base_Type (Etype (Formal_2))
and then
(not Present (Typ)
or else Implementation_Base_Type (Etype (Formal_1)) = Typ);
end if;
return False;
end Is_Equality;
-------------------
-- Find_Equality --
-------------------
function Find_Equality (Prims : Elist_Id) return Entity_Id is
function Find_Aliased_Equality (Prim : Entity_Id) return Entity_Id;
-- Find an equality in a possible alias chain starting from primitive
-- operation Prim.
---------------------------
-- Find_Aliased_Equality --
---------------------------
function Find_Aliased_Equality (Prim : Entity_Id) return Entity_Id is
Candid : Entity_Id;
begin
-- Inspect each candidate in the alias chain, checking whether it
-- denotes an equality.
Candid := Prim;
while Present (Candid) loop
if Is_Equality (Candid) then
return Candid;
end if;
Candid := Alias (Candid);
end loop;
return Empty;
end Find_Aliased_Equality;
-- Local variables
Eq_Prim : Entity_Id;
Prim_Elmt : Elmt_Id;
-- Start of processing for Find_Equality
begin
-- Assume that the tagged type lacks an equality
Eq_Prim := Empty;
-- Inspect the list of primitives looking for a suitable equality
-- within a possible chain of aliases.
Prim_Elmt := First_Elmt (Prims);
while Present (Prim_Elmt) and then No (Eq_Prim) loop
Eq_Prim := Find_Aliased_Equality (Node (Prim_Elmt));
Next_Elmt (Prim_Elmt);
end loop;
-- A tagged type should always have an equality
pragma Assert (Present (Eq_Prim));
return Eq_Prim;
end Find_Equality;
----------------------------------------
-- User_Defined_Primitive_Equality_Op --
----------------------------------------
function User_Defined_Primitive_Equality_Op
(Typ : Entity_Id) return Entity_Id
is
Enclosing_Scope : constant Entity_Id := Scope (Typ);
E : Entity_Id;
begin
for Private_Entities in Boolean loop
if Private_Entities then
if Ekind (Enclosing_Scope) /= E_Package then
exit;
end if;
E := First_Private_Entity (Enclosing_Scope);
else
E := First_Entity (Enclosing_Scope);
end if;
while Present (E) loop
if Is_Equality (E, Typ) then
return E;
end if;
Next_Entity (E);
end loop;
end loop;
if Is_Derived_Type (Typ) then
return User_Defined_Primitive_Equality_Op
(Implementation_Base_Type (Etype (Typ)));
end if;
return Empty;
end User_Defined_Primitive_Equality_Op;
------------------------------------
-- Has_Unconstrained_UU_Component --
------------------------------------
function Has_Unconstrained_UU_Component
(Typ : Entity_Id) return Boolean
is
function Unconstrained_UU_In_Component_Declaration
(N : Node_Id) return Boolean;
function Unconstrained_UU_In_Component_Items
(L : List_Id) return Boolean;
function Unconstrained_UU_In_Component_List
(N : Node_Id) return Boolean;
function Unconstrained_UU_In_Variant_Part
(N : Node_Id) return Boolean;
-- A family of routines that determine whether a particular construct
-- of a record type definition contains a subcomponent of an
-- unchecked union type whose nominal subtype is unconstrained.
--
-- Individual routines correspond to the production rules of the Ada
-- grammar, as described in the Ada RM (P).
-----------------------------------------------
-- Unconstrained_UU_In_Component_Declaration --
-----------------------------------------------
function Unconstrained_UU_In_Component_Declaration
(N : Node_Id) return Boolean
is
pragma Assert (Nkind (N) = N_Component_Declaration);
Sindic : constant Node_Id :=
Subtype_Indication (Component_Definition (N));
begin
-- If the component declaration includes a subtype indication
-- it is not an unchecked_union. Otherwise verify that it carries
-- the Unchecked_Union flag and is either a record or a private
-- type. A Record_Subtype declared elsewhere does not qualify,
-- even if its parent type carries the flag.
return Nkind (Sindic) in N_Expanded_Name | N_Identifier
and then Is_Unchecked_Union (Base_Type (Etype (Sindic)))
and then (Ekind (Entity (Sindic)) in
E_Private_Type | E_Record_Type);
end Unconstrained_UU_In_Component_Declaration;
-----------------------------------------
-- Unconstrained_UU_In_Component_Items --
-----------------------------------------
function Unconstrained_UU_In_Component_Items
(L : List_Id) return Boolean
is
N : Node_Id := First (L);
begin
while Present (N) loop
if Nkind (N) = N_Component_Declaration
and then Unconstrained_UU_In_Component_Declaration (N)
then
return True;
end if;
Next (N);
end loop;
return False;
end Unconstrained_UU_In_Component_Items;
----------------------------------------
-- Unconstrained_UU_In_Component_List --
----------------------------------------
function Unconstrained_UU_In_Component_List
(N : Node_Id) return Boolean
is
pragma Assert (Nkind (N) = N_Component_List);
Optional_Variant_Part : Node_Id;
begin
if Unconstrained_UU_In_Component_Items (Component_Items (N)) then
return True;
end if;
Optional_Variant_Part := Variant_Part (N);
return
Present (Optional_Variant_Part)
and then
Unconstrained_UU_In_Variant_Part (Optional_Variant_Part);
end Unconstrained_UU_In_Component_List;
--------------------------------------
-- Unconstrained_UU_In_Variant_Part --
--------------------------------------
function Unconstrained_UU_In_Variant_Part
(N : Node_Id) return Boolean
is
pragma Assert (Nkind (N) = N_Variant_Part);
Variant : Node_Id := First (Variants (N));
begin
loop
if Unconstrained_UU_In_Component_List (Component_List (Variant))
then
return True;
end if;
Next (Variant);
exit when No (Variant);
end loop;
return False;
end Unconstrained_UU_In_Variant_Part;
Typ_Def : constant Node_Id :=
Type_Definition (Declaration_Node (Base_Type (Typ)));
Optional_Component_List : constant Node_Id :=
Component_List (Typ_Def);
-- Start of processing for Has_Unconstrained_UU_Component
begin
return Present (Optional_Component_List)
and then
Unconstrained_UU_In_Component_List (Optional_Component_List);
end Has_Unconstrained_UU_Component;
-- Local variables
Typl : Entity_Id;
-- Start of processing for Expand_N_Op_Eq
begin
Binary_Op_Validity_Checks (N);
-- Deal with private types
Typl := A_Typ;
if Ekind (Typl) = E_Private_Type then
Typl := Underlying_Type (Typl);
elsif Ekind (Typl) = E_Private_Subtype then
Typl := Underlying_Type (Base_Type (Typl));
end if;
-- It may happen in error situations that the underlying type is not
-- set. The error will be detected later, here we just defend the
-- expander code.
if No (Typl) then
return;
end if;
-- Now get the implementation base type (note that plain Base_Type here
-- might lead us back to the private type, which is not what we want!)
Typl := Implementation_Base_Type (Typl);
-- Equality between variant records results in a call to a routine
-- that has conditional tests of the discriminant value(s), and hence
-- violates the No_Implicit_Conditionals restriction.
if Has_Variant_Part (Typl) then
declare
Msg : Boolean;
begin
Check_Restriction (Msg, No_Implicit_Conditionals, N);
if Msg then
Error_Msg_N
("\comparison of variant records tests discriminants", N);
return;
end if;
end;
end if;
-- Deal with overflow checks in MINIMIZED/ELIMINATED mode and if that
-- means we no longer have a comparison operation, we are all done.
if Minimized_Eliminated_Overflow_Check (Left_Opnd (N)) then
Expand_Compare_Minimize_Eliminate_Overflow (N);
end if;
if Nkind (N) /= N_Op_Eq then
return;
end if;
-- Boolean types (requiring handling of non-standard case)
if Is_Boolean_Type (Typl) then
Adjust_Condition (Left_Opnd (N));
Adjust_Condition (Right_Opnd (N));
Set_Etype (N, Standard_Boolean);
Adjust_Result_Type (N, Typ);
-- Array types
elsif Is_Array_Type (Typl) then
-- If we are doing full validity checking, and it is possible for the
-- array elements to be invalid then expand out array comparisons to
-- make sure that we check the array elements.
if Validity_Check_Operands
and then not Is_Known_Valid (Component_Type (Typl))
then
declare
Save_Force_Validity_Checks : constant Boolean :=
Force_Validity_Checks;
begin
Force_Validity_Checks := True;
Rewrite (N,
Expand_Array_Equality
(N,
Relocate_Node (Lhs),
Relocate_Node (Rhs),
Bodies,
Typl));
Insert_Actions (N, Bodies);
Analyze_And_Resolve (N, Standard_Boolean);
Force_Validity_Checks := Save_Force_Validity_Checks;
end;
-- Packed case where both operands are known aligned
elsif Is_Bit_Packed_Array (Typl)
and then not Is_Possibly_Unaligned_Object (Lhs)
and then not Is_Possibly_Unaligned_Object (Rhs)
then
Expand_Packed_Eq (N);
-- Where the component type is elementary we can use a block bit
-- comparison (if supported on the target) exception in the case
-- of floating-point (negative zero issues require element by
-- element comparison), and full access types (where we must be sure
-- to load elements independently) and possibly unaligned arrays.
elsif Is_Elementary_Type (Component_Type (Typl))
and then not Is_Floating_Point_Type (Component_Type (Typl))
and then not Is_Full_Access (Component_Type (Typl))
and then not Is_Possibly_Unaligned_Object (Lhs)
and then not Is_Possibly_Unaligned_Slice (Lhs)
and then not Is_Possibly_Unaligned_Object (Rhs)
and then not Is_Possibly_Unaligned_Slice (Rhs)
and then Support_Composite_Compare_On_Target
then
null;
-- For composite and floating-point cases, expand equality loop to
-- make sure of using proper comparisons for tagged types, and
-- correctly handling the floating-point case.
else
Rewrite (N,
Expand_Array_Equality
(N,
Relocate_Node (Lhs),
Relocate_Node (Rhs),
Bodies,
Typl));
Insert_Actions (N, Bodies, Suppress => All_Checks);
Analyze_And_Resolve (N, Standard_Boolean, Suppress => All_Checks);
end if;
-- Record Types
elsif Is_Record_Type (Typl) then
-- For tagged types, use the primitive "="
if Is_Tagged_Type (Typl) then
-- No need to do anything else compiling under restriction
-- No_Dispatching_Calls. During the semantic analysis we
-- already notified such violation.
if Restriction_Active (No_Dispatching_Calls) then
return;
end if;
-- If this is an untagged private type completed with a derivation
-- of an untagged private type whose full view is a tagged type,
-- we use the primitive operations of the private type (since it
-- does not have a full view, and also because its equality
-- primitive may have been overridden in its untagged full view).
if Inherits_From_Tagged_Full_View (A_Typ) then
Build_Equality_Call
(Find_Equality (Collect_Primitive_Operations (A_Typ)));
-- Find the type's predefined equality or an overriding
-- user-defined equality. The reason for not simply calling
-- Find_Prim_Op here is that there may be a user-defined
-- overloaded equality op that precedes the equality that we
-- want, so we have to explicitly search (e.g., there could be
-- an equality with two different parameter types).
else
if Is_Class_Wide_Type (Typl) then
Typl := Find_Specific_Type (Typl);
end if;
Build_Equality_Call
(Find_Equality (Primitive_Operations (Typl)));
end if;
-- See AI12-0101 (which only removes a legality rule) and then
-- AI05-0123 (which then applies in the previously illegal case).
-- AI12-0101 is a binding interpretation.
elsif Ada_Version >= Ada_2012
and then Present (User_Defined_Primitive_Equality_Op (Typl))
then
Build_Equality_Call (User_Defined_Primitive_Equality_Op (Typl));
-- Ada 2005 (AI-216): Program_Error is raised when evaluating the
-- predefined equality operator for a type which has a subcomponent
-- of an Unchecked_Union type whose nominal subtype is unconstrained.
elsif Has_Unconstrained_UU_Component (Typl) then
Insert_Action (N,
Make_Raise_Program_Error (Loc,
Reason => PE_Unchecked_Union_Restriction));
-- Prevent Gigi from generating incorrect code by rewriting the
-- equality as a standard False. (is this documented somewhere???)
Rewrite (N,
New_Occurrence_Of (Standard_False, Loc));
elsif Is_Unchecked_Union (Typl) then
-- If we can infer the discriminants of the operands, we make a
-- call to the TSS equality function.
if Has_Inferable_Discriminants (Lhs)
and then
Has_Inferable_Discriminants (Rhs)
then
Build_Equality_Call
(TSS (Root_Type (Typl), TSS_Composite_Equality));
else
-- Ada 2005 (AI-216): Program_Error is raised when evaluating
-- the predefined equality operator for an Unchecked_Union type
-- if either of the operands lack inferable discriminants.
Insert_Action (N,
Make_Raise_Program_Error (Loc,
Reason => PE_Unchecked_Union_Restriction));
-- Emit a warning on source equalities only, otherwise the
-- message may appear out of place due to internal use. The
-- warning is unconditional because it is required by the
-- language.
if Comes_From_Source (N) then
Error_Msg_N
("Unchecked_Union discriminants cannot be determined??",
N);
Error_Msg_N
("\Program_Error will be raised for equality operation??",
N);
end if;
-- Prevent Gigi from generating incorrect code by rewriting
-- the equality as a standard False (documented where???).
Rewrite (N,
New_Occurrence_Of (Standard_False, Loc));
end if;
-- If a type support function is present (for complex cases), use it
elsif Present (TSS (Root_Type (Typl), TSS_Composite_Equality)) then
Build_Equality_Call
(TSS (Root_Type (Typl), TSS_Composite_Equality));
-- When comparing two Bounded_Strings, use the primitive equality of
-- the root Super_String type.
elsif Is_Bounded_String (Typl) then
Build_Equality_Call
(Find_Equality
(Collect_Primitive_Operations (Root_Type (Typl))));
-- Otherwise expand the component by component equality. Note that
-- we never use block-bit comparisons for records, because of the
-- problems with gaps. The back end will often be able to recombine
-- the separate comparisons that we generate here.
else
Remove_Side_Effects (Lhs);
Remove_Side_Effects (Rhs);
Rewrite (N, Expand_Record_Equality (N, Typl, Lhs, Rhs));
Analyze_And_Resolve (N, Standard_Boolean, Suppress => All_Checks);
end if;
-- If unnesting, handle elementary types whose Equivalent_Types are
-- records because there may be padding or undefined fields.
elsif Unnest_Subprogram_Mode
and then Ekind (Typl) in E_Class_Wide_Type
| E_Class_Wide_Subtype
| E_Access_Subprogram_Type
| E_Access_Protected_Subprogram_Type
| E_Anonymous_Access_Protected_Subprogram_Type
| E_Exception_Type
and then Present (Equivalent_Type (Typl))
and then Is_Record_Type (Equivalent_Type (Typl))
then
Typl := Equivalent_Type (Typl);
Remove_Side_Effects (Lhs);
Remove_Side_Effects (Rhs);
Rewrite (N,
Expand_Record_Equality (N, Typl,
Unchecked_Convert_To (Typl, Lhs),
Unchecked_Convert_To (Typl, Rhs)));
Analyze_And_Resolve (N, Standard_Boolean, Suppress => All_Checks);
end if;
-- Test if result is known at compile time
Rewrite_Comparison (N);
-- Try to narrow the operation
if Typl = Universal_Integer and then Nkind (N) = N_Op_Eq then
Narrow_Large_Operation (N);
end if;
-- Special optimization of length comparison
Optimize_Length_Comparison (N);
-- One more special case: if we have a comparison of X'Result = expr
-- in floating-point, then if not already there, change expr to be
-- f'Machine (expr) to eliminate surprise from extra precision.
if Is_Floating_Point_Type (Typl)
and then Is_Attribute_Result (Original_Node (Lhs))
then
-- Stick in the Typ'Machine call if not already there
if Nkind (Rhs) /= N_Attribute_Reference
or else Attribute_Name (Rhs) /= Name_Machine
then
Rewrite (Rhs,
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Typl, Loc),
Attribute_Name => Name_Machine,
Expressions => New_List (Relocate_Node (Rhs))));
Analyze_And_Resolve (Rhs, Typl);
end if;
end if;
end Expand_N_Op_Eq;
-----------------------
-- Expand_N_Op_Expon --
-----------------------
procedure Expand_N_Op_Expon (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Ovflo : constant Boolean := Do_Overflow_Check (N);
Typ : constant Entity_Id := Etype (N);
Rtyp : constant Entity_Id := Root_Type (Typ);
Bastyp : Entity_Id;
function Wrap_MA (Exp : Node_Id) return Node_Id;
-- Given an expression Exp, if the root type is Float or Long_Float,
-- then wrap the expression in a call of Bastyp'Machine, to stop any
-- extra precision. This is done to ensure that X**A = X**B when A is
-- a static constant and B is a variable with the same value. For any
-- other type, the node Exp is returned unchanged.
-------------
-- Wrap_MA --
-------------
function Wrap_MA (Exp : Node_Id) return Node_Id is
Loc : constant Source_Ptr := Sloc (Exp);
begin
if Rtyp = Standard_Float or else Rtyp = Standard_Long_Float then
return
Make_Attribute_Reference (Loc,
Attribute_Name => Name_Machine,
Prefix => New_Occurrence_Of (Bastyp, Loc),
Expressions => New_List (Relocate_Node (Exp)));
else
return Exp;
end if;
end Wrap_MA;
-- Local variables
Base : Node_Id;
Ent : Entity_Id;
Etyp : Entity_Id;
Exp : Node_Id;
Exptyp : Entity_Id;
Expv : Uint;
Rent : RE_Id;
Temp : Node_Id;
Xnode : Node_Id;
-- Start of processing for Expand_N_Op_Expon
begin
Binary_Op_Validity_Checks (N);
-- CodePeer wants to see the unexpanded N_Op_Expon node
if CodePeer_Mode then
return;
end if;
-- Relocation of left and right operands must be done after performing
-- the validity checks since the generation of validation checks may
-- remove side effects.
Base := Relocate_Node (Left_Opnd (N));
Bastyp := Etype (Base);
Exp := Relocate_Node (Right_Opnd (N));
Exptyp := Etype (Exp);
-- If either operand is of a private type, then we have the use of an
-- intrinsic operator, and we get rid of the privateness, by using root
-- types of underlying types for the actual operation. Otherwise the
-- private types will cause trouble if we expand multiplications or
-- shifts etc. We also do this transformation if the result type is
-- different from the base type.
if Is_Private_Type (Etype (Base))
or else Is_Private_Type (Typ)
or else Is_Private_Type (Exptyp)
or else Rtyp /= Root_Type (Bastyp)
then
declare
Bt : constant Entity_Id := Root_Type (Underlying_Type (Bastyp));
Et : constant Entity_Id := Root_Type (Underlying_Type (Exptyp));
begin
Rewrite (N,
Unchecked_Convert_To (Typ,
Make_Op_Expon (Loc,
Left_Opnd => Unchecked_Convert_To (Bt, Base),
Right_Opnd => Unchecked_Convert_To (Et, Exp))));
Analyze_And_Resolve (N, Typ);
return;
end;
end if;
-- Check for MINIMIZED/ELIMINATED overflow mode
if Minimized_Eliminated_Overflow_Check (N) then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- Test for case of known right argument where we can replace the
-- exponentiation by an equivalent expression using multiplication.
-- Note: use CRT_Safe version of Compile_Time_Known_Value because in
-- configurable run-time mode, we may not have the exponentiation
-- routine available, and we don't want the legality of the program
-- to depend on how clever the compiler is in knowing values.
if CRT_Safe_Compile_Time_Known_Value (Exp) then
Expv := Expr_Value (Exp);
-- We only fold small non-negative exponents. You might think we
-- could fold small negative exponents for the real case, but we
-- can't because we are required to raise Constraint_Error for
-- the case of 0.0 ** (negative) even if Machine_Overflows = False.
-- See ACVC test C4A012B, and it is not worth generating the test.
-- For small negative exponents, we return the reciprocal of
-- the folding of the exponentiation for the opposite (positive)
-- exponent, as required by Ada RM 4.5.6(11/3).
if abs Expv <= 4 then
-- X ** 0 = 1 (or 1.0)
if Expv = 0 then
-- Call Remove_Side_Effects to ensure that any side effects
-- in the ignored left operand (in particular function calls
-- to user defined functions) are properly executed.
Remove_Side_Effects (Base);
if Ekind (Typ) in Integer_Kind then
Xnode := Make_Integer_Literal (Loc, Intval => 1);
else
Xnode := Make_Real_Literal (Loc, Ureal_1);
end if;
-- X ** 1 = X
elsif Expv = 1 then
Xnode := Base;
-- X ** 2 = X * X
elsif Expv = 2 then
Xnode :=
Wrap_MA (
Make_Op_Multiply (Loc,
Left_Opnd => Duplicate_Subexpr (Base),
Right_Opnd => Duplicate_Subexpr_No_Checks (Base)));
-- X ** 3 = X * X * X
elsif Expv = 3 then
Xnode :=
Wrap_MA (
Make_Op_Multiply (Loc,
Left_Opnd =>
Make_Op_Multiply (Loc,
Left_Opnd => Duplicate_Subexpr (Base),
Right_Opnd => Duplicate_Subexpr_No_Checks (Base)),
Right_Opnd => Duplicate_Subexpr_No_Checks (Base)));
-- X ** 4 ->
-- do
-- En : constant base'type := base * base;
-- in
-- En * En
elsif Expv = 4 then
Temp := Make_Temporary (Loc, 'E', Base);
Xnode :=
Make_Expression_With_Actions (Loc,
Actions => New_List (
Make_Object_Declaration (Loc,
Defining_Identifier => Temp,
Constant_Present => True,
Object_Definition => New_Occurrence_Of (Typ, Loc),
Expression =>
Wrap_MA (
Make_Op_Multiply (Loc,
Left_Opnd =>
Duplicate_Subexpr (Base),
Right_Opnd =>
Duplicate_Subexpr_No_Checks (Base))))),
Expression =>
Wrap_MA (
Make_Op_Multiply (Loc,
Left_Opnd => New_Occurrence_Of (Temp, Loc),
Right_Opnd => New_Occurrence_Of (Temp, Loc))));
-- X ** N = 1.0 / X ** (-N)
-- N in -4 .. -1
else
pragma Assert
(Expv = -1 or Expv = -2 or Expv = -3 or Expv = -4);
Xnode :=
Make_Op_Divide (Loc,
Left_Opnd =>
Make_Float_Literal (Loc,
Radix => Uint_1,
Significand => Uint_1,
Exponent => Uint_0),
Right_Opnd =>
Make_Op_Expon (Loc,
Left_Opnd => Duplicate_Subexpr (Base),
Right_Opnd =>
Make_Integer_Literal (Loc,
Intval => -Expv)));
end if;
Rewrite (N, Xnode);
Analyze_And_Resolve (N, Typ);
return;
end if;
end if;
-- Deal with optimizing 2 ** expression to shift where possible
-- Note: we used to check that Exptyp was an unsigned type. But that is
-- an unnecessary check, since if Exp is negative, we have a run-time
-- error that is either caught (so we get the right result) or we have
-- suppressed the check, in which case the code is erroneous anyway.
if Is_Integer_Type (Rtyp)
-- The base value must be "safe compile-time known", and exactly 2
and then Nkind (Base) = N_Integer_Literal
and then CRT_Safe_Compile_Time_Known_Value (Base)
and then Expr_Value (Base) = Uint_2
-- We only handle cases where the right type is a integer
and then Is_Integer_Type (Root_Type (Exptyp))
and then Esize (Root_Type (Exptyp)) <= Standard_Integer_Size
-- This transformation is not applicable for a modular type with a
-- nonbinary modulus because we do not handle modular reduction in
-- a correct manner if we attempt this transformation in this case.
and then not Non_Binary_Modulus (Typ)
then
-- Handle the cases where our parent is a division or multiplication
-- specially. In these cases we can convert to using a shift at the
-- parent level if we are not doing overflow checking, since it is
-- too tricky to combine the overflow check at the parent level.
if not Ovflo
and then Nkind (Parent (N)) in N_Op_Divide | N_Op_Multiply
then
declare
P : constant Node_Id := Parent (N);
L : constant Node_Id := Left_Opnd (P);
R : constant Node_Id := Right_Opnd (P);
begin
if (Nkind (P) = N_Op_Multiply
and then
((Is_Integer_Type (Etype (L)) and then R = N)
or else
(Is_Integer_Type (Etype (R)) and then L = N))
and then not Do_Overflow_Check (P))
or else
(Nkind (P) = N_Op_Divide
and then Is_Integer_Type (Etype (L))
and then Is_Unsigned_Type (Etype (L))
and then R = N
and then not Do_Overflow_Check (P))
then
Set_Is_Power_Of_2_For_Shift (N);
return;
end if;
end;
-- Here we just have 2 ** N on its own, so we can convert this to a
-- shift node. We are prepared to deal with overflow here, and we
-- also have to handle proper modular reduction for binary modular.
else
declare
OK : Boolean;
Lo : Uint;
Hi : Uint;
MaxS : Uint;
-- Maximum shift count with no overflow
TestS : Boolean;
-- Set True if we must test the shift count
Test_Gt : Node_Id;
-- Node for test against TestS
begin
-- Compute maximum shift based on the underlying size. For a
-- modular type this is one less than the size.
if Is_Modular_Integer_Type (Typ) then
-- For modular integer types, this is the size of the value
-- being shifted minus one. Any larger values will cause
-- modular reduction to a result of zero. Note that we do
-- want the RM_Size here (e.g. mod 2 ** 7, we want a result
-- of 6, since 2**7 should be reduced to zero).
MaxS := RM_Size (Rtyp) - 1;
-- For signed integer types, we use the size of the value
-- being shifted minus 2. Larger values cause overflow.
else
MaxS := Esize (Rtyp) - 2;
end if;
-- Determine range to see if it can be larger than MaxS
Determine_Range (Exp, OK, Lo, Hi, Assume_Valid => True);
TestS := (not OK) or else Hi > MaxS;
-- Signed integer case
if Is_Signed_Integer_Type (Typ) then
-- Generate overflow check if overflow is active. Note that
-- we can simply ignore the possibility of overflow if the
-- flag is not set (means that overflow cannot happen or
-- that overflow checks are suppressed).
if Ovflo and TestS then
Insert_Action (N,
Make_Raise_Constraint_Error (Loc,
Condition =>
Make_Op_Gt (Loc,
Left_Opnd => Duplicate_Subexpr (Exp),
Right_Opnd => Make_Integer_Literal (Loc, MaxS)),
Reason => CE_Overflow_Check_Failed));
end if;
-- Now rewrite node as Shift_Left (1, right-operand)
Rewrite (N,
Make_Op_Shift_Left (Loc,
Left_Opnd => Make_Integer_Literal (Loc, Uint_1),
Right_Opnd => Exp));
-- Modular integer case
else pragma Assert (Is_Modular_Integer_Type (Typ));
-- If shift count can be greater than MaxS, we need to wrap
-- the shift in a test that will reduce the result value to
-- zero if this shift count is exceeded.
if TestS then
-- Note: build node for the comparison first, before we
-- reuse the Right_Opnd, so that we have proper parents
-- in place for the Duplicate_Subexpr call.
Test_Gt :=
Make_Op_Gt (Loc,
Left_Opnd => Duplicate_Subexpr (Exp),
Right_Opnd => Make_Integer_Literal (Loc, MaxS));
Rewrite (N,
Make_If_Expression (Loc,
Expressions => New_List (
Test_Gt,
Make_Integer_Literal (Loc, Uint_0),
Make_Op_Shift_Left (Loc,
Left_Opnd => Make_Integer_Literal (Loc, Uint_1),
Right_Opnd => Exp))));
-- If we know shift count cannot be greater than MaxS, then
-- it is safe to just rewrite as a shift with no test.
else
Rewrite (N,
Make_Op_Shift_Left (Loc,
Left_Opnd => Make_Integer_Literal (Loc, Uint_1),
Right_Opnd => Exp));
end if;
end if;
Analyze_And_Resolve (N, Typ);
return;
end;
end if;
end if;
-- Fall through if exponentiation must be done using a runtime routine
-- First deal with modular case
if Is_Modular_Integer_Type (Rtyp) then
-- Nonbinary modular case, we call the special exponentiation
-- routine for the nonbinary case, converting the argument to
-- Long_Long_Integer and passing the modulus value. Then the
-- result is converted back to the base type.
if Non_Binary_Modulus (Rtyp) then
Rewrite (N,
Convert_To (Typ,
Make_Function_Call (Loc,
Name =>
New_Occurrence_Of (RTE (RE_Exp_Modular), Loc),
Parameter_Associations => New_List (
Convert_To (RTE (RE_Unsigned), Base),
Make_Integer_Literal (Loc, Modulus (Rtyp)),
Exp))));
-- Binary modular case, in this case, we call one of three routines,
-- either the unsigned integer case, or the unsigned long long
-- integer case, or the unsigned long long long integer case, with a
-- final "and" operation to do the required mod.
else
if Esize (Rtyp) <= Standard_Integer_Size then
Ent := RTE (RE_Exp_Unsigned);
elsif Esize (Rtyp) <= Standard_Long_Long_Integer_Size then
Ent := RTE (RE_Exp_Long_Long_Unsigned);
else
Ent := RTE (RE_Exp_Long_Long_Long_Unsigned);
end if;
Rewrite (N,
Convert_To (Typ,
Make_Op_And (Loc,
Left_Opnd =>
Make_Function_Call (Loc,
Name => New_Occurrence_Of (Ent, Loc),
Parameter_Associations => New_List (
Convert_To (Etype (First_Formal (Ent)), Base),
Exp)),
Right_Opnd =>
Make_Integer_Literal (Loc, Modulus (Rtyp) - 1))));
end if;
-- Common exit point for modular type case
Analyze_And_Resolve (N, Typ);
return;
-- Signed integer cases, using either Integer, Long_Long_Integer or
-- Long_Long_Long_Integer. It is not worth also having routines for
-- Short_[Short_]Integer, since for most machines it would not help,
-- and it would generate more code that might need certification when
-- a certified run time is required.
-- In the integer cases, we have two routines, one for when overflow
-- checks are required, and one when they are not required, since there
-- is a real gain in omitting checks on many machines.
elsif Is_Signed_Integer_Type (Rtyp) then
if Esize (Rtyp) <= Standard_Integer_Size then
Etyp := Standard_Integer;
if Ovflo then
Rent := RE_Exp_Integer;
else
Rent := RE_Exn_Integer;
end if;
elsif Esize (Rtyp) <= Standard_Long_Long_Integer_Size then
Etyp := Standard_Long_Long_Integer;
if Ovflo then
Rent := RE_Exp_Long_Long_Integer;
else
Rent := RE_Exn_Long_Long_Integer;
end if;
else
Etyp := Standard_Long_Long_Long_Integer;
if Ovflo then
Rent := RE_Exp_Long_Long_Long_Integer;
else
Rent := RE_Exn_Long_Long_Long_Integer;
end if;
end if;
-- Floating-point cases. We do not need separate routines for the
-- overflow case here, since in the case of floating-point, we generate
-- infinities anyway as a rule (either that or we automatically trap
-- overflow), and if there is an infinity generated and a range check
-- is required, the check will fail anyway.
else
pragma Assert (Is_Floating_Point_Type (Rtyp));
-- Short_Float and Float are the same type for GNAT
if Rtyp = Standard_Short_Float or else Rtyp = Standard_Float then
Etyp := Standard_Float;
Rent := RE_Exn_Float;
elsif Rtyp = Standard_Long_Float then
Etyp := Standard_Long_Float;
Rent := RE_Exn_Long_Float;
else
Etyp := Standard_Long_Long_Float;
Rent := RE_Exn_Long_Long_Float;
end if;
end if;
-- Common processing for integer cases and floating-point cases.
-- If we are in the right type, we can call runtime routine directly
if Typ = Etyp
and then not Is_Universal_Numeric_Type (Rtyp)
then
Rewrite (N,
Wrap_MA (
Make_Function_Call (Loc,
Name => New_Occurrence_Of (RTE (Rent), Loc),
Parameter_Associations => New_List (Base, Exp))));
-- Otherwise we have to introduce conversions (conversions are also
-- required in the universal cases, since the runtime routine is
-- typed using one of the standard types).
else
Rewrite (N,
Convert_To (Typ,
Make_Function_Call (Loc,
Name => New_Occurrence_Of (RTE (Rent), Loc),
Parameter_Associations => New_List (
Convert_To (Etyp, Base),
Exp))));
end if;
Analyze_And_Resolve (N, Typ);
return;
exception
when RE_Not_Available =>
return;
end Expand_N_Op_Expon;
--------------------
-- Expand_N_Op_Ge --
--------------------
procedure Expand_N_Op_Ge (N : Node_Id) is
Typ : constant Entity_Id := Etype (N);
Op1 : constant Node_Id := Left_Opnd (N);
Op2 : constant Node_Id := Right_Opnd (N);
Typ1 : constant Entity_Id := Base_Type (Etype (Op1));
begin
Binary_Op_Validity_Checks (N);
-- Deal with overflow checks in MINIMIZED/ELIMINATED mode and if that
-- means we no longer have a comparison operation, we are all done.
if Minimized_Eliminated_Overflow_Check (Op1) then
Expand_Compare_Minimize_Eliminate_Overflow (N);
end if;
if Nkind (N) /= N_Op_Ge then
return;
end if;
-- Array type case
if Is_Array_Type (Typ1) then
Expand_Array_Comparison (N);
return;
end if;
-- Deal with boolean operands
if Is_Boolean_Type (Typ1) then
Adjust_Condition (Op1);
Adjust_Condition (Op2);
Set_Etype (N, Standard_Boolean);
Adjust_Result_Type (N, Typ);
end if;
Rewrite_Comparison (N);
-- Try to narrow the operation
if Typ1 = Universal_Integer and then Nkind (N) = N_Op_Ge then
Narrow_Large_Operation (N);
end if;
Optimize_Length_Comparison (N);
end Expand_N_Op_Ge;
--------------------
-- Expand_N_Op_Gt --
--------------------
procedure Expand_N_Op_Gt (N : Node_Id) is
Typ : constant Entity_Id := Etype (N);
Op1 : constant Node_Id := Left_Opnd (N);
Op2 : constant Node_Id := Right_Opnd (N);
Typ1 : constant Entity_Id := Base_Type (Etype (Op1));
begin
Binary_Op_Validity_Checks (N);
-- Deal with overflow checks in MINIMIZED/ELIMINATED mode and if that
-- means we no longer have a comparison operation, we are all done.
if Minimized_Eliminated_Overflow_Check (Op1) then
Expand_Compare_Minimize_Eliminate_Overflow (N);
end if;
if Nkind (N) /= N_Op_Gt then
return;
end if;
-- Deal with array type operands
if Is_Array_Type (Typ1) then
Expand_Array_Comparison (N);
return;
end if;
-- Deal with boolean type operands
if Is_Boolean_Type (Typ1) then
Adjust_Condition (Op1);
Adjust_Condition (Op2);
Set_Etype (N, Standard_Boolean);
Adjust_Result_Type (N, Typ);
end if;
Rewrite_Comparison (N);
-- Try to narrow the operation
if Typ1 = Universal_Integer and then Nkind (N) = N_Op_Gt then
Narrow_Large_Operation (N);
end if;
Optimize_Length_Comparison (N);
end Expand_N_Op_Gt;
--------------------
-- Expand_N_Op_Le --
--------------------
procedure Expand_N_Op_Le (N : Node_Id) is
Typ : constant Entity_Id := Etype (N);
Op1 : constant Node_Id := Left_Opnd (N);
Op2 : constant Node_Id := Right_Opnd (N);
Typ1 : constant Entity_Id := Base_Type (Etype (Op1));
begin
Binary_Op_Validity_Checks (N);
-- Deal with overflow checks in MINIMIZED/ELIMINATED mode and if that
-- means we no longer have a comparison operation, we are all done.
if Minimized_Eliminated_Overflow_Check (Op1) then
Expand_Compare_Minimize_Eliminate_Overflow (N);
end if;
if Nkind (N) /= N_Op_Le then
return;
end if;
-- Deal with array type operands
if Is_Array_Type (Typ1) then
Expand_Array_Comparison (N);
return;
end if;
-- Deal with Boolean type operands
if Is_Boolean_Type (Typ1) then
Adjust_Condition (Op1);
Adjust_Condition (Op2);
Set_Etype (N, Standard_Boolean);
Adjust_Result_Type (N, Typ);
end if;
Rewrite_Comparison (N);
-- Try to narrow the operation
if Typ1 = Universal_Integer and then Nkind (N) = N_Op_Le then
Narrow_Large_Operation (N);
end if;
Optimize_Length_Comparison (N);
end Expand_N_Op_Le;
--------------------
-- Expand_N_Op_Lt --
--------------------
procedure Expand_N_Op_Lt (N : Node_Id) is
Typ : constant Entity_Id := Etype (N);
Op1 : constant Node_Id := Left_Opnd (N);
Op2 : constant Node_Id := Right_Opnd (N);
Typ1 : constant Entity_Id := Base_Type (Etype (Op1));
begin
Binary_Op_Validity_Checks (N);
-- Deal with overflow checks in MINIMIZED/ELIMINATED mode and if that
-- means we no longer have a comparison operation, we are all done.
if Minimized_Eliminated_Overflow_Check (Op1) then
Expand_Compare_Minimize_Eliminate_Overflow (N);
end if;
if Nkind (N) /= N_Op_Lt then
return;
end if;
-- Deal with array type operands
if Is_Array_Type (Typ1) then
Expand_Array_Comparison (N);
return;
end if;
-- Deal with Boolean type operands
if Is_Boolean_Type (Typ1) then
Adjust_Condition (Op1);
Adjust_Condition (Op2);
Set_Etype (N, Standard_Boolean);
Adjust_Result_Type (N, Typ);
end if;
Rewrite_Comparison (N);
-- Try to narrow the operation
if Typ1 = Universal_Integer and then Nkind (N) = N_Op_Lt then
Narrow_Large_Operation (N);
end if;
Optimize_Length_Comparison (N);
end Expand_N_Op_Lt;
-----------------------
-- Expand_N_Op_Minus --
-----------------------
procedure Expand_N_Op_Minus (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Etype (N);
begin
Unary_Op_Validity_Checks (N);
-- Check for MINIMIZED/ELIMINATED overflow mode
if Minimized_Eliminated_Overflow_Check (N) then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- Try to narrow the operation
if Typ = Universal_Integer then
Narrow_Large_Operation (N);
if Nkind (N) /= N_Op_Minus then
return;
end if;
end if;
if not Backend_Overflow_Checks_On_Target
and then Is_Signed_Integer_Type (Typ)
and then Do_Overflow_Check (N)
then
-- Software overflow checking expands -expr into (0 - expr)
Rewrite (N,
Make_Op_Subtract (Loc,
Left_Opnd => Make_Integer_Literal (Loc, 0),
Right_Opnd => Right_Opnd (N)));
Analyze_And_Resolve (N, Typ);
end if;
Expand_Nonbinary_Modular_Op (N);
end Expand_N_Op_Minus;
---------------------
-- Expand_N_Op_Mod --
---------------------
procedure Expand_N_Op_Mod (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Etype (N);
DDC : constant Boolean := Do_Division_Check (N);
Left : Node_Id;
Right : Node_Id;
LLB : Uint;
Llo : Uint;
Lhi : Uint;
LOK : Boolean;
Rlo : Uint;
Rhi : Uint;
ROK : Boolean;
pragma Warnings (Off, Lhi);
begin
Binary_Op_Validity_Checks (N);
-- Check for MINIMIZED/ELIMINATED overflow mode
if Minimized_Eliminated_Overflow_Check (N) then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- Try to narrow the operation
if Typ = Universal_Integer then
Narrow_Large_Operation (N);
if Nkind (N) /= N_Op_Mod then
return;
end if;
end if;
if Is_Integer_Type (Typ) then
Apply_Divide_Checks (N);
-- All done if we don't have a MOD any more, which can happen as a
-- result of overflow expansion in MINIMIZED or ELIMINATED modes.
if Nkind (N) /= N_Op_Mod then
return;
end if;
end if;
-- Proceed with expansion of mod operator
Left := Left_Opnd (N);
Right := Right_Opnd (N);
Determine_Range (Right, ROK, Rlo, Rhi, Assume_Valid => True);
Determine_Range (Left, LOK, Llo, Lhi, Assume_Valid => True);
-- Convert mod to rem if operands are both known to be non-negative, or
-- both known to be non-positive (these are the cases in which rem and
-- mod are the same, see (RM 4.5.5(28-30)). We do this since it is quite
-- likely that this will improve the quality of code, (the operation now
-- corresponds to the hardware remainder), and it does not seem likely
-- that it could be harmful. It also avoids some cases of the elaborate
-- expansion in Modify_Tree_For_C mode below (since Ada rem = C %).
if (LOK and ROK)
and then ((Llo >= 0 and then Rlo >= 0)
or else
(Lhi <= 0 and then Rhi <= 0))
then
Rewrite (N,
Make_Op_Rem (Sloc (N),
Left_Opnd => Left_Opnd (N),
Right_Opnd => Right_Opnd (N)));
-- Instead of reanalyzing the node we do the analysis manually. This
-- avoids anomalies when the replacement is done in an instance and
-- is epsilon more efficient.
Set_Entity (N, Standard_Entity (S_Op_Rem));
Set_Etype (N, Typ);
Set_Do_Division_Check (N, DDC);
Expand_N_Op_Rem (N);
Set_Analyzed (N);
return;
-- Otherwise, normal mod processing
else
-- Apply optimization x mod 1 = 0. We don't really need that with
-- gcc, but it is useful with other back ends and is certainly
-- harmless.
if Is_Integer_Type (Etype (N))
and then Compile_Time_Known_Value (Right)
and then Expr_Value (Right) = Uint_1
then
-- Call Remove_Side_Effects to ensure that any side effects in
-- the ignored left operand (in particular function calls to
-- user defined functions) are properly executed.
Remove_Side_Effects (Left);
Rewrite (N, Make_Integer_Literal (Loc, 0));
Analyze_And_Resolve (N, Typ);
return;
end if;
-- If we still have a mod operator and we are in Modify_Tree_For_C
-- mode, and we have a signed integer type, then here is where we do
-- the rewrite in terms of Rem. Note this rewrite bypasses the need
-- for the special handling of the annoying case of largest negative
-- number mod minus one.
if Nkind (N) = N_Op_Mod
and then Is_Signed_Integer_Type (Typ)
and then Modify_Tree_For_C
then
-- In the general case, we expand A mod B as
-- Tnn : constant typ := A rem B;
-- ..
-- (if (A >= 0) = (B >= 0) then Tnn
-- elsif Tnn = 0 then 0
-- else Tnn + B)
-- The comparison can be written simply as A >= 0 if we know that
-- B >= 0 which is a very common case.
-- An important optimization is when B is known at compile time
-- to be 2**K for some constant. In this case we can simply AND
-- the left operand with the bit string 2**K-1 (i.e. K 1-bits)
-- and that works for both the positive and negative cases.
declare
P2 : constant Nat := Power_Of_Two (Right);
begin
if P2 /= 0 then
Rewrite (N,
Unchecked_Convert_To (Typ,
Make_Op_And (Loc,
Left_Opnd =>
Unchecked_Convert_To
(Corresponding_Unsigned_Type (Typ), Left),
Right_Opnd =>
Make_Integer_Literal (Loc, 2 ** P2 - 1))));
Analyze_And_Resolve (N, Typ);
return;
end if;
end;
-- Here for the full rewrite
declare
Tnn : constant Entity_Id := Make_Temporary (Sloc (N), 'T', N);
Cmp : Node_Id;
begin
Cmp :=
Make_Op_Ge (Loc,
Left_Opnd => Duplicate_Subexpr_No_Checks (Left),
Right_Opnd => Make_Integer_Literal (Loc, 0));
if not LOK or else Rlo < 0 then
Cmp :=
Make_Op_Eq (Loc,
Left_Opnd => Cmp,
Right_Opnd =>
Make_Op_Ge (Loc,
Left_Opnd => Duplicate_Subexpr_No_Checks (Right),
Right_Opnd => Make_Integer_Literal (Loc, 0)));
end if;
Insert_Action (N,
Make_Object_Declaration (Loc,
Defining_Identifier => Tnn,
Constant_Present => True,
Object_Definition => New_Occurrence_Of (Typ, Loc),
Expression =>
Make_Op_Rem (Loc,
Left_Opnd => Left,
Right_Opnd => Right)));
Rewrite (N,
Make_If_Expression (Loc,
Expressions => New_List (
Cmp,
New_Occurrence_Of (Tnn, Loc),
Make_If_Expression (Loc,
Is_Elsif => True,
Expressions => New_List (
Make_Op_Eq (Loc,
Left_Opnd => New_Occurrence_Of (Tnn, Loc),
Right_Opnd => Make_Integer_Literal (Loc, 0)),
Make_Integer_Literal (Loc, 0),
Make_Op_Add (Loc,
Left_Opnd => New_Occurrence_Of (Tnn, Loc),
Right_Opnd =>
Duplicate_Subexpr_No_Checks (Right)))))));
Analyze_And_Resolve (N, Typ);
return;
end;
end if;
-- Deal with annoying case of largest negative number mod minus one.
-- Gigi may not handle this case correctly, because on some targets,
-- the mod value is computed using a divide instruction which gives
-- an overflow trap for this case.
-- It would be a bit more efficient to figure out which targets
-- this is really needed for, but in practice it is reasonable
-- to do the following special check in all cases, since it means
-- we get a clearer message, and also the overhead is minimal given
-- that division is expensive in any case.
-- In fact the check is quite easy, if the right operand is -1, then
-- the mod value is always 0, and we can just ignore the left operand
-- completely in this case.
-- This only applies if we still have a mod operator. Skip if we
-- have already rewritten this (e.g. in the case of eliminated
-- overflow checks which have driven us into bignum mode).
if Nkind (N) = N_Op_Mod then
-- The operand type may be private (e.g. in the expansion of an
-- intrinsic operation) so we must use the underlying type to get
-- the bounds, and convert the literals explicitly.
LLB :=
Expr_Value
(Type_Low_Bound (Base_Type (Underlying_Type (Etype (Left)))));
if ((not ROK) or else (Rlo <= (-1) and then (-1) <= Rhi))
and then ((not LOK) or else (Llo = LLB))
and then not CodePeer_Mode
then
Rewrite (N,
Make_If_Expression (Loc,
Expressions => New_List (
Make_Op_Eq (Loc,
Left_Opnd => Duplicate_Subexpr (Right),
Right_Opnd =>
Unchecked_Convert_To (Typ,
Make_Integer_Literal (Loc, -1))),
Unchecked_Convert_To (Typ,
Make_Integer_Literal (Loc, Uint_0)),
Relocate_Node (N))));
Set_Analyzed (Next (Next (First (Expressions (N)))));
Analyze_And_Resolve (N, Typ);
end if;
end if;
end if;
end Expand_N_Op_Mod;
--------------------------
-- Expand_N_Op_Multiply --
--------------------------
procedure Expand_N_Op_Multiply (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Lop : constant Node_Id := Left_Opnd (N);
Rop : constant Node_Id := Right_Opnd (N);
Lp2 : constant Boolean :=
Nkind (Lop) = N_Op_Expon and then Is_Power_Of_2_For_Shift (Lop);
Rp2 : constant Boolean :=
Nkind (Rop) = N_Op_Expon and then Is_Power_Of_2_For_Shift (Rop);
Ltyp : constant Entity_Id := Etype (Lop);
Rtyp : constant Entity_Id := Etype (Rop);
Typ : Entity_Id := Etype (N);
begin
Binary_Op_Validity_Checks (N);
-- Check for MINIMIZED/ELIMINATED overflow mode
if Minimized_Eliminated_Overflow_Check (N) then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- Special optimizations for integer types
if Is_Integer_Type (Typ) then
-- N * 0 = 0 for integer types
if Compile_Time_Known_Value (Rop)
and then Expr_Value (Rop) = Uint_0
then
-- Call Remove_Side_Effects to ensure that any side effects in
-- the ignored left operand (in particular function calls to
-- user defined functions) are properly executed.
Remove_Side_Effects (Lop);
Rewrite (N, Make_Integer_Literal (Loc, Uint_0));
Analyze_And_Resolve (N, Typ);
return;
end if;
-- Similar handling for 0 * N = 0
if Compile_Time_Known_Value (Lop)
and then Expr_Value (Lop) = Uint_0
then
Remove_Side_Effects (Rop);
Rewrite (N, Make_Integer_Literal (Loc, Uint_0));
Analyze_And_Resolve (N, Typ);
return;
end if;
-- N * 1 = 1 * N = N for integer types
-- This optimisation is not done if we are going to
-- rewrite the product 1 * 2 ** N to a shift.
if Compile_Time_Known_Value (Rop)
and then Expr_Value (Rop) = Uint_1
and then not Lp2
then
Rewrite (N, Lop);
return;
elsif Compile_Time_Known_Value (Lop)
and then Expr_Value (Lop) = Uint_1
and then not Rp2
then
Rewrite (N, Rop);
return;
end if;
end if;
-- Convert x * 2 ** y to Shift_Left (x, y). Note that the fact that
-- Is_Power_Of_2_For_Shift is set means that we know that our left
-- operand is an integer, as required for this to work.
if Rp2 then
if Lp2 then
-- Convert 2 ** A * 2 ** B into 2 ** (A + B)
Rewrite (N,
Make_Op_Expon (Loc,
Left_Opnd => Make_Integer_Literal (Loc, 2),
Right_Opnd =>
Make_Op_Add (Loc,
Left_Opnd => Right_Opnd (Lop),
Right_Opnd => Right_Opnd (Rop))));
Analyze_And_Resolve (N, Typ);
return;
else
-- If the result is modular, perform the reduction of the result
-- appropriately.
if Is_Modular_Integer_Type (Typ)
and then not Non_Binary_Modulus (Typ)
then
Rewrite (N,
Make_Op_And (Loc,
Left_Opnd =>
Make_Op_Shift_Left (Loc,
Left_Opnd => Lop,
Right_Opnd =>
Convert_To (Standard_Natural, Right_Opnd (Rop))),
Right_Opnd =>
Make_Integer_Literal (Loc, Modulus (Typ) - 1)));
else
Rewrite (N,
Make_Op_Shift_Left (Loc,
Left_Opnd => Lop,
Right_Opnd =>
Convert_To (Standard_Natural, Right_Opnd (Rop))));
end if;
Analyze_And_Resolve (N, Typ);
return;
end if;
-- Same processing for the operands the other way round
elsif Lp2 then
if Is_Modular_Integer_Type (Typ)
and then not Non_Binary_Modulus (Typ)
then
Rewrite (N,
Make_Op_And (Loc,
Left_Opnd =>
Make_Op_Shift_Left (Loc,
Left_Opnd => Rop,
Right_Opnd =>
Convert_To (Standard_Natural, Right_Opnd (Lop))),
Right_Opnd =>
Make_Integer_Literal (Loc, Modulus (Typ) - 1)));
else
Rewrite (N,
Make_Op_Shift_Left (Loc,
Left_Opnd => Rop,
Right_Opnd =>
Convert_To (Standard_Natural, Right_Opnd (Lop))));
end if;
Analyze_And_Resolve (N, Typ);
return;
end if;
-- Try to narrow the operation
if Typ = Universal_Integer then
Narrow_Large_Operation (N);
if Nkind (N) /= N_Op_Multiply then
return;
end if;
end if;
-- Do required fixup of universal fixed operation
if Typ = Universal_Fixed then
Fixup_Universal_Fixed_Operation (N);
Typ := Etype (N);
end if;
-- Multiplications with fixed-point results
if Is_Fixed_Point_Type (Typ) then
-- Case of fixed * integer => fixed
if Is_Integer_Type (Rtyp) then
Expand_Multiply_Fixed_By_Integer_Giving_Fixed (N);
-- Case of integer * fixed => fixed
elsif Is_Integer_Type (Ltyp) then
Expand_Multiply_Integer_By_Fixed_Giving_Fixed (N);
-- Case of fixed * fixed => fixed
else
Expand_Multiply_Fixed_By_Fixed_Giving_Fixed (N);
end if;
-- Other cases of multiplication of fixed-point operands
elsif Is_Fixed_Point_Type (Ltyp) or else Is_Fixed_Point_Type (Rtyp) then
if Is_Integer_Type (Typ) then
Expand_Multiply_Fixed_By_Fixed_Giving_Integer (N);
else
pragma Assert (Is_Floating_Point_Type (Typ));
Expand_Multiply_Fixed_By_Fixed_Giving_Float (N);
end if;
-- Mixed-mode operations can appear in a non-static universal context,
-- in which case the integer argument must be converted explicitly.
elsif Typ = Universal_Real and then Is_Integer_Type (Rtyp) then
Rewrite (Rop, Convert_To (Universal_Real, Relocate_Node (Rop)));
Analyze_And_Resolve (Rop, Universal_Real);
elsif Typ = Universal_Real and then Is_Integer_Type (Ltyp) then
Rewrite (Lop, Convert_To (Universal_Real, Relocate_Node (Lop)));
Analyze_And_Resolve (Lop, Universal_Real);
-- Non-fixed point cases, check software overflow checking required
elsif Is_Signed_Integer_Type (Etype (N)) then
Apply_Arithmetic_Overflow_Check (N);
end if;
-- Overflow checks for floating-point if -gnateF mode active
Check_Float_Op_Overflow (N);
Expand_Nonbinary_Modular_Op (N);
end Expand_N_Op_Multiply;
--------------------
-- Expand_N_Op_Ne --
--------------------
procedure Expand_N_Op_Ne (N : Node_Id) is
Typ : constant Entity_Id := Etype (Left_Opnd (N));
begin
-- Case of elementary type with standard operator. But if unnesting,
-- handle elementary types whose Equivalent_Types are records because
-- there may be padding or undefined fields.
if Is_Elementary_Type (Typ)
and then Sloc (Entity (N)) = Standard_Location
and then not (Ekind (Typ) in E_Class_Wide_Type
| E_Class_Wide_Subtype
| E_Access_Subprogram_Type
| E_Access_Protected_Subprogram_Type
| E_Anonymous_Access_Protected_Subprogram_Type
| E_Exception_Type
and then Present (Equivalent_Type (Typ))
and then Is_Record_Type (Equivalent_Type (Typ)))
then
Binary_Op_Validity_Checks (N);
-- Deal with overflow checks in MINIMIZED/ELIMINATED mode and if
-- means we no longer have a /= operation, we are all done.
if Minimized_Eliminated_Overflow_Check (Left_Opnd (N)) then
Expand_Compare_Minimize_Eliminate_Overflow (N);
end if;
if Nkind (N) /= N_Op_Ne then
return;
end if;
-- Boolean types (requiring handling of non-standard case)
if Is_Boolean_Type (Typ) then
Adjust_Condition (Left_Opnd (N));
Adjust_Condition (Right_Opnd (N));
Set_Etype (N, Standard_Boolean);
Adjust_Result_Type (N, Typ);
end if;
Rewrite_Comparison (N);
-- Try to narrow the operation
if Typ = Universal_Integer and then Nkind (N) = N_Op_Ne then
Narrow_Large_Operation (N);
end if;
-- For all cases other than elementary types, we rewrite node as the
-- negation of an equality operation, and reanalyze. The equality to be
-- used is defined in the same scope and has the same signature. This
-- signature must be set explicitly since in an instance it may not have
-- the same visibility as in the generic unit. This avoids duplicating
-- or factoring the complex code for record/array equality tests etc.
-- This case is also used for the minimal expansion performed in
-- GNATprove mode.
else
declare
Loc : constant Source_Ptr := Sloc (N);
Neg : Node_Id;
Ne : constant Entity_Id := Entity (N);
begin
Binary_Op_Validity_Checks (N);
Neg :=
Make_Op_Not (Loc,
Right_Opnd =>
Make_Op_Eq (Loc,
Left_Opnd => Left_Opnd (N),
Right_Opnd => Right_Opnd (N)));
-- The level of parentheses is useless in GNATprove mode, and
-- bumping its level here leads to wrong columns being used in
-- check messages, hence skip it in this mode.
if not GNATprove_Mode then
Set_Paren_Count (Right_Opnd (Neg), 1);
end if;
if Scope (Ne) /= Standard_Standard then
Set_Entity (Right_Opnd (Neg), Corresponding_Equality (Ne));
end if;
-- For navigation purposes, we want to treat the inequality as an
-- implicit reference to the corresponding equality. Preserve the
-- Comes_From_ source flag to generate proper Xref entries.
Preserve_Comes_From_Source (Neg, N);
Preserve_Comes_From_Source (Right_Opnd (Neg), N);
Rewrite (N, Neg);
Analyze_And_Resolve (N, Standard_Boolean);
end;
end if;
-- No need for optimization in GNATprove mode, where we would rather see
-- the original source expression.
if not GNATprove_Mode then
Optimize_Length_Comparison (N);
end if;
end Expand_N_Op_Ne;
---------------------
-- Expand_N_Op_Not --
---------------------
-- If the argument is other than a Boolean array type, there is no special
-- expansion required, except for dealing with validity checks, and non-
-- standard boolean representations.
-- For the packed array case, we call the special routine in Exp_Pakd,
-- except that if the component size is greater than one, we use the
-- standard routine generating a gruesome loop (it is so peculiar to have
-- packed arrays with non-standard Boolean representations anyway, so it
-- does not matter that we do not handle this case efficiently).
-- For the unpacked array case (and for the special packed case where we
-- have non standard Booleans, as discussed above), we generate and insert
-- into the tree the following function definition:
-- function Nnnn (A : arr) is
-- B : arr;
-- begin
-- for J in a'range loop
-- B (J) := not A (J);
-- end loop;
-- return B;
-- end Nnnn;
-- or in the case of Transform_Function_Array:
-- procedure Nnnn (A : arr; RESULT : out arr) is
-- begin
-- for J in a'range loop
-- RESULT (J) := not A (J);
-- end loop;
-- end Nnnn;
-- Here arr is the actual subtype of the parameter (and hence always
-- constrained). Then we replace the not with a call to this subprogram.
procedure Expand_N_Op_Not (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Etype (Right_Opnd (N));
Opnd : Node_Id;
Arr : Entity_Id;
A : Entity_Id;
B : Entity_Id;
J : Entity_Id;
A_J : Node_Id;
B_J : Node_Id;
Func_Name : Entity_Id;
Loop_Statement : Node_Id;
begin
Unary_Op_Validity_Checks (N);
-- For boolean operand, deal with non-standard booleans
if Is_Boolean_Type (Typ) then
Adjust_Condition (Right_Opnd (N));
Set_Etype (N, Standard_Boolean);
Adjust_Result_Type (N, Typ);
return;
end if;
-- Only array types need any other processing
if not Is_Array_Type (Typ) then
return;
end if;
-- Case of array operand. If bit packed with a component size of 1,
-- handle it in Exp_Pakd if the operand is known to be aligned.
if Is_Bit_Packed_Array (Typ)
and then Component_Size (Typ) = 1
and then not Is_Possibly_Unaligned_Object (Right_Opnd (N))
then
Expand_Packed_Not (N);
return;
end if;
-- Case of array operand which is not bit-packed. If the context is
-- a safe assignment, call in-place operation, If context is a larger
-- boolean expression in the context of a safe assignment, expansion is
-- done by enclosing operation.
Opnd := Relocate_Node (Right_Opnd (N));
Convert_To_Actual_Subtype (Opnd);
Arr := Etype (Opnd);
Ensure_Defined (Arr, N);
Silly_Boolean_Array_Not_Test (N, Arr);
if Nkind (Parent (N)) = N_Assignment_Statement then
if Safe_In_Place_Array_Op (Name (Parent (N)), N, Empty) then
Build_Boolean_Array_Proc_Call (Parent (N), Opnd, Empty);
return;
-- Special case the negation of a binary operation
elsif Nkind (Opnd) in N_Op_And | N_Op_Or | N_Op_Xor
and then Safe_In_Place_Array_Op
(Name (Parent (N)), Left_Opnd (Opnd), Right_Opnd (Opnd))
then
Build_Boolean_Array_Proc_Call (Parent (N), Opnd, Empty);
return;
end if;
elsif Nkind (Parent (N)) in N_Binary_Op
and then Nkind (Parent (Parent (N))) = N_Assignment_Statement
then
declare
Op1 : constant Node_Id := Left_Opnd (Parent (N));
Op2 : constant Node_Id := Right_Opnd (Parent (N));
Lhs : constant Node_Id := Name (Parent (Parent (N)));
begin
if Safe_In_Place_Array_Op (Lhs, Op1, Op2) then
-- (not A) op (not B) can be reduced to a single call
if N = Op1 and then Nkind (Op2) = N_Op_Not then
return;
elsif N = Op2 and then Nkind (Op1) = N_Op_Not then
return;
-- A xor (not B) can also be special-cased
elsif N = Op2 and then Nkind (Parent (N)) = N_Op_Xor then
return;
end if;
end if;
end;
end if;
A := Make_Defining_Identifier (Loc, Name_uA);
if Transform_Function_Array then
B := Make_Defining_Identifier (Loc, Name_UP_RESULT);
else
B := Make_Defining_Identifier (Loc, Name_uB);
end if;
J := Make_Defining_Identifier (Loc, Name_uJ);
A_J :=
Make_Indexed_Component (Loc,
Prefix => New_Occurrence_Of (A, Loc),
Expressions => New_List (New_Occurrence_Of (J, Loc)));
B_J :=
Make_Indexed_Component (Loc,
Prefix => New_Occurrence_Of (B, Loc),
Expressions => New_List (New_Occurrence_Of (J, Loc)));
Loop_Statement :=
Make_Implicit_Loop_Statement (N,
Identifier => Empty,
Iteration_Scheme =>
Make_Iteration_Scheme (Loc,
Loop_Parameter_Specification =>
Make_Loop_Parameter_Specification (Loc,
Defining_Identifier => J,
Discrete_Subtype_Definition =>
Make_Attribute_Reference (Loc,
Prefix => Make_Identifier (Loc, Chars (A)),
Attribute_Name => Name_Range))),
Statements => New_List (
Make_Assignment_Statement (Loc,
Name => B_J,
Expression => Make_Op_Not (Loc, A_J))));
Func_Name := Make_Temporary (Loc, 'N');
Set_Is_Inlined (Func_Name);
if Transform_Function_Array then
Insert_Action (N,
Make_Subprogram_Body (Loc,
Specification =>
Make_Procedure_Specification (Loc,
Defining_Unit_Name => Func_Name,
Parameter_Specifications => New_List (
Make_Parameter_Specification (Loc,
Defining_Identifier => A,
Parameter_Type => New_Occurrence_Of (Typ, Loc)),
Make_Parameter_Specification (Loc,
Defining_Identifier => B,
Out_Present => True,
Parameter_Type => New_Occurrence_Of (Typ, Loc)))),
Declarations => New_List,
Handled_Statement_Sequence =>
Make_Handled_Sequence_Of_Statements (Loc,
Statements => New_List (Loop_Statement))));
declare
Temp_Id : constant Entity_Id := Make_Temporary (Loc, 'T');
Call : Node_Id;
Decl : Node_Id;
begin
-- Generate:
-- Temp : ...;
Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Temp_Id,
Object_Definition => New_Occurrence_Of (Typ, Loc));
-- Generate:
-- Proc_Call (Opnd, Temp);
Call :=
Make_Procedure_Call_Statement (Loc,
Name => New_Occurrence_Of (Func_Name, Loc),
Parameter_Associations =>
New_List (Opnd, New_Occurrence_Of (Temp_Id, Loc)));
Insert_Actions (Parent (N), New_List (Decl, Call));
Rewrite (N, New_Occurrence_Of (Temp_Id, Loc));
end;
else
Insert_Action (N,
Make_Subprogram_Body (Loc,
Specification =>
Make_Function_Specification (Loc,
Defining_Unit_Name => Func_Name,
Parameter_Specifications => New_List (
Make_Parameter_Specification (Loc,
Defining_Identifier => A,
Parameter_Type => New_Occurrence_Of (Typ, Loc))),
Result_Definition => New_Occurrence_Of (Typ, Loc)),
Declarations => New_List (
Make_Object_Declaration (Loc,
Defining_Identifier => B,
Object_Definition => New_Occurrence_Of (Arr, Loc))),
Handled_Statement_Sequence =>
Make_Handled_Sequence_Of_Statements (Loc,
Statements => New_List (
Loop_Statement,
Make_Simple_Return_Statement (Loc,
Expression => Make_Identifier (Loc, Chars (B)))))));
Rewrite (N,
Make_Function_Call (Loc,
Name => New_Occurrence_Of (Func_Name, Loc),
Parameter_Associations => New_List (Opnd)));
end if;
Analyze_And_Resolve (N, Typ);
end Expand_N_Op_Not;
--------------------
-- Expand_N_Op_Or --
--------------------
procedure Expand_N_Op_Or (N : Node_Id) is
Typ : constant Entity_Id := Etype (N);
begin
Binary_Op_Validity_Checks (N);
if Is_Array_Type (Etype (N)) then
Expand_Boolean_Operator (N);
elsif Is_Boolean_Type (Etype (N)) then
Adjust_Condition (Left_Opnd (N));
Adjust_Condition (Right_Opnd (N));
Set_Etype (N, Standard_Boolean);
Adjust_Result_Type (N, Typ);
elsif Is_Intrinsic_Subprogram (Entity (N)) then
Expand_Intrinsic_Call (N, Entity (N));
end if;
Expand_Nonbinary_Modular_Op (N);
end Expand_N_Op_Or;
----------------------
-- Expand_N_Op_Plus --
----------------------
procedure Expand_N_Op_Plus (N : Node_Id) is
Typ : constant Entity_Id := Etype (N);
begin
Unary_Op_Validity_Checks (N);
-- Check for MINIMIZED/ELIMINATED overflow mode
if Minimized_Eliminated_Overflow_Check (N) then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- Try to narrow the operation
if Typ = Universal_Integer then
Narrow_Large_Operation (N);
end if;
end Expand_N_Op_Plus;
---------------------
-- Expand_N_Op_Rem --
---------------------
procedure Expand_N_Op_Rem (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Etype (N);
Left : Node_Id;
Right : Node_Id;
Lo : Uint;
Hi : Uint;
OK : Boolean;
Lneg : Boolean;
Rneg : Boolean;
-- Set if corresponding operand can be negative
begin
Binary_Op_Validity_Checks (N);
-- Check for MINIMIZED/ELIMINATED overflow mode
if Minimized_Eliminated_Overflow_Check (N) then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- Try to narrow the operation
if Typ = Universal_Integer then
Narrow_Large_Operation (N);
if Nkind (N) /= N_Op_Rem then
return;
end if;
end if;
if Is_Integer_Type (Etype (N)) then
Apply_Divide_Checks (N);
-- All done if we don't have a REM any more, which can happen as a
-- result of overflow expansion in MINIMIZED or ELIMINATED modes.
if Nkind (N) /= N_Op_Rem then
return;
end if;
end if;
-- Proceed with expansion of REM
Left := Left_Opnd (N);
Right := Right_Opnd (N);
-- Apply optimization x rem 1 = 0. We don't really need that with gcc,
-- but it is useful with other back ends, and is certainly harmless.
if Is_Integer_Type (Etype (N))
and then Compile_Time_Known_Value (Right)
and then Expr_Value (Right) = Uint_1
then
-- Call Remove_Side_Effects to ensure that any side effects in the
-- ignored left operand (in particular function calls to user defined
-- functions) are properly executed.
Remove_Side_Effects (Left);
Rewrite (N, Make_Integer_Literal (Loc, 0));
Analyze_And_Resolve (N, Typ);
return;
end if;
-- Deal with annoying case of largest negative number remainder minus
-- one. Gigi may not handle this case correctly, because on some
-- targets, the mod value is computed using a divide instruction
-- which gives an overflow trap for this case.
-- It would be a bit more efficient to figure out which targets this
-- is really needed for, but in practice it is reasonable to do the
-- following special check in all cases, since it means we get a clearer
-- message, and also the overhead is minimal given that division is
-- expensive in any case.
-- In fact the check is quite easy, if the right operand is -1, then
-- the remainder is always 0, and we can just ignore the left operand
-- completely in this case.
Determine_Range (Right, OK, Lo, Hi, Assume_Valid => True);
Lneg := (not OK) or else Lo < 0;
Determine_Range (Left, OK, Lo, Hi, Assume_Valid => True);
Rneg := (not OK) or else Lo < 0;
-- We won't mess with trying to find out if the left operand can really
-- be the largest negative number (that's a pain in the case of private
-- types and this is really marginal). We will just assume that we need
-- the test if the left operand can be negative at all.
if (Lneg and Rneg)
and then not CodePeer_Mode
then
Rewrite (N,
Make_If_Expression (Loc,
Expressions => New_List (
Make_Op_Eq (Loc,
Left_Opnd => Duplicate_Subexpr (Right),
Right_Opnd =>
Unchecked_Convert_To (Typ, Make_Integer_Literal (Loc, -1))),
Unchecked_Convert_To (Typ,
Make_Integer_Literal (Loc, Uint_0)),
Relocate_Node (N))));
Set_Analyzed (Next (Next (First (Expressions (N)))));
Analyze_And_Resolve (N, Typ);
end if;
end Expand_N_Op_Rem;
-----------------------------
-- Expand_N_Op_Rotate_Left --
-----------------------------
procedure Expand_N_Op_Rotate_Left (N : Node_Id) is
begin
Binary_Op_Validity_Checks (N);
-- If we are in Modify_Tree_For_C mode, there is no rotate left in C,
-- so we rewrite in terms of logical shifts
-- Shift_Left (Num, Bits) or Shift_Right (num, Esize - Bits)
-- where Bits is the shift count mod Esize (the mod operation here
-- deals with ludicrous large shift counts, which are apparently OK).
if Modify_Tree_For_C then
declare
Loc : constant Source_Ptr := Sloc (N);
Rtp : constant Entity_Id := Etype (Right_Opnd (N));
Typ : constant Entity_Id := Etype (N);
begin
-- Sem_Intr should prevent getting there with a non binary modulus
pragma Assert (not Non_Binary_Modulus (Typ));
Rewrite (Right_Opnd (N),
Make_Op_Rem (Loc,
Left_Opnd => Relocate_Node (Right_Opnd (N)),
Right_Opnd => Make_Integer_Literal (Loc, Esize (Typ))));
Analyze_And_Resolve (Right_Opnd (N), Rtp);
Rewrite (N,
Make_Op_Or (Loc,
Left_Opnd =>
Make_Op_Shift_Left (Loc,
Left_Opnd => Left_Opnd (N),
Right_Opnd => Right_Opnd (N)),
Right_Opnd =>
Make_Op_Shift_Right (Loc,
Left_Opnd => Duplicate_Subexpr_No_Checks (Left_Opnd (N)),
Right_Opnd =>
Make_Op_Subtract (Loc,
Left_Opnd => Make_Integer_Literal (Loc, Esize (Typ)),
Right_Opnd =>
Duplicate_Subexpr_No_Checks (Right_Opnd (N))))));
Analyze_And_Resolve (N, Typ);
end;
end if;
end Expand_N_Op_Rotate_Left;
------------------------------
-- Expand_N_Op_Rotate_Right --
------------------------------
procedure Expand_N_Op_Rotate_Right (N : Node_Id) is
begin
Binary_Op_Validity_Checks (N);
-- If we are in Modify_Tree_For_C mode, there is no rotate right in C,
-- so we rewrite in terms of logical shifts
-- Shift_Right (Num, Bits) or Shift_Left (num, Esize - Bits)
-- where Bits is the shift count mod Esize (the mod operation here
-- deals with ludicrous large shift counts, which are apparently OK).
if Modify_Tree_For_C then
declare
Loc : constant Source_Ptr := Sloc (N);
Rtp : constant Entity_Id := Etype (Right_Opnd (N));
Typ : constant Entity_Id := Etype (N);
begin
-- Sem_Intr should prevent getting there with a non binary modulus
pragma Assert (not Non_Binary_Modulus (Typ));
Rewrite (Right_Opnd (N),
Make_Op_Rem (Loc,
Left_Opnd => Relocate_Node (Right_Opnd (N)),
Right_Opnd => Make_Integer_Literal (Loc, Esize (Typ))));
Analyze_And_Resolve (Right_Opnd (N), Rtp);
Rewrite (N,
Make_Op_Or (Loc,
Left_Opnd =>
Make_Op_Shift_Right (Loc,
Left_Opnd => Left_Opnd (N),
Right_Opnd => Right_Opnd (N)),
Right_Opnd =>
Make_Op_Shift_Left (Loc,
Left_Opnd => Duplicate_Subexpr_No_Checks (Left_Opnd (N)),
Right_Opnd =>
Make_Op_Subtract (Loc,
Left_Opnd => Make_Integer_Literal (Loc, Esize (Typ)),
Right_Opnd =>
Duplicate_Subexpr_No_Checks (Right_Opnd (N))))));
Analyze_And_Resolve (N, Typ);
end;
end if;
end Expand_N_Op_Rotate_Right;
----------------------------
-- Expand_N_Op_Shift_Left --
----------------------------
-- Note: nothing in this routine depends on left as opposed to right shifts
-- so we share the routine for expanding shift right operations.
procedure Expand_N_Op_Shift_Left (N : Node_Id) is
begin
Binary_Op_Validity_Checks (N);
-- If we are in Modify_Tree_For_C mode, then ensure that the right
-- operand is not greater than the word size (since that would not
-- be defined properly by the corresponding C shift operator).
if Modify_Tree_For_C then
declare
Right : constant Node_Id := Right_Opnd (N);
Loc : constant Source_Ptr := Sloc (Right);
Typ : constant Entity_Id := Etype (N);
Siz : constant Uint := Esize (Typ);
Orig : Node_Id;
OK : Boolean;
Lo : Uint;
Hi : Uint;
begin
-- Sem_Intr should prevent getting there with a non binary modulus
pragma Assert (not Non_Binary_Modulus (Typ));
if Compile_Time_Known_Value (Right) then
if Expr_Value (Right) >= Siz then
Rewrite (N, Make_Integer_Literal (Loc, 0));
Analyze_And_Resolve (N, Typ);
end if;
-- Not compile time known, find range
else
Determine_Range (Right, OK, Lo, Hi, Assume_Valid => True);
-- Nothing to do if known to be OK range, otherwise expand
if not OK or else Hi >= Siz then
-- Prevent recursion on copy of shift node
Orig := Relocate_Node (N);
Set_Analyzed (Orig);
-- Now do the rewrite
Rewrite (N,
Make_If_Expression (Loc,
Expressions => New_List (
Make_Op_Ge (Loc,
Left_Opnd => Duplicate_Subexpr_Move_Checks (Right),
Right_Opnd => Make_Integer_Literal (Loc, Siz)),
Make_Integer_Literal (Loc, 0),
Orig)));
Analyze_And_Resolve (N, Typ);
end if;
end if;
end;
end if;
end Expand_N_Op_Shift_Left;
-----------------------------
-- Expand_N_Op_Shift_Right --
-----------------------------
procedure Expand_N_Op_Shift_Right (N : Node_Id) is
begin
-- Share shift left circuit
Expand_N_Op_Shift_Left (N);
end Expand_N_Op_Shift_Right;
----------------------------------------
-- Expand_N_Op_Shift_Right_Arithmetic --
----------------------------------------
procedure Expand_N_Op_Shift_Right_Arithmetic (N : Node_Id) is
begin
Binary_Op_Validity_Checks (N);
-- If we are in Modify_Tree_For_C mode, there is no shift right
-- arithmetic in C, so we rewrite in terms of logical shifts for
-- modular integers, and keep the Shift_Right intrinsic for signed
-- integers: even though doing a shift on a signed integer is not
-- fully guaranteed by the C standard, this is what C compilers
-- implement in practice.
-- Consider also taking advantage of this for modular integers by first
-- performing an unchecked conversion of the modular integer to a signed
-- integer of the same sign, and then convert back.
-- Shift_Right (Num, Bits) or
-- (if Num >= Sign
-- then not (Shift_Right (Mask, bits))
-- else 0)
-- Here Mask is all 1 bits (2**size - 1), and Sign is 2**(size - 1)
-- Note: the above works fine for shift counts greater than or equal
-- to the word size, since in this case (not (Shift_Right (Mask, bits)))
-- generates all 1'bits.
if Modify_Tree_For_C and then Is_Modular_Integer_Type (Etype (N)) then
declare
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Etype (N);
Sign : constant Uint := 2 ** (Esize (Typ) - 1);
Mask : constant Uint := (2 ** Esize (Typ)) - 1;
Left : constant Node_Id := Left_Opnd (N);
Right : constant Node_Id := Right_Opnd (N);
Maskx : Node_Id;
begin
-- Sem_Intr should prevent getting there with a non binary modulus
pragma Assert (not Non_Binary_Modulus (Typ));
-- Here if not (Shift_Right (Mask, bits)) can be computed at
-- compile time as a single constant.
if Compile_Time_Known_Value (Right) then
declare
Val : constant Uint := Expr_Value (Right);
begin
if Val >= Esize (Typ) then
Maskx := Make_Integer_Literal (Loc, Mask);
else
Maskx :=
Make_Integer_Literal (Loc,
Intval => Mask - (Mask / (2 ** Expr_Value (Right))));
end if;
end;
else
Maskx :=
Make_Op_Not (Loc,
Right_Opnd =>
Make_Op_Shift_Right (Loc,
Left_Opnd => Make_Integer_Literal (Loc, Mask),
Right_Opnd => Duplicate_Subexpr_No_Checks (Right)));
end if;
-- Now do the rewrite
Rewrite (N,
Make_Op_Or (Loc,
Left_Opnd =>
Make_Op_Shift_Right (Loc,
Left_Opnd => Left,
Right_Opnd => Right),
Right_Opnd =>
Make_If_Expression (Loc,
Expressions => New_List (
Make_Op_Ge (Loc,
Left_Opnd => Duplicate_Subexpr_No_Checks (Left),
Right_Opnd => Make_Integer_Literal (Loc, Sign)),
Maskx,
Make_Integer_Literal (Loc, 0)))));
Analyze_And_Resolve (N, Typ);
end;
end if;
end Expand_N_Op_Shift_Right_Arithmetic;
--------------------------
-- Expand_N_Op_Subtract --
--------------------------
procedure Expand_N_Op_Subtract (N : Node_Id) is
Typ : constant Entity_Id := Etype (N);
begin
Binary_Op_Validity_Checks (N);
-- Check for MINIMIZED/ELIMINATED overflow mode
if Minimized_Eliminated_Overflow_Check (N) then
Apply_Arithmetic_Overflow_Check (N);
return;
end if;
-- Try to narrow the operation
if Typ = Universal_Integer then
Narrow_Large_Operation (N);
if Nkind (N) /= N_Op_Subtract then
return;
end if;
end if;
-- N - 0 = N for integer types
if Is_Integer_Type (Typ)
and then Compile_Time_Known_Value (Right_Opnd (N))
and then Expr_Value (Right_Opnd (N)) = 0
then
Rewrite (N, Left_Opnd (N));
return;
end if;
-- Arithmetic overflow checks for signed integer/fixed point types
if Is_Signed_Integer_Type (Typ) or else Is_Fixed_Point_Type (Typ) then
Apply_Arithmetic_Overflow_Check (N);
end if;
-- Overflow checks for floating-point if -gnateF mode active
Check_Float_Op_Overflow (N);
Expand_Nonbinary_Modular_Op (N);
end Expand_N_Op_Subtract;
---------------------
-- Expand_N_Op_Xor --
---------------------
procedure Expand_N_Op_Xor (N : Node_Id) is
Typ : constant Entity_Id := Etype (N);
begin
Binary_Op_Validity_Checks (N);
if Is_Array_Type (Etype (N)) then
Expand_Boolean_Operator (N);
elsif Is_Boolean_Type (Etype (N)) then
Adjust_Condition (Left_Opnd (N));
Adjust_Condition (Right_Opnd (N));
Set_Etype (N, Standard_Boolean);
Adjust_Result_Type (N, Typ);
elsif Is_Intrinsic_Subprogram (Entity (N)) then
Expand_Intrinsic_Call (N, Entity (N));
end if;
Expand_Nonbinary_Modular_Op (N);
end Expand_N_Op_Xor;
----------------------
-- Expand_N_Or_Else --
----------------------
procedure Expand_N_Or_Else (N : Node_Id)
renames Expand_Short_Circuit_Operator;
-----------------------------------
-- Expand_N_Qualified_Expression --
-----------------------------------
procedure Expand_N_Qualified_Expression (N : Node_Id) is
Operand : constant Node_Id := Expression (N);
Target_Type : constant Entity_Id := Entity (Subtype_Mark (N));
begin
-- Do validity check if validity checking operands
if Validity_Checks_On and Validity_Check_Operands then
Ensure_Valid (Operand);
end if;
-- Apply possible constraint check
Apply_Constraint_Check (Operand, Target_Type, No_Sliding => True);
-- Apply possible predicate check
Apply_Predicate_Check (Operand, Target_Type);
if Do_Range_Check (Operand) then
Generate_Range_Check (Operand, Target_Type, CE_Range_Check_Failed);
end if;
end Expand_N_Qualified_Expression;
------------------------------------
-- Expand_N_Quantified_Expression --
------------------------------------
-- We expand:
-- for all X in range => Cond
-- into:
-- T := True;
-- for X in range loop
-- if not Cond then
-- T := False;
-- exit;
-- end if;
-- end loop;
-- Similarly, an existentially quantified expression:
-- for some X in range => Cond
-- becomes:
-- T := False;
-- for X in range loop
-- if Cond then
-- T := True;
-- exit;
-- end if;
-- end loop;
-- In both cases, the iteration may be over a container in which case it is
-- given by an iterator specification, not a loop parameter specification.
procedure Expand_N_Quantified_Expression (N : Node_Id) is
Actions : constant List_Id := New_List;
For_All : constant Boolean := All_Present (N);
Iter_Spec : constant Node_Id := Iterator_Specification (N);
Loc : constant Source_Ptr := Sloc (N);
Loop_Spec : constant Node_Id := Loop_Parameter_Specification (N);
Cond : Node_Id;
Flag : Entity_Id;
Scheme : Node_Id;
Stmts : List_Id;
Var : Entity_Id;
begin
-- Ensure that the bound variable as well as the type of Name of the
-- Iter_Spec if present are properly frozen. We must do this before
-- expansion because the expression is about to be converted into a
-- loop, and resulting freeze nodes may end up in the wrong place in the
-- tree.
if Present (Iter_Spec) then
Var := Defining_Identifier (Iter_Spec);
else
Var := Defining_Identifier (Loop_Spec);
end if;
declare
P : Node_Id := Parent (N);
begin
while Nkind (P) in N_Subexpr loop
P := Parent (P);
end loop;
if Present (Iter_Spec) then
Freeze_Before (P, Etype (Name (Iter_Spec)));
end if;
Freeze_Before (P, Etype (Var));
end;
-- Create the declaration of the flag which tracks the status of the
-- quantified expression. Generate:
-- Flag : Boolean := (True | False);
Flag := Make_Temporary (Loc, 'T', N);
Append_To (Actions,
Make_Object_Declaration (Loc,
Defining_Identifier => Flag,
Object_Definition => New_Occurrence_Of (Standard_Boolean, Loc),
Expression =>
New_Occurrence_Of (Boolean_Literals (For_All), Loc)));
-- Construct the circuitry which tracks the status of the quantified
-- expression. Generate:
-- if [not] Cond then
-- Flag := (False | True);
-- exit;
-- end if;
Cond := Relocate_Node (Condition (N));
if For_All then
Cond := Make_Op_Not (Loc, Cond);
end if;
Stmts := New_List (
Make_Implicit_If_Statement (N,
Condition => Cond,
Then_Statements => New_List (
Make_Assignment_Statement (Loc,
Name => New_Occurrence_Of (Flag, Loc),
Expression =>
New_Occurrence_Of (Boolean_Literals (not For_All), Loc)),
Make_Exit_Statement (Loc))));
-- Build the loop equivalent of the quantified expression
if Present (Iter_Spec) then
Scheme :=
Make_Iteration_Scheme (Loc,
Iterator_Specification => Iter_Spec);
else
Scheme :=
Make_Iteration_Scheme (Loc,
Loop_Parameter_Specification => Loop_Spec);
end if;
Append_To (Actions,
Make_Loop_Statement (Loc,
Iteration_Scheme => Scheme,
Statements => Stmts,
End_Label => Empty));
-- Transform the quantified expression
Rewrite (N,
Make_Expression_With_Actions (Loc,
Expression => New_Occurrence_Of (Flag, Loc),
Actions => Actions));
Analyze_And_Resolve (N, Standard_Boolean);
end Expand_N_Quantified_Expression;
---------------------------------
-- Expand_N_Selected_Component --
---------------------------------
procedure Expand_N_Selected_Component (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Par : constant Node_Id := Parent (N);
P : constant Node_Id := Prefix (N);
S : constant Node_Id := Selector_Name (N);
Ptyp : constant Entity_Id := Underlying_Type (Etype (P));
Disc : Entity_Id;
New_N : Node_Id;
Dcon : Elmt_Id;
Dval : Node_Id;
function In_Left_Hand_Side (Comp : Node_Id) return Boolean;
-- Gigi needs a temporary for prefixes that depend on a discriminant,
-- unless the context of an assignment can provide size information.
-- Don't we have a general routine that does this???
function Is_Subtype_Declaration return Boolean;
-- The replacement of a discriminant reference by its value is required
-- if this is part of the initialization of an temporary generated by a
-- change of representation. This shows up as the construction of a
-- discriminant constraint for a subtype declared at the same point as
-- the entity in the prefix of the selected component. We recognize this
-- case when the context of the reference is:
-- subtype ST is T(Obj.D);
-- where the entity for Obj comes from source, and ST has the same sloc.
-----------------------
-- In_Left_Hand_Side --
-----------------------
function In_Left_Hand_Side (Comp : Node_Id) return Boolean is
begin
return (Nkind (Parent (Comp)) = N_Assignment_Statement
and then Comp = Name (Parent (Comp)))
or else (Present (Parent (Comp))
and then Nkind (Parent (Comp)) in N_Subexpr
and then In_Left_Hand_Side (Parent (Comp)));
end In_Left_Hand_Side;
-----------------------------
-- Is_Subtype_Declaration --
-----------------------------
function Is_Subtype_Declaration return Boolean is
Par : constant Node_Id := Parent (N);
begin
return
Nkind (Par) = N_Index_Or_Discriminant_Constraint
and then Nkind (Parent (Parent (Par))) = N_Subtype_Declaration
and then Comes_From_Source (Entity (Prefix (N)))
and then Sloc (Par) = Sloc (Entity (Prefix (N)));
end Is_Subtype_Declaration;
-- Start of processing for Expand_N_Selected_Component
begin
-- Deal with discriminant check required
if Do_Discriminant_Check (N) then
if Present (Discriminant_Checking_Func
(Original_Record_Component (Entity (S))))
then
-- Present the discriminant checking function to the backend, so
-- that it can inline the call to the function.
Add_Inlined_Body
(Discriminant_Checking_Func
(Original_Record_Component (Entity (S))),
N);
-- Now reset the flag and generate the call
Set_Do_Discriminant_Check (N, False);
Generate_Discriminant_Check (N);
-- In the case of Unchecked_Union, no discriminant checking is
-- actually performed.
else
Set_Do_Discriminant_Check (N, False);
end if;
end if;
-- Ada 2005 (AI-318-02): If the prefix is a call to a build-in-place
-- function, then additional actuals must be passed.
if Is_Build_In_Place_Function_Call (P) then
Make_Build_In_Place_Call_In_Anonymous_Context (P);
-- Ada 2005 (AI-318-02): Specialization of the previous case for prefix
-- containing build-in-place function calls whose returned object covers
-- interface types.
elsif Present (Unqual_BIP_Iface_Function_Call (P)) then
Make_Build_In_Place_Iface_Call_In_Anonymous_Context (P);
end if;
-- Gigi cannot handle unchecked conversions that are the prefix of a
-- selected component with discriminants. This must be checked during
-- expansion, because during analysis the type of the selector is not
-- known at the point the prefix is analyzed. If the conversion is the
-- target of an assignment, then we cannot force the evaluation.
if Nkind (Prefix (N)) = N_Unchecked_Type_Conversion
and then Has_Discriminants (Etype (N))
and then not In_Left_Hand_Side (N)
then
Force_Evaluation (Prefix (N));
end if;
-- Remaining processing applies only if selector is a discriminant
if Ekind (Entity (Selector_Name (N))) = E_Discriminant then
-- If the selector is a discriminant of a constrained record type,
-- we may be able to rewrite the expression with the actual value
-- of the discriminant, a useful optimization in some cases.
if Is_Record_Type (Ptyp)
and then Has_Discriminants (Ptyp)
and then Is_Constrained (Ptyp)
then
-- Do this optimization for discrete types only, and not for
-- access types (access discriminants get us into trouble).
if not Is_Discrete_Type (Etype (N)) then
null;
-- Don't do this on the left-hand side of an assignment statement.
-- Normally one would think that references like this would not
-- occur, but they do in generated code, and mean that we really
-- do want to assign the discriminant.
elsif Nkind (Par) = N_Assignment_Statement
and then Name (Par) = N
then
null;
-- Don't do this optimization for the prefix of an attribute or
-- the name of an object renaming declaration since these are
-- contexts where we do not want the value anyway.
elsif (Nkind (Par) = N_Attribute_Reference
and then Prefix (Par) = N)
or else Is_Renamed_Object (N)
then
null;
-- Don't do this optimization if we are within the code for a
-- discriminant check, since the whole point of such a check may
-- be to verify the condition on which the code below depends.
elsif Is_In_Discriminant_Check (N) then
null;
-- Green light to see if we can do the optimization. There is
-- still one condition that inhibits the optimization below but
-- now is the time to check the particular discriminant.
else
-- Loop through discriminants to find the matching discriminant
-- constraint to see if we can copy it.
Disc := First_Discriminant (Ptyp);
Dcon := First_Elmt (Discriminant_Constraint (Ptyp));
Discr_Loop : while Present (Dcon) loop
Dval := Node (Dcon);
-- Check if this is the matching discriminant and if the
-- discriminant value is simple enough to make sense to
-- copy. We don't want to copy complex expressions, and
-- indeed to do so can cause trouble (before we put in
-- this guard, a discriminant expression containing an
-- AND THEN was copied, causing problems for coverage
-- analysis tools).
-- However, if the reference is part of the initialization
-- code generated for an object declaration, we must use
-- the discriminant value from the subtype constraint,
-- because the selected component may be a reference to the
-- object being initialized, whose discriminant is not yet
-- set. This only happens in complex cases involving changes
-- of representation.
if Disc = Entity (Selector_Name (N))
and then (Is_Entity_Name (Dval)
or else Compile_Time_Known_Value (Dval)
or else Is_Subtype_Declaration)
then
-- Here we have the matching discriminant. Check for
-- the case of a discriminant of a component that is
-- constrained by an outer discriminant, which cannot
-- be optimized away.
if Denotes_Discriminant (Dval, Check_Concurrent => True)
then
exit Discr_Loop;
-- Do not retrieve value if constraint is not static. It
-- is generally not useful, and the constraint may be a
-- rewritten outer discriminant in which case it is in
-- fact incorrect.
elsif Is_Entity_Name (Dval)
and then
Nkind (Parent (Entity (Dval))) = N_Object_Declaration
and then Present (Expression (Parent (Entity (Dval))))
and then not
Is_OK_Static_Expression
(Expression (Parent (Entity (Dval))))
then
exit Discr_Loop;
-- In the context of a case statement, the expression may
-- have the base type of the discriminant, and we need to
-- preserve the constraint to avoid spurious errors on
-- missing cases.
elsif Nkind (Parent (N)) = N_Case_Statement
and then Etype (Dval) /= Etype (Disc)
then
Rewrite (N,
Make_Qualified_Expression (Loc,
Subtype_Mark =>
New_Occurrence_Of (Etype (Disc), Loc),
Expression =>
New_Copy_Tree (Dval)));
Analyze_And_Resolve (N, Etype (Disc));
-- In case that comes out as a static expression,
-- reset it (a selected component is never static).
Set_Is_Static_Expression (N, False);
return;
-- Otherwise we can just copy the constraint, but the
-- result is certainly not static. In some cases the
-- discriminant constraint has been analyzed in the
-- context of the original subtype indication, but for
-- itypes the constraint might not have been analyzed
-- yet, and this must be done now.
else
Rewrite (N, New_Copy_Tree (Dval));
Analyze_And_Resolve (N);
Set_Is_Static_Expression (N, False);
return;
end if;
end if;
Next_Elmt (Dcon);
Next_Discriminant (Disc);
end loop Discr_Loop;
-- Note: the above loop should always find a matching
-- discriminant, but if it does not, we just missed an
-- optimization due to some glitch (perhaps a previous
-- error), so ignore.
end if;
end if;
-- The only remaining processing is in the case of a discriminant of
-- a concurrent object, where we rewrite the prefix to denote the
-- corresponding record type. If the type is derived and has renamed
-- discriminants, use corresponding discriminant, which is the one
-- that appears in the corresponding record.
if not Is_Concurrent_Type (Ptyp) then
return;
end if;
Disc := Entity (Selector_Name (N));
if Is_Derived_Type (Ptyp)
and then Present (Corresponding_Discriminant (Disc))
then
Disc := Corresponding_Discriminant (Disc);
end if;
New_N :=
Make_Selected_Component (Loc,
Prefix =>
Unchecked_Convert_To (Corresponding_Record_Type (Ptyp),
New_Copy_Tree (P)),
Selector_Name => Make_Identifier (Loc, Chars (Disc)));
Rewrite (N, New_N);
Analyze (N);
end if;
-- Set Atomic_Sync_Required if necessary for atomic component
if Nkind (N) = N_Selected_Component then
declare
E : constant Entity_Id := Entity (Selector_Name (N));
Set : Boolean;
begin
-- If component is atomic, but type is not, setting depends on
-- disable/enable state for the component.
if Is_Atomic (E) and then not Is_Atomic (Etype (E)) then
Set := not Atomic_Synchronization_Disabled (E);
-- If component is not atomic, but its type is atomic, setting
-- depends on disable/enable state for the type.
elsif not Is_Atomic (E) and then Is_Atomic (Etype (E)) then
Set := not Atomic_Synchronization_Disabled (Etype (E));
-- If both component and type are atomic, we disable if either
-- component or its type have sync disabled.
elsif Is_Atomic (E) and then Is_Atomic (Etype (E)) then
Set := (not Atomic_Synchronization_Disabled (E))
and then
(not Atomic_Synchronization_Disabled (Etype (E)));
else
Set := False;
end if;
-- Set flag if required
if Set then
Activate_Atomic_Synchronization (N);
end if;
end;
end if;
end Expand_N_Selected_Component;
--------------------
-- Expand_N_Slice --
--------------------
procedure Expand_N_Slice (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Etype (N);
function Is_Procedure_Actual (N : Node_Id) return Boolean;
-- Check whether the argument is an actual for a procedure call, in
-- which case the expansion of a bit-packed slice is deferred until the
-- call itself is expanded. The reason this is required is that we might
-- have an IN OUT or OUT parameter, and the copy out is essential, and
-- that copy out would be missed if we created a temporary here in
-- Expand_N_Slice. Note that we don't bother to test specifically for an
-- IN OUT or OUT mode parameter, since it is a bit tricky to do, and it
-- is harmless to defer expansion in the IN case, since the call
-- processing will still generate the appropriate copy in operation,
-- which will take care of the slice.
procedure Make_Temporary_For_Slice;
-- Create a named variable for the value of the slice, in cases where
-- the back end cannot handle it properly, e.g. when packed types or
-- unaligned slices are involved.
-------------------------
-- Is_Procedure_Actual --
-------------------------
function Is_Procedure_Actual (N : Node_Id) return Boolean is
Par : Node_Id := Parent (N);
begin
loop
-- If our parent is a procedure call we can return
if Nkind (Par) = N_Procedure_Call_Statement then
return True;
-- If our parent is a type conversion, keep climbing the tree,
-- since a type conversion can be a procedure actual. Also keep
-- climbing if parameter association or a qualified expression,
-- since these are additional cases that do can appear on
-- procedure actuals.
elsif Nkind (Par) in N_Type_Conversion
| N_Parameter_Association
| N_Qualified_Expression
then
Par := Parent (Par);
-- Any other case is not what we are looking for
else
return False;
end if;
end loop;
end Is_Procedure_Actual;
------------------------------
-- Make_Temporary_For_Slice --
------------------------------
procedure Make_Temporary_For_Slice is
Ent : constant Entity_Id := Make_Temporary (Loc, 'T', N);
Decl : Node_Id;
begin
Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Ent,
Object_Definition => New_Occurrence_Of (Typ, Loc));
Set_No_Initialization (Decl);
Insert_Actions (N, New_List (
Decl,
Make_Assignment_Statement (Loc,
Name => New_Occurrence_Of (Ent, Loc),
Expression => Relocate_Node (N))));
Rewrite (N, New_Occurrence_Of (Ent, Loc));
Analyze_And_Resolve (N, Typ);
end Make_Temporary_For_Slice;
-- Local variables
Pref : constant Node_Id := Prefix (N);
-- Start of processing for Expand_N_Slice
begin
-- Ada 2005 (AI-318-02): If the prefix is a call to a build-in-place
-- function, then additional actuals must be passed.
if Is_Build_In_Place_Function_Call (Pref) then
Make_Build_In_Place_Call_In_Anonymous_Context (Pref);
-- Ada 2005 (AI-318-02): Specialization of the previous case for prefix
-- containing build-in-place function calls whose returned object covers
-- interface types.
elsif Present (Unqual_BIP_Iface_Function_Call (Pref)) then
Make_Build_In_Place_Iface_Call_In_Anonymous_Context (Pref);
end if;
-- The remaining case to be handled is packed slices. We can leave
-- packed slices as they are in the following situations:
-- 1. Right or left side of an assignment (we can handle this
-- situation correctly in the assignment statement expansion).
-- 2. Prefix of indexed component (the slide is optimized away in this
-- case, see the start of Expand_N_Indexed_Component.)
-- 3. Object renaming declaration, since we want the name of the
-- slice, not the value.
-- 4. Argument to procedure call, since copy-in/copy-out handling may
-- be required, and this is handled in the expansion of call
-- itself.
-- 5. Prefix of an address attribute (this is an error which is caught
-- elsewhere, and the expansion would interfere with generating the
-- error message) or of a size attribute (because 'Size may change
-- when applied to the temporary instead of the slice directly).
if not Is_Packed (Typ) then
-- Apply transformation for actuals of a function call, where
-- Expand_Actuals is not used.
if Nkind (Parent (N)) = N_Function_Call
and then Is_Possibly_Unaligned_Slice (N)
then
Make_Temporary_For_Slice;
end if;
elsif Nkind (Parent (N)) = N_Assignment_Statement
or else (Nkind (Parent (Parent (N))) = N_Assignment_Statement
and then Parent (N) = Name (Parent (Parent (N))))
then
return;
elsif Nkind (Parent (N)) = N_Indexed_Component
or else Is_Renamed_Object (N)
or else Is_Procedure_Actual (N)
then
return;
elsif Nkind (Parent (N)) = N_Attribute_Reference
and then (Attribute_Name (Parent (N)) = Name_Address
or else Attribute_Name (Parent (N)) = Name_Size)
then
return;
else
Make_Temporary_For_Slice;
end if;
end Expand_N_Slice;
------------------------------
-- Expand_N_Type_Conversion --
------------------------------
procedure Expand_N_Type_Conversion (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Operand : constant Node_Id := Expression (N);
Operand_Acc : Node_Id := Operand;
Target_Type : Entity_Id := Etype (N);
Operand_Type : Entity_Id := Etype (Operand);
procedure Discrete_Range_Check;
-- Handles generation of range check for discrete target value
procedure Handle_Changed_Representation;
-- This is called in the case of record and array type conversions to
-- see if there is a change of representation to be handled. Change of
-- representation is actually handled at the assignment statement level,
-- and what this procedure does is rewrite node N conversion as an
-- assignment to temporary. If there is no change of representation,
-- then the conversion node is unchanged.
procedure Raise_Accessibility_Error;
-- Called when we know that an accessibility check will fail. Rewrites
-- node N to an appropriate raise statement and outputs warning msgs.
-- The Etype of the raise node is set to Target_Type. Note that in this
-- case the rest of the processing should be skipped (i.e. the call to
-- this procedure will be followed by "goto Done").
procedure Real_Range_Check;
-- Handles generation of range check for real target value
function Has_Extra_Accessibility (Id : Entity_Id) return Boolean;
-- True iff Present (Effective_Extra_Accessibility (Id)) successfully
-- evaluates to True.
function Statically_Deeper_Relation_Applies (Targ_Typ : Entity_Id)
return Boolean;
-- Given a target type for a conversion, determine whether the
-- statically deeper accessibility rules apply to it.
--------------------------
-- Discrete_Range_Check --
--------------------------
-- Case of conversions to a discrete type. We let Generate_Range_Check
-- do the heavy lifting, after converting a fixed-point operand to an
-- appropriate integer type.
procedure Discrete_Range_Check is
Expr : Node_Id;
Ityp : Entity_Id;
procedure Generate_Temporary;
-- Generate a temporary to facilitate in the C backend the code
-- generation of the unchecked conversion since the size of the
-- source type may differ from the size of the target type.
------------------------
-- Generate_Temporary --
------------------------
procedure Generate_Temporary is
begin
if Esize (Etype (Expr)) < Esize (Etype (Ityp)) then
declare
Exp_Type : constant Entity_Id := Ityp;
Def_Id : constant Entity_Id :=
Make_Temporary (Loc, 'R', Expr);
E : Node_Id;
Res : Node_Id;
begin
Set_Is_Internal (Def_Id);
Set_Etype (Def_Id, Exp_Type);
Res := New_Occurrence_Of (Def_Id, Loc);
E :=
Make_Object_Declaration (Loc,
Defining_Identifier => Def_Id,
Object_Definition => New_Occurrence_Of
(Exp_Type, Loc),
Constant_Present => True,
Expression => Relocate_Node (Expr));
Set_Assignment_OK (E);
Insert_Action (Expr, E);
Set_Assignment_OK (Res, Assignment_OK (Expr));
Rewrite (Expr, Res);
Analyze_And_Resolve (Expr, Exp_Type);
end;
end if;
end Generate_Temporary;
-- Start of processing for Discrete_Range_Check
begin
-- Nothing more to do if conversion was rewritten
if Nkind (N) /= N_Type_Conversion then
return;
end if;
Expr := Expression (N);
-- Clear the Do_Range_Check flag on Expr
Set_Do_Range_Check (Expr, False);
-- Nothing to do if range checks suppressed
if Range_Checks_Suppressed (Target_Type) then
return;
end if;
-- Nothing to do if expression is an entity on which checks have been
-- suppressed.
if Is_Entity_Name (Expr)
and then Range_Checks_Suppressed (Entity (Expr))
then
return;
end if;
-- Before we do a range check, we have to deal with treating
-- a fixed-point operand as an integer. The way we do this
-- is simply to do an unchecked conversion to an appropriate
-- integer type with the smallest size, so that we can suppress
-- trivial checks.
if Is_Fixed_Point_Type (Etype (Expr)) then
Ityp := Small_Integer_Type_For
(Esize (Base_Type (Etype (Expr))), False);
-- Generate a temporary with the integer type to facilitate in the
-- C backend the code generation for the unchecked conversion.
if Modify_Tree_For_C then
Generate_Temporary;
end if;
Rewrite (Expr, Unchecked_Convert_To (Ityp, Expr));
end if;
-- Reset overflow flag, since the range check will include
-- dealing with possible overflow, and generate the check.
Set_Do_Overflow_Check (N, False);
Generate_Range_Check (Expr, Target_Type, CE_Range_Check_Failed);
end Discrete_Range_Check;
-----------------------------------
-- Handle_Changed_Representation --
-----------------------------------
procedure Handle_Changed_Representation is
Temp : Entity_Id;
Decl : Node_Id;
Odef : Node_Id;
N_Ix : Node_Id;
Cons : List_Id;
begin
-- Nothing else to do if no change of representation
if Has_Compatible_Representation (Target_Type, Operand_Type) then
return;
-- The real change of representation work is done by the assignment
-- statement processing. So if this type conversion is appearing as
-- the expression of an assignment statement, nothing needs to be
-- done to the conversion.
elsif Nkind (Parent (N)) = N_Assignment_Statement then
return;
-- Otherwise we need to generate a temporary variable, and do the
-- change of representation assignment into that temporary variable.
-- The conversion is then replaced by a reference to this variable.
else
Cons := No_List;
-- If type is unconstrained we have to add a constraint, copied
-- from the actual value of the left-hand side.
if not Is_Constrained (Target_Type) then
if Has_Discriminants (Operand_Type) then
-- A change of representation can only apply to untagged
-- types. We need to build the constraint that applies to
-- the target type, using the constraints of the operand.
-- The analysis is complicated if there are both inherited
-- discriminants and constrained discriminants.
-- We iterate over the discriminants of the target, and
-- find the discriminant of the same name:
-- a) If there is a corresponding discriminant in the object
-- then the value is a selected component of the operand.
-- b) Otherwise the value of a constrained discriminant is
-- found in the stored constraint of the operand.
declare
Stored : constant Elist_Id :=
Stored_Constraint (Operand_Type);
Elmt : Elmt_Id;
Disc_O : Entity_Id;
-- Discriminant of the operand type. Its value in the
-- object is captured in a selected component.
Disc_S : Entity_Id;
-- Stored discriminant of the operand. If present, it
-- corresponds to a constrained discriminant of the
-- parent type.
Disc_T : Entity_Id;
-- Discriminant of the target type
begin
Disc_T := First_Discriminant (Target_Type);
Disc_O := First_Discriminant (Operand_Type);
Disc_S := First_Stored_Discriminant (Operand_Type);
if Present (Stored) then
Elmt := First_Elmt (Stored);
else
Elmt := No_Elmt; -- init to avoid warning
end if;
Cons := New_List;
while Present (Disc_T) loop
if Present (Disc_O)
and then Chars (Disc_T) = Chars (Disc_O)
then
Append_To (Cons,
Make_Selected_Component (Loc,
Prefix =>
Duplicate_Subexpr_Move_Checks (Operand),
Selector_Name =>
Make_Identifier (Loc, Chars (Disc_O))));
Next_Discriminant (Disc_O);
elsif Present (Disc_S) then
Append_To (Cons, New_Copy_Tree (Node (Elmt)));
Next_Elmt (Elmt);
end if;
Next_Discriminant (Disc_T);
end loop;
end;
elsif Is_Array_Type (Operand_Type) then
N_Ix := First_Index (Target_Type);
Cons := New_List;
for J in 1 .. Number_Dimensions (Operand_Type) loop
-- We convert the bounds explicitly. We use an unchecked
-- conversion because bounds checks are done elsewhere.
Append_To (Cons,
Make_Range (Loc,
Low_Bound =>
Unchecked_Convert_To (Etype (N_Ix),
Make_Attribute_Reference (Loc,
Prefix =>
Duplicate_Subexpr_No_Checks
(Operand, Name_Req => True),
Attribute_Name => Name_First,
Expressions => New_List (
Make_Integer_Literal (Loc, J)))),
High_Bound =>
Unchecked_Convert_To (Etype (N_Ix),
Make_Attribute_Reference (Loc,
Prefix =>
Duplicate_Subexpr_No_Checks
(Operand, Name_Req => True),
Attribute_Name => Name_Last,
Expressions => New_List (
Make_Integer_Literal (Loc, J))))));
Next_Index (N_Ix);
end loop;
end if;
end if;
Odef := New_Occurrence_Of (Target_Type, Loc);
if Present (Cons) then
Odef :=
Make_Subtype_Indication (Loc,
Subtype_Mark => Odef,
Constraint =>
Make_Index_Or_Discriminant_Constraint (Loc,
Constraints => Cons));
end if;
Temp := Make_Temporary (Loc, 'C');
Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Temp,
Object_Definition => Odef);
Set_No_Initialization (Decl, True);
-- Insert required actions. It is essential to suppress checks
-- since we have suppressed default initialization, which means
-- that the variable we create may have no discriminants.
Insert_Actions (N,
New_List (
Decl,
Make_Assignment_Statement (Loc,
Name => New_Occurrence_Of (Temp, Loc),
Expression => Relocate_Node (N))),
Suppress => All_Checks);
Rewrite (N, New_Occurrence_Of (Temp, Loc));
return;
end if;
end Handle_Changed_Representation;
-------------------------------
-- Raise_Accessibility_Error --
-------------------------------
procedure Raise_Accessibility_Error is
begin
Error_Msg_Warn := SPARK_Mode /= On;
Rewrite (N,
Make_Raise_Program_Error (Sloc (N),
Reason => PE_Accessibility_Check_Failed));
Set_Etype (N, Target_Type);
Error_Msg_N ("accessibility check failure<<", N);
Error_Msg_N ("\Program_Error [<<", N);
end Raise_Accessibility_Error;
----------------------
-- Real_Range_Check --
----------------------
-- Case of conversions to floating-point or fixed-point. If range checks
-- are enabled and the target type has a range constraint, we convert:
-- typ (x)
-- to
-- Tnn : typ'Base := typ'Base (x);
-- [constraint_error when Tnn < typ'First or else Tnn > typ'Last]
-- typ (Tnn)
-- This is necessary when there is a conversion of integer to float or
-- to fixed-point to ensure that the correct checks are made. It is not
-- necessary for the float-to-float case where it is enough to just set
-- the Do_Range_Check flag on the expression.
procedure Real_Range_Check is
Btyp : constant Entity_Id := Base_Type (Target_Type);
Lo : constant Node_Id := Type_Low_Bound (Target_Type);
Hi : constant Node_Id := Type_High_Bound (Target_Type);
Conv : Node_Id;
Hi_Arg : Node_Id;
Hi_Val : Node_Id;
Lo_Arg : Node_Id;
Lo_Val : Node_Id;
Expr : Entity_Id;
Tnn : Entity_Id;
begin
-- Nothing more to do if conversion was rewritten
if Nkind (N) /= N_Type_Conversion then
return;
end if;
Expr := Expression (N);
-- Clear the Do_Range_Check flag on Expr
Set_Do_Range_Check (Expr, False);
-- Nothing to do if range checks suppressed, or target has the same
-- range as the base type (or is the base type).
if Range_Checks_Suppressed (Target_Type)
or else (Lo = Type_Low_Bound (Btyp)
and then
Hi = Type_High_Bound (Btyp))
then
return;
end if;
-- Nothing to do if expression is an entity on which checks have been
-- suppressed.
if Is_Entity_Name (Expr)
and then Range_Checks_Suppressed (Entity (Expr))
then
return;
end if;
-- Nothing to do if expression was rewritten into a float-to-float
-- conversion, since this kind of conversion is handled elsewhere.
if Is_Floating_Point_Type (Etype (Expr))
and then Is_Floating_Point_Type (Target_Type)
then
return;
end if;
-- Nothing to do if bounds are all static and we can tell that the
-- expression is within the bounds of the target. Note that if the
-- operand is of an unconstrained floating-point type, then we do
-- not trust it to be in range (might be infinite)
declare
S_Lo : constant Node_Id := Type_Low_Bound (Etype (Expr));
S_Hi : constant Node_Id := Type_High_Bound (Etype (Expr));
begin
if (not Is_Floating_Point_Type (Etype (Expr))
or else Is_Constrained (Etype (Expr)))
and then Compile_Time_Known_Value (S_Lo)
and then Compile_Time_Known_Value (S_Hi)
and then Compile_Time_Known_Value (Hi)
and then Compile_Time_Known_Value (Lo)
then
declare
D_Lov : constant Ureal := Expr_Value_R (Lo);
D_Hiv : constant Ureal := Expr_Value_R (Hi);
S_Lov : Ureal;
S_Hiv : Ureal;
begin
if Is_Real_Type (Etype (Expr)) then
S_Lov := Expr_Value_R (S_Lo);
S_Hiv := Expr_Value_R (S_Hi);
else
S_Lov := UR_From_Uint (Expr_Value (S_Lo));
S_Hiv := UR_From_Uint (Expr_Value (S_Hi));
end if;
if D_Hiv > D_Lov
and then S_Lov >= D_Lov
and then S_Hiv <= D_Hiv
then
return;
end if;
end;
end if;
end;
-- Otherwise rewrite the conversion as described above
Conv := Convert_To (Btyp, Expr);
-- If a conversion is necessary, then copy the specific flags from
-- the original one and also move the Do_Overflow_Check flag since
-- this new conversion is to the base type.
if Nkind (Conv) = N_Type_Conversion then
Set_Conversion_OK (Conv, Conversion_OK (N));
Set_Float_Truncate (Conv, Float_Truncate (N));
Set_Rounded_Result (Conv, Rounded_Result (N));
if Do_Overflow_Check (N) then
Set_Do_Overflow_Check (Conv);
Set_Do_Overflow_Check (N, False);
end if;
end if;
Tnn := Make_Temporary (Loc, 'T', Conv);
-- For a conversion from Float to Fixed where the bounds of the
-- fixed-point type are static, we can obtain a more accurate
-- fixed-point value by converting the result of the floating-
-- point expression to an appropriate integer type, and then
-- performing an unchecked conversion to the target fixed-point
-- type. The range check can then use the corresponding integer
-- value of the bounds instead of requiring further conversions.
-- This preserves the identity:
-- Fix_Val = Fixed_Type (Float_Type (Fix_Val))
-- which used to fail when Fix_Val was a bound of the type and
-- the 'Small was not a representable number.
-- This transformation requires an integer type large enough to
-- accommodate a fixed-point value.
if Is_Ordinary_Fixed_Point_Type (Target_Type)
and then Is_Floating_Point_Type (Etype (Expr))
and then RM_Size (Btyp) <= System_Max_Integer_Size
and then Nkind (Lo) = N_Real_Literal
and then Nkind (Hi) = N_Real_Literal
then
declare
Expr_Id : constant Entity_Id := Make_Temporary (Loc, 'T', Conv);
Int_Typ : constant Entity_Id :=
Small_Integer_Type_For (RM_Size (Btyp), False);
begin
-- Generate a temporary with the integer value. Required in the
-- CCG compiler to ensure that run-time checks reference this
-- integer expression (instead of the resulting fixed-point
-- value because fixed-point values are handled by means of
-- unsigned integer types).
Insert_Action (N,
Make_Object_Declaration (Loc,
Defining_Identifier => Expr_Id,
Object_Definition => New_Occurrence_Of (Int_Typ, Loc),
Constant_Present => True,
Expression =>
Convert_To (Int_Typ, Expression (Conv))));
-- Create integer objects for range checking of result.
Lo_Arg :=
Unchecked_Convert_To
(Int_Typ, New_Occurrence_Of (Expr_Id, Loc));
Lo_Val :=
Make_Integer_Literal (Loc, Corresponding_Integer_Value (Lo));
Hi_Arg :=
Unchecked_Convert_To
(Int_Typ, New_Occurrence_Of (Expr_Id, Loc));
Hi_Val :=
Make_Integer_Literal (Loc, Corresponding_Integer_Value (Hi));
-- Rewrite conversion as an integer conversion of the
-- original floating-point expression, followed by an
-- unchecked conversion to the target fixed-point type.
Conv :=
Unchecked_Convert_To
(Target_Type, New_Occurrence_Of (Expr_Id, Loc));
end;
-- All other conversions
else
Lo_Arg := New_Occurrence_Of (Tnn, Loc);
Lo_Val :=
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Target_Type, Loc),
Attribute_Name => Name_First);
Hi_Arg := New_Occurrence_Of (Tnn, Loc);
Hi_Val :=
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Target_Type, Loc),
Attribute_Name => Name_Last);
end if;
-- Build code for range checking. Note that checks are suppressed
-- here since we don't want a recursive range check popping up.
Insert_Actions (N, New_List (
Make_Object_Declaration (Loc,
Defining_Identifier => Tnn,
Object_Definition => New_Occurrence_Of (Btyp, Loc),
Constant_Present => True,
Expression => Conv),
Make_Raise_Constraint_Error (Loc,
Condition =>
Make_Or_Else (Loc,
Left_Opnd =>
Make_Op_Lt (Loc,
Left_Opnd => Lo_Arg,
Right_Opnd => Lo_Val),
Right_Opnd =>
Make_Op_Gt (Loc,
Left_Opnd => Hi_Arg,
Right_Opnd => Hi_Val)),
Reason => CE_Range_Check_Failed)),
Suppress => All_Checks);
Rewrite (Expr, New_Occurrence_Of (Tnn, Loc));
end Real_Range_Check;
-----------------------------
-- Has_Extra_Accessibility --
-----------------------------
-- Returns true for a formal of an anonymous access type or for an Ada
-- 2012-style stand-alone object of an anonymous access type.
function Has_Extra_Accessibility (Id : Entity_Id) return Boolean is
begin
if Is_Formal (Id) or else Ekind (Id) in E_Constant | E_Variable then
return Present (Effective_Extra_Accessibility (Id));
else
return False;
end if;
end Has_Extra_Accessibility;
----------------------------------------
-- Statically_Deeper_Relation_Applies --
----------------------------------------
function Statically_Deeper_Relation_Applies (Targ_Typ : Entity_Id)
return Boolean
is
begin
-- The case where the target type is an anonymous access type is
-- ignored since they have different semantics and get covered by
-- various runtime checks depending on context.
-- Note, the current implementation of this predicate is incomplete
-- and doesn't fully reflect the rules given in RM 3.10.2 (19) and
-- (19.1) ???
return Ekind (Targ_Typ) /= E_Anonymous_Access_Type;
end Statically_Deeper_Relation_Applies;
-- Start of processing for Expand_N_Type_Conversion
begin
-- First remove check marks put by the semantic analysis on the type
-- conversion between array types. We need these checks, and they will
-- be generated by this expansion routine, but we do not depend on these
-- flags being set, and since we do intend to expand the checks in the
-- front end, we don't want them on the tree passed to the back end.
if Is_Array_Type (Target_Type) then
if Is_Constrained (Target_Type) then
Set_Do_Length_Check (N, False);
else
Set_Do_Range_Check (Operand, False);
end if;
end if;
-- Nothing at all to do if conversion is to the identical type so remove
-- the conversion completely, it is useless, except that it may carry
-- an Assignment_OK attribute, which must be propagated to the operand
-- and the Do_Range_Check flag on the operand must be cleared, if any.
if Operand_Type = Target_Type then
if Assignment_OK (N) then
Set_Assignment_OK (Operand);
end if;
Set_Do_Range_Check (Operand, False);
Rewrite (N, Relocate_Node (Operand));
goto Done;
end if;
-- Nothing to do if this is the second argument of read. This is a
-- "backwards" conversion that will be handled by the specialized code
-- in attribute processing.
if Nkind (Parent (N)) = N_Attribute_Reference
and then Attribute_Name (Parent (N)) = Name_Read
and then Next (First (Expressions (Parent (N)))) = N
then
goto Done;
end if;
-- Check for case of converting to a type that has an invariant
-- associated with it. This requires an invariant check. We insert
-- a call:
-- invariant_check (typ (expr))
-- in the code, after removing side effects from the expression.
-- This is clearer than replacing the conversion into an expression
-- with actions, because the context may impose additional actions
-- (tag checks, membership tests, etc.) that conflict with this
-- rewriting (used previously).
-- Note: the Comes_From_Source check, and then the resetting of this
-- flag prevents what would otherwise be an infinite recursion.
if Has_Invariants (Target_Type)
and then Present (Invariant_Procedure (Target_Type))
and then Comes_From_Source (N)
then
Set_Comes_From_Source (N, False);
Remove_Side_Effects (N);
Insert_Action (N, Make_Invariant_Call (Duplicate_Subexpr (N)));
goto Done;
-- AI12-0042: For a view conversion to a class-wide type occurring
-- within the immediate scope of T, from a specific type that is
-- a descendant of T (including T itself), an invariant check is
-- performed on the part of the object that is of type T. (We don't
-- need to explicitly check for the operand type being a descendant,
-- just that it's a specific type, because the conversion would be
-- illegal if it's specific and not a descendant -- downward conversion
-- is not allowed).
elsif Is_Class_Wide_Type (Target_Type)
and then not Is_Class_Wide_Type (Etype (Expression (N)))
and then Present (Invariant_Procedure (Root_Type (Target_Type)))
and then Comes_From_Source (N)
and then Within_Scope (Find_Enclosing_Scope (N), Scope (Target_Type))
then
Remove_Side_Effects (N);
-- Perform the invariant check on a conversion to the class-wide
-- type's root type.
declare
Root_Conv : constant Node_Id :=
Make_Type_Conversion (Loc,
Subtype_Mark =>
New_Occurrence_Of (Root_Type (Target_Type), Loc),
Expression => Duplicate_Subexpr (Expression (N)));
begin
Set_Etype (Root_Conv, Root_Type (Target_Type));
Insert_Action (N, Make_Invariant_Call (Root_Conv));
goto Done;
end;
end if;
-- Here if we may need to expand conversion
-- If the operand of the type conversion is an arithmetic operation on
-- signed integers, and the based type of the signed integer type in
-- question is smaller than Standard.Integer, we promote both of the
-- operands to type Integer.
-- For example, if we have
-- target-type (opnd1 + opnd2)
-- and opnd1 and opnd2 are of type short integer, then we rewrite
-- this as:
-- target-type (integer(opnd1) + integer(opnd2))
-- We do this because we are always allowed to compute in a larger type
-- if we do the right thing with the result, and in this case we are
-- going to do a conversion which will do an appropriate check to make
-- sure that things are in range of the target type in any case. This
-- avoids some unnecessary intermediate overflows.
-- We might consider a similar transformation in the case where the
-- target is a real type or a 64-bit integer type, and the operand
-- is an arithmetic operation using a 32-bit integer type. However,
-- we do not bother with this case, because it could cause significant
-- inefficiencies on 32-bit machines. On a 64-bit machine it would be
-- much cheaper, but we don't want different behavior on 32-bit and
-- 64-bit machines. Note that the exclusion of the 64-bit case also
-- handles the configurable run-time cases where 64-bit arithmetic
-- may simply be unavailable.
-- Note: this circuit is partially redundant with respect to the circuit
-- in Checks.Apply_Arithmetic_Overflow_Check, but we catch more cases in
-- the processing here. Also we still need the Checks circuit, since we
-- have to be sure not to generate junk overflow checks in the first
-- place, since it would be tricky to remove them here.
if Integer_Promotion_Possible (N) then
-- All conditions met, go ahead with transformation
declare
Opnd : Node_Id;
L, R : Node_Id;
begin
Opnd := New_Op_Node (Nkind (Operand), Loc);
R := Convert_To (Standard_Integer, Right_Opnd (Operand));
Set_Right_Opnd (Opnd, R);
if Nkind (Operand) in N_Binary_Op then
L := Convert_To (Standard_Integer, Left_Opnd (Operand));
Set_Left_Opnd (Opnd, L);
end if;
Rewrite (N,
Make_Type_Conversion (Loc,
Subtype_Mark => Relocate_Node (Subtype_Mark (N)),
Expression => Opnd));
Analyze_And_Resolve (N, Target_Type);
goto Done;
end;
end if;
-- If the conversion is from Universal_Integer and requires an overflow
-- check, try to do an intermediate conversion to a narrower type first
-- without overflow check, in order to avoid doing the overflow check
-- in Universal_Integer, which can be a very large type.
if Operand_Type = Universal_Integer and then Do_Overflow_Check (N) then
declare
Lo, Hi, Siz : Uint;
OK : Boolean;
Typ : Entity_Id;
begin
Determine_Range (Operand, OK, Lo, Hi, Assume_Valid => True);
if OK then
Siz := Get_Size_For_Range (Lo, Hi);
-- We use the base type instead of the first subtype because
-- overflow checks are done in the base type, so this avoids
-- the need for useless conversions.
if Siz < System_Max_Integer_Size then
Typ := Etype (Integer_Type_For (Siz, Uns => False));
Convert_To_And_Rewrite (Typ, Operand);
Analyze_And_Resolve
(Operand, Typ, Suppress => Overflow_Check);
Analyze_And_Resolve (N, Target_Type);
goto Done;
end if;
end if;
end;
end if;
-- Do validity check if validity checking operands
if Validity_Checks_On and Validity_Check_Operands then
Ensure_Valid (Operand);
end if;
-- Special case of converting from non-standard boolean type
if Is_Boolean_Type (Operand_Type)
and then (Nonzero_Is_True (Operand_Type))
then
Adjust_Condition (Operand);
Set_Etype (Operand, Standard_Boolean);
Operand_Type := Standard_Boolean;
end if;
-- Case of converting to an access type
if Is_Access_Type (Target_Type) then
-- In terms of accessibility rules, an anonymous access discriminant
-- is not considered separate from its parent object.
if Nkind (Operand) = N_Selected_Component
and then Ekind (Entity (Selector_Name (Operand))) = E_Discriminant
and then Ekind (Operand_Type) = E_Anonymous_Access_Type
then
Operand_Acc := Original_Node (Prefix (Operand));
end if;
-- If this type conversion was internally generated by the front end
-- to displace the pointer to the object to reference an interface
-- type and the original node was an Unrestricted_Access attribute,
-- then skip applying accessibility checks (because, according to the
-- GNAT Reference Manual, this attribute is similar to 'Access except
-- that all accessibility and aliased view checks are omitted).
if not Comes_From_Source (N)
and then Is_Interface (Designated_Type (Target_Type))
and then Nkind (Original_Node (N)) = N_Attribute_Reference
and then Attribute_Name (Original_Node (N)) =
Name_Unrestricted_Access
then
null;
-- Apply an accessibility check when the conversion operand is an
-- access parameter (or a renaming thereof), unless conversion was
-- expanded from an Unchecked_ or Unrestricted_Access attribute,
-- or for the actual of a class-wide interface parameter. Note that
-- other checks may still need to be applied below (such as tagged
-- type checks).
elsif Is_Entity_Name (Operand_Acc)
and then Has_Extra_Accessibility (Entity (Operand_Acc))
and then Ekind (Etype (Operand_Acc)) = E_Anonymous_Access_Type
and then (Nkind (Original_Node (N)) /= N_Attribute_Reference
or else Attribute_Name (Original_Node (N)) = Name_Access)
and then not No_Dynamic_Accessibility_Checks_Enabled (N)
then
if not Comes_From_Source (N)
and then Nkind (Parent (N)) in N_Function_Call
| N_Parameter_Association
| N_Procedure_Call_Statement
and then Is_Interface (Designated_Type (Target_Type))
and then Is_Class_Wide_Type (Designated_Type (Target_Type))
then
null;
else
Apply_Accessibility_Check
(Operand, Target_Type, Insert_Node => Operand);
end if;
-- If the level of the operand type is statically deeper than the
-- level of the target type, then force Program_Error. Note that this
-- can only occur for cases where the attribute is within the body of
-- an instantiation, otherwise the conversion will already have been
-- rejected as illegal.
-- Note: warnings are issued by the analyzer for the instance cases,
-- and, since we are late in expansion, a check is performed to
-- verify that neither the target type nor the operand type are
-- internally generated - as this can lead to spurious errors when,
-- for example, the operand type is a result of BIP expansion.
elsif In_Instance_Body
and then Statically_Deeper_Relation_Applies (Target_Type)
and then not Is_Internal (Target_Type)
and then not Is_Internal (Operand_Type)
and then
Type_Access_Level (Operand_Type) > Type_Access_Level (Target_Type)
then
Raise_Accessibility_Error;
goto Done;
-- When the operand is a selected access discriminant the check needs
-- to be made against the level of the object denoted by the prefix
-- of the selected name. Force Program_Error for this case as well
-- (this accessibility violation can only happen if within the body
-- of an instantiation).
elsif In_Instance_Body
and then Ekind (Operand_Type) = E_Anonymous_Access_Type
and then Nkind (Operand) = N_Selected_Component
and then Ekind (Entity (Selector_Name (Operand))) = E_Discriminant
and then Static_Accessibility_Level (Operand, Zero_On_Dynamic_Level)
> Type_Access_Level (Target_Type)
then
Raise_Accessibility_Error;
goto Done;
end if;
end if;
-- Case of conversions of tagged types and access to tagged types
-- When needed, that is to say when the expression is class-wide, Add
-- runtime a tag check for (strict) downward conversion by using the
-- membership test, generating:
-- [constraint_error when Operand not in Target_Type'Class]
-- or in the access type case
-- [constraint_error
-- when Operand /= null
-- and then Operand.all not in
-- Designated_Type (Target_Type)'Class]
if (Is_Access_Type (Target_Type)
and then Is_Tagged_Type (Designated_Type (Target_Type)))
or else Is_Tagged_Type (Target_Type)
then
-- Do not do any expansion in the access type case if the parent is a
-- renaming, since this is an error situation which will be caught by
-- Sem_Ch8, and the expansion can interfere with this error check.
if Is_Access_Type (Target_Type) and then Is_Renamed_Object (N) then
goto Done;
end if;
-- Otherwise, proceed with processing tagged conversion
Tagged_Conversion : declare
Actual_Op_Typ : Entity_Id;
Actual_Targ_Typ : Entity_Id;
Root_Op_Typ : Entity_Id;
procedure Make_Tag_Check (Targ_Typ : Entity_Id);
-- Create a membership check to test whether Operand is a member
-- of Targ_Typ. If the original Target_Type is an access, include
-- a test for null value. The check is inserted at N.
--------------------
-- Make_Tag_Check --
--------------------
procedure Make_Tag_Check (Targ_Typ : Entity_Id) is
Cond : Node_Id;
begin
-- Generate:
-- [Constraint_Error
-- when Operand /= null
-- and then Operand.all not in Targ_Typ]
if Is_Access_Type (Target_Type) then
Cond :=
Make_And_Then (Loc,
Left_Opnd =>
Make_Op_Ne (Loc,
Left_Opnd => Duplicate_Subexpr_No_Checks (Operand),
Right_Opnd => Make_Null (Loc)),
Right_Opnd =>
Make_Not_In (Loc,
Left_Opnd =>
Make_Explicit_Dereference (Loc,
Prefix => Duplicate_Subexpr_No_Checks (Operand)),
Right_Opnd => New_Occurrence_Of (Targ_Typ, Loc)));
-- Generate:
-- [Constraint_Error when Operand not in Targ_Typ]
else
Cond :=
Make_Not_In (Loc,
Left_Opnd => Duplicate_Subexpr_No_Checks (Operand),
Right_Opnd => New_Occurrence_Of (Targ_Typ, Loc));
end if;
Insert_Action (N,
Make_Raise_Constraint_Error (Loc,
Condition => Cond,
Reason => CE_Tag_Check_Failed),
Suppress => All_Checks);
end Make_Tag_Check;
-- Start of processing for Tagged_Conversion
begin
-- Handle entities from the limited view
if Is_Access_Type (Operand_Type) then
Actual_Op_Typ :=
Available_View (Designated_Type (Operand_Type));
else
Actual_Op_Typ := Operand_Type;
end if;
if Is_Access_Type (Target_Type) then
Actual_Targ_Typ :=
Available_View (Designated_Type (Target_Type));
else
Actual_Targ_Typ := Target_Type;
end if;
Root_Op_Typ := Root_Type (Actual_Op_Typ);
-- Ada 2005 (AI-251): Handle interface type conversion
if Is_Interface (Actual_Op_Typ)
or else
Is_Interface (Actual_Targ_Typ)
then
Expand_Interface_Conversion (N);
goto Done;
end if;
-- Create a runtime tag check for a downward CW type conversion
if Is_Class_Wide_Type (Actual_Op_Typ)
and then Actual_Op_Typ /= Actual_Targ_Typ
and then Root_Op_Typ /= Actual_Targ_Typ
and then Is_Ancestor
(Root_Op_Typ, Actual_Targ_Typ, Use_Full_View => True)
and then not Tag_Checks_Suppressed (Actual_Targ_Typ)
then
declare
Conv : Node_Id;
begin
Make_Tag_Check (Class_Wide_Type (Actual_Targ_Typ));
Conv := Unchecked_Convert_To (Target_Type, Expression (N));
Rewrite (N, Conv);
Analyze_And_Resolve (N, Target_Type);
end;
end if;
end Tagged_Conversion;
-- Case of other access type conversions
elsif Is_Access_Type (Target_Type) then
Apply_Constraint_Check (Operand, Target_Type);
-- Case of conversions from a fixed-point type
-- These conversions require special expansion and processing, found in
-- the Exp_Fixd package. We ignore cases where Conversion_OK is set,
-- since from a semantic point of view, these are simple integer
-- conversions, which do not need further processing except for the
-- generation of range checks, which is performed at the end of this
-- procedure.
elsif Is_Fixed_Point_Type (Operand_Type)
and then not Conversion_OK (N)
then
-- We should never see universal fixed at this case, since the
-- expansion of the constituent divide or multiply should have
-- eliminated the explicit mention of universal fixed.
pragma Assert (Operand_Type /= Universal_Fixed);
-- Check for special case of the conversion to universal real that
-- occurs as a result of the use of a round attribute. In this case,
-- the real type for the conversion is taken from the target type of
-- the Round attribute and the result must be marked as rounded.
if Target_Type = Universal_Real
and then Nkind (Parent (N)) = N_Attribute_Reference
and then Attribute_Name (Parent (N)) = Name_Round
then
Set_Etype (N, Etype (Parent (N)));
Target_Type := Etype (N);
Set_Rounded_Result (N);
end if;
if Is_Fixed_Point_Type (Target_Type) then
Expand_Convert_Fixed_To_Fixed (N);
elsif Is_Integer_Type (Target_Type) then
Expand_Convert_Fixed_To_Integer (N);
else
pragma Assert (Is_Floating_Point_Type (Target_Type));
Expand_Convert_Fixed_To_Float (N);
end if;
-- Case of conversions to a fixed-point type
-- These conversions require special expansion and processing, found in
-- the Exp_Fixd package. Again, ignore cases where Conversion_OK is set,
-- since from a semantic point of view, these are simple integer
-- conversions, which do not need further processing.
elsif Is_Fixed_Point_Type (Target_Type)
and then not Conversion_OK (N)
then
if Is_Integer_Type (Operand_Type) then
Expand_Convert_Integer_To_Fixed (N);
else
pragma Assert (Is_Floating_Point_Type (Operand_Type));
Expand_Convert_Float_To_Fixed (N);
end if;
-- Case of array conversions
-- Expansion of array conversions, add required length/range checks but
-- only do this if there is no change of representation. For handling of
-- this case, see Handle_Changed_Representation.
elsif Is_Array_Type (Target_Type) then
if Is_Constrained (Target_Type) then
Apply_Length_Check (Operand, Target_Type);
else
-- If the object has an unconstrained array subtype with fixed
-- lower bound, then sliding to that bound may be needed.
if Is_Fixed_Lower_Bound_Array_Subtype (Target_Type) then
Expand_Sliding_Conversion (Operand, Target_Type);
end if;
Apply_Range_Check (Operand, Target_Type);
end if;
Handle_Changed_Representation;
-- Case of conversions of discriminated types
-- Add required discriminant checks if target is constrained. Again this
-- change is skipped if we have a change of representation.
elsif Has_Discriminants (Target_Type)
and then Is_Constrained (Target_Type)
then
Apply_Discriminant_Check (Operand, Target_Type);
Handle_Changed_Representation;
-- Case of all other record conversions. The only processing required
-- is to check for a change of representation requiring the special
-- assignment processing.
elsif Is_Record_Type (Target_Type) then
-- Ada 2005 (AI-216): Program_Error is raised when converting from
-- a derived Unchecked_Union type to an unconstrained type that is
-- not Unchecked_Union if the operand lacks inferable discriminants.
if Is_Derived_Type (Operand_Type)
and then Is_Unchecked_Union (Base_Type (Operand_Type))
and then not Is_Constrained (Target_Type)
and then not Is_Unchecked_Union (Base_Type (Target_Type))
and then not Has_Inferable_Discriminants (Operand)
then
-- To prevent Gigi from generating illegal code, we generate a
-- Program_Error node, but we give it the target type of the
-- conversion (is this requirement documented somewhere ???)
declare
PE : constant Node_Id := Make_Raise_Program_Error (Loc,
Reason => PE_Unchecked_Union_Restriction);
begin
Set_Etype (PE, Target_Type);
Rewrite (N, PE);
end;
else
Handle_Changed_Representation;
end if;
-- Case of conversions of enumeration types
elsif Is_Enumeration_Type (Target_Type) then
-- Special processing is required if there is a change of
-- representation (from enumeration representation clauses).
if not Has_Compatible_Representation (Target_Type, Operand_Type)
and then not Conversion_OK (N)
then
-- Convert: x(y) to x'val (ytyp'pos (y))
Rewrite (N,
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Target_Type, Loc),
Attribute_Name => Name_Val,
Expressions => New_List (
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Operand_Type, Loc),
Attribute_Name => Name_Pos,
Expressions => New_List (Operand)))));
Analyze_And_Resolve (N, Target_Type);
end if;
end if;
-- At this stage, either the conversion node has been transformed into
-- some other equivalent expression, or left as a conversion that can be
-- handled by Gigi.
-- The only remaining step is to generate a range check if we still have
-- a type conversion at this stage and Do_Range_Check is set. Note that
-- we need to deal with at most 8 out of the 9 possible cases of numeric
-- conversions here, because the float-to-integer case is entirely dealt
-- with by Apply_Float_Conversion_Check.
if Nkind (N) = N_Type_Conversion
and then Do_Range_Check (Expression (N))
then
-- Float-to-float conversions
if Is_Floating_Point_Type (Target_Type)
and then Is_Floating_Point_Type (Etype (Expression (N)))
then
-- Reset overflow flag, since the range check will include
-- dealing with possible overflow, and generate the check.
Set_Do_Overflow_Check (N, False);
Generate_Range_Check
(Expression (N), Target_Type, CE_Range_Check_Failed);
-- Discrete-to-discrete conversions or fixed-point-to-discrete
-- conversions when Conversion_OK is set.
elsif Is_Discrete_Type (Target_Type)
and then (Is_Discrete_Type (Etype (Expression (N)))
or else (Is_Fixed_Point_Type (Etype (Expression (N)))
and then Conversion_OK (N)))
then
-- If Address is either a source type or target type,
-- suppress range check to avoid typing anomalies when
-- it is a visible integer type.
if Is_Descendant_Of_Address (Etype (Expression (N)))
or else Is_Descendant_Of_Address (Target_Type)
then
Set_Do_Range_Check (Expression (N), False);
else
Discrete_Range_Check;
end if;
-- Conversions to floating- or fixed-point when Conversion_OK is set
elsif Is_Floating_Point_Type (Target_Type)
or else (Is_Fixed_Point_Type (Target_Type)
and then Conversion_OK (N))
then
Real_Range_Check;
end if;
pragma Assert (not Do_Range_Check (Expression (N)));
end if;
-- Here at end of processing
<<Done>>
-- Apply predicate check if required. Note that we can't just call
-- Apply_Predicate_Check here, because the type looks right after
-- the conversion and it would omit the check. The Comes_From_Source
-- guard is necessary to prevent infinite recursions when we generate
-- internal conversions for the purpose of checking predicates.
-- A view conversion of a tagged object is an object and can appear
-- in an assignment context, in which case no predicate check applies
-- to the now-dead value.
if Nkind (Parent (N)) = N_Assignment_Statement
and then N = Name (Parent (N))
then
null;
elsif Predicate_Enabled (Target_Type)
and then Target_Type /= Operand_Type
and then Comes_From_Source (N)
then
declare
New_Expr : constant Node_Id := Duplicate_Subexpr (N);
begin
-- Avoid infinite recursion on the subsequent expansion of the
-- copy of the original type conversion. When needed, a range
-- check has already been applied to the expression.
Set_Comes_From_Source (New_Expr, False);
Insert_Action (N,
Make_Predicate_Check (Target_Type, New_Expr),
Suppress => Range_Check);
end;
end if;
end Expand_N_Type_Conversion;
-----------------------------------
-- Expand_N_Unchecked_Expression --
-----------------------------------
-- Remove the unchecked expression node from the tree. Its job was simply
-- to make sure that its constituent expression was handled with checks
-- off, and now that is done, we can remove it from the tree, and indeed
-- must, since Gigi does not expect to see these nodes.
procedure Expand_N_Unchecked_Expression (N : Node_Id) is
Exp : constant Node_Id := Expression (N);
begin
Set_Assignment_OK (Exp, Assignment_OK (N) or else Assignment_OK (Exp));
Rewrite (N, Exp);
end Expand_N_Unchecked_Expression;
----------------------------------------
-- Expand_N_Unchecked_Type_Conversion --
----------------------------------------
-- If this cannot be handled by Gigi and we haven't already made a
-- temporary for it, do it now.
procedure Expand_N_Unchecked_Type_Conversion (N : Node_Id) is
Target_Type : constant Entity_Id := Etype (N);
Operand : constant Node_Id := Expression (N);
Operand_Type : constant Entity_Id := Etype (Operand);
begin
-- Nothing at all to do if conversion is to the identical type so remove
-- the conversion completely, it is useless, except that it may carry
-- an Assignment_OK indication which must be propagated to the operand.
if Operand_Type = Target_Type then
Expand_N_Unchecked_Expression (N);
return;
end if;
-- Generate an extra temporary for cases unsupported by the C backend
if Modify_Tree_For_C then
declare
Source : constant Node_Id := Unqual_Conv (Expression (N));
Source_Typ : Entity_Id := Get_Full_View (Etype (Source));
begin
if Is_Packed_Array (Source_Typ) then
Source_Typ := Packed_Array_Impl_Type (Source_Typ);
end if;
if Nkind (Source) = N_Function_Call
and then (Is_Composite_Type (Etype (Source))
or else Is_Composite_Type (Target_Type))
then
Force_Evaluation (Source);
end if;
end;
end if;
-- Nothing to do if conversion is safe
if Safe_Unchecked_Type_Conversion (N) then
return;
end if;
if Assignment_OK (N) then
null;
else
Force_Evaluation (N);
end if;
end Expand_N_Unchecked_Type_Conversion;
----------------------------
-- Expand_Record_Equality --
----------------------------
-- For non-variant records, Equality is expanded when needed into:
-- and then Lhs.Discr1 = Rhs.Discr1
-- and then ...
-- and then Lhs.Discrn = Rhs.Discrn
-- and then Lhs.Cmp1 = Rhs.Cmp1
-- and then ...
-- and then Lhs.Cmpn = Rhs.Cmpn
-- The expression is folded by the back end for adjacent fields. This
-- function is called for tagged record in only one occasion: for imple-
-- menting predefined primitive equality (see Predefined_Primitives_Bodies)
-- otherwise the primitive "=" is used directly.
function Expand_Record_Equality
(Nod : Node_Id;
Typ : Entity_Id;
Lhs : Node_Id;
Rhs : Node_Id) return Node_Id
is
Loc : constant Source_Ptr := Sloc (Nod);
Result : Node_Id;
C : Entity_Id;
First_Time : Boolean := True;
function Element_To_Compare (C : Entity_Id) return Entity_Id;
-- Return the next discriminant or component to compare, starting with
-- C, skipping inherited components.
------------------------
-- Element_To_Compare --
------------------------
function Element_To_Compare (C : Entity_Id) return Entity_Id is
Comp : Entity_Id := C;
begin
while Present (Comp) loop
-- Skip inherited components
-- Note: for a tagged type, we always generate the "=" primitive
-- for the base type (not on the first subtype), so the test for
-- Comp /= Original_Record_Component (Comp) is True for inherited
-- components only.
if (Is_Tagged_Type (Typ)
and then Comp /= Original_Record_Component (Comp))
-- Skip _Tag
or else Chars (Comp) = Name_uTag
-- Skip interface elements (secondary tags???)
or else Is_Interface (Etype (Comp))
then
Next_Component_Or_Discriminant (Comp);
else
return Comp;
end if;
end loop;
return Empty;
end Element_To_Compare;
-- Start of processing for Expand_Record_Equality
begin
-- Generates the following code: (assuming that Typ has one Discr and
-- component C2 is also a record)
-- Lhs.Discr1 = Rhs.Discr1
-- and then Lhs.C1 = Rhs.C1
-- and then Lhs.C2.C1=Rhs.C2.C1 and then ... Lhs.C2.Cn=Rhs.C2.Cn
-- and then ...
-- and then Lhs.Cmpn = Rhs.Cmpn
Result := New_Occurrence_Of (Standard_True, Loc);
C := Element_To_Compare (First_Component_Or_Discriminant (Typ));
while Present (C) loop
declare
New_Lhs : Node_Id;
New_Rhs : Node_Id;
Check : Node_Id;
begin
if First_Time then
New_Lhs := Lhs;
New_Rhs := Rhs;
else
New_Lhs := New_Copy_Tree (Lhs);
New_Rhs := New_Copy_Tree (Rhs);
end if;
Check :=
Expand_Composite_Equality (Nod, Etype (C),
Lhs =>
Make_Selected_Component (Loc,
Prefix => New_Lhs,
Selector_Name => New_Occurrence_Of (C, Loc)),
Rhs =>
Make_Selected_Component (Loc,
Prefix => New_Rhs,
Selector_Name => New_Occurrence_Of (C, Loc)));
-- If some (sub)component is an unchecked_union, the whole
-- operation will raise program error.
if Nkind (Check) = N_Raise_Program_Error then
Result := Check;
Set_Etype (Result, Standard_Boolean);
exit;
else
if First_Time then
Result := Check;
-- Generate logical "and" for CodePeer to simplify the
-- generated code and analysis.
elsif CodePeer_Mode then
Result :=
Make_Op_And (Loc,
Left_Opnd => Result,
Right_Opnd => Check);
else
Result :=
Make_And_Then (Loc,
Left_Opnd => Result,
Right_Opnd => Check);
end if;
end if;
end;
First_Time := False;
C := Element_To_Compare (Next_Component_Or_Discriminant (C));
end loop;
return Result;
end Expand_Record_Equality;
---------------------------
-- Expand_Set_Membership --
---------------------------
procedure Expand_Set_Membership (N : Node_Id) is
Lop : constant Node_Id := Left_Opnd (N);
Alt : Node_Id;
Res : Node_Id;
function Make_Cond (Alt : Node_Id) return Node_Id;
-- If the alternative is a subtype mark, create a simple membership
-- test. Otherwise create an equality test for it.
---------------
-- Make_Cond --
---------------
function Make_Cond (Alt : Node_Id) return Node_Id is
Cond : Node_Id;
L : constant Node_Id := New_Copy_Tree (Lop);
R : constant Node_Id := Relocate_Node (Alt);
begin
if (Is_Entity_Name (Alt) and then Is_Type (Entity (Alt)))
or else Nkind (Alt) = N_Range
then
Cond :=
Make_In (Sloc (Alt),
Left_Opnd => L,
Right_Opnd => R);
else
Cond :=
Make_Op_Eq (Sloc (Alt),
Left_Opnd => L,
Right_Opnd => R);
if Is_Record_Or_Limited_Type (Etype (Alt)) then
-- We reset the Entity in order to use the primitive equality
-- of the type, as per RM 4.5.2 (28.1/4).
Set_Entity (Cond, Empty);
end if;
end if;
return Cond;
end Make_Cond;
-- Start of processing for Expand_Set_Membership
begin
Remove_Side_Effects (Lop);
Alt := First (Alternatives (N));
Res := Make_Cond (Alt);
Next (Alt);
-- We use left associativity as in the equivalent boolean case. This
-- kind of canonicalization helps the optimizer of the code generator.
while Present (Alt) loop
Res :=
Make_Or_Else (Sloc (Alt),
Left_Opnd => Res,
Right_Opnd => Make_Cond (Alt));
Next (Alt);
end loop;
Rewrite (N, Res);
Analyze_And_Resolve (N, Standard_Boolean);
end Expand_Set_Membership;
-----------------------------------
-- Expand_Short_Circuit_Operator --
-----------------------------------
-- Deal with special expansion if actions are present for the right operand
-- and deal with optimizing case of arguments being True or False. We also
-- deal with the special case of non-standard boolean values.
procedure Expand_Short_Circuit_Operator (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Etype (N);
Left : constant Node_Id := Left_Opnd (N);
Right : constant Node_Id := Right_Opnd (N);
LocR : constant Source_Ptr := Sloc (Right);
Actlist : List_Id;
Shortcut_Value : constant Boolean := Nkind (N) = N_Or_Else;
Shortcut_Ent : constant Entity_Id := Boolean_Literals (Shortcut_Value);
-- If Left = Shortcut_Value then Right need not be evaluated
function Make_Test_Expr (Opnd : Node_Id) return Node_Id;
-- For Opnd a boolean expression, return a Boolean expression equivalent
-- to Opnd /= Shortcut_Value.
function Useful (Actions : List_Id) return Boolean;
-- Return True if Actions is not empty and contains useful nodes to
-- process.
--------------------
-- Make_Test_Expr --
--------------------
function Make_Test_Expr (Opnd : Node_Id) return Node_Id is
begin
if Shortcut_Value then
return Make_Op_Not (Sloc (Opnd), Opnd);
else
return Opnd;
end if;
end Make_Test_Expr;
------------
-- Useful --
------------
function Useful (Actions : List_Id) return Boolean is
L : Node_Id;
begin
if Present (Actions) then
L := First (Actions);
-- For now "useful" means not N_Variable_Reference_Marker.
-- Consider stripping other nodes in the future.
while Present (L) loop
if Nkind (L) /= N_Variable_Reference_Marker then
return True;
end if;
Next (L);
end loop;
end if;
return False;
end Useful;
-- Local variables
Op_Var : Entity_Id;
-- Entity for a temporary variable holding the value of the operator,
-- used for expansion in the case where actions are present.
-- Start of processing for Expand_Short_Circuit_Operator
begin
-- Deal with non-standard booleans
if Is_Boolean_Type (Typ) then
Adjust_Condition (Left);
Adjust_Condition (Right);
Set_Etype (N, Standard_Boolean);
end if;
-- Check for cases where left argument is known to be True or False
if Compile_Time_Known_Value (Left) then
-- Mark SCO for left condition as compile time known
if Generate_SCO and then Comes_From_Source (Left) then
Set_SCO_Condition (Left, Expr_Value_E (Left) = Standard_True);
end if;
-- Rewrite True AND THEN Right / False OR ELSE Right to Right.
-- Any actions associated with Right will be executed unconditionally
-- and can thus be inserted into the tree unconditionally.
if Expr_Value_E (Left) /= Shortcut_Ent then
if Present (Actions (N)) then
Insert_Actions (N, Actions (N));
end if;
Rewrite (N, Right);
-- Rewrite False AND THEN Right / True OR ELSE Right to Left.
-- In this case we can forget the actions associated with Right,
-- since they will never be executed.
else
Kill_Dead_Code (Right);
Kill_Dead_Code (Actions (N));
Rewrite (N, New_Occurrence_Of (Shortcut_Ent, Loc));
end if;
Adjust_Result_Type (N, Typ);
return;
end if;
-- If Actions are present for the right operand, we have to do some
-- special processing. We can't just let these actions filter back into
-- code preceding the short circuit (which is what would have happened
-- if we had not trapped them in the short-circuit form), since they
-- must only be executed if the right operand of the short circuit is
-- executed and not otherwise.
if Useful (Actions (N)) then
Actlist := Actions (N);
-- The old approach is to expand:
-- left AND THEN right
-- into
-- C : Boolean := False;
-- IF left THEN
-- Actions;
-- IF right THEN
-- C := True;
-- END IF;
-- END IF;
-- and finally rewrite the operator into a reference to C. Similarly
-- for left OR ELSE right, with negated values. Note that this
-- rewrite causes some difficulties for coverage analysis because
-- of the introduction of the new variable C, which obscures the
-- structure of the test.
-- We use this "old approach" if Minimize_Expression_With_Actions
-- is True.
if Minimize_Expression_With_Actions then
Op_Var := Make_Temporary (Loc, 'C', Related_Node => N);
Insert_Action (N,
Make_Object_Declaration (Loc,
Defining_Identifier => Op_Var,
Object_Definition =>
New_Occurrence_Of (Standard_Boolean, Loc),
Expression =>
New_Occurrence_Of (Shortcut_Ent, Loc)));
Append_To (Actlist,
Make_Implicit_If_Statement (Right,
Condition => Make_Test_Expr (Right),
Then_Statements => New_List (
Make_Assignment_Statement (LocR,
Name => New_Occurrence_Of (Op_Var, LocR),
Expression =>
New_Occurrence_Of
(Boolean_Literals (not Shortcut_Value), LocR)))));
Insert_Action (N,
Make_Implicit_If_Statement (Left,
Condition => Make_Test_Expr (Left),
Then_Statements => Actlist));
Rewrite (N, New_Occurrence_Of (Op_Var, Loc));
Analyze_And_Resolve (N, Standard_Boolean);
-- The new approach (the default) is to use an
-- Expression_With_Actions node for the right operand of the
-- short-circuit form. Note that this solves the traceability
-- problems for coverage analysis.
else
Rewrite (Right,
Make_Expression_With_Actions (LocR,
Expression => Relocate_Node (Right),
Actions => Actlist));
Set_Actions (N, No_List);
Analyze_And_Resolve (Right, Standard_Boolean);
end if;
Adjust_Result_Type (N, Typ);
return;
end if;
-- No actions present, check for cases of right argument True/False
if Compile_Time_Known_Value (Right) then
-- Mark SCO for left condition as compile time known
if Generate_SCO and then Comes_From_Source (Right) then
Set_SCO_Condition (Right, Expr_Value_E (Right) = Standard_True);
end if;
-- Change (Left and then True), (Left or else False) to Left. Note
-- that we know there are no actions associated with the right
-- operand, since we just checked for this case above.
if Expr_Value_E (Right) /= Shortcut_Ent then
Rewrite (N, Left);
-- Change (Left and then False), (Left or else True) to Right,
-- making sure to preserve any side effects associated with the Left
-- operand.
else
Remove_Side_Effects (Left);
Rewrite (N, New_Occurrence_Of (Shortcut_Ent, Loc));
end if;
end if;
Adjust_Result_Type (N, Typ);
end Expand_Short_Circuit_Operator;
------------------------------------
-- Fixup_Universal_Fixed_Operation --
-------------------------------------
procedure Fixup_Universal_Fixed_Operation (N : Node_Id) is
Conv : constant Node_Id := Parent (N);
begin
-- We must have a type conversion immediately above us
pragma Assert (Nkind (Conv) = N_Type_Conversion);
-- Normally the type conversion gives our target type. The exception
-- occurs in the case of the Round attribute, where the conversion
-- will be to universal real, and our real type comes from the Round
-- attribute (as well as an indication that we must round the result)
if Etype (Conv) = Universal_Real
and then Nkind (Parent (Conv)) = N_Attribute_Reference
and then Attribute_Name (Parent (Conv)) = Name_Round
then
Set_Etype (N, Base_Type (Etype (Parent (Conv))));
Set_Rounded_Result (N);
-- Normal case where type comes from conversion above us
else
Set_Etype (N, Base_Type (Etype (Conv)));
end if;
end Fixup_Universal_Fixed_Operation;
------------------------
-- Get_Size_For_Range --
------------------------
function Get_Size_For_Range (Lo, Hi : Uint) return Uint is
function Is_OK_For_Range (Siz : Uint) return Boolean;
-- Return True if a signed integer with given size can cover Lo .. Hi
--------------------------
-- Is_OK_For_Range --
--------------------------
function Is_OK_For_Range (Siz : Uint) return Boolean is
B : constant Uint := Uint_2 ** (Siz - 1);
begin
-- Test B = 2 ** (size - 1) (can accommodate -B .. +(B - 1))
return Lo >= -B and then Hi >= -B and then Lo < B and then Hi < B;
end Is_OK_For_Range;
begin
-- This is (almost always) the size of Integer
if Is_OK_For_Range (Uint_32) then
return Uint_32;
-- Check 63
elsif Is_OK_For_Range (Uint_63) then
return Uint_63;
-- This is (almost always) the size of Long_Long_Integer
elsif Is_OK_For_Range (Uint_64) then
return Uint_64;
-- Check 127
elsif Is_OK_For_Range (Uint_127) then
return Uint_127;
else
return Uint_128;
end if;
end Get_Size_For_Range;
-------------------------------
-- Insert_Dereference_Action --
-------------------------------
procedure Insert_Dereference_Action (N : Node_Id) is
function Is_Checked_Storage_Pool (P : Entity_Id) return Boolean;
-- Return true if type of P is derived from Checked_Pool;
-----------------------------
-- Is_Checked_Storage_Pool --
-----------------------------
function Is_Checked_Storage_Pool (P : Entity_Id) return Boolean is
T : Entity_Id;
begin
if No (P) then
return False;
end if;
T := Etype (P);
while T /= Etype (T) loop
if Is_RTE (T, RE_Checked_Pool) then
return True;
else
T := Etype (T);
end if;
end loop;
return False;
end Is_Checked_Storage_Pool;
-- Local variables
Context : constant Node_Id := Parent (N);
Ptr_Typ : constant Entity_Id := Etype (N);
Desig_Typ : constant Entity_Id :=
Available_View (Designated_Type (Ptr_Typ));
Loc : constant Source_Ptr := Sloc (N);
Pool : constant Entity_Id := Associated_Storage_Pool (Ptr_Typ);
Addr : Entity_Id;
Alig : Entity_Id;
Deref : Node_Id;
Size : Entity_Id;
Size_Bits : Node_Id;
Stmt : Node_Id;
-- Start of processing for Insert_Dereference_Action
begin
pragma Assert (Nkind (Context) = N_Explicit_Dereference);
-- Do not re-expand a dereference which has already been processed by
-- this routine.
if Has_Dereference_Action (Context) then
return;
-- Do not perform this type of expansion for internally-generated
-- dereferences.
elsif not Comes_From_Source (Original_Node (Context)) then
return;
-- A dereference action is only applicable to objects which have been
-- allocated on a checked pool.
elsif not Is_Checked_Storage_Pool (Pool) then
return;
end if;
-- Extract the address of the dereferenced object. Generate:
-- Addr : System.Address := <N>'Pool_Address;
Addr := Make_Temporary (Loc, 'P');
Insert_Action (N,
Make_Object_Declaration (Loc,
Defining_Identifier => Addr,
Object_Definition =>
New_Occurrence_Of (RTE (RE_Address), Loc),
Expression =>
Make_Attribute_Reference (Loc,
Prefix => Duplicate_Subexpr_Move_Checks (N),
Attribute_Name => Name_Pool_Address)));
-- Calculate the size of the dereferenced object. Generate:
-- Size : Storage_Count := <N>.all'Size / Storage_Unit;
Deref :=
Make_Explicit_Dereference (Loc,
Prefix => Duplicate_Subexpr_Move_Checks (N));
Set_Has_Dereference_Action (Deref);
Size_Bits :=
Make_Attribute_Reference (Loc,
Prefix => Deref,
Attribute_Name => Name_Size);
-- Special case of an unconstrained array: need to add descriptor size
if Is_Array_Type (Desig_Typ)
and then not Is_Constrained (First_Subtype (Desig_Typ))
then
Size_Bits :=
Make_Op_Add (Loc,
Left_Opnd =>
Make_Attribute_Reference (Loc,
Prefix =>
New_Occurrence_Of (First_Subtype (Desig_Typ), Loc),
Attribute_Name => Name_Descriptor_Size),
Right_Opnd => Size_Bits);
end if;
Size := Make_Temporary (Loc, 'S');
Insert_Action (N,
Make_Object_Declaration (Loc,
Defining_Identifier => Size,
Object_Definition =>
New_Occurrence_Of (RTE (RE_Storage_Count), Loc),
Expression =>
Make_Op_Divide (Loc,
Left_Opnd => Size_Bits,
Right_Opnd => Make_Integer_Literal (Loc, System_Storage_Unit))));
-- Calculate the alignment of the dereferenced object. Generate:
-- Alig : constant Storage_Count := <N>.all'Alignment;
Deref :=
Make_Explicit_Dereference (Loc,
Prefix => Duplicate_Subexpr_Move_Checks (N));
Set_Has_Dereference_Action (Deref);
Alig := Make_Temporary (Loc, 'A');
Insert_Action (N,
Make_Object_Declaration (Loc,
Defining_Identifier => Alig,
Object_Definition =>
New_Occurrence_Of (RTE (RE_Storage_Count), Loc),
Expression =>
Make_Attribute_Reference (Loc,
Prefix => Deref,
Attribute_Name => Name_Alignment)));
-- A dereference of a controlled object requires special processing. The
-- finalization machinery requests additional space from the underlying
-- pool to allocate and hide two pointers. As a result, a checked pool
-- may mark the wrong memory as valid. Since checked pools do not have
-- knowledge of hidden pointers, we have to bring the two pointers back
-- in view in order to restore the original state of the object.
-- The address manipulation is not performed for access types that are
-- subject to pragma No_Heap_Finalization because the two pointers do
-- not exist in the first place.
if No_Heap_Finalization (Ptr_Typ) then
null;
elsif Needs_Finalization (Desig_Typ) then
-- Adjust the address and size of the dereferenced object. Generate:
-- Adjust_Controlled_Dereference (Addr, Size, Alig);
Stmt :=
Make_Procedure_Call_Statement (Loc,
Name =>
New_Occurrence_Of (RTE (RE_Adjust_Controlled_Dereference), Loc),
Parameter_Associations => New_List (
New_Occurrence_Of (Addr, Loc),
New_Occurrence_Of (Size, Loc),
New_Occurrence_Of (Alig, Loc)));
-- Class-wide types complicate things because we cannot determine
-- statically whether the actual object is truly controlled. We must
-- generate a runtime check to detect this property. Generate:
--
-- if Needs_Finalization (<N>.all'Tag) then
-- <Stmt>;
-- end if;
if Is_Class_Wide_Type (Desig_Typ) then
Deref :=
Make_Explicit_Dereference (Loc,
Prefix => Duplicate_Subexpr_Move_Checks (N));
Set_Has_Dereference_Action (Deref);
Stmt :=
Make_Implicit_If_Statement (N,
Condition =>
Make_Function_Call (Loc,
Name =>
New_Occurrence_Of (RTE (RE_Needs_Finalization), Loc),
Parameter_Associations => New_List (
Make_Attribute_Reference (Loc,
Prefix => Deref,
Attribute_Name => Name_Tag))),
Then_Statements => New_List (Stmt));
end if;
Insert_Action (N, Stmt);
end if;
-- Generate:
-- Dereference (Pool, Addr, Size, Alig);
Insert_Action (N,
Make_Procedure_Call_Statement (Loc,
Name =>
New_Occurrence_Of
(Find_Prim_Op (Etype (Pool), Name_Dereference), Loc),
Parameter_Associations => New_List (
New_Occurrence_Of (Pool, Loc),
New_Occurrence_Of (Addr, Loc),
New_Occurrence_Of (Size, Loc),
New_Occurrence_Of (Alig, Loc))));
-- Mark the explicit dereference as processed to avoid potential
-- infinite expansion.
Set_Has_Dereference_Action (Context);
exception
when RE_Not_Available =>
return;
end Insert_Dereference_Action;
--------------------------------
-- Integer_Promotion_Possible --
--------------------------------
function Integer_Promotion_Possible (N : Node_Id) return Boolean is
Operand : constant Node_Id := Expression (N);
Operand_Type : constant Entity_Id := Etype (Operand);
Root_Operand_Type : constant Entity_Id := Root_Type (Operand_Type);
begin
pragma Assert (Nkind (N) = N_Type_Conversion);
return
-- We only do the transformation for source constructs. We assume
-- that the expander knows what it is doing when it generates code.
Comes_From_Source (N)
-- If the operand type is Short_Integer or Short_Short_Integer,
-- then we will promote to Integer, which is available on all
-- targets, and is sufficient to ensure no intermediate overflow.
-- Furthermore it is likely to be as efficient or more efficient
-- than using the smaller type for the computation so we do this
-- unconditionally.
and then
(Root_Operand_Type = Base_Type (Standard_Short_Integer)
or else
Root_Operand_Type = Base_Type (Standard_Short_Short_Integer))
-- Test for interesting operation, which includes addition,
-- division, exponentiation, multiplication, subtraction, absolute
-- value and unary negation. Unary "+" is omitted since it is a
-- no-op and thus can't overflow.
and then Nkind (Operand) in
N_Op_Abs | N_Op_Add | N_Op_Divide | N_Op_Expon |
N_Op_Minus | N_Op_Multiply | N_Op_Subtract;
end Integer_Promotion_Possible;
------------------------------
-- Make_Array_Comparison_Op --
------------------------------
-- This is a hand-coded expansion of the following generic function:
-- generic
-- type elem is (<>);
-- type index is (<>);
-- type a is array (index range <>) of elem;
-- function Gnnn (X : a; Y: a) return boolean is
-- J : index := Y'first;
-- begin
-- if X'length = 0 then
-- return false;
-- elsif Y'length = 0 then
-- return true;
-- else
-- for I in X'range loop
-- if X (I) = Y (J) then
-- if J = Y'last then
-- exit;
-- else
-- J := index'succ (J);
-- end if;
-- else
-- return X (I) > Y (J);
-- end if;
-- end loop;
-- return X'length > Y'length;
-- end if;
-- end Gnnn;
-- Note that since we are essentially doing this expansion by hand, we
-- do not need to generate an actual or formal generic part, just the
-- instantiated function itself.
function Make_Array_Comparison_Op
(Typ : Entity_Id;
Nod : Node_Id) return Node_Id
is
Loc : constant Source_Ptr := Sloc (Nod);
X : constant Entity_Id := Make_Defining_Identifier (Loc, Name_uX);
Y : constant Entity_Id := Make_Defining_Identifier (Loc, Name_uY);
I : constant Entity_Id := Make_Defining_Identifier (Loc, Name_uI);
J : constant Entity_Id := Make_Defining_Identifier (Loc, Name_uJ);
Index : constant Entity_Id := Base_Type (Etype (First_Index (Typ)));
Loop_Statement : Node_Id;
Loop_Body : Node_Id;
If_Stat : Node_Id;
Inner_If : Node_Id;
Final_Expr : Node_Id;
Func_Body : Node_Id;
Func_Name : Entity_Id;
Formals : List_Id;
Length1 : Node_Id;
Length2 : Node_Id;
begin
-- if J = Y'last then
-- exit;
-- else
-- J := index'succ (J);
-- end if;
Inner_If :=
Make_Implicit_If_Statement (Nod,
Condition =>
Make_Op_Eq (Loc,
Left_Opnd => New_Occurrence_Of (J, Loc),
Right_Opnd =>
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Y, Loc),
Attribute_Name => Name_Last)),
Then_Statements => New_List (
Make_Exit_Statement (Loc)),
Else_Statements =>
New_List (
Make_Assignment_Statement (Loc,
Name => New_Occurrence_Of (J, Loc),
Expression =>
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Index, Loc),
Attribute_Name => Name_Succ,
Expressions => New_List (New_Occurrence_Of (J, Loc))))));
-- if X (I) = Y (J) then
-- if ... end if;
-- else
-- return X (I) > Y (J);
-- end if;
Loop_Body :=
Make_Implicit_If_Statement (Nod,
Condition =>
Make_Op_Eq (Loc,
Left_Opnd =>
Make_Indexed_Component (Loc,
Prefix => New_Occurrence_Of (X, Loc),
Expressions => New_List (New_Occurrence_Of (I, Loc))),
Right_Opnd =>
Make_Indexed_Component (Loc,
Prefix => New_Occurrence_Of (Y, Loc),
Expressions => New_List (New_Occurrence_Of (J, Loc)))),
Then_Statements => New_List (Inner_If),
Else_Statements => New_List (
Make_Simple_Return_Statement (Loc,
Expression =>
Make_Op_Gt (Loc,
Left_Opnd =>
Make_Indexed_Component (Loc,
Prefix => New_Occurrence_Of (X, Loc),
Expressions => New_List (New_Occurrence_Of (I, Loc))),
Right_Opnd =>
Make_Indexed_Component (Loc,
Prefix => New_Occurrence_Of (Y, Loc),
Expressions => New_List (
New_Occurrence_Of (J, Loc)))))));
-- for I in X'range loop
-- if ... end if;
-- end loop;
Loop_Statement :=
Make_Implicit_Loop_Statement (Nod,
Identifier => Empty,
Iteration_Scheme =>
Make_Iteration_Scheme (Loc,
Loop_Parameter_Specification =>
Make_Loop_Parameter_Specification (Loc,
Defining_Identifier => I,
Discrete_Subtype_Definition =>
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (X, Loc),
Attribute_Name => Name_Range))),
Statements => New_List (Loop_Body));
-- if X'length = 0 then
-- return false;
-- elsif Y'length = 0 then
-- return true;
-- else
-- for ... loop ... end loop;
-- return X'length > Y'length;
-- end if;
Length1 :=
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (X, Loc),
Attribute_Name => Name_Length);
Length2 :=
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Y, Loc),
Attribute_Name => Name_Length);
Final_Expr :=
Make_Op_Gt (Loc,
Left_Opnd => Length1,
Right_Opnd => Length2);
If_Stat :=
Make_Implicit_If_Statement (Nod,
Condition =>
Make_Op_Eq (Loc,
Left_Opnd =>
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (X, Loc),
Attribute_Name => Name_Length),
Right_Opnd =>
Make_Integer_Literal (Loc, 0)),
Then_Statements =>
New_List (
Make_Simple_Return_Statement (Loc,
Expression => New_Occurrence_Of (Standard_False, Loc))),
Elsif_Parts => New_List (
Make_Elsif_Part (Loc,
Condition =>
Make_Op_Eq (Loc,
Left_Opnd =>
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Y, Loc),
Attribute_Name => Name_Length),
Right_Opnd =>
Make_Integer_Literal (Loc, 0)),
Then_Statements =>
New_List (
Make_Simple_Return_Statement (Loc,
Expression => New_Occurrence_Of (Standard_True, Loc))))),
Else_Statements => New_List (
Loop_Statement,
Make_Simple_Return_Statement (Loc,
Expression => Final_Expr)));
-- (X : a; Y: a)
Formals := New_List (
Make_Parameter_Specification (Loc,
Defining_Identifier => X,
Parameter_Type => New_Occurrence_Of (Typ, Loc)),
Make_Parameter_Specification (Loc,
Defining_Identifier => Y,
Parameter_Type => New_Occurrence_Of (Typ, Loc)));
-- function Gnnn (...) return boolean is
-- J : index := Y'first;
-- begin
-- if ... end if;
-- end Gnnn;
Func_Name := Make_Temporary (Loc, 'G');
Func_Body :=
Make_Subprogram_Body (Loc,
Specification =>
Make_Function_Specification (Loc,
Defining_Unit_Name => Func_Name,
Parameter_Specifications => Formals,
Result_Definition => New_Occurrence_Of (Standard_Boolean, Loc)),
Declarations => New_List (
Make_Object_Declaration (Loc,
Defining_Identifier => J,
Object_Definition => New_Occurrence_Of (Index, Loc),
Expression =>
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Y, Loc),
Attribute_Name => Name_First))),
Handled_Statement_Sequence =>
Make_Handled_Sequence_Of_Statements (Loc,
Statements => New_List (If_Stat)));
return Func_Body;
end Make_Array_Comparison_Op;
---------------------------
-- Make_Boolean_Array_Op --
---------------------------
-- For logical operations on boolean arrays, expand in line the following,
-- replacing 'and' with 'or' or 'xor' where needed:
-- function Annn (A : typ; B: typ) return typ is
-- C : typ;
-- begin
-- for J in A'range loop
-- C (J) := A (J) op B (J);
-- end loop;
-- return C;
-- end Annn;
-- or in the case of Transform_Function_Array:
-- procedure Annn (A : typ; B: typ; RESULT: out typ) is
-- begin
-- for J in A'range loop
-- RESULT (J) := A (J) op B (J);
-- end loop;
-- end Annn;
-- Here typ is the boolean array type
function Make_Boolean_Array_Op
(Typ : Entity_Id;
N : Node_Id) return Node_Id
is
Loc : constant Source_Ptr := Sloc (N);
A : constant Entity_Id := Make_Defining_Identifier (Loc, Name_uA);
B : constant Entity_Id := Make_Defining_Identifier (Loc, Name_uB);
J : constant Entity_Id := Make_Defining_Identifier (Loc, Name_uJ);
C : Entity_Id;
A_J : Node_Id;
B_J : Node_Id;
C_J : Node_Id;
Op : Node_Id;
Formals : List_Id;
Func_Name : Entity_Id;
Func_Body : Node_Id;
Loop_Statement : Node_Id;
begin
if Transform_Function_Array then
C := Make_Defining_Identifier (Loc, Name_UP_RESULT);
else
C := Make_Defining_Identifier (Loc, Name_uC);
end if;
A_J :=
Make_Indexed_Component (Loc,
Prefix => New_Occurrence_Of (A, Loc),
Expressions => New_List (New_Occurrence_Of (J, Loc)));
B_J :=
Make_Indexed_Component (Loc,
Prefix => New_Occurrence_Of (B, Loc),
Expressions => New_List (New_Occurrence_Of (J, Loc)));
C_J :=
Make_Indexed_Component (Loc,
Prefix => New_Occurrence_Of (C, Loc),
Expressions => New_List (New_Occurrence_Of (J, Loc)));
if Nkind (N) = N_Op_And then
Op :=
Make_Op_And (Loc,
Left_Opnd => A_J,
Right_Opnd => B_J);
elsif Nkind (N) = N_Op_Or then
Op :=
Make_Op_Or (Loc,
Left_Opnd => A_J,
Right_Opnd => B_J);
else
Op :=
Make_Op_Xor (Loc,
Left_Opnd => A_J,
Right_Opnd => B_J);
end if;
Loop_Statement :=
Make_Implicit_Loop_Statement (N,
Identifier => Empty,
Iteration_Scheme =>
Make_Iteration_Scheme (Loc,
Loop_Parameter_Specification =>
Make_Loop_Parameter_Specification (Loc,
Defining_Identifier => J,
Discrete_Subtype_Definition =>
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (A, Loc),
Attribute_Name => Name_Range))),
Statements => New_List (
Make_Assignment_Statement (Loc,
Name => C_J,
Expression => Op)));
Formals := New_List (
Make_Parameter_Specification (Loc,
Defining_Identifier => A,
Parameter_Type => New_Occurrence_Of (Typ, Loc)),
Make_Parameter_Specification (Loc,
Defining_Identifier => B,
Parameter_Type => New_Occurrence_Of (Typ, Loc)));
if Transform_Function_Array then
Append_To (Formals,
Make_Parameter_Specification (Loc,
Defining_Identifier => C,
Out_Present => True,
Parameter_Type => New_Occurrence_Of (Typ, Loc)));
end if;
Func_Name := Make_Temporary (Loc, 'A');
Set_Is_Inlined (Func_Name);
if Transform_Function_Array then
Func_Body :=
Make_Subprogram_Body (Loc,
Specification =>
Make_Procedure_Specification (Loc,
Defining_Unit_Name => Func_Name,
Parameter_Specifications => Formals),
Declarations => New_List,
Handled_Statement_Sequence =>
Make_Handled_Sequence_Of_Statements (Loc,
Statements => New_List (Loop_Statement)));
else
Func_Body :=
Make_Subprogram_Body (Loc,
Specification =>
Make_Function_Specification (Loc,
Defining_Unit_Name => Func_Name,
Parameter_Specifications => Formals,
Result_Definition => New_Occurrence_Of (Typ, Loc)),
Declarations => New_List (
Make_Object_Declaration (Loc,
Defining_Identifier => C,
Object_Definition => New_Occurrence_Of (Typ, Loc))),
Handled_Statement_Sequence =>
Make_Handled_Sequence_Of_Statements (Loc,
Statements => New_List (
Loop_Statement,
Make_Simple_Return_Statement (Loc,
Expression => New_Occurrence_Of (C, Loc)))));
end if;
return Func_Body;
end Make_Boolean_Array_Op;
-----------------------------------------
-- Minimized_Eliminated_Overflow_Check --
-----------------------------------------
function Minimized_Eliminated_Overflow_Check (N : Node_Id) return Boolean is
begin
-- The MINIMIZED mode operates in Long_Long_Integer so we cannot use it
-- if the type of the expression is already larger.
return
Is_Signed_Integer_Type (Etype (N))
and then Overflow_Check_Mode in Minimized_Or_Eliminated
and then not (Overflow_Check_Mode = Minimized
and then
Esize (Etype (N)) > Standard_Long_Long_Integer_Size);
end Minimized_Eliminated_Overflow_Check;
----------------------------
-- Narrow_Large_Operation --
----------------------------
procedure Narrow_Large_Operation (N : Node_Id) is
Kind : constant Node_Kind := Nkind (N);
In_Rng : constant Boolean := Kind = N_In;
Binary : constant Boolean := Kind in N_Binary_Op or else In_Rng;
Compar : constant Boolean := Kind in N_Op_Compare or else In_Rng;
R : constant Node_Id := Right_Opnd (N);
Typ : constant Entity_Id := Etype (R);
Tsiz : constant Uint := RM_Size (Typ);
-- Local variables
L : Node_Id;
Llo, Lhi : Uint;
Rlo, Rhi : Uint;
Lsiz, Rsiz : Uint;
Nlo, Nhi : Uint;
Nsiz : Uint;
Ntyp : Entity_Id;
Nop : Node_Id;
OK : Boolean;
-- Start of processing for Narrow_Large_Operation
begin
-- First, determine the range of the left operand, if any
if Binary then
L := Left_Opnd (N);
Determine_Range (L, OK, Llo, Lhi, Assume_Valid => True);
if not OK then
return;
end if;
else
L := Empty;
Llo := Uint_0;
Lhi := Uint_0;
end if;
-- Second, determine the range of the right operand, which can itself
-- be a range, in which case we take the lower bound of the low bound
-- and the upper bound of the high bound.
if In_Rng then
declare
Zlo, Zhi : Uint;
begin
Determine_Range
(Low_Bound (R), OK, Rlo, Zhi, Assume_Valid => True);
if not OK then
return;
end if;
Determine_Range
(High_Bound (R), OK, Zlo, Rhi, Assume_Valid => True);
if not OK then
return;
end if;
end;
else
Determine_Range (R, OK, Rlo, Rhi, Assume_Valid => True);
if not OK then
return;
end if;
end if;
-- Then compute a size suitable for each range
if Binary then
Lsiz := Get_Size_For_Range (Llo, Lhi);
else
Lsiz := Uint_0;
end if;
Rsiz := Get_Size_For_Range (Rlo, Rhi);
-- Now compute the size of the narrower type
if Compar then
-- The type must be able to accommodate the operands
Nsiz := UI_Max (Lsiz, Rsiz);
else
-- The type must be able to accommodate the operand(s) and result.
-- Note that Determine_Range typically does not report the bounds of
-- the value as being larger than those of the base type, which means
-- that it does not report overflow (see also Enable_Overflow_Check).
Determine_Range (N, OK, Nlo, Nhi, Assume_Valid => True);
if not OK then
return;
end if;
-- Therefore, if Nsiz is not lower than the size of the original type
-- here, we cannot be sure that the operation does not overflow.
Nsiz := Get_Size_For_Range (Nlo, Nhi);
Nsiz := UI_Max (Nsiz, Lsiz);
Nsiz := UI_Max (Nsiz, Rsiz);
end if;
-- If the size is not lower than the size of the original type, then
-- there is no point in changing the type, except in the case where
-- we can remove a conversion to the original type from an operand.
if Nsiz >= Tsiz
and then not (Binary
and then Nkind (L) = N_Type_Conversion
and then Entity (Subtype_Mark (L)) = Typ)
and then not (Nkind (R) = N_Type_Conversion
and then Entity (Subtype_Mark (R)) = Typ)
then
return;
end if;
-- Now pick the narrower type according to the size. We use the base
-- type instead of the first subtype because operations are done in
-- the base type, so this avoids the need for useless conversions.
if Nsiz <= System_Max_Integer_Size then
Ntyp := Etype (Integer_Type_For (Nsiz, Uns => False));
else
return;
end if;
-- Finally, rewrite the operation in the narrower type, but make sure
-- not to perform name resolution for the operator again.
Nop := New_Op_Node (Kind, Sloc (N));
if Nkind (N) in N_Has_Entity then
Set_Entity (Nop, Entity (N));
end if;
if Binary then
Set_Left_Opnd (Nop, Convert_To (Ntyp, L));
end if;
if In_Rng then
Set_Right_Opnd (Nop,
Make_Range (Sloc (N),
Convert_To (Ntyp, Low_Bound (R)),
Convert_To (Ntyp, High_Bound (R))));
else
Set_Right_Opnd (Nop, Convert_To (Ntyp, R));
end if;
Rewrite (N, Nop);
if Compar then
-- Analyze it with the comparison type and checks suppressed since
-- the conversions of the operands cannot overflow.
Analyze_And_Resolve
(N, Etype (Original_Node (N)), Suppress => Overflow_Check);
else
-- Analyze it with the narrower type and checks suppressed, but only
-- when we are sure that the operation does not overflow, see above.
if Nsiz < Tsiz then
Analyze_And_Resolve (N, Ntyp, Suppress => Overflow_Check);
else
Analyze_And_Resolve (N, Ntyp);
end if;
-- Put back a conversion to the original type
Convert_To_And_Rewrite (Typ, N);
end if;
end Narrow_Large_Operation;
--------------------------------
-- Optimize_Length_Comparison --
--------------------------------
procedure Optimize_Length_Comparison (N : Node_Id) is
Loc : constant Source_Ptr := Sloc (N);
Typ : constant Entity_Id := Etype (N);
Result : Node_Id;
Left : Node_Id;
Right : Node_Id;
-- First and Last attribute reference nodes, which end up as left and
-- right operands of the optimized result.
Is_Zero : Boolean;
-- True for comparison operand of zero
Maybe_Superflat : Boolean;
-- True if we may be in the dynamic superflat case, i.e. Is_Zero is set
-- to false but the comparison operand can be zero at run time. In this
-- case, we normally cannot do anything because the canonical formula of
-- the length is not valid, but there is one exception: when the operand
-- is itself the length of an array with the same bounds as the array on
-- the LHS, we can entirely optimize away the comparison.
Comp : Node_Id;
-- Comparison operand, set only if Is_Zero is false
Ent : array (Pos range 1 .. 2) of Entity_Id := (Empty, Empty);
-- Entities whose length is being compared
Index : array (Pos range 1 .. 2) of Node_Id := (Empty, Empty);
-- Integer_Literal nodes for length attribute expressions, or Empty
-- if there is no such expression present.
Op : Node_Kind := Nkind (N);
-- Kind of comparison operator, gets flipped if operands backwards
function Convert_To_Long_Long_Integer (N : Node_Id) return Node_Id;
-- Given a discrete expression, returns a Long_Long_Integer typed
-- expression representing the underlying value of the expression.
-- This is done with an unchecked conversion to Long_Long_Integer.
-- We use unchecked conversion to handle the enumeration type case.
function Is_Entity_Length (N : Node_Id; Num : Pos) return Boolean;
-- Tests if N is a length attribute applied to a simple entity. If so,
-- returns True, and sets Ent to the entity, and Index to the integer
-- literal provided as an attribute expression, or to Empty if none.
-- Num is the index designating the relevant slot in Ent and Index.
-- Also returns True if the expression is a generated type conversion
-- whose expression is of the desired form. This latter case arises
-- when Apply_Universal_Integer_Attribute_Check installs a conversion
-- to check for being in range, which is not needed in this context.
-- Returns False if neither condition holds.
function Is_Optimizable (N : Node_Id) return Boolean;
-- Tests N to see if it is an optimizable comparison value (defined as
-- constant zero or one, or something else where the value is known to
-- be nonnegative and in the 32-bit range and where the corresponding
-- Length value is also known to be 32 bits). If result is true, sets
-- Is_Zero, Maybe_Superflat and Comp accordingly.
procedure Rewrite_For_Equal_Lengths;
-- Rewrite the comparison of two equal lengths into either True or False
----------------------------------
-- Convert_To_Long_Long_Integer --
----------------------------------
function Convert_To_Long_Long_Integer (N : Node_Id) return Node_Id is
begin
return Unchecked_Convert_To (Standard_Long_Long_Integer, N);
end Convert_To_Long_Long_Integer;
----------------------
-- Is_Entity_Length --
----------------------
function Is_Entity_Length (N : Node_Id; Num : Pos) return Boolean is
begin
if Nkind (N) = N_Attribute_Reference
and then Attribute_Name (N) = Name_Length
and then Is_Entity_Name (Prefix (N))
then
Ent (Num) := Entity (Prefix (N));
if Present (Expressions (N)) then
Index (Num) := First (Expressions (N));
else
Index (Num) := Empty;
end if;
return True;
elsif Nkind (N) = N_Type_Conversion
and then not Comes_From_Source (N)
then
return Is_Entity_Length (Expression (N), Num);
else
return False;
end if;
end Is_Entity_Length;
--------------------
-- Is_Optimizable --
--------------------
function Is_Optimizable (N : Node_Id) return Boolean is
Val : Uint;
OK : Boolean;
Lo : Uint;
Hi : Uint;
Indx : Node_Id;
Dbl : Boolean;
Ityp : Entity_Id;
begin
if Compile_Time_Known_Value (N) then
Val := Expr_Value (N);
if Val = Uint_0 then
Is_Zero := True;
Maybe_Superflat := False;
Comp := Empty;
return True;
elsif Val = Uint_1 then
Is_Zero := False;
Maybe_Superflat := False;
Comp := Empty;
return True;
end if;
end if;
-- Here we have to make sure of being within a 32-bit range (take the
-- full unsigned range so the length of 32-bit arrays is accepted).
Determine_Range (N, OK, Lo, Hi, Assume_Valid => True);
if not OK
or else Lo < Uint_0
or else Hi > Uint_2 ** 32
then
return False;
end if;
Maybe_Superflat := (Lo = Uint_0);
-- Tests if N is also a length attribute applied to a simple entity
Dbl := Is_Entity_Length (N, 2);
-- We can deal with the superflat case only if N is also a length
if Maybe_Superflat and then not Dbl then
return False;
end if;
-- Comparison value was within range, so now we must check the index
-- value to make sure it is also within 32 bits.
for K in Pos range 1 .. 2 loop
Indx := First_Index (Etype (Ent (K)));
if Present (Index (K)) then
for J in 2 .. UI_To_Int (Intval (Index (K))) loop
Next_Index (Indx);
end loop;
end if;
Ityp := Etype (Indx);
if Esize (Ityp) > 32 then
return False;
end if;
exit when not Dbl;
end loop;
Is_Zero := False;
Comp := N;
return True;
end Is_Optimizable;
-------------------------------
-- Rewrite_For_Equal_Lengths --
-------------------------------
procedure Rewrite_For_Equal_Lengths is
begin
case Op is
when N_Op_Eq
| N_Op_Ge
| N_Op_Le
=>
Rewrite (N,
Convert_To (Typ,
New_Occurrence_Of (Standard_True, Sloc (N))));
when N_Op_Ne
| N_Op_Gt
| N_Op_Lt
=>
Rewrite (N,
Convert_To (Typ,
New_Occurrence_Of (Standard_False, Sloc (N))));
when others =>
raise Program_Error;
end case;
Analyze_And_Resolve (N, Typ);
end Rewrite_For_Equal_Lengths;
-- Start of processing for Optimize_Length_Comparison
begin
-- Nothing to do if not a comparison
if Op not in N_Op_Compare then
return;
end if;
-- Nothing to do if special -gnatd.P debug flag set.
if Debug_Flag_Dot_PP then
return;
end if;
-- Ent'Length op 0/1
if Is_Entity_Length (Left_Opnd (N), 1)
and then Is_Optimizable (Right_Opnd (N))
then
null;
-- 0/1 op Ent'Length
elsif Is_Entity_Length (Right_Opnd (N), 1)
and then Is_Optimizable (Left_Opnd (N))
then
-- Flip comparison to opposite sense
case Op is
when N_Op_Lt => Op := N_Op_Gt;
when N_Op_Le => Op := N_Op_Ge;
when N_Op_Gt => Op := N_Op_Lt;
when N_Op_Ge => Op := N_Op_Le;
when others => null;
end case;
-- Else optimization not possible
else
return;
end if;
-- Fall through if we will do the optimization
-- Cases to handle:
-- X'Length = 0 => X'First > X'Last
-- X'Length = 1 => X'First = X'Last
-- X'Length = n => X'First + (n - 1) = X'Last
-- X'Length /= 0 => X'First <= X'Last
-- X'Length /= 1 => X'First /= X'Last
-- X'Length /= n => X'First + (n - 1) /= X'Last
-- X'Length >= 0 => always true, warn
-- X'Length >= 1 => X'First <= X'Last
-- X'Length >= n => X'First + (n - 1) <= X'Last
-- X'Length > 0 => X'First <= X'Last
-- X'Length > 1 => X'First < X'Last
-- X'Length > n => X'First + (n - 1) < X'Last
-- X'Length <= 0 => X'First > X'Last (warn, could be =)
-- X'Length <= 1 => X'First >= X'Last
-- X'Length <= n => X'First + (n - 1) >= X'Last
-- X'Length < 0 => always false (warn)
-- X'Length < 1 => X'First > X'Last
-- X'Length < n => X'First + (n - 1) > X'Last
-- Note: for the cases of n (not constant 0,1), we require that the
-- corresponding index type be integer or shorter (i.e. not 64-bit),
-- and the same for the comparison value. Then we do the comparison
-- using 64-bit arithmetic (actually long long integer), so that we
-- cannot have overflow intefering with the result.
-- First deal with warning cases
if Is_Zero then
case Op is
-- X'Length >= 0
when N_Op_Ge =>
Rewrite (N,
Convert_To (Typ, New_Occurrence_Of (Standard_True, Loc)));
Analyze_And_Resolve (N, Typ);
Warn_On_Known_Condition (N);
return;
-- X'Length < 0
when N_Op_Lt =>
Rewrite (N,
Convert_To (Typ, New_Occurrence_Of (Standard_False, Loc)));
Analyze_And_Resolve (N, Typ);
Warn_On_Known_Condition (N);
return;
when N_Op_Le =>
if Constant_Condition_Warnings
and then Comes_From_Source (Original_Node (N))
then
Error_Msg_N ("could replace by ""'=""?c?", N);
end if;
Op := N_Op_Eq;
when others =>
null;
end case;
end if;
-- Build the First reference we will use
Left :=
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Ent (1), Loc),
Attribute_Name => Name_First);
if Present (Index (1)) then
Set_Expressions (Left, New_List (New_Copy (Index (1))));
end if;
-- Build the Last reference we will use
Right :=
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Ent (1), Loc),
Attribute_Name => Name_Last);
if Present (Index (1)) then
Set_Expressions (Right, New_List (New_Copy (Index (1))));
end if;
-- If general value case, then do the addition of (n - 1), and
-- also add the needed conversions to type Long_Long_Integer.
-- If n = Y'Length, we rewrite X'First + (n - 1) op X'Last into:
-- Y'Last + (X'First - Y'First) op X'Last
-- in the hope that X'First - Y'First can be computed statically.
if Present (Comp) then
if Present (Ent (2)) then
declare
Y_First : constant Node_Id :=
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Ent (2), Loc),
Attribute_Name => Name_First);
Y_Last : constant Node_Id :=
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Ent (2), Loc),
Attribute_Name => Name_Last);
R : Compare_Result;
begin
if Present (Index (2)) then
Set_Expressions (Y_First, New_List (New_Copy (Index (2))));
Set_Expressions (Y_Last, New_List (New_Copy (Index (2))));
end if;
Analyze (Left);
Analyze (Y_First);
-- If X'First = Y'First, simplify the above formula into a
-- direct comparison of Y'Last and X'Last.
R := Compile_Time_Compare (Left, Y_First, Assume_Valid => True);
if R = EQ then
Analyze (Right);
Analyze (Y_Last);
R := Compile_Time_Compare
(Right, Y_Last, Assume_Valid => True);
-- If the pairs of attributes are equal, we are done
if R = EQ then
Rewrite_For_Equal_Lengths;
return;
end if;
-- If the base types are different, convert both operands to
-- Long_Long_Integer, else compare them directly.
if Base_Type (Etype (Right)) /= Base_Type (Etype (Y_Last))
then
Left := Convert_To_Long_Long_Integer (Y_Last);
else
Left := Y_Last;
Comp := Empty;
end if;
-- Otherwise, use the above formula as-is
else
Left :=
Make_Op_Add (Loc,
Left_Opnd =>
Convert_To_Long_Long_Integer (Y_Last),
Right_Opnd =>
Make_Op_Subtract (Loc,
Left_Opnd =>
Convert_To_Long_Long_Integer (Left),
Right_Opnd =>
Convert_To_Long_Long_Integer (Y_First)));
end if;
end;
-- General value case
else
Left :=
Make_Op_Add (Loc,
Left_Opnd => Convert_To_Long_Long_Integer (Left),
Right_Opnd =>
Make_Op_Subtract (Loc,
Left_Opnd => Convert_To_Long_Long_Integer (Comp),
Right_Opnd => Make_Integer_Literal (Loc, 1)));
end if;
end if;
-- We cannot do anything in the superflat case past this point
if Maybe_Superflat then
return;
end if;
-- If general operand, convert Last reference to Long_Long_Integer
if Present (Comp) then
Right := Convert_To_Long_Long_Integer (Right);
end if;
-- Check for cases to optimize
-- X'Length = 0 => X'First > X'Last
-- X'Length < 1 => X'First > X'Last
-- X'Length < n => X'First + (n - 1) > X'Last
if (Is_Zero and then Op = N_Op_Eq)
or else (not Is_Zero and then Op = N_Op_Lt)
then
Result :=
Make_Op_Gt (Loc,
Left_Opnd => Left,
Right_Opnd => Right);
-- X'Length = 1 => X'First = X'Last
-- X'Length = n => X'First + (n - 1) = X'Last
elsif not Is_Zero and then Op = N_Op_Eq then
Result :=
Make_Op_Eq (Loc,
Left_Opnd => Left,
Right_Opnd => Right);
-- X'Length /= 0 => X'First <= X'Last
-- X'Length > 0 => X'First <= X'Last
elsif Is_Zero and (Op = N_Op_Ne or else Op = N_Op_Gt) then
Result :=
Make_Op_Le (Loc,
Left_Opnd => Left,
Right_Opnd => Right);
-- X'Length /= 1 => X'First /= X'Last
-- X'Length /= n => X'First + (n - 1) /= X'Last
elsif not Is_Zero and then Op = N_Op_Ne then
Result :=
Make_Op_Ne (Loc,
Left_Opnd => Left,
Right_Opnd => Right);
-- X'Length >= 1 => X'First <= X'Last
-- X'Length >= n => X'First + (n - 1) <= X'Last
elsif not Is_Zero and then Op = N_Op_Ge then
Result :=
Make_Op_Le (Loc,
Left_Opnd => Left,
Right_Opnd => Right);
-- X'Length > 1 => X'First < X'Last
-- X'Length > n => X'First + (n = 1) < X'Last
elsif not Is_Zero and then Op = N_Op_Gt then
Result :=
Make_Op_Lt (Loc,
Left_Opnd => Left,
Right_Opnd => Right);
-- X'Length <= 1 => X'First >= X'Last
-- X'Length <= n => X'First + (n - 1) >= X'Last
elsif not Is_Zero and then Op = N_Op_Le then
Result :=
Make_Op_Ge (Loc,
Left_Opnd => Left,
Right_Opnd => Right);
-- Should not happen at this stage
else
raise Program_Error;
end if;
-- Rewrite and finish up (we can suppress overflow checks, see above)
Rewrite (N, Result);
Analyze_And_Resolve (N, Typ, Suppress => Overflow_Check);
end Optimize_Length_Comparison;
--------------------------------
-- Process_If_Case_Statements --
--------------------------------
procedure Process_If_Case_Statements (N : Node_Id; Stmts : List_Id) is
Decl : Node_Id;
begin
Decl := First (Stmts);
while Present (Decl) loop
if Nkind (Decl) = N_Object_Declaration
and then Is_Finalizable_Transient (Decl, N)
then
Process_Transient_In_Expression (Decl, N, Stmts);
end if;
Next (Decl);
end loop;
end Process_If_Case_Statements;
-------------------------------------
-- Process_Transient_In_Expression --
-------------------------------------
procedure Process_Transient_In_Expression
(Obj_Decl : Node_Id;
Expr : Node_Id;
Stmts : List_Id)
is
Loc : constant Source_Ptr := Sloc (Obj_Decl);
Obj_Id : constant Entity_Id := Defining_Identifier (Obj_Decl);
Hook_Context : constant Node_Id := Find_Hook_Context (Expr);
-- The node on which to insert the hook as an action. This is usually
-- the innermost enclosing non-transient construct.
Fin_Call : Node_Id;
Hook_Assign : Node_Id;
Hook_Clear : Node_Id;
Hook_Decl : Node_Id;
Hook_Insert : Node_Id;
Ptr_Decl : Node_Id;
Fin_Context : Node_Id;
-- The node after which to insert the finalization actions of the
-- transient object.
begin
pragma Assert (Nkind (Expr) in N_Case_Expression
| N_Expression_With_Actions
| N_If_Expression);
-- When the context is a Boolean evaluation, all three nodes capture the
-- result of their computation in a local temporary:
-- do
-- Trans_Id : Ctrl_Typ := ...;
-- Result : constant Boolean := ... Trans_Id ...;
-- <finalize Trans_Id>
-- in Result end;
-- As a result, the finalization of any transient objects can safely
-- take place after the result capture.
-- ??? could this be extended to elementary types?
if Is_Boolean_Type (Etype (Expr)) then
Fin_Context := Last (Stmts);
-- Otherwise the immediate context may not be safe enough to carry
-- out transient object finalization due to aliasing and nesting of
-- constructs. Insert calls to [Deep_]Finalize after the innermost
-- enclosing non-transient construct.
else
Fin_Context := Hook_Context;
end if;
-- Mark the transient object as successfully processed to avoid double
-- finalization.
Set_Is_Finalized_Transient (Obj_Id);
-- Construct all the pieces necessary to hook and finalize a transient
-- object.
Build_Transient_Object_Statements
(Obj_Decl => Obj_Decl,
Fin_Call => Fin_Call,
Hook_Assign => Hook_Assign,
Hook_Clear => Hook_Clear,
Hook_Decl => Hook_Decl,
Ptr_Decl => Ptr_Decl,
Finalize_Obj => False);
-- Add the access type which provides a reference to the transient
-- object. Generate:
-- type Ptr_Typ is access all Desig_Typ;
Insert_Action (Hook_Context, Ptr_Decl);
-- Add the temporary which acts as a hook to the transient object.
-- Generate:
-- Hook : Ptr_Id := null;
Insert_Action (Hook_Context, Hook_Decl);
-- When the transient object is initialized by an aggregate, the hook
-- must capture the object after the last aggregate assignment takes
-- place. Only then is the object considered initialized. Generate:
-- Hook := Ptr_Typ (Obj_Id);
-- <or>
-- Hook := Obj_Id'Unrestricted_Access;
if Ekind (Obj_Id) in E_Constant | E_Variable
and then Present (Last_Aggregate_Assignment (Obj_Id))
then
Hook_Insert := Last_Aggregate_Assignment (Obj_Id);
-- Otherwise the hook seizes the related object immediately
else
Hook_Insert := Obj_Decl;
end if;
Insert_After_And_Analyze (Hook_Insert, Hook_Assign);
-- When the node is part of a return statement, there is no need to
-- insert a finalization call, as the general finalization mechanism
-- (see Build_Finalizer) would take care of the transient object on
-- subprogram exit. Note that it would also be impossible to insert the
-- finalization code after the return statement as this will render it
-- unreachable.
if Nkind (Fin_Context) = N_Simple_Return_Statement then
null;
-- Finalize the hook after the context has been evaluated. Generate:
-- if Hook /= null then
-- [Deep_]Finalize (Hook.all);
-- Hook := null;
-- end if;
-- Note that the value returned by Find_Hook_Context may be an operator
-- node, which is not a list member. We must locate the proper node in
-- in the tree after which to insert the finalization code.
else
while not Is_List_Member (Fin_Context) loop
Fin_Context := Parent (Fin_Context);
end loop;
pragma Assert (Present (Fin_Context));
Insert_Action_After (Fin_Context,
Make_Implicit_If_Statement (Obj_Decl,
Condition =>
Make_Op_Ne (Loc,
Left_Opnd =>
New_Occurrence_Of (Defining_Entity (Hook_Decl), Loc),
Right_Opnd => Make_Null (Loc)),
Then_Statements => New_List (
Fin_Call,
Hook_Clear)));
end if;
end Process_Transient_In_Expression;
------------------------
-- Rewrite_Comparison --
------------------------
procedure Rewrite_Comparison (N : Node_Id) is
Typ : constant Entity_Id := Etype (N);
False_Result : Boolean;
True_Result : Boolean;
begin
if Nkind (N) = N_Type_Conversion then
Rewrite_Comparison (Expression (N));
return;
elsif Nkind (N) not in N_Op_Compare then
return;
end if;
-- If both operands are static, then the comparison has been already
-- folded in evaluation.
pragma Assert
(not Is_Static_Expression (Left_Opnd (N))
or else
not Is_Static_Expression (Right_Opnd (N)));
-- Determine the potential outcome of the comparison assuming that the
-- operands are valid and emit a warning when the comparison evaluates
-- to True or False only in the presence of invalid values.
Warn_On_Constant_Valid_Condition (N);
-- Determine the potential outcome of the comparison assuming that the
-- operands are not valid.
Test_Comparison
(Op => N,
Assume_Valid => False,
True_Result => True_Result,
False_Result => False_Result);
-- The outcome is a decisive False or True, rewrite the operator into a
-- non-static literal.
if False_Result or True_Result then
Rewrite (N,
Convert_To (Typ,
New_Occurrence_Of (Boolean_Literals (True_Result), Sloc (N))));
Analyze_And_Resolve (N, Typ);
Set_Is_Static_Expression (N, False);
Warn_On_Known_Condition (N);
end if;
end Rewrite_Comparison;
----------------------------
-- Safe_In_Place_Array_Op --
----------------------------
function Safe_In_Place_Array_Op
(Lhs : Node_Id;
Op1 : Node_Id;
Op2 : Node_Id) return Boolean
is
Target : Entity_Id;
function Is_Safe_Operand (Op : Node_Id) return Boolean;
-- Operand is safe if it cannot overlap part of the target of the
-- operation. If the operand and the target are identical, the operand
-- is safe. The operand can be empty in the case of negation.
function Is_Unaliased (N : Node_Id) return Boolean;
-- Check that N is a stand-alone entity
------------------
-- Is_Unaliased --
------------------
function Is_Unaliased (N : Node_Id) return Boolean is
begin
return
Is_Entity_Name (N)
and then No (Address_Clause (Entity (N)))
and then No (Renamed_Object (Entity (N)));
end Is_Unaliased;
---------------------
-- Is_Safe_Operand --
---------------------
function Is_Safe_Operand (Op : Node_Id) return Boolean is
begin
if No (Op) then
return True;
elsif Is_Entity_Name (Op) then
return Is_Unaliased (Op);
elsif Nkind (Op) in N_Indexed_Component | N_Selected_Component then
return Is_Unaliased (Prefix (Op));
elsif Nkind (Op) = N_Slice then
return
Is_Unaliased (Prefix (Op))
and then Entity (Prefix (Op)) /= Target;
elsif Nkind (Op) = N_Op_Not then
return Is_Safe_Operand (Right_Opnd (Op));
else
return False;
end if;
end Is_Safe_Operand;
-- Start of processing for Safe_In_Place_Array_Op
begin
-- Skip this processing if the component size is different from system
-- storage unit (since at least for NOT this would cause problems).
if Component_Size (Etype (Lhs)) /= System_Storage_Unit then
return False;
-- Cannot do in place stuff if non-standard Boolean representation
elsif Has_Non_Standard_Rep (Component_Type (Etype (Lhs))) then
return False;
elsif not Is_Unaliased (Lhs) then
return False;
else
Target := Entity (Lhs);
return Is_Safe_Operand (Op1) and then Is_Safe_Operand (Op2);
end if;
end Safe_In_Place_Array_Op;
-----------------------
-- Tagged_Membership --
-----------------------
-- There are two different cases to consider depending on whether the right
-- operand is a class-wide type or not. If not we just compare the actual
-- tag of the left expr to the target type tag:
--
-- Left_Expr.Tag = Right_Type'Tag;
--
-- If it is a class-wide type we use the RT function CW_Membership which is
-- usually implemented by looking in the ancestor tables contained in the
-- dispatch table pointed by Left_Expr.Tag for Typ'Tag
-- In both cases if Left_Expr is an access type, we first check whether it
-- is null.
-- Ada 2005 (AI-251): If it is a class-wide interface type we use the RT
-- function IW_Membership which is usually implemented by looking in the
-- table of abstract interface types plus the ancestor table contained in
-- the dispatch table pointed by Left_Expr.Tag for Typ'Tag
procedure Tagged_Membership
(N : Node_Id;
SCIL_Node : out Node_Id;
Result : out Node_Id)
is
Left : constant Node_Id := Left_Opnd (N);
Right : constant Node_Id := Right_Opnd (N);
Loc : constant Source_Ptr := Sloc (N);
-- Handle entities from the limited view
Orig_Right_Type : constant Entity_Id := Available_View (Etype (Right));
Full_R_Typ : Entity_Id;
Left_Type : Entity_Id := Available_View (Etype (Left));
Right_Type : Entity_Id := Orig_Right_Type;
Obj_Tag : Node_Id;
begin
SCIL_Node := Empty;
-- We have to examine the corresponding record type when dealing with
-- protected types instead of the original, unexpanded, type.
if Ekind (Right_Type) = E_Protected_Type then
Right_Type := Corresponding_Record_Type (Right_Type);
end if;
if Ekind (Left_Type) = E_Protected_Type then
Left_Type := Corresponding_Record_Type (Left_Type);
end if;
-- In the case where the type is an access type, the test is applied
-- using the designated types (needed in Ada 2012 for implicit anonymous
-- access conversions, for AI05-0149).
if Is_Access_Type (Right_Type) then
Left_Type := Designated_Type (Left_Type);
Right_Type := Designated_Type (Right_Type);
end if;
if Is_Class_Wide_Type (Left_Type) then
Left_Type := Root_Type (Left_Type);
end if;
if Is_Class_Wide_Type (Right_Type) then
Full_R_Typ := Underlying_Type (Root_Type (Right_Type));
else
Full_R_Typ := Underlying_Type (Right_Type);
end if;
Obj_Tag :=
Make_Selected_Component (Loc,
Prefix => Relocate_Node (Left),
Selector_Name =>
New_Occurrence_Of (First_Tag_Component (Left_Type), Loc));
if Is_Class_Wide_Type (Right_Type) then
-- No need to issue a run-time check if we statically know that the
-- result of this membership test is always true. For example,
-- considering the following declarations:
-- type Iface is interface;
-- type T is tagged null record;
-- type DT is new T and Iface with null record;
-- Obj1 : T;
-- Obj2 : DT;
-- These membership tests are always true:
-- Obj1 in T'Class
-- Obj2 in T'Class;
-- Obj2 in Iface'Class;
-- We do not need to handle cases where the membership is illegal.
-- For example:
-- Obj1 in DT'Class; -- Compile time error
-- Obj1 in Iface'Class; -- Compile time error
if not Is_Interface (Left_Type)
and then not Is_Class_Wide_Type (Left_Type)
and then (Is_Ancestor (Etype (Right_Type), Left_Type,
Use_Full_View => True)
or else (Is_Interface (Etype (Right_Type))
and then Interface_Present_In_Ancestor
(Typ => Left_Type,
Iface => Etype (Right_Type))))
then
Result := New_Occurrence_Of (Standard_True, Loc);
return;
end if;
-- Ada 2005 (AI-251): Class-wide applied to interfaces
if Is_Interface (Etype (Class_Wide_Type (Right_Type)))
-- Support to: "Iface_CW_Typ in Typ'Class"
or else Is_Interface (Left_Type)
then
-- Issue error if IW_Membership operation not available in a
-- configurable run-time setting.
if not RTE_Available (RE_IW_Membership) then
Error_Msg_CRT
("dynamic membership test on interface types", N);
Result := Empty;
return;
end if;
Result :=
Make_Function_Call (Loc,
Name => New_Occurrence_Of (RTE (RE_IW_Membership), Loc),
Parameter_Associations => New_List (
Make_Attribute_Reference (Loc,
Prefix => Obj_Tag,
Attribute_Name => Name_Address),
New_Occurrence_Of (
Node (First_Elmt (Access_Disp_Table (Full_R_Typ))),
Loc)));
-- Ada 95: Normal case
else
-- Issue error if CW_Membership operation not available in a
-- configurable run-time setting.
if not RTE_Available (RE_CW_Membership) then
Error_Msg_CRT
("dynamic membership test on tagged types", N);
Result := Empty;
return;
end if;
Result :=
Make_Function_Call (Loc,
Name => New_Occurrence_Of (RTE (RE_CW_Membership), Loc),
Parameter_Associations => New_List (
Obj_Tag,
New_Occurrence_Of (
Node (First_Elmt (Access_Disp_Table (Full_R_Typ))),
Loc)));
-- Generate the SCIL node for this class-wide membership test.
if Generate_SCIL then
SCIL_Node := Make_SCIL_Membership_Test (Sloc (N));
Set_SCIL_Entity (SCIL_Node, Etype (Right_Type));
Set_SCIL_Tag_Value (SCIL_Node, Obj_Tag);
end if;
end if;
-- Right_Type is not a class-wide type
else
-- No need to check the tag of the object if Right_Typ is abstract
if Is_Abstract_Type (Right_Type) then
Result := New_Occurrence_Of (Standard_False, Loc);
else
Result :=
Make_Op_Eq (Loc,
Left_Opnd => Obj_Tag,
Right_Opnd =>
New_Occurrence_Of
(Node (First_Elmt (Access_Disp_Table (Full_R_Typ))), Loc));
end if;
end if;
-- if Left is an access object then generate test of the form:
-- * if Right_Type excludes null: Left /= null and then ...
-- * if Right_Type includes null: Left = null or else ...
if Is_Access_Type (Orig_Right_Type) then
if Can_Never_Be_Null (Orig_Right_Type) then
Result := Make_And_Then (Loc,
Left_Opnd =>
Make_Op_Ne (Loc,
Left_Opnd => Left,
Right_Opnd => Make_Null (Loc)),
Right_Opnd => Result);
else
Result := Make_Or_Else (Loc,
Left_Opnd =>
Make_Op_Eq (Loc,
Left_Opnd => Left,
Right_Opnd => Make_Null (Loc)),
Right_Opnd => Result);
end if;
end if;
end Tagged_Membership;
------------------------------
-- Unary_Op_Validity_Checks --
------------------------------
procedure Unary_Op_Validity_Checks (N : Node_Id) is
begin
if Validity_Checks_On and Validity_Check_Operands then
Ensure_Valid (Right_Opnd (N));
end if;
end Unary_Op_Validity_Checks;
end Exp_Ch4;
|
micahwelf/FLTK-Ada | Ada | 3,141 | adb |
with
Interfaces.C,
System;
use type
System.Address;
package body FLTK.Widgets.Buttons.Radio is
procedure radio_button_set_draw_hook
(W, D : in System.Address);
pragma Import (C, radio_button_set_draw_hook, "radio_button_set_draw_hook");
pragma Inline (radio_button_set_draw_hook);
procedure radio_button_set_handle_hook
(W, H : in System.Address);
pragma Import (C, radio_button_set_handle_hook, "radio_button_set_handle_hook");
pragma Inline (radio_button_set_handle_hook);
function new_fl_radio_button
(X, Y, W, H : in Interfaces.C.int;
Text : in Interfaces.C.char_array)
return System.Address;
pragma Import (C, new_fl_radio_button, "new_fl_radio_button");
pragma Inline (new_fl_radio_button);
procedure free_fl_radio_button
(B : in System.Address);
pragma Import (C, free_fl_radio_button, "free_fl_radio_button");
pragma Inline (free_fl_radio_button);
procedure fl_radio_button_draw
(W : in System.Address);
pragma Import (C, fl_radio_button_draw, "fl_radio_button_draw");
pragma Inline (fl_radio_button_draw);
function fl_radio_button_handle
(W : in System.Address;
E : in Interfaces.C.int)
return Interfaces.C.int;
pragma Import (C, fl_radio_button_handle, "fl_radio_button_handle");
pragma Inline (fl_radio_button_handle);
procedure Finalize
(This : in out Radio_Button) is
begin
if This.Void_Ptr /= System.Null_Address and then
This in Radio_Button'Class
then
free_fl_radio_button (This.Void_Ptr);
This.Void_Ptr := System.Null_Address;
end if;
Finalize (Button (This));
end Finalize;
package body Forge is
function Create
(X, Y, W, H : in Integer;
Text : in String)
return Radio_Button is
begin
return This : Radio_Button do
This.Void_Ptr := new_fl_radio_button
(Interfaces.C.int (X),
Interfaces.C.int (Y),
Interfaces.C.int (W),
Interfaces.C.int (H),
Interfaces.C.To_C (Text));
fl_widget_set_user_data
(This.Void_Ptr,
Widget_Convert.To_Address (This'Unchecked_Access));
radio_button_set_draw_hook (This.Void_Ptr, Draw_Hook'Address);
radio_button_set_handle_hook (This.Void_Ptr, Handle_Hook'Address);
end return;
end Create;
end Forge;
procedure Draw
(This : in out Radio_Button) is
begin
fl_radio_button_draw (This.Void_Ptr);
end Draw;
function Handle
(This : in out Radio_Button;
Event : in Event_Kind)
return Event_Outcome is
begin
return Event_Outcome'Val
(fl_radio_button_handle (This.Void_Ptr, Event_Kind'Pos (Event)));
end Handle;
end FLTK.Widgets.Buttons.Radio;
|
reznikmm/matreshka | Ada | 4,767 | 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.Slots.Collections is
pragma Preelaborate;
package UML_Slot_Collections is
new AMF.Generic_Collections
(UML_Slot,
UML_Slot_Access);
type Set_Of_UML_Slot is
new UML_Slot_Collections.Set with null record;
Empty_Set_Of_UML_Slot : constant Set_Of_UML_Slot;
type Ordered_Set_Of_UML_Slot is
new UML_Slot_Collections.Ordered_Set with null record;
Empty_Ordered_Set_Of_UML_Slot : constant Ordered_Set_Of_UML_Slot;
type Bag_Of_UML_Slot is
new UML_Slot_Collections.Bag with null record;
Empty_Bag_Of_UML_Slot : constant Bag_Of_UML_Slot;
type Sequence_Of_UML_Slot is
new UML_Slot_Collections.Sequence with null record;
Empty_Sequence_Of_UML_Slot : constant Sequence_Of_UML_Slot;
private
Empty_Set_Of_UML_Slot : constant Set_Of_UML_Slot
:= (UML_Slot_Collections.Set with null record);
Empty_Ordered_Set_Of_UML_Slot : constant Ordered_Set_Of_UML_Slot
:= (UML_Slot_Collections.Ordered_Set with null record);
Empty_Bag_Of_UML_Slot : constant Bag_Of_UML_Slot
:= (UML_Slot_Collections.Bag with null record);
Empty_Sequence_Of_UML_Slot : constant Sequence_Of_UML_Slot
:= (UML_Slot_Collections.Sequence with null record);
end AMF.UML.Slots.Collections;
|
AdaCore/libadalang | Ada | 59 | ads | with Bar;
package Foo is
pragma Test (Bar.I);
end Foo;
|
melwyncarlo/ProjectEuler | Ada | 3,274 | adb | with Ada.Strings.Fixed;
with Ada.Integer_Text_IO;
-- Copyright 2021 Melwyn Francis Carlo
procedure A033 is
use Ada.Strings.Fixed;
use Ada.Integer_Text_IO;
Products_List : array (Integer range 1 .. 4, 1 .. 2) of Integer;
Value_1, Value_2 : Float;
Count_Val : Integer := 1;
Reduced : Boolean;
I, Temp_Num_11, Temp_Num_12, Temp_Num_21,
Temp_Num_22, Temp_Num_3, Temp_Num_4 : Integer;
begin
for I in 10 .. 50 loop
for J in 10 .. 99 loop
if I >= J or (I mod 10) = 0 or (J mod 10) = 0 then
goto Continue;
end if;
Temp_Num_11 := Character'Pos (Trim (Integer'Image (I),
Ada.Strings.Both) (1)) - Character'Pos ('0');
Temp_Num_12 := Character'Pos (Trim (Integer'Image (I),
Ada.Strings.Both) (2)) - Character'Pos ('0');
Temp_Num_21 := Character'Pos (Trim (Integer'Image (J),
Ada.Strings.Both) (1)) - Character'Pos ('0');
Temp_Num_22 := Character'Pos (Trim (Integer'Image (J),
Ada.Strings.Both) (2)) - Character'Pos ('0');
Temp_Num_3 := 99999;
Temp_Num_4 := 99999;
if Temp_Num_11 = Temp_Num_21 and Temp_Num_12 /= Temp_Num_22 then
Temp_Num_3 := Temp_Num_12;
Temp_Num_4 := Temp_Num_22;
elsif Temp_Num_11 = Temp_Num_22 and Temp_Num_12 /= Temp_Num_21 then
Temp_Num_3 := Temp_Num_12;
Temp_Num_4 := Temp_Num_21;
elsif Temp_Num_12 = Temp_Num_21 and Temp_Num_11 /= Temp_Num_22 then
Temp_Num_3 := Temp_Num_11;
Temp_Num_4 := Temp_Num_22;
elsif Temp_Num_12 = Temp_Num_22 and Temp_Num_11 /= Temp_Num_21 then
Temp_Num_3 := Temp_Num_11;
Temp_Num_4 := Temp_Num_21;
end if;
if Temp_Num_3 /= 99999 then
Value_1 := (Float'Floor (Float (I) * 1.0E5 / Float (J))) / 1.0E5;
Value_2 := (Float'Floor (Float (Temp_Num_3) * 1.0E5 /
Float (Temp_Num_4))) / 1.0E5;
if (Value_1 - Value_2) < 1.0E-5
and (Value_1 - Value_2) > -1.0E-5
then
Products_List (Count_Val, 1) := I;
Products_List (Count_Val, 2) := J;
Count_Val := Count_Val + 1;
end if;
end if;
<<Continue>>
end loop;
end loop;
Products_List (1, 1) := Products_List (1, 1) * Products_List (2, 1)
* Products_List (3, 1) * Products_List (4, 1);
Products_List (1, 2) := Products_List (1, 2) * Products_List (2, 2)
* Products_List (3, 2) * Products_List (4, 2);
while Products_List (1, 1) /= 1 and Products_List (1, 2) /= 1 loop
I := 2;
Reduced := False;
while not Reduced loop
if (Products_List (1, 1) mod I) = 0
and (Products_List (1, 2) mod I) = 0
then
Products_List (1, 1) := Products_List (1, 1) / I;
Products_List (1, 2) := Products_List (1, 2) / I;
Reduced := True;
else
I := I + 1;
end if;
end loop;
end loop;
Put (Products_List (1, 2), Width => 0);
end A033;
|
reznikmm/matreshka | Ada | 3,458 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- XML Processor --
-- --
-- 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: 3559 $ $Date: 2012-12-07 13:08:31 +0200 (Пт., 07 дек. 2012) $
------------------------------------------------------------------------------
package XSD_To_Ada is
pragma Pure;
end XSD_To_Ada;
|
leo-brewin/adm-bssn-numerical | Ada | 2,522 | ads | with Ada.Characters.Latin_1;
package Support.Strings is
function str (source : Real; -- the number to print
width : Integer := 10) -- width of the printed number
return string;
function str (source : Integer; -- the number to print
width : Integer := 0) -- width of the printed number
return string;
function str (source : string;
width : integer;
pad : Character := Ada.Characters.Latin_1.NUL) return string;
function str (source : character;
width : integer := 1) return string;
function str (source : in string) return String;
function fill_str (the_num : Integer; -- the number to print
width : Integer; -- width of the printed number
fill_chr : Character := ' ') -- the leading fill character
return String;
function spc (width : integer) return string;
function cut (the_line : string) return string; -- delete (cut) trailing null characters
procedure null_string (source : in out string);
function get_strlen (source : string) return Integer;
procedure set_strlen (source : in out string;
length : Integer);
function make_str (n : Integer;
m : Integer) return String;
procedure readstr (source : string;
target : out integer);
procedure readstr (source : string;
target : out real);
procedure writestr (target : out string;
source : integer);
procedure writestr (target : out string;
source : real);
procedure writestr (target : out string;
source : string);
function centre (the_string : String;
the_length : Integer;
the_offset : Integer := 0) return String;
procedure trim_head (the_string : in out String);
function trim_head (the_string : String) return String;
procedure trim_tail (the_string : in out String);
function trim_tail (the_string : String) return String;
procedure trim (the_string : in out String);
function trim (the_string : String) return String;
function lower_case (source : String) return String;
function upper_case (source : String) return String;
end Support.Strings;
|
Subsets and Splits
No community queries yet
The top public SQL queries from the community will appear here once available.