repo_name
stringlengths
9
74
language
stringclasses
1 value
length_bytes
int64
11
9.34M
extension
stringclasses
2 values
content
stringlengths
11
9.34M
Fabien-Chouteau/GESTE
Ada
313
ads
with Interfaces; package GESTE_Config is type Color_Index is range 0 .. 20; subtype Output_Color is Interfaces.Unsigned_16; Transparent : constant Output_Color := 391; Tile_Size : constant := 16; type Tile_Index is range 0 .. 122; No_Tile : constant Tile_Index := 0; end GESTE_Config;
reznikmm/matreshka
Ada
4,061
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.Office_Conversion_Mode_Attributes; package Matreshka.ODF_Office.Conversion_Mode_Attributes is type Office_Conversion_Mode_Attribute_Node is new Matreshka.ODF_Office.Abstract_Office_Attribute_Node and ODF.DOM.Office_Conversion_Mode_Attributes.ODF_Office_Conversion_Mode_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Office_Conversion_Mode_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Office_Conversion_Mode_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Office.Conversion_Mode_Attributes;
xeenta/learning-ada
Ada
5,536
adb
-- compile with -gnatW8 with Ada.Text_IO; use Ada.Text_IO; with Ada.Wide_Text_IO; with Ada.Integer_Text_IO; use Ada.Integer_Text_IO; with Ada.Strings.Unbounded; procedure Test_Types is type Cows_Counter_Type is new Natural; type Fixed_Point_Type is delta 0.01 range 0.0 .. 1_166_405_539.00; -- decimal fixed point type Money is delta 0.001 digits 15; type Byte is mod 2**8; for Byte'Size use 8; subtype Age_Type is Integer range 0 .. 150; package SU renames Ada.Strings.Unbounded; subtype U_String is SU.Unbounded_String; function Us (S : String) return U_String renames SU.To_Unbounded_String; -- A record type Person is record Name : U_String; Surname : U_String; Age : Age_Type; Married : Boolean; end record; function To_String (P : Person) return String is begin return SU.To_String (P.Name) & " " & Su.To_String (P.Surname) & ", " & Integer'Image (P.Age) & " years old, " & (if P.Married then "married" else "single"); end To_String; -- overload the concat op, just for moo function "&" (L : String; R : Cows_Counter_Type) return String is begin return L & Integer'Image (Integer (R)); end "&"; Cows_In_The_Park : constant Cows_Counter_Type := 0; Newborn_Cows : constant Integer := 1; Huge_Number : constant Long_Integer := Long_Integer'Last; Very_Huge_Number : constant Long_Long_Integer := Long_Long_Integer'First; Normal_Float : constant Float := Float'Last; Big_Float : constant Long_Float := Long_Float'Last; Huge_Float : constant Long_Long_Float := Long_Long_Float'Last; -- ANSI ESC seq for Bold and normal Esc_Char : constant Character := Character'Val (27); Bold_On : constant String := Esc_Char & "[1m"; Fancy_Off : constant String := Esc_Char & "[0m"; -- this is a way to encode a character by its code Strange_Sign : constant Wide_Character := '["A345"]'; -- or we can write it "for real", provided the source code encoding -- matches the one chosen by the compiler... I use UTF-8 and GNAT -- compiler, therefore I've added the -gnatW8 option Greek_Letter : constant Wide_Character := 'α'; -- Also with Wide_Character we can use the attribute-function Val -- to convert the code of a character into the character No_Hiragana : constant Wide_Character := Wide_Character'Val (16#306e#); -- always with the -gnatW8 option, we can write "wide string" -- directly. Hello_String : constant Wide_String := "→Hello← "; -- A second longs a second One_Second : constant Duration := 1.0; T : Duration; -- these are bytes; let's see the wrap-around arithmetic Byte_1 : constant Byte := 254; Byte_2 : constant Byte := Byte_1 + 1; Byte_3 : constant Byte := Byte_2 + 1; Homer_Simpson : constant Person := (Name => Us ("Homer"), Surname => Us ("Simpson"), Age => 54, Married => True); package LI is new Integer_IO (Long_Integer); package LLI is new Integer_IO (Long_Long_Integer); package F is new Float_IO (Float); package FF is new Float_IO (Long_Float); package FFF is new Float_IO (Long_Long_Float); package D is new Fixed_IO (Duration); package M is new Modular_IO (Byte); -- we can also have our special Cow IO package Cow is new Integer_IO (Cows_Counter_Type); package W renames Ada.Wide_Text_IO; begin -- the following won't compile --Cows_In_The_Park := Cows_In_The_Park + Newborn_Cows; Put_Line ("cows in the park: " & Cows_In_The_Park); Cow.Put (Cows_In_The_Park); Put ("; "); Put ("newborn cows: "); Put (Newborn_Cows); New_Line; Put (Integer (Cows_Counter_Type'Last)); New_Line; LI.Put (Huge_Number); New_Line; LLI.Put (Very_Huge_Number); New_Line; Put (Integer'First); Put (Integer'Last); New_Line; Put (Float'Digits); Put (" §§ "); F.Put (Float'First); New_Line; delay One_Second; -- let's waste a second of your time Put (Long_Float'Digits); New_Line; Put (Long_Long_Float'Digits); New_Line; F.Put (Normal_Float); Put (" << Float"); New_Line; FF.Put (Big_Float); Put (" << Long_Float"); New_Line; FFF.Put (Huge_Float); Put (" << Long_Long_Float"); New_Line; Put_Line (Bold_On & "BOLD" & Fancy_Off); W.Put_Line (Hello_String & Greek_Letter & Strange_Sign & No_Hiragana); T := 1.0; while T > 0.01 loop D.Put (T, Aft => 2); delay T; T := T / 2.0; end loop; New_Line; F.Put (Float (Duration'Delta)); New_Line; F.Put (Float (Duration'First)); F.Put (Float (Duration'Last)); New_Line; F.Put (Float (Duration'Small)); New_Line; F.Put (Float (Fixed_Point_Type'Small)); New_Line; F.Put (Float (Money'Small)); New_Line; F.Put (Float (Money'First)); F.Put (Float (Money'Last)); New_Line; M.Put (Byte_1); M.Put (Byte_2); M.Put (Byte_3); New_Line; -- Let's try with a different base; unfortunately, it uses the Ada -- notation, found no way to remove it to write e.g. FF instead of -- 16#FF#. M.Put (Byte_1, Width => 8, Base => 16); M.Put (Byte_2, Width => 8, Base => 16); M.Put (Byte_3, Width => 8, Base => 2); New_Line; Put_Line (To_String (Homer_Simpson)); end Test_Types;
reznikmm/matreshka
Ada
3,403
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2013, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ package ODF.DOM.Elements.Text is end ODF.DOM.Elements.Text;
reznikmm/matreshka
Ada
3,588
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Elements.Generic_Hash; function AMF.DG.Styles.Hash is new AMF.Elements.Generic_Hash (DG_Style, DG_Style_Access);
glencornell/ada-object-framework
Ada
1,457
adb
with Aof.Core.Signals; with Derived_Objects; with Slots; -- This example builds upon the simple signal example where signals -- may be chained ad-infintum. In some circumstances, it may be -- useful to connect one signal to another. This is one way to -- acheive the Delegation GoF design pattern. procedure Chained_Signals is S0 : Aof.Core.Signals.Empty.Signal; begin -- Assign values to each of the objects to distinguish between -- them. Slots.Obj_1.Id := 1; Slots.Obj_2.Id := 2; -- Connecting the slots to the signal as in the first example: S0.Connect(Slots.Xaa'access); S0.Connect(Slots.Xab'access); S0.Connect(Slots.Xac'access); S0.Connect(Slots.Obj_1'Access, Derived_Objects.My_Slot'Access); S0.Connect(Slots.Obj_2'Access, Derived_Objects.My_Slot'Access); -- Connecting the same set of slots in a different order to the -- other signal Slots.Chained_Signal.Connect(Slots.Xac'access); Slots.Chained_Signal.Connect(Slots.Xab'access); Slots.Chained_Signal.Connect(Slots.Obj_2'Access, Derived_Objects.My_Slot'access); Slots.Chained_Signal.Connect(Slots.Xaa'access); Slots.Chained_Signal.Connect(Slots.Obj_1'Access, Derived_Objects.My_Slot'access); -- Connect the signal Chained_Signal to the first signal, as if -- Chained_Signal were a slot: S0.Connect(Signal => Slots.Chained_Signal'access); -- Now emit the signal: S0.Emit; end Chained_Signals;
charlesdaniels/libagar
Ada
443
ads
------------------------------------------------------------------------------ -- AGAR GUI LIBRARY -- -- A G A R -- -- S p e c -- ------------------------------------------------------------------------------ package Agar is pragma Pure (Agar); end Agar;
reznikmm/matreshka
Ada
4,143
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- SQL Database Access -- -- -- -- 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 SQL.Databases.Internals; with Matreshka.Internals.SQL_Drivers.Oracle.Databases; package body Matreshka.Internals.SQL_Drivers.Oracle.Plug_In is ---------- -- Next -- ---------- function Next (Self : Abstract_Plug_In'Class) return access Abstract_Plug_In'Class is begin return Self.Next; end Next; -------------- -- Register -- -------------- procedure Register (Database : in out SQL.Databases.SQL_Database; Plug_In : access Abstract_Plug_In'Class) is Driver : Databases.OCI_Database renames Databases.OCI_Database (SQL.Databases.Internals.Internal (Database).all); begin Plug_In.Next := Driver.Plugins; Driver.Plugins := Plug_In; end Register; end Matreshka.Internals.SQL_Drivers.Oracle.Plug_In;
annexi-strayline/AURA
Ada
5,827
ads
------------------------------------------------------------------------------ -- -- -- Ada User Repository Annex (AURA) -- -- ANNEXI-STRAYLINE Reference Implementation -- -- -- -- Command Line Interface -- -- -- -- ------------------------------------------------------------------------ -- -- -- -- Copyright (C) 2020, ANNEXI-STRAYLINE Trans-Human Ltd. -- -- All rights reserved. -- -- -- -- Original Contributors: -- -- * Richard Wai (ANNEXI-STRAYLINE) -- -- -- -- 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 -- -- 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. -- -- -- ------------------------------------------------------------------------------ -- This package offers a generic tool for scanning the identifiers declare in -- a package specification. -- -- The result is a tree that represents all explicitly declared entities within -- a package specification, as well as their defining name, kind, and any child -- declarations. -- -- The scanner is not strict, and will ignore more than a few syntax and -- legality errors. It is intended that scanner sources will be passing through -- an actual compiler at some later time. with Ada.Strings.Wide_Wide_Unbounded; with Ada.Containers.Multiway_Trees; with Ada_Lexical_Parser; with Registrar.Library_Units; package Specification_Scanner is package WWU renames Ada.Strings.Wide_Wide_Unbounded; use type Registrar.Library_Units.Library_Unit_Kind; Syntax_Error: exception; type Entity_Kind is (Type_Declaration, Subtype_Declaration, Object_Declaration, Number_Declaration, Subprogram_Declaration, Expression_Function_Declaration, Package_Declaration, Exception_Declaration); -- Generally following ARM 3.1 with contractions type Declared_Entity is record Name: WWU.Unbounded_Wide_Wide_String; Kind: Entity_Kind; Is_Generic : Boolean := False; Is_Constant : Boolean := False; Is_Renaming : Boolean := False; Is_Anon_Access: Boolean := False; Subtype_Mark: WWU.Unbounded_Wide_Wide_String; Expression : WWU.Unbounded_Wide_Wide_String; -- Expression does not include the terminating delimiter (;) Renamed_Entity_Name: WWU.Unbounded_Wide_Wide_String; end record; package Declaration_Trees is new Ada.Containers.Multiway_Trees (Declared_Entity); procedure Scan_Package_Spec (Unit : in Registrar.Library_Units.Library_Unit; Unit_Tree: out Declaration_Trees.Tree) with Pre => Unit.Kind = Registrar.Library_Units.Package_Unit; -- This takes a library_unit which shall be a library package. The -- specifcation is scanned, and a declaration tree is returned. -- If the source is malformed, Syntax_Error is raised end Specification_Scanner;
ZinebZaad/ENSEEIHT
Ada
2,162
adb
-- Score PIXAL le 07/10/2020 à 14:33 : 100% with Ada.Text_IO; use Ada.Text_IO; with Ada.Integer_Text_IO; use Ada.Integer_Text_IO; procedure Robot_Type_1 is -- Direction type T_Direction is (NORD, EST, SUD, OUEST); -- Robot type 1 type T_Robot_1 is record Absc: Integer; -- Abscisse du robot Ord: Integer; -- Ordonnée du robot Orientation: T_Direction; -- Orientation du robot end record; -- Environnement: MAX_X: constant Integer := 10; MAX_Y: constant Integer := 10; type T_Environnement is array (-MAX_X..MAX_X, -MAX_Y..MAX_Y) of Boolean; --| Le programme principal |------------------------------------------------ R1: T_Robot_1; -- Robot 1 R2: T_Robot_1; -- Robot 2 E1: T_Environnement; -- L'Environnement begin -- Initialisation de R1 pour que son abscisse soit 4, son ordonnée 2 et sa direction ouest R1 := (Absc => 4, Ord => 2, Orientation => OUEST); -- Initialisation de R2 avec R1 R2 := R1; -- Modification de l'abscisse de R1 pour qu'elle devienne 3 R1.Absc := 3; -- Afficher l'abscisse de R1. La valeur affichée sera 3 Put ("Abscisse de R1 : "); Put (R1.Absc, 1); New_Line; -- Afficher l'abscisse de R2. La valeur affichée sera 4 Put ("Abscisse de R2 : "); Put (R2.Absc, 1); New_Line; -- Modifier l'environnement pour que la case de coordonnées (4,2) soit libre. E1(4, 2) := True; -- Afficher "OK" si le robot R1 est sur une case libre, "ERREUR" sinon if E1(R1.Absc, R1.Ord) then Put_Line ("OK"); else Put_Line ("ERREUR"); end if; --! Résponses aux questions: -- 1: T_Direction est Enum (NORD, EST, SUD, OUEST) -- T_Robot_1 est Enregistrement: X is Integer, Y is Integer, Direction is T_Direction. -- -- 2: T_Environnement est Matrice (minX..maxX, minY..maxY) de type Boolean -- -- 3: Obtenir son abscisse: x := robot.X -- robot.Direction := NORD -- environnement(robot.x, robot.y) (retourne un boolean) -- -- 4: Les sous-programmes à ajouter: Tourner_Droite, Avancer. end Robot_Type_1;
MinimSecure/unum-sdk
Ada
1,014
adb
-- Copyright 2011-2016 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. with Pck; use Pck; procedure Foo is type BA is access all Boolean; type BAs is array (1 .. 1) of BA; type Blob is record Val : Integer; Bees : BAs; end record; My_Blob : Blob := (Val => 1, Bees => (1 => null)); begin Do_Nothing (My_Blob'Address); -- STOP end Foo;
reznikmm/matreshka
Ada
3,949
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.Style.Text_Underline_Style; package ODF.DOM.Attributes.Style.Text_Underline_Style.Internals is function Create (Node : Matreshka.ODF_Attributes.Style.Text_Underline_Style.Style_Text_Underline_Style_Access) return ODF.DOM.Attributes.Style.Text_Underline_Style.ODF_Style_Text_Underline_Style; function Wrap (Node : Matreshka.ODF_Attributes.Style.Text_Underline_Style.Style_Text_Underline_Style_Access) return ODF.DOM.Attributes.Style.Text_Underline_Style.ODF_Style_Text_Underline_Style; end ODF.DOM.Attributes.Style.Text_Underline_Style.Internals;
sungyeon/drake
Ada
9,901
adb
-- convert UCD/extracted/DerivedGeneralCategory.txt -- bin/ucd_generalcategory $UCD/extracted/DerivedGeneralCategory.txt > ../source/strings/a-ucgeca.ads with Ada.Command_Line; use Ada.Command_Line; with Ada.Containers.Doubly_Linked_Lists; with Ada.Integer_Text_IO; use Ada.Integer_Text_IO; with Ada.Strings; use Ada.Strings; with Ada.Strings.Fixed; use Ada.Strings.Fixed; with Ada.Strings.Maps; use Ada.Strings.Maps; with Ada.Strings.Unbounded; use Ada.Strings.Unbounded; with Ada.Text_IO; use Ada.Text_IO; procedure ucd_generalcategory is Hexadecimal_Digit_Set : constant Character_Set := To_Set ("0123456789ABCDEF"); Letter_Set : constant Character_Set := To_Set (Character_Ranges'(('A', 'Z'), ('a', 'z'))); function Value (S : String) return Wide_Wide_Character is Img : constant String := "Hex_" & (1 .. 8 - S'Length => '0') & S; begin return Wide_Wide_Character'Value (Img); end Value; procedure Put_16 (Item : Integer) is begin if Item >= 16#10000# then Put (Item, Width => 1, Base => 16); else declare S : String (1 .. 8); -- "16#XXXX#" begin Put (S, Item, Base => 16); S (1) := '1'; S (2) := '6'; S (3) := '#'; for I in reverse 4 .. 6 loop if S (I) = '#' then S (4 .. I) := (others => '0'); exit; end if; end loop; Put (S); end; end if; end Put_16; type Bit is (In_16, In_17, In_32); function Get_Bit (C : Wide_Wide_Character) return Bit is begin if C > Wide_Wide_Character'Val (16#1FFFF#) then return In_32; elsif C > Wide_Wide_Character'Val (16#FFFF#) then return In_17; else return In_16; end if; end Get_Bit; type Range_Item is record First : Wide_Wide_Character; Last : Wide_Wide_Character; end record; package Range_Lists is new Ada.Containers.Doubly_Linked_Lists (Range_Item); use Range_Lists; type Nums_Type is array (Bit, Boolean) of Natural; type Category_Item is record Name : Ada.Strings.Unbounded.Unbounded_String; Code_Points : aliased Range_Lists.List; Total_CP_Num : Natural; Total_Set_Num : Natural; Nums : Nums_Type; end record; package Category_Lists is new Ada.Containers.Doubly_Linked_Lists (Category_Item); use Category_Lists; function Find (Table : Category_Lists.List; Category : String) return Category_Lists.Cursor is I : Category_Lists.Cursor := First (Table); begin while Has_Element (I) loop if Table.Constant_Reference (I).Element.Name = Category then return I; end if; I := Next (I); end loop; return Category_Lists.No_Element; end Find; Table : aliased Category_Lists.List; begin declare File : Ada.Text_IO.File_Type; begin Open (File, In_File, Argument (1)); while not End_Of_File (File) loop declare Line : constant String := Get_Line (File); P : Positive := Line'First; N : Natural; Token_First : Positive; Token_Last : Natural; First, Last : Wide_Wide_Character; Category : Ada.Strings.Unbounded.Unbounded_String; Category_Pos : Category_Lists.Cursor; begin if Line'Length = 0 or else Line (P) = '#' then null; -- comment else Find_Token ( Line (P .. Line'Last), Hexadecimal_Digit_Set, Inside, Token_First, Token_Last); if Token_First /= P then raise Data_Error with Line & " -- A"; end if; First := Value (Line (Token_First .. Token_Last)); P := Token_Last + 1; if Line (P) = '.' and then Line (P + 1) = '.' then P := P + 2; Find_Token ( Line (P .. Line'Last), Hexadecimal_Digit_Set, Inside, Token_First, Token_Last); if Token_First /= P then raise Data_Error with Line & " -- B"; end if; Last := Value (Line (Token_First .. Token_Last)); P := Token_Last + 1; else Last := First; end if; N := Index_Non_Blank (Line (P .. Line'Last)); if N = 0 or else Line (N) /= ';' then raise Data_Error with Line & " -- C"; end if; P := N + 1; -- skip ';' N := Index_Non_Blank (Line (P .. Line'Last)); if N = 0 then raise Data_Error with Line & " -- D"; end if; P := N; Find_Token ( Line (P .. Line'Last), Letter_Set, Inside, Token_First, Token_Last); if Token_First /= P then raise Data_Error with Line & " -- E"; end if; Category := To_Unbounded_String (Line (Token_First .. Token_Last)); Category_Pos := Find (Table, To_String (Category)); if not Has_Element (Category_Pos) then Insert ( Table, Before => Category_Lists.No_Element, Position => Category_Pos); Table.Reference (Category_Pos).Element.Name := Category; end if; Append ( Table.Reference (Category_Pos).Element.Code_Points, (First => First, Last => Last)); end if; end; end loop; Close (File); end; declare I : Category_Lists.Cursor := First (Table); begin while Has_Element (I) loop declare Cat : Category_Item renames Table.Reference (I).Element.all; begin Cat.Total_CP_Num := 0; Cat.Total_Set_Num := 0; for J in Bit loop for K in Boolean loop Cat.Nums (J, K) := 0; end loop; end loop; declare J : Range_Lists.Cursor := First (Cat.Code_Points); begin while Has_Element (J) loop declare R : Range_Item renames Cat.Code_Points.Constant_Reference (J).Element.all; B : Bit := Get_Bit (R.Last); S : Boolean := R.First /= R.Last; begin Cat.Nums (B, S) := Cat.Nums (B, S) + 1; Cat.Total_CP_Num := Cat.Total_CP_Num + ( Wide_Wide_Character'Pos (R.Last) - Wide_Wide_Character'Pos (R.First) + 1); Cat.Total_Set_Num := Cat.Total_Set_Num + 1; end; J := Next (J); end loop; end; end; I := Next (I); end loop; end; Put_Line ("pragma License (Unrestricted);"); Put_Line ("-- implementation unit, translated from DerivedGeneralCategory.txt"); Put_Line ("package Ada.UCD.General_Category is"); Put_Line (" pragma Pure;"); New_Line; declare I : Category_Lists.Cursor := First (Table); begin while Has_Element (I) loop declare Cat : Category_Item renames Table.Reference (I).Element.all; begin Put (" "); Put (To_String (Cat.Name)); Put ("_Total : constant := "); Put (Cat.Total_CP_Num, Width => 1); Put (";"); New_Line; Put (" "); Put (To_String (Cat.Name)); Put ("_Range_Length : constant := "); Put (Cat.Total_Set_Num, Width => 1); Put (";"); New_Line; end; I := Next (I); end loop; end; New_Line; Put_Line (" Empty_XXXXx1 : constant UCS_2_Array (1 .. 0) := (others => 0);"); Put_Line (" Empty_XXXXx2 : constant Set_16_Type (1 .. 0) := (others => (0, 0));"); Put_Line (" Empty_1XXXXx1 : UCS_2_Array renames Empty_XXXXx1;"); Put_Line (" Empty_1XXXXx2 : Set_16_Type renames Empty_XXXXx2;"); Put_Line (" Empty_XXXXXXXXx1 : constant UCS_4_Array (1 .. 0) := (others => 0);"); Put_Line (" Empty_XXXXXXXXx2 : constant Set_32_Type (1 .. 0) := (others => (0, 0));"); New_Line; declare I : Category_Lists.Cursor := First (Table); begin while Has_Element (I) loop declare Cat : Category_Item renames Table.Reference (I).Element.all; begin for B in Bit loop for S in Boolean loop Put (" "); Put (To_String (Cat.Name)); Put ("_Table_"); case B is when In_32 => Put ("XXXXXXXX"); when In_17 => Put ("1XXXX"); when In_16 => Put ("XXXX"); end case; if S then Put ("x2"); else Put ("x1"); end if; Put (" : "); if Cat.Nums (B, S) > 0 then Put ("constant "); end if; if S then case B is when In_32 => Put ("Set_32_Type"); when In_16 | In_17 => Put ("Set_16_Type"); end case; else case B is when In_32 => Put ("UCS_4_Array"); when In_16 | In_17 => Put ("UCS_2_Array"); end case; end if; if Cat.Nums (B, S) = 0 then Put (" renames Empty_"); case B is when In_32 => Put ("XXXXXXXX"); when In_17 => Put ("1XXXX"); when In_16 => Put ("XXXX"); end case; if S then Put ("x2"); else Put ("x1"); end if; Put (";"); New_Line; else Put (" (1 .. "); Put (Cat.Nums (B, S), Width => 1); Put (") := ("); New_Line; declare J : Range_Lists.Cursor := First (Cat.Code_Points); Second : Boolean := False; begin while Has_Element (J) loop declare R : Range_Item renames Cat.Code_Points.Constant_Reference (J).Element.all; Item_B : Bit := Get_Bit (R.Last); Item_S : Boolean := R.First /= R.Last; Offset : Integer := 0; begin if Item_B = B and then Item_S = S then if B = In_17 then Offset := 16#10000#; end if; if Second then Put (","); New_Line; end if; Put (" "); if Cat.Nums (B, S) = 1 then Put ("1 => "); end if; if S then Put ("("); Put_16 ( Wide_Wide_Character'Pos (R.First) - Offset); Put (", "); Put_16 ( Wide_Wide_Character'Pos (R.Last) - Offset); Put (")"); else Put_16 ( Wide_Wide_Character'Pos (R.First) - Offset); end if; Second := True; end if; end; J := Next (J); end loop; end; Put (");"); New_Line; end if; New_Line; end loop; end loop; end; I := Next (I); end loop; end; Put_Line ("end Ada.UCD.General_Category;"); end ucd_generalcategory;
vpodzime/ada-util
Ada
3,703
ads
----------------------------------------------------------------------- -- Util.Concurrent.Pools -- Concurrent Pools -- Copyright (C) 2011, 2015 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.Finalization; -- The <b>Util.Concurrent.Pools</b> generic defines a pool of objects which -- can be shared by multiple threads. First, the pool is configured to have -- a number of objects by using the <b>Set_Size</b> procedure. Then, a thread -- that needs an object uses the <b>Get_Instance</b> to get an object. -- The object is removed from the pool. As soon as the thread has finished, -- it puts back the object in the pool using the <b>Release</b> procedure. -- -- The <b>Get_Instance</b> entry will block until an object is available. generic type Element_Type is private; package Util.Concurrent.Pools is pragma Preelaborate; FOREVER : constant Duration := -1.0; -- Exception raised if the Get_Instance timeout exceeded. Timeout : exception; -- Pool of objects type Pool is limited new Ada.Finalization.Limited_Controlled with private; -- Get an element instance from the pool. -- Wait until one instance gets available. procedure Get_Instance (From : in out Pool; Item : out Element_Type; Wait : in Duration := FOREVER); -- Put the element back to the pool. procedure Release (Into : in out Pool; Item : in Element_Type); -- Set the pool size. procedure Set_Size (Into : in out Pool; Capacity : in Positive); -- Get the number of available elements in the pool. procedure Get_Available (From : in out Pool; Available : out Natural); -- Release the pool elements. overriding procedure Finalize (Object : in out Pool); private -- To store the pool elements, we use an array which is allocated dynamically -- by the <b>Set_Size</b> protected operation. The generated code is smaller -- compared to the use of Ada vectors container. type Element_Array is array (Positive range <>) of Element_Type; type Element_Array_Access is access all Element_Array; Null_Element_Array : constant Element_Array_Access := null; -- Pool of objects protected type Protected_Pool is -- Get an element instance from the pool. -- Wait until one instance gets available. entry Get_Instance (Item : out Element_Type); -- Put the element back to the pool. procedure Release (Item : in Element_Type); -- Set the pool size. procedure Set_Size (Capacity : in Natural); -- Get the number of available elements. function Get_Available return Natural; private Available : Natural := 0; Elements : Element_Array_Access := Null_Element_Array; end Protected_Pool; type Pool is limited new Ada.Finalization.Limited_Controlled with record List : Protected_Pool; end record; end Util.Concurrent.Pools;
stcarrez/dynamo
Ada
7,537
adb
----------------------------------------------------------------------- -- gen-artifacts-distribs-libs -- Unix shared library extraction and distribution -- Copyright (C) 2012, 2018, 2020, 2021 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.Directories; with Util.Log.Loggers; with Util.Streams.Pipes; with Util.Streams.Texts; with Util.Beans.Objects; with Util.Files; with EL.Variables.Default; with EL.Contexts.Default; with Gen.Utils; package body Gen.Artifacts.Distribs.Libs is Log : constant Util.Log.Loggers.Logger := Util.Log.Loggers.Create ("Gen.Artifacts.Distribs.Exec"); -- ------------------------------ -- Create a distribution rule to extract the shared libraries used by an executable -- and copy a selected subset in the target directory. -- ------------------------------ function Create_Rule (Node : in DOM.Core.Node) return Distrib_Rule_Access is procedure Collect_Libraries (Rule : in out Libs_Rule'Class; Node : in DOM.Core.Node); -- ------------------------------ -- Collect the library patterns for the distribution rule. -- ------------------------------ procedure Collect_Libraries (Rule : in out Libs_Rule'Class; Node : in DOM.Core.Node) is Name : constant String := Gen.Utils.Get_Data_Content (Node); begin Rule.Libraries.Append (Name); end Collect_Libraries; procedure Iterate is new Gen.Utils.Iterate_Nodes (T => Libs_Rule'Class, Process => Collect_Libraries); Ctx : EL.Contexts.Default.Default_Context; Command : constant String := Gen.Utils.Get_Data_Content (Node, "command"); Result : constant Libs_Rule_Access := new Libs_Rule; begin if Command = "" then Result.Command := EL.Expressions.Create_Expression ("ldd #{src}", Ctx); else Result.Command := EL.Expressions.Create_Expression (Command, Ctx); end if; Iterate (Result.all, Node, "library"); return Result.all'Access; end Create_Rule; -- ------------------------------ -- Get a name to qualify the installation rule (used for logs). -- ------------------------------ overriding function Get_Install_Name (Rule : in Libs_Rule) return String is pragma Unreferenced (Rule); begin return "libs"; end Get_Install_Name; -- ------------------------------ -- Get the target path associate with the given source file for the distribution rule. -- ------------------------------ overriding function Get_Target_Path (Rule : in Libs_Rule; Base : in String; File : in File_Record) return String is pragma Unreferenced (File); Dir : constant String := To_String (Rule.Dir); begin return Util.Files.Compose (Base, Dir); end Get_Target_Path; -- ------------------------------ -- Check if the library whose absolute path is defined in <b>Source</b> must be -- copied in the target directory and copy that library if needed. -- ------------------------------ procedure Copy (Rule : in Libs_Rule; Dir : in String; Source : in String) is Name : constant String := Ada.Directories.Simple_Name (Source); Path : constant String := Ada.Directories.Compose (Dir, Name); Iter : Util.Strings.Vectors.Cursor := Rule.Libraries.First; Found : Boolean := not Util.Strings.Vectors.Has_Element (Iter); begin Log.Debug ("Checking library {0}", Path); while not Found and then Util.Strings.Vectors.Has_Element (Iter) loop declare Lib : constant String := Util.Strings.Vectors.Element (Iter); Matcher : constant GNAT.Regpat.Pattern_Matcher := Make_Regexp (Lib); begin Found := GNAT.Regpat.Match (Matcher, Name); end; Util.Strings.Vectors.Next (Iter); end loop; if Found then Log.Info ("Copy {0} To {1}", Source, Path); -- Make sure the target directory exists. Ada.Directories.Create_Path (Dir); Ada.Directories.Copy_File (Source_Name => Source, Target_Name => Path, Form => "preserve=all_attributes, mode=overwrite"); end if; end Copy; overriding procedure Install (Rule : in Libs_Rule; Path : in String; Files : in File_Vector; Context : in out Generator'Class) is Ctx : EL.Contexts.Default.Default_Context; Variables : aliased EL.Variables.Default.Default_Variable_Mapper; Source : constant String := Get_Source_Path (Files); begin if Rule.Level >= Util.Log.INFO_LEVEL then Log.Info ("install {0} to {1}", Source, Path); end if; Variables.Bind ("src", Util.Beans.Objects.To_Object (Source)); Ctx.Set_Variable_Mapper (Variables'Unchecked_Access); declare Cmd : constant Util.Beans.Objects.Object := Rule.Command.Get_Value (Ctx); Command : constant String := Util.Beans.Objects.To_String (Cmd); Pipe : aliased Util.Streams.Pipes.Pipe_Stream; Reader : Util.Streams.Texts.Reader_Stream; begin -- Execute 'ldd' with the executable and read the output to extract the library path. -- Lines have the form: -- libsqlite3.so.0 => /usr/lib/libsqlite3.so.0 (0xb758a000) -- and we extract the absolute path to make the copy. Pipe.Open (Command); Reader.Initialize (Pipe'Unchecked_Access); while not Reader.Is_Eof loop declare Line : UString; Pos : Natural; Last : Natural; begin Reader.Read_Line (Line, True); Pos := Ada.Strings.Unbounded.Index (Line, "=> "); if Pos > 0 then Pos := Pos + 3; Last := Ada.Strings.Unbounded.Index (Line, " ", Pos); if Last = 0 then Last := Ada.Strings.Unbounded.Length (Line); else Last := Last - 1; end if; if Pos < Last then Rule.Copy (Path, Ada.Strings.Unbounded.Slice (Line, Pos, Last)); end if; end if; end; end loop; Pipe.Close; if Pipe.Get_Exit_Status /= 0 then Context.Error ("Command {0} exited with status {1}", Command, Integer'Image (Pipe.Get_Exit_Status)); end if; end; end Install; end Gen.Artifacts.Distribs.Libs;
grim7reaper/SipHash
Ada
2,778
adb
------------------------------------------------------------------------ -- Copyright (c) 2014 Sylvain Laperche <[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: -- 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 author 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 HOLDERS AND CONTRIBUTORSBE 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. ------------------------------------------------------------------------ ------------------------------------------------------------------------ -- SipHash -- -- Implementation Notes: -- This package implements utility functions. -- -- Portability Issues: -- - 64-bit integers are required. ------------------------------------------------------------------------ package body SipHash is --------------------------------------------------------------------- -- Version_String -- Implementation Notes: -- Trims the leading space from of the string returned by -- Natural'Image. --------------------------------------------------------------------- function Version_String return String is Major : constant String := Natural'Image(Version.Major); Minor : constant String := Natural'Image(Version.Minor); Patch : constant String := Natural'Image(Version.Patch); begin return Major(2..Major'Last) & '.' & Minor(2..Minor'Last) & '.' & Patch(2..Patch'Last); end Version_String; end SipHash;
AdaCore/libadalang
Ada
61
adb
package body Pkg3 is procedure Foo is separate; end Pkg3;
charlie5/cBound
Ada
1,855
ads
-- This file is generated by SWIG. Please do not modify by hand. -- with Interfaces; with swig; with Interfaces.C; with Interfaces.C.Pointers; package xcb.xcb_glx_get_compressed_tex_image_arb_reply_t is -- Item -- type Item is record response_type : aliased Interfaces.Unsigned_8; pad0 : aliased Interfaces.Unsigned_8; sequence : aliased Interfaces.Unsigned_16; length : aliased Interfaces.Unsigned_32; pad1 : aliased swig.int8_t_Array (0 .. 7); size : aliased Interfaces.Integer_32; pad2 : aliased swig.int8_t_Array (0 .. 11); end record; -- Item_Array -- type Item_Array is array (Interfaces.C .size_t range <>) of aliased xcb .xcb_glx_get_compressed_tex_image_arb_reply_t .Item; -- Pointer -- package C_Pointers is new Interfaces.C.Pointers (Index => Interfaces.C.size_t, Element => xcb.xcb_glx_get_compressed_tex_image_arb_reply_t.Item, Element_Array => xcb.xcb_glx_get_compressed_tex_image_arb_reply_t.Item_Array, Default_Terminator => (others => <>)); subtype Pointer is C_Pointers.Pointer; -- Pointer_Array -- type Pointer_Array is array (Interfaces.C .size_t range <>) of aliased xcb .xcb_glx_get_compressed_tex_image_arb_reply_t .Pointer; -- Pointer_Pointer -- package C_Pointer_Pointers is new Interfaces.C.Pointers (Index => Interfaces.C.size_t, Element => xcb.xcb_glx_get_compressed_tex_image_arb_reply_t.Pointer, Element_Array => xcb.xcb_glx_get_compressed_tex_image_arb_reply_t.Pointer_Array, Default_Terminator => null); subtype Pointer_Pointer is C_Pointer_Pointers.Pointer; end xcb.xcb_glx_get_compressed_tex_image_arb_reply_t;
optikos/oasis
Ada
1,585
ads
-- Copyright (c) 2019 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- with Program.Elements.Constraints; with Program.Lexical_Elements; with Program.Elements.Expressions; package Program.Elements.Digits_Constraints is pragma Pure (Program.Elements.Digits_Constraints); type Digits_Constraint is limited interface and Program.Elements.Constraints.Constraint; type Digits_Constraint_Access is access all Digits_Constraint'Class with Storage_Size => 0; not overriding function Digits_Expression (Self : Digits_Constraint) return not null Program.Elements.Expressions.Expression_Access is abstract; not overriding function Real_Range_Constraint (Self : Digits_Constraint) return Program.Elements.Constraints.Constraint_Access is abstract; type Digits_Constraint_Text is limited interface; type Digits_Constraint_Text_Access is access all Digits_Constraint_Text'Class with Storage_Size => 0; not overriding function To_Digits_Constraint_Text (Self : aliased in out Digits_Constraint) return Digits_Constraint_Text_Access is abstract; not overriding function Digits_Token (Self : Digits_Constraint_Text) return not null Program.Lexical_Elements.Lexical_Element_Access is abstract; not overriding function Range_Token (Self : Digits_Constraint_Text) return Program.Lexical_Elements.Lexical_Element_Access is abstract; end Program.Elements.Digits_Constraints;
apple-oss-distributions/old_ncurses
Ada
3,009
ads
------------------------------------------------------------------------------ -- -- -- GNAT ncurses Binding Samples -- -- -- -- ncurses -- -- -- -- B O D Y -- -- -- ------------------------------------------------------------------------------ -- Copyright (c) 2000 Free Software Foundation, Inc. -- -- -- -- Permission is hereby granted, free of charge, to any person obtaining a -- -- copy of this software and associated documentation files (the -- -- "Software"), to deal in the Software without restriction, including -- -- without limitation the rights to use, copy, modify, merge, publish, -- -- distribute, distribute with modifications, sublicense, and/or sell -- -- copies of the Software, and to permit persons to whom the Software is -- -- furnished to do so, subject to the following conditions: -- -- -- -- The above copyright notice and this permission notice shall be included -- -- in all copies or substantial portions of the Software. -- -- -- -- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS -- -- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF -- -- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. -- -- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, -- -- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR -- -- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR -- -- THE USE OR OTHER DEALINGS IN THE SOFTWARE. -- -- -- -- Except as contained in this notice, the name(s) of the above copyright -- -- holders shall not be used in advertising or otherwise to promote the -- -- sale, use or other dealings in this Software without prior written -- -- authorization. -- ------------------------------------------------------------------------------ -- Author: Eugene V. Melaragno <[email protected]> 2000 -- Version Control -- $Revision: 1.1.1.1 $ -- Binding Version 01.00 ------------------------------------------------------------------------------ procedure ncurses2.overlap_test;
charlie5/cBound
Ada
1,403
ads
-- This file is generated by SWIG. Please do not modify by hand. -- with Interfaces.C; with Interfaces.C; with Interfaces.C.Pointers; package xcb.xcb_drawable_iterator_t is -- Item -- type Item is record data : access xcb.xcb_drawable_t; the_rem : aliased Interfaces.C.int; index : aliased Interfaces.C.int; end record; -- Item_Array -- type Item_Array is array (Interfaces.C.size_t range <>) of aliased xcb.xcb_drawable_iterator_t .Item; -- Pointer -- package C_Pointers is new Interfaces.C.Pointers (Index => Interfaces.C.size_t, Element => xcb.xcb_drawable_iterator_t.Item, Element_Array => xcb.xcb_drawable_iterator_t.Item_Array, Default_Terminator => (others => <>)); subtype Pointer is C_Pointers.Pointer; -- Pointer_Array -- type Pointer_Array is array (Interfaces.C.size_t range <>) of aliased xcb.xcb_drawable_iterator_t .Pointer; -- Pointer_Pointer -- package C_Pointer_Pointers is new Interfaces.C.Pointers (Index => Interfaces.C.size_t, Element => xcb.xcb_drawable_iterator_t.Pointer, Element_Array => xcb.xcb_drawable_iterator_t.Pointer_Array, Default_Terminator => null); subtype Pointer_Pointer is C_Pointer_Pointers.Pointer; end xcb.xcb_drawable_iterator_t;
reznikmm/matreshka
Ada
4,137
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with ODF.DOM.Draw_Extrusion_First_Light_Harsh_Attributes; package Matreshka.ODF_Draw.Extrusion_First_Light_Harsh_Attributes is type Draw_Extrusion_First_Light_Harsh_Attribute_Node is new Matreshka.ODF_Draw.Abstract_Draw_Attribute_Node and ODF.DOM.Draw_Extrusion_First_Light_Harsh_Attributes.ODF_Draw_Extrusion_First_Light_Harsh_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Draw_Extrusion_First_Light_Harsh_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Draw_Extrusion_First_Light_Harsh_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Draw.Extrusion_First_Light_Harsh_Attributes;
reznikmm/matreshka
Ada
4,175
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Web Framework -- -- -- -- Tools Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2015, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Asis.Statements; with Asis.Elements; package body Properties.Statements.Exit_Statement is ---------- -- Code -- ---------- function Code (Engine : access Engines.Contexts.Context; Element : Asis.Expression; Name : Engines.Text_Property) return League.Strings.Universal_String is Cond : constant Asis.Expression := Asis.Statements.Exit_Condition (Element); Text : League.Strings.Universal_String; Down : League.Strings.Universal_String; begin if not Asis.Elements.Is_Nil (Cond) then Text.Append ("if ("); Down := Engine.Text.Get_Property (Cond, Name); Text.Append (Down); Text.Append (")"); end if; Text.Append ("break;"); return Text; end Code; end Properties.Statements.Exit_Statement;
sungyeon/drake
Ada
1,368
adb
with System.Formatting.Literals; with System.Long_Long_Integer_Types; with System.Value_Errors; package body System.Val_LLU is subtype Word_Unsigned is Long_Long_Integer_Types.Word_Unsigned; subtype Long_Long_Unsigned is Long_Long_Integer_Types.Long_Long_Unsigned; -- implementation function Value_Long_Long_Unsigned (Str : String) return Unsigned_Types.Long_Long_Unsigned is Last : Natural; Result : Unsigned_Types.Long_Long_Unsigned; Error : Boolean; begin if Unsigned_Types.Long_Long_Unsigned'Size <= Standard'Word_Size then Formatting.Literals.Get_Literal ( Str, Last, Word_Unsigned (Result), Error => Error); else Formatting.Literals.Get_Literal ( Str, Last, Long_Long_Unsigned (Result), Error => Error); end if; if not Error then Formatting.Literals.Check_Last (Str, Last, Error); if not Error then return Result; end if; end if; Value_Errors.Raise_Discrete_Value_Failure ("Long_Long_Unsigned", Str); declare Uninitialized : Unsigned_Types.Long_Long_Unsigned; pragma Unmodified (Uninitialized); begin return Uninitialized; end; end Value_Long_Long_Unsigned; end System.Val_LLU;
AdaCore/training_material
Ada
1,798
adb
with Ada.Text_IO; use Ada.Text_IO; with Input; package body Screen_Output is ---------------- -- Local Data -- ---------------- Debug_On : constant Boolean := False; -- When set, debugging information messages are output on the screen. --------- -- Msg -- --------- procedure Msg (S1 : String; S2 : String := ""; End_Line : Boolean := True) is begin Put (S1); Put (S2); if End_Line then New_Line; end; end Msg; --------------- -- Debug_Msg -- --------------- procedure Debug_Msg (S : String) is begin if not Debug_On then return; end if; Put ("DEBUG: "); Put (S); New_Line; end Debug_Msg; --------------- -- Error_Msg -- --------------- procedure Error_Msg (S1 : String; S2 : String := ""; S3 : String := "") is begin Put ("sdc error at line"); Put (Natural'Image (Input.Line_Number) & ": "); Put (S1); Put (S2); Put (S3); New_Line; end Error_Msg; ------------------ -- Syntax_Error -- ------------------ procedure Syntax_Error (S : String; Error_Pos : Natural := 0) is Pos : Natural := Error_Pos; begin if Pos = 0 then Pos := Input.Column_Number; end if; Put ("sdc:"); Put_Line (Input.Current_Line); Put ("sdc:"); for I in 1 .. Pos - 1 loop Put ("-"); end loop; Put_Line ("!"); Put ("sdc input error at line"); Put (Natural'Image (Input.Line_Number) & ": " & S); New_Line; end Syntax_Error; ----------- -- Pause -- ----------- procedure Pause is begin Put ("Press a key to continue..."); Skip_Line; end Pause; end Screen_Output;
reznikmm/matreshka
Ada
4,608
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.Direction_Attributes is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Style_Direction_Attribute_Node is begin return Self : Style_Direction_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_Direction_Attribute_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Direction_Attribute; end Get_Local_Name; begin Matreshka.DOM_Documents.Register_Attribute (Matreshka.ODF_String_Constants.Style_URI, Matreshka.ODF_String_Constants.Direction_Attribute, Style_Direction_Attribute_Node'Tag); end Matreshka.ODF_Style.Direction_Attributes;
shintakezou/drake
Ada
9,554
adb
with Ada.Exception_Identification.From_Here; with System.Address_To_Named_Access_Conversions; with System.Standard_Allocators; with System.Storage_Elements; with System.Zero_Terminated_Strings; with C.errno; with C.fnmatch; with C.stdint; package body System.Native_Directories.Searching is use Ada.Exception_Identification.From_Here; use type Storage_Elements.Storage_Offset; use type C.char; use type C.signed_int; use type C.dirent.DIR_ptr; use type C.bits.dirent.struct_dirent_ptr; use type C.size_t; use type C.sys.types.mode_t; package char_ptr_Conv is new Address_To_Named_Access_Conversions (C.char, C.char_ptr); package dirent_ptr_Conv is new Address_To_Named_Access_Conversions ( C.dirent.struct_dirent, C.bits.dirent.struct_dirent_ptr); function strlen (s : not null access constant C.char) return C.size_t with Import, Convention => Intrinsic, External_Name => "__builtin_strlen"; procedure memcpy ( dst : not null C.bits.dirent.struct_dirent_ptr; src : not null C.bits.dirent.struct_dirent_ptr; n : Storage_Elements.Storage_Count) with Import, Convention => Intrinsic, External_Name => "__builtin_memcpy"; procedure Get_Information ( Directory : String; Directory_Entry : not null Directory_Entry_Access; Information : aliased out C.sys.stat.struct_stat; errno : out C.signed_int); procedure Get_Information ( Directory : String; Directory_Entry : not null Directory_Entry_Access; Information : aliased out C.sys.stat.struct_stat; errno : out C.signed_int) is S_Length : constant C.size_t := strlen (Directory_Entry.d_name (0)'Access); Full_Name : C.char_array ( 0 .. Directory'Length * Zero_Terminated_Strings.Expanding + 1 -- '/' + S_Length); Full_Name_Length : C.size_t; begin -- compose Zero_Terminated_Strings.To_C ( Directory, Full_Name (0)'Access, Full_Name_Length); Full_Name (Full_Name_Length) := '/'; Full_Name_Length := Full_Name_Length + 1; Full_Name (Full_Name_Length .. Full_Name_Length + S_Length - 1) := Directory_Entry.d_name (0 .. S_Length - 1); Full_Name_Length := Full_Name_Length + S_Length; Full_Name (Full_Name_Length) := C.char'Val (0); -- stat if C.sys.stat.lstat (Full_Name (0)'Access, Information'Access) < 0 then errno := C.errno.errno; else errno := 0; end if; end Get_Information; -- implementation function New_Directory_Entry (Source : not null Directory_Entry_Access) return not null Directory_Entry_Access is Result : Directory_Entry_Access; begin Result := dirent_ptr_Conv.To_Pointer ( Standard_Allocators.Allocate ( Storage_Elements.Storage_Offset (Source.d_reclen))); memcpy ( Result, Source, Storage_Elements.Storage_Offset (Source.d_reclen)); return Result; end New_Directory_Entry; procedure Free (X : in out Directory_Entry_Access) is begin Standard_Allocators.Free (dirent_ptr_Conv.To_Address (X)); X := null; end Free; procedure Start_Search ( Search : aliased in out Search_Type; Directory : String; Pattern : String; Filter : Filter_Type; Directory_Entry : out Directory_Entry_Access; Has_Next_Entry : out Boolean) is begin if Directory'Length = 0 then -- reject Raise_Exception (Name_Error'Identity); end if; declare C_Directory : C.char_array ( 0 .. Directory'Length * Zero_Terminated_Strings.Expanding); Handle : C.dirent.DIR_ptr; begin Zero_Terminated_Strings.To_C ( Directory, C_Directory (0)'Access); Handle := C.dirent.opendir (C_Directory (0)'Access); if Handle = null then Raise_Exception (Named_IO_Exception_Id (C.errno.errno)); end if; Search.Handle := Handle; end; Search.Filter := Filter; Search.Pattern := char_ptr_Conv.To_Pointer ( Standard_Allocators.Allocate ( Storage_Elements.Storage_Offset (Pattern'Length) * Zero_Terminated_Strings.Expanding + 1)); -- NUL Zero_Terminated_Strings.To_C (Pattern, Search.Pattern); Get_Next_Entry (Search, Directory_Entry, Has_Next_Entry); end Start_Search; procedure End_Search ( Search : aliased in out Search_Type; Raise_On_Error : Boolean) is Handle : constant C.dirent.DIR_ptr := Search.Handle; begin Search.Handle := null; Standard_Allocators.Free ( char_ptr_Conv.To_Address (Search.Pattern)); Search.Pattern := null; if C.dirent.closedir (Handle) < 0 then if Raise_On_Error then Raise_Exception (IO_Exception_Id (C.errno.errno)); end if; end if; end End_Search; procedure Get_Next_Entry ( Search : aliased in out Search_Type; Directory_Entry : out Directory_Entry_Access; Has_Next_Entry : out Boolean) is begin loop C.errno.errno_location.all := 0; Directory_Entry := C.dirent.readdir (Search.Handle); declare errno : constant C.signed_int := C.errno.errno; begin if errno /= 0 then Raise_Exception (IO_Exception_Id (errno)); elsif Directory_Entry = null then Has_Next_Entry := False; -- end exit; end if; end; if Search.Filter (Kind (Directory_Entry)) and then C.fnmatch.fnmatch ( Search.Pattern, Directory_Entry.d_name (0)'Access, 0) = 0 and then ( Directory_Entry.d_name (0) /= '.' or else ( Directory_Entry.d_name (1) /= C.char'Val (0) and then ( Directory_Entry.d_name (1) /= '.' or else Directory_Entry.d_name (2) /= C.char'Val (0)))) then Has_Next_Entry := True; exit; -- found end if; end loop; end Get_Next_Entry; procedure Get_Entry ( Directory : String; Name : String; Directory_Entry : aliased out Directory_Entry_Access; Additional : aliased in out Directory_Entry_Additional_Type) is Dummy_dirent : C.bits.dirent.struct_dirent; -- to use 'Position Record_Length : constant Storage_Elements.Storage_Count := Storage_Elements.Storage_Offset'Max ( C.bits.dirent.struct_dirent'Size / Standard'Storage_Unit, Dummy_dirent.d_name'Position + Storage_Elements.Storage_Offset (Name'Length + 1)); errno : C.signed_int; begin -- allocation Directory_Entry := dirent_ptr_Conv.To_Pointer ( Standard_Allocators.Allocate (Record_Length)); -- filling components Directory_Entry.d_off := 0; -- ? Directory_Entry.d_reclen := C.stdint.uint16_t (Record_Length); Zero_Terminated_Strings.To_C (Name, Directory_Entry.d_name (0)'Access); Get_Information (Directory, Directory_Entry, Additional.Information, errno => errno); if errno /= 0 then Raise_Exception (Named_IO_Exception_Id (errno)); end if; Directory_Entry.d_ino := Additional.Information.st_ino; Directory_Entry.d_type := C.stdint.uint8_t ( C.Shift_Right (Additional.Information.st_mode, 12)); Additional.Filled := True; end Get_Entry; function Simple_Name (Directory_Entry : not null Directory_Entry_Access) return String is begin return Zero_Terminated_Strings.Value ( Directory_Entry.d_name (0)'Access); end Simple_Name; function Kind (Directory_Entry : not null Directory_Entry_Access) return File_Kind is begin -- DTTOIF return Kind ( C.Shift_Left (C.sys.types.mode_t (Directory_Entry.d_type), 12)); end Kind; function Size ( Directory : String; Directory_Entry : not null Directory_Entry_Access; Additional : aliased in out Directory_Entry_Additional_Type) return Ada.Streams.Stream_Element_Count is begin if not Additional.Filled then Get_Information (Directory, Directory_Entry, Additional.Information); Additional.Filled := True; end if; return Ada.Streams.Stream_Element_Offset ( Additional.Information.st_size); end Size; function Modification_Time ( Directory : String; Directory_Entry : not null Directory_Entry_Access; Additional : aliased in out Directory_Entry_Additional_Type) return Native_Calendar.Native_Time is begin if not Additional.Filled then Get_Information (Directory, Directory_Entry, Additional.Information); Additional.Filled := True; end if; return Additional.Information.st_mtim; end Modification_Time; procedure Get_Information ( Directory : String; Directory_Entry : not null Directory_Entry_Access; Information : aliased out C.sys.stat.struct_stat) is errno : C.signed_int; begin Get_Information (Directory, Directory_Entry, Information, errno => errno); if errno /= 0 then Raise_Exception (IO_Exception_Id (errno)); end if; end Get_Information; end System.Native_Directories.Searching;
wookey-project/ewok-legacy
Ada
9,025
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 ewok.tasks; use ewok.tasks; with ewok.tasks_shared; use ewok.tasks_shared; with ewok.sched; with ewok.softirq; with ewok.syscalls.cfg.dev; with ewok.syscalls.cfg.gpio; with ewok.syscalls.dma; with ewok.syscalls.gettick; with ewok.syscalls.init; with ewok.syscalls.ipc; with ewok.syscalls.lock; with ewok.syscalls.reset; with ewok.syscalls.rng; with ewok.syscalls.sleep; with ewok.syscalls.yield; with ewok.exported.interrupts; use type ewok.exported.interrupts.t_interrupt_config_access; with m4.cpu.instructions; package body ewok.syscalls.handler with spark_mode => off is type t_syscall_parameters_access is access all t_syscall_parameters; function to_syscall_parameters_access is new ada.unchecked_conversion (system_address, t_syscall_parameters_access); procedure exec_synchronous_syscall (current_id : in ewok.tasks_shared.t_task_id; mode : in ewok.tasks_shared.t_task_mode; sys_params_a : in t_syscall_parameters_access) is begin case sys_params_a.all.syscall_type is when SYS_IPC => ewok.syscalls.ipc.sys_ipc (current_id, sys_params_a.all.args, mode); when SYS_GETTICK => ewok.syscalls.gettick.sys_gettick (current_id, sys_params_a.all.args, mode); when SYS_LOCK => ewok.syscalls.lock.sys_lock (current_id, sys_params_a.all.args, mode); when SYS_YIELD => ewok.syscalls.yield.sys_yield (current_id, mode); when SYS_CFG => declare syscall : t_syscalls_cfg with address => sys_params_a.all.args(0)'address; begin case syscall is when CFG_GPIO_SET => ewok.syscalls.cfg.gpio.gpio_set (current_id, sys_params_a.all.args, mode); when CFG_GPIO_GET => ewok.syscalls.cfg.gpio.gpio_get (current_id, sys_params_a.all.args, mode); when CFG_GPIO_UNLOCK_EXTI => ewok.syscalls.cfg.gpio.gpio_unlock_exti (current_id, sys_params_a.all.args, mode); when CFG_DMA_RECONF => ewok.syscalls.dma.sys_cfg_dma_reconf (current_id, sys_params_a.all.args, mode); when CFG_DMA_RELOAD => ewok.syscalls.dma.sys_cfg_dma_reload (current_id, sys_params_a.all.args, mode); when CFG_DMA_DISABLE => ewok.syscalls.dma.sys_cfg_dma_disable (current_id, sys_params_a.all.args, mode); when CFG_DEV_MAP => ewok.syscalls.cfg.dev.dev_map (current_id, sys_params_a.all.args, mode); when CFG_DEV_UNMAP => ewok.syscalls.cfg.dev.dev_unmap (current_id, sys_params_a.all.args, mode); when CFG_DEV_RELEASE => ewok.syscalls.cfg.dev.dev_release (current_id, sys_params_a.all.args, mode); end case; end; when SYS_SLEEP => ewok.syscalls.sleep.sys_sleep (current_id, sys_params_a.all.args, mode); when SYS_GET_RANDOM => ewok.syscalls.rng.sys_get_random (current_id, sys_params_a.all.args, mode); when SYS_RESET => ewok.syscalls.reset.sys_reset (current_id, mode); when SYS_INIT => ewok.syscalls.init.sys_init (current_id, sys_params_a.all.args, mode); when SYS_LOG => raise program_error; end case; end exec_synchronous_syscall; function svc_handler (frame_a : t_stack_frame_access) return t_stack_frame_access is svc : t_svc_type; sys_params_a : t_syscall_parameters_access; current_id : t_task_id; current_a : ewok.tasks.t_task_access; begin current_id := ewok.sched.get_current; current_a := ewok.tasks.get_task (current_id); -- -- We must save the frame pointer because synchronous syscall don't refer -- to the parameters on the stack indexed by 'frame_a' but to -- 'current_a' (they access 'frame_a' via 'current_a.all.ctx.frame_a' -- or 'current_a.all.isr_ctx.frame_a') -- if ewok.tasks.get_mode (current_id) = TASK_MODE_MAINTHREAD then current_a.all.ctx.frame_a := frame_a; else current_a.all.isr_ctx.frame_a := frame_a; end if; -- -- Getting the svc number from the SVC instruction -- declare inst : m4.cpu.instructions.t_svc_instruction with import, address => to_address (frame_a.all.PC - 2); begin if not inst.opcode'valid then raise program_error; end if; declare svc_type : t_svc_type with address => inst.svc_num'address; begin if not svc_type'valid then ewok.tasks.set_state (current_id, TASK_MODE_MAINTHREAD, TASK_STATE_FAULT); set_return_value (current_id, current_a.all.mode, SYS_E_DENIED); return frame_a; end if; svc := svc_type; end; end; ------------------- -- Managing SVCs -- ------------------- case svc is when SVC_SYSCALL => -- Extracting syscall parameters sys_params_a := to_syscall_parameters_access (frame_a.all.R0); -- Are they valid? if not sys_params_a.all.syscall_type'valid then ewok.tasks.set_state (current_id, TASK_MODE_MAINTHREAD, TASK_STATE_FAULT); set_return_value (current_id, ewok.tasks.get_mode(current_id), SYS_E_DENIED); end if; -- Executing IPCs if sys_params_a.all.syscall_type = SYS_IPC then ewok.syscalls.ipc.sys_ipc (current_id, sys_params_a.all.args, current_a.all.mode); return ewok.sched.do_schedule (frame_a); -- Executing other synchronous syscall elsif sys_params_a.all.syscall_type /= SYS_LOG then exec_synchronous_syscall (current_id, current_a.all.mode, sys_params_a); return frame_a; -- Sys_log() syscall is postponed (asynchronously executed) else if current_a.all.mode = TASK_MODE_MAINTHREAD then ewok.softirq.push_syscall (current_id); ewok.tasks.set_state (current_id, TASK_MODE_MAINTHREAD, TASK_STATE_SVC_BLOCKED); return ewok.sched.do_schedule (frame_a); else -- Postponed syscalls are forbidden in ISR mode set_return_value (current_id, TASK_MODE_ISRTHREAD, SYS_E_DENIED); return frame_a; end if; end if; when SVC_TASK_DONE => ewok.tasks.set_state (current_id, TASK_MODE_MAINTHREAD, TASK_STATE_FINISHED); return ewok.sched.do_schedule (frame_a); when SVC_ISR_DONE => #if CONFIG_SCHED_SUPPORT_FISR declare current_state : constant t_task_state := ewok.tasks.get_state (current_id, TASK_MODE_MAINTHREAD); begin if current_state = TASK_STATE_RUNNABLE or current_state = TASK_STATE_IDLE then ewok.tasks.set_state (current_id, TASK_MODE_MAINTHREAD, TASK_STATE_FORCED); end if; end; #end if; ewok.tasks.set_state (current_id, TASK_MODE_ISRTHREAD, TASK_STATE_ISR_DONE); return ewok.sched.do_schedule (frame_a); end case; end svc_handler; end ewok.syscalls.handler;
JKI757/coinapi-sdk
Ada
6,144
adb
-- OEML _ REST API -- This section will provide necessary information about the `CoinAPI OEML REST API` protocol. This API is also available in the Postman application: <a href=\"https://postman.coinapi.io/\" target=\"_blank\">https://postman.coinapi.io/</a> -- -- The version of the OpenAPI document: v1 -- Contact: [email protected] -- -- NOTE: This package is auto generated by OpenAPI-Generator 5.2.0. -- https://openapi-generator.tech -- Do not edit the class manually. pragma Warnings (Off, "*is not referenced"); with Swagger.Streams; package body .Clients is pragma Style_Checks ("-mr"); -- Get balances -- Get current currency balance from all or single exchange. procedure V_1Balances_Get (Client : in out Client_Type; Exchange_Id : in Swagger.Nullable_UString; Result : out .Models.Balance_Type_Vectors.Vector) is URI : Swagger.Clients.URI_Type; Reply : Swagger.Value_Type; begin Client.Set_Accept ((Swagger.Clients.APPLICATION_JSON, Swagger.Clients.APPLICTION_JSON)); URI.Add_Param ("exchange_id", Exchange_Id); URI.Set_Path ("/v1/balances"); Client.Call (Swagger.Clients.GET, URI, Reply); .Models.Deserialize (Reply, "", Result); end V_1Balances_Get; -- Cancel all orders request -- This request cancels all open orders on single specified exchange. procedure V_1Orders_Cancel_All_Post (Client : in out Client_Type; Order_Cancel_All_Request_Type : in .Models.OrderCancelAllRequest_Type; Result : out .Models.MessageReject_Type) is URI : Swagger.Clients.URI_Type; Req : Swagger.Clients.Request_Type; Reply : Swagger.Value_Type; begin Client.Set_Accept ((Swagger.Clients.APPLICATION_JSON, Swagger.Clients.APPLICTION_JSON)); Client.Initialize (Req, (1 => Swagger.Clients.APPLICATION_JSON)); .Models.Serialize (Req.Stream, "", Order_Cancel_All_Request_Type); URI.Set_Path ("/v1/orders/cancel/all"); Client.Call (Swagger.Clients.POST, URI, Req, Reply); .Models.Deserialize (Reply, "", Result); end V_1Orders_Cancel_All_Post; -- Cancel order request -- Request cancel for an existing order. The order can be canceled using the `client_order_id` or `exchange_order_id`. procedure V_1Orders_Cancel_Post (Client : in out Client_Type; Order_Cancel_Single_Request_Type : in .Models.OrderCancelSingleRequest_Type; Result : out .Models.OrderExecutionReport_Type) is URI : Swagger.Clients.URI_Type; Req : Swagger.Clients.Request_Type; Reply : Swagger.Value_Type; begin Client.Set_Accept ((Swagger.Clients.APPLICATION_JSON, Swagger.Clients.APPLICTION_JSON)); Client.Initialize (Req, (1 => Swagger.Clients.APPLICATION_JSON)); .Models.Serialize (Req.Stream, "", Order_Cancel_Single_Request_Type); URI.Set_Path ("/v1/orders/cancel"); Client.Call (Swagger.Clients.POST, URI, Req, Reply); .Models.Deserialize (Reply, "", Result); end V_1Orders_Cancel_Post; -- Get open orders -- Get last execution reports for open orders across all or single exchange. procedure V_1Orders_Get (Client : in out Client_Type; Exchange_Id : in Swagger.Nullable_UString; Result : out .Models.OrderExecutionReport_Type_Vectors.Vector) is URI : Swagger.Clients.URI_Type; Reply : Swagger.Value_Type; begin Client.Set_Accept ((Swagger.Clients.APPLICATION_JSON, Swagger.Clients.APPLICTION_JSON)); URI.Add_Param ("exchange_id", Exchange_Id); URI.Set_Path ("/v1/orders"); Client.Call (Swagger.Clients.GET, URI, Reply); .Models.Deserialize (Reply, "", Result); end V_1Orders_Get; -- Send new order -- This request creating new order for the specific exchange. procedure V_1Orders_Post (Client : in out Client_Type; Order_New_Single_Request_Type : in .Models.OrderNewSingleRequest_Type; Result : out .Models.OrderExecutionReport_Type) is URI : Swagger.Clients.URI_Type; Req : Swagger.Clients.Request_Type; Reply : Swagger.Value_Type; begin Client.Set_Accept ((Swagger.Clients.APPLICATION_JSON, Swagger.Clients.APPLICTION_JSON)); Client.Initialize (Req, (1 => Swagger.Clients.APPLICATION_JSON)); .Models.Serialize (Req.Stream, "", Order_New_Single_Request_Type); URI.Set_Path ("/v1/orders"); Client.Call (Swagger.Clients.POST, URI, Req, Reply); .Models.Deserialize (Reply, "", Result); end V_1Orders_Post; -- Get order execution report -- Get the last order execution report for the specified order. The requested order does not need to be active or opened. procedure V_1Orders_Status_Client_Order_Id_Get (Client : in out Client_Type; Client_Order_Id : in Swagger.UString; Result : out .Models.OrderExecutionReport_Type) is URI : Swagger.Clients.URI_Type; Reply : Swagger.Value_Type; begin Client.Set_Accept ((1 => Swagger.Clients.APPLICATION_JSON)); URI.Set_Path ("/v1/orders/status/{client_order_id}"); URI.Set_Path_Param ("client_order_id", Client_Order_Id); Client.Call (Swagger.Clients.GET, URI, Reply); .Models.Deserialize (Reply, "", Result); end V_1Orders_Status_Client_Order_Id_Get; -- Get open positions -- Get current open positions across all or single exchange. procedure V_1Positions_Get (Client : in out Client_Type; Exchange_Id : in Swagger.Nullable_UString; Result : out .Models.Position_Type_Vectors.Vector) is URI : Swagger.Clients.URI_Type; Reply : Swagger.Value_Type; begin Client.Set_Accept ((Swagger.Clients.APPLICATION_JSON, Swagger.Clients.APPLICTION_JSON)); URI.Add_Param ("exchange_id", Exchange_Id); URI.Set_Path ("/v1/positions"); Client.Call (Swagger.Clients.GET, URI, Reply); .Models.Deserialize (Reply, "", Result); end V_1Positions_Get; end .Clients;
frmr/power-station
Ada
99
adb
with power_Station; use power_Station; procedure Main is begin Start_Reactor; end Main;
MinimSecure/unum-sdk
Ada
1,246
ads
-- Copyright 2009-2016 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. with Ada.Finalization; package Parse_Controlled is type Variant_Kind is (VK_Null, VK_Num, VK_String); type Null_Variant_Record (Kind : Variant_Kind := VK_Null) is record case Kind is when VK_Null => null; when VK_Num => Num_Value : Long_Float; when VK_String => String_Value : Natural; end case; end record; type Null_Variant is new Ada.Finalization.Controlled with record V : Null_Variant_Record; end record; end Parse_Controlled;
MinimSecure/unum-sdk
Ada
949
ads
-- Copyright 2012-2016 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. with System; package Pck is type Char_Table is array (Character range Character'First .. Character'Last) of Natural; Global_Char_Table : Char_Table := (others => 0); procedure Do_Nothing (A : System.Address); end Pck;
stcarrez/sql-benchmark
Ada
7,026
adb
----------------------------------------------------------------------- -- sqlbench-main -- Main SQL Bencharmk -- Copyright (C) 2018, 2019 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.Exceptions; with Ada.Command_Line; with Ada.Text_IO; with Ada.Strings.Unbounded; with Util.Log.Loggers; with Util.Measures; with Util.Strings; with Util.Files; with ADO; with ADO.Configs; with ADO.Drivers; with ADO.Connections; with ADO.Sessions; with ADO.Sessions.Factory; with Sqlbench.Simple; procedure Sqlbench.Main is use Ada.Strings.Unbounded; procedure Read_Line (Line : in String); procedure Read_Stat_Line (Line : in String); Log : constant Util.Log.Loggers.Logger := Util.Log.Loggers.Create ("Sqlbench.Main"); Thread_Count : Natural := 0; Rss_Size : Natural := 0; Hwm_Size : Natural := 0; User_Time : Natural := 0; Sys_Time : Natural := 0; procedure Read_Line (Line : in String) is Pos : Natural := Util.Strings.Index (Line, ASCII.HT); Last : Natural := Util.Strings.Rindex (Line, ' '); begin Log.Debug ("{0}", Line); if Pos = 0 then Pos := Util.Strings.Index (Line, ' '); end if; if Last = 0 then Last := Line'Last; end if; if Pos > 0 then if Util.Strings.Starts_With (Line, "Threads:") then Thread_Count := Natural'Value (Line (Pos + 1 .. Last)); elsif Util.Strings.Starts_With (Line, "VmRSS:") then Rss_Size := Natural'Value (Line (Pos + 1 .. Last)); elsif Util.Strings.Starts_With (Line, "VmHWM:") then Hwm_Size := Natural'Value (Line (Pos + 1 .. Last)); end if; end if; exception when Constraint_Error => null; end Read_Line; procedure Read_Stat_Line (Line : in String) is Pos : Natural := Line'First; Next : Natural; begin Log.Debug ("{0}", Line); for I in 1 .. 13 loop Pos := Util.Strings.Index (Line, ' ', Pos + 1); exit when Pos = 0; end loop; Next := Util.Strings.Index (Line, ' ', Pos + 1); User_Time := 10 * Natural'Value (Line (Pos + 1 .. Next - 1)); Pos := Next; Next := Util.Strings.Index (Line, ' ', Pos + 1); Sys_Time := 10 * Natural'Value (Line (Pos + 1 .. Next - 1)); exception when Constraint_Error => null; end Read_Stat_Line; Driver : Unbounded_String; Context : Sqlbench.Context_Type; Repeat : Sqlbench.Repeat_Type := 100; Output : Unbounded_String; Output_File : Ada.Text_IO.File_Type; Arg_Pos : Positive := 1; Arg_Count : constant Natural := Ada.Command_Line.Argument_Count; begin Util.Log.Loggers.Initialize ("sqlbench.properties"); -- Initialize the database drivers. ADO.Drivers.Initialize ("sqlbench.properties"); while Arg_Pos <= Arg_Count loop declare Arg : constant String := Ada.Command_Line.Argument (Arg_Pos); begin if Arg = "-sqlite" then Driver := To_Unbounded_String ("sqlite"); elsif Arg = "-mysql" then Driver := To_Unbounded_String ("mysql"); elsif Arg = "-postgresql" then Driver := To_Unbounded_String ("postgresql"); elsif Arg = "-repeat" and Arg_Pos + 1 <= Arg_Count then Arg_Pos := Arg_Pos + 1; Repeat := Repeat_Type'Value (Ada.Command_Line.Argument (Arg_Pos)); elsif Arg = "-o" and Arg_Pos + 1 <= Arg_Count then Arg_Pos := Arg_Pos + 1; Output := To_Unbounded_String (Ada.Command_Line.Argument (Arg_Pos)); else raise Constraint_Error; end if; exception when Constraint_Error => Ada.Text_IO.Put_Line (Ada.Text_IO.Standard_Error, "Usage: sql-bench [-sqlite] [-mysql] [-postgresql] " & "[-repeat count] [-o output]"); Ada.Command_Line.Set_Exit_Status (2); return; end; Arg_Pos := Arg_Pos + 1; end loop; -- Initialize the session factory to connect to the -- database defined by 'ado.database' property. Context.Factory.Create (ADO.Configs.Get_Config (To_String (Driver) & ".database")); Context.Session := Context.Factory.Get_Master_Session; Simple.Register (Context); for Test of Context.Tests loop Context.Repeat := Repeat * Test.Factor; declare T : Util.Measures.Stamp; begin Test.Handler (Context); Util.Measures.Report (Context.Perf, T, Test.Title, Positive (Context.Repeat)); exception when others => null; end; end loop; begin Util.Files.Read_File (Path => "/proc/self/status", Process => Read_Line'Access); exception when others => null; end; begin Util.Files.Read_File (Path => "/proc/self/stat", Process => Read_Stat_Line'Access); exception when others => null; end; if Length (Output) > 0 then Ada.Text_IO.Create (Output_File, Ada.Text_IO.Out_File, To_String (Output)); Ada.Text_IO.Set_Output (Output_File); end if; Ada.Text_IO.Put ("<benchmark language='Ada' driver='"); Ada.Text_IO.Put (Context.Get_Driver_Name); Ada.Text_IO.Put ("' threads='"); Ada.Text_IO.Put (Util.Strings.Image (Thread_Count)); Ada.Text_IO.Put ("' rss_size='"); Ada.Text_IO.Put (Util.Strings.Image (Rss_Size)); Ada.Text_IO.Put ("' peek_rss_size='"); Ada.Text_IO.Put (Util.Strings.Image (Hwm_Size)); Ada.Text_IO.Put ("' user_time='"); Ada.Text_IO.Put (Util.Strings.Image (User_Time)); Ada.Text_IO.Put ("' sys_time='"); Ada.Text_IO.Put (Util.Strings.Image (Sys_Time)); Ada.Text_IO.Put_Line ("'>"); Util.Measures.Write (Context.Perf, "SQL Benchmark", (if Length (Output) > 0 then Output_File else Ada.Text_IO.Standard_Output)); Ada.Text_IO.Put_Line ("</benchmark>"); Ada.Text_IO.Flush; exception when E : ADO.Connections.Database_Error | ADO.Sessions.Connection_Error => Ada.Text_IO.Put_Line (Ada.Text_IO.Standard_Error, "Cannot connect to database: " & Ada.Exceptions.Exception_Message (E)); Ada.Command_Line.Set_Exit_Status (1); end Sqlbench.Main;
MinimSecure/unum-sdk
Ada
912
ads
-- Copyright 2011-2019 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. package Pck is procedure Hello; procedure There; -- The name of that procedure needs to be greater (in terms -- of alphabetical order) than the name of the procedure above. end Pck;
tum-ei-rcs/StratoX
Ada
10,354
ads
------------------------------------------------------------------------------ -- -- -- GNAT RUNTIME COMPONENTS -- -- -- -- S Y S T E M . G E N E R I C _ C _ M A T H _ I N T E R F A C E -- -- -- -- S p e c -- -- -- -- Copyright (C) 1992-2015, 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. -- -- -- -- -- -- -- -- -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ -- This is the Ada Cert Math specific version of s-gcmain.ads. -- @llrset s-gcmain.ads -- Generic C Math Interface -- ======================== -- Provide the elementary mathematical functions support library packages. -- This package is an implementation of the Ada elementary functions -- using the C math library. The C library is assumed to be conforming -- with ISO/IEC 9899:1999 (C99). In particular, all identities specified -- in chapter F.9 must hold. Furthermore, the accuracy of the various -- functions is assumed to be sufficient for the strict mode specified -- in Annex G of the Ada standard. -- For environments where this is not true, the generic Ada implementations -- should be used. These only require the standard arithmetic operations. -- Typically, the generic functions are imported from C as follows. -- For the C type "float": -- function Sin (X : Float) return Float; -- pragma Import (C, Sin, "sinf"); -- or for the C type "double": -- function Sin (X : Long_Float) return Long_Float; -- pragma Import (C, Sin, "sin"); -- or for the C type "long double": -- function Sin (X : Long_Long_Float) return Long_Long_Float -- pragma Import (C, Sin, "sinl"); generic type Float_Type is digits <>; with function C_Sqrt (X : Float_Type) return Float_Type is <>; with function C_Log (X : Float_Type) return Float_Type is <>; with function C_Exp (X : Float_Type) return Float_Type is <>; with function C_Pow (X, Y : Float_Type) return Float_Type is <>; with function C_Sin (X : Float_Type) return Float_Type is <>; with function C_Cos (X : Float_Type) return Float_Type is <>; with function C_Tan (X : Float_Type) return Float_Type is <>; with function C_Asin (X : Float_Type) return Float_Type is <>; with function C_Acos (X : Float_Type) return Float_Type is <>; with function C_Atan2 (Y, X : Float_Type) return Float_Type is <>; with function C_Sinh (X : Float_Type) return Float_Type is <>; with function C_Cosh (X : Float_Type) return Float_Type is <>; with function C_Tanh (X : Float_Type) return Float_Type is <>; with function C_Asinh (X : Float_Type) return Float_Type is <>; with function C_Acosh (X : Float_Type) return Float_Type is <>; with function C_Atanh (Y : Float_Type) return Float_Type is <>; package System.Generic_C_Math_Interface is pragma Pure (Generic_C_Math_Interface); -- pragma Assert (Float_Type'Signed_Zeros); -- Assertion fails on e500v2 targets pragma Assert (Float_Type'Machine_Radix = 2); function Sqrt (X : Float_Type'Base) return Float_Type'Base; -- @llr Sqrt (Float_Type) -- This function shall return the square root of <X> function Log (X : Float_Type'Base) return Float_Type'Base; -- @llr Log (Float_Type) -- This function shall return the logarithm of <X> function Log (X, Base : Float_Type'Base) return Float_Type'Base; -- @llr Log (Float_Type; Float_Type) -- This function shall compute the logarithm of <X> with the specified base function Exp (X : Float_Type'Base) return Float_Type'Base; -- @llr Exp (Float_Type) -- This function shall compute the exponent of <X> function "**" (Left, Right : Float_Type'Base) return Float_Type'Base; -- @llr "**" (Float_Type; Float_Type) -- This function shall compute <Left> to the power of <Right> function Sin (X : Float_Type'Base) return Float_Type'Base; -- @llr Sin (Float_Type) -- This function shall return the sine of <X> function Sin (X, Cycle : Float_Type'Base) return Float_Type'Base; -- @llr Sin (Float_Type; Float_Type) -- This function shall return the sine of <X> with the specified base function Cos (X : Float_Type'Base) return Float_Type'Base; -- @llr Cos (Float_Type) -- This function shall return the cosine of <X> function Cos (X, Cycle : Float_Type'Base) return Float_Type'Base; -- @llr Cos (Float_Type; Float_Type) -- This function shall return the cosine of <X> with the specified base function Tan (X : Float_Type'Base) return Float_Type'Base; -- @llr Tan (Float_Type) -- This function shall return the tangent of <X> function Tan (X, Cycle : Float_Type'Base) return Float_Type'Base; -- @llr Tan (Float_Type; Float_Type) -- This function shall return the tangent of <X> with the specified base function Cot (X : Float_Type'Base) return Float_Type'Base; -- @llr Cot (Float_Type) -- This function shall return the cotangent of <X> function Cot (X, Cycle : Float_Type'Base) return Float_Type'Base; -- @llr Cot (Float_Type; Float_Type) -- This function shall return the cotangent of <X> with the specified base function Arcsin (X : Float_Type'Base) return Float_Type'Base; -- @llr Arcsin (Float_Type) -- This function shall return the inverse sine of <X> function Arcsin (X, Cycle : Float_Type'Base) return Float_Type'Base; -- @llr Arcsin (Float_Type; Float_Type) -- This function shall return the inverse sine of <X> with the specified -- base function Arccos (X : Float_Type'Base) return Float_Type'Base; -- @llr Arccos (Float_Type) -- This function shall return the inverse cosine of <X> function Arccos (X, Cycle : Float_Type'Base) return Float_Type'Base; -- @llr Arccos (Float_Type; Float_Type) -- This function shall return the inverse cosine of <X> with the specified -- base function Arctan (Y : Float_Type'Base; X : Float_Type'Base := 1.0) return Float_Type'Base; -- @llr Arctan (Float_Type; Float_Type) -- This function shall compute the principal value of the inverse tangent -- of <Y> / <X> function Arctan (Y : Float_Type'Base; X : Float_Type'Base := 1.0; Cycle : Float_Type'Base) return Float_Type'Base; -- @llr Arctan (Float_Type; Float_Type; Float_Type) -- This function shall compute the principal value of the inverse tangent -- of <Y> / <X> with the specified base function Arccot (X : Float_Type'Base; Y : Float_Type'Base := 1.0) return Float_Type'Base; -- @llr Arccot (Float_Type; Float_Type) -- This function shall compute the principal value of the inverse cotangent -- of <Y> / <X> function Arccot (X : Float_Type'Base; Y : Float_Type'Base := 1.0; Cycle : Float_Type'Base) return Float_Type'Base; -- @llr Arccot (Float_Type; Float_Type; FLoat_Type) -- This function shall compute the principal value of the inverse cotangent -- of <Y> / <X> with the specified base function Sinh (X : Float_Type'Base) return Float_Type'Base; -- @llr Sinh (Float_Type) -- This function shall return the hyperbolic sine of <X> function Cosh (X : Float_Type'Base) return Float_Type'Base; -- @llr Cosh (Float_Type) -- This function shall return the hyperbolic cosine of <X> function Tanh (X : Float_Type'Base) return Float_Type'Base; -- @llr Tanh (Float_Type) -- This function shall return the hyperbolic tangent of <X> function Coth (X : Float_Type'Base) return Float_Type'Base; -- @llr Coth (Float_Type) -- This function shall return the hyperbolic cotangent of <X> function Arcsinh (X : Float_Type'Base) return Float_Type'Base; -- @llr Arcsinh (Float_Type) -- This function shall return the inverse hyperbolic sine of <X> function Arccosh (X : Float_Type'Base) return Float_Type'Base; -- @llr Arccosh (Float_Type) -- This function shall return the inverse hyperbolic cosine of <X> function Arctanh (X : Float_Type'Base) return Float_Type'Base; -- @llr Arctanh (Float_Type) -- This function shall return the inverse hyperbolic tangent of <X> function Arccoth (X : Float_Type'Base) return Float_Type'Base; -- @llr Arccoth (Float_Type) -- This function shall return the inverse hyperbolic cotangent of <X> end System.Generic_C_Math_Interface;
reznikmm/matreshka
Ada
5,295
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.Call_Behavior_Actions.Collections is pragma Preelaborate; package UML_Call_Behavior_Action_Collections is new AMF.Generic_Collections (UML_Call_Behavior_Action, UML_Call_Behavior_Action_Access); type Set_Of_UML_Call_Behavior_Action is new UML_Call_Behavior_Action_Collections.Set with null record; Empty_Set_Of_UML_Call_Behavior_Action : constant Set_Of_UML_Call_Behavior_Action; type Ordered_Set_Of_UML_Call_Behavior_Action is new UML_Call_Behavior_Action_Collections.Ordered_Set with null record; Empty_Ordered_Set_Of_UML_Call_Behavior_Action : constant Ordered_Set_Of_UML_Call_Behavior_Action; type Bag_Of_UML_Call_Behavior_Action is new UML_Call_Behavior_Action_Collections.Bag with null record; Empty_Bag_Of_UML_Call_Behavior_Action : constant Bag_Of_UML_Call_Behavior_Action; type Sequence_Of_UML_Call_Behavior_Action is new UML_Call_Behavior_Action_Collections.Sequence with null record; Empty_Sequence_Of_UML_Call_Behavior_Action : constant Sequence_Of_UML_Call_Behavior_Action; private Empty_Set_Of_UML_Call_Behavior_Action : constant Set_Of_UML_Call_Behavior_Action := (UML_Call_Behavior_Action_Collections.Set with null record); Empty_Ordered_Set_Of_UML_Call_Behavior_Action : constant Ordered_Set_Of_UML_Call_Behavior_Action := (UML_Call_Behavior_Action_Collections.Ordered_Set with null record); Empty_Bag_Of_UML_Call_Behavior_Action : constant Bag_Of_UML_Call_Behavior_Action := (UML_Call_Behavior_Action_Collections.Bag with null record); Empty_Sequence_Of_UML_Call_Behavior_Action : constant Sequence_Of_UML_Call_Behavior_Action := (UML_Call_Behavior_Action_Collections.Sequence with null record); end AMF.UML.Call_Behavior_Actions.Collections;
Fabien-Chouteau/samd51-hal
Ada
3,893
adb
------------------------------------------------------------------------------ -- -- -- Copyright (C) 2019, AdaCore -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions are -- -- met: -- -- 1. Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- 2. Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in -- -- the documentation and/or other materials provided with the -- -- distribution. -- -- 3. Neither the name of the copyright holder nor the names of its -- -- contributors may be used to endorse or promote products derived -- -- from this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT -- -- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, -- -- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY -- -- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT -- -- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE -- -- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ package body SAM.SERCOM is ---------------- -- Configured -- ---------------- function Configured (This : SERCOM_Device) return Boolean is begin return This.Config_Done; end Configured; ------------- -- Enabled -- ------------- function Enabled (This : SERCOM_Device) return Boolean is begin return This.Periph.SERCOM_SPI.CTRLA.ENABLE; end Enabled; ------------ -- Enable -- ------------ procedure Enable (This : in out SERCOM_Device) is begin This.Periph.SERCOM_SPI.CTRLA.ENABLE := True; -- Wait for enable synchronization signal while This.Periph.SERCOM_SPI.SYNCBUSY.ENABLE loop null; end loop; end Enable; ------------- -- Disable -- ------------- procedure Disable (This : in out SERCOM_Device) is begin This.Periph.SERCOM_SPI.CTRLA.ENABLE := False; end Disable; ----------- -- Reset -- ----------- procedure Reset (This : in out SERCOM_Device) is begin This.Periph.SERCOM_SPI.CTRLA.SWRST := True; -- Wait for reset synchronization signal while This.Periph.SERCOM_SPI.SYNCBUSY.SWRST loop null; end loop; This.Config_Done := False; end Reset; --------------------- -- Debug_Stop_Mode -- --------------------- procedure Debug_Stop_Mode (This : in out SERCOM_Device; Enabled : Boolean := True) is begin This.Periph.SERCOM_SPI.DBGCTRL.DBGSTOP := Enabled; end Debug_Stop_Mode; end SAM.SERCOM;
nerilex/ada-util
Ada
7,250
ads
----------------------------------------------------------------------- -- util-serialize-mappers -- Serialize objects in various formats -- Copyright (C) 2010, 2011 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.Strings.Unbounded; with Ada.Finalization; with Util.Beans.Objects; with Util.Log.Loggers; with Util.Serialize.Contexts; package Util.Serialize.Mappers is Mapping_Error : exception; -- The <b>Field_Error</b> exception can be raised by a mapper to indicate that the field -- that was extracted is invalid. The exception message will be reported as an error message -- and the IO reader will be marked as in error. The IO reader will continue to read and -- process the mappings. Field_Error : exception; -- The <b>Field_Fatal_Error</b> exception is similar to the <b>Field_Error</b> exception. -- However the IO reader will report the error and immediately stop. Field_Fatal_Error : exception; -- ------------------------------ -- Mapping -- ------------------------------ -- The <b>Mapping</b> represents a rule component to establish a mapping -- when reading some format (XML, JSON). type Mapping is abstract tagged limited private; type Mapping_Access is access all Mapping'Class; -- ------------------------------ -- Mapper -- ------------------------------ -- The <b>Mapper</b> represents a node of the mapping tree. The mapping -- tree is walked horizontally to find siblings. It is walked vertically when -- entering or leaving an object. type Mapper is new Ada.Finalization.Limited_Controlled with private; type Mapper_Access is access all Mapper'Class; -- Execute the mapping operation on the object associated with the current context. -- The object is extracted from the context and the <b>Execute</b> operation is called. procedure Execute (Handler : in Mapper; Map : in Mapping'Class; Ctx : in out Util.Serialize.Contexts.Context'Class; Value : in Util.Beans.Objects.Object); -- Add a mapping for setting a member. When the attribute rule defined by <b>Path</b> -- is matched, the <b>Set_Member</b> procedure will be called with the value and the -- <b>Field</b> identification. -- Example: -- info/first_name matches: <info><first_name>...</first_name></info> -- info/a/b/name matches: <info><a><b><name>...</name></b></a></info> -- */a/b/name matches: <i><i><j><a><b><name>...</name></b></a></j></i></i> -- **/name matches: <i><name>...</name></i>, <b><c><name>...</name></c></b> procedure Add_Mapping (Into : in out Mapper; Path : in String; Map : in Mapping_Access); procedure Add_Mapping (Into : in out Mapper; Path : in String; Map : in Mapper_Access); -- Clone the <b>Handler</b> instance and get a copy of that single object. function Clone (Handler : in Mapper) return Mapper_Access; -- Set the name/value pair on the current object. For each active mapping, -- find whether a rule matches our name and execute it. procedure Set_Member (Handler : in Mapper; Name : in String; Value : in Util.Beans.Objects.Object; Attribute : in Boolean := False; Context : in out Util.Serialize.Contexts.Context'Class); procedure Start_Object (Handler : in Mapper; Context : in out Util.Serialize.Contexts.Context'Class; Name : in String); procedure Finish_Object (Handler : in Mapper; Context : in out Util.Serialize.Contexts.Context'Class; Name : in String); -- Find the mapper associated with the given name. -- Returns null if there is no mapper. function Find_Mapper (Controller : in Mapper; Name : in String; Attribute : in Boolean := False) return Mapper_Access; function Is_Proxy (Controller : in Mapper) return Boolean; -- Returns true if the mapper is a wildcard node (matches any element). function Is_Wildcard (Controller : in Mapper) return Boolean; -- Returns the mapping name. function Get_Name (Controller : in Mapper) return String; procedure Iterate (Controller : in Mapper; Process : not null access procedure (Map : in Mapper'Class)); -- Dump the mapping tree on the logger using the INFO log level. procedure Dump (Handler : in Mapper'Class; Log : in Util.Log.Loggers.Logger'Class; Prefix : in String := ""); private -- Find a path component representing a child mapper under <b>From</b> and -- identified by the given <b>Name</b>. If the mapper is not found, a new -- Mapper_Node is created. procedure Find_Path_Component (From : in out Mapper'Class; Name : in String; Root : in out Mapper_Access; Result : out Mapper_Access); -- Build the mapping tree that corresponds to the given <b>Path</b>. -- Each path component is represented by a <b>Mapper_Node</b> element. -- The node is created if it does not exists. procedure Build_Path (Into : in out Mapper'Class; Path : in String; Last_Pos : out Natural; Node : out Mapper_Access); type Mapping is abstract tagged limited record Mapper : Mapper_Access; Name : Ada.Strings.Unbounded.Unbounded_String; Is_Attribute : Boolean := False; end record; type Mapper is new Ada.Finalization.Limited_Controlled with record Next_Mapping : Mapper_Access := null; First_Child : Mapper_Access := null; Mapper : Mapper_Access := null; Mapping : Mapping_Access := null; Name : Ada.Strings.Unbounded.Unbounded_String; Is_Proxy_Mapper : Boolean := False; Is_Clone : Boolean := False; Is_Wildcard : Boolean := False; Is_Deep_Wildcard : Boolean := False; end record; -- Finalize the object and release any mapping. overriding procedure Finalize (Controller : in out Mapper); end Util.Serialize.Mappers;
DrenfongWong/tkm-rpc
Ada
260
ads
with Tkmrpc.Request; with Tkmrpc.Response; package Tkmrpc.Operation_Handlers.Ike.Cc_Reset is procedure Handle (Req : Request.Data_Type; Res : out Response.Data_Type); -- Handler for the cc_reset operation. end Tkmrpc.Operation_Handlers.Ike.Cc_Reset;
eqcola/ada-ado
Ada
2,680
adb
----------------------------------------------------------------------- -- Print_User -- Example to find an object from the database -- Copyright (C) 2010, 2011 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with ADO; with ADO.Drivers; with ADO.Sessions; with ADO.SQL; with ADO.Sessions.Factory; with Samples.User.Model; with Util.Log.Loggers; with Ada.Text_IO; with Ada.Command_Line; procedure Print_User is use ADO; use Ada; use Samples.User.Model; Factory : ADO.Sessions.Factory.Session_Factory; begin Util.Log.Loggers.Initialize ("samples.properties"); -- Initialize the database drivers. ADO.Drivers.Initialize ("samples.properties"); if Ada.Command_Line.Argument_Count < 1 then Ada.Text_IO.Put_Line ("Usage: print_user user-name ..."); Ada.Text_IO.Put_Line ("Example: print_user joe"); Ada.Command_Line.Set_Exit_Status (2); return; end if; -- Create and configure the connection pool Factory.Create (ADO.Drivers.Get_Config ("ado.database")); declare Session : ADO.Sessions.Session := Factory.Get_Session; User : User_Ref; Found : Boolean; begin for I in 1 .. Ada.Command_Line.Argument_Count loop declare User_Name : constant String := Ada.Command_Line.Argument (I); Query : ADO.SQL.Query; begin Ada.Text_IO.Put_Line ("Searching '" & User_Name & "'..."); Query.Bind_Param (1, User_Name); Query.Set_Filter ("name = ?"); User.Find (Session => Session, Query => Query, Found => Found); if Found then Ada.Text_IO.Put_Line (" Id : " & Identifier'Image (User.Get_Id)); Ada.Text_IO.Put_Line (" User : " & User.Get_Name); Ada.Text_IO.Put_Line (" Email : " & User.Get_Email); else Ada.Text_IO.Put_Line (" User '" & User_Name & "' does not exist"); end if; end; end loop; end; end Print_User;
AdaCore/libadalang
Ada
56
ads
package Testpr2 is pragma Preelaborate; end Testpr2;
reznikmm/matreshka
Ada
5,295
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Generic_Collections; package AMF.CMOF.Packageable_Elements.Collections is pragma Preelaborate; package CMOF_Packageable_Element_Collections is new AMF.Generic_Collections (CMOF_Packageable_Element, CMOF_Packageable_Element_Access); type Set_Of_CMOF_Packageable_Element is new CMOF_Packageable_Element_Collections.Set with null record; Empty_Set_Of_CMOF_Packageable_Element : constant Set_Of_CMOF_Packageable_Element; type Ordered_Set_Of_CMOF_Packageable_Element is new CMOF_Packageable_Element_Collections.Ordered_Set with null record; Empty_Ordered_Set_Of_CMOF_Packageable_Element : constant Ordered_Set_Of_CMOF_Packageable_Element; type Bag_Of_CMOF_Packageable_Element is new CMOF_Packageable_Element_Collections.Bag with null record; Empty_Bag_Of_CMOF_Packageable_Element : constant Bag_Of_CMOF_Packageable_Element; type Sequence_Of_CMOF_Packageable_Element is new CMOF_Packageable_Element_Collections.Sequence with null record; Empty_Sequence_Of_CMOF_Packageable_Element : constant Sequence_Of_CMOF_Packageable_Element; private Empty_Set_Of_CMOF_Packageable_Element : constant Set_Of_CMOF_Packageable_Element := (CMOF_Packageable_Element_Collections.Set with null record); Empty_Ordered_Set_Of_CMOF_Packageable_Element : constant Ordered_Set_Of_CMOF_Packageable_Element := (CMOF_Packageable_Element_Collections.Ordered_Set with null record); Empty_Bag_Of_CMOF_Packageable_Element : constant Bag_Of_CMOF_Packageable_Element := (CMOF_Packageable_Element_Collections.Bag with null record); Empty_Sequence_Of_CMOF_Packageable_Element : constant Sequence_Of_CMOF_Packageable_Element := (CMOF_Packageable_Element_Collections.Sequence with null record); end AMF.CMOF.Packageable_Elements.Collections;
jrmarino/AdaBase
Ada
472
adb
with AdaBase; with Connect; with Ada.Text_IO; procedure Fruit1 is package CON renames Connect; package TIO renames Ada.Text_IO; numrows : AdaBase.Affected_Rows; cmd : constant String := "DELETE FROM fruits WHERE color = 'red'"; begin CON.connect_database; numrows := CON.DR.execute (sql => cmd); TIO.Put_Line ("SQL: " & cmd); TIO.Put_Line ("Result: Deleted" & numrows'Img & " rows"); CON.DR.rollback; CON.DR.disconnect; end Fruit1;
reznikmm/matreshka
Ada
5,460
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Generic_Collections; package AMF.Standard_Profile_L2.Subsystems.Collections is pragma Preelaborate; package Standard_Profile_L2_Subsystem_Collections is new AMF.Generic_Collections (Standard_Profile_L2_Subsystem, Standard_Profile_L2_Subsystem_Access); type Set_Of_Standard_Profile_L2_Subsystem is new Standard_Profile_L2_Subsystem_Collections.Set with null record; Empty_Set_Of_Standard_Profile_L2_Subsystem : constant Set_Of_Standard_Profile_L2_Subsystem; type Ordered_Set_Of_Standard_Profile_L2_Subsystem is new Standard_Profile_L2_Subsystem_Collections.Ordered_Set with null record; Empty_Ordered_Set_Of_Standard_Profile_L2_Subsystem : constant Ordered_Set_Of_Standard_Profile_L2_Subsystem; type Bag_Of_Standard_Profile_L2_Subsystem is new Standard_Profile_L2_Subsystem_Collections.Bag with null record; Empty_Bag_Of_Standard_Profile_L2_Subsystem : constant Bag_Of_Standard_Profile_L2_Subsystem; type Sequence_Of_Standard_Profile_L2_Subsystem is new Standard_Profile_L2_Subsystem_Collections.Sequence with null record; Empty_Sequence_Of_Standard_Profile_L2_Subsystem : constant Sequence_Of_Standard_Profile_L2_Subsystem; private Empty_Set_Of_Standard_Profile_L2_Subsystem : constant Set_Of_Standard_Profile_L2_Subsystem := (Standard_Profile_L2_Subsystem_Collections.Set with null record); Empty_Ordered_Set_Of_Standard_Profile_L2_Subsystem : constant Ordered_Set_Of_Standard_Profile_L2_Subsystem := (Standard_Profile_L2_Subsystem_Collections.Ordered_Set with null record); Empty_Bag_Of_Standard_Profile_L2_Subsystem : constant Bag_Of_Standard_Profile_L2_Subsystem := (Standard_Profile_L2_Subsystem_Collections.Bag with null record); Empty_Sequence_Of_Standard_Profile_L2_Subsystem : constant Sequence_Of_Standard_Profile_L2_Subsystem := (Standard_Profile_L2_Subsystem_Collections.Sequence with null record); end AMF.Standard_Profile_L2.Subsystems.Collections;
persan/protobuf-ada
Ada
162
ads
with Google.Protobuf.Wire_Format; package Protocol_Buffers.Wire_Format renames Google.Protobuf.Wire_Format with Obsolescent => "use Google.Protobuf.Wire_Format";
JeremyGrosser/clock3
Ada
34,489
ads
pragma Style_Checks (Off); -- Copyright (c) 2018 Microchip Technology Inc. -- -- SPDX-License-Identifier: Apache-2.0 -- -- 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. -- This spec has been automatically generated from ATSAMD21G18A.svd pragma Restrictions (No_Elaboration_Code); with HAL; with System; package SAMD21_SVD.SYSCTRL is pragma Preelaborate; --------------- -- Registers -- --------------- -- Interrupt Enable Clear type SYSCTRL_INTENCLR_Register is record -- XOSC Ready Interrupt Enable XOSCRDY : Boolean := False; -- XOSC32K Ready Interrupt Enable XOSC32KRDY : Boolean := False; -- OSC32K Ready Interrupt Enable OSC32KRDY : Boolean := False; -- OSC8M Ready Interrupt Enable OSC8MRDY : Boolean := False; -- DFLL Ready Interrupt Enable DFLLRDY : Boolean := False; -- DFLL Out Of Bounds Interrupt Enable DFLLOOB : Boolean := False; -- DFLL Lock Fine Interrupt Enable DFLLLCKF : Boolean := False; -- DFLL Lock Coarse Interrupt Enable DFLLLCKC : Boolean := False; -- DFLL Reference Clock Stopped Interrupt Enable DFLLRCS : Boolean := False; -- BOD33 Ready Interrupt Enable BOD33RDY : Boolean := False; -- BOD33 Detection Interrupt Enable BOD33DET : Boolean := False; -- BOD33 Synchronization Ready Interrupt Enable B33SRDY : Boolean := False; -- unspecified Reserved_12_14 : HAL.UInt3 := 16#0#; -- DPLL Lock Rise Interrupt Enable DPLLLCKR : Boolean := False; -- DPLL Lock Fall Interrupt Enable DPLLLCKF : Boolean := False; -- DPLL Lock Timeout Interrupt Enable DPLLLTO : Boolean := False; -- unspecified Reserved_18_31 : HAL.UInt14 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for SYSCTRL_INTENCLR_Register use record XOSCRDY at 0 range 0 .. 0; XOSC32KRDY at 0 range 1 .. 1; OSC32KRDY at 0 range 2 .. 2; OSC8MRDY at 0 range 3 .. 3; DFLLRDY at 0 range 4 .. 4; DFLLOOB at 0 range 5 .. 5; DFLLLCKF at 0 range 6 .. 6; DFLLLCKC at 0 range 7 .. 7; DFLLRCS at 0 range 8 .. 8; BOD33RDY at 0 range 9 .. 9; BOD33DET at 0 range 10 .. 10; B33SRDY at 0 range 11 .. 11; Reserved_12_14 at 0 range 12 .. 14; DPLLLCKR at 0 range 15 .. 15; DPLLLCKF at 0 range 16 .. 16; DPLLLTO at 0 range 17 .. 17; Reserved_18_31 at 0 range 18 .. 31; end record; -- Interrupt Enable Set type SYSCTRL_INTENSET_Register is record -- XOSC Ready Interrupt Enable XOSCRDY : Boolean := False; -- XOSC32K Ready Interrupt Enable XOSC32KRDY : Boolean := False; -- OSC32K Ready Interrupt Enable OSC32KRDY : Boolean := False; -- OSC8M Ready Interrupt Enable OSC8MRDY : Boolean := False; -- DFLL Ready Interrupt Enable DFLLRDY : Boolean := False; -- DFLL Out Of Bounds Interrupt Enable DFLLOOB : Boolean := False; -- DFLL Lock Fine Interrupt Enable DFLLLCKF : Boolean := False; -- DFLL Lock Coarse Interrupt Enable DFLLLCKC : Boolean := False; -- DFLL Reference Clock Stopped Interrupt Enable DFLLRCS : Boolean := False; -- BOD33 Ready Interrupt Enable BOD33RDY : Boolean := False; -- BOD33 Detection Interrupt Enable BOD33DET : Boolean := False; -- BOD33 Synchronization Ready Interrupt Enable B33SRDY : Boolean := False; -- unspecified Reserved_12_14 : HAL.UInt3 := 16#0#; -- DPLL Lock Rise Interrupt Enable DPLLLCKR : Boolean := False; -- DPLL Lock Fall Interrupt Enable DPLLLCKF : Boolean := False; -- DPLL Lock Timeout Interrupt Enable DPLLLTO : Boolean := False; -- unspecified Reserved_18_31 : HAL.UInt14 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for SYSCTRL_INTENSET_Register use record XOSCRDY at 0 range 0 .. 0; XOSC32KRDY at 0 range 1 .. 1; OSC32KRDY at 0 range 2 .. 2; OSC8MRDY at 0 range 3 .. 3; DFLLRDY at 0 range 4 .. 4; DFLLOOB at 0 range 5 .. 5; DFLLLCKF at 0 range 6 .. 6; DFLLLCKC at 0 range 7 .. 7; DFLLRCS at 0 range 8 .. 8; BOD33RDY at 0 range 9 .. 9; BOD33DET at 0 range 10 .. 10; B33SRDY at 0 range 11 .. 11; Reserved_12_14 at 0 range 12 .. 14; DPLLLCKR at 0 range 15 .. 15; DPLLLCKF at 0 range 16 .. 16; DPLLLTO at 0 range 17 .. 17; Reserved_18_31 at 0 range 18 .. 31; end record; -- Interrupt Flag Status and Clear type SYSCTRL_INTFLAG_Register is record -- XOSC Ready XOSCRDY : Boolean := False; -- XOSC32K Ready XOSC32KRDY : Boolean := False; -- OSC32K Ready OSC32KRDY : Boolean := False; -- OSC8M Ready OSC8MRDY : Boolean := False; -- DFLL Ready DFLLRDY : Boolean := False; -- DFLL Out Of Bounds DFLLOOB : Boolean := False; -- DFLL Lock Fine DFLLLCKF : Boolean := False; -- DFLL Lock Coarse DFLLLCKC : Boolean := False; -- DFLL Reference Clock Stopped DFLLRCS : Boolean := False; -- BOD33 Ready BOD33RDY : Boolean := False; -- BOD33 Detection BOD33DET : Boolean := False; -- BOD33 Synchronization Ready B33SRDY : Boolean := False; -- unspecified Reserved_12_14 : HAL.UInt3 := 16#0#; -- DPLL Lock Rise DPLLLCKR : Boolean := False; -- DPLL Lock Fall DPLLLCKF : Boolean := False; -- DPLL Lock Timeout DPLLLTO : Boolean := False; -- unspecified Reserved_18_31 : HAL.UInt14 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for SYSCTRL_INTFLAG_Register use record XOSCRDY at 0 range 0 .. 0; XOSC32KRDY at 0 range 1 .. 1; OSC32KRDY at 0 range 2 .. 2; OSC8MRDY at 0 range 3 .. 3; DFLLRDY at 0 range 4 .. 4; DFLLOOB at 0 range 5 .. 5; DFLLLCKF at 0 range 6 .. 6; DFLLLCKC at 0 range 7 .. 7; DFLLRCS at 0 range 8 .. 8; BOD33RDY at 0 range 9 .. 9; BOD33DET at 0 range 10 .. 10; B33SRDY at 0 range 11 .. 11; Reserved_12_14 at 0 range 12 .. 14; DPLLLCKR at 0 range 15 .. 15; DPLLLCKF at 0 range 16 .. 16; DPLLLTO at 0 range 17 .. 17; Reserved_18_31 at 0 range 18 .. 31; end record; -- Power and Clocks Status type SYSCTRL_PCLKSR_Register is record -- Read-only. XOSC Ready XOSCRDY : Boolean; -- Read-only. XOSC32K Ready XOSC32KRDY : Boolean; -- Read-only. OSC32K Ready OSC32KRDY : Boolean; -- Read-only. OSC8M Ready OSC8MRDY : Boolean; -- Read-only. DFLL Ready DFLLRDY : Boolean; -- Read-only. DFLL Out Of Bounds DFLLOOB : Boolean; -- Read-only. DFLL Lock Fine DFLLLCKF : Boolean; -- Read-only. DFLL Lock Coarse DFLLLCKC : Boolean; -- Read-only. DFLL Reference Clock Stopped DFLLRCS : Boolean; -- Read-only. BOD33 Ready BOD33RDY : Boolean; -- Read-only. BOD33 Detection BOD33DET : Boolean; -- Read-only. BOD33 Synchronization Ready B33SRDY : Boolean; -- unspecified Reserved_12_14 : HAL.UInt3; -- Read-only. DPLL Lock Rise DPLLLCKR : Boolean; -- Read-only. DPLL Lock Fall DPLLLCKF : Boolean; -- Read-only. DPLL Lock Timeout DPLLLTO : Boolean; -- unspecified Reserved_18_31 : HAL.UInt14; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for SYSCTRL_PCLKSR_Register use record XOSCRDY at 0 range 0 .. 0; XOSC32KRDY at 0 range 1 .. 1; OSC32KRDY at 0 range 2 .. 2; OSC8MRDY at 0 range 3 .. 3; DFLLRDY at 0 range 4 .. 4; DFLLOOB at 0 range 5 .. 5; DFLLLCKF at 0 range 6 .. 6; DFLLLCKC at 0 range 7 .. 7; DFLLRCS at 0 range 8 .. 8; BOD33RDY at 0 range 9 .. 9; BOD33DET at 0 range 10 .. 10; B33SRDY at 0 range 11 .. 11; Reserved_12_14 at 0 range 12 .. 14; DPLLLCKR at 0 range 15 .. 15; DPLLLCKF at 0 range 16 .. 16; DPLLLTO at 0 range 17 .. 17; Reserved_18_31 at 0 range 18 .. 31; end record; -- Oscillator Gain type XOSC_GAINSelect is (-- 2MHz Val_0, -- 4MHz Val_1, -- 8MHz Val_2, -- 16MHz Val_3, -- 30MHz Val_4) with Size => 3; for XOSC_GAINSelect use (Val_0 => 0, Val_1 => 1, Val_2 => 2, Val_3 => 3, Val_4 => 4); subtype SYSCTRL_XOSC_STARTUP_Field is HAL.UInt4; -- External Multipurpose Crystal Oscillator (XOSC) Control type SYSCTRL_XOSC_Register is record -- unspecified Reserved_0_0 : HAL.Bit := 16#0#; -- Oscillator Enable ENABLE : Boolean := False; -- Crystal Oscillator Enable XTALEN : Boolean := False; -- unspecified Reserved_3_5 : HAL.UInt3 := 16#0#; -- Run in Standby RUNSTDBY : Boolean := False; -- On Demand Control ONDEMAND : Boolean := True; -- Oscillator Gain GAIN : XOSC_GAINSelect := SAMD21_SVD.SYSCTRL.Val_0; -- Automatic Amplitude Gain Control AMPGC : Boolean := False; -- Start-Up Time STARTUP : SYSCTRL_XOSC_STARTUP_Field := 16#0#; end record with Volatile_Full_Access, Object_Size => 16, Bit_Order => System.Low_Order_First; for SYSCTRL_XOSC_Register use record Reserved_0_0 at 0 range 0 .. 0; ENABLE at 0 range 1 .. 1; XTALEN at 0 range 2 .. 2; Reserved_3_5 at 0 range 3 .. 5; RUNSTDBY at 0 range 6 .. 6; ONDEMAND at 0 range 7 .. 7; GAIN at 0 range 8 .. 10; AMPGC at 0 range 11 .. 11; STARTUP at 0 range 12 .. 15; end record; subtype SYSCTRL_XOSC32K_STARTUP_Field is HAL.UInt3; -- 32kHz External Crystal Oscillator (XOSC32K) Control type SYSCTRL_XOSC32K_Register is record -- unspecified Reserved_0_0 : HAL.Bit := 16#0#; -- Oscillator Enable ENABLE : Boolean := False; -- Crystal Oscillator Enable XTALEN : Boolean := False; -- 32kHz Output Enable EN32K : Boolean := False; -- 1kHz Output Enable EN1K : Boolean := False; -- Automatic Amplitude Control Enable AAMPEN : Boolean := False; -- Run in Standby RUNSTDBY : Boolean := False; -- On Demand Control ONDEMAND : Boolean := True; -- Oscillator Start-Up Time STARTUP : SYSCTRL_XOSC32K_STARTUP_Field := 16#0#; -- unspecified Reserved_11_11 : HAL.Bit := 16#0#; -- Write Lock WRTLOCK : Boolean := False; -- unspecified Reserved_13_15 : HAL.UInt3 := 16#0#; end record with Volatile_Full_Access, Object_Size => 16, Bit_Order => System.Low_Order_First; for SYSCTRL_XOSC32K_Register use record Reserved_0_0 at 0 range 0 .. 0; ENABLE at 0 range 1 .. 1; XTALEN at 0 range 2 .. 2; EN32K at 0 range 3 .. 3; EN1K at 0 range 4 .. 4; AAMPEN at 0 range 5 .. 5; RUNSTDBY at 0 range 6 .. 6; ONDEMAND at 0 range 7 .. 7; STARTUP at 0 range 8 .. 10; Reserved_11_11 at 0 range 11 .. 11; WRTLOCK at 0 range 12 .. 12; Reserved_13_15 at 0 range 13 .. 15; end record; subtype SYSCTRL_OSC32K_STARTUP_Field is HAL.UInt3; subtype SYSCTRL_OSC32K_CALIB_Field is HAL.UInt7; -- 32kHz Internal Oscillator (OSC32K) Control type SYSCTRL_OSC32K_Register is record -- unspecified Reserved_0_0 : HAL.Bit := 16#0#; -- Oscillator Enable ENABLE : Boolean := False; -- 32kHz Output Enable EN32K : Boolean := False; -- 1kHz Output Enable EN1K : Boolean := False; -- unspecified Reserved_4_5 : HAL.UInt2 := 16#0#; -- Run in Standby RUNSTDBY : Boolean := False; -- On Demand Control ONDEMAND : Boolean := True; -- Oscillator Start-Up Time STARTUP : SYSCTRL_OSC32K_STARTUP_Field := 16#0#; -- unspecified Reserved_11_11 : HAL.Bit := 16#0#; -- Write Lock WRTLOCK : Boolean := False; -- unspecified Reserved_13_15 : HAL.UInt3 := 16#0#; -- Oscillator Calibration CALIB : SYSCTRL_OSC32K_CALIB_Field := 16#3F#; -- unspecified Reserved_23_31 : HAL.UInt9 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for SYSCTRL_OSC32K_Register use record Reserved_0_0 at 0 range 0 .. 0; ENABLE at 0 range 1 .. 1; EN32K at 0 range 2 .. 2; EN1K at 0 range 3 .. 3; Reserved_4_5 at 0 range 4 .. 5; RUNSTDBY at 0 range 6 .. 6; ONDEMAND at 0 range 7 .. 7; STARTUP at 0 range 8 .. 10; Reserved_11_11 at 0 range 11 .. 11; WRTLOCK at 0 range 12 .. 12; Reserved_13_15 at 0 range 13 .. 15; CALIB at 0 range 16 .. 22; Reserved_23_31 at 0 range 23 .. 31; end record; subtype SYSCTRL_OSCULP32K_CALIB_Field is HAL.UInt5; -- 32kHz Ultra Low Power Internal Oscillator (OSCULP32K) Control type SYSCTRL_OSCULP32K_Register is record -- Oscillator Calibration CALIB : SYSCTRL_OSCULP32K_CALIB_Field := 16#1F#; -- unspecified Reserved_5_6 : HAL.UInt2 := 16#0#; -- Write Lock WRTLOCK : Boolean := False; end record with Volatile_Full_Access, Object_Size => 8, Bit_Order => System.Low_Order_First; for SYSCTRL_OSCULP32K_Register use record CALIB at 0 range 0 .. 4; Reserved_5_6 at 0 range 5 .. 6; WRTLOCK at 0 range 7 .. 7; end record; -- Oscillator Prescaler type OSC8M_PRESCSelect is (-- 1 Val_0, -- 2 Val_1, -- 4 Val_2, -- 8 Val_3) with Size => 2; for OSC8M_PRESCSelect use (Val_0 => 0, Val_1 => 1, Val_2 => 2, Val_3 => 3); subtype SYSCTRL_OSC8M_CALIB_Field is HAL.UInt12; -- Oscillator Frequency Range type OSC8M_FRANGESelect is (-- 4 to 6MHz Val_0, -- 6 to 8MHz Val_1, -- 8 to 11MHz Val_2, -- 11 to 15MHz Val_3) with Size => 2; for OSC8M_FRANGESelect use (Val_0 => 0, Val_1 => 1, Val_2 => 2, Val_3 => 3); -- 8MHz Internal Oscillator (OSC8M) Control type SYSCTRL_OSC8M_Register is record -- unspecified Reserved_0_0 : HAL.Bit := 16#0#; -- Oscillator Enable ENABLE : Boolean := True; -- unspecified Reserved_2_5 : HAL.UInt4 := 16#0#; -- Run in Standby RUNSTDBY : Boolean := False; -- On Demand Control ONDEMAND : Boolean := True; -- Oscillator Prescaler PRESC : OSC8M_PRESCSelect := SAMD21_SVD.SYSCTRL.Val_3; -- unspecified Reserved_10_15 : HAL.UInt6 := 16#0#; -- Oscillator Calibration CALIB : SYSCTRL_OSC8M_CALIB_Field := 16#707#; -- unspecified Reserved_28_29 : HAL.UInt2 := 16#0#; -- Oscillator Frequency Range FRANGE : OSC8M_FRANGESelect := SAMD21_SVD.SYSCTRL.Val_2; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for SYSCTRL_OSC8M_Register use record Reserved_0_0 at 0 range 0 .. 0; ENABLE at 0 range 1 .. 1; Reserved_2_5 at 0 range 2 .. 5; RUNSTDBY at 0 range 6 .. 6; ONDEMAND at 0 range 7 .. 7; PRESC at 0 range 8 .. 9; Reserved_10_15 at 0 range 10 .. 15; CALIB at 0 range 16 .. 27; Reserved_28_29 at 0 range 28 .. 29; FRANGE at 0 range 30 .. 31; end record; -- DFLL48M Control type SYSCTRL_DFLLCTRL_Register is record -- unspecified Reserved_0_0 : HAL.Bit := 16#0#; -- DFLL Enable ENABLE : Boolean := False; -- Operating Mode Selection MODE : Boolean := False; -- Stable DFLL Frequency STABLE : Boolean := False; -- Lose Lock After Wake LLAW : Boolean := False; -- USB Clock Recovery Mode USBCRM : Boolean := False; -- Run in Standby RUNSTDBY : Boolean := False; -- On Demand Control ONDEMAND : Boolean := True; -- Chill Cycle Disable CCDIS : Boolean := False; -- Quick Lock Disable QLDIS : Boolean := False; -- Bypass Coarse Lock BPLCKC : Boolean := False; -- Wait Lock WAITLOCK : Boolean := False; -- unspecified Reserved_12_15 : HAL.UInt4 := 16#0#; end record with Volatile_Full_Access, Object_Size => 16, Bit_Order => System.Low_Order_First; for SYSCTRL_DFLLCTRL_Register use record Reserved_0_0 at 0 range 0 .. 0; ENABLE at 0 range 1 .. 1; MODE at 0 range 2 .. 2; STABLE at 0 range 3 .. 3; LLAW at 0 range 4 .. 4; USBCRM at 0 range 5 .. 5; RUNSTDBY at 0 range 6 .. 6; ONDEMAND at 0 range 7 .. 7; CCDIS at 0 range 8 .. 8; QLDIS at 0 range 9 .. 9; BPLCKC at 0 range 10 .. 10; WAITLOCK at 0 range 11 .. 11; Reserved_12_15 at 0 range 12 .. 15; end record; subtype SYSCTRL_DFLLVAL_FINE_Field is HAL.UInt10; subtype SYSCTRL_DFLLVAL_COARSE_Field is HAL.UInt6; subtype SYSCTRL_DFLLVAL_DIFF_Field is HAL.UInt16; -- DFLL48M Value type SYSCTRL_DFLLVAL_Register is record -- Fine Value FINE : SYSCTRL_DFLLVAL_FINE_Field := 16#0#; -- Coarse Value COARSE : SYSCTRL_DFLLVAL_COARSE_Field := 16#0#; -- Read-only. Multiplication Ratio Difference DIFF : SYSCTRL_DFLLVAL_DIFF_Field := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for SYSCTRL_DFLLVAL_Register use record FINE at 0 range 0 .. 9; COARSE at 0 range 10 .. 15; DIFF at 0 range 16 .. 31; end record; subtype SYSCTRL_DFLLMUL_MUL_Field is HAL.UInt16; subtype SYSCTRL_DFLLMUL_FSTEP_Field is HAL.UInt10; subtype SYSCTRL_DFLLMUL_CSTEP_Field is HAL.UInt6; -- DFLL48M Multiplier type SYSCTRL_DFLLMUL_Register is record -- DFLL Multiply Factor MUL : SYSCTRL_DFLLMUL_MUL_Field := 16#0#; -- Fine Maximum Step FSTEP : SYSCTRL_DFLLMUL_FSTEP_Field := 16#0#; -- Coarse Maximum Step CSTEP : SYSCTRL_DFLLMUL_CSTEP_Field := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for SYSCTRL_DFLLMUL_Register use record MUL at 0 range 0 .. 15; FSTEP at 0 range 16 .. 25; CSTEP at 0 range 26 .. 31; end record; -- DFLL48M Synchronization type SYSCTRL_DFLLSYNC_Register is record -- unspecified Reserved_0_6 : HAL.UInt7 := 16#0#; -- Write-only. Read Request READREQ : Boolean := False; end record with Volatile_Full_Access, Object_Size => 8, Bit_Order => System.Low_Order_First; for SYSCTRL_DFLLSYNC_Register use record Reserved_0_6 at 0 range 0 .. 6; READREQ at 0 range 7 .. 7; end record; -- BOD33 Action type BOD33_ACTIONSelect is (-- No action NONE, -- The BOD33 generates a reset RESET, -- The BOD33 generates an interrupt INTERRUPT) with Size => 2; for BOD33_ACTIONSelect use (NONE => 0, RESET => 1, INTERRUPT => 2); -- Prescaler Select type BOD33_PSELSelect is (-- Divide clock by 2 DIV2, -- Divide clock by 4 DIV4, -- Divide clock by 8 DIV8, -- Divide clock by 16 DIV16, -- Divide clock by 32 DIV32, -- Divide clock by 64 DIV64, -- Divide clock by 128 DIV128, -- Divide clock by 256 DIV256, -- Divide clock by 512 DIV512, -- Divide clock by 1024 DIV1K, -- Divide clock by 2048 DIV2K, -- Divide clock by 4096 DIV4K, -- Divide clock by 8192 DIV8K, -- Divide clock by 16384 DIV16K, -- Divide clock by 32768 DIV32K, -- Divide clock by 65536 DIV64K) with Size => 4; for BOD33_PSELSelect use (DIV2 => 0, DIV4 => 1, DIV8 => 2, DIV16 => 3, DIV32 => 4, DIV64 => 5, DIV128 => 6, DIV256 => 7, DIV512 => 8, DIV1K => 9, DIV2K => 10, DIV4K => 11, DIV8K => 12, DIV16K => 13, DIV32K => 14, DIV64K => 15); subtype SYSCTRL_BOD33_LEVEL_Field is HAL.UInt6; -- 3.3V Brown-Out Detector (BOD33) Control type SYSCTRL_BOD33_Register is record -- unspecified Reserved_0_0 : HAL.Bit := 16#0#; -- Enable ENABLE : Boolean := False; -- Hysteresis HYST : Boolean := False; -- BOD33 Action ACTION : BOD33_ACTIONSelect := SAMD21_SVD.SYSCTRL.NONE; -- unspecified Reserved_5_5 : HAL.Bit := 16#0#; -- Run in Standby RUNSTDBY : Boolean := False; -- unspecified Reserved_7_7 : HAL.Bit := 16#0#; -- Operation Mode MODE : Boolean := False; -- Clock Enable CEN : Boolean := False; -- unspecified Reserved_10_11 : HAL.UInt2 := 16#0#; -- Prescaler Select PSEL : BOD33_PSELSelect := SAMD21_SVD.SYSCTRL.DIV2; -- BOD33 Threshold Level LEVEL : SYSCTRL_BOD33_LEVEL_Field := 16#0#; -- unspecified Reserved_22_31 : HAL.UInt10 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for SYSCTRL_BOD33_Register use record Reserved_0_0 at 0 range 0 .. 0; ENABLE at 0 range 1 .. 1; HYST at 0 range 2 .. 2; ACTION at 0 range 3 .. 4; Reserved_5_5 at 0 range 5 .. 5; RUNSTDBY at 0 range 6 .. 6; Reserved_7_7 at 0 range 7 .. 7; MODE at 0 range 8 .. 8; CEN at 0 range 9 .. 9; Reserved_10_11 at 0 range 10 .. 11; PSEL at 0 range 12 .. 15; LEVEL at 0 range 16 .. 21; Reserved_22_31 at 0 range 22 .. 31; end record; -- Voltage Regulator System (VREG) Control type SYSCTRL_VREG_Register is record -- unspecified Reserved_0_5 : HAL.UInt6 := 16#0#; -- Run in Standby RUNSTDBY : Boolean := False; -- unspecified Reserved_7_12 : HAL.UInt6 := 16#0#; -- Force LDO Voltage Regulator FORCELDO : Boolean := False; -- unspecified Reserved_14_15 : HAL.UInt2 := 16#0#; end record with Volatile_Full_Access, Object_Size => 16, Bit_Order => System.Low_Order_First; for SYSCTRL_VREG_Register use record Reserved_0_5 at 0 range 0 .. 5; RUNSTDBY at 0 range 6 .. 6; Reserved_7_12 at 0 range 7 .. 12; FORCELDO at 0 range 13 .. 13; Reserved_14_15 at 0 range 14 .. 15; end record; subtype SYSCTRL_VREF_CALIB_Field is HAL.UInt11; -- Voltage References System (VREF) Control type SYSCTRL_VREF_Register is record -- unspecified Reserved_0_0 : HAL.Bit := 16#0#; -- Temperature Sensor Enable TSEN : Boolean := False; -- Bandgap Output Enable BGOUTEN : Boolean := False; -- unspecified Reserved_3_15 : HAL.UInt13 := 16#0#; -- Bandgap Voltage Generator Calibration CALIB : SYSCTRL_VREF_CALIB_Field := 16#0#; -- unspecified Reserved_27_31 : HAL.UInt5 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for SYSCTRL_VREF_Register use record Reserved_0_0 at 0 range 0 .. 0; TSEN at 0 range 1 .. 1; BGOUTEN at 0 range 2 .. 2; Reserved_3_15 at 0 range 3 .. 15; CALIB at 0 range 16 .. 26; Reserved_27_31 at 0 range 27 .. 31; end record; -- DPLL Control A type SYSCTRL_DPLLCTRLA_Register is record -- unspecified Reserved_0_0 : HAL.Bit := 16#0#; -- DPLL Enable ENABLE : Boolean := False; -- unspecified Reserved_2_5 : HAL.UInt4 := 16#0#; -- Run in Standby RUNSTDBY : Boolean := False; -- On Demand Clock Activation ONDEMAND : Boolean := True; end record with Volatile_Full_Access, Object_Size => 8, Bit_Order => System.Low_Order_First; for SYSCTRL_DPLLCTRLA_Register use record Reserved_0_0 at 0 range 0 .. 0; ENABLE at 0 range 1 .. 1; Reserved_2_5 at 0 range 2 .. 5; RUNSTDBY at 0 range 6 .. 6; ONDEMAND at 0 range 7 .. 7; end record; subtype SYSCTRL_DPLLRATIO_LDR_Field is HAL.UInt12; subtype SYSCTRL_DPLLRATIO_LDRFRAC_Field is HAL.UInt4; -- DPLL Ratio Control type SYSCTRL_DPLLRATIO_Register is record -- Loop Divider Ratio LDR : SYSCTRL_DPLLRATIO_LDR_Field := 16#0#; -- unspecified Reserved_12_15 : HAL.UInt4 := 16#0#; -- Loop Divider Ratio Fractional Part LDRFRAC : SYSCTRL_DPLLRATIO_LDRFRAC_Field := 16#0#; -- unspecified Reserved_20_31 : HAL.UInt12 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for SYSCTRL_DPLLRATIO_Register use record LDR at 0 range 0 .. 11; Reserved_12_15 at 0 range 12 .. 15; LDRFRAC at 0 range 16 .. 19; Reserved_20_31 at 0 range 20 .. 31; end record; -- Proportional Integral Filter Selection type DPLLCTRLB_FILTERSelect is (-- Default filter mode DEFAULT, -- Low bandwidth filter LBFILT, -- High bandwidth filter HBFILT, -- High damping filter HDFILT) with Size => 2; for DPLLCTRLB_FILTERSelect use (DEFAULT => 0, LBFILT => 1, HBFILT => 2, HDFILT => 3); -- Reference Clock Selection type DPLLCTRLB_REFCLKSelect is (-- CLK_DPLL_REF0 clock reference REF0, -- CLK_DPLL_REF1 clock reference REF1, -- GCLK_DPLL clock reference GCLK) with Size => 2; for DPLLCTRLB_REFCLKSelect use (REF0 => 0, REF1 => 1, GCLK => 2); -- Lock Time type DPLLCTRLB_LTIMESelect is (-- No time-out DEFAULT, -- Time-out if no lock within 8 ms Val_8MS, -- Time-out if no lock within 9 ms Val_9MS, -- Time-out if no lock within 10 ms Val_10MS, -- Time-out if no lock within 11 ms Val_11MS) with Size => 3; for DPLLCTRLB_LTIMESelect use (DEFAULT => 0, Val_8MS => 4, Val_9MS => 5, Val_10MS => 6, Val_11MS => 7); subtype SYSCTRL_DPLLCTRLB_DIV_Field is HAL.UInt11; -- DPLL Control B type SYSCTRL_DPLLCTRLB_Register is record -- Proportional Integral Filter Selection FILTER : DPLLCTRLB_FILTERSelect := SAMD21_SVD.SYSCTRL.DEFAULT; -- Low-Power Enable LPEN : Boolean := False; -- Wake Up Fast WUF : Boolean := False; -- Reference Clock Selection REFCLK : DPLLCTRLB_REFCLKSelect := SAMD21_SVD.SYSCTRL.REF0; -- unspecified Reserved_6_7 : HAL.UInt2 := 16#0#; -- Lock Time LTIME : DPLLCTRLB_LTIMESelect := SAMD21_SVD.SYSCTRL.DEFAULT; -- unspecified Reserved_11_11 : HAL.Bit := 16#0#; -- Lock Bypass LBYPASS : Boolean := False; -- unspecified Reserved_13_15 : HAL.UInt3 := 16#0#; -- Clock Divider DIV : SYSCTRL_DPLLCTRLB_DIV_Field := 16#0#; -- unspecified Reserved_27_31 : HAL.UInt5 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for SYSCTRL_DPLLCTRLB_Register use record FILTER at 0 range 0 .. 1; LPEN at 0 range 2 .. 2; WUF at 0 range 3 .. 3; REFCLK at 0 range 4 .. 5; Reserved_6_7 at 0 range 6 .. 7; LTIME at 0 range 8 .. 10; Reserved_11_11 at 0 range 11 .. 11; LBYPASS at 0 range 12 .. 12; Reserved_13_15 at 0 range 13 .. 15; DIV at 0 range 16 .. 26; Reserved_27_31 at 0 range 27 .. 31; end record; -- DPLL Status type SYSCTRL_DPLLSTATUS_Register is record -- Read-only. DPLL Lock Status LOCK : Boolean; -- Read-only. Output Clock Ready CLKRDY : Boolean; -- Read-only. DPLL Enable ENABLE : Boolean; -- Read-only. Divider Enable DIV : Boolean; -- unspecified Reserved_4_7 : HAL.UInt4; end record with Volatile_Full_Access, Object_Size => 8, Bit_Order => System.Low_Order_First; for SYSCTRL_DPLLSTATUS_Register use record LOCK at 0 range 0 .. 0; CLKRDY at 0 range 1 .. 1; ENABLE at 0 range 2 .. 2; DIV at 0 range 3 .. 3; Reserved_4_7 at 0 range 4 .. 7; end record; ----------------- -- Peripherals -- ----------------- -- System Control type SYSCTRL_Peripheral is record -- Interrupt Enable Clear INTENCLR : aliased SYSCTRL_INTENCLR_Register; -- Interrupt Enable Set INTENSET : aliased SYSCTRL_INTENSET_Register; -- Interrupt Flag Status and Clear INTFLAG : aliased SYSCTRL_INTFLAG_Register; -- Power and Clocks Status PCLKSR : aliased SYSCTRL_PCLKSR_Register; -- External Multipurpose Crystal Oscillator (XOSC) Control XOSC : aliased SYSCTRL_XOSC_Register; -- 32kHz External Crystal Oscillator (XOSC32K) Control XOSC32K : aliased SYSCTRL_XOSC32K_Register; -- 32kHz Internal Oscillator (OSC32K) Control OSC32K : aliased SYSCTRL_OSC32K_Register; -- 32kHz Ultra Low Power Internal Oscillator (OSCULP32K) Control OSCULP32K : aliased SYSCTRL_OSCULP32K_Register; -- 8MHz Internal Oscillator (OSC8M) Control OSC8M : aliased SYSCTRL_OSC8M_Register; -- DFLL48M Control DFLLCTRL : aliased SYSCTRL_DFLLCTRL_Register; -- DFLL48M Value DFLLVAL : aliased SYSCTRL_DFLLVAL_Register; -- DFLL48M Multiplier DFLLMUL : aliased SYSCTRL_DFLLMUL_Register; -- DFLL48M Synchronization DFLLSYNC : aliased SYSCTRL_DFLLSYNC_Register; -- 3.3V Brown-Out Detector (BOD33) Control BOD33 : aliased SYSCTRL_BOD33_Register; -- Voltage Regulator System (VREG) Control VREG : aliased SYSCTRL_VREG_Register; -- Voltage References System (VREF) Control VREF : aliased SYSCTRL_VREF_Register; -- DPLL Control A DPLLCTRLA : aliased SYSCTRL_DPLLCTRLA_Register; -- DPLL Ratio Control DPLLRATIO : aliased SYSCTRL_DPLLRATIO_Register; -- DPLL Control B DPLLCTRLB : aliased SYSCTRL_DPLLCTRLB_Register; -- DPLL Status DPLLSTATUS : aliased SYSCTRL_DPLLSTATUS_Register; end record with Volatile; for SYSCTRL_Peripheral use record INTENCLR at 16#0# range 0 .. 31; INTENSET at 16#4# range 0 .. 31; INTFLAG at 16#8# range 0 .. 31; PCLKSR at 16#C# range 0 .. 31; XOSC at 16#10# range 0 .. 15; XOSC32K at 16#14# range 0 .. 15; OSC32K at 16#18# range 0 .. 31; OSCULP32K at 16#1C# range 0 .. 7; OSC8M at 16#20# range 0 .. 31; DFLLCTRL at 16#24# range 0 .. 15; DFLLVAL at 16#28# range 0 .. 31; DFLLMUL at 16#2C# range 0 .. 31; DFLLSYNC at 16#30# range 0 .. 7; BOD33 at 16#34# range 0 .. 31; VREG at 16#3C# range 0 .. 15; VREF at 16#40# range 0 .. 31; DPLLCTRLA at 16#44# range 0 .. 7; DPLLRATIO at 16#48# range 0 .. 31; DPLLCTRLB at 16#4C# range 0 .. 31; DPLLSTATUS at 16#50# range 0 .. 7; end record; -- System Control SYSCTRL_Periph : aliased SYSCTRL_Peripheral with Import, Address => SYSCTRL_Base; end SAMD21_SVD.SYSCTRL;
reznikmm/matreshka
Ada
3,490
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Web Framework -- -- -- -- 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$ ------------------------------------------------------------------------------ package Servlet.Request_Dispatchers is pragma Preelaborate; type Request_Dispatcher is limited interface; end Servlet.Request_Dispatchers;
stcarrez/ada-util
Ada
10,760
ads
----------------------------------------------------------------------- -- util-serialize-mappers -- Serialize objects in various formats -- Copyright (C) 2010, 2011, 2017, 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 Ada.Strings.Unbounded; with Ada.Finalization; with Util.Beans.Objects; with Util.Log.Loggers; with Util.Stacks; with Util.Serialize.IO; with Util.Serialize.Contexts; package Util.Serialize.Mappers is Mapping_Error : exception; -- The <b>Field_Error</b> exception can be raised by a mapper to indicate that the field -- that was extracted is invalid. The exception message will be reported as an error message -- and the IO reader will be marked as in error. The IO reader will continue to read and -- process the mappings. Field_Error : exception; -- The <b>Field_Fatal_Error</b> exception is similar to the <b>Field_Error</b> exception. -- However the IO reader will report the error and immediately stop. Field_Fatal_Error : exception; -- ------------------------------ -- Mapping -- ------------------------------ -- The <b>Mapping</b> represents a rule component to establish a mapping -- when reading some format (XML, JSON). type Mapping is abstract tagged limited private; type Mapping_Access is access all Mapping'Class; -- ------------------------------ -- Mapper -- ------------------------------ -- The <b>Mapper</b> represents a node of the mapping tree. The mapping -- tree is walked horizontally to find siblings. It is walked vertically when -- entering or leaving an object. type Mapper is new Ada.Finalization.Limited_Controlled with private; type Mapper_Access is access all Mapper'Class; -- Execute the mapping operation on the object associated with the current context. -- The object is extracted from the context and the <b>Execute</b> operation is called. procedure Execute (Handler : in Mapper; Map : in Mapping'Class; Ctx : in out Util.Serialize.Contexts.Context'Class; Value : in Util.Beans.Objects.Object); -- Add a mapping for setting a member. When the attribute rule defined by <b>Path</b> -- is matched, the <b>Set_Member</b> procedure will be called with the value and the -- <b>Field</b> identification. -- Example: -- info/first_name matches: <info><first_name>...</first_name></info> -- info/a/b/name matches: <info><a><b><name>...</name></b></a></info> -- */a/b/name matches: <i><i><j><a><b><name>...</name></b></a></j></i></i> -- **/name matches: <i><name>...</name></i>, <b><c><name>...</name></c></b> procedure Add_Mapping (Into : in out Mapper; Path : in String; Map : in Mapping_Access); procedure Add_Mapping (Into : in out Mapper; Path : in String; Map : in Mapper_Access); -- Clone the <b>Handler</b> instance and get a copy of that single object. function Clone (Handler : in Mapper) return Mapper_Access; -- Set the name/value pair on the current object. For each active mapping, -- find whether a rule matches our name and execute it. procedure Set_Member (Handler : in Mapper; Name : in String; Value : in Util.Beans.Objects.Object; Attribute : in Boolean := False; Context : in out Util.Serialize.Contexts.Context'Class); procedure Start_Object (Handler : in Mapper; Context : in out Util.Serialize.Contexts.Context'Class; Name : in String); procedure Finish_Object (Handler : in Mapper; Context : in out Util.Serialize.Contexts.Context'Class; Name : in String); -- Find the mapper associated with the given name. -- Returns null if there is no mapper. function Find_Mapper (Controller : in Mapper; Name : in String; Attribute : in Boolean := False) return Mapper_Access; function Is_Proxy (Controller : in Mapper) return Boolean; -- Returns true if the mapper is a wildcard node (matches any element). function Is_Wildcard (Controller : in Mapper) return Boolean; -- Returns the mapping name. function Get_Name (Controller : in Mapper) return String; procedure Iterate (Controller : in Mapper; Process : not null access procedure (Map : in Mapper'Class)); -- Dump the mapping tree on the logger using the INFO log level. procedure Dump (Handler : in Mapper'Class; Log : in Util.Log.Loggers.Logger'Class; Prefix : in String := ""); type Processing is new Util.Serialize.Contexts.Context and Util.Serialize.IO.Reader with private; -- Start a document. overriding procedure Start_Document (Stream : in out Processing); -- Start a new object associated with the given name. This is called when -- the '{' is reached. The reader must be updated so that the next -- <b>Set_Member</b> procedure will associate the name/value pair on the -- new object. overriding procedure Start_Object (Handler : in out Processing; Name : in String; Logger : in out Util.Log.Logging'Class); -- Finish an object associated with the given name. The reader must be -- updated to be associated with the previous object. overriding procedure Finish_Object (Handler : in out Processing; Name : in String; Logger : in out Util.Log.Logging'Class); overriding procedure Start_Array (Handler : in out Processing; Name : in String; Logger : in out Util.Log.Logging'Class); overriding procedure Finish_Array (Handler : in out Processing; Name : in String; Count : in Natural; Logger : in out Util.Log.Logging'Class); -- Set the name/value pair on the current object. For each active mapping, -- find whether a rule matches our name and execute it. overriding procedure Set_Member (Handler : in out Processing; Name : in String; Value : in Util.Beans.Objects.Object; Logger : in out Util.Log.Logging'Class; Attribute : in Boolean := False); procedure Add_Mapping (Handler : in out Processing; Path : in String; Mapper : in Util.Serialize.Mappers.Mapper_Access); -- Dump the mapping tree on the logger using the INFO log level. procedure Dump (Handler : in Processing'Class; Logger : in Util.Log.Loggers.Logger'Class); private -- Find a path component representing a child mapper under <b>From</b> and -- identified by the given <b>Name</b>. If the mapper is not found, a new -- Mapper_Node is created. procedure Find_Path_Component (From : in out Mapper'Class; Name : in String; Root : in out Mapper_Access; Result : out Mapper_Access); -- Build the mapping tree that corresponds to the given <b>Path</b>. -- Each path component is represented by a <b>Mapper_Node</b> element. -- The node is created if it does not exists. procedure Build_Path (Into : in out Mapper'Class; Path : in String; Last_Pos : out Natural; Node : out Mapper_Access); type Mapping is abstract tagged limited record Mapper : Mapper_Access; Is_Attribute : Boolean := False; end record; type Mapper is new Ada.Finalization.Limited_Controlled with record Next_Mapping : Mapper_Access := null; First_Child : Mapper_Access := null; Mapper : Mapper_Access := null; Mapping : Mapping_Access := null; Name : Ada.Strings.Unbounded.Unbounded_String; Is_Proxy_Mapper : Boolean := False; Is_Clone : Boolean := False; Is_Wildcard : Boolean := False; Is_Deep_Wildcard : Boolean := False; end record; -- Finalize the object and release any mapping. overriding procedure Finalize (Controller : in out Mapper); -- Implementation limitation: the max number of active mapping nodes MAX_NODES : constant Positive := 10; type Mapper_Access_Array is array (1 .. MAX_NODES) of Serialize.Mappers.Mapper_Access; procedure Push (Handler : in out Processing); -- Pop the context and restore the previous context when leaving an element procedure Pop (Handler : in out Processing); function Find_Mapper (Handler : in Processing; Name : in String) return Util.Serialize.Mappers.Mapper_Access; type Element_Context is record -- The object mapper being process. Object_Mapper : Util.Serialize.Mappers.Mapper_Access; -- The active mapping nodes. Active_Nodes : Mapper_Access_Array; end record; type Element_Context_Access is access all Element_Context; package Context_Stack is new Util.Stacks (Element_Type => Element_Context, Element_Type_Access => Element_Context_Access); type Processing is new Util.Serialize.Contexts.Context and Util.Serialize.IO.Reader with record Error_Flag : Boolean := False; Stack : Context_Stack.Stack; Mapping_Tree : aliased Mappers.Mapper; Current_Mapper : Util.Serialize.Mappers.Mapper_Access; end record; end Util.Serialize.Mappers;
AdaCore/gpr
Ada
35
ads
with API; with ABC; procedure Tst;
optikos/oasis
Ada
2,205
adb
-- Copyright (c) 2019 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- with Program.Units.Bodies; package body Program.Units.Subunits is -------------------- -- Append_Subunit -- -------------------- procedure Append_Subunit (Self : in out Subunit; Value : Program.Compilation_Units.Compilation_Unit_Access) is begin Self.Subunits.Append (Value); end Append_Subunit; ---------------- -- Initialize -- ---------------- procedure Initialize (Self : in out Subunit; Compilation : Program.Compilations.Compilation_Access; Full_Name : Text; Context_Clause : Program.Element_Vectors.Element_Vector_Access; Unit_Declaration : not null Program.Elements.Element_Access; Parent_Body : not null Program.Compilation_Units .Compilation_Unit_Access) is begin Self.Initialize (Compilation => Compilation, Full_Name => Full_Name, Context_Clause => Context_Clause, Unit_Declaration => Unit_Declaration); Self.Parent_Body := Parent_Body; if Parent_Body.all in Program.Units.Bodies.Unit_Body then Program.Units.Bodies.Unit_Body (Parent_Body.all).Append_Subunit (Self'Unchecked_Access); else Subunit (Parent_Body.all).Append_Subunit (Self'Unchecked_Access); end if; Self.Subunits.Clear; end Initialize; -------------- -- Subunits -- -------------- overriding function Subunits (Self : access Subunit) return Program.Compilation_Unit_Vectors.Compilation_Unit_Vector_Access is begin if Self.Subunits.Is_Empty then return null; else return Self.Subunits'Access; end if; end Subunits; ----------------- -- Parent_Body -- ----------------- overriding function Parent_Body (Self : access Subunit) return not null Program.Compilation_Units.Compilation_Unit_Access is begin return Self.Parent_Body; end Parent_Body; end Program.Units.Subunits;
gitter-badger/spat
Ada
1,195
ads
------------------------------------------------------------------------------ -- Copyright (C) 2020 by Heisenbug Ltd. ([email protected]) -- -- This work is free. You can redistribute it and/or modify it under the -- terms of the Do What The Fuck You Want To Public License, Version 2, -- as published by Sam Hocevar. See the LICENSE file for more details. ------------------------------------------------------------------------------ pragma License (Unrestricted); ------------------------------------------------------------------------------ -- -- SPARK Proof Analysis Tool -- -- S.P.A.T. - GNAT project file (.gpr) support. -- ------------------------------------------------------------------------------ limited with SPAT.Strings; limited with GNATCOLL.VFS; package SPAT.GPR_Support is --------------------------------------------------------------------------- -- Get_SPARK_Files -- -- Retrieve all (existing) .spark files from the project. --------------------------------------------------------------------------- function Get_SPARK_Files (GPR_File : GNATCOLL.VFS.Filesystem_String) return Strings.SPARK_File_Names; end SPAT.GPR_Support;
reznikmm/matreshka
Ada
3,759
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.Presentation_Full_Screen_Attributes is pragma Preelaborate; type ODF_Presentation_Full_Screen_Attribute is limited interface and XML.DOM.Attributes.DOM_Attribute; type ODF_Presentation_Full_Screen_Attribute_Access is access all ODF_Presentation_Full_Screen_Attribute'Class with Storage_Size => 0; end ODF.DOM.Presentation_Full_Screen_Attributes;
dan76/Amass
Ada
782
ads
-- Copyright © by Jeff Foley 2017-2023. All rights reserved. -- Use of this source code is governed by Apache 2 LICENSE that can be found in the LICENSE file. -- SPDX-License-Identifier: Apache-2.0 local url = require("url") local json = require("json") name = "Baidu" type = "scrape" function start() set_rate_limit(1) end function vertical(ctx, domain) for i=0,10 do local ok = scrape(ctx, {['url']=build_url(domain, i)}) if not ok then break end end end function build_url(domain, pagenum) local query = "site:" .. domain .. " -site:www." .. domain local params = { ['wd']=query, ['oq']=query, ['pn']=pagenum, } return "https://www.baidu.com/s?" .. url.build_query_string(params) end
reznikmm/matreshka
Ada
3,968
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ -- An event is the specification of some occurrence that may potentially -- trigger effects by an object. ------------------------------------------------------------------------------ with AMF.UML.Packageable_Elements; package AMF.UML.Events is pragma Preelaborate; type UML_Event is limited interface and AMF.UML.Packageable_Elements.UML_Packageable_Element; type UML_Event_Access is access all UML_Event'Class; for UML_Event_Access'Storage_Size use 0; end AMF.UML.Events;
reznikmm/matreshka
Ada
5,850
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Localization, Internationalization, Globalization for Ada -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2009-2011, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Ada.Unchecked_Deallocation; with Matreshka.Internals.Locales.Defaults; package body Matreshka.Internals.Locales is Application_Locale : Locale_Data_Access := null; Thread_Locale : Locale_Data_Access := null; pragma Thread_Local_Storage (Thread_Locale); ----------------- -- Dereference -- ----------------- procedure Dereference (Self : in out Locale_Data_Access) is procedure Free is new Ada.Unchecked_Deallocation (Locale_Data, Locale_Data_Access); begin if Matreshka.Atomics.Counters.Decrement (Self.Counter) then pragma Assert (Self /= Defaults.Default_Locale'Access); Free (Self); end if; end Dereference; -------------- -- Get_Core -- -------------- function Get_Core (Self : not null access Locale_Data'Class; Code : Unicode.Code_Point) return Unicode.Ucd.Core_Values is function Element is new Matreshka.Internals.Unicode.Ucd.Generic_Element (Matreshka.Internals.Unicode.Ucd.Core_Values, Matreshka.Internals.Unicode.Ucd.Core_Second_Stage, Matreshka.Internals.Unicode.Ucd.Core_Second_Stage_Access, Matreshka.Internals.Unicode.Ucd.Core_First_Stage); begin return Element (Self.Core.all, Code); end Get_Core; ---------------- -- Get_Locale -- ---------------- function Get_Locale return not null Locale_Data_Access is begin if Thread_Locale /= null then Reference (Thread_Locale); return Thread_Locale; elsif Application_Locale /= null then Reference (Application_Locale); return Application_Locale; else Reference (Matreshka.Internals.Locales.Defaults.Default_Locale'Access); return Matreshka.Internals.Locales.Defaults.Default_Locale'Access; end if; end Get_Locale; --------------- -- Reference -- --------------- procedure Reference (Self : Locale_Data_Access) is begin Matreshka.Atomics.Counters.Increment (Self.Counter); end Reference; ----------------------- -- Set_Thread_Locale -- ----------------------- procedure Set_Thread_Locale (Self : Locale_Data_Access) is begin if Thread_Locale /= null then Dereference (Thread_Locale); end if; Thread_Locale := Self; if Thread_Locale /= null then Reference (Thread_Locale); end if; end Set_Thread_Locale; end Matreshka.Internals.Locales;
persan/a-vulkan
Ada
730,173
ads
pragma Ada_2012; pragma Style_Checks (Off); with Interfaces.C; use Interfaces.C; with System; with Interfaces.C.Strings; package Vulkan.Low_Level.vulkan_core_h is VULKAN_CORE_H_u : constant := 1; -- vulkan_core.h:2 VK_VERSION_1_0 : constant := 1; -- vulkan_core.h:32 -- arg-macro: function VK_MAKE_VERSION (major, minor, patch) -- return ((major) << 22) or ((minor) << 12) or (patch); -- unsupported macro: VK_API_VERSION_1_0 VK_MAKE_VERSION(1, 0, 0) -- arg-macro: function VK_VERSION_MAJOR (version) -- return (uint32_t)(version) >> 22; -- arg-macro: function VK_VERSION_MINOR (version) -- return ((uint32_t)(version) >> 12) and 16#3ff#; -- arg-macro: function VK_VERSION_PATCH (version) -- return (uint32_t)(version) and 16#fff#; VK_HEADER_VERSION : constant := 131; -- vulkan_core.h:47 VK_NULL_HANDLE : constant := 0; -- vulkan_core.h:50 -- unsupported macro: VK_DEFINE_HANDLE(object) typedef struct object ##_T* object; -- unsupported macro: VK_DEFINE_NON_DISPATCHABLE_HANDLE(object) typedef struct object ##_T *object; VK_LOD_CLAMP_NONE : constant := 1000.0; -- vulkan_core.h:93 function VK_REMAINING_MIP_LEVELS return Interfaces.Unsigned_64 is (not 0); function VK_REMAINING_MIP_LEVELS return Interfaces.Unsigned_32 is (not 0); function VK_REMAINING_MIP_LEVELS return Interfaces.Unsigned_16 is (not 0); function VK_REMAINING_MIP_LEVELS return Interfaces.Unsigned_8 is (not 0); function VK_REMAINING_ARRAY_LAYERS return Interfaces.Unsigned_64 is (not 0); function VK_REMAINING_ARRAY_LAYERS return Interfaces.Unsigned_32 is (not 0); function VK_REMAINING_ARRAY_LAYERS return Interfaces.Unsigned_16 is (not 0); function VK_REMAINING_ARRAY_LAYERS return Interfaces.Unsigned_8 is (not 0); function VK_WHOLE_SIZE return Interfaces.Unsigned_64 is (not 0); function VK_WHOLE_SIZE return Interfaces.Unsigned_32 is (not 0); function VK_WHOLE_SIZE return Interfaces.Unsigned_16 is (not 0); function VK_WHOLE_SIZE return Interfaces.Unsigned_8 is (not 0); function VK_ATTACHMENT_UNUSED return Interfaces.Unsigned_64 is (not 0); function VK_ATTACHMENT_UNUSED return Interfaces.Unsigned_32 is (not 0); function VK_ATTACHMENT_UNUSED return Interfaces.Unsigned_16 is (not 0); function VK_ATTACHMENT_UNUSED return Interfaces.Unsigned_8 is (not 0); VK_TRUE : constant := 1; -- vulkan_core.h:98 VK_FALSE : constant := 0; -- vulkan_core.h:99 function VK_QUEUE_FAMILY_IGNORED return Interfaces.Unsigned_64 is (not 0); function VK_QUEUE_FAMILY_IGNORED return Interfaces.Unsigned_32 is (not 0); function VK_QUEUE_FAMILY_IGNORED return Interfaces.Unsigned_16 is (not 0); function VK_QUEUE_FAMILY_IGNORED return Interfaces.Unsigned_8 is (not 0); function VK_SUBPASS_EXTERNAL return Interfaces.Unsigned_64 is (not 0); function VK_SUBPASS_EXTERNAL return Interfaces.Unsigned_32 is (not 0); function VK_SUBPASS_EXTERNAL return Interfaces.Unsigned_16 is (not 0); function VK_SUBPASS_EXTERNAL return Interfaces.Unsigned_8 is (not 0); VK_MAX_PHYSICAL_DEVICE_NAME_SIZE : constant := 256; -- vulkan_core.h:102 VK_UUID_SIZE : constant := 16; -- vulkan_core.h:103 VK_MAX_MEMORY_TYPES : constant := 32; -- vulkan_core.h:104 VK_MAX_MEMORY_HEAPS : constant := 16; -- vulkan_core.h:105 VK_MAX_EXTENSION_NAME_SIZE : constant := 256; -- vulkan_core.h:106 VK_MAX_DESCRIPTION_SIZE : constant := 256; -- vulkan_core.h:107 VK_VERSION_1_1 : constant := 1; -- vulkan_core.h:4025 -- unsupported macro: VK_API_VERSION_1_1 VK_MAKE_VERSION(1, 1, 0) VK_MAX_DEVICE_GROUP_SIZE : constant := 32; -- vulkan_core.h:4031 VK_LUID_SIZE : constant := 8; -- vulkan_core.h:4032 -- unsupported macro: VK_QUEUE_FAMILY_EXTERNAL (~0U-1) VK_VERSION_1_2 : constant := 1; -- vulkan_core.h:4906 -- unsupported macro: VK_API_VERSION_1_2 VK_MAKE_VERSION(1, 2, 0) VK_MAX_DRIVER_NAME_SIZE : constant := 256; -- vulkan_core.h:4911 VK_MAX_DRIVER_INFO_SIZE : constant := 256; -- vulkan_core.h:4912 VK_KHR_surface : constant := 1; -- vulkan_core.h:5660 VK_KHR_SURFACE_SPEC_VERSION : constant := 25; -- vulkan_core.h:5662 VK_KHR_SURFACE_EXTENSION_NAME : aliased constant String := "VK_KHR_surface" & ASCII.NUL; -- vulkan_core.h:5663 VK_KHR_swapchain : constant := 1; -- vulkan_core.h:5780 VK_KHR_SWAPCHAIN_SPEC_VERSION : constant := 70; -- vulkan_core.h:5782 VK_KHR_SWAPCHAIN_EXTENSION_NAME : aliased constant String := "VK_KHR_swapchain" & ASCII.NUL; -- vulkan_core.h:5783 VK_KHR_display : constant := 1; -- vulkan_core.h:5939 VK_KHR_DISPLAY_SPEC_VERSION : constant := 23; -- vulkan_core.h:5942 VK_KHR_DISPLAY_EXTENSION_NAME : aliased constant String := "VK_KHR_display" & ASCII.NUL; -- vulkan_core.h:5943 VK_KHR_display_swapchain : constant := 1; -- vulkan_core.h:6064 VK_KHR_DISPLAY_SWAPCHAIN_SPEC_VERSION : constant := 10; -- vulkan_core.h:6065 VK_KHR_DISPLAY_SWAPCHAIN_EXTENSION_NAME : aliased constant String := "VK_KHR_display_swapchain" & ASCII.NUL; -- vulkan_core.h:6066 VK_KHR_sampler_mirror_clamp_to_edge : constant := 1; -- vulkan_core.h:6087 VK_KHR_SAMPLER_MIRROR_CLAMP_TO_EDGE_SPEC_VERSION : constant := 3; -- vulkan_core.h:6088 VK_KHR_SAMPLER_MIRROR_CLAMP_TO_EDGE_EXTENSION_NAME : aliased constant String := "VK_KHR_sampler_mirror_clamp_to_edge" & ASCII.NUL; -- vulkan_core.h:6089 VK_KHR_multiview : constant := 1; -- vulkan_core.h:6092 VK_KHR_MULTIVIEW_SPEC_VERSION : constant := 1; -- vulkan_core.h:6093 VK_KHR_MULTIVIEW_EXTENSION_NAME : aliased constant String := "VK_KHR_multiview" & ASCII.NUL; -- vulkan_core.h:6094 VK_KHR_get_physical_device_properties2 : constant := 1; -- vulkan_core.h:6103 VK_KHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_SPEC_VERSION : constant := 2; -- vulkan_core.h:6104 VK_KHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_EXTENSION_NAME : aliased constant String := "VK_KHR_get_physical_device_properties2" & ASCII.NUL; -- vulkan_core.h:6105 VK_KHR_device_group : constant := 1; -- vulkan_core.h:6168 VK_KHR_DEVICE_GROUP_SPEC_VERSION : constant := 4; -- vulkan_core.h:6169 VK_KHR_DEVICE_GROUP_EXTENSION_NAME : aliased constant String := "VK_KHR_device_group" & ASCII.NUL; -- vulkan_core.h:6170 VK_KHR_shader_draw_parameters : constant := 1; -- vulkan_core.h:6220 VK_KHR_SHADER_DRAW_PARAMETERS_SPEC_VERSION : constant := 1; -- vulkan_core.h:6221 VK_KHR_SHADER_DRAW_PARAMETERS_EXTENSION_NAME : aliased constant String := "VK_KHR_shader_draw_parameters" & ASCII.NUL; -- vulkan_core.h:6222 VK_KHR_maintenance1 : constant := 1; -- vulkan_core.h:6225 VK_KHR_MAINTENANCE1_SPEC_VERSION : constant := 2; -- vulkan_core.h:6226 VK_KHR_MAINTENANCE1_EXTENSION_NAME : aliased constant String := "VK_KHR_maintenance1" & ASCII.NUL; -- vulkan_core.h:6227 VK_KHR_device_group_creation : constant := 1; -- vulkan_core.h:6240 VK_KHR_DEVICE_GROUP_CREATION_SPEC_VERSION : constant := 1; -- vulkan_core.h:6241 VK_KHR_DEVICE_GROUP_CREATION_EXTENSION_NAME : aliased constant String := "VK_KHR_device_group_creation" & ASCII.NUL; -- vulkan_core.h:6242 -- unsupported macro: VK_MAX_DEVICE_GROUP_SIZE_KHR VK_MAX_DEVICE_GROUP_SIZE VK_KHR_external_memory_capabilities : constant := 1; -- vulkan_core.h:6258 VK_KHR_EXTERNAL_MEMORY_CAPABILITIES_SPEC_VERSION : constant := 1; -- vulkan_core.h:6259 VK_KHR_EXTERNAL_MEMORY_CAPABILITIES_EXTENSION_NAME : aliased constant String := "VK_KHR_external_memory_capabilities" & ASCII.NUL; -- vulkan_core.h:6260 -- unsupported macro: VK_LUID_SIZE_KHR VK_LUID_SIZE VK_KHR_external_memory : constant := 1; -- vulkan_core.h:6292 VK_KHR_EXTERNAL_MEMORY_SPEC_VERSION : constant := 1; -- vulkan_core.h:6293 VK_KHR_EXTERNAL_MEMORY_EXTENSION_NAME : aliased constant String := "VK_KHR_external_memory" & ASCII.NUL; -- vulkan_core.h:6294 -- unsupported macro: VK_QUEUE_FAMILY_EXTERNAL_KHR VK_QUEUE_FAMILY_EXTERNAL VK_KHR_external_memory_fd : constant := 1; -- vulkan_core.h:6304 VK_KHR_EXTERNAL_MEMORY_FD_SPEC_VERSION : constant := 1; -- vulkan_core.h:6305 VK_KHR_EXTERNAL_MEMORY_FD_EXTENSION_NAME : aliased constant String := "VK_KHR_external_memory_fd" & ASCII.NUL; -- vulkan_core.h:6306 VK_KHR_external_semaphore_capabilities : constant := 1; -- vulkan_core.h:6344 VK_KHR_EXTERNAL_SEMAPHORE_CAPABILITIES_SPEC_VERSION : constant := 1; -- vulkan_core.h:6345 VK_KHR_EXTERNAL_SEMAPHORE_CAPABILITIES_EXTENSION_NAME : aliased constant String := "VK_KHR_external_semaphore_capabilities" & ASCII.NUL; -- vulkan_core.h:6346 VK_KHR_external_semaphore : constant := 1; -- vulkan_core.h:6369 VK_KHR_EXTERNAL_SEMAPHORE_SPEC_VERSION : constant := 1; -- vulkan_core.h:6370 VK_KHR_EXTERNAL_SEMAPHORE_EXTENSION_NAME : aliased constant String := "VK_KHR_external_semaphore" & ASCII.NUL; -- vulkan_core.h:6371 VK_KHR_external_semaphore_fd : constant := 1; -- vulkan_core.h:6380 VK_KHR_EXTERNAL_SEMAPHORE_FD_SPEC_VERSION : constant := 1; -- vulkan_core.h:6381 VK_KHR_EXTERNAL_SEMAPHORE_FD_EXTENSION_NAME : aliased constant String := "VK_KHR_external_semaphore_fd" & ASCII.NUL; -- vulkan_core.h:6382 VK_KHR_push_descriptor : constant := 1; -- vulkan_core.h:6414 VK_KHR_PUSH_DESCRIPTOR_SPEC_VERSION : constant := 2; -- vulkan_core.h:6415 VK_KHR_PUSH_DESCRIPTOR_EXTENSION_NAME : aliased constant String := "VK_KHR_push_descriptor" & ASCII.NUL; -- vulkan_core.h:6416 VK_KHR_shader_float16_int8 : constant := 1; -- vulkan_core.h:6444 VK_KHR_SHADER_FLOAT16_INT8_SPEC_VERSION : constant := 1; -- vulkan_core.h:6445 VK_KHR_SHADER_FLOAT16_INT8_EXTENSION_NAME : aliased constant String := "VK_KHR_shader_float16_int8" & ASCII.NUL; -- vulkan_core.h:6446 VK_KHR_16bit_storage : constant := 1; -- vulkan_core.h:6453 VK_KHR_16BIT_STORAGE_SPEC_VERSION : constant := 1; -- vulkan_core.h:6454 VK_KHR_16BIT_STORAGE_EXTENSION_NAME : aliased constant String := "VK_KHR_16bit_storage" & ASCII.NUL; -- vulkan_core.h:6455 VK_KHR_incremental_present : constant := 1; -- vulkan_core.h:6460 VK_KHR_INCREMENTAL_PRESENT_SPEC_VERSION : constant := 1; -- vulkan_core.h:6461 VK_KHR_INCREMENTAL_PRESENT_EXTENSION_NAME : aliased constant String := "VK_KHR_incremental_present" & ASCII.NUL; -- vulkan_core.h:6462 VK_KHR_descriptor_update_template : constant := 1; -- vulkan_core.h:6483 VK_KHR_DESCRIPTOR_UPDATE_TEMPLATE_SPEC_VERSION : constant := 1; -- vulkan_core.h:6486 VK_KHR_DESCRIPTOR_UPDATE_TEMPLATE_EXTENSION_NAME : aliased constant String := "VK_KHR_descriptor_update_template" & ASCII.NUL; -- vulkan_core.h:6487 VK_KHR_imageless_framebuffer : constant := 1; -- vulkan_core.h:6520 VK_KHR_IMAGELESS_FRAMEBUFFER_SPEC_VERSION : constant := 1; -- vulkan_core.h:6521 VK_KHR_IMAGELESS_FRAMEBUFFER_EXTENSION_NAME : aliased constant String := "VK_KHR_imageless_framebuffer" & ASCII.NUL; -- vulkan_core.h:6522 VK_KHR_create_renderpass2 : constant := 1; -- vulkan_core.h:6533 VK_KHR_CREATE_RENDERPASS_2_SPEC_VERSION : constant := 1; -- vulkan_core.h:6534 VK_KHR_CREATE_RENDERPASS_2_EXTENSION_NAME : aliased constant String := "VK_KHR_create_renderpass2" & ASCII.NUL; -- vulkan_core.h:6535 VK_KHR_shared_presentable_image : constant := 1; -- vulkan_core.h:6578 VK_KHR_SHARED_PRESENTABLE_IMAGE_SPEC_VERSION : constant := 1; -- vulkan_core.h:6579 VK_KHR_SHARED_PRESENTABLE_IMAGE_EXTENSION_NAME : aliased constant String := "VK_KHR_shared_presentable_image" & ASCII.NUL; -- vulkan_core.h:6580 VK_KHR_external_fence_capabilities : constant := 1; -- vulkan_core.h:6596 VK_KHR_EXTERNAL_FENCE_CAPABILITIES_SPEC_VERSION : constant := 1; -- vulkan_core.h:6597 VK_KHR_EXTERNAL_FENCE_CAPABILITIES_EXTENSION_NAME : aliased constant String := "VK_KHR_external_fence_capabilities" & ASCII.NUL; -- vulkan_core.h:6598 VK_KHR_external_fence : constant := 1; -- vulkan_core.h:6621 VK_KHR_EXTERNAL_FENCE_SPEC_VERSION : constant := 1; -- vulkan_core.h:6622 VK_KHR_EXTERNAL_FENCE_EXTENSION_NAME : aliased constant String := "VK_KHR_external_fence" & ASCII.NUL; -- vulkan_core.h:6623 VK_KHR_external_fence_fd : constant := 1; -- vulkan_core.h:6632 VK_KHR_EXTERNAL_FENCE_FD_SPEC_VERSION : constant := 1; -- vulkan_core.h:6633 VK_KHR_EXTERNAL_FENCE_FD_EXTENSION_NAME : aliased constant String := "VK_KHR_external_fence_fd" & ASCII.NUL; -- vulkan_core.h:6634 VK_KHR_performance_query : constant := 1; -- vulkan_core.h:6666 VK_KHR_PERFORMANCE_QUERY_SPEC_VERSION : constant := 1; -- vulkan_core.h:6667 VK_KHR_PERFORMANCE_QUERY_EXTENSION_NAME : aliased constant String := "VK_KHR_performance_query" & ASCII.NUL; -- vulkan_core.h:6668 VK_KHR_maintenance2 : constant := 1; -- vulkan_core.h:6813 VK_KHR_MAINTENANCE2_SPEC_VERSION : constant := 1; -- vulkan_core.h:6814 VK_KHR_MAINTENANCE2_EXTENSION_NAME : aliased constant String := "VK_KHR_maintenance2" & ASCII.NUL; -- vulkan_core.h:6815 VK_KHR_get_surface_capabilities2 : constant := 1; -- vulkan_core.h:6832 VK_KHR_GET_SURFACE_CAPABILITIES_2_SPEC_VERSION : constant := 1; -- vulkan_core.h:6833 VK_KHR_GET_SURFACE_CAPABILITIES_2_EXTENSION_NAME : aliased constant String := "VK_KHR_get_surface_capabilities2" & ASCII.NUL; -- vulkan_core.h:6834 VK_KHR_variable_pointers : constant := 1; -- vulkan_core.h:6870 VK_KHR_VARIABLE_POINTERS_SPEC_VERSION : constant := 1; -- vulkan_core.h:6871 VK_KHR_VARIABLE_POINTERS_EXTENSION_NAME : aliased constant String := "VK_KHR_variable_pointers" & ASCII.NUL; -- vulkan_core.h:6872 VK_KHR_get_display_properties2 : constant := 1; -- vulkan_core.h:6879 VK_KHR_GET_DISPLAY_PROPERTIES_2_SPEC_VERSION : constant := 1; -- vulkan_core.h:6880 VK_KHR_GET_DISPLAY_PROPERTIES_2_EXTENSION_NAME : aliased constant String := "VK_KHR_get_display_properties2" & ASCII.NUL; -- vulkan_core.h:6881 VK_KHR_dedicated_allocation : constant := 1; -- vulkan_core.h:6942 VK_KHR_DEDICATED_ALLOCATION_SPEC_VERSION : constant := 3; -- vulkan_core.h:6943 VK_KHR_DEDICATED_ALLOCATION_EXTENSION_NAME : aliased constant String := "VK_KHR_dedicated_allocation" & ASCII.NUL; -- vulkan_core.h:6944 VK_KHR_storage_buffer_storage_class : constant := 1; -- vulkan_core.h:6951 VK_KHR_STORAGE_BUFFER_STORAGE_CLASS_SPEC_VERSION : constant := 1; -- vulkan_core.h:6952 VK_KHR_STORAGE_BUFFER_STORAGE_CLASS_EXTENSION_NAME : aliased constant String := "VK_KHR_storage_buffer_storage_class" & ASCII.NUL; -- vulkan_core.h:6953 VK_KHR_relaxed_block_layout : constant := 1; -- vulkan_core.h:6956 VK_KHR_RELAXED_BLOCK_LAYOUT_SPEC_VERSION : constant := 1; -- vulkan_core.h:6957 VK_KHR_RELAXED_BLOCK_LAYOUT_EXTENSION_NAME : aliased constant String := "VK_KHR_relaxed_block_layout" & ASCII.NUL; -- vulkan_core.h:6958 VK_KHR_get_memory_requirements2 : constant := 1; -- vulkan_core.h:6961 VK_KHR_GET_MEMORY_REQUIREMENTS_2_SPEC_VERSION : constant := 1; -- vulkan_core.h:6962 VK_KHR_GET_MEMORY_REQUIREMENTS_2_EXTENSION_NAME : aliased constant String := "VK_KHR_get_memory_requirements2" & ASCII.NUL; -- vulkan_core.h:6963 VK_KHR_image_format_list : constant := 1; -- vulkan_core.h:6995 VK_KHR_IMAGE_FORMAT_LIST_SPEC_VERSION : constant := 1; -- vulkan_core.h:6996 VK_KHR_IMAGE_FORMAT_LIST_EXTENSION_NAME : aliased constant String := "VK_KHR_image_format_list" & ASCII.NUL; -- vulkan_core.h:6997 VK_KHR_sampler_ycbcr_conversion : constant := 1; -- vulkan_core.h:7002 VK_KHR_SAMPLER_YCBCR_CONVERSION_SPEC_VERSION : constant := 14; -- vulkan_core.h:7005 VK_KHR_SAMPLER_YCBCR_CONVERSION_EXTENSION_NAME : aliased constant String := "VK_KHR_sampler_ycbcr_conversion" & ASCII.NUL; -- vulkan_core.h:7006 VK_KHR_bind_memory2 : constant := 1; -- vulkan_core.h:7042 VK_KHR_BIND_MEMORY_2_SPEC_VERSION : constant := 1; -- vulkan_core.h:7043 VK_KHR_BIND_MEMORY_2_EXTENSION_NAME : aliased constant String := "VK_KHR_bind_memory2" & ASCII.NUL; -- vulkan_core.h:7044 VK_KHR_maintenance3 : constant := 1; -- vulkan_core.h:7065 VK_KHR_MAINTENANCE3_SPEC_VERSION : constant := 1; -- vulkan_core.h:7066 VK_KHR_MAINTENANCE3_EXTENSION_NAME : aliased constant String := "VK_KHR_maintenance3" & ASCII.NUL; -- vulkan_core.h:7067 VK_KHR_draw_indirect_count : constant := 1; -- vulkan_core.h:7082 VK_KHR_DRAW_INDIRECT_COUNT_SPEC_VERSION : constant := 1; -- vulkan_core.h:7083 VK_KHR_DRAW_INDIRECT_COUNT_EXTENSION_NAME : aliased constant String := "VK_KHR_draw_indirect_count" & ASCII.NUL; -- vulkan_core.h:7084 VK_KHR_shader_subgroup_extended_types : constant := 1; -- vulkan_core.h:7109 VK_KHR_SHADER_SUBGROUP_EXTENDED_TYPES_SPEC_VERSION : constant := 1; -- vulkan_core.h:7110 VK_KHR_SHADER_SUBGROUP_EXTENDED_TYPES_EXTENSION_NAME : aliased constant String := "VK_KHR_shader_subgroup_extended_types" & ASCII.NUL; -- vulkan_core.h:7111 VK_KHR_8bit_storage : constant := 1; -- vulkan_core.h:7116 VK_KHR_8BIT_STORAGE_SPEC_VERSION : constant := 1; -- vulkan_core.h:7117 VK_KHR_8BIT_STORAGE_EXTENSION_NAME : aliased constant String := "VK_KHR_8bit_storage" & ASCII.NUL; -- vulkan_core.h:7118 VK_KHR_shader_atomic_int64 : constant := 1; -- vulkan_core.h:7123 VK_KHR_SHADER_ATOMIC_INT64_SPEC_VERSION : constant := 1; -- vulkan_core.h:7124 VK_KHR_SHADER_ATOMIC_INT64_EXTENSION_NAME : aliased constant String := "VK_KHR_shader_atomic_int64" & ASCII.NUL; -- vulkan_core.h:7125 VK_KHR_shader_clock : constant := 1; -- vulkan_core.h:7130 VK_KHR_SHADER_CLOCK_SPEC_VERSION : constant := 1; -- vulkan_core.h:7131 VK_KHR_SHADER_CLOCK_EXTENSION_NAME : aliased constant String := "VK_KHR_shader_clock" & ASCII.NUL; -- vulkan_core.h:7132 VK_KHR_driver_properties : constant := 1; -- vulkan_core.h:7142 VK_KHR_DRIVER_PROPERTIES_SPEC_VERSION : constant := 1; -- vulkan_core.h:7143 VK_KHR_DRIVER_PROPERTIES_EXTENSION_NAME : aliased constant String := "VK_KHR_driver_properties" & ASCII.NUL; -- vulkan_core.h:7144 -- unsupported macro: VK_MAX_DRIVER_NAME_SIZE_KHR VK_MAX_DRIVER_NAME_SIZE -- unsupported macro: VK_MAX_DRIVER_INFO_SIZE_KHR VK_MAX_DRIVER_INFO_SIZE VK_KHR_shader_float_controls : constant := 1; -- vulkan_core.h:7155 VK_KHR_SHADER_FLOAT_CONTROLS_SPEC_VERSION : constant := 4; -- vulkan_core.h:7156 VK_KHR_SHADER_FLOAT_CONTROLS_EXTENSION_NAME : aliased constant String := "VK_KHR_shader_float_controls" & ASCII.NUL; -- vulkan_core.h:7157 VK_KHR_depth_stencil_resolve : constant := 1; -- vulkan_core.h:7164 VK_KHR_DEPTH_STENCIL_RESOLVE_SPEC_VERSION : constant := 1; -- vulkan_core.h:7165 VK_KHR_DEPTH_STENCIL_RESOLVE_EXTENSION_NAME : aliased constant String := "VK_KHR_depth_stencil_resolve" & ASCII.NUL; -- vulkan_core.h:7166 VK_KHR_swapchain_mutable_format : constant := 1; -- vulkan_core.h:7177 VK_KHR_SWAPCHAIN_MUTABLE_FORMAT_SPEC_VERSION : constant := 1; -- vulkan_core.h:7178 VK_KHR_SWAPCHAIN_MUTABLE_FORMAT_EXTENSION_NAME : aliased constant String := "VK_KHR_swapchain_mutable_format" & ASCII.NUL; -- vulkan_core.h:7179 VK_KHR_timeline_semaphore : constant := 1; -- vulkan_core.h:7182 VK_KHR_TIMELINE_SEMAPHORE_SPEC_VERSION : constant := 2; -- vulkan_core.h:7183 VK_KHR_TIMELINE_SEMAPHORE_EXTENSION_NAME : aliased constant String := "VK_KHR_timeline_semaphore" & ASCII.NUL; -- vulkan_core.h:7184 VK_KHR_vulkan_memory_model : constant := 1; -- vulkan_core.h:7224 VK_KHR_VULKAN_MEMORY_MODEL_SPEC_VERSION : constant := 3; -- vulkan_core.h:7225 VK_KHR_VULKAN_MEMORY_MODEL_EXTENSION_NAME : aliased constant String := "VK_KHR_vulkan_memory_model" & ASCII.NUL; -- vulkan_core.h:7226 VK_KHR_spirv_1_4 : constant := 1; -- vulkan_core.h:7231 VK_KHR_SPIRV_1_4_SPEC_VERSION : constant := 1; -- vulkan_core.h:7232 VK_KHR_SPIRV_1_4_EXTENSION_NAME : aliased constant String := "VK_KHR_spirv_1_4" & ASCII.NUL; -- vulkan_core.h:7233 VK_KHR_surface_protected_capabilities : constant := 1; -- vulkan_core.h:7236 VK_KHR_SURFACE_PROTECTED_CAPABILITIES_SPEC_VERSION : constant := 1; -- vulkan_core.h:7237 VK_KHR_SURFACE_PROTECTED_CAPABILITIES_EXTENSION_NAME : aliased constant String := "VK_KHR_surface_protected_capabilities" & ASCII.NUL; -- vulkan_core.h:7238 VK_KHR_separate_depth_stencil_layouts : constant := 1; -- vulkan_core.h:7247 VK_KHR_SEPARATE_DEPTH_STENCIL_LAYOUTS_SPEC_VERSION : constant := 1; -- vulkan_core.h:7248 VK_KHR_SEPARATE_DEPTH_STENCIL_LAYOUTS_EXTENSION_NAME : aliased constant String := "VK_KHR_separate_depth_stencil_layouts" & ASCII.NUL; -- vulkan_core.h:7249 VK_KHR_uniform_buffer_standard_layout : constant := 1; -- vulkan_core.h:7258 VK_KHR_UNIFORM_BUFFER_STANDARD_LAYOUT_SPEC_VERSION : constant := 1; -- vulkan_core.h:7259 VK_KHR_UNIFORM_BUFFER_STANDARD_LAYOUT_EXTENSION_NAME : aliased constant String := "VK_KHR_uniform_buffer_standard_layout" & ASCII.NUL; -- vulkan_core.h:7260 VK_KHR_buffer_device_address : constant := 1; -- vulkan_core.h:7265 VK_KHR_BUFFER_DEVICE_ADDRESS_SPEC_VERSION : constant := 1; -- vulkan_core.h:7266 VK_KHR_BUFFER_DEVICE_ADDRESS_EXTENSION_NAME : aliased constant String := "VK_KHR_buffer_device_address" & ASCII.NUL; -- vulkan_core.h:7267 VK_KHR_pipeline_executable_properties : constant := 1; -- vulkan_core.h:7297 VK_KHR_PIPELINE_EXECUTABLE_PROPERTIES_SPEC_VERSION : constant := 1; -- vulkan_core.h:7298 VK_KHR_PIPELINE_EXECUTABLE_PROPERTIES_EXTENSION_NAME : aliased constant String := "VK_KHR_pipeline_executable_properties" & ASCII.NUL; -- vulkan_core.h:7299 VK_EXT_debug_report : constant := 1; -- vulkan_core.h:7390 VK_EXT_DEBUG_REPORT_SPEC_VERSION : constant := 9; -- vulkan_core.h:7392 VK_EXT_DEBUG_REPORT_EXTENSION_NAME : aliased constant String := "VK_EXT_debug_report" & ASCII.NUL; -- vulkan_core.h:7393 VK_NV_glsl_shader : constant := 1; -- vulkan_core.h:7498 VK_NV_GLSL_SHADER_SPEC_VERSION : constant := 1; -- vulkan_core.h:7499 VK_NV_GLSL_SHADER_EXTENSION_NAME : aliased constant String := "VK_NV_glsl_shader" & ASCII.NUL; -- vulkan_core.h:7500 VK_EXT_depth_range_unrestricted : constant := 1; -- vulkan_core.h:7503 VK_EXT_DEPTH_RANGE_UNRESTRICTED_SPEC_VERSION : constant := 1; -- vulkan_core.h:7504 VK_EXT_DEPTH_RANGE_UNRESTRICTED_EXTENSION_NAME : aliased constant String := "VK_EXT_depth_range_unrestricted" & ASCII.NUL; -- vulkan_core.h:7505 VK_IMG_filter_cubic : constant := 1; -- vulkan_core.h:7508 VK_IMG_FILTER_CUBIC_SPEC_VERSION : constant := 1; -- vulkan_core.h:7509 VK_IMG_FILTER_CUBIC_EXTENSION_NAME : aliased constant String := "VK_IMG_filter_cubic" & ASCII.NUL; -- vulkan_core.h:7510 VK_AMD_rasterization_order : constant := 1; -- vulkan_core.h:7513 VK_AMD_RASTERIZATION_ORDER_SPEC_VERSION : constant := 1; -- vulkan_core.h:7514 VK_AMD_RASTERIZATION_ORDER_EXTENSION_NAME : aliased constant String := "VK_AMD_rasterization_order" & ASCII.NUL; -- vulkan_core.h:7515 VK_AMD_shader_trinary_minmax : constant := 1; -- vulkan_core.h:7533 VK_AMD_SHADER_TRINARY_MINMAX_SPEC_VERSION : constant := 1; -- vulkan_core.h:7534 VK_AMD_SHADER_TRINARY_MINMAX_EXTENSION_NAME : aliased constant String := "VK_AMD_shader_trinary_minmax" & ASCII.NUL; -- vulkan_core.h:7535 VK_AMD_shader_explicit_vertex_parameter : constant := 1; -- vulkan_core.h:7538 VK_AMD_SHADER_EXPLICIT_VERTEX_PARAMETER_SPEC_VERSION : constant := 1; -- vulkan_core.h:7539 VK_AMD_SHADER_EXPLICIT_VERTEX_PARAMETER_EXTENSION_NAME : aliased constant String := "VK_AMD_shader_explicit_vertex_parameter" & ASCII.NUL; -- vulkan_core.h:7540 VK_EXT_debug_marker : constant := 1; -- vulkan_core.h:7543 VK_EXT_DEBUG_MARKER_SPEC_VERSION : constant := 4; -- vulkan_core.h:7544 VK_EXT_DEBUG_MARKER_EXTENSION_NAME : aliased constant String := "VK_EXT_debug_marker" & ASCII.NUL; -- vulkan_core.h:7545 VK_AMD_gcn_shader : constant := 1; -- vulkan_core.h:7599 VK_AMD_GCN_SHADER_SPEC_VERSION : constant := 1; -- vulkan_core.h:7600 VK_AMD_GCN_SHADER_EXTENSION_NAME : aliased constant String := "VK_AMD_gcn_shader" & ASCII.NUL; -- vulkan_core.h:7601 VK_NV_dedicated_allocation : constant := 1; -- vulkan_core.h:7604 VK_NV_DEDICATED_ALLOCATION_SPEC_VERSION : constant := 1; -- vulkan_core.h:7605 VK_NV_DEDICATED_ALLOCATION_EXTENSION_NAME : aliased constant String := "VK_NV_dedicated_allocation" & ASCII.NUL; -- vulkan_core.h:7606 VK_EXT_transform_feedback : constant := 1; -- vulkan_core.h:7628 VK_EXT_TRANSFORM_FEEDBACK_SPEC_VERSION : constant := 1; -- vulkan_core.h:7629 VK_EXT_TRANSFORM_FEEDBACK_EXTENSION_NAME : aliased constant String := "VK_EXT_transform_feedback" & ASCII.NUL; -- vulkan_core.h:7630 VK_NVX_image_view_handle : constant := 1; -- vulkan_core.h:7715 VK_NVX_IMAGE_VIEW_HANDLE_SPEC_VERSION : constant := 1; -- vulkan_core.h:7716 VK_NVX_IMAGE_VIEW_HANDLE_EXTENSION_NAME : aliased constant String := "VK_NVX_image_view_handle" & ASCII.NUL; -- vulkan_core.h:7717 VK_AMD_draw_indirect_count : constant := 1; -- vulkan_core.h:7735 VK_AMD_DRAW_INDIRECT_COUNT_SPEC_VERSION : constant := 2; -- vulkan_core.h:7736 VK_AMD_DRAW_INDIRECT_COUNT_EXTENSION_NAME : aliased constant String := "VK_AMD_draw_indirect_count" & ASCII.NUL; -- vulkan_core.h:7737 VK_AMD_negative_viewport_height : constant := 1; -- vulkan_core.h:7762 VK_AMD_NEGATIVE_VIEWPORT_HEIGHT_SPEC_VERSION : constant := 1; -- vulkan_core.h:7763 VK_AMD_NEGATIVE_VIEWPORT_HEIGHT_EXTENSION_NAME : aliased constant String := "VK_AMD_negative_viewport_height" & ASCII.NUL; -- vulkan_core.h:7764 VK_AMD_gpu_shader_half_float : constant := 1; -- vulkan_core.h:7767 VK_AMD_GPU_SHADER_HALF_FLOAT_SPEC_VERSION : constant := 2; -- vulkan_core.h:7768 VK_AMD_GPU_SHADER_HALF_FLOAT_EXTENSION_NAME : aliased constant String := "VK_AMD_gpu_shader_half_float" & ASCII.NUL; -- vulkan_core.h:7769 VK_AMD_shader_ballot : constant := 1; -- vulkan_core.h:7772 VK_AMD_SHADER_BALLOT_SPEC_VERSION : constant := 1; -- vulkan_core.h:7773 VK_AMD_SHADER_BALLOT_EXTENSION_NAME : aliased constant String := "VK_AMD_shader_ballot" & ASCII.NUL; -- vulkan_core.h:7774 VK_AMD_texture_gather_bias_lod : constant := 1; -- vulkan_core.h:7777 VK_AMD_TEXTURE_GATHER_BIAS_LOD_SPEC_VERSION : constant := 1; -- vulkan_core.h:7778 VK_AMD_TEXTURE_GATHER_BIAS_LOD_EXTENSION_NAME : aliased constant String := "VK_AMD_texture_gather_bias_lod" & ASCII.NUL; -- vulkan_core.h:7779 VK_AMD_shader_info : constant := 1; -- vulkan_core.h:7788 VK_AMD_SHADER_INFO_SPEC_VERSION : constant := 1; -- vulkan_core.h:7789 VK_AMD_SHADER_INFO_EXTENSION_NAME : aliased constant String := "VK_AMD_shader_info" & ASCII.NUL; -- vulkan_core.h:7790 VK_AMD_shader_image_load_store_lod : constant := 1; -- vulkan_core.h:7832 VK_AMD_SHADER_IMAGE_LOAD_STORE_LOD_SPEC_VERSION : constant := 1; -- vulkan_core.h:7833 VK_AMD_SHADER_IMAGE_LOAD_STORE_LOD_EXTENSION_NAME : aliased constant String := "VK_AMD_shader_image_load_store_lod" & ASCII.NUL; -- vulkan_core.h:7834 VK_NV_corner_sampled_image : constant := 1; -- vulkan_core.h:7837 VK_NV_CORNER_SAMPLED_IMAGE_SPEC_VERSION : constant := 2; -- vulkan_core.h:7838 VK_NV_CORNER_SAMPLED_IMAGE_EXTENSION_NAME : aliased constant String := "VK_NV_corner_sampled_image" & ASCII.NUL; -- vulkan_core.h:7839 VK_IMG_format_pvrtc : constant := 1; -- vulkan_core.h:7848 VK_IMG_FORMAT_PVRTC_SPEC_VERSION : constant := 1; -- vulkan_core.h:7849 VK_IMG_FORMAT_PVRTC_EXTENSION_NAME : aliased constant String := "VK_IMG_format_pvrtc" & ASCII.NUL; -- vulkan_core.h:7850 VK_NV_external_memory_capabilities : constant := 1; -- vulkan_core.h:7853 VK_NV_EXTERNAL_MEMORY_CAPABILITIES_SPEC_VERSION : constant := 1; -- vulkan_core.h:7854 VK_NV_EXTERNAL_MEMORY_CAPABILITIES_EXTENSION_NAME : aliased constant String := "VK_NV_external_memory_capabilities" & ASCII.NUL; -- vulkan_core.h:7855 VK_NV_external_memory : constant := 1; -- vulkan_core.h:7895 VK_NV_EXTERNAL_MEMORY_SPEC_VERSION : constant := 1; -- vulkan_core.h:7896 VK_NV_EXTERNAL_MEMORY_EXTENSION_NAME : aliased constant String := "VK_NV_external_memory" & ASCII.NUL; -- vulkan_core.h:7897 VK_EXT_validation_flags : constant := 1; -- vulkan_core.h:7912 VK_EXT_VALIDATION_FLAGS_SPEC_VERSION : constant := 2; -- vulkan_core.h:7913 VK_EXT_VALIDATION_FLAGS_EXTENSION_NAME : aliased constant String := "VK_EXT_validation_flags" & ASCII.NUL; -- vulkan_core.h:7914 VK_EXT_shader_subgroup_ballot : constant := 1; -- vulkan_core.h:7933 VK_EXT_SHADER_SUBGROUP_BALLOT_SPEC_VERSION : constant := 1; -- vulkan_core.h:7934 VK_EXT_SHADER_SUBGROUP_BALLOT_EXTENSION_NAME : aliased constant String := "VK_EXT_shader_subgroup_ballot" & ASCII.NUL; -- vulkan_core.h:7935 VK_EXT_shader_subgroup_vote : constant := 1; -- vulkan_core.h:7938 VK_EXT_SHADER_SUBGROUP_VOTE_SPEC_VERSION : constant := 1; -- vulkan_core.h:7939 VK_EXT_SHADER_SUBGROUP_VOTE_EXTENSION_NAME : aliased constant String := "VK_EXT_shader_subgroup_vote" & ASCII.NUL; -- vulkan_core.h:7940 VK_EXT_texture_compression_astc_hdr : constant := 1; -- vulkan_core.h:7943 VK_EXT_TEXTURE_COMPRESSION_ASTC_HDR_SPEC_VERSION : constant := 1; -- vulkan_core.h:7944 VK_EXT_TEXTURE_COMPRESSION_ASTC_HDR_EXTENSION_NAME : aliased constant String := "VK_EXT_texture_compression_astc_hdr" & ASCII.NUL; -- vulkan_core.h:7945 VK_EXT_astc_decode_mode : constant := 1; -- vulkan_core.h:7954 VK_EXT_ASTC_DECODE_MODE_SPEC_VERSION : constant := 1; -- vulkan_core.h:7955 VK_EXT_ASTC_DECODE_MODE_EXTENSION_NAME : aliased constant String := "VK_EXT_astc_decode_mode" & ASCII.NUL; -- vulkan_core.h:7956 VK_EXT_conditional_rendering : constant := 1; -- vulkan_core.h:7971 VK_EXT_CONDITIONAL_RENDERING_SPEC_VERSION : constant := 2; -- vulkan_core.h:7972 VK_EXT_CONDITIONAL_RENDERING_EXTENSION_NAME : aliased constant String := "VK_EXT_conditional_rendering" & ASCII.NUL; -- vulkan_core.h:7973 VK_NVX_device_generated_commands : constant := 1; -- vulkan_core.h:8014 VK_NVX_DEVICE_GENERATED_COMMANDS_SPEC_VERSION : constant := 3; -- vulkan_core.h:8017 VK_NVX_DEVICE_GENERATED_COMMANDS_EXTENSION_NAME : aliased constant String := "VK_NVX_device_generated_commands" & ASCII.NUL; -- vulkan_core.h:8018 VK_NV_clip_space_w_scaling : constant := 1; -- vulkan_core.h:8237 VK_NV_CLIP_SPACE_W_SCALING_SPEC_VERSION : constant := 1; -- vulkan_core.h:8238 VK_NV_CLIP_SPACE_W_SCALING_EXTENSION_NAME : aliased constant String := "VK_NV_clip_space_w_scaling" & ASCII.NUL; -- vulkan_core.h:8239 VK_EXT_direct_mode_display : constant := 1; -- vulkan_core.h:8264 VK_EXT_DIRECT_MODE_DISPLAY_SPEC_VERSION : constant := 1; -- vulkan_core.h:8265 VK_EXT_DIRECT_MODE_DISPLAY_EXTENSION_NAME : aliased constant String := "VK_EXT_direct_mode_display" & ASCII.NUL; -- vulkan_core.h:8266 VK_EXT_display_surface_counter : constant := 1; -- vulkan_core.h:8276 VK_EXT_DISPLAY_SURFACE_COUNTER_SPEC_VERSION : constant := 1; -- vulkan_core.h:8277 VK_EXT_DISPLAY_SURFACE_COUNTER_EXTENSION_NAME : aliased constant String := "VK_EXT_display_surface_counter" & ASCII.NUL; -- vulkan_core.h:8278 VK_EXT_display_control : constant := 1; -- vulkan_core.h:8311 VK_EXT_DISPLAY_CONTROL_SPEC_VERSION : constant := 1; -- vulkan_core.h:8312 VK_EXT_DISPLAY_CONTROL_EXTENSION_NAME : aliased constant String := "VK_EXT_display_control" & ASCII.NUL; -- vulkan_core.h:8313 VK_GOOGLE_display_timing : constant := 1; -- vulkan_core.h:8396 VK_GOOGLE_DISPLAY_TIMING_SPEC_VERSION : constant := 1; -- vulkan_core.h:8397 VK_GOOGLE_DISPLAY_TIMING_EXTENSION_NAME : aliased constant String := "VK_GOOGLE_display_timing" & ASCII.NUL; -- vulkan_core.h:8398 VK_NV_sample_mask_override_coverage : constant := 1; -- vulkan_core.h:8440 VK_NV_SAMPLE_MASK_OVERRIDE_COVERAGE_SPEC_VERSION : constant := 1; -- vulkan_core.h:8441 VK_NV_SAMPLE_MASK_OVERRIDE_COVERAGE_EXTENSION_NAME : aliased constant String := "VK_NV_sample_mask_override_coverage" & ASCII.NUL; -- vulkan_core.h:8442 VK_NV_geometry_shader_passthrough : constant := 1; -- vulkan_core.h:8445 VK_NV_GEOMETRY_SHADER_PASSTHROUGH_SPEC_VERSION : constant := 1; -- vulkan_core.h:8446 VK_NV_GEOMETRY_SHADER_PASSTHROUGH_EXTENSION_NAME : aliased constant String := "VK_NV_geometry_shader_passthrough" & ASCII.NUL; -- vulkan_core.h:8447 VK_NV_viewport_array2 : constant := 1; -- vulkan_core.h:8450 VK_NV_VIEWPORT_ARRAY2_SPEC_VERSION : constant := 1; -- vulkan_core.h:8451 VK_NV_VIEWPORT_ARRAY2_EXTENSION_NAME : aliased constant String := "VK_NV_viewport_array2" & ASCII.NUL; -- vulkan_core.h:8452 VK_NVX_multiview_per_view_attributes : constant := 1; -- vulkan_core.h:8455 VK_NVX_MULTIVIEW_PER_VIEW_ATTRIBUTES_SPEC_VERSION : constant := 1; -- vulkan_core.h:8456 VK_NVX_MULTIVIEW_PER_VIEW_ATTRIBUTES_EXTENSION_NAME : aliased constant String := "VK_NVX_multiview_per_view_attributes" & ASCII.NUL; -- vulkan_core.h:8457 VK_NV_viewport_swizzle : constant := 1; -- vulkan_core.h:8466 VK_NV_VIEWPORT_SWIZZLE_SPEC_VERSION : constant := 1; -- vulkan_core.h:8467 VK_NV_VIEWPORT_SWIZZLE_EXTENSION_NAME : aliased constant String := "VK_NV_viewport_swizzle" & ASCII.NUL; -- vulkan_core.h:8468 VK_EXT_discard_rectangles : constant := 1; -- vulkan_core.h:8502 VK_EXT_DISCARD_RECTANGLES_SPEC_VERSION : constant := 1; -- vulkan_core.h:8503 VK_EXT_DISCARD_RECTANGLES_EXTENSION_NAME : aliased constant String := "VK_EXT_discard_rectangles" & ASCII.NUL; -- vulkan_core.h:8504 VK_EXT_conservative_rasterization : constant := 1; -- vulkan_core.h:8541 VK_EXT_CONSERVATIVE_RASTERIZATION_SPEC_VERSION : constant := 1; -- vulkan_core.h:8542 VK_EXT_CONSERVATIVE_RASTERIZATION_EXTENSION_NAME : aliased constant String := "VK_EXT_conservative_rasterization" & ASCII.NUL; -- vulkan_core.h:8543 VK_EXT_depth_clip_enable : constant := 1; -- vulkan_core.h:8579 VK_EXT_DEPTH_CLIP_ENABLE_SPEC_VERSION : constant := 1; -- vulkan_core.h:8580 VK_EXT_DEPTH_CLIP_ENABLE_EXTENSION_NAME : aliased constant String := "VK_EXT_depth_clip_enable" & ASCII.NUL; -- vulkan_core.h:8581 VK_EXT_swapchain_colorspace : constant := 1; -- vulkan_core.h:8598 VK_EXT_SWAPCHAIN_COLOR_SPACE_SPEC_VERSION : constant := 4; -- vulkan_core.h:8599 VK_EXT_SWAPCHAIN_COLOR_SPACE_EXTENSION_NAME : aliased constant String := "VK_EXT_swapchain_colorspace" & ASCII.NUL; -- vulkan_core.h:8600 VK_EXT_hdr_metadata : constant := 1; -- vulkan_core.h:8603 VK_EXT_HDR_METADATA_SPEC_VERSION : constant := 2; -- vulkan_core.h:8604 VK_EXT_HDR_METADATA_EXTENSION_NAME : aliased constant String := "VK_EXT_hdr_metadata" & ASCII.NUL; -- vulkan_core.h:8605 VK_EXT_external_memory_dma_buf : constant := 1; -- vulkan_core.h:8635 VK_EXT_EXTERNAL_MEMORY_DMA_BUF_SPEC_VERSION : constant := 1; -- vulkan_core.h:8636 VK_EXT_EXTERNAL_MEMORY_DMA_BUF_EXTENSION_NAME : aliased constant String := "VK_EXT_external_memory_dma_buf" & ASCII.NUL; -- vulkan_core.h:8637 VK_EXT_queue_family_foreign : constant := 1; -- vulkan_core.h:8640 VK_EXT_QUEUE_FAMILY_FOREIGN_SPEC_VERSION : constant := 1; -- vulkan_core.h:8641 VK_EXT_QUEUE_FAMILY_FOREIGN_EXTENSION_NAME : aliased constant String := "VK_EXT_queue_family_foreign" & ASCII.NUL; -- vulkan_core.h:8642 -- unsupported macro: VK_QUEUE_FAMILY_FOREIGN_EXT (~0U-2) VK_EXT_debug_utils : constant := 1; -- vulkan_core.h:8646 VK_EXT_DEBUG_UTILS_SPEC_VERSION : constant := 1; -- vulkan_core.h:8648 VK_EXT_DEBUG_UTILS_EXTENSION_NAME : aliased constant String := "VK_EXT_debug_utils" & ASCII.NUL; -- vulkan_core.h:8649 VK_EXT_sampler_filter_minmax : constant := 1; -- vulkan_core.h:8787 VK_EXT_SAMPLER_FILTER_MINMAX_SPEC_VERSION : constant := 2; -- vulkan_core.h:8788 VK_EXT_SAMPLER_FILTER_MINMAX_EXTENSION_NAME : aliased constant String := "VK_EXT_sampler_filter_minmax" & ASCII.NUL; -- vulkan_core.h:8789 VK_AMD_gpu_shader_int16 : constant := 1; -- vulkan_core.h:8798 VK_AMD_GPU_SHADER_INT16_SPEC_VERSION : constant := 2; -- vulkan_core.h:8799 VK_AMD_GPU_SHADER_INT16_EXTENSION_NAME : aliased constant String := "VK_AMD_gpu_shader_int16" & ASCII.NUL; -- vulkan_core.h:8800 VK_AMD_mixed_attachment_samples : constant := 1; -- vulkan_core.h:8803 VK_AMD_MIXED_ATTACHMENT_SAMPLES_SPEC_VERSION : constant := 1; -- vulkan_core.h:8804 VK_AMD_MIXED_ATTACHMENT_SAMPLES_EXTENSION_NAME : aliased constant String := "VK_AMD_mixed_attachment_samples" & ASCII.NUL; -- vulkan_core.h:8805 VK_AMD_shader_fragment_mask : constant := 1; -- vulkan_core.h:8808 VK_AMD_SHADER_FRAGMENT_MASK_SPEC_VERSION : constant := 1; -- vulkan_core.h:8809 VK_AMD_SHADER_FRAGMENT_MASK_EXTENSION_NAME : aliased constant String := "VK_AMD_shader_fragment_mask" & ASCII.NUL; -- vulkan_core.h:8810 VK_EXT_inline_uniform_block : constant := 1; -- vulkan_core.h:8813 VK_EXT_INLINE_UNIFORM_BLOCK_SPEC_VERSION : constant := 1; -- vulkan_core.h:8814 VK_EXT_INLINE_UNIFORM_BLOCK_EXTENSION_NAME : aliased constant String := "VK_EXT_inline_uniform_block" & ASCII.NUL; -- vulkan_core.h:8815 VK_EXT_shader_stencil_export : constant := 1; -- vulkan_core.h:8848 VK_EXT_SHADER_STENCIL_EXPORT_SPEC_VERSION : constant := 1; -- vulkan_core.h:8849 VK_EXT_SHADER_STENCIL_EXPORT_EXTENSION_NAME : aliased constant String := "VK_EXT_shader_stencil_export" & ASCII.NUL; -- vulkan_core.h:8850 VK_EXT_sample_locations : constant := 1; -- vulkan_core.h:8853 VK_EXT_SAMPLE_LOCATIONS_SPEC_VERSION : constant := 1; -- vulkan_core.h:8854 VK_EXT_SAMPLE_LOCATIONS_EXTENSION_NAME : aliased constant String := "VK_EXT_sample_locations" & ASCII.NUL; -- vulkan_core.h:8855 VK_EXT_blend_operation_advanced : constant := 1; -- vulkan_core.h:8927 VK_EXT_BLEND_OPERATION_ADVANCED_SPEC_VERSION : constant := 2; -- vulkan_core.h:8928 VK_EXT_BLEND_OPERATION_ADVANCED_EXTENSION_NAME : aliased constant String := "VK_EXT_blend_operation_advanced" & ASCII.NUL; -- vulkan_core.h:8929 VK_NV_fragment_coverage_to_color : constant := 1; -- vulkan_core.h:8967 VK_NV_FRAGMENT_COVERAGE_TO_COLOR_SPEC_VERSION : constant := 1; -- vulkan_core.h:8968 VK_NV_FRAGMENT_COVERAGE_TO_COLOR_EXTENSION_NAME : aliased constant String := "VK_NV_fragment_coverage_to_color" & ASCII.NUL; -- vulkan_core.h:8969 VK_NV_framebuffer_mixed_samples : constant := 1; -- vulkan_core.h:8981 VK_NV_FRAMEBUFFER_MIXED_SAMPLES_SPEC_VERSION : constant := 1; -- vulkan_core.h:8982 VK_NV_FRAMEBUFFER_MIXED_SAMPLES_EXTENSION_NAME : aliased constant String := "VK_NV_framebuffer_mixed_samples" & ASCII.NUL; -- vulkan_core.h:8983 VK_NV_fill_rectangle : constant := 1; -- vulkan_core.h:9008 VK_NV_FILL_RECTANGLE_SPEC_VERSION : constant := 1; -- vulkan_core.h:9009 VK_NV_FILL_RECTANGLE_EXTENSION_NAME : aliased constant String := "VK_NV_fill_rectangle" & ASCII.NUL; -- vulkan_core.h:9010 VK_NV_shader_sm_builtins : constant := 1; -- vulkan_core.h:9013 VK_NV_SHADER_SM_BUILTINS_SPEC_VERSION : constant := 1; -- vulkan_core.h:9014 VK_NV_SHADER_SM_BUILTINS_EXTENSION_NAME : aliased constant String := "VK_NV_shader_sm_builtins" & ASCII.NUL; -- vulkan_core.h:9015 VK_EXT_post_depth_coverage : constant := 1; -- vulkan_core.h:9031 VK_EXT_POST_DEPTH_COVERAGE_SPEC_VERSION : constant := 1; -- vulkan_core.h:9032 VK_EXT_POST_DEPTH_COVERAGE_EXTENSION_NAME : aliased constant String := "VK_EXT_post_depth_coverage" & ASCII.NUL; -- vulkan_core.h:9033 VK_EXT_image_drm_format_modifier : constant := 1; -- vulkan_core.h:9036 VK_EXT_IMAGE_DRM_FORMAT_MODIFIER_SPEC_VERSION : constant := 1; -- vulkan_core.h:9037 VK_EXT_IMAGE_DRM_FORMAT_MODIFIER_EXTENSION_NAME : aliased constant String := "VK_EXT_image_drm_format_modifier" & ASCII.NUL; -- vulkan_core.h:9038 VK_EXT_validation_cache : constant := 1; -- vulkan_core.h:9092 VK_EXT_VALIDATION_CACHE_SPEC_VERSION : constant := 1; -- vulkan_core.h:9094 VK_EXT_VALIDATION_CACHE_EXTENSION_NAME : aliased constant String := "VK_EXT_validation_cache" & ASCII.NUL; -- vulkan_core.h:9095 VK_EXT_descriptor_indexing : constant := 1; -- vulkan_core.h:9150 VK_EXT_DESCRIPTOR_INDEXING_SPEC_VERSION : constant := 2; -- vulkan_core.h:9151 VK_EXT_DESCRIPTOR_INDEXING_EXTENSION_NAME : aliased constant String := "VK_EXT_descriptor_indexing" & ASCII.NUL; -- vulkan_core.h:9152 VK_EXT_shader_viewport_index_layer : constant := 1; -- vulkan_core.h:9169 VK_EXT_SHADER_VIEWPORT_INDEX_LAYER_SPEC_VERSION : constant := 1; -- vulkan_core.h:9170 VK_EXT_SHADER_VIEWPORT_INDEX_LAYER_EXTENSION_NAME : aliased constant String := "VK_EXT_shader_viewport_index_layer" & ASCII.NUL; -- vulkan_core.h:9171 VK_NV_shading_rate_image : constant := 1; -- vulkan_core.h:9174 VK_NV_SHADING_RATE_IMAGE_SPEC_VERSION : constant := 3; -- vulkan_core.h:9175 VK_NV_SHADING_RATE_IMAGE_EXTENSION_NAME : aliased constant String := "VK_NV_shading_rate_image" & ASCII.NUL; -- vulkan_core.h:9176 VK_NV_ray_tracing : constant := 1; -- vulkan_core.h:9280 VK_NV_RAY_TRACING_SPEC_VERSION : constant := 3; -- vulkan_core.h:9282 VK_NV_RAY_TRACING_EXTENSION_NAME : aliased constant String := "VK_NV_ray_tracing" & ASCII.NUL; -- vulkan_core.h:9283 -- unsupported macro: VK_SHADER_UNUSED_NV (~0U) VK_NV_representative_fragment_test : constant := 1; -- vulkan_core.h:9580 VK_NV_REPRESENTATIVE_FRAGMENT_TEST_SPEC_VERSION : constant := 2; -- vulkan_core.h:9581 VK_NV_REPRESENTATIVE_FRAGMENT_TEST_EXTENSION_NAME : aliased constant String := "VK_NV_representative_fragment_test" & ASCII.NUL; -- vulkan_core.h:9582 VK_EXT_filter_cubic : constant := 1; -- vulkan_core.h:9597 VK_EXT_FILTER_CUBIC_SPEC_VERSION : constant := 3; -- vulkan_core.h:9598 VK_EXT_FILTER_CUBIC_EXTENSION_NAME : aliased constant String := "VK_EXT_filter_cubic" & ASCII.NUL; -- vulkan_core.h:9599 VK_EXT_global_priority : constant := 1; -- vulkan_core.h:9615 VK_EXT_GLOBAL_PRIORITY_SPEC_VERSION : constant := 2; -- vulkan_core.h:9616 VK_EXT_GLOBAL_PRIORITY_EXTENSION_NAME : aliased constant String := "VK_EXT_global_priority" & ASCII.NUL; -- vulkan_core.h:9617 VK_EXT_external_memory_host : constant := 1; -- vulkan_core.h:9637 VK_EXT_EXTERNAL_MEMORY_HOST_SPEC_VERSION : constant := 1; -- vulkan_core.h:9638 VK_EXT_EXTERNAL_MEMORY_HOST_EXTENSION_NAME : aliased constant String := "VK_EXT_external_memory_host" & ASCII.NUL; -- vulkan_core.h:9639 VK_AMD_buffer_marker : constant := 1; -- vulkan_core.h:9670 VK_AMD_BUFFER_MARKER_SPEC_VERSION : constant := 1; -- vulkan_core.h:9671 VK_AMD_BUFFER_MARKER_EXTENSION_NAME : aliased constant String := "VK_AMD_buffer_marker" & ASCII.NUL; -- vulkan_core.h:9672 VK_AMD_pipeline_compiler_control : constant := 1; -- vulkan_core.h:9685 VK_AMD_PIPELINE_COMPILER_CONTROL_SPEC_VERSION : constant := 1; -- vulkan_core.h:9686 VK_AMD_PIPELINE_COMPILER_CONTROL_EXTENSION_NAME : aliased constant String := "VK_AMD_pipeline_compiler_control" & ASCII.NUL; -- vulkan_core.h:9687 VK_EXT_calibrated_timestamps : constant := 1; -- vulkan_core.h:9701 VK_EXT_CALIBRATED_TIMESTAMPS_SPEC_VERSION : constant := 1; -- vulkan_core.h:9702 VK_EXT_CALIBRATED_TIMESTAMPS_EXTENSION_NAME : aliased constant String := "VK_EXT_calibrated_timestamps" & ASCII.NUL; -- vulkan_core.h:9703 VK_AMD_shader_core_properties : constant := 1; -- vulkan_core.h:9739 VK_AMD_SHADER_CORE_PROPERTIES_SPEC_VERSION : constant := 2; -- vulkan_core.h:9740 VK_AMD_SHADER_CORE_PROPERTIES_EXTENSION_NAME : aliased constant String := "VK_AMD_shader_core_properties" & ASCII.NUL; -- vulkan_core.h:9741 VK_AMD_memory_overallocation_behavior : constant := 1; -- vulkan_core.h:9763 VK_AMD_MEMORY_OVERALLOCATION_BEHAVIOR_SPEC_VERSION : constant := 1; -- vulkan_core.h:9764 VK_AMD_MEMORY_OVERALLOCATION_BEHAVIOR_EXTENSION_NAME : aliased constant String := "VK_AMD_memory_overallocation_behavior" & ASCII.NUL; -- vulkan_core.h:9765 VK_EXT_vertex_attribute_divisor : constant := 1; -- vulkan_core.h:9784 VK_EXT_VERTEX_ATTRIBUTE_DIVISOR_SPEC_VERSION : constant := 3; -- vulkan_core.h:9785 VK_EXT_VERTEX_ATTRIBUTE_DIVISOR_EXTENSION_NAME : aliased constant String := "VK_EXT_vertex_attribute_divisor" & ASCII.NUL; -- vulkan_core.h:9786 VK_EXT_pipeline_creation_feedback : constant := 1; -- vulkan_core.h:9814 VK_EXT_PIPELINE_CREATION_FEEDBACK_SPEC_VERSION : constant := 1; -- vulkan_core.h:9815 VK_EXT_PIPELINE_CREATION_FEEDBACK_EXTENSION_NAME : aliased constant String := "VK_EXT_pipeline_creation_feedback" & ASCII.NUL; -- vulkan_core.h:9816 VK_NV_shader_subgroup_partitioned : constant := 1; -- vulkan_core.h:9840 VK_NV_SHADER_SUBGROUP_PARTITIONED_SPEC_VERSION : constant := 1; -- vulkan_core.h:9841 VK_NV_SHADER_SUBGROUP_PARTITIONED_EXTENSION_NAME : aliased constant String := "VK_NV_shader_subgroup_partitioned" & ASCII.NUL; -- vulkan_core.h:9842 VK_NV_compute_shader_derivatives : constant := 1; -- vulkan_core.h:9845 VK_NV_COMPUTE_SHADER_DERIVATIVES_SPEC_VERSION : constant := 1; -- vulkan_core.h:9846 VK_NV_COMPUTE_SHADER_DERIVATIVES_EXTENSION_NAME : aliased constant String := "VK_NV_compute_shader_derivatives" & ASCII.NUL; -- vulkan_core.h:9847 VK_NV_mesh_shader : constant := 1; -- vulkan_core.h:9857 VK_NV_MESH_SHADER_SPEC_VERSION : constant := 1; -- vulkan_core.h:9858 VK_NV_MESH_SHADER_EXTENSION_NAME : aliased constant String := "VK_NV_mesh_shader" & ASCII.NUL; -- vulkan_core.h:9859 VK_NV_fragment_shader_barycentric : constant := 1; -- vulkan_core.h:9918 VK_NV_FRAGMENT_SHADER_BARYCENTRIC_SPEC_VERSION : constant := 1; -- vulkan_core.h:9919 VK_NV_FRAGMENT_SHADER_BARYCENTRIC_EXTENSION_NAME : aliased constant String := "VK_NV_fragment_shader_barycentric" & ASCII.NUL; -- vulkan_core.h:9920 VK_NV_shader_image_footprint : constant := 1; -- vulkan_core.h:9929 VK_NV_SHADER_IMAGE_FOOTPRINT_SPEC_VERSION : constant := 2; -- vulkan_core.h:9930 VK_NV_SHADER_IMAGE_FOOTPRINT_EXTENSION_NAME : aliased constant String := "VK_NV_shader_image_footprint" & ASCII.NUL; -- vulkan_core.h:9931 VK_NV_scissor_exclusive : constant := 1; -- vulkan_core.h:9940 VK_NV_SCISSOR_EXCLUSIVE_SPEC_VERSION : constant := 1; -- vulkan_core.h:9941 VK_NV_SCISSOR_EXCLUSIVE_EXTENSION_NAME : aliased constant String := "VK_NV_scissor_exclusive" & ASCII.NUL; -- vulkan_core.h:9942 VK_NV_device_diagnostic_checkpoints : constant := 1; -- vulkan_core.h:9967 VK_NV_DEVICE_DIAGNOSTIC_CHECKPOINTS_SPEC_VERSION : constant := 2; -- vulkan_core.h:9968 VK_NV_DEVICE_DIAGNOSTIC_CHECKPOINTS_EXTENSION_NAME : aliased constant String := "VK_NV_device_diagnostic_checkpoints" & ASCII.NUL; -- vulkan_core.h:9969 VK_INTEL_shader_integer_functions2 : constant := 1; -- vulkan_core.h:9998 VK_INTEL_SHADER_INTEGER_FUNCTIONS_2_SPEC_VERSION : constant := 1; -- vulkan_core.h:9999 VK_INTEL_SHADER_INTEGER_FUNCTIONS_2_EXTENSION_NAME : aliased constant String := "VK_INTEL_shader_integer_functions2" & ASCII.NUL; -- vulkan_core.h:10000 VK_INTEL_performance_query : constant := 1; -- vulkan_core.h:10009 VK_INTEL_PERFORMANCE_QUERY_SPEC_VERSION : constant := 1; -- vulkan_core.h:10011 VK_INTEL_PERFORMANCE_QUERY_EXTENSION_NAME : aliased constant String := "VK_INTEL_performance_query" & ASCII.NUL; -- vulkan_core.h:10012 VK_EXT_pci_bus_info : constant := 1; -- vulkan_core.h:10160 VK_EXT_PCI_BUS_INFO_SPEC_VERSION : constant := 2; -- vulkan_core.h:10161 VK_EXT_PCI_BUS_INFO_EXTENSION_NAME : aliased constant String := "VK_EXT_pci_bus_info" & ASCII.NUL; -- vulkan_core.h:10162 VK_AMD_display_native_hdr : constant := 1; -- vulkan_core.h:10174 VK_AMD_DISPLAY_NATIVE_HDR_SPEC_VERSION : constant := 1; -- vulkan_core.h:10175 VK_AMD_DISPLAY_NATIVE_HDR_EXTENSION_NAME : aliased constant String := "VK_AMD_display_native_hdr" & ASCII.NUL; -- vulkan_core.h:10176 VK_EXT_fragment_density_map : constant := 1; -- vulkan_core.h:10199 VK_EXT_FRAGMENT_DENSITY_MAP_SPEC_VERSION : constant := 1; -- vulkan_core.h:10200 VK_EXT_FRAGMENT_DENSITY_MAP_EXTENSION_NAME : aliased constant String := "VK_EXT_fragment_density_map" & ASCII.NUL; -- vulkan_core.h:10201 VK_EXT_scalar_block_layout : constant := 1; -- vulkan_core.h:10226 VK_EXT_SCALAR_BLOCK_LAYOUT_SPEC_VERSION : constant := 1; -- vulkan_core.h:10227 VK_EXT_SCALAR_BLOCK_LAYOUT_EXTENSION_NAME : aliased constant String := "VK_EXT_scalar_block_layout" & ASCII.NUL; -- vulkan_core.h:10228 VK_GOOGLE_hlsl_functionality1 : constant := 1; -- vulkan_core.h:10233 VK_GOOGLE_HLSL_FUNCTIONALITY1_SPEC_VERSION : constant := 1; -- vulkan_core.h:10234 VK_GOOGLE_HLSL_FUNCTIONALITY1_EXTENSION_NAME : aliased constant String := "VK_GOOGLE_hlsl_functionality1" & ASCII.NUL; -- vulkan_core.h:10235 VK_GOOGLE_decorate_string : constant := 1; -- vulkan_core.h:10238 VK_GOOGLE_DECORATE_STRING_SPEC_VERSION : constant := 1; -- vulkan_core.h:10239 VK_GOOGLE_DECORATE_STRING_EXTENSION_NAME : aliased constant String := "VK_GOOGLE_decorate_string" & ASCII.NUL; -- vulkan_core.h:10240 VK_EXT_subgroup_size_control : constant := 1; -- vulkan_core.h:10243 VK_EXT_SUBGROUP_SIZE_CONTROL_SPEC_VERSION : constant := 2; -- vulkan_core.h:10244 VK_EXT_SUBGROUP_SIZE_CONTROL_EXTENSION_NAME : aliased constant String := "VK_EXT_subgroup_size_control" & ASCII.NUL; -- vulkan_core.h:10245 VK_AMD_shader_core_properties2 : constant := 1; -- vulkan_core.h:10270 VK_AMD_SHADER_CORE_PROPERTIES_2_SPEC_VERSION : constant := 1; -- vulkan_core.h:10271 VK_AMD_SHADER_CORE_PROPERTIES_2_EXTENSION_NAME : aliased constant String := "VK_AMD_shader_core_properties2" & ASCII.NUL; -- vulkan_core.h:10272 VK_AMD_device_coherent_memory : constant := 1; -- vulkan_core.h:10287 VK_AMD_DEVICE_COHERENT_MEMORY_SPEC_VERSION : constant := 1; -- vulkan_core.h:10288 VK_AMD_DEVICE_COHERENT_MEMORY_EXTENSION_NAME : aliased constant String := "VK_AMD_device_coherent_memory" & ASCII.NUL; -- vulkan_core.h:10289 VK_EXT_memory_budget : constant := 1; -- vulkan_core.h:10298 VK_EXT_MEMORY_BUDGET_SPEC_VERSION : constant := 1; -- vulkan_core.h:10299 VK_EXT_MEMORY_BUDGET_EXTENSION_NAME : aliased constant String := "VK_EXT_memory_budget" & ASCII.NUL; -- vulkan_core.h:10300 VK_EXT_memory_priority : constant := 1; -- vulkan_core.h:10310 VK_EXT_MEMORY_PRIORITY_SPEC_VERSION : constant := 1; -- vulkan_core.h:10311 VK_EXT_MEMORY_PRIORITY_EXTENSION_NAME : aliased constant String := "VK_EXT_memory_priority" & ASCII.NUL; -- vulkan_core.h:10312 VK_NV_dedicated_allocation_image_aliasing : constant := 1; -- vulkan_core.h:10327 VK_NV_DEDICATED_ALLOCATION_IMAGE_ALIASING_SPEC_VERSION : constant := 1; -- vulkan_core.h:10328 VK_NV_DEDICATED_ALLOCATION_IMAGE_ALIASING_EXTENSION_NAME : aliased constant String := "VK_NV_dedicated_allocation_image_aliasing" & ASCII.NUL; -- vulkan_core.h:10329 VK_EXT_buffer_device_address : constant := 1; -- vulkan_core.h:10338 VK_EXT_BUFFER_DEVICE_ADDRESS_SPEC_VERSION : constant := 2; -- vulkan_core.h:10339 VK_EXT_BUFFER_DEVICE_ADDRESS_EXTENSION_NAME : aliased constant String := "VK_EXT_buffer_device_address" & ASCII.NUL; -- vulkan_core.h:10340 VK_EXT_tooling_info : constant := 1; -- vulkan_core.h:10368 VK_EXT_TOOLING_INFO_SPEC_VERSION : constant := 1; -- vulkan_core.h:10369 VK_EXT_TOOLING_INFO_EXTENSION_NAME : aliased constant String := "VK_EXT_tooling_info" & ASCII.NUL; -- vulkan_core.h:10370 VK_EXT_separate_stencil_usage : constant := 1; -- vulkan_core.h:10403 VK_EXT_SEPARATE_STENCIL_USAGE_SPEC_VERSION : constant := 1; -- vulkan_core.h:10404 VK_EXT_SEPARATE_STENCIL_USAGE_EXTENSION_NAME : aliased constant String := "VK_EXT_separate_stencil_usage" & ASCII.NUL; -- vulkan_core.h:10405 VK_EXT_validation_features : constant := 1; -- vulkan_core.h:10410 VK_EXT_VALIDATION_FEATURES_SPEC_VERSION : constant := 2; -- vulkan_core.h:10411 VK_EXT_VALIDATION_FEATURES_EXTENSION_NAME : aliased constant String := "VK_EXT_validation_features" & ASCII.NUL; -- vulkan_core.h:10412 VK_NV_cooperative_matrix : constant := 1; -- vulkan_core.h:10448 VK_NV_COOPERATIVE_MATRIX_SPEC_VERSION : constant := 1; -- vulkan_core.h:10449 VK_NV_COOPERATIVE_MATRIX_EXTENSION_NAME : aliased constant String := "VK_NV_cooperative_matrix" & ASCII.NUL; -- vulkan_core.h:10450 VK_NV_coverage_reduction_mode : constant := 1; -- vulkan_core.h:10516 VK_NV_COVERAGE_REDUCTION_MODE_SPEC_VERSION : constant := 1; -- vulkan_core.h:10517 VK_NV_COVERAGE_REDUCTION_MODE_EXTENSION_NAME : aliased constant String := "VK_NV_coverage_reduction_mode" & ASCII.NUL; -- vulkan_core.h:10518 VK_EXT_fragment_shader_interlock : constant := 1; -- vulkan_core.h:10561 VK_EXT_FRAGMENT_SHADER_INTERLOCK_SPEC_VERSION : constant := 1; -- vulkan_core.h:10562 VK_EXT_FRAGMENT_SHADER_INTERLOCK_EXTENSION_NAME : aliased constant String := "VK_EXT_fragment_shader_interlock" & ASCII.NUL; -- vulkan_core.h:10563 VK_EXT_ycbcr_image_arrays : constant := 1; -- vulkan_core.h:10574 VK_EXT_YCBCR_IMAGE_ARRAYS_SPEC_VERSION : constant := 1; -- vulkan_core.h:10575 VK_EXT_YCBCR_IMAGE_ARRAYS_EXTENSION_NAME : aliased constant String := "VK_EXT_ycbcr_image_arrays" & ASCII.NUL; -- vulkan_core.h:10576 VK_EXT_headless_surface : constant := 1; -- vulkan_core.h:10585 VK_EXT_HEADLESS_SURFACE_SPEC_VERSION : constant := 1; -- vulkan_core.h:10586 VK_EXT_HEADLESS_SURFACE_EXTENSION_NAME : aliased constant String := "VK_EXT_headless_surface" & ASCII.NUL; -- vulkan_core.h:10587 VK_EXT_line_rasterization : constant := 1; -- vulkan_core.h:10606 VK_EXT_LINE_RASTERIZATION_SPEC_VERSION : constant := 1; -- vulkan_core.h:10607 VK_EXT_LINE_RASTERIZATION_EXTENSION_NAME : aliased constant String := "VK_EXT_line_rasterization" & ASCII.NUL; -- vulkan_core.h:10608 VK_EXT_host_query_reset : constant := 1; -- vulkan_core.h:10656 VK_EXT_HOST_QUERY_RESET_SPEC_VERSION : constant := 1; -- vulkan_core.h:10657 VK_EXT_HOST_QUERY_RESET_EXTENSION_NAME : aliased constant String := "VK_EXT_host_query_reset" & ASCII.NUL; -- vulkan_core.h:10658 VK_EXT_index_type_uint8 : constant := 1; -- vulkan_core.h:10672 VK_EXT_INDEX_TYPE_UINT8_SPEC_VERSION : constant := 1; -- vulkan_core.h:10673 VK_EXT_INDEX_TYPE_UINT8_EXTENSION_NAME : aliased constant String := "VK_EXT_index_type_uint8" & ASCII.NUL; -- vulkan_core.h:10674 VK_EXT_shader_demote_to_helper_invocation : constant := 1; -- vulkan_core.h:10683 VK_EXT_SHADER_DEMOTE_TO_HELPER_INVOCATION_SPEC_VERSION : constant := 1; -- vulkan_core.h:10684 VK_EXT_SHADER_DEMOTE_TO_HELPER_INVOCATION_EXTENSION_NAME : aliased constant String := "VK_EXT_shader_demote_to_helper_invocation" & ASCII.NUL; -- vulkan_core.h:10685 VK_EXT_texel_buffer_alignment : constant := 1; -- vulkan_core.h:10694 VK_EXT_TEXEL_BUFFER_ALIGNMENT_SPEC_VERSION : constant := 1; -- vulkan_core.h:10695 VK_EXT_TEXEL_BUFFER_ALIGNMENT_EXTENSION_NAME : aliased constant String := "VK_EXT_texel_buffer_alignment" & ASCII.NUL; -- vulkan_core.h:10696 VK_GOOGLE_user_type : constant := 1; -- vulkan_core.h:10714 VK_GOOGLE_USER_TYPE_SPEC_VERSION : constant := 1; -- vulkan_core.h:10715 VK_GOOGLE_USER_TYPE_EXTENSION_NAME : aliased constant String := "VK_GOOGLE_user_type" & ASCII.NUL; -- vulkan_core.h:10716 --** Copyright (c) 2015-2019 The Khronos Group Inc. --** --** Licensed under the Apache License, Version 2.0 (the "License"); --** you may not use this file except in compliance with the License. --** You may obtain a copy of the 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. -- --** This header is generated from the Khronos Vulkan XML API Registry. --** -- -- DEPRECATED: This define has been removed. Specific version defines (e.g. VK_API_VERSION_1_0), or the VK_MAKE_VERSION macro, should be used instead. --#define VK_API_VERSION VK_MAKE_VERSION(1, 0, 0) // Patch version should always be set to 0 -- Vulkan 1.0 version number -- Version of this file subtype VkFlags is Interfaces.C.unsigned_short; -- vulkan_core.h:64 subtype VkBool32 is Interfaces.C.unsigned_short; -- vulkan_core.h:65 subtype VkDeviceSize is Interfaces.C.unsigned_long; -- vulkan_core.h:66 subtype VkSampleMask is Interfaces.C.unsigned_short; -- vulkan_core.h:67 type VkInstance_T is null record; -- incomplete struct type VkInstance is access all VkInstance_T; -- vulkan_core.h:68 type VkPhysicalDevice_T is null record; -- incomplete struct type VkPhysicalDevice is access all VkPhysicalDevice_T; -- vulkan_core.h:69 type VkDevice_T is null record; -- incomplete struct type VkDevice is access all VkDevice_T; -- vulkan_core.h:70 type VkQueue_T is null record; -- incomplete struct type VkQueue is access all VkQueue_T; -- vulkan_core.h:71 type VkSemaphore_T is null record; -- incomplete struct type VkSemaphore is access all VkSemaphore_T; -- vulkan_core.h:72 type VkCommandBuffer_T is null record; -- incomplete struct type VkCommandBuffer is access all VkCommandBuffer_T; -- vulkan_core.h:73 type VkFence_T is null record; -- incomplete struct type VkFence is access all VkFence_T; -- vulkan_core.h:74 type VkDeviceMemory_T is null record; -- incomplete struct type VkDeviceMemory is access all VkDeviceMemory_T; -- vulkan_core.h:75 type VkBuffer_T is null record; -- incomplete struct type VkBuffer is access all VkBuffer_T; -- vulkan_core.h:76 type VkImage_T is null record; -- incomplete struct type VkImage is access all VkImage_T; -- vulkan_core.h:77 type VkEvent_T is null record; -- incomplete struct type VkEvent is access all VkEvent_T; -- vulkan_core.h:78 type VkQueryPool_T is null record; -- incomplete struct type VkQueryPool is access all VkQueryPool_T; -- vulkan_core.h:79 type VkBufferView_T is null record; -- incomplete struct type VkBufferView is access all VkBufferView_T; -- vulkan_core.h:80 type VkImageView_T is null record; -- incomplete struct type VkImageView is access all VkImageView_T; -- vulkan_core.h:81 type VkShaderModule_T is null record; -- incomplete struct type VkShaderModule is access all VkShaderModule_T; -- vulkan_core.h:82 type VkPipelineCache_T is null record; -- incomplete struct type VkPipelineCache is access all VkPipelineCache_T; -- vulkan_core.h:83 type VkPipelineLayout_T is null record; -- incomplete struct type VkPipelineLayout is access all VkPipelineLayout_T; -- vulkan_core.h:84 type VkRenderPass_T is null record; -- incomplete struct type VkRenderPass is access all VkRenderPass_T; -- vulkan_core.h:85 type VkPipeline_T is null record; -- incomplete struct type VkPipeline is access all VkPipeline_T; -- vulkan_core.h:86 type VkDescriptorSetLayout_T is null record; -- incomplete struct type VkDescriptorSetLayout is access all VkDescriptorSetLayout_T; -- vulkan_core.h:87 type VkSampler_T is null record; -- incomplete struct type VkSampler is access all VkSampler_T; -- vulkan_core.h:88 type VkDescriptorPool_T is null record; -- incomplete struct type VkDescriptorPool is access all VkDescriptorPool_T; -- vulkan_core.h:89 type VkDescriptorSet_T is null record; -- incomplete struct type VkDescriptorSet is access all VkDescriptorSet_T; -- vulkan_core.h:90 type VkFramebuffer_T is null record; -- incomplete struct type VkFramebuffer is access all VkFramebuffer_T; -- vulkan_core.h:91 type VkCommandPool_T is null record; -- incomplete struct type VkCommandPool is access all VkCommandPool_T; -- vulkan_core.h:92 subtype VkPipelineCacheHeaderVersion is unsigned; VK_PIPELINE_CACHE_HEADER_VERSION_ONE : constant unsigned := 1; VK_PIPELINE_CACHE_HEADER_VERSION_BEGIN_RANGE : constant unsigned := 1; VK_PIPELINE_CACHE_HEADER_VERSION_END_RANGE : constant unsigned := 1; VK_PIPELINE_CACHE_HEADER_VERSION_RANGE_SIZE : constant unsigned := 1; VK_PIPELINE_CACHE_HEADER_VERSION_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:109 subtype VkResult is int; VK_SUCCESS : constant int := 0; VK_NOT_READY : constant int := 1; VK_TIMEOUT : constant int := 2; VK_EVENT_SET : constant int := 3; VK_EVENT_RESET : constant int := 4; VK_INCOMPLETE : constant int := 5; VK_ERROR_OUT_OF_HOST_MEMORY : constant int := -1; VK_ERROR_OUT_OF_DEVICE_MEMORY : constant int := -2; VK_ERROR_INITIALIZATION_FAILED : constant int := -3; VK_ERROR_DEVICE_LOST : constant int := -4; VK_ERROR_MEMORY_MAP_FAILED : constant int := -5; VK_ERROR_LAYER_NOT_PRESENT : constant int := -6; VK_ERROR_EXTENSION_NOT_PRESENT : constant int := -7; VK_ERROR_FEATURE_NOT_PRESENT : constant int := -8; VK_ERROR_INCOMPATIBLE_DRIVER : constant int := -9; VK_ERROR_TOO_MANY_OBJECTS : constant int := -10; VK_ERROR_FORMAT_NOT_SUPPORTED : constant int := -11; VK_ERROR_FRAGMENTED_POOL : constant int := -12; VK_ERROR_UNKNOWN : constant int := -13; VK_ERROR_OUT_OF_POOL_MEMORY : constant int := -1000069000; VK_ERROR_INVALID_EXTERNAL_HANDLE : constant int := -1000072003; VK_ERROR_FRAGMENTATION : constant int := -1000161000; VK_ERROR_INVALID_OPAQUE_CAPTURE_ADDRESS : constant int := -1000257000; VK_ERROR_SURFACE_LOST_KHR : constant int := -1000000000; VK_ERROR_NATIVE_WINDOW_IN_USE_KHR : constant int := -1000000001; VK_SUBOPTIMAL_KHR : constant int := 1000001003; VK_ERROR_OUT_OF_DATE_KHR : constant int := -1000001004; VK_ERROR_INCOMPATIBLE_DISPLAY_KHR : constant int := -1000003001; VK_ERROR_VALIDATION_FAILED_EXT : constant int := -1000011001; VK_ERROR_INVALID_SHADER_NV : constant int := -1000012000; VK_ERROR_INVALID_DRM_FORMAT_MODIFIER_PLANE_LAYOUT_EXT : constant int := -1000158000; VK_ERROR_NOT_PERMITTED_EXT : constant int := -1000174001; VK_ERROR_FULL_SCREEN_EXCLUSIVE_MODE_LOST_EXT : constant int := -1000255000; VK_ERROR_OUT_OF_POOL_MEMORY_KHR : constant int := -1000069000; VK_ERROR_INVALID_EXTERNAL_HANDLE_KHR : constant int := -1000072003; VK_ERROR_FRAGMENTATION_EXT : constant int := -1000161000; VK_ERROR_INVALID_DEVICE_ADDRESS_EXT : constant int := -1000257000; VK_ERROR_INVALID_OPAQUE_CAPTURE_ADDRESS_KHR : constant int := -1000257000; VK_RESULT_BEGIN_RANGE : constant int := -13; VK_RESULT_END_RANGE : constant int := 5; VK_RESULT_RANGE_SIZE : constant int := 19; VK_RESULT_MAX_ENUM : constant int := 2147483647; -- vulkan_core.h:117 subtype VkStructureType is unsigned; VK_STRUCTURE_TYPE_APPLICATION_INFO : constant unsigned := 0; VK_STRUCTURE_TYPE_INSTANCE_CREATE_INFO : constant unsigned := 1; VK_STRUCTURE_TYPE_DEVICE_QUEUE_CREATE_INFO : constant unsigned := 2; VK_STRUCTURE_TYPE_DEVICE_CREATE_INFO : constant unsigned := 3; VK_STRUCTURE_TYPE_SUBMIT_INFO : constant unsigned := 4; VK_STRUCTURE_TYPE_MEMORY_ALLOCATE_INFO : constant unsigned := 5; VK_STRUCTURE_TYPE_MAPPED_MEMORY_RANGE : constant unsigned := 6; VK_STRUCTURE_TYPE_BIND_SPARSE_INFO : constant unsigned := 7; VK_STRUCTURE_TYPE_FENCE_CREATE_INFO : constant unsigned := 8; VK_STRUCTURE_TYPE_SEMAPHORE_CREATE_INFO : constant unsigned := 9; VK_STRUCTURE_TYPE_EVENT_CREATE_INFO : constant unsigned := 10; VK_STRUCTURE_TYPE_QUERY_POOL_CREATE_INFO : constant unsigned := 11; VK_STRUCTURE_TYPE_BUFFER_CREATE_INFO : constant unsigned := 12; VK_STRUCTURE_TYPE_BUFFER_VIEW_CREATE_INFO : constant unsigned := 13; VK_STRUCTURE_TYPE_IMAGE_CREATE_INFO : constant unsigned := 14; VK_STRUCTURE_TYPE_IMAGE_VIEW_CREATE_INFO : constant unsigned := 15; VK_STRUCTURE_TYPE_SHADER_MODULE_CREATE_INFO : constant unsigned := 16; VK_STRUCTURE_TYPE_PIPELINE_CACHE_CREATE_INFO : constant unsigned := 17; VK_STRUCTURE_TYPE_PIPELINE_SHADER_STAGE_CREATE_INFO : constant unsigned := 18; VK_STRUCTURE_TYPE_PIPELINE_VERTEX_INPUT_STATE_CREATE_INFO : constant unsigned := 19; VK_STRUCTURE_TYPE_PIPELINE_INPUT_ASSEMBLY_STATE_CREATE_INFO : constant unsigned := 20; VK_STRUCTURE_TYPE_PIPELINE_TESSELLATION_STATE_CREATE_INFO : constant unsigned := 21; VK_STRUCTURE_TYPE_PIPELINE_VIEWPORT_STATE_CREATE_INFO : constant unsigned := 22; VK_STRUCTURE_TYPE_PIPELINE_RASTERIZATION_STATE_CREATE_INFO : constant unsigned := 23; VK_STRUCTURE_TYPE_PIPELINE_MULTISAMPLE_STATE_CREATE_INFO : constant unsigned := 24; VK_STRUCTURE_TYPE_PIPELINE_DEPTH_STENCIL_STATE_CREATE_INFO : constant unsigned := 25; VK_STRUCTURE_TYPE_PIPELINE_COLOR_BLEND_STATE_CREATE_INFO : constant unsigned := 26; VK_STRUCTURE_TYPE_PIPELINE_DYNAMIC_STATE_CREATE_INFO : constant unsigned := 27; VK_STRUCTURE_TYPE_GRAPHICS_PIPELINE_CREATE_INFO : constant unsigned := 28; VK_STRUCTURE_TYPE_COMPUTE_PIPELINE_CREATE_INFO : constant unsigned := 29; VK_STRUCTURE_TYPE_PIPELINE_LAYOUT_CREATE_INFO : constant unsigned := 30; VK_STRUCTURE_TYPE_SAMPLER_CREATE_INFO : constant unsigned := 31; VK_STRUCTURE_TYPE_DESCRIPTOR_SET_LAYOUT_CREATE_INFO : constant unsigned := 32; VK_STRUCTURE_TYPE_DESCRIPTOR_POOL_CREATE_INFO : constant unsigned := 33; VK_STRUCTURE_TYPE_DESCRIPTOR_SET_ALLOCATE_INFO : constant unsigned := 34; VK_STRUCTURE_TYPE_WRITE_DESCRIPTOR_SET : constant unsigned := 35; VK_STRUCTURE_TYPE_COPY_DESCRIPTOR_SET : constant unsigned := 36; VK_STRUCTURE_TYPE_FRAMEBUFFER_CREATE_INFO : constant unsigned := 37; VK_STRUCTURE_TYPE_RENDER_PASS_CREATE_INFO : constant unsigned := 38; VK_STRUCTURE_TYPE_COMMAND_POOL_CREATE_INFO : constant unsigned := 39; VK_STRUCTURE_TYPE_COMMAND_BUFFER_ALLOCATE_INFO : constant unsigned := 40; VK_STRUCTURE_TYPE_COMMAND_BUFFER_INHERITANCE_INFO : constant unsigned := 41; VK_STRUCTURE_TYPE_COMMAND_BUFFER_BEGIN_INFO : constant unsigned := 42; VK_STRUCTURE_TYPE_RENDER_PASS_BEGIN_INFO : constant unsigned := 43; VK_STRUCTURE_TYPE_BUFFER_MEMORY_BARRIER : constant unsigned := 44; VK_STRUCTURE_TYPE_IMAGE_MEMORY_BARRIER : constant unsigned := 45; VK_STRUCTURE_TYPE_MEMORY_BARRIER : constant unsigned := 46; VK_STRUCTURE_TYPE_LOADER_INSTANCE_CREATE_INFO : constant unsigned := 47; VK_STRUCTURE_TYPE_LOADER_DEVICE_CREATE_INFO : constant unsigned := 48; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SUBGROUP_PROPERTIES : constant unsigned := 1000094000; VK_STRUCTURE_TYPE_BIND_BUFFER_MEMORY_INFO : constant unsigned := 1000157000; VK_STRUCTURE_TYPE_BIND_IMAGE_MEMORY_INFO : constant unsigned := 1000157001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_16BIT_STORAGE_FEATURES : constant unsigned := 1000083000; VK_STRUCTURE_TYPE_MEMORY_DEDICATED_REQUIREMENTS : constant unsigned := 1000127000; VK_STRUCTURE_TYPE_MEMORY_DEDICATED_ALLOCATE_INFO : constant unsigned := 1000127001; VK_STRUCTURE_TYPE_MEMORY_ALLOCATE_FLAGS_INFO : constant unsigned := 1000060000; VK_STRUCTURE_TYPE_DEVICE_GROUP_RENDER_PASS_BEGIN_INFO : constant unsigned := 1000060003; VK_STRUCTURE_TYPE_DEVICE_GROUP_COMMAND_BUFFER_BEGIN_INFO : constant unsigned := 1000060004; VK_STRUCTURE_TYPE_DEVICE_GROUP_SUBMIT_INFO : constant unsigned := 1000060005; VK_STRUCTURE_TYPE_DEVICE_GROUP_BIND_SPARSE_INFO : constant unsigned := 1000060006; VK_STRUCTURE_TYPE_BIND_BUFFER_MEMORY_DEVICE_GROUP_INFO : constant unsigned := 1000060013; VK_STRUCTURE_TYPE_BIND_IMAGE_MEMORY_DEVICE_GROUP_INFO : constant unsigned := 1000060014; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_GROUP_PROPERTIES : constant unsigned := 1000070000; VK_STRUCTURE_TYPE_DEVICE_GROUP_DEVICE_CREATE_INFO : constant unsigned := 1000070001; VK_STRUCTURE_TYPE_BUFFER_MEMORY_REQUIREMENTS_INFO_2 : constant unsigned := 1000146000; VK_STRUCTURE_TYPE_IMAGE_MEMORY_REQUIREMENTS_INFO_2 : constant unsigned := 1000146001; VK_STRUCTURE_TYPE_IMAGE_SPARSE_MEMORY_REQUIREMENTS_INFO_2 : constant unsigned := 1000146002; VK_STRUCTURE_TYPE_MEMORY_REQUIREMENTS_2 : constant unsigned := 1000146003; VK_STRUCTURE_TYPE_SPARSE_IMAGE_MEMORY_REQUIREMENTS_2 : constant unsigned := 1000146004; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_FEATURES_2 : constant unsigned := 1000059000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_PROPERTIES_2 : constant unsigned := 1000059001; VK_STRUCTURE_TYPE_FORMAT_PROPERTIES_2 : constant unsigned := 1000059002; VK_STRUCTURE_TYPE_IMAGE_FORMAT_PROPERTIES_2 : constant unsigned := 1000059003; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_IMAGE_FORMAT_INFO_2 : constant unsigned := 1000059004; VK_STRUCTURE_TYPE_QUEUE_FAMILY_PROPERTIES_2 : constant unsigned := 1000059005; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MEMORY_PROPERTIES_2 : constant unsigned := 1000059006; VK_STRUCTURE_TYPE_SPARSE_IMAGE_FORMAT_PROPERTIES_2 : constant unsigned := 1000059007; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SPARSE_IMAGE_FORMAT_INFO_2 : constant unsigned := 1000059008; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_POINT_CLIPPING_PROPERTIES : constant unsigned := 1000117000; VK_STRUCTURE_TYPE_RENDER_PASS_INPUT_ATTACHMENT_ASPECT_CREATE_INFO : constant unsigned := 1000117001; VK_STRUCTURE_TYPE_IMAGE_VIEW_USAGE_CREATE_INFO : constant unsigned := 1000117002; VK_STRUCTURE_TYPE_PIPELINE_TESSELLATION_DOMAIN_ORIGIN_STATE_CREATE_INFO : constant unsigned := 1000117003; VK_STRUCTURE_TYPE_RENDER_PASS_MULTIVIEW_CREATE_INFO : constant unsigned := 1000053000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MULTIVIEW_FEATURES : constant unsigned := 1000053001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MULTIVIEW_PROPERTIES : constant unsigned := 1000053002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_VARIABLE_POINTERS_FEATURES : constant unsigned := 1000120000; VK_STRUCTURE_TYPE_PROTECTED_SUBMIT_INFO : constant unsigned := 1000145000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_PROTECTED_MEMORY_FEATURES : constant unsigned := 1000145001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_PROTECTED_MEMORY_PROPERTIES : constant unsigned := 1000145002; VK_STRUCTURE_TYPE_DEVICE_QUEUE_INFO_2 : constant unsigned := 1000145003; VK_STRUCTURE_TYPE_SAMPLER_YCBCR_CONVERSION_CREATE_INFO : constant unsigned := 1000156000; VK_STRUCTURE_TYPE_SAMPLER_YCBCR_CONVERSION_INFO : constant unsigned := 1000156001; VK_STRUCTURE_TYPE_BIND_IMAGE_PLANE_MEMORY_INFO : constant unsigned := 1000156002; VK_STRUCTURE_TYPE_IMAGE_PLANE_MEMORY_REQUIREMENTS_INFO : constant unsigned := 1000156003; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SAMPLER_YCBCR_CONVERSION_FEATURES : constant unsigned := 1000156004; VK_STRUCTURE_TYPE_SAMPLER_YCBCR_CONVERSION_IMAGE_FORMAT_PROPERTIES : constant unsigned := 1000156005; VK_STRUCTURE_TYPE_DESCRIPTOR_UPDATE_TEMPLATE_CREATE_INFO : constant unsigned := 1000085000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_EXTERNAL_IMAGE_FORMAT_INFO : constant unsigned := 1000071000; VK_STRUCTURE_TYPE_EXTERNAL_IMAGE_FORMAT_PROPERTIES : constant unsigned := 1000071001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_EXTERNAL_BUFFER_INFO : constant unsigned := 1000071002; VK_STRUCTURE_TYPE_EXTERNAL_BUFFER_PROPERTIES : constant unsigned := 1000071003; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_ID_PROPERTIES : constant unsigned := 1000071004; VK_STRUCTURE_TYPE_EXTERNAL_MEMORY_BUFFER_CREATE_INFO : constant unsigned := 1000072000; VK_STRUCTURE_TYPE_EXTERNAL_MEMORY_IMAGE_CREATE_INFO : constant unsigned := 1000072001; VK_STRUCTURE_TYPE_EXPORT_MEMORY_ALLOCATE_INFO : constant unsigned := 1000072002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_EXTERNAL_FENCE_INFO : constant unsigned := 1000112000; VK_STRUCTURE_TYPE_EXTERNAL_FENCE_PROPERTIES : constant unsigned := 1000112001; VK_STRUCTURE_TYPE_EXPORT_FENCE_CREATE_INFO : constant unsigned := 1000113000; VK_STRUCTURE_TYPE_EXPORT_SEMAPHORE_CREATE_INFO : constant unsigned := 1000077000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_EXTERNAL_SEMAPHORE_INFO : constant unsigned := 1000076000; VK_STRUCTURE_TYPE_EXTERNAL_SEMAPHORE_PROPERTIES : constant unsigned := 1000076001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MAINTENANCE_3_PROPERTIES : constant unsigned := 1000168000; VK_STRUCTURE_TYPE_DESCRIPTOR_SET_LAYOUT_SUPPORT : constant unsigned := 1000168001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_DRAW_PARAMETERS_FEATURES : constant unsigned := 1000063000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_VULKAN_1_1_FEATURES : constant unsigned := 49; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_VULKAN_1_1_PROPERTIES : constant unsigned := 50; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_VULKAN_1_2_FEATURES : constant unsigned := 51; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_VULKAN_1_2_PROPERTIES : constant unsigned := 52; VK_STRUCTURE_TYPE_IMAGE_FORMAT_LIST_CREATE_INFO : constant unsigned := 1000147000; VK_STRUCTURE_TYPE_ATTACHMENT_DESCRIPTION_2 : constant unsigned := 1000109000; VK_STRUCTURE_TYPE_ATTACHMENT_REFERENCE_2 : constant unsigned := 1000109001; VK_STRUCTURE_TYPE_SUBPASS_DESCRIPTION_2 : constant unsigned := 1000109002; VK_STRUCTURE_TYPE_SUBPASS_DEPENDENCY_2 : constant unsigned := 1000109003; VK_STRUCTURE_TYPE_RENDER_PASS_CREATE_INFO_2 : constant unsigned := 1000109004; VK_STRUCTURE_TYPE_SUBPASS_BEGIN_INFO : constant unsigned := 1000109005; VK_STRUCTURE_TYPE_SUBPASS_END_INFO : constant unsigned := 1000109006; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_8BIT_STORAGE_FEATURES : constant unsigned := 1000177000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_DRIVER_PROPERTIES : constant unsigned := 1000196000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_ATOMIC_INT64_FEATURES : constant unsigned := 1000180000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_FLOAT16_INT8_FEATURES : constant unsigned := 1000082000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_FLOAT_CONTROLS_PROPERTIES : constant unsigned := 1000197000; VK_STRUCTURE_TYPE_DESCRIPTOR_SET_LAYOUT_BINDING_FLAGS_CREATE_INFO : constant unsigned := 1000161000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_DESCRIPTOR_INDEXING_FEATURES : constant unsigned := 1000161001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_DESCRIPTOR_INDEXING_PROPERTIES : constant unsigned := 1000161002; VK_STRUCTURE_TYPE_DESCRIPTOR_SET_VARIABLE_DESCRIPTOR_COUNT_ALLOCATE_INFO : constant unsigned := 1000161003; VK_STRUCTURE_TYPE_DESCRIPTOR_SET_VARIABLE_DESCRIPTOR_COUNT_LAYOUT_SUPPORT : constant unsigned := 1000161004; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_DEPTH_STENCIL_RESOLVE_PROPERTIES : constant unsigned := 1000199000; VK_STRUCTURE_TYPE_SUBPASS_DESCRIPTION_DEPTH_STENCIL_RESOLVE : constant unsigned := 1000199001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SCALAR_BLOCK_LAYOUT_FEATURES : constant unsigned := 1000221000; VK_STRUCTURE_TYPE_IMAGE_STENCIL_USAGE_CREATE_INFO : constant unsigned := 1000246000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SAMPLER_FILTER_MINMAX_PROPERTIES : constant unsigned := 1000130000; VK_STRUCTURE_TYPE_SAMPLER_REDUCTION_MODE_CREATE_INFO : constant unsigned := 1000130001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_VULKAN_MEMORY_MODEL_FEATURES : constant unsigned := 1000211000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_IMAGELESS_FRAMEBUFFER_FEATURES : constant unsigned := 1000108000; VK_STRUCTURE_TYPE_FRAMEBUFFER_ATTACHMENTS_CREATE_INFO : constant unsigned := 1000108001; VK_STRUCTURE_TYPE_FRAMEBUFFER_ATTACHMENT_IMAGE_INFO : constant unsigned := 1000108002; VK_STRUCTURE_TYPE_RENDER_PASS_ATTACHMENT_BEGIN_INFO : constant unsigned := 1000108003; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_UNIFORM_BUFFER_STANDARD_LAYOUT_FEATURES : constant unsigned := 1000253000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_SUBGROUP_EXTENDED_TYPES_FEATURES : constant unsigned := 1000175000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SEPARATE_DEPTH_STENCIL_LAYOUTS_FEATURES : constant unsigned := 1000241000; VK_STRUCTURE_TYPE_ATTACHMENT_REFERENCE_STENCIL_LAYOUT : constant unsigned := 1000241001; VK_STRUCTURE_TYPE_ATTACHMENT_DESCRIPTION_STENCIL_LAYOUT : constant unsigned := 1000241002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_HOST_QUERY_RESET_FEATURES : constant unsigned := 1000261000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_TIMELINE_SEMAPHORE_FEATURES : constant unsigned := 1000207000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_TIMELINE_SEMAPHORE_PROPERTIES : constant unsigned := 1000207001; VK_STRUCTURE_TYPE_SEMAPHORE_TYPE_CREATE_INFO : constant unsigned := 1000207002; VK_STRUCTURE_TYPE_TIMELINE_SEMAPHORE_SUBMIT_INFO : constant unsigned := 1000207003; VK_STRUCTURE_TYPE_SEMAPHORE_WAIT_INFO : constant unsigned := 1000207004; VK_STRUCTURE_TYPE_SEMAPHORE_SIGNAL_INFO : constant unsigned := 1000207005; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_BUFFER_DEVICE_ADDRESS_FEATURES : constant unsigned := 1000257000; VK_STRUCTURE_TYPE_BUFFER_DEVICE_ADDRESS_INFO : constant unsigned := 1000244001; VK_STRUCTURE_TYPE_BUFFER_OPAQUE_CAPTURE_ADDRESS_CREATE_INFO : constant unsigned := 1000257002; VK_STRUCTURE_TYPE_MEMORY_OPAQUE_CAPTURE_ADDRESS_ALLOCATE_INFO : constant unsigned := 1000257003; VK_STRUCTURE_TYPE_DEVICE_MEMORY_OPAQUE_CAPTURE_ADDRESS_INFO : constant unsigned := 1000257004; VK_STRUCTURE_TYPE_SWAPCHAIN_CREATE_INFO_KHR : constant unsigned := 1000001000; VK_STRUCTURE_TYPE_PRESENT_INFO_KHR : constant unsigned := 1000001001; VK_STRUCTURE_TYPE_DEVICE_GROUP_PRESENT_CAPABILITIES_KHR : constant unsigned := 1000060007; VK_STRUCTURE_TYPE_IMAGE_SWAPCHAIN_CREATE_INFO_KHR : constant unsigned := 1000060008; VK_STRUCTURE_TYPE_BIND_IMAGE_MEMORY_SWAPCHAIN_INFO_KHR : constant unsigned := 1000060009; VK_STRUCTURE_TYPE_ACQUIRE_NEXT_IMAGE_INFO_KHR : constant unsigned := 1000060010; VK_STRUCTURE_TYPE_DEVICE_GROUP_PRESENT_INFO_KHR : constant unsigned := 1000060011; VK_STRUCTURE_TYPE_DEVICE_GROUP_SWAPCHAIN_CREATE_INFO_KHR : constant unsigned := 1000060012; VK_STRUCTURE_TYPE_DISPLAY_MODE_CREATE_INFO_KHR : constant unsigned := 1000002000; VK_STRUCTURE_TYPE_DISPLAY_SURFACE_CREATE_INFO_KHR : constant unsigned := 1000002001; VK_STRUCTURE_TYPE_DISPLAY_PRESENT_INFO_KHR : constant unsigned := 1000003000; VK_STRUCTURE_TYPE_XLIB_SURFACE_CREATE_INFO_KHR : constant unsigned := 1000004000; VK_STRUCTURE_TYPE_XCB_SURFACE_CREATE_INFO_KHR : constant unsigned := 1000005000; VK_STRUCTURE_TYPE_WAYLAND_SURFACE_CREATE_INFO_KHR : constant unsigned := 1000006000; VK_STRUCTURE_TYPE_ANDROID_SURFACE_CREATE_INFO_KHR : constant unsigned := 1000008000; VK_STRUCTURE_TYPE_WIN32_SURFACE_CREATE_INFO_KHR : constant unsigned := 1000009000; VK_STRUCTURE_TYPE_DEBUG_REPORT_CALLBACK_CREATE_INFO_EXT : constant unsigned := 1000011000; VK_STRUCTURE_TYPE_PIPELINE_RASTERIZATION_STATE_RASTERIZATION_ORDER_AMD : constant unsigned := 1000018000; VK_STRUCTURE_TYPE_DEBUG_MARKER_OBJECT_NAME_INFO_EXT : constant unsigned := 1000022000; VK_STRUCTURE_TYPE_DEBUG_MARKER_OBJECT_TAG_INFO_EXT : constant unsigned := 1000022001; VK_STRUCTURE_TYPE_DEBUG_MARKER_MARKER_INFO_EXT : constant unsigned := 1000022002; VK_STRUCTURE_TYPE_DEDICATED_ALLOCATION_IMAGE_CREATE_INFO_NV : constant unsigned := 1000026000; VK_STRUCTURE_TYPE_DEDICATED_ALLOCATION_BUFFER_CREATE_INFO_NV : constant unsigned := 1000026001; VK_STRUCTURE_TYPE_DEDICATED_ALLOCATION_MEMORY_ALLOCATE_INFO_NV : constant unsigned := 1000026002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_TRANSFORM_FEEDBACK_FEATURES_EXT : constant unsigned := 1000028000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_TRANSFORM_FEEDBACK_PROPERTIES_EXT : constant unsigned := 1000028001; VK_STRUCTURE_TYPE_PIPELINE_RASTERIZATION_STATE_STREAM_CREATE_INFO_EXT : constant unsigned := 1000028002; VK_STRUCTURE_TYPE_IMAGE_VIEW_HANDLE_INFO_NVX : constant unsigned := 1000030000; VK_STRUCTURE_TYPE_TEXTURE_LOD_GATHER_FORMAT_PROPERTIES_AMD : constant unsigned := 1000041000; VK_STRUCTURE_TYPE_STREAM_DESCRIPTOR_SURFACE_CREATE_INFO_GGP : constant unsigned := 1000049000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_CORNER_SAMPLED_IMAGE_FEATURES_NV : constant unsigned := 1000050000; VK_STRUCTURE_TYPE_EXTERNAL_MEMORY_IMAGE_CREATE_INFO_NV : constant unsigned := 1000056000; VK_STRUCTURE_TYPE_EXPORT_MEMORY_ALLOCATE_INFO_NV : constant unsigned := 1000056001; VK_STRUCTURE_TYPE_IMPORT_MEMORY_WIN32_HANDLE_INFO_NV : constant unsigned := 1000057000; VK_STRUCTURE_TYPE_EXPORT_MEMORY_WIN32_HANDLE_INFO_NV : constant unsigned := 1000057001; VK_STRUCTURE_TYPE_WIN32_KEYED_MUTEX_ACQUIRE_RELEASE_INFO_NV : constant unsigned := 1000058000; VK_STRUCTURE_TYPE_VALIDATION_FLAGS_EXT : constant unsigned := 1000061000; VK_STRUCTURE_TYPE_VI_SURFACE_CREATE_INFO_NN : constant unsigned := 1000062000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_TEXTURE_COMPRESSION_ASTC_HDR_FEATURES_EXT : constant unsigned := 1000066000; VK_STRUCTURE_TYPE_IMAGE_VIEW_ASTC_DECODE_MODE_EXT : constant unsigned := 1000067000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_ASTC_DECODE_FEATURES_EXT : constant unsigned := 1000067001; VK_STRUCTURE_TYPE_IMPORT_MEMORY_WIN32_HANDLE_INFO_KHR : constant unsigned := 1000073000; VK_STRUCTURE_TYPE_EXPORT_MEMORY_WIN32_HANDLE_INFO_KHR : constant unsigned := 1000073001; VK_STRUCTURE_TYPE_MEMORY_WIN32_HANDLE_PROPERTIES_KHR : constant unsigned := 1000073002; VK_STRUCTURE_TYPE_MEMORY_GET_WIN32_HANDLE_INFO_KHR : constant unsigned := 1000073003; VK_STRUCTURE_TYPE_IMPORT_MEMORY_FD_INFO_KHR : constant unsigned := 1000074000; VK_STRUCTURE_TYPE_MEMORY_FD_PROPERTIES_KHR : constant unsigned := 1000074001; VK_STRUCTURE_TYPE_MEMORY_GET_FD_INFO_KHR : constant unsigned := 1000074002; VK_STRUCTURE_TYPE_WIN32_KEYED_MUTEX_ACQUIRE_RELEASE_INFO_KHR : constant unsigned := 1000075000; VK_STRUCTURE_TYPE_IMPORT_SEMAPHORE_WIN32_HANDLE_INFO_KHR : constant unsigned := 1000078000; VK_STRUCTURE_TYPE_EXPORT_SEMAPHORE_WIN32_HANDLE_INFO_KHR : constant unsigned := 1000078001; VK_STRUCTURE_TYPE_D3D12_FENCE_SUBMIT_INFO_KHR : constant unsigned := 1000078002; VK_STRUCTURE_TYPE_SEMAPHORE_GET_WIN32_HANDLE_INFO_KHR : constant unsigned := 1000078003; VK_STRUCTURE_TYPE_IMPORT_SEMAPHORE_FD_INFO_KHR : constant unsigned := 1000079000; VK_STRUCTURE_TYPE_SEMAPHORE_GET_FD_INFO_KHR : constant unsigned := 1000079001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_PUSH_DESCRIPTOR_PROPERTIES_KHR : constant unsigned := 1000080000; VK_STRUCTURE_TYPE_COMMAND_BUFFER_INHERITANCE_CONDITIONAL_RENDERING_INFO_EXT : constant unsigned := 1000081000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_CONDITIONAL_RENDERING_FEATURES_EXT : constant unsigned := 1000081001; VK_STRUCTURE_TYPE_CONDITIONAL_RENDERING_BEGIN_INFO_EXT : constant unsigned := 1000081002; VK_STRUCTURE_TYPE_PRESENT_REGIONS_KHR : constant unsigned := 1000084000; VK_STRUCTURE_TYPE_OBJECT_TABLE_CREATE_INFO_NVX : constant unsigned := 1000086000; VK_STRUCTURE_TYPE_INDIRECT_COMMANDS_LAYOUT_CREATE_INFO_NVX : constant unsigned := 1000086001; VK_STRUCTURE_TYPE_CMD_PROCESS_COMMANDS_INFO_NVX : constant unsigned := 1000086002; VK_STRUCTURE_TYPE_CMD_RESERVE_SPACE_FOR_COMMANDS_INFO_NVX : constant unsigned := 1000086003; VK_STRUCTURE_TYPE_DEVICE_GENERATED_COMMANDS_LIMITS_NVX : constant unsigned := 1000086004; VK_STRUCTURE_TYPE_DEVICE_GENERATED_COMMANDS_FEATURES_NVX : constant unsigned := 1000086005; VK_STRUCTURE_TYPE_PIPELINE_VIEWPORT_W_SCALING_STATE_CREATE_INFO_NV : constant unsigned := 1000087000; VK_STRUCTURE_TYPE_SURFACE_CAPABILITIES_2_EXT : constant unsigned := 1000090000; VK_STRUCTURE_TYPE_DISPLAY_POWER_INFO_EXT : constant unsigned := 1000091000; VK_STRUCTURE_TYPE_DEVICE_EVENT_INFO_EXT : constant unsigned := 1000091001; VK_STRUCTURE_TYPE_DISPLAY_EVENT_INFO_EXT : constant unsigned := 1000091002; VK_STRUCTURE_TYPE_SWAPCHAIN_COUNTER_CREATE_INFO_EXT : constant unsigned := 1000091003; VK_STRUCTURE_TYPE_PRESENT_TIMES_INFO_GOOGLE : constant unsigned := 1000092000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MULTIVIEW_PER_VIEW_ATTRIBUTES_PROPERTIES_NVX : constant unsigned := 1000097000; VK_STRUCTURE_TYPE_PIPELINE_VIEWPORT_SWIZZLE_STATE_CREATE_INFO_NV : constant unsigned := 1000098000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_DISCARD_RECTANGLE_PROPERTIES_EXT : constant unsigned := 1000099000; VK_STRUCTURE_TYPE_PIPELINE_DISCARD_RECTANGLE_STATE_CREATE_INFO_EXT : constant unsigned := 1000099001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_CONSERVATIVE_RASTERIZATION_PROPERTIES_EXT : constant unsigned := 1000101000; VK_STRUCTURE_TYPE_PIPELINE_RASTERIZATION_CONSERVATIVE_STATE_CREATE_INFO_EXT : constant unsigned := 1000101001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_DEPTH_CLIP_ENABLE_FEATURES_EXT : constant unsigned := 1000102000; VK_STRUCTURE_TYPE_PIPELINE_RASTERIZATION_DEPTH_CLIP_STATE_CREATE_INFO_EXT : constant unsigned := 1000102001; VK_STRUCTURE_TYPE_HDR_METADATA_EXT : constant unsigned := 1000105000; VK_STRUCTURE_TYPE_SHARED_PRESENT_SURFACE_CAPABILITIES_KHR : constant unsigned := 1000111000; VK_STRUCTURE_TYPE_IMPORT_FENCE_WIN32_HANDLE_INFO_KHR : constant unsigned := 1000114000; VK_STRUCTURE_TYPE_EXPORT_FENCE_WIN32_HANDLE_INFO_KHR : constant unsigned := 1000114001; VK_STRUCTURE_TYPE_FENCE_GET_WIN32_HANDLE_INFO_KHR : constant unsigned := 1000114002; VK_STRUCTURE_TYPE_IMPORT_FENCE_FD_INFO_KHR : constant unsigned := 1000115000; VK_STRUCTURE_TYPE_FENCE_GET_FD_INFO_KHR : constant unsigned := 1000115001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_PERFORMANCE_QUERY_FEATURES_KHR : constant unsigned := 1000116000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_PERFORMANCE_QUERY_PROPERTIES_KHR : constant unsigned := 1000116001; VK_STRUCTURE_TYPE_QUERY_POOL_PERFORMANCE_CREATE_INFO_KHR : constant unsigned := 1000116002; VK_STRUCTURE_TYPE_PERFORMANCE_QUERY_SUBMIT_INFO_KHR : constant unsigned := 1000116003; VK_STRUCTURE_TYPE_ACQUIRE_PROFILING_LOCK_INFO_KHR : constant unsigned := 1000116004; VK_STRUCTURE_TYPE_PERFORMANCE_COUNTER_KHR : constant unsigned := 1000116005; VK_STRUCTURE_TYPE_PERFORMANCE_COUNTER_DESCRIPTION_KHR : constant unsigned := 1000116006; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SURFACE_INFO_2_KHR : constant unsigned := 1000119000; VK_STRUCTURE_TYPE_SURFACE_CAPABILITIES_2_KHR : constant unsigned := 1000119001; VK_STRUCTURE_TYPE_SURFACE_FORMAT_2_KHR : constant unsigned := 1000119002; VK_STRUCTURE_TYPE_DISPLAY_PROPERTIES_2_KHR : constant unsigned := 1000121000; VK_STRUCTURE_TYPE_DISPLAY_PLANE_PROPERTIES_2_KHR : constant unsigned := 1000121001; VK_STRUCTURE_TYPE_DISPLAY_MODE_PROPERTIES_2_KHR : constant unsigned := 1000121002; VK_STRUCTURE_TYPE_DISPLAY_PLANE_INFO_2_KHR : constant unsigned := 1000121003; VK_STRUCTURE_TYPE_DISPLAY_PLANE_CAPABILITIES_2_KHR : constant unsigned := 1000121004; VK_STRUCTURE_TYPE_IOS_SURFACE_CREATE_INFO_MVK : constant unsigned := 1000122000; VK_STRUCTURE_TYPE_MACOS_SURFACE_CREATE_INFO_MVK : constant unsigned := 1000123000; VK_STRUCTURE_TYPE_DEBUG_UTILS_OBJECT_NAME_INFO_EXT : constant unsigned := 1000128000; VK_STRUCTURE_TYPE_DEBUG_UTILS_OBJECT_TAG_INFO_EXT : constant unsigned := 1000128001; VK_STRUCTURE_TYPE_DEBUG_UTILS_LABEL_EXT : constant unsigned := 1000128002; VK_STRUCTURE_TYPE_DEBUG_UTILS_MESSENGER_CALLBACK_DATA_EXT : constant unsigned := 1000128003; VK_STRUCTURE_TYPE_DEBUG_UTILS_MESSENGER_CREATE_INFO_EXT : constant unsigned := 1000128004; VK_STRUCTURE_TYPE_ANDROID_HARDWARE_BUFFER_USAGE_ANDROID : constant unsigned := 1000129000; VK_STRUCTURE_TYPE_ANDROID_HARDWARE_BUFFER_PROPERTIES_ANDROID : constant unsigned := 1000129001; VK_STRUCTURE_TYPE_ANDROID_HARDWARE_BUFFER_FORMAT_PROPERTIES_ANDROID : constant unsigned := 1000129002; VK_STRUCTURE_TYPE_IMPORT_ANDROID_HARDWARE_BUFFER_INFO_ANDROID : constant unsigned := 1000129003; VK_STRUCTURE_TYPE_MEMORY_GET_ANDROID_HARDWARE_BUFFER_INFO_ANDROID : constant unsigned := 1000129004; VK_STRUCTURE_TYPE_EXTERNAL_FORMAT_ANDROID : constant unsigned := 1000129005; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_INLINE_UNIFORM_BLOCK_FEATURES_EXT : constant unsigned := 1000138000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_INLINE_UNIFORM_BLOCK_PROPERTIES_EXT : constant unsigned := 1000138001; VK_STRUCTURE_TYPE_WRITE_DESCRIPTOR_SET_INLINE_UNIFORM_BLOCK_EXT : constant unsigned := 1000138002; VK_STRUCTURE_TYPE_DESCRIPTOR_POOL_INLINE_UNIFORM_BLOCK_CREATE_INFO_EXT : constant unsigned := 1000138003; VK_STRUCTURE_TYPE_SAMPLE_LOCATIONS_INFO_EXT : constant unsigned := 1000143000; VK_STRUCTURE_TYPE_RENDER_PASS_SAMPLE_LOCATIONS_BEGIN_INFO_EXT : constant unsigned := 1000143001; VK_STRUCTURE_TYPE_PIPELINE_SAMPLE_LOCATIONS_STATE_CREATE_INFO_EXT : constant unsigned := 1000143002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SAMPLE_LOCATIONS_PROPERTIES_EXT : constant unsigned := 1000143003; VK_STRUCTURE_TYPE_MULTISAMPLE_PROPERTIES_EXT : constant unsigned := 1000143004; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_BLEND_OPERATION_ADVANCED_FEATURES_EXT : constant unsigned := 1000148000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_BLEND_OPERATION_ADVANCED_PROPERTIES_EXT : constant unsigned := 1000148001; VK_STRUCTURE_TYPE_PIPELINE_COLOR_BLEND_ADVANCED_STATE_CREATE_INFO_EXT : constant unsigned := 1000148002; VK_STRUCTURE_TYPE_PIPELINE_COVERAGE_TO_COLOR_STATE_CREATE_INFO_NV : constant unsigned := 1000149000; VK_STRUCTURE_TYPE_PIPELINE_COVERAGE_MODULATION_STATE_CREATE_INFO_NV : constant unsigned := 1000152000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_SM_BUILTINS_FEATURES_NV : constant unsigned := 1000154000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_SM_BUILTINS_PROPERTIES_NV : constant unsigned := 1000154001; VK_STRUCTURE_TYPE_DRM_FORMAT_MODIFIER_PROPERTIES_LIST_EXT : constant unsigned := 1000158000; VK_STRUCTURE_TYPE_DRM_FORMAT_MODIFIER_PROPERTIES_EXT : constant unsigned := 1000158001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_IMAGE_DRM_FORMAT_MODIFIER_INFO_EXT : constant unsigned := 1000158002; VK_STRUCTURE_TYPE_IMAGE_DRM_FORMAT_MODIFIER_LIST_CREATE_INFO_EXT : constant unsigned := 1000158003; VK_STRUCTURE_TYPE_IMAGE_DRM_FORMAT_MODIFIER_EXPLICIT_CREATE_INFO_EXT : constant unsigned := 1000158004; VK_STRUCTURE_TYPE_IMAGE_DRM_FORMAT_MODIFIER_PROPERTIES_EXT : constant unsigned := 1000158005; VK_STRUCTURE_TYPE_VALIDATION_CACHE_CREATE_INFO_EXT : constant unsigned := 1000160000; VK_STRUCTURE_TYPE_SHADER_MODULE_VALIDATION_CACHE_CREATE_INFO_EXT : constant unsigned := 1000160001; VK_STRUCTURE_TYPE_PIPELINE_VIEWPORT_SHADING_RATE_IMAGE_STATE_CREATE_INFO_NV : constant unsigned := 1000164000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADING_RATE_IMAGE_FEATURES_NV : constant unsigned := 1000164001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADING_RATE_IMAGE_PROPERTIES_NV : constant unsigned := 1000164002; VK_STRUCTURE_TYPE_PIPELINE_VIEWPORT_COARSE_SAMPLE_ORDER_STATE_CREATE_INFO_NV : constant unsigned := 1000164005; VK_STRUCTURE_TYPE_RAY_TRACING_PIPELINE_CREATE_INFO_NV : constant unsigned := 1000165000; VK_STRUCTURE_TYPE_ACCELERATION_STRUCTURE_CREATE_INFO_NV : constant unsigned := 1000165001; VK_STRUCTURE_TYPE_GEOMETRY_NV : constant unsigned := 1000165003; VK_STRUCTURE_TYPE_GEOMETRY_TRIANGLES_NV : constant unsigned := 1000165004; VK_STRUCTURE_TYPE_GEOMETRY_AABB_NV : constant unsigned := 1000165005; VK_STRUCTURE_TYPE_BIND_ACCELERATION_STRUCTURE_MEMORY_INFO_NV : constant unsigned := 1000165006; VK_STRUCTURE_TYPE_WRITE_DESCRIPTOR_SET_ACCELERATION_STRUCTURE_NV : constant unsigned := 1000165007; VK_STRUCTURE_TYPE_ACCELERATION_STRUCTURE_MEMORY_REQUIREMENTS_INFO_NV : constant unsigned := 1000165008; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_RAY_TRACING_PROPERTIES_NV : constant unsigned := 1000165009; VK_STRUCTURE_TYPE_RAY_TRACING_SHADER_GROUP_CREATE_INFO_NV : constant unsigned := 1000165011; VK_STRUCTURE_TYPE_ACCELERATION_STRUCTURE_INFO_NV : constant unsigned := 1000165012; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_REPRESENTATIVE_FRAGMENT_TEST_FEATURES_NV : constant unsigned := 1000166000; VK_STRUCTURE_TYPE_PIPELINE_REPRESENTATIVE_FRAGMENT_TEST_STATE_CREATE_INFO_NV : constant unsigned := 1000166001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_IMAGE_VIEW_IMAGE_FORMAT_INFO_EXT : constant unsigned := 1000170000; VK_STRUCTURE_TYPE_FILTER_CUBIC_IMAGE_VIEW_IMAGE_FORMAT_PROPERTIES_EXT : constant unsigned := 1000170001; VK_STRUCTURE_TYPE_DEVICE_QUEUE_GLOBAL_PRIORITY_CREATE_INFO_EXT : constant unsigned := 1000174000; VK_STRUCTURE_TYPE_IMPORT_MEMORY_HOST_POINTER_INFO_EXT : constant unsigned := 1000178000; VK_STRUCTURE_TYPE_MEMORY_HOST_POINTER_PROPERTIES_EXT : constant unsigned := 1000178001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_EXTERNAL_MEMORY_HOST_PROPERTIES_EXT : constant unsigned := 1000178002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_CLOCK_FEATURES_KHR : constant unsigned := 1000181000; VK_STRUCTURE_TYPE_PIPELINE_COMPILER_CONTROL_CREATE_INFO_AMD : constant unsigned := 1000183000; VK_STRUCTURE_TYPE_CALIBRATED_TIMESTAMP_INFO_EXT : constant unsigned := 1000184000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_CORE_PROPERTIES_AMD : constant unsigned := 1000185000; VK_STRUCTURE_TYPE_DEVICE_MEMORY_OVERALLOCATION_CREATE_INFO_AMD : constant unsigned := 1000189000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_VERTEX_ATTRIBUTE_DIVISOR_PROPERTIES_EXT : constant unsigned := 1000190000; VK_STRUCTURE_TYPE_PIPELINE_VERTEX_INPUT_DIVISOR_STATE_CREATE_INFO_EXT : constant unsigned := 1000190001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_VERTEX_ATTRIBUTE_DIVISOR_FEATURES_EXT : constant unsigned := 1000190002; VK_STRUCTURE_TYPE_PRESENT_FRAME_TOKEN_GGP : constant unsigned := 1000191000; VK_STRUCTURE_TYPE_PIPELINE_CREATION_FEEDBACK_CREATE_INFO_EXT : constant unsigned := 1000192000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_COMPUTE_SHADER_DERIVATIVES_FEATURES_NV : constant unsigned := 1000201000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MESH_SHADER_FEATURES_NV : constant unsigned := 1000202000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MESH_SHADER_PROPERTIES_NV : constant unsigned := 1000202001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_FRAGMENT_SHADER_BARYCENTRIC_FEATURES_NV : constant unsigned := 1000203000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_IMAGE_FOOTPRINT_FEATURES_NV : constant unsigned := 1000204000; VK_STRUCTURE_TYPE_PIPELINE_VIEWPORT_EXCLUSIVE_SCISSOR_STATE_CREATE_INFO_NV : constant unsigned := 1000205000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_EXCLUSIVE_SCISSOR_FEATURES_NV : constant unsigned := 1000205002; VK_STRUCTURE_TYPE_CHECKPOINT_DATA_NV : constant unsigned := 1000206000; VK_STRUCTURE_TYPE_QUEUE_FAMILY_CHECKPOINT_PROPERTIES_NV : constant unsigned := 1000206001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_INTEGER_FUNCTIONS_2_FEATURES_INTEL : constant unsigned := 1000209000; VK_STRUCTURE_TYPE_QUERY_POOL_CREATE_INFO_INTEL : constant unsigned := 1000210000; VK_STRUCTURE_TYPE_INITIALIZE_PERFORMANCE_API_INFO_INTEL : constant unsigned := 1000210001; VK_STRUCTURE_TYPE_PERFORMANCE_MARKER_INFO_INTEL : constant unsigned := 1000210002; VK_STRUCTURE_TYPE_PERFORMANCE_STREAM_MARKER_INFO_INTEL : constant unsigned := 1000210003; VK_STRUCTURE_TYPE_PERFORMANCE_OVERRIDE_INFO_INTEL : constant unsigned := 1000210004; VK_STRUCTURE_TYPE_PERFORMANCE_CONFIGURATION_ACQUIRE_INFO_INTEL : constant unsigned := 1000210005; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_PCI_BUS_INFO_PROPERTIES_EXT : constant unsigned := 1000212000; VK_STRUCTURE_TYPE_DISPLAY_NATIVE_HDR_SURFACE_CAPABILITIES_AMD : constant unsigned := 1000213000; VK_STRUCTURE_TYPE_SWAPCHAIN_DISPLAY_NATIVE_HDR_CREATE_INFO_AMD : constant unsigned := 1000213001; VK_STRUCTURE_TYPE_IMAGEPIPE_SURFACE_CREATE_INFO_FUCHSIA : constant unsigned := 1000214000; VK_STRUCTURE_TYPE_METAL_SURFACE_CREATE_INFO_EXT : constant unsigned := 1000217000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_FRAGMENT_DENSITY_MAP_FEATURES_EXT : constant unsigned := 1000218000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_FRAGMENT_DENSITY_MAP_PROPERTIES_EXT : constant unsigned := 1000218001; VK_STRUCTURE_TYPE_RENDER_PASS_FRAGMENT_DENSITY_MAP_CREATE_INFO_EXT : constant unsigned := 1000218002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SUBGROUP_SIZE_CONTROL_PROPERTIES_EXT : constant unsigned := 1000225000; VK_STRUCTURE_TYPE_PIPELINE_SHADER_STAGE_REQUIRED_SUBGROUP_SIZE_CREATE_INFO_EXT : constant unsigned := 1000225001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SUBGROUP_SIZE_CONTROL_FEATURES_EXT : constant unsigned := 1000225002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_CORE_PROPERTIES_2_AMD : constant unsigned := 1000227000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_COHERENT_MEMORY_FEATURES_AMD : constant unsigned := 1000229000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MEMORY_BUDGET_PROPERTIES_EXT : constant unsigned := 1000237000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MEMORY_PRIORITY_FEATURES_EXT : constant unsigned := 1000238000; VK_STRUCTURE_TYPE_MEMORY_PRIORITY_ALLOCATE_INFO_EXT : constant unsigned := 1000238001; VK_STRUCTURE_TYPE_SURFACE_PROTECTED_CAPABILITIES_KHR : constant unsigned := 1000239000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_DEDICATED_ALLOCATION_IMAGE_ALIASING_FEATURES_NV : constant unsigned := 1000240000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_BUFFER_DEVICE_ADDRESS_FEATURES_EXT : constant unsigned := 1000244000; VK_STRUCTURE_TYPE_BUFFER_DEVICE_ADDRESS_CREATE_INFO_EXT : constant unsigned := 1000244002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_TOOL_PROPERTIES_EXT : constant unsigned := 1000245000; VK_STRUCTURE_TYPE_VALIDATION_FEATURES_EXT : constant unsigned := 1000247000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_COOPERATIVE_MATRIX_FEATURES_NV : constant unsigned := 1000249000; VK_STRUCTURE_TYPE_COOPERATIVE_MATRIX_PROPERTIES_NV : constant unsigned := 1000249001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_COOPERATIVE_MATRIX_PROPERTIES_NV : constant unsigned := 1000249002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_COVERAGE_REDUCTION_MODE_FEATURES_NV : constant unsigned := 1000250000; VK_STRUCTURE_TYPE_PIPELINE_COVERAGE_REDUCTION_STATE_CREATE_INFO_NV : constant unsigned := 1000250001; VK_STRUCTURE_TYPE_FRAMEBUFFER_MIXED_SAMPLES_COMBINATION_NV : constant unsigned := 1000250002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_FRAGMENT_SHADER_INTERLOCK_FEATURES_EXT : constant unsigned := 1000251000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_YCBCR_IMAGE_ARRAYS_FEATURES_EXT : constant unsigned := 1000252000; VK_STRUCTURE_TYPE_SURFACE_FULL_SCREEN_EXCLUSIVE_INFO_EXT : constant unsigned := 1000255000; VK_STRUCTURE_TYPE_SURFACE_CAPABILITIES_FULL_SCREEN_EXCLUSIVE_EXT : constant unsigned := 1000255002; VK_STRUCTURE_TYPE_SURFACE_FULL_SCREEN_EXCLUSIVE_WIN32_INFO_EXT : constant unsigned := 1000255001; VK_STRUCTURE_TYPE_HEADLESS_SURFACE_CREATE_INFO_EXT : constant unsigned := 1000256000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_LINE_RASTERIZATION_FEATURES_EXT : constant unsigned := 1000259000; VK_STRUCTURE_TYPE_PIPELINE_RASTERIZATION_LINE_STATE_CREATE_INFO_EXT : constant unsigned := 1000259001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_LINE_RASTERIZATION_PROPERTIES_EXT : constant unsigned := 1000259002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_INDEX_TYPE_UINT8_FEATURES_EXT : constant unsigned := 1000265000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_PIPELINE_EXECUTABLE_PROPERTIES_FEATURES_KHR : constant unsigned := 1000269000; VK_STRUCTURE_TYPE_PIPELINE_INFO_KHR : constant unsigned := 1000269001; VK_STRUCTURE_TYPE_PIPELINE_EXECUTABLE_PROPERTIES_KHR : constant unsigned := 1000269002; VK_STRUCTURE_TYPE_PIPELINE_EXECUTABLE_INFO_KHR : constant unsigned := 1000269003; VK_STRUCTURE_TYPE_PIPELINE_EXECUTABLE_STATISTIC_KHR : constant unsigned := 1000269004; VK_STRUCTURE_TYPE_PIPELINE_EXECUTABLE_INTERNAL_REPRESENTATION_KHR : constant unsigned := 1000269005; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_DEMOTE_TO_HELPER_INVOCATION_FEATURES_EXT : constant unsigned := 1000276000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_TEXEL_BUFFER_ALIGNMENT_FEATURES_EXT : constant unsigned := 1000281000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_TEXEL_BUFFER_ALIGNMENT_PROPERTIES_EXT : constant unsigned := 1000281001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_VARIABLE_POINTER_FEATURES : constant unsigned := 1000120000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_DRAW_PARAMETER_FEATURES : constant unsigned := 1000063000; VK_STRUCTURE_TYPE_DEBUG_REPORT_CREATE_INFO_EXT : constant unsigned := 1000011000; VK_STRUCTURE_TYPE_RENDER_PASS_MULTIVIEW_CREATE_INFO_KHR : constant unsigned := 1000053000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MULTIVIEW_FEATURES_KHR : constant unsigned := 1000053001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MULTIVIEW_PROPERTIES_KHR : constant unsigned := 1000053002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_FEATURES_2_KHR : constant unsigned := 1000059000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_PROPERTIES_2_KHR : constant unsigned := 1000059001; VK_STRUCTURE_TYPE_FORMAT_PROPERTIES_2_KHR : constant unsigned := 1000059002; VK_STRUCTURE_TYPE_IMAGE_FORMAT_PROPERTIES_2_KHR : constant unsigned := 1000059003; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_IMAGE_FORMAT_INFO_2_KHR : constant unsigned := 1000059004; VK_STRUCTURE_TYPE_QUEUE_FAMILY_PROPERTIES_2_KHR : constant unsigned := 1000059005; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MEMORY_PROPERTIES_2_KHR : constant unsigned := 1000059006; VK_STRUCTURE_TYPE_SPARSE_IMAGE_FORMAT_PROPERTIES_2_KHR : constant unsigned := 1000059007; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SPARSE_IMAGE_FORMAT_INFO_2_KHR : constant unsigned := 1000059008; VK_STRUCTURE_TYPE_MEMORY_ALLOCATE_FLAGS_INFO_KHR : constant unsigned := 1000060000; VK_STRUCTURE_TYPE_DEVICE_GROUP_RENDER_PASS_BEGIN_INFO_KHR : constant unsigned := 1000060003; VK_STRUCTURE_TYPE_DEVICE_GROUP_COMMAND_BUFFER_BEGIN_INFO_KHR : constant unsigned := 1000060004; VK_STRUCTURE_TYPE_DEVICE_GROUP_SUBMIT_INFO_KHR : constant unsigned := 1000060005; VK_STRUCTURE_TYPE_DEVICE_GROUP_BIND_SPARSE_INFO_KHR : constant unsigned := 1000060006; VK_STRUCTURE_TYPE_BIND_BUFFER_MEMORY_DEVICE_GROUP_INFO_KHR : constant unsigned := 1000060013; VK_STRUCTURE_TYPE_BIND_IMAGE_MEMORY_DEVICE_GROUP_INFO_KHR : constant unsigned := 1000060014; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_GROUP_PROPERTIES_KHR : constant unsigned := 1000070000; VK_STRUCTURE_TYPE_DEVICE_GROUP_DEVICE_CREATE_INFO_KHR : constant unsigned := 1000070001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_EXTERNAL_IMAGE_FORMAT_INFO_KHR : constant unsigned := 1000071000; VK_STRUCTURE_TYPE_EXTERNAL_IMAGE_FORMAT_PROPERTIES_KHR : constant unsigned := 1000071001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_EXTERNAL_BUFFER_INFO_KHR : constant unsigned := 1000071002; VK_STRUCTURE_TYPE_EXTERNAL_BUFFER_PROPERTIES_KHR : constant unsigned := 1000071003; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_ID_PROPERTIES_KHR : constant unsigned := 1000071004; VK_STRUCTURE_TYPE_EXTERNAL_MEMORY_BUFFER_CREATE_INFO_KHR : constant unsigned := 1000072000; VK_STRUCTURE_TYPE_EXTERNAL_MEMORY_IMAGE_CREATE_INFO_KHR : constant unsigned := 1000072001; VK_STRUCTURE_TYPE_EXPORT_MEMORY_ALLOCATE_INFO_KHR : constant unsigned := 1000072002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_EXTERNAL_SEMAPHORE_INFO_KHR : constant unsigned := 1000076000; VK_STRUCTURE_TYPE_EXTERNAL_SEMAPHORE_PROPERTIES_KHR : constant unsigned := 1000076001; VK_STRUCTURE_TYPE_EXPORT_SEMAPHORE_CREATE_INFO_KHR : constant unsigned := 1000077000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_FLOAT16_INT8_FEATURES_KHR : constant unsigned := 1000082000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_FLOAT16_INT8_FEATURES_KHR : constant unsigned := 1000082000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_16BIT_STORAGE_FEATURES_KHR : constant unsigned := 1000083000; VK_STRUCTURE_TYPE_DESCRIPTOR_UPDATE_TEMPLATE_CREATE_INFO_KHR : constant unsigned := 1000085000; VK_STRUCTURE_TYPE_SURFACE_CAPABILITIES2_EXT : constant unsigned := 1000090000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_IMAGELESS_FRAMEBUFFER_FEATURES_KHR : constant unsigned := 1000108000; VK_STRUCTURE_TYPE_FRAMEBUFFER_ATTACHMENTS_CREATE_INFO_KHR : constant unsigned := 1000108001; VK_STRUCTURE_TYPE_FRAMEBUFFER_ATTACHMENT_IMAGE_INFO_KHR : constant unsigned := 1000108002; VK_STRUCTURE_TYPE_RENDER_PASS_ATTACHMENT_BEGIN_INFO_KHR : constant unsigned := 1000108003; VK_STRUCTURE_TYPE_ATTACHMENT_DESCRIPTION_2_KHR : constant unsigned := 1000109000; VK_STRUCTURE_TYPE_ATTACHMENT_REFERENCE_2_KHR : constant unsigned := 1000109001; VK_STRUCTURE_TYPE_SUBPASS_DESCRIPTION_2_KHR : constant unsigned := 1000109002; VK_STRUCTURE_TYPE_SUBPASS_DEPENDENCY_2_KHR : constant unsigned := 1000109003; VK_STRUCTURE_TYPE_RENDER_PASS_CREATE_INFO_2_KHR : constant unsigned := 1000109004; VK_STRUCTURE_TYPE_SUBPASS_BEGIN_INFO_KHR : constant unsigned := 1000109005; VK_STRUCTURE_TYPE_SUBPASS_END_INFO_KHR : constant unsigned := 1000109006; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_EXTERNAL_FENCE_INFO_KHR : constant unsigned := 1000112000; VK_STRUCTURE_TYPE_EXTERNAL_FENCE_PROPERTIES_KHR : constant unsigned := 1000112001; VK_STRUCTURE_TYPE_EXPORT_FENCE_CREATE_INFO_KHR : constant unsigned := 1000113000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_POINT_CLIPPING_PROPERTIES_KHR : constant unsigned := 1000117000; VK_STRUCTURE_TYPE_RENDER_PASS_INPUT_ATTACHMENT_ASPECT_CREATE_INFO_KHR : constant unsigned := 1000117001; VK_STRUCTURE_TYPE_IMAGE_VIEW_USAGE_CREATE_INFO_KHR : constant unsigned := 1000117002; VK_STRUCTURE_TYPE_PIPELINE_TESSELLATION_DOMAIN_ORIGIN_STATE_CREATE_INFO_KHR : constant unsigned := 1000117003; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_VARIABLE_POINTER_FEATURES_KHR : constant unsigned := 1000120000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_VARIABLE_POINTERS_FEATURES_KHR : constant unsigned := 1000120000; VK_STRUCTURE_TYPE_MEMORY_DEDICATED_REQUIREMENTS_KHR : constant unsigned := 1000127000; VK_STRUCTURE_TYPE_MEMORY_DEDICATED_ALLOCATE_INFO_KHR : constant unsigned := 1000127001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SAMPLER_FILTER_MINMAX_PROPERTIES_EXT : constant unsigned := 1000130000; VK_STRUCTURE_TYPE_SAMPLER_REDUCTION_MODE_CREATE_INFO_EXT : constant unsigned := 1000130001; VK_STRUCTURE_TYPE_BUFFER_MEMORY_REQUIREMENTS_INFO_2_KHR : constant unsigned := 1000146000; VK_STRUCTURE_TYPE_IMAGE_MEMORY_REQUIREMENTS_INFO_2_KHR : constant unsigned := 1000146001; VK_STRUCTURE_TYPE_IMAGE_SPARSE_MEMORY_REQUIREMENTS_INFO_2_KHR : constant unsigned := 1000146002; VK_STRUCTURE_TYPE_MEMORY_REQUIREMENTS_2_KHR : constant unsigned := 1000146003; VK_STRUCTURE_TYPE_SPARSE_IMAGE_MEMORY_REQUIREMENTS_2_KHR : constant unsigned := 1000146004; VK_STRUCTURE_TYPE_IMAGE_FORMAT_LIST_CREATE_INFO_KHR : constant unsigned := 1000147000; VK_STRUCTURE_TYPE_SAMPLER_YCBCR_CONVERSION_CREATE_INFO_KHR : constant unsigned := 1000156000; VK_STRUCTURE_TYPE_SAMPLER_YCBCR_CONVERSION_INFO_KHR : constant unsigned := 1000156001; VK_STRUCTURE_TYPE_BIND_IMAGE_PLANE_MEMORY_INFO_KHR : constant unsigned := 1000156002; VK_STRUCTURE_TYPE_IMAGE_PLANE_MEMORY_REQUIREMENTS_INFO_KHR : constant unsigned := 1000156003; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SAMPLER_YCBCR_CONVERSION_FEATURES_KHR : constant unsigned := 1000156004; VK_STRUCTURE_TYPE_SAMPLER_YCBCR_CONVERSION_IMAGE_FORMAT_PROPERTIES_KHR : constant unsigned := 1000156005; VK_STRUCTURE_TYPE_BIND_BUFFER_MEMORY_INFO_KHR : constant unsigned := 1000157000; VK_STRUCTURE_TYPE_BIND_IMAGE_MEMORY_INFO_KHR : constant unsigned := 1000157001; VK_STRUCTURE_TYPE_DESCRIPTOR_SET_LAYOUT_BINDING_FLAGS_CREATE_INFO_EXT : constant unsigned := 1000161000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_DESCRIPTOR_INDEXING_FEATURES_EXT : constant unsigned := 1000161001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_DESCRIPTOR_INDEXING_PROPERTIES_EXT : constant unsigned := 1000161002; VK_STRUCTURE_TYPE_DESCRIPTOR_SET_VARIABLE_DESCRIPTOR_COUNT_ALLOCATE_INFO_EXT : constant unsigned := 1000161003; VK_STRUCTURE_TYPE_DESCRIPTOR_SET_VARIABLE_DESCRIPTOR_COUNT_LAYOUT_SUPPORT_EXT : constant unsigned := 1000161004; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_MAINTENANCE_3_PROPERTIES_KHR : constant unsigned := 1000168000; VK_STRUCTURE_TYPE_DESCRIPTOR_SET_LAYOUT_SUPPORT_KHR : constant unsigned := 1000168001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_SUBGROUP_EXTENDED_TYPES_FEATURES_KHR : constant unsigned := 1000175000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_8BIT_STORAGE_FEATURES_KHR : constant unsigned := 1000177000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SHADER_ATOMIC_INT64_FEATURES_KHR : constant unsigned := 1000180000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_DRIVER_PROPERTIES_KHR : constant unsigned := 1000196000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_FLOAT_CONTROLS_PROPERTIES_KHR : constant unsigned := 1000197000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_DEPTH_STENCIL_RESOLVE_PROPERTIES_KHR : constant unsigned := 1000199000; VK_STRUCTURE_TYPE_SUBPASS_DESCRIPTION_DEPTH_STENCIL_RESOLVE_KHR : constant unsigned := 1000199001; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_TIMELINE_SEMAPHORE_FEATURES_KHR : constant unsigned := 1000207000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_TIMELINE_SEMAPHORE_PROPERTIES_KHR : constant unsigned := 1000207001; VK_STRUCTURE_TYPE_SEMAPHORE_TYPE_CREATE_INFO_KHR : constant unsigned := 1000207002; VK_STRUCTURE_TYPE_TIMELINE_SEMAPHORE_SUBMIT_INFO_KHR : constant unsigned := 1000207003; VK_STRUCTURE_TYPE_SEMAPHORE_WAIT_INFO_KHR : constant unsigned := 1000207004; VK_STRUCTURE_TYPE_SEMAPHORE_SIGNAL_INFO_KHR : constant unsigned := 1000207005; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_VULKAN_MEMORY_MODEL_FEATURES_KHR : constant unsigned := 1000211000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SCALAR_BLOCK_LAYOUT_FEATURES_EXT : constant unsigned := 1000221000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_SEPARATE_DEPTH_STENCIL_LAYOUTS_FEATURES_KHR : constant unsigned := 1000241000; VK_STRUCTURE_TYPE_ATTACHMENT_REFERENCE_STENCIL_LAYOUT_KHR : constant unsigned := 1000241001; VK_STRUCTURE_TYPE_ATTACHMENT_DESCRIPTION_STENCIL_LAYOUT_KHR : constant unsigned := 1000241002; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_BUFFER_ADDRESS_FEATURES_EXT : constant unsigned := 1000244000; VK_STRUCTURE_TYPE_BUFFER_DEVICE_ADDRESS_INFO_EXT : constant unsigned := 1000244001; VK_STRUCTURE_TYPE_IMAGE_STENCIL_USAGE_CREATE_INFO_EXT : constant unsigned := 1000246000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_UNIFORM_BUFFER_STANDARD_LAYOUT_FEATURES_KHR : constant unsigned := 1000253000; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_BUFFER_DEVICE_ADDRESS_FEATURES_KHR : constant unsigned := 1000257000; VK_STRUCTURE_TYPE_BUFFER_DEVICE_ADDRESS_INFO_KHR : constant unsigned := 1000244001; VK_STRUCTURE_TYPE_BUFFER_OPAQUE_CAPTURE_ADDRESS_CREATE_INFO_KHR : constant unsigned := 1000257002; VK_STRUCTURE_TYPE_MEMORY_OPAQUE_CAPTURE_ADDRESS_ALLOCATE_INFO_KHR : constant unsigned := 1000257003; VK_STRUCTURE_TYPE_DEVICE_MEMORY_OPAQUE_CAPTURE_ADDRESS_INFO_KHR : constant unsigned := 1000257004; VK_STRUCTURE_TYPE_PHYSICAL_DEVICE_HOST_QUERY_RESET_FEATURES_EXT : constant unsigned := 1000261000; VK_STRUCTURE_TYPE_BEGIN_RANGE : constant unsigned := 0; VK_STRUCTURE_TYPE_END_RANGE : constant unsigned := 48; VK_STRUCTURE_TYPE_RANGE_SIZE : constant unsigned := 49; VK_STRUCTURE_TYPE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:162 subtype VkSystemAllocationScope is unsigned; VK_SYSTEM_ALLOCATION_SCOPE_COMMAND : constant unsigned := 0; VK_SYSTEM_ALLOCATION_SCOPE_OBJECT : constant unsigned := 1; VK_SYSTEM_ALLOCATION_SCOPE_CACHE : constant unsigned := 2; VK_SYSTEM_ALLOCATION_SCOPE_DEVICE : constant unsigned := 3; VK_SYSTEM_ALLOCATION_SCOPE_INSTANCE : constant unsigned := 4; VK_SYSTEM_ALLOCATION_SCOPE_BEGIN_RANGE : constant unsigned := 0; VK_SYSTEM_ALLOCATION_SCOPE_END_RANGE : constant unsigned := 4; VK_SYSTEM_ALLOCATION_SCOPE_RANGE_SIZE : constant unsigned := 5; VK_SYSTEM_ALLOCATION_SCOPE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:682 subtype VkInternalAllocationType is unsigned; VK_INTERNAL_ALLOCATION_TYPE_EXECUTABLE : constant unsigned := 0; VK_INTERNAL_ALLOCATION_TYPE_BEGIN_RANGE : constant unsigned := 0; VK_INTERNAL_ALLOCATION_TYPE_END_RANGE : constant unsigned := 0; VK_INTERNAL_ALLOCATION_TYPE_RANGE_SIZE : constant unsigned := 1; VK_INTERNAL_ALLOCATION_TYPE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:694 subtype VkFormat is unsigned; VK_FORMAT_UNDEFINED : constant unsigned := 0; VK_FORMAT_R4G4_UNORM_PACK8 : constant unsigned := 1; VK_FORMAT_R4G4B4A4_UNORM_PACK16 : constant unsigned := 2; VK_FORMAT_B4G4R4A4_UNORM_PACK16 : constant unsigned := 3; VK_FORMAT_R5G6B5_UNORM_PACK16 : constant unsigned := 4; VK_FORMAT_B5G6R5_UNORM_PACK16 : constant unsigned := 5; VK_FORMAT_R5G5B5A1_UNORM_PACK16 : constant unsigned := 6; VK_FORMAT_B5G5R5A1_UNORM_PACK16 : constant unsigned := 7; VK_FORMAT_A1R5G5B5_UNORM_PACK16 : constant unsigned := 8; VK_FORMAT_R8_UNORM : constant unsigned := 9; VK_FORMAT_R8_SNORM : constant unsigned := 10; VK_FORMAT_R8_USCALED : constant unsigned := 11; VK_FORMAT_R8_SSCALED : constant unsigned := 12; VK_FORMAT_R8_UINT : constant unsigned := 13; VK_FORMAT_R8_SINT : constant unsigned := 14; VK_FORMAT_R8_SRGB : constant unsigned := 15; VK_FORMAT_R8G8_UNORM : constant unsigned := 16; VK_FORMAT_R8G8_SNORM : constant unsigned := 17; VK_FORMAT_R8G8_USCALED : constant unsigned := 18; VK_FORMAT_R8G8_SSCALED : constant unsigned := 19; VK_FORMAT_R8G8_UINT : constant unsigned := 20; VK_FORMAT_R8G8_SINT : constant unsigned := 21; VK_FORMAT_R8G8_SRGB : constant unsigned := 22; VK_FORMAT_R8G8B8_UNORM : constant unsigned := 23; VK_FORMAT_R8G8B8_SNORM : constant unsigned := 24; VK_FORMAT_R8G8B8_USCALED : constant unsigned := 25; VK_FORMAT_R8G8B8_SSCALED : constant unsigned := 26; VK_FORMAT_R8G8B8_UINT : constant unsigned := 27; VK_FORMAT_R8G8B8_SINT : constant unsigned := 28; VK_FORMAT_R8G8B8_SRGB : constant unsigned := 29; VK_FORMAT_B8G8R8_UNORM : constant unsigned := 30; VK_FORMAT_B8G8R8_SNORM : constant unsigned := 31; VK_FORMAT_B8G8R8_USCALED : constant unsigned := 32; VK_FORMAT_B8G8R8_SSCALED : constant unsigned := 33; VK_FORMAT_B8G8R8_UINT : constant unsigned := 34; VK_FORMAT_B8G8R8_SINT : constant unsigned := 35; VK_FORMAT_B8G8R8_SRGB : constant unsigned := 36; VK_FORMAT_R8G8B8A8_UNORM : constant unsigned := 37; VK_FORMAT_R8G8B8A8_SNORM : constant unsigned := 38; VK_FORMAT_R8G8B8A8_USCALED : constant unsigned := 39; VK_FORMAT_R8G8B8A8_SSCALED : constant unsigned := 40; VK_FORMAT_R8G8B8A8_UINT : constant unsigned := 41; VK_FORMAT_R8G8B8A8_SINT : constant unsigned := 42; VK_FORMAT_R8G8B8A8_SRGB : constant unsigned := 43; VK_FORMAT_B8G8R8A8_UNORM : constant unsigned := 44; VK_FORMAT_B8G8R8A8_SNORM : constant unsigned := 45; VK_FORMAT_B8G8R8A8_USCALED : constant unsigned := 46; VK_FORMAT_B8G8R8A8_SSCALED : constant unsigned := 47; VK_FORMAT_B8G8R8A8_UINT : constant unsigned := 48; VK_FORMAT_B8G8R8A8_SINT : constant unsigned := 49; VK_FORMAT_B8G8R8A8_SRGB : constant unsigned := 50; VK_FORMAT_A8B8G8R8_UNORM_PACK32 : constant unsigned := 51; VK_FORMAT_A8B8G8R8_SNORM_PACK32 : constant unsigned := 52; VK_FORMAT_A8B8G8R8_USCALED_PACK32 : constant unsigned := 53; VK_FORMAT_A8B8G8R8_SSCALED_PACK32 : constant unsigned := 54; VK_FORMAT_A8B8G8R8_UINT_PACK32 : constant unsigned := 55; VK_FORMAT_A8B8G8R8_SINT_PACK32 : constant unsigned := 56; VK_FORMAT_A8B8G8R8_SRGB_PACK32 : constant unsigned := 57; VK_FORMAT_A2R10G10B10_UNORM_PACK32 : constant unsigned := 58; VK_FORMAT_A2R10G10B10_SNORM_PACK32 : constant unsigned := 59; VK_FORMAT_A2R10G10B10_USCALED_PACK32 : constant unsigned := 60; VK_FORMAT_A2R10G10B10_SSCALED_PACK32 : constant unsigned := 61; VK_FORMAT_A2R10G10B10_UINT_PACK32 : constant unsigned := 62; VK_FORMAT_A2R10G10B10_SINT_PACK32 : constant unsigned := 63; VK_FORMAT_A2B10G10R10_UNORM_PACK32 : constant unsigned := 64; VK_FORMAT_A2B10G10R10_SNORM_PACK32 : constant unsigned := 65; VK_FORMAT_A2B10G10R10_USCALED_PACK32 : constant unsigned := 66; VK_FORMAT_A2B10G10R10_SSCALED_PACK32 : constant unsigned := 67; VK_FORMAT_A2B10G10R10_UINT_PACK32 : constant unsigned := 68; VK_FORMAT_A2B10G10R10_SINT_PACK32 : constant unsigned := 69; VK_FORMAT_R16_UNORM : constant unsigned := 70; VK_FORMAT_R16_SNORM : constant unsigned := 71; VK_FORMAT_R16_USCALED : constant unsigned := 72; VK_FORMAT_R16_SSCALED : constant unsigned := 73; VK_FORMAT_R16_UINT : constant unsigned := 74; VK_FORMAT_R16_SINT : constant unsigned := 75; VK_FORMAT_R16_SFLOAT : constant unsigned := 76; VK_FORMAT_R16G16_UNORM : constant unsigned := 77; VK_FORMAT_R16G16_SNORM : constant unsigned := 78; VK_FORMAT_R16G16_USCALED : constant unsigned := 79; VK_FORMAT_R16G16_SSCALED : constant unsigned := 80; VK_FORMAT_R16G16_UINT : constant unsigned := 81; VK_FORMAT_R16G16_SINT : constant unsigned := 82; VK_FORMAT_R16G16_SFLOAT : constant unsigned := 83; VK_FORMAT_R16G16B16_UNORM : constant unsigned := 84; VK_FORMAT_R16G16B16_SNORM : constant unsigned := 85; VK_FORMAT_R16G16B16_USCALED : constant unsigned := 86; VK_FORMAT_R16G16B16_SSCALED : constant unsigned := 87; VK_FORMAT_R16G16B16_UINT : constant unsigned := 88; VK_FORMAT_R16G16B16_SINT : constant unsigned := 89; VK_FORMAT_R16G16B16_SFLOAT : constant unsigned := 90; VK_FORMAT_R16G16B16A16_UNORM : constant unsigned := 91; VK_FORMAT_R16G16B16A16_SNORM : constant unsigned := 92; VK_FORMAT_R16G16B16A16_USCALED : constant unsigned := 93; VK_FORMAT_R16G16B16A16_SSCALED : constant unsigned := 94; VK_FORMAT_R16G16B16A16_UINT : constant unsigned := 95; VK_FORMAT_R16G16B16A16_SINT : constant unsigned := 96; VK_FORMAT_R16G16B16A16_SFLOAT : constant unsigned := 97; VK_FORMAT_R32_UINT : constant unsigned := 98; VK_FORMAT_R32_SINT : constant unsigned := 99; VK_FORMAT_R32_SFLOAT : constant unsigned := 100; VK_FORMAT_R32G32_UINT : constant unsigned := 101; VK_FORMAT_R32G32_SINT : constant unsigned := 102; VK_FORMAT_R32G32_SFLOAT : constant unsigned := 103; VK_FORMAT_R32G32B32_UINT : constant unsigned := 104; VK_FORMAT_R32G32B32_SINT : constant unsigned := 105; VK_FORMAT_R32G32B32_SFLOAT : constant unsigned := 106; VK_FORMAT_R32G32B32A32_UINT : constant unsigned := 107; VK_FORMAT_R32G32B32A32_SINT : constant unsigned := 108; VK_FORMAT_R32G32B32A32_SFLOAT : constant unsigned := 109; VK_FORMAT_R64_UINT : constant unsigned := 110; VK_FORMAT_R64_SINT : constant unsigned := 111; VK_FORMAT_R64_SFLOAT : constant unsigned := 112; VK_FORMAT_R64G64_UINT : constant unsigned := 113; VK_FORMAT_R64G64_SINT : constant unsigned := 114; VK_FORMAT_R64G64_SFLOAT : constant unsigned := 115; VK_FORMAT_R64G64B64_UINT : constant unsigned := 116; VK_FORMAT_R64G64B64_SINT : constant unsigned := 117; VK_FORMAT_R64G64B64_SFLOAT : constant unsigned := 118; VK_FORMAT_R64G64B64A64_UINT : constant unsigned := 119; VK_FORMAT_R64G64B64A64_SINT : constant unsigned := 120; VK_FORMAT_R64G64B64A64_SFLOAT : constant unsigned := 121; VK_FORMAT_B10G11R11_UFLOAT_PACK32 : constant unsigned := 122; VK_FORMAT_E5B9G9R9_UFLOAT_PACK32 : constant unsigned := 123; VK_FORMAT_D16_UNORM : constant unsigned := 124; VK_FORMAT_X8_D24_UNORM_PACK32 : constant unsigned := 125; VK_FORMAT_D32_SFLOAT : constant unsigned := 126; VK_FORMAT_S8_UINT : constant unsigned := 127; VK_FORMAT_D16_UNORM_S8_UINT : constant unsigned := 128; VK_FORMAT_D24_UNORM_S8_UINT : constant unsigned := 129; VK_FORMAT_D32_SFLOAT_S8_UINT : constant unsigned := 130; VK_FORMAT_BC1_RGB_UNORM_BLOCK : constant unsigned := 131; VK_FORMAT_BC1_RGB_SRGB_BLOCK : constant unsigned := 132; VK_FORMAT_BC1_RGBA_UNORM_BLOCK : constant unsigned := 133; VK_FORMAT_BC1_RGBA_SRGB_BLOCK : constant unsigned := 134; VK_FORMAT_BC2_UNORM_BLOCK : constant unsigned := 135; VK_FORMAT_BC2_SRGB_BLOCK : constant unsigned := 136; VK_FORMAT_BC3_UNORM_BLOCK : constant unsigned := 137; VK_FORMAT_BC3_SRGB_BLOCK : constant unsigned := 138; VK_FORMAT_BC4_UNORM_BLOCK : constant unsigned := 139; VK_FORMAT_BC4_SNORM_BLOCK : constant unsigned := 140; VK_FORMAT_BC5_UNORM_BLOCK : constant unsigned := 141; VK_FORMAT_BC5_SNORM_BLOCK : constant unsigned := 142; VK_FORMAT_BC6H_UFLOAT_BLOCK : constant unsigned := 143; VK_FORMAT_BC6H_SFLOAT_BLOCK : constant unsigned := 144; VK_FORMAT_BC7_UNORM_BLOCK : constant unsigned := 145; VK_FORMAT_BC7_SRGB_BLOCK : constant unsigned := 146; VK_FORMAT_ETC2_R8G8B8_UNORM_BLOCK : constant unsigned := 147; VK_FORMAT_ETC2_R8G8B8_SRGB_BLOCK : constant unsigned := 148; VK_FORMAT_ETC2_R8G8B8A1_UNORM_BLOCK : constant unsigned := 149; VK_FORMAT_ETC2_R8G8B8A1_SRGB_BLOCK : constant unsigned := 150; VK_FORMAT_ETC2_R8G8B8A8_UNORM_BLOCK : constant unsigned := 151; VK_FORMAT_ETC2_R8G8B8A8_SRGB_BLOCK : constant unsigned := 152; VK_FORMAT_EAC_R11_UNORM_BLOCK : constant unsigned := 153; VK_FORMAT_EAC_R11_SNORM_BLOCK : constant unsigned := 154; VK_FORMAT_EAC_R11G11_UNORM_BLOCK : constant unsigned := 155; VK_FORMAT_EAC_R11G11_SNORM_BLOCK : constant unsigned := 156; VK_FORMAT_ASTC_4x4_UNORM_BLOCK : constant unsigned := 157; VK_FORMAT_ASTC_4x4_SRGB_BLOCK : constant unsigned := 158; VK_FORMAT_ASTC_5x4_UNORM_BLOCK : constant unsigned := 159; VK_FORMAT_ASTC_5x4_SRGB_BLOCK : constant unsigned := 160; VK_FORMAT_ASTC_5x5_UNORM_BLOCK : constant unsigned := 161; VK_FORMAT_ASTC_5x5_SRGB_BLOCK : constant unsigned := 162; VK_FORMAT_ASTC_6x5_UNORM_BLOCK : constant unsigned := 163; VK_FORMAT_ASTC_6x5_SRGB_BLOCK : constant unsigned := 164; VK_FORMAT_ASTC_6x6_UNORM_BLOCK : constant unsigned := 165; VK_FORMAT_ASTC_6x6_SRGB_BLOCK : constant unsigned := 166; VK_FORMAT_ASTC_8x5_UNORM_BLOCK : constant unsigned := 167; VK_FORMAT_ASTC_8x5_SRGB_BLOCK : constant unsigned := 168; VK_FORMAT_ASTC_8x6_UNORM_BLOCK : constant unsigned := 169; VK_FORMAT_ASTC_8x6_SRGB_BLOCK : constant unsigned := 170; VK_FORMAT_ASTC_8x8_UNORM_BLOCK : constant unsigned := 171; VK_FORMAT_ASTC_8x8_SRGB_BLOCK : constant unsigned := 172; VK_FORMAT_ASTC_10x5_UNORM_BLOCK : constant unsigned := 173; VK_FORMAT_ASTC_10x5_SRGB_BLOCK : constant unsigned := 174; VK_FORMAT_ASTC_10x6_UNORM_BLOCK : constant unsigned := 175; VK_FORMAT_ASTC_10x6_SRGB_BLOCK : constant unsigned := 176; VK_FORMAT_ASTC_10x8_UNORM_BLOCK : constant unsigned := 177; VK_FORMAT_ASTC_10x8_SRGB_BLOCK : constant unsigned := 178; VK_FORMAT_ASTC_10x10_UNORM_BLOCK : constant unsigned := 179; VK_FORMAT_ASTC_10x10_SRGB_BLOCK : constant unsigned := 180; VK_FORMAT_ASTC_12x10_UNORM_BLOCK : constant unsigned := 181; VK_FORMAT_ASTC_12x10_SRGB_BLOCK : constant unsigned := 182; VK_FORMAT_ASTC_12x12_UNORM_BLOCK : constant unsigned := 183; VK_FORMAT_ASTC_12x12_SRGB_BLOCK : constant unsigned := 184; VK_FORMAT_G8B8G8R8_422_UNORM : constant unsigned := 1000156000; VK_FORMAT_B8G8R8G8_422_UNORM : constant unsigned := 1000156001; VK_FORMAT_G8_B8_R8_3PLANE_420_UNORM : constant unsigned := 1000156002; VK_FORMAT_G8_B8R8_2PLANE_420_UNORM : constant unsigned := 1000156003; VK_FORMAT_G8_B8_R8_3PLANE_422_UNORM : constant unsigned := 1000156004; VK_FORMAT_G8_B8R8_2PLANE_422_UNORM : constant unsigned := 1000156005; VK_FORMAT_G8_B8_R8_3PLANE_444_UNORM : constant unsigned := 1000156006; VK_FORMAT_R10X6_UNORM_PACK16 : constant unsigned := 1000156007; VK_FORMAT_R10X6G10X6_UNORM_2PACK16 : constant unsigned := 1000156008; VK_FORMAT_R10X6G10X6B10X6A10X6_UNORM_4PACK16 : constant unsigned := 1000156009; VK_FORMAT_G10X6B10X6G10X6R10X6_422_UNORM_4PACK16 : constant unsigned := 1000156010; VK_FORMAT_B10X6G10X6R10X6G10X6_422_UNORM_4PACK16 : constant unsigned := 1000156011; VK_FORMAT_G10X6_B10X6_R10X6_3PLANE_420_UNORM_3PACK16 : constant unsigned := 1000156012; VK_FORMAT_G10X6_B10X6R10X6_2PLANE_420_UNORM_3PACK16 : constant unsigned := 1000156013; VK_FORMAT_G10X6_B10X6_R10X6_3PLANE_422_UNORM_3PACK16 : constant unsigned := 1000156014; VK_FORMAT_G10X6_B10X6R10X6_2PLANE_422_UNORM_3PACK16 : constant unsigned := 1000156015; VK_FORMAT_G10X6_B10X6_R10X6_3PLANE_444_UNORM_3PACK16 : constant unsigned := 1000156016; VK_FORMAT_R12X4_UNORM_PACK16 : constant unsigned := 1000156017; VK_FORMAT_R12X4G12X4_UNORM_2PACK16 : constant unsigned := 1000156018; VK_FORMAT_R12X4G12X4B12X4A12X4_UNORM_4PACK16 : constant unsigned := 1000156019; VK_FORMAT_G12X4B12X4G12X4R12X4_422_UNORM_4PACK16 : constant unsigned := 1000156020; VK_FORMAT_B12X4G12X4R12X4G12X4_422_UNORM_4PACK16 : constant unsigned := 1000156021; VK_FORMAT_G12X4_B12X4_R12X4_3PLANE_420_UNORM_3PACK16 : constant unsigned := 1000156022; VK_FORMAT_G12X4_B12X4R12X4_2PLANE_420_UNORM_3PACK16 : constant unsigned := 1000156023; VK_FORMAT_G12X4_B12X4_R12X4_3PLANE_422_UNORM_3PACK16 : constant unsigned := 1000156024; VK_FORMAT_G12X4_B12X4R12X4_2PLANE_422_UNORM_3PACK16 : constant unsigned := 1000156025; VK_FORMAT_G12X4_B12X4_R12X4_3PLANE_444_UNORM_3PACK16 : constant unsigned := 1000156026; VK_FORMAT_G16B16G16R16_422_UNORM : constant unsigned := 1000156027; VK_FORMAT_B16G16R16G16_422_UNORM : constant unsigned := 1000156028; VK_FORMAT_G16_B16_R16_3PLANE_420_UNORM : constant unsigned := 1000156029; VK_FORMAT_G16_B16R16_2PLANE_420_UNORM : constant unsigned := 1000156030; VK_FORMAT_G16_B16_R16_3PLANE_422_UNORM : constant unsigned := 1000156031; VK_FORMAT_G16_B16R16_2PLANE_422_UNORM : constant unsigned := 1000156032; VK_FORMAT_G16_B16_R16_3PLANE_444_UNORM : constant unsigned := 1000156033; VK_FORMAT_PVRTC1_2BPP_UNORM_BLOCK_IMG : constant unsigned := 1000054000; VK_FORMAT_PVRTC1_4BPP_UNORM_BLOCK_IMG : constant unsigned := 1000054001; VK_FORMAT_PVRTC2_2BPP_UNORM_BLOCK_IMG : constant unsigned := 1000054002; VK_FORMAT_PVRTC2_4BPP_UNORM_BLOCK_IMG : constant unsigned := 1000054003; VK_FORMAT_PVRTC1_2BPP_SRGB_BLOCK_IMG : constant unsigned := 1000054004; VK_FORMAT_PVRTC1_4BPP_SRGB_BLOCK_IMG : constant unsigned := 1000054005; VK_FORMAT_PVRTC2_2BPP_SRGB_BLOCK_IMG : constant unsigned := 1000054006; VK_FORMAT_PVRTC2_4BPP_SRGB_BLOCK_IMG : constant unsigned := 1000054007; VK_FORMAT_ASTC_4x4_SFLOAT_BLOCK_EXT : constant unsigned := 1000066000; VK_FORMAT_ASTC_5x4_SFLOAT_BLOCK_EXT : constant unsigned := 1000066001; VK_FORMAT_ASTC_5x5_SFLOAT_BLOCK_EXT : constant unsigned := 1000066002; VK_FORMAT_ASTC_6x5_SFLOAT_BLOCK_EXT : constant unsigned := 1000066003; VK_FORMAT_ASTC_6x6_SFLOAT_BLOCK_EXT : constant unsigned := 1000066004; VK_FORMAT_ASTC_8x5_SFLOAT_BLOCK_EXT : constant unsigned := 1000066005; VK_FORMAT_ASTC_8x6_SFLOAT_BLOCK_EXT : constant unsigned := 1000066006; VK_FORMAT_ASTC_8x8_SFLOAT_BLOCK_EXT : constant unsigned := 1000066007; VK_FORMAT_ASTC_10x5_SFLOAT_BLOCK_EXT : constant unsigned := 1000066008; VK_FORMAT_ASTC_10x6_SFLOAT_BLOCK_EXT : constant unsigned := 1000066009; VK_FORMAT_ASTC_10x8_SFLOAT_BLOCK_EXT : constant unsigned := 1000066010; VK_FORMAT_ASTC_10x10_SFLOAT_BLOCK_EXT : constant unsigned := 1000066011; VK_FORMAT_ASTC_12x10_SFLOAT_BLOCK_EXT : constant unsigned := 1000066012; VK_FORMAT_ASTC_12x12_SFLOAT_BLOCK_EXT : constant unsigned := 1000066013; VK_FORMAT_G8B8G8R8_422_UNORM_KHR : constant unsigned := 1000156000; VK_FORMAT_B8G8R8G8_422_UNORM_KHR : constant unsigned := 1000156001; VK_FORMAT_G8_B8_R8_3PLANE_420_UNORM_KHR : constant unsigned := 1000156002; VK_FORMAT_G8_B8R8_2PLANE_420_UNORM_KHR : constant unsigned := 1000156003; VK_FORMAT_G8_B8_R8_3PLANE_422_UNORM_KHR : constant unsigned := 1000156004; VK_FORMAT_G8_B8R8_2PLANE_422_UNORM_KHR : constant unsigned := 1000156005; VK_FORMAT_G8_B8_R8_3PLANE_444_UNORM_KHR : constant unsigned := 1000156006; VK_FORMAT_R10X6_UNORM_PACK16_KHR : constant unsigned := 1000156007; VK_FORMAT_R10X6G10X6_UNORM_2PACK16_KHR : constant unsigned := 1000156008; VK_FORMAT_R10X6G10X6B10X6A10X6_UNORM_4PACK16_KHR : constant unsigned := 1000156009; VK_FORMAT_G10X6B10X6G10X6R10X6_422_UNORM_4PACK16_KHR : constant unsigned := 1000156010; VK_FORMAT_B10X6G10X6R10X6G10X6_422_UNORM_4PACK16_KHR : constant unsigned := 1000156011; VK_FORMAT_G10X6_B10X6_R10X6_3PLANE_420_UNORM_3PACK16_KHR : constant unsigned := 1000156012; VK_FORMAT_G10X6_B10X6R10X6_2PLANE_420_UNORM_3PACK16_KHR : constant unsigned := 1000156013; VK_FORMAT_G10X6_B10X6_R10X6_3PLANE_422_UNORM_3PACK16_KHR : constant unsigned := 1000156014; VK_FORMAT_G10X6_B10X6R10X6_2PLANE_422_UNORM_3PACK16_KHR : constant unsigned := 1000156015; VK_FORMAT_G10X6_B10X6_R10X6_3PLANE_444_UNORM_3PACK16_KHR : constant unsigned := 1000156016; VK_FORMAT_R12X4_UNORM_PACK16_KHR : constant unsigned := 1000156017; VK_FORMAT_R12X4G12X4_UNORM_2PACK16_KHR : constant unsigned := 1000156018; VK_FORMAT_R12X4G12X4B12X4A12X4_UNORM_4PACK16_KHR : constant unsigned := 1000156019; VK_FORMAT_G12X4B12X4G12X4R12X4_422_UNORM_4PACK16_KHR : constant unsigned := 1000156020; VK_FORMAT_B12X4G12X4R12X4G12X4_422_UNORM_4PACK16_KHR : constant unsigned := 1000156021; VK_FORMAT_G12X4_B12X4_R12X4_3PLANE_420_UNORM_3PACK16_KHR : constant unsigned := 1000156022; VK_FORMAT_G12X4_B12X4R12X4_2PLANE_420_UNORM_3PACK16_KHR : constant unsigned := 1000156023; VK_FORMAT_G12X4_B12X4_R12X4_3PLANE_422_UNORM_3PACK16_KHR : constant unsigned := 1000156024; VK_FORMAT_G12X4_B12X4R12X4_2PLANE_422_UNORM_3PACK16_KHR : constant unsigned := 1000156025; VK_FORMAT_G12X4_B12X4_R12X4_3PLANE_444_UNORM_3PACK16_KHR : constant unsigned := 1000156026; VK_FORMAT_G16B16G16R16_422_UNORM_KHR : constant unsigned := 1000156027; VK_FORMAT_B16G16R16G16_422_UNORM_KHR : constant unsigned := 1000156028; VK_FORMAT_G16_B16_R16_3PLANE_420_UNORM_KHR : constant unsigned := 1000156029; VK_FORMAT_G16_B16R16_2PLANE_420_UNORM_KHR : constant unsigned := 1000156030; VK_FORMAT_G16_B16_R16_3PLANE_422_UNORM_KHR : constant unsigned := 1000156031; VK_FORMAT_G16_B16R16_2PLANE_422_UNORM_KHR : constant unsigned := 1000156032; VK_FORMAT_G16_B16_R16_3PLANE_444_UNORM_KHR : constant unsigned := 1000156033; VK_FORMAT_BEGIN_RANGE : constant unsigned := 0; VK_FORMAT_END_RANGE : constant unsigned := 184; VK_FORMAT_RANGE_SIZE : constant unsigned := 185; VK_FORMAT_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:702 subtype VkImageType is unsigned; VK_IMAGE_TYPE_1D : constant unsigned := 0; VK_IMAGE_TYPE_2D : constant unsigned := 1; VK_IMAGE_TYPE_3D : constant unsigned := 2; VK_IMAGE_TYPE_BEGIN_RANGE : constant unsigned := 0; VK_IMAGE_TYPE_END_RANGE : constant unsigned := 2; VK_IMAGE_TYPE_RANGE_SIZE : constant unsigned := 3; VK_IMAGE_TYPE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:984 subtype VkImageTiling is unsigned; VK_IMAGE_TILING_OPTIMAL : constant unsigned := 0; VK_IMAGE_TILING_LINEAR : constant unsigned := 1; VK_IMAGE_TILING_DRM_FORMAT_MODIFIER_EXT : constant unsigned := 1000158000; VK_IMAGE_TILING_BEGIN_RANGE : constant unsigned := 0; VK_IMAGE_TILING_END_RANGE : constant unsigned := 1; VK_IMAGE_TILING_RANGE_SIZE : constant unsigned := 2; VK_IMAGE_TILING_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:994 subtype VkPhysicalDeviceType is unsigned; VK_PHYSICAL_DEVICE_TYPE_OTHER : constant unsigned := 0; VK_PHYSICAL_DEVICE_TYPE_INTEGRATED_GPU : constant unsigned := 1; VK_PHYSICAL_DEVICE_TYPE_DISCRETE_GPU : constant unsigned := 2; VK_PHYSICAL_DEVICE_TYPE_VIRTUAL_GPU : constant unsigned := 3; VK_PHYSICAL_DEVICE_TYPE_CPU : constant unsigned := 4; VK_PHYSICAL_DEVICE_TYPE_BEGIN_RANGE : constant unsigned := 0; VK_PHYSICAL_DEVICE_TYPE_END_RANGE : constant unsigned := 4; VK_PHYSICAL_DEVICE_TYPE_RANGE_SIZE : constant unsigned := 5; VK_PHYSICAL_DEVICE_TYPE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1004 subtype VkQueryType is unsigned; VK_QUERY_TYPE_OCCLUSION : constant unsigned := 0; VK_QUERY_TYPE_PIPELINE_STATISTICS : constant unsigned := 1; VK_QUERY_TYPE_TIMESTAMP : constant unsigned := 2; VK_QUERY_TYPE_TRANSFORM_FEEDBACK_STREAM_EXT : constant unsigned := 1000028004; VK_QUERY_TYPE_PERFORMANCE_QUERY_KHR : constant unsigned := 1000116000; VK_QUERY_TYPE_ACCELERATION_STRUCTURE_COMPACTED_SIZE_NV : constant unsigned := 1000165000; VK_QUERY_TYPE_PERFORMANCE_QUERY_INTEL : constant unsigned := 1000210000; VK_QUERY_TYPE_BEGIN_RANGE : constant unsigned := 0; VK_QUERY_TYPE_END_RANGE : constant unsigned := 2; VK_QUERY_TYPE_RANGE_SIZE : constant unsigned := 3; VK_QUERY_TYPE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1016 subtype VkSharingMode is unsigned; VK_SHARING_MODE_EXCLUSIVE : constant unsigned := 0; VK_SHARING_MODE_CONCURRENT : constant unsigned := 1; VK_SHARING_MODE_BEGIN_RANGE : constant unsigned := 0; VK_SHARING_MODE_END_RANGE : constant unsigned := 1; VK_SHARING_MODE_RANGE_SIZE : constant unsigned := 2; VK_SHARING_MODE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1030 subtype VkImageLayout is unsigned; VK_IMAGE_LAYOUT_UNDEFINED : constant unsigned := 0; VK_IMAGE_LAYOUT_GENERAL : constant unsigned := 1; VK_IMAGE_LAYOUT_COLOR_ATTACHMENT_OPTIMAL : constant unsigned := 2; VK_IMAGE_LAYOUT_DEPTH_STENCIL_ATTACHMENT_OPTIMAL : constant unsigned := 3; VK_IMAGE_LAYOUT_DEPTH_STENCIL_READ_ONLY_OPTIMAL : constant unsigned := 4; VK_IMAGE_LAYOUT_SHADER_READ_ONLY_OPTIMAL : constant unsigned := 5; VK_IMAGE_LAYOUT_TRANSFER_SRC_OPTIMAL : constant unsigned := 6; VK_IMAGE_LAYOUT_TRANSFER_DST_OPTIMAL : constant unsigned := 7; VK_IMAGE_LAYOUT_PREINITIALIZED : constant unsigned := 8; VK_IMAGE_LAYOUT_DEPTH_READ_ONLY_STENCIL_ATTACHMENT_OPTIMAL : constant unsigned := 1000117000; VK_IMAGE_LAYOUT_DEPTH_ATTACHMENT_STENCIL_READ_ONLY_OPTIMAL : constant unsigned := 1000117001; VK_IMAGE_LAYOUT_DEPTH_ATTACHMENT_OPTIMAL : constant unsigned := 1000241000; VK_IMAGE_LAYOUT_DEPTH_READ_ONLY_OPTIMAL : constant unsigned := 1000241001; VK_IMAGE_LAYOUT_STENCIL_ATTACHMENT_OPTIMAL : constant unsigned := 1000241002; VK_IMAGE_LAYOUT_STENCIL_READ_ONLY_OPTIMAL : constant unsigned := 1000241003; VK_IMAGE_LAYOUT_PRESENT_SRC_KHR : constant unsigned := 1000001002; VK_IMAGE_LAYOUT_SHARED_PRESENT_KHR : constant unsigned := 1000111000; VK_IMAGE_LAYOUT_SHADING_RATE_OPTIMAL_NV : constant unsigned := 1000164003; VK_IMAGE_LAYOUT_FRAGMENT_DENSITY_MAP_OPTIMAL_EXT : constant unsigned := 1000218000; VK_IMAGE_LAYOUT_DEPTH_READ_ONLY_STENCIL_ATTACHMENT_OPTIMAL_KHR : constant unsigned := 1000117000; VK_IMAGE_LAYOUT_DEPTH_ATTACHMENT_STENCIL_READ_ONLY_OPTIMAL_KHR : constant unsigned := 1000117001; VK_IMAGE_LAYOUT_DEPTH_ATTACHMENT_OPTIMAL_KHR : constant unsigned := 1000241000; VK_IMAGE_LAYOUT_DEPTH_READ_ONLY_OPTIMAL_KHR : constant unsigned := 1000241001; VK_IMAGE_LAYOUT_STENCIL_ATTACHMENT_OPTIMAL_KHR : constant unsigned := 1000241002; VK_IMAGE_LAYOUT_STENCIL_READ_ONLY_OPTIMAL_KHR : constant unsigned := 1000241003; VK_IMAGE_LAYOUT_BEGIN_RANGE : constant unsigned := 0; VK_IMAGE_LAYOUT_END_RANGE : constant unsigned := 8; VK_IMAGE_LAYOUT_RANGE_SIZE : constant unsigned := 9; VK_IMAGE_LAYOUT_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1039 subtype VkImageViewType is unsigned; VK_IMAGE_VIEW_TYPE_1D : constant unsigned := 0; VK_IMAGE_VIEW_TYPE_2D : constant unsigned := 1; VK_IMAGE_VIEW_TYPE_3D : constant unsigned := 2; VK_IMAGE_VIEW_TYPE_CUBE : constant unsigned := 3; VK_IMAGE_VIEW_TYPE_1D_ARRAY : constant unsigned := 4; VK_IMAGE_VIEW_TYPE_2D_ARRAY : constant unsigned := 5; VK_IMAGE_VIEW_TYPE_CUBE_ARRAY : constant unsigned := 6; VK_IMAGE_VIEW_TYPE_BEGIN_RANGE : constant unsigned := 0; VK_IMAGE_VIEW_TYPE_END_RANGE : constant unsigned := 6; VK_IMAGE_VIEW_TYPE_RANGE_SIZE : constant unsigned := 7; VK_IMAGE_VIEW_TYPE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1071 subtype VkComponentSwizzle is unsigned; VK_COMPONENT_SWIZZLE_IDENTITY : constant unsigned := 0; VK_COMPONENT_SWIZZLE_ZERO : constant unsigned := 1; VK_COMPONENT_SWIZZLE_ONE : constant unsigned := 2; VK_COMPONENT_SWIZZLE_R : constant unsigned := 3; VK_COMPONENT_SWIZZLE_G : constant unsigned := 4; VK_COMPONENT_SWIZZLE_B : constant unsigned := 5; VK_COMPONENT_SWIZZLE_A : constant unsigned := 6; VK_COMPONENT_SWIZZLE_BEGIN_RANGE : constant unsigned := 0; VK_COMPONENT_SWIZZLE_END_RANGE : constant unsigned := 6; VK_COMPONENT_SWIZZLE_RANGE_SIZE : constant unsigned := 7; VK_COMPONENT_SWIZZLE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1085 subtype VkVertexInputRate is unsigned; VK_VERTEX_INPUT_RATE_VERTEX : constant unsigned := 0; VK_VERTEX_INPUT_RATE_INSTANCE : constant unsigned := 1; VK_VERTEX_INPUT_RATE_BEGIN_RANGE : constant unsigned := 0; VK_VERTEX_INPUT_RATE_END_RANGE : constant unsigned := 1; VK_VERTEX_INPUT_RATE_RANGE_SIZE : constant unsigned := 2; VK_VERTEX_INPUT_RATE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1099 subtype VkPrimitiveTopology is unsigned; VK_PRIMITIVE_TOPOLOGY_POINT_LIST : constant unsigned := 0; VK_PRIMITIVE_TOPOLOGY_LINE_LIST : constant unsigned := 1; VK_PRIMITIVE_TOPOLOGY_LINE_STRIP : constant unsigned := 2; VK_PRIMITIVE_TOPOLOGY_TRIANGLE_LIST : constant unsigned := 3; VK_PRIMITIVE_TOPOLOGY_TRIANGLE_STRIP : constant unsigned := 4; VK_PRIMITIVE_TOPOLOGY_TRIANGLE_FAN : constant unsigned := 5; VK_PRIMITIVE_TOPOLOGY_LINE_LIST_WITH_ADJACENCY : constant unsigned := 6; VK_PRIMITIVE_TOPOLOGY_LINE_STRIP_WITH_ADJACENCY : constant unsigned := 7; VK_PRIMITIVE_TOPOLOGY_TRIANGLE_LIST_WITH_ADJACENCY : constant unsigned := 8; VK_PRIMITIVE_TOPOLOGY_TRIANGLE_STRIP_WITH_ADJACENCY : constant unsigned := 9; VK_PRIMITIVE_TOPOLOGY_PATCH_LIST : constant unsigned := 10; VK_PRIMITIVE_TOPOLOGY_BEGIN_RANGE : constant unsigned := 0; VK_PRIMITIVE_TOPOLOGY_END_RANGE : constant unsigned := 10; VK_PRIMITIVE_TOPOLOGY_RANGE_SIZE : constant unsigned := 11; VK_PRIMITIVE_TOPOLOGY_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1108 subtype VkPolygonMode is unsigned; VK_POLYGON_MODE_FILL : constant unsigned := 0; VK_POLYGON_MODE_LINE : constant unsigned := 1; VK_POLYGON_MODE_POINT : constant unsigned := 2; VK_POLYGON_MODE_FILL_RECTANGLE_NV : constant unsigned := 1000153000; VK_POLYGON_MODE_BEGIN_RANGE : constant unsigned := 0; VK_POLYGON_MODE_END_RANGE : constant unsigned := 2; VK_POLYGON_MODE_RANGE_SIZE : constant unsigned := 3; VK_POLYGON_MODE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1126 subtype VkFrontFace is unsigned; VK_FRONT_FACE_COUNTER_CLOCKWISE : constant unsigned := 0; VK_FRONT_FACE_CLOCKWISE : constant unsigned := 1; VK_FRONT_FACE_BEGIN_RANGE : constant unsigned := 0; VK_FRONT_FACE_END_RANGE : constant unsigned := 1; VK_FRONT_FACE_RANGE_SIZE : constant unsigned := 2; VK_FRONT_FACE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1137 subtype VkCompareOp is unsigned; VK_COMPARE_OP_NEVER : constant unsigned := 0; VK_COMPARE_OP_LESS : constant unsigned := 1; VK_COMPARE_OP_EQUAL : constant unsigned := 2; VK_COMPARE_OP_LESS_OR_EQUAL : constant unsigned := 3; VK_COMPARE_OP_GREATER : constant unsigned := 4; VK_COMPARE_OP_NOT_EQUAL : constant unsigned := 5; VK_COMPARE_OP_GREATER_OR_EQUAL : constant unsigned := 6; VK_COMPARE_OP_ALWAYS : constant unsigned := 7; VK_COMPARE_OP_BEGIN_RANGE : constant unsigned := 0; VK_COMPARE_OP_END_RANGE : constant unsigned := 7; VK_COMPARE_OP_RANGE_SIZE : constant unsigned := 8; VK_COMPARE_OP_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1146 subtype VkStencilOp is unsigned; VK_STENCIL_OP_KEEP : constant unsigned := 0; VK_STENCIL_OP_ZERO : constant unsigned := 1; VK_STENCIL_OP_REPLACE : constant unsigned := 2; VK_STENCIL_OP_INCREMENT_AND_CLAMP : constant unsigned := 3; VK_STENCIL_OP_DECREMENT_AND_CLAMP : constant unsigned := 4; VK_STENCIL_OP_INVERT : constant unsigned := 5; VK_STENCIL_OP_INCREMENT_AND_WRAP : constant unsigned := 6; VK_STENCIL_OP_DECREMENT_AND_WRAP : constant unsigned := 7; VK_STENCIL_OP_BEGIN_RANGE : constant unsigned := 0; VK_STENCIL_OP_END_RANGE : constant unsigned := 7; VK_STENCIL_OP_RANGE_SIZE : constant unsigned := 8; VK_STENCIL_OP_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1161 subtype VkLogicOp is unsigned; VK_LOGIC_OP_CLEAR : constant unsigned := 0; VK_LOGIC_OP_AND : constant unsigned := 1; VK_LOGIC_OP_AND_REVERSE : constant unsigned := 2; VK_LOGIC_OP_COPY : constant unsigned := 3; VK_LOGIC_OP_AND_INVERTED : constant unsigned := 4; VK_LOGIC_OP_NO_OP : constant unsigned := 5; VK_LOGIC_OP_XOR : constant unsigned := 6; VK_LOGIC_OP_OR : constant unsigned := 7; VK_LOGIC_OP_NOR : constant unsigned := 8; VK_LOGIC_OP_EQUIVALENT : constant unsigned := 9; VK_LOGIC_OP_INVERT : constant unsigned := 10; VK_LOGIC_OP_OR_REVERSE : constant unsigned := 11; VK_LOGIC_OP_COPY_INVERTED : constant unsigned := 12; VK_LOGIC_OP_OR_INVERTED : constant unsigned := 13; VK_LOGIC_OP_NAND : constant unsigned := 14; VK_LOGIC_OP_SET : constant unsigned := 15; VK_LOGIC_OP_BEGIN_RANGE : constant unsigned := 0; VK_LOGIC_OP_END_RANGE : constant unsigned := 15; VK_LOGIC_OP_RANGE_SIZE : constant unsigned := 16; VK_LOGIC_OP_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1176 subtype VkBlendFactor is unsigned; VK_BLEND_FACTOR_ZERO : constant unsigned := 0; VK_BLEND_FACTOR_ONE : constant unsigned := 1; VK_BLEND_FACTOR_SRC_COLOR : constant unsigned := 2; VK_BLEND_FACTOR_ONE_MINUS_SRC_COLOR : constant unsigned := 3; VK_BLEND_FACTOR_DST_COLOR : constant unsigned := 4; VK_BLEND_FACTOR_ONE_MINUS_DST_COLOR : constant unsigned := 5; VK_BLEND_FACTOR_SRC_ALPHA : constant unsigned := 6; VK_BLEND_FACTOR_ONE_MINUS_SRC_ALPHA : constant unsigned := 7; VK_BLEND_FACTOR_DST_ALPHA : constant unsigned := 8; VK_BLEND_FACTOR_ONE_MINUS_DST_ALPHA : constant unsigned := 9; VK_BLEND_FACTOR_CONSTANT_COLOR : constant unsigned := 10; VK_BLEND_FACTOR_ONE_MINUS_CONSTANT_COLOR : constant unsigned := 11; VK_BLEND_FACTOR_CONSTANT_ALPHA : constant unsigned := 12; VK_BLEND_FACTOR_ONE_MINUS_CONSTANT_ALPHA : constant unsigned := 13; VK_BLEND_FACTOR_SRC_ALPHA_SATURATE : constant unsigned := 14; VK_BLEND_FACTOR_SRC1_COLOR : constant unsigned := 15; VK_BLEND_FACTOR_ONE_MINUS_SRC1_COLOR : constant unsigned := 16; VK_BLEND_FACTOR_SRC1_ALPHA : constant unsigned := 17; VK_BLEND_FACTOR_ONE_MINUS_SRC1_ALPHA : constant unsigned := 18; VK_BLEND_FACTOR_BEGIN_RANGE : constant unsigned := 0; VK_BLEND_FACTOR_END_RANGE : constant unsigned := 18; VK_BLEND_FACTOR_RANGE_SIZE : constant unsigned := 19; VK_BLEND_FACTOR_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1199 subtype VkBlendOp is unsigned; VK_BLEND_OP_ADD : constant unsigned := 0; VK_BLEND_OP_SUBTRACT : constant unsigned := 1; VK_BLEND_OP_REVERSE_SUBTRACT : constant unsigned := 2; VK_BLEND_OP_MIN : constant unsigned := 3; VK_BLEND_OP_MAX : constant unsigned := 4; VK_BLEND_OP_ZERO_EXT : constant unsigned := 1000148000; VK_BLEND_OP_SRC_EXT : constant unsigned := 1000148001; VK_BLEND_OP_DST_EXT : constant unsigned := 1000148002; VK_BLEND_OP_SRC_OVER_EXT : constant unsigned := 1000148003; VK_BLEND_OP_DST_OVER_EXT : constant unsigned := 1000148004; VK_BLEND_OP_SRC_IN_EXT : constant unsigned := 1000148005; VK_BLEND_OP_DST_IN_EXT : constant unsigned := 1000148006; VK_BLEND_OP_SRC_OUT_EXT : constant unsigned := 1000148007; VK_BLEND_OP_DST_OUT_EXT : constant unsigned := 1000148008; VK_BLEND_OP_SRC_ATOP_EXT : constant unsigned := 1000148009; VK_BLEND_OP_DST_ATOP_EXT : constant unsigned := 1000148010; VK_BLEND_OP_XOR_EXT : constant unsigned := 1000148011; VK_BLEND_OP_MULTIPLY_EXT : constant unsigned := 1000148012; VK_BLEND_OP_SCREEN_EXT : constant unsigned := 1000148013; VK_BLEND_OP_OVERLAY_EXT : constant unsigned := 1000148014; VK_BLEND_OP_DARKEN_EXT : constant unsigned := 1000148015; VK_BLEND_OP_LIGHTEN_EXT : constant unsigned := 1000148016; VK_BLEND_OP_COLORDODGE_EXT : constant unsigned := 1000148017; VK_BLEND_OP_COLORBURN_EXT : constant unsigned := 1000148018; VK_BLEND_OP_HARDLIGHT_EXT : constant unsigned := 1000148019; VK_BLEND_OP_SOFTLIGHT_EXT : constant unsigned := 1000148020; VK_BLEND_OP_DIFFERENCE_EXT : constant unsigned := 1000148021; VK_BLEND_OP_EXCLUSION_EXT : constant unsigned := 1000148022; VK_BLEND_OP_INVERT_EXT : constant unsigned := 1000148023; VK_BLEND_OP_INVERT_RGB_EXT : constant unsigned := 1000148024; VK_BLEND_OP_LINEARDODGE_EXT : constant unsigned := 1000148025; VK_BLEND_OP_LINEARBURN_EXT : constant unsigned := 1000148026; VK_BLEND_OP_VIVIDLIGHT_EXT : constant unsigned := 1000148027; VK_BLEND_OP_LINEARLIGHT_EXT : constant unsigned := 1000148028; VK_BLEND_OP_PINLIGHT_EXT : constant unsigned := 1000148029; VK_BLEND_OP_HARDMIX_EXT : constant unsigned := 1000148030; VK_BLEND_OP_HSL_HUE_EXT : constant unsigned := 1000148031; VK_BLEND_OP_HSL_SATURATION_EXT : constant unsigned := 1000148032; VK_BLEND_OP_HSL_COLOR_EXT : constant unsigned := 1000148033; VK_BLEND_OP_HSL_LUMINOSITY_EXT : constant unsigned := 1000148034; VK_BLEND_OP_PLUS_EXT : constant unsigned := 1000148035; VK_BLEND_OP_PLUS_CLAMPED_EXT : constant unsigned := 1000148036; VK_BLEND_OP_PLUS_CLAMPED_ALPHA_EXT : constant unsigned := 1000148037; VK_BLEND_OP_PLUS_DARKER_EXT : constant unsigned := 1000148038; VK_BLEND_OP_MINUS_EXT : constant unsigned := 1000148039; VK_BLEND_OP_MINUS_CLAMPED_EXT : constant unsigned := 1000148040; VK_BLEND_OP_CONTRAST_EXT : constant unsigned := 1000148041; VK_BLEND_OP_INVERT_OVG_EXT : constant unsigned := 1000148042; VK_BLEND_OP_RED_EXT : constant unsigned := 1000148043; VK_BLEND_OP_GREEN_EXT : constant unsigned := 1000148044; VK_BLEND_OP_BLUE_EXT : constant unsigned := 1000148045; VK_BLEND_OP_BEGIN_RANGE : constant unsigned := 0; VK_BLEND_OP_END_RANGE : constant unsigned := 4; VK_BLEND_OP_RANGE_SIZE : constant unsigned := 5; VK_BLEND_OP_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1225 subtype VkDynamicState is unsigned; VK_DYNAMIC_STATE_VIEWPORT : constant unsigned := 0; VK_DYNAMIC_STATE_SCISSOR : constant unsigned := 1; VK_DYNAMIC_STATE_LINE_WIDTH : constant unsigned := 2; VK_DYNAMIC_STATE_DEPTH_BIAS : constant unsigned := 3; VK_DYNAMIC_STATE_BLEND_CONSTANTS : constant unsigned := 4; VK_DYNAMIC_STATE_DEPTH_BOUNDS : constant unsigned := 5; VK_DYNAMIC_STATE_STENCIL_COMPARE_MASK : constant unsigned := 6; VK_DYNAMIC_STATE_STENCIL_WRITE_MASK : constant unsigned := 7; VK_DYNAMIC_STATE_STENCIL_REFERENCE : constant unsigned := 8; VK_DYNAMIC_STATE_VIEWPORT_W_SCALING_NV : constant unsigned := 1000087000; VK_DYNAMIC_STATE_DISCARD_RECTANGLE_EXT : constant unsigned := 1000099000; VK_DYNAMIC_STATE_SAMPLE_LOCATIONS_EXT : constant unsigned := 1000143000; VK_DYNAMIC_STATE_VIEWPORT_SHADING_RATE_PALETTE_NV : constant unsigned := 1000164004; VK_DYNAMIC_STATE_VIEWPORT_COARSE_SAMPLE_ORDER_NV : constant unsigned := 1000164006; VK_DYNAMIC_STATE_EXCLUSIVE_SCISSOR_NV : constant unsigned := 1000205001; VK_DYNAMIC_STATE_LINE_STIPPLE_EXT : constant unsigned := 1000259000; VK_DYNAMIC_STATE_BEGIN_RANGE : constant unsigned := 0; VK_DYNAMIC_STATE_END_RANGE : constant unsigned := 8; VK_DYNAMIC_STATE_RANGE_SIZE : constant unsigned := 9; VK_DYNAMIC_STATE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1283 subtype VkFilter is unsigned; VK_FILTER_NEAREST : constant unsigned := 0; VK_FILTER_LINEAR : constant unsigned := 1; VK_FILTER_CUBIC_IMG : constant unsigned := 1000015000; VK_FILTER_CUBIC_EXT : constant unsigned := 1000015000; VK_FILTER_BEGIN_RANGE : constant unsigned := 0; VK_FILTER_END_RANGE : constant unsigned := 1; VK_FILTER_RANGE_SIZE : constant unsigned := 2; VK_FILTER_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1306 subtype VkSamplerMipmapMode is unsigned; VK_SAMPLER_MIPMAP_MODE_NEAREST : constant unsigned := 0; VK_SAMPLER_MIPMAP_MODE_LINEAR : constant unsigned := 1; VK_SAMPLER_MIPMAP_MODE_BEGIN_RANGE : constant unsigned := 0; VK_SAMPLER_MIPMAP_MODE_END_RANGE : constant unsigned := 1; VK_SAMPLER_MIPMAP_MODE_RANGE_SIZE : constant unsigned := 2; VK_SAMPLER_MIPMAP_MODE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1317 subtype VkSamplerAddressMode is unsigned; VK_SAMPLER_ADDRESS_MODE_REPEAT : constant unsigned := 0; VK_SAMPLER_ADDRESS_MODE_MIRRORED_REPEAT : constant unsigned := 1; VK_SAMPLER_ADDRESS_MODE_CLAMP_TO_EDGE : constant unsigned := 2; VK_SAMPLER_ADDRESS_MODE_CLAMP_TO_BORDER : constant unsigned := 3; VK_SAMPLER_ADDRESS_MODE_MIRROR_CLAMP_TO_EDGE : constant unsigned := 4; VK_SAMPLER_ADDRESS_MODE_MIRROR_CLAMP_TO_EDGE_KHR : constant unsigned := 4; VK_SAMPLER_ADDRESS_MODE_BEGIN_RANGE : constant unsigned := 0; VK_SAMPLER_ADDRESS_MODE_END_RANGE : constant unsigned := 3; VK_SAMPLER_ADDRESS_MODE_RANGE_SIZE : constant unsigned := 4; VK_SAMPLER_ADDRESS_MODE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1326 subtype VkBorderColor is unsigned; VK_BORDER_COLOR_FLOAT_TRANSPARENT_BLACK : constant unsigned := 0; VK_BORDER_COLOR_INT_TRANSPARENT_BLACK : constant unsigned := 1; VK_BORDER_COLOR_FLOAT_OPAQUE_BLACK : constant unsigned := 2; VK_BORDER_COLOR_INT_OPAQUE_BLACK : constant unsigned := 3; VK_BORDER_COLOR_FLOAT_OPAQUE_WHITE : constant unsigned := 4; VK_BORDER_COLOR_INT_OPAQUE_WHITE : constant unsigned := 5; VK_BORDER_COLOR_BEGIN_RANGE : constant unsigned := 0; VK_BORDER_COLOR_END_RANGE : constant unsigned := 5; VK_BORDER_COLOR_RANGE_SIZE : constant unsigned := 6; VK_BORDER_COLOR_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1339 subtype VkDescriptorType is unsigned; VK_DESCRIPTOR_TYPE_SAMPLER : constant unsigned := 0; VK_DESCRIPTOR_TYPE_COMBINED_IMAGE_SAMPLER : constant unsigned := 1; VK_DESCRIPTOR_TYPE_SAMPLED_IMAGE : constant unsigned := 2; VK_DESCRIPTOR_TYPE_STORAGE_IMAGE : constant unsigned := 3; VK_DESCRIPTOR_TYPE_UNIFORM_TEXEL_BUFFER : constant unsigned := 4; VK_DESCRIPTOR_TYPE_STORAGE_TEXEL_BUFFER : constant unsigned := 5; VK_DESCRIPTOR_TYPE_UNIFORM_BUFFER : constant unsigned := 6; VK_DESCRIPTOR_TYPE_STORAGE_BUFFER : constant unsigned := 7; VK_DESCRIPTOR_TYPE_UNIFORM_BUFFER_DYNAMIC : constant unsigned := 8; VK_DESCRIPTOR_TYPE_STORAGE_BUFFER_DYNAMIC : constant unsigned := 9; VK_DESCRIPTOR_TYPE_INPUT_ATTACHMENT : constant unsigned := 10; VK_DESCRIPTOR_TYPE_INLINE_UNIFORM_BLOCK_EXT : constant unsigned := 1000138000; VK_DESCRIPTOR_TYPE_ACCELERATION_STRUCTURE_NV : constant unsigned := 1000165000; VK_DESCRIPTOR_TYPE_BEGIN_RANGE : constant unsigned := 0; VK_DESCRIPTOR_TYPE_END_RANGE : constant unsigned := 10; VK_DESCRIPTOR_TYPE_RANGE_SIZE : constant unsigned := 11; VK_DESCRIPTOR_TYPE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1352 subtype VkAttachmentLoadOp is unsigned; VK_ATTACHMENT_LOAD_OP_LOAD : constant unsigned := 0; VK_ATTACHMENT_LOAD_OP_CLEAR : constant unsigned := 1; VK_ATTACHMENT_LOAD_OP_DONT_CARE : constant unsigned := 2; VK_ATTACHMENT_LOAD_OP_BEGIN_RANGE : constant unsigned := 0; VK_ATTACHMENT_LOAD_OP_END_RANGE : constant unsigned := 2; VK_ATTACHMENT_LOAD_OP_RANGE_SIZE : constant unsigned := 3; VK_ATTACHMENT_LOAD_OP_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1372 subtype VkAttachmentStoreOp is unsigned; VK_ATTACHMENT_STORE_OP_STORE : constant unsigned := 0; VK_ATTACHMENT_STORE_OP_DONT_CARE : constant unsigned := 1; VK_ATTACHMENT_STORE_OP_BEGIN_RANGE : constant unsigned := 0; VK_ATTACHMENT_STORE_OP_END_RANGE : constant unsigned := 1; VK_ATTACHMENT_STORE_OP_RANGE_SIZE : constant unsigned := 2; VK_ATTACHMENT_STORE_OP_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1382 subtype VkPipelineBindPoint is unsigned; VK_PIPELINE_BIND_POINT_GRAPHICS : constant unsigned := 0; VK_PIPELINE_BIND_POINT_COMPUTE : constant unsigned := 1; VK_PIPELINE_BIND_POINT_RAY_TRACING_NV : constant unsigned := 1000165000; VK_PIPELINE_BIND_POINT_BEGIN_RANGE : constant unsigned := 0; VK_PIPELINE_BIND_POINT_END_RANGE : constant unsigned := 1; VK_PIPELINE_BIND_POINT_RANGE_SIZE : constant unsigned := 2; VK_PIPELINE_BIND_POINT_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1391 subtype VkCommandBufferLevel is unsigned; VK_COMMAND_BUFFER_LEVEL_PRIMARY : constant unsigned := 0; VK_COMMAND_BUFFER_LEVEL_SECONDARY : constant unsigned := 1; VK_COMMAND_BUFFER_LEVEL_BEGIN_RANGE : constant unsigned := 0; VK_COMMAND_BUFFER_LEVEL_END_RANGE : constant unsigned := 1; VK_COMMAND_BUFFER_LEVEL_RANGE_SIZE : constant unsigned := 2; VK_COMMAND_BUFFER_LEVEL_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1401 subtype VkIndexType is unsigned; VK_INDEX_TYPE_UINT16 : constant unsigned := 0; VK_INDEX_TYPE_UINT32 : constant unsigned := 1; VK_INDEX_TYPE_NONE_NV : constant unsigned := 1000165000; VK_INDEX_TYPE_UINT8_EXT : constant unsigned := 1000265000; VK_INDEX_TYPE_BEGIN_RANGE : constant unsigned := 0; VK_INDEX_TYPE_END_RANGE : constant unsigned := 1; VK_INDEX_TYPE_RANGE_SIZE : constant unsigned := 2; VK_INDEX_TYPE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1410 subtype VkSubpassContents is unsigned; VK_SUBPASS_CONTENTS_INLINE : constant unsigned := 0; VK_SUBPASS_CONTENTS_SECONDARY_COMMAND_BUFFERS : constant unsigned := 1; VK_SUBPASS_CONTENTS_BEGIN_RANGE : constant unsigned := 0; VK_SUBPASS_CONTENTS_END_RANGE : constant unsigned := 1; VK_SUBPASS_CONTENTS_RANGE_SIZE : constant unsigned := 2; VK_SUBPASS_CONTENTS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1421 subtype VkObjectType is unsigned; VK_OBJECT_TYPE_UNKNOWN : constant unsigned := 0; VK_OBJECT_TYPE_INSTANCE : constant unsigned := 1; VK_OBJECT_TYPE_PHYSICAL_DEVICE : constant unsigned := 2; VK_OBJECT_TYPE_DEVICE : constant unsigned := 3; VK_OBJECT_TYPE_QUEUE : constant unsigned := 4; VK_OBJECT_TYPE_SEMAPHORE : constant unsigned := 5; VK_OBJECT_TYPE_COMMAND_BUFFER : constant unsigned := 6; VK_OBJECT_TYPE_FENCE : constant unsigned := 7; VK_OBJECT_TYPE_DEVICE_MEMORY : constant unsigned := 8; VK_OBJECT_TYPE_BUFFER : constant unsigned := 9; VK_OBJECT_TYPE_IMAGE : constant unsigned := 10; VK_OBJECT_TYPE_EVENT : constant unsigned := 11; VK_OBJECT_TYPE_QUERY_POOL : constant unsigned := 12; VK_OBJECT_TYPE_BUFFER_VIEW : constant unsigned := 13; VK_OBJECT_TYPE_IMAGE_VIEW : constant unsigned := 14; VK_OBJECT_TYPE_SHADER_MODULE : constant unsigned := 15; VK_OBJECT_TYPE_PIPELINE_CACHE : constant unsigned := 16; VK_OBJECT_TYPE_PIPELINE_LAYOUT : constant unsigned := 17; VK_OBJECT_TYPE_RENDER_PASS : constant unsigned := 18; VK_OBJECT_TYPE_PIPELINE : constant unsigned := 19; VK_OBJECT_TYPE_DESCRIPTOR_SET_LAYOUT : constant unsigned := 20; VK_OBJECT_TYPE_SAMPLER : constant unsigned := 21; VK_OBJECT_TYPE_DESCRIPTOR_POOL : constant unsigned := 22; VK_OBJECT_TYPE_DESCRIPTOR_SET : constant unsigned := 23; VK_OBJECT_TYPE_FRAMEBUFFER : constant unsigned := 24; VK_OBJECT_TYPE_COMMAND_POOL : constant unsigned := 25; VK_OBJECT_TYPE_SAMPLER_YCBCR_CONVERSION : constant unsigned := 1000156000; VK_OBJECT_TYPE_DESCRIPTOR_UPDATE_TEMPLATE : constant unsigned := 1000085000; VK_OBJECT_TYPE_SURFACE_KHR : constant unsigned := 1000000000; VK_OBJECT_TYPE_SWAPCHAIN_KHR : constant unsigned := 1000001000; VK_OBJECT_TYPE_DISPLAY_KHR : constant unsigned := 1000002000; VK_OBJECT_TYPE_DISPLAY_MODE_KHR : constant unsigned := 1000002001; VK_OBJECT_TYPE_DEBUG_REPORT_CALLBACK_EXT : constant unsigned := 1000011000; VK_OBJECT_TYPE_OBJECT_TABLE_NVX : constant unsigned := 1000086000; VK_OBJECT_TYPE_INDIRECT_COMMANDS_LAYOUT_NVX : constant unsigned := 1000086001; VK_OBJECT_TYPE_DEBUG_UTILS_MESSENGER_EXT : constant unsigned := 1000128000; VK_OBJECT_TYPE_VALIDATION_CACHE_EXT : constant unsigned := 1000160000; VK_OBJECT_TYPE_ACCELERATION_STRUCTURE_NV : constant unsigned := 1000165000; VK_OBJECT_TYPE_PERFORMANCE_CONFIGURATION_INTEL : constant unsigned := 1000210000; VK_OBJECT_TYPE_DESCRIPTOR_UPDATE_TEMPLATE_KHR : constant unsigned := 1000085000; VK_OBJECT_TYPE_SAMPLER_YCBCR_CONVERSION_KHR : constant unsigned := 1000156000; VK_OBJECT_TYPE_BEGIN_RANGE : constant unsigned := 0; VK_OBJECT_TYPE_END_RANGE : constant unsigned := 25; VK_OBJECT_TYPE_RANGE_SIZE : constant unsigned := 26; VK_OBJECT_TYPE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1430 subtype VkVendorId is unsigned; VK_VENDOR_ID_VIV : constant unsigned := 65537; VK_VENDOR_ID_VSI : constant unsigned := 65538; VK_VENDOR_ID_KAZAN : constant unsigned := 65539; VK_VENDOR_ID_BEGIN_RANGE : constant unsigned := 65537; VK_VENDOR_ID_END_RANGE : constant unsigned := 65539; VK_VENDOR_ID_RANGE_SIZE : constant unsigned := 3; VK_VENDOR_ID_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1478 subtype VkInstanceCreateFlags is VkFlags; -- vulkan_core.h:1487 subtype VkFormatFeatureFlagBits is unsigned; VK_FORMAT_FEATURE_SAMPLED_IMAGE_BIT : constant unsigned := 1; VK_FORMAT_FEATURE_STORAGE_IMAGE_BIT : constant unsigned := 2; VK_FORMAT_FEATURE_STORAGE_IMAGE_ATOMIC_BIT : constant unsigned := 4; VK_FORMAT_FEATURE_UNIFORM_TEXEL_BUFFER_BIT : constant unsigned := 8; VK_FORMAT_FEATURE_STORAGE_TEXEL_BUFFER_BIT : constant unsigned := 16; VK_FORMAT_FEATURE_STORAGE_TEXEL_BUFFER_ATOMIC_BIT : constant unsigned := 32; VK_FORMAT_FEATURE_VERTEX_BUFFER_BIT : constant unsigned := 64; VK_FORMAT_FEATURE_COLOR_ATTACHMENT_BIT : constant unsigned := 128; VK_FORMAT_FEATURE_COLOR_ATTACHMENT_BLEND_BIT : constant unsigned := 256; VK_FORMAT_FEATURE_DEPTH_STENCIL_ATTACHMENT_BIT : constant unsigned := 512; VK_FORMAT_FEATURE_BLIT_SRC_BIT : constant unsigned := 1024; VK_FORMAT_FEATURE_BLIT_DST_BIT : constant unsigned := 2048; VK_FORMAT_FEATURE_SAMPLED_IMAGE_FILTER_LINEAR_BIT : constant unsigned := 4096; VK_FORMAT_FEATURE_TRANSFER_SRC_BIT : constant unsigned := 16384; VK_FORMAT_FEATURE_TRANSFER_DST_BIT : constant unsigned := 32768; VK_FORMAT_FEATURE_MIDPOINT_CHROMA_SAMPLES_BIT : constant unsigned := 131072; VK_FORMAT_FEATURE_SAMPLED_IMAGE_YCBCR_CONVERSION_LINEAR_FILTER_BIT : constant unsigned := 262144; VK_FORMAT_FEATURE_SAMPLED_IMAGE_YCBCR_CONVERSION_SEPARATE_RECONSTRUCTION_FILTER_BIT : constant unsigned := 524288; VK_FORMAT_FEATURE_SAMPLED_IMAGE_YCBCR_CONVERSION_CHROMA_RECONSTRUCTION_EXPLICIT_BIT : constant unsigned := 1048576; VK_FORMAT_FEATURE_SAMPLED_IMAGE_YCBCR_CONVERSION_CHROMA_RECONSTRUCTION_EXPLICIT_FORCEABLE_BIT : constant unsigned := 2097152; VK_FORMAT_FEATURE_DISJOINT_BIT : constant unsigned := 4194304; VK_FORMAT_FEATURE_COSITED_CHROMA_SAMPLES_BIT : constant unsigned := 8388608; VK_FORMAT_FEATURE_SAMPLED_IMAGE_FILTER_MINMAX_BIT : constant unsigned := 65536; VK_FORMAT_FEATURE_SAMPLED_IMAGE_FILTER_CUBIC_BIT_IMG : constant unsigned := 8192; VK_FORMAT_FEATURE_FRAGMENT_DENSITY_MAP_BIT_EXT : constant unsigned := 16777216; VK_FORMAT_FEATURE_TRANSFER_SRC_BIT_KHR : constant unsigned := 16384; VK_FORMAT_FEATURE_TRANSFER_DST_BIT_KHR : constant unsigned := 32768; VK_FORMAT_FEATURE_SAMPLED_IMAGE_FILTER_MINMAX_BIT_EXT : constant unsigned := 65536; VK_FORMAT_FEATURE_MIDPOINT_CHROMA_SAMPLES_BIT_KHR : constant unsigned := 131072; VK_FORMAT_FEATURE_SAMPLED_IMAGE_YCBCR_CONVERSION_LINEAR_FILTER_BIT_KHR : constant unsigned := 262144; VK_FORMAT_FEATURE_SAMPLED_IMAGE_YCBCR_CONVERSION_SEPARATE_RECONSTRUCTION_FILTER_BIT_KHR : constant unsigned := 524288; VK_FORMAT_FEATURE_SAMPLED_IMAGE_YCBCR_CONVERSION_CHROMA_RECONSTRUCTION_EXPLICIT_BIT_KHR : constant unsigned := 1048576; VK_FORMAT_FEATURE_SAMPLED_IMAGE_YCBCR_CONVERSION_CHROMA_RECONSTRUCTION_EXPLICIT_FORCEABLE_BIT_KHR : constant unsigned := 2097152; VK_FORMAT_FEATURE_DISJOINT_BIT_KHR : constant unsigned := 4194304; VK_FORMAT_FEATURE_COSITED_CHROMA_SAMPLES_BIT_KHR : constant unsigned := 8388608; VK_FORMAT_FEATURE_SAMPLED_IMAGE_FILTER_CUBIC_BIT_EXT : constant unsigned := 8192; VK_FORMAT_FEATURE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1489 subtype VkFormatFeatureFlags is VkFlags; -- vulkan_core.h:1528 subtype VkImageUsageFlagBits is unsigned; VK_IMAGE_USAGE_TRANSFER_SRC_BIT : constant unsigned := 1; VK_IMAGE_USAGE_TRANSFER_DST_BIT : constant unsigned := 2; VK_IMAGE_USAGE_SAMPLED_BIT : constant unsigned := 4; VK_IMAGE_USAGE_STORAGE_BIT : constant unsigned := 8; VK_IMAGE_USAGE_COLOR_ATTACHMENT_BIT : constant unsigned := 16; VK_IMAGE_USAGE_DEPTH_STENCIL_ATTACHMENT_BIT : constant unsigned := 32; VK_IMAGE_USAGE_TRANSIENT_ATTACHMENT_BIT : constant unsigned := 64; VK_IMAGE_USAGE_INPUT_ATTACHMENT_BIT : constant unsigned := 128; VK_IMAGE_USAGE_SHADING_RATE_IMAGE_BIT_NV : constant unsigned := 256; VK_IMAGE_USAGE_FRAGMENT_DENSITY_MAP_BIT_EXT : constant unsigned := 512; VK_IMAGE_USAGE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1530 subtype VkImageUsageFlags is VkFlags; -- vulkan_core.h:1543 subtype VkImageCreateFlagBits is unsigned; VK_IMAGE_CREATE_SPARSE_BINDING_BIT : constant unsigned := 1; VK_IMAGE_CREATE_SPARSE_RESIDENCY_BIT : constant unsigned := 2; VK_IMAGE_CREATE_SPARSE_ALIASED_BIT : constant unsigned := 4; VK_IMAGE_CREATE_MUTABLE_FORMAT_BIT : constant unsigned := 8; VK_IMAGE_CREATE_CUBE_COMPATIBLE_BIT : constant unsigned := 16; VK_IMAGE_CREATE_ALIAS_BIT : constant unsigned := 1024; VK_IMAGE_CREATE_SPLIT_INSTANCE_BIND_REGIONS_BIT : constant unsigned := 64; VK_IMAGE_CREATE_2D_ARRAY_COMPATIBLE_BIT : constant unsigned := 32; VK_IMAGE_CREATE_BLOCK_TEXEL_VIEW_COMPATIBLE_BIT : constant unsigned := 128; VK_IMAGE_CREATE_EXTENDED_USAGE_BIT : constant unsigned := 256; VK_IMAGE_CREATE_PROTECTED_BIT : constant unsigned := 2048; VK_IMAGE_CREATE_DISJOINT_BIT : constant unsigned := 512; VK_IMAGE_CREATE_CORNER_SAMPLED_BIT_NV : constant unsigned := 8192; VK_IMAGE_CREATE_SAMPLE_LOCATIONS_COMPATIBLE_DEPTH_BIT_EXT : constant unsigned := 4096; VK_IMAGE_CREATE_SUBSAMPLED_BIT_EXT : constant unsigned := 16384; VK_IMAGE_CREATE_SPLIT_INSTANCE_BIND_REGIONS_BIT_KHR : constant unsigned := 64; VK_IMAGE_CREATE_2D_ARRAY_COMPATIBLE_BIT_KHR : constant unsigned := 32; VK_IMAGE_CREATE_BLOCK_TEXEL_VIEW_COMPATIBLE_BIT_KHR : constant unsigned := 128; VK_IMAGE_CREATE_EXTENDED_USAGE_BIT_KHR : constant unsigned := 256; VK_IMAGE_CREATE_DISJOINT_BIT_KHR : constant unsigned := 512; VK_IMAGE_CREATE_ALIAS_BIT_KHR : constant unsigned := 1024; VK_IMAGE_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1545 subtype VkImageCreateFlags is VkFlags; -- vulkan_core.h:1569 subtype VkSampleCountFlagBits is unsigned; VK_SAMPLE_COUNT_1_BIT : constant unsigned := 1; VK_SAMPLE_COUNT_2_BIT : constant unsigned := 2; VK_SAMPLE_COUNT_4_BIT : constant unsigned := 4; VK_SAMPLE_COUNT_8_BIT : constant unsigned := 8; VK_SAMPLE_COUNT_16_BIT : constant unsigned := 16; VK_SAMPLE_COUNT_32_BIT : constant unsigned := 32; VK_SAMPLE_COUNT_64_BIT : constant unsigned := 64; VK_SAMPLE_COUNT_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1571 subtype VkSampleCountFlags is VkFlags; -- vulkan_core.h:1581 subtype VkQueueFlagBits is unsigned; VK_QUEUE_GRAPHICS_BIT : constant unsigned := 1; VK_QUEUE_COMPUTE_BIT : constant unsigned := 2; VK_QUEUE_TRANSFER_BIT : constant unsigned := 4; VK_QUEUE_SPARSE_BINDING_BIT : constant unsigned := 8; VK_QUEUE_PROTECTED_BIT : constant unsigned := 16; VK_QUEUE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1583 subtype VkQueueFlags is VkFlags; -- vulkan_core.h:1591 subtype VkMemoryPropertyFlagBits is unsigned; VK_MEMORY_PROPERTY_DEVICE_LOCAL_BIT : constant unsigned := 1; VK_MEMORY_PROPERTY_HOST_VISIBLE_BIT : constant unsigned := 2; VK_MEMORY_PROPERTY_HOST_COHERENT_BIT : constant unsigned := 4; VK_MEMORY_PROPERTY_HOST_CACHED_BIT : constant unsigned := 8; VK_MEMORY_PROPERTY_LAZILY_ALLOCATED_BIT : constant unsigned := 16; VK_MEMORY_PROPERTY_PROTECTED_BIT : constant unsigned := 32; VK_MEMORY_PROPERTY_DEVICE_COHERENT_BIT_AMD : constant unsigned := 64; VK_MEMORY_PROPERTY_DEVICE_UNCACHED_BIT_AMD : constant unsigned := 128; VK_MEMORY_PROPERTY_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1593 subtype VkMemoryPropertyFlags is VkFlags; -- vulkan_core.h:1604 subtype VkMemoryHeapFlagBits is unsigned; VK_MEMORY_HEAP_DEVICE_LOCAL_BIT : constant unsigned := 1; VK_MEMORY_HEAP_MULTI_INSTANCE_BIT : constant unsigned := 2; VK_MEMORY_HEAP_MULTI_INSTANCE_BIT_KHR : constant unsigned := 2; VK_MEMORY_HEAP_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1606 subtype VkMemoryHeapFlags is VkFlags; -- vulkan_core.h:1612 subtype VkDeviceCreateFlags is VkFlags; -- vulkan_core.h:1613 subtype VkDeviceQueueCreateFlagBits is unsigned; VK_DEVICE_QUEUE_CREATE_PROTECTED_BIT : constant unsigned := 1; VK_DEVICE_QUEUE_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1615 subtype VkDeviceQueueCreateFlags is VkFlags; -- vulkan_core.h:1619 subtype VkPipelineStageFlagBits is unsigned; VK_PIPELINE_STAGE_TOP_OF_PIPE_BIT : constant unsigned := 1; VK_PIPELINE_STAGE_DRAW_INDIRECT_BIT : constant unsigned := 2; VK_PIPELINE_STAGE_VERTEX_INPUT_BIT : constant unsigned := 4; VK_PIPELINE_STAGE_VERTEX_SHADER_BIT : constant unsigned := 8; VK_PIPELINE_STAGE_TESSELLATION_CONTROL_SHADER_BIT : constant unsigned := 16; VK_PIPELINE_STAGE_TESSELLATION_EVALUATION_SHADER_BIT : constant unsigned := 32; VK_PIPELINE_STAGE_GEOMETRY_SHADER_BIT : constant unsigned := 64; VK_PIPELINE_STAGE_FRAGMENT_SHADER_BIT : constant unsigned := 128; VK_PIPELINE_STAGE_EARLY_FRAGMENT_TESTS_BIT : constant unsigned := 256; VK_PIPELINE_STAGE_LATE_FRAGMENT_TESTS_BIT : constant unsigned := 512; VK_PIPELINE_STAGE_COLOR_ATTACHMENT_OUTPUT_BIT : constant unsigned := 1024; VK_PIPELINE_STAGE_COMPUTE_SHADER_BIT : constant unsigned := 2048; VK_PIPELINE_STAGE_TRANSFER_BIT : constant unsigned := 4096; VK_PIPELINE_STAGE_BOTTOM_OF_PIPE_BIT : constant unsigned := 8192; VK_PIPELINE_STAGE_HOST_BIT : constant unsigned := 16384; VK_PIPELINE_STAGE_ALL_GRAPHICS_BIT : constant unsigned := 32768; VK_PIPELINE_STAGE_ALL_COMMANDS_BIT : constant unsigned := 65536; VK_PIPELINE_STAGE_TRANSFORM_FEEDBACK_BIT_EXT : constant unsigned := 16777216; VK_PIPELINE_STAGE_CONDITIONAL_RENDERING_BIT_EXT : constant unsigned := 262144; VK_PIPELINE_STAGE_COMMAND_PROCESS_BIT_NVX : constant unsigned := 131072; VK_PIPELINE_STAGE_SHADING_RATE_IMAGE_BIT_NV : constant unsigned := 4194304; VK_PIPELINE_STAGE_RAY_TRACING_SHADER_BIT_NV : constant unsigned := 2097152; VK_PIPELINE_STAGE_ACCELERATION_STRUCTURE_BUILD_BIT_NV : constant unsigned := 33554432; VK_PIPELINE_STAGE_TASK_SHADER_BIT_NV : constant unsigned := 524288; VK_PIPELINE_STAGE_MESH_SHADER_BIT_NV : constant unsigned := 1048576; VK_PIPELINE_STAGE_FRAGMENT_DENSITY_PROCESS_BIT_EXT : constant unsigned := 8388608; VK_PIPELINE_STAGE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1621 subtype VkPipelineStageFlags is VkFlags; -- vulkan_core.h:1650 subtype VkMemoryMapFlags is VkFlags; -- vulkan_core.h:1651 subtype VkImageAspectFlagBits is unsigned; VK_IMAGE_ASPECT_COLOR_BIT : constant unsigned := 1; VK_IMAGE_ASPECT_DEPTH_BIT : constant unsigned := 2; VK_IMAGE_ASPECT_STENCIL_BIT : constant unsigned := 4; VK_IMAGE_ASPECT_METADATA_BIT : constant unsigned := 8; VK_IMAGE_ASPECT_PLANE_0_BIT : constant unsigned := 16; VK_IMAGE_ASPECT_PLANE_1_BIT : constant unsigned := 32; VK_IMAGE_ASPECT_PLANE_2_BIT : constant unsigned := 64; VK_IMAGE_ASPECT_MEMORY_PLANE_0_BIT_EXT : constant unsigned := 128; VK_IMAGE_ASPECT_MEMORY_PLANE_1_BIT_EXT : constant unsigned := 256; VK_IMAGE_ASPECT_MEMORY_PLANE_2_BIT_EXT : constant unsigned := 512; VK_IMAGE_ASPECT_MEMORY_PLANE_3_BIT_EXT : constant unsigned := 1024; VK_IMAGE_ASPECT_PLANE_0_BIT_KHR : constant unsigned := 16; VK_IMAGE_ASPECT_PLANE_1_BIT_KHR : constant unsigned := 32; VK_IMAGE_ASPECT_PLANE_2_BIT_KHR : constant unsigned := 64; VK_IMAGE_ASPECT_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1653 subtype VkImageAspectFlags is VkFlags; -- vulkan_core.h:1670 subtype VkSparseImageFormatFlagBits is unsigned; VK_SPARSE_IMAGE_FORMAT_SINGLE_MIPTAIL_BIT : constant unsigned := 1; VK_SPARSE_IMAGE_FORMAT_ALIGNED_MIP_SIZE_BIT : constant unsigned := 2; VK_SPARSE_IMAGE_FORMAT_NONSTANDARD_BLOCK_SIZE_BIT : constant unsigned := 4; VK_SPARSE_IMAGE_FORMAT_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1672 subtype VkSparseImageFormatFlags is VkFlags; -- vulkan_core.h:1678 subtype VkSparseMemoryBindFlagBits is unsigned; VK_SPARSE_MEMORY_BIND_METADATA_BIT : constant unsigned := 1; VK_SPARSE_MEMORY_BIND_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1680 subtype VkSparseMemoryBindFlags is VkFlags; -- vulkan_core.h:1684 subtype VkFenceCreateFlagBits is unsigned; VK_FENCE_CREATE_SIGNALED_BIT : constant unsigned := 1; VK_FENCE_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1686 subtype VkFenceCreateFlags is VkFlags; -- vulkan_core.h:1690 subtype VkSemaphoreCreateFlags is VkFlags; -- vulkan_core.h:1691 subtype VkEventCreateFlags is VkFlags; -- vulkan_core.h:1692 subtype VkQueryPoolCreateFlags is VkFlags; -- vulkan_core.h:1693 subtype VkQueryPipelineStatisticFlagBits is unsigned; VK_QUERY_PIPELINE_STATISTIC_INPUT_ASSEMBLY_VERTICES_BIT : constant unsigned := 1; VK_QUERY_PIPELINE_STATISTIC_INPUT_ASSEMBLY_PRIMITIVES_BIT : constant unsigned := 2; VK_QUERY_PIPELINE_STATISTIC_VERTEX_SHADER_INVOCATIONS_BIT : constant unsigned := 4; VK_QUERY_PIPELINE_STATISTIC_GEOMETRY_SHADER_INVOCATIONS_BIT : constant unsigned := 8; VK_QUERY_PIPELINE_STATISTIC_GEOMETRY_SHADER_PRIMITIVES_BIT : constant unsigned := 16; VK_QUERY_PIPELINE_STATISTIC_CLIPPING_INVOCATIONS_BIT : constant unsigned := 32; VK_QUERY_PIPELINE_STATISTIC_CLIPPING_PRIMITIVES_BIT : constant unsigned := 64; VK_QUERY_PIPELINE_STATISTIC_FRAGMENT_SHADER_INVOCATIONS_BIT : constant unsigned := 128; VK_QUERY_PIPELINE_STATISTIC_TESSELLATION_CONTROL_SHADER_PATCHES_BIT : constant unsigned := 256; VK_QUERY_PIPELINE_STATISTIC_TESSELLATION_EVALUATION_SHADER_INVOCATIONS_BIT : constant unsigned := 512; VK_QUERY_PIPELINE_STATISTIC_COMPUTE_SHADER_INVOCATIONS_BIT : constant unsigned := 1024; VK_QUERY_PIPELINE_STATISTIC_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1695 subtype VkQueryPipelineStatisticFlags is VkFlags; -- vulkan_core.h:1709 subtype VkQueryResultFlagBits is unsigned; VK_QUERY_RESULT_64_BIT : constant unsigned := 1; VK_QUERY_RESULT_WAIT_BIT : constant unsigned := 2; VK_QUERY_RESULT_WITH_AVAILABILITY_BIT : constant unsigned := 4; VK_QUERY_RESULT_PARTIAL_BIT : constant unsigned := 8; VK_QUERY_RESULT_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1711 subtype VkQueryResultFlags is VkFlags; -- vulkan_core.h:1718 subtype VkBufferCreateFlagBits is unsigned; VK_BUFFER_CREATE_SPARSE_BINDING_BIT : constant unsigned := 1; VK_BUFFER_CREATE_SPARSE_RESIDENCY_BIT : constant unsigned := 2; VK_BUFFER_CREATE_SPARSE_ALIASED_BIT : constant unsigned := 4; VK_BUFFER_CREATE_PROTECTED_BIT : constant unsigned := 8; VK_BUFFER_CREATE_DEVICE_ADDRESS_CAPTURE_REPLAY_BIT : constant unsigned := 16; VK_BUFFER_CREATE_DEVICE_ADDRESS_CAPTURE_REPLAY_BIT_EXT : constant unsigned := 16; VK_BUFFER_CREATE_DEVICE_ADDRESS_CAPTURE_REPLAY_BIT_KHR : constant unsigned := 16; VK_BUFFER_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1720 subtype VkBufferCreateFlags is VkFlags; -- vulkan_core.h:1730 subtype VkBufferUsageFlagBits is unsigned; VK_BUFFER_USAGE_TRANSFER_SRC_BIT : constant unsigned := 1; VK_BUFFER_USAGE_TRANSFER_DST_BIT : constant unsigned := 2; VK_BUFFER_USAGE_UNIFORM_TEXEL_BUFFER_BIT : constant unsigned := 4; VK_BUFFER_USAGE_STORAGE_TEXEL_BUFFER_BIT : constant unsigned := 8; VK_BUFFER_USAGE_UNIFORM_BUFFER_BIT : constant unsigned := 16; VK_BUFFER_USAGE_STORAGE_BUFFER_BIT : constant unsigned := 32; VK_BUFFER_USAGE_INDEX_BUFFER_BIT : constant unsigned := 64; VK_BUFFER_USAGE_VERTEX_BUFFER_BIT : constant unsigned := 128; VK_BUFFER_USAGE_INDIRECT_BUFFER_BIT : constant unsigned := 256; VK_BUFFER_USAGE_SHADER_DEVICE_ADDRESS_BIT : constant unsigned := 131072; VK_BUFFER_USAGE_TRANSFORM_FEEDBACK_BUFFER_BIT_EXT : constant unsigned := 2048; VK_BUFFER_USAGE_TRANSFORM_FEEDBACK_COUNTER_BUFFER_BIT_EXT : constant unsigned := 4096; VK_BUFFER_USAGE_CONDITIONAL_RENDERING_BIT_EXT : constant unsigned := 512; VK_BUFFER_USAGE_RAY_TRACING_BIT_NV : constant unsigned := 1024; VK_BUFFER_USAGE_SHADER_DEVICE_ADDRESS_BIT_EXT : constant unsigned := 131072; VK_BUFFER_USAGE_SHADER_DEVICE_ADDRESS_BIT_KHR : constant unsigned := 131072; VK_BUFFER_USAGE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1732 subtype VkBufferUsageFlags is VkFlags; -- vulkan_core.h:1751 subtype VkBufferViewCreateFlags is VkFlags; -- vulkan_core.h:1752 subtype VkImageViewCreateFlagBits is unsigned; VK_IMAGE_VIEW_CREATE_FRAGMENT_DENSITY_MAP_DYNAMIC_BIT_EXT : constant unsigned := 1; VK_IMAGE_VIEW_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1754 subtype VkImageViewCreateFlags is VkFlags; -- vulkan_core.h:1758 subtype VkShaderModuleCreateFlagBits is unsigned; VK_SHADER_MODULE_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1760 subtype VkShaderModuleCreateFlags is VkFlags; -- vulkan_core.h:1763 subtype VkPipelineCacheCreateFlags is VkFlags; -- vulkan_core.h:1764 subtype VkPipelineCreateFlagBits is unsigned; VK_PIPELINE_CREATE_DISABLE_OPTIMIZATION_BIT : constant unsigned := 1; VK_PIPELINE_CREATE_ALLOW_DERIVATIVES_BIT : constant unsigned := 2; VK_PIPELINE_CREATE_DERIVATIVE_BIT : constant unsigned := 4; VK_PIPELINE_CREATE_VIEW_INDEX_FROM_DEVICE_INDEX_BIT : constant unsigned := 8; VK_PIPELINE_CREATE_DISPATCH_BASE_BIT : constant unsigned := 16; VK_PIPELINE_CREATE_DEFER_COMPILE_BIT_NV : constant unsigned := 32; VK_PIPELINE_CREATE_CAPTURE_STATISTICS_BIT_KHR : constant unsigned := 64; VK_PIPELINE_CREATE_CAPTURE_INTERNAL_REPRESENTATIONS_BIT_KHR : constant unsigned := 128; VK_PIPELINE_CREATE_DISPATCH_BASE : constant unsigned := 16; VK_PIPELINE_CREATE_VIEW_INDEX_FROM_DEVICE_INDEX_BIT_KHR : constant unsigned := 8; VK_PIPELINE_CREATE_DISPATCH_BASE_KHR : constant unsigned := 16; VK_PIPELINE_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1766 subtype VkPipelineCreateFlags is VkFlags; -- vulkan_core.h:1780 subtype VkPipelineShaderStageCreateFlagBits is unsigned; VK_PIPELINE_SHADER_STAGE_CREATE_ALLOW_VARYING_SUBGROUP_SIZE_BIT_EXT : constant unsigned := 1; VK_PIPELINE_SHADER_STAGE_CREATE_REQUIRE_FULL_SUBGROUPS_BIT_EXT : constant unsigned := 2; VK_PIPELINE_SHADER_STAGE_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1782 subtype VkPipelineShaderStageCreateFlags is VkFlags; -- vulkan_core.h:1787 subtype VkShaderStageFlagBits is unsigned; VK_SHADER_STAGE_VERTEX_BIT : constant unsigned := 1; VK_SHADER_STAGE_TESSELLATION_CONTROL_BIT : constant unsigned := 2; VK_SHADER_STAGE_TESSELLATION_EVALUATION_BIT : constant unsigned := 4; VK_SHADER_STAGE_GEOMETRY_BIT : constant unsigned := 8; VK_SHADER_STAGE_FRAGMENT_BIT : constant unsigned := 16; VK_SHADER_STAGE_COMPUTE_BIT : constant unsigned := 32; VK_SHADER_STAGE_ALL_GRAPHICS : constant unsigned := 31; VK_SHADER_STAGE_ALL : constant unsigned := 2147483647; VK_SHADER_STAGE_RAYGEN_BIT_NV : constant unsigned := 256; VK_SHADER_STAGE_ANY_HIT_BIT_NV : constant unsigned := 512; VK_SHADER_STAGE_CLOSEST_HIT_BIT_NV : constant unsigned := 1024; VK_SHADER_STAGE_MISS_BIT_NV : constant unsigned := 2048; VK_SHADER_STAGE_INTERSECTION_BIT_NV : constant unsigned := 4096; VK_SHADER_STAGE_CALLABLE_BIT_NV : constant unsigned := 8192; VK_SHADER_STAGE_TASK_BIT_NV : constant unsigned := 64; VK_SHADER_STAGE_MESH_BIT_NV : constant unsigned := 128; VK_SHADER_STAGE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1789 subtype VkPipelineVertexInputStateCreateFlags is VkFlags; -- vulkan_core.h:1808 subtype VkPipelineInputAssemblyStateCreateFlags is VkFlags; -- vulkan_core.h:1809 subtype VkPipelineTessellationStateCreateFlags is VkFlags; -- vulkan_core.h:1810 subtype VkPipelineViewportStateCreateFlags is VkFlags; -- vulkan_core.h:1811 subtype VkPipelineRasterizationStateCreateFlags is VkFlags; -- vulkan_core.h:1812 subtype VkCullModeFlagBits is unsigned; VK_CULL_MODE_NONE : constant unsigned := 0; VK_CULL_MODE_FRONT_BIT : constant unsigned := 1; VK_CULL_MODE_BACK_BIT : constant unsigned := 2; VK_CULL_MODE_FRONT_AND_BACK : constant unsigned := 3; VK_CULL_MODE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1814 subtype VkCullModeFlags is VkFlags; -- vulkan_core.h:1821 subtype VkPipelineMultisampleStateCreateFlags is VkFlags; -- vulkan_core.h:1822 subtype VkPipelineDepthStencilStateCreateFlags is VkFlags; -- vulkan_core.h:1823 subtype VkPipelineColorBlendStateCreateFlags is VkFlags; -- vulkan_core.h:1824 subtype VkColorComponentFlagBits is unsigned; VK_COLOR_COMPONENT_R_BIT : constant unsigned := 1; VK_COLOR_COMPONENT_G_BIT : constant unsigned := 2; VK_COLOR_COMPONENT_B_BIT : constant unsigned := 4; VK_COLOR_COMPONENT_A_BIT : constant unsigned := 8; VK_COLOR_COMPONENT_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1826 subtype VkColorComponentFlags is VkFlags; -- vulkan_core.h:1833 subtype VkPipelineDynamicStateCreateFlags is VkFlags; -- vulkan_core.h:1834 subtype VkPipelineLayoutCreateFlags is VkFlags; -- vulkan_core.h:1835 subtype VkShaderStageFlags is VkFlags; -- vulkan_core.h:1836 subtype VkSamplerCreateFlagBits is unsigned; VK_SAMPLER_CREATE_SUBSAMPLED_BIT_EXT : constant unsigned := 1; VK_SAMPLER_CREATE_SUBSAMPLED_COARSE_RECONSTRUCTION_BIT_EXT : constant unsigned := 2; VK_SAMPLER_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1838 subtype VkSamplerCreateFlags is VkFlags; -- vulkan_core.h:1843 subtype VkDescriptorSetLayoutCreateFlagBits is unsigned; VK_DESCRIPTOR_SET_LAYOUT_CREATE_UPDATE_AFTER_BIND_POOL_BIT : constant unsigned := 2; VK_DESCRIPTOR_SET_LAYOUT_CREATE_PUSH_DESCRIPTOR_BIT_KHR : constant unsigned := 1; VK_DESCRIPTOR_SET_LAYOUT_CREATE_UPDATE_AFTER_BIND_POOL_BIT_EXT : constant unsigned := 2; VK_DESCRIPTOR_SET_LAYOUT_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1845 subtype VkDescriptorSetLayoutCreateFlags is VkFlags; -- vulkan_core.h:1851 subtype VkDescriptorPoolCreateFlagBits is unsigned; VK_DESCRIPTOR_POOL_CREATE_FREE_DESCRIPTOR_SET_BIT : constant unsigned := 1; VK_DESCRIPTOR_POOL_CREATE_UPDATE_AFTER_BIND_BIT : constant unsigned := 2; VK_DESCRIPTOR_POOL_CREATE_UPDATE_AFTER_BIND_BIT_EXT : constant unsigned := 2; VK_DESCRIPTOR_POOL_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1853 subtype VkDescriptorPoolCreateFlags is VkFlags; -- vulkan_core.h:1859 subtype VkDescriptorPoolResetFlags is VkFlags; -- vulkan_core.h:1860 subtype VkFramebufferCreateFlagBits is unsigned; VK_FRAMEBUFFER_CREATE_IMAGELESS_BIT : constant unsigned := 1; VK_FRAMEBUFFER_CREATE_IMAGELESS_BIT_KHR : constant unsigned := 1; VK_FRAMEBUFFER_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1862 subtype VkFramebufferCreateFlags is VkFlags; -- vulkan_core.h:1867 subtype VkRenderPassCreateFlagBits is unsigned; VK_RENDER_PASS_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1869 subtype VkRenderPassCreateFlags is VkFlags; -- vulkan_core.h:1872 subtype VkAttachmentDescriptionFlagBits is unsigned; VK_ATTACHMENT_DESCRIPTION_MAY_ALIAS_BIT : constant unsigned := 1; VK_ATTACHMENT_DESCRIPTION_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1874 subtype VkAttachmentDescriptionFlags is VkFlags; -- vulkan_core.h:1878 subtype VkSubpassDescriptionFlagBits is unsigned; VK_SUBPASS_DESCRIPTION_PER_VIEW_ATTRIBUTES_BIT_NVX : constant unsigned := 1; VK_SUBPASS_DESCRIPTION_PER_VIEW_POSITION_X_ONLY_BIT_NVX : constant unsigned := 2; VK_SUBPASS_DESCRIPTION_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1880 subtype VkSubpassDescriptionFlags is VkFlags; -- vulkan_core.h:1885 subtype VkAccessFlagBits is unsigned; VK_ACCESS_INDIRECT_COMMAND_READ_BIT : constant unsigned := 1; VK_ACCESS_INDEX_READ_BIT : constant unsigned := 2; VK_ACCESS_VERTEX_ATTRIBUTE_READ_BIT : constant unsigned := 4; VK_ACCESS_UNIFORM_READ_BIT : constant unsigned := 8; VK_ACCESS_INPUT_ATTACHMENT_READ_BIT : constant unsigned := 16; VK_ACCESS_SHADER_READ_BIT : constant unsigned := 32; VK_ACCESS_SHADER_WRITE_BIT : constant unsigned := 64; VK_ACCESS_COLOR_ATTACHMENT_READ_BIT : constant unsigned := 128; VK_ACCESS_COLOR_ATTACHMENT_WRITE_BIT : constant unsigned := 256; VK_ACCESS_DEPTH_STENCIL_ATTACHMENT_READ_BIT : constant unsigned := 512; VK_ACCESS_DEPTH_STENCIL_ATTACHMENT_WRITE_BIT : constant unsigned := 1024; VK_ACCESS_TRANSFER_READ_BIT : constant unsigned := 2048; VK_ACCESS_TRANSFER_WRITE_BIT : constant unsigned := 4096; VK_ACCESS_HOST_READ_BIT : constant unsigned := 8192; VK_ACCESS_HOST_WRITE_BIT : constant unsigned := 16384; VK_ACCESS_MEMORY_READ_BIT : constant unsigned := 32768; VK_ACCESS_MEMORY_WRITE_BIT : constant unsigned := 65536; VK_ACCESS_TRANSFORM_FEEDBACK_WRITE_BIT_EXT : constant unsigned := 33554432; VK_ACCESS_TRANSFORM_FEEDBACK_COUNTER_READ_BIT_EXT : constant unsigned := 67108864; VK_ACCESS_TRANSFORM_FEEDBACK_COUNTER_WRITE_BIT_EXT : constant unsigned := 134217728; VK_ACCESS_CONDITIONAL_RENDERING_READ_BIT_EXT : constant unsigned := 1048576; VK_ACCESS_COMMAND_PROCESS_READ_BIT_NVX : constant unsigned := 131072; VK_ACCESS_COMMAND_PROCESS_WRITE_BIT_NVX : constant unsigned := 262144; VK_ACCESS_COLOR_ATTACHMENT_READ_NONCOHERENT_BIT_EXT : constant unsigned := 524288; VK_ACCESS_SHADING_RATE_IMAGE_READ_BIT_NV : constant unsigned := 8388608; VK_ACCESS_ACCELERATION_STRUCTURE_READ_BIT_NV : constant unsigned := 2097152; VK_ACCESS_ACCELERATION_STRUCTURE_WRITE_BIT_NV : constant unsigned := 4194304; VK_ACCESS_FRAGMENT_DENSITY_MAP_READ_BIT_EXT : constant unsigned := 16777216; VK_ACCESS_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1887 subtype VkAccessFlags is VkFlags; -- vulkan_core.h:1918 subtype VkDependencyFlagBits is unsigned; VK_DEPENDENCY_BY_REGION_BIT : constant unsigned := 1; VK_DEPENDENCY_DEVICE_GROUP_BIT : constant unsigned := 4; VK_DEPENDENCY_VIEW_LOCAL_BIT : constant unsigned := 2; VK_DEPENDENCY_VIEW_LOCAL_BIT_KHR : constant unsigned := 2; VK_DEPENDENCY_DEVICE_GROUP_BIT_KHR : constant unsigned := 4; VK_DEPENDENCY_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1920 subtype VkDependencyFlags is VkFlags; -- vulkan_core.h:1928 subtype VkCommandPoolCreateFlagBits is unsigned; VK_COMMAND_POOL_CREATE_TRANSIENT_BIT : constant unsigned := 1; VK_COMMAND_POOL_CREATE_RESET_COMMAND_BUFFER_BIT : constant unsigned := 2; VK_COMMAND_POOL_CREATE_PROTECTED_BIT : constant unsigned := 4; VK_COMMAND_POOL_CREATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1930 subtype VkCommandPoolCreateFlags is VkFlags; -- vulkan_core.h:1936 subtype VkCommandPoolResetFlagBits is unsigned; VK_COMMAND_POOL_RESET_RELEASE_RESOURCES_BIT : constant unsigned := 1; VK_COMMAND_POOL_RESET_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1938 subtype VkCommandPoolResetFlags is VkFlags; -- vulkan_core.h:1942 subtype VkCommandBufferUsageFlagBits is unsigned; VK_COMMAND_BUFFER_USAGE_ONE_TIME_SUBMIT_BIT : constant unsigned := 1; VK_COMMAND_BUFFER_USAGE_RENDER_PASS_CONTINUE_BIT : constant unsigned := 2; VK_COMMAND_BUFFER_USAGE_SIMULTANEOUS_USE_BIT : constant unsigned := 4; VK_COMMAND_BUFFER_USAGE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1944 subtype VkCommandBufferUsageFlags is VkFlags; -- vulkan_core.h:1950 subtype VkQueryControlFlagBits is unsigned; VK_QUERY_CONTROL_PRECISE_BIT : constant unsigned := 1; VK_QUERY_CONTROL_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1952 subtype VkQueryControlFlags is VkFlags; -- vulkan_core.h:1956 subtype VkCommandBufferResetFlagBits is unsigned; VK_COMMAND_BUFFER_RESET_RELEASE_RESOURCES_BIT : constant unsigned := 1; VK_COMMAND_BUFFER_RESET_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1958 subtype VkCommandBufferResetFlags is VkFlags; -- vulkan_core.h:1962 subtype VkStencilFaceFlagBits is unsigned; VK_STENCIL_FACE_FRONT_BIT : constant unsigned := 1; VK_STENCIL_FACE_BACK_BIT : constant unsigned := 2; VK_STENCIL_FACE_FRONT_AND_BACK : constant unsigned := 3; VK_STENCIL_FRONT_AND_BACK : constant unsigned := 3; VK_STENCIL_FACE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:1964 subtype VkStencilFaceFlags is VkFlags; -- vulkan_core.h:1971 type VkApplicationInfo is record sType : aliased VkStructureType; -- vulkan_core.h:1973 pNext : System.Address; -- vulkan_core.h:1974 pApplicationName : Interfaces.C.Strings.chars_ptr; -- vulkan_core.h:1975 applicationVersion : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:1976 pEngineName : Interfaces.C.Strings.chars_ptr; -- vulkan_core.h:1977 engineVersion : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:1978 apiVersion : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:1979 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:1972 type VkInstanceCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:1983 pNext : System.Address; -- vulkan_core.h:1984 flags : aliased VkInstanceCreateFlags; -- vulkan_core.h:1985 pApplicationInfo : access constant VkApplicationInfo; -- vulkan_core.h:1986 enabledLayerCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:1987 ppEnabledLayerNames : System.Address; -- vulkan_core.h:1988 enabledExtensionCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:1989 ppEnabledExtensionNames : System.Address; -- vulkan_core.h:1990 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:1982 type PFN_vkAllocationFunction is access function (arg1 : System.Address; arg2 : size_t; arg3 : size_t; arg4 : VkSystemAllocationScope) return System.Address with Convention => C; -- vulkan_core.h:1993 type PFN_vkReallocationFunction is access function (arg1 : System.Address; arg2 : System.Address; arg3 : size_t; arg4 : size_t; arg5 : VkSystemAllocationScope) return System.Address with Convention => C; -- vulkan_core.h:1999 type PFN_vkFreeFunction is access procedure (arg1 : System.Address; arg2 : System.Address) with Convention => C; -- vulkan_core.h:2006 type PFN_vkInternalAllocationNotification is access procedure (arg1 : System.Address; arg2 : size_t; arg3 : VkInternalAllocationType; arg4 : VkSystemAllocationScope) with Convention => C; -- vulkan_core.h:2010 type PFN_vkInternalFreeNotification is access procedure (arg1 : System.Address; arg2 : size_t; arg3 : VkInternalAllocationType; arg4 : VkSystemAllocationScope) with Convention => C; -- vulkan_core.h:2016 type VkAllocationCallbacks is record pUserData : System.Address; -- vulkan_core.h:2023 pfnAllocation : PFN_vkAllocationFunction; -- vulkan_core.h:2024 pfnReallocation : PFN_vkReallocationFunction; -- vulkan_core.h:2025 pfnFree : PFN_vkFreeFunction; -- vulkan_core.h:2026 pfnInternalAllocation : PFN_vkInternalAllocationNotification; -- vulkan_core.h:2027 pfnInternalFree : PFN_vkInternalFreeNotification; -- vulkan_core.h:2028 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2022 type VkPhysicalDeviceFeatures is record robustBufferAccess : aliased VkBool32; -- vulkan_core.h:2032 fullDrawIndexUint32 : aliased VkBool32; -- vulkan_core.h:2033 imageCubeArray : aliased VkBool32; -- vulkan_core.h:2034 independentBlend : aliased VkBool32; -- vulkan_core.h:2035 geometryShader : aliased VkBool32; -- vulkan_core.h:2036 tessellationShader : aliased VkBool32; -- vulkan_core.h:2037 sampleRateShading : aliased VkBool32; -- vulkan_core.h:2038 dualSrcBlend : aliased VkBool32; -- vulkan_core.h:2039 logicOp : aliased VkBool32; -- vulkan_core.h:2040 multiDrawIndirect : aliased VkBool32; -- vulkan_core.h:2041 drawIndirectFirstInstance : aliased VkBool32; -- vulkan_core.h:2042 depthClamp : aliased VkBool32; -- vulkan_core.h:2043 depthBiasClamp : aliased VkBool32; -- vulkan_core.h:2044 fillModeNonSolid : aliased VkBool32; -- vulkan_core.h:2045 depthBounds : aliased VkBool32; -- vulkan_core.h:2046 wideLines : aliased VkBool32; -- vulkan_core.h:2047 largePoints : aliased VkBool32; -- vulkan_core.h:2048 alphaToOne : aliased VkBool32; -- vulkan_core.h:2049 multiViewport : aliased VkBool32; -- vulkan_core.h:2050 samplerAnisotropy : aliased VkBool32; -- vulkan_core.h:2051 textureCompressionETC2 : aliased VkBool32; -- vulkan_core.h:2052 textureCompressionASTC_LDR : aliased VkBool32; -- vulkan_core.h:2053 textureCompressionBC : aliased VkBool32; -- vulkan_core.h:2054 occlusionQueryPrecise : aliased VkBool32; -- vulkan_core.h:2055 pipelineStatisticsQuery : aliased VkBool32; -- vulkan_core.h:2056 vertexPipelineStoresAndAtomics : aliased VkBool32; -- vulkan_core.h:2057 fragmentStoresAndAtomics : aliased VkBool32; -- vulkan_core.h:2058 shaderTessellationAndGeometryPointSize : aliased VkBool32; -- vulkan_core.h:2059 shaderImageGatherExtended : aliased VkBool32; -- vulkan_core.h:2060 shaderStorageImageExtendedFormats : aliased VkBool32; -- vulkan_core.h:2061 shaderStorageImageMultisample : aliased VkBool32; -- vulkan_core.h:2062 shaderStorageImageReadWithoutFormat : aliased VkBool32; -- vulkan_core.h:2063 shaderStorageImageWriteWithoutFormat : aliased VkBool32; -- vulkan_core.h:2064 shaderUniformBufferArrayDynamicIndexing : aliased VkBool32; -- vulkan_core.h:2065 shaderSampledImageArrayDynamicIndexing : aliased VkBool32; -- vulkan_core.h:2066 shaderStorageBufferArrayDynamicIndexing : aliased VkBool32; -- vulkan_core.h:2067 shaderStorageImageArrayDynamicIndexing : aliased VkBool32; -- vulkan_core.h:2068 shaderClipDistance : aliased VkBool32; -- vulkan_core.h:2069 shaderCullDistance : aliased VkBool32; -- vulkan_core.h:2070 shaderFloat64 : aliased VkBool32; -- vulkan_core.h:2071 shaderInt64 : aliased VkBool32; -- vulkan_core.h:2072 shaderInt16 : aliased VkBool32; -- vulkan_core.h:2073 shaderResourceResidency : aliased VkBool32; -- vulkan_core.h:2074 shaderResourceMinLod : aliased VkBool32; -- vulkan_core.h:2075 sparseBinding : aliased VkBool32; -- vulkan_core.h:2076 sparseResidencyBuffer : aliased VkBool32; -- vulkan_core.h:2077 sparseResidencyImage2D : aliased VkBool32; -- vulkan_core.h:2078 sparseResidencyImage3D : aliased VkBool32; -- vulkan_core.h:2079 sparseResidency2Samples : aliased VkBool32; -- vulkan_core.h:2080 sparseResidency4Samples : aliased VkBool32; -- vulkan_core.h:2081 sparseResidency8Samples : aliased VkBool32; -- vulkan_core.h:2082 sparseResidency16Samples : aliased VkBool32; -- vulkan_core.h:2083 sparseResidencyAliased : aliased VkBool32; -- vulkan_core.h:2084 variableMultisampleRate : aliased VkBool32; -- vulkan_core.h:2085 inheritedQueries : aliased VkBool32; -- vulkan_core.h:2086 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2031 type VkFormatProperties is record linearTilingFeatures : aliased VkFormatFeatureFlags; -- vulkan_core.h:2090 optimalTilingFeatures : aliased VkFormatFeatureFlags; -- vulkan_core.h:2091 bufferFeatures : aliased VkFormatFeatureFlags; -- vulkan_core.h:2092 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2089 type VkExtent3D is record width : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2096 height : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2097 depth : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2098 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2095 type VkImageFormatProperties is record maxExtent : aliased VkExtent3D; -- vulkan_core.h:2102 maxMipLevels : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2103 maxArrayLayers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2104 sampleCounts : aliased VkSampleCountFlags; -- vulkan_core.h:2105 maxResourceSize : aliased VkDeviceSize; -- vulkan_core.h:2106 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2101 type VkPhysicalDeviceLimits_array1331 is array (0 .. 2) of aliased Interfaces.C.unsigned_short; type VkPhysicalDeviceLimits_array1333 is array (0 .. 1) of aliased Interfaces.C.unsigned_short; type VkPhysicalDeviceLimits_array1334 is array (0 .. 1) of aliased float; type VkPhysicalDeviceLimits is record maxImageDimension1D : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2110 maxImageDimension2D : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2111 maxImageDimension3D : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2112 maxImageDimensionCube : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2113 maxImageArrayLayers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2114 maxTexelBufferElements : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2115 maxUniformBufferRange : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2116 maxStorageBufferRange : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2117 maxPushConstantsSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2118 maxMemoryAllocationCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2119 maxSamplerAllocationCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2120 bufferImageGranularity : aliased VkDeviceSize; -- vulkan_core.h:2121 sparseAddressSpaceSize : aliased VkDeviceSize; -- vulkan_core.h:2122 maxBoundDescriptorSets : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2123 maxPerStageDescriptorSamplers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2124 maxPerStageDescriptorUniformBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2125 maxPerStageDescriptorStorageBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2126 maxPerStageDescriptorSampledImages : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2127 maxPerStageDescriptorStorageImages : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2128 maxPerStageDescriptorInputAttachments : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2129 maxPerStageResources : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2130 maxDescriptorSetSamplers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2131 maxDescriptorSetUniformBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2132 maxDescriptorSetUniformBuffersDynamic : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2133 maxDescriptorSetStorageBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2134 maxDescriptorSetStorageBuffersDynamic : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2135 maxDescriptorSetSampledImages : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2136 maxDescriptorSetStorageImages : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2137 maxDescriptorSetInputAttachments : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2138 maxVertexInputAttributes : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2139 maxVertexInputBindings : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2140 maxVertexInputAttributeOffset : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2141 maxVertexInputBindingStride : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2142 maxVertexOutputComponents : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2143 maxTessellationGenerationLevel : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2144 maxTessellationPatchSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2145 maxTessellationControlPerVertexInputComponents : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2146 maxTessellationControlPerVertexOutputComponents : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2147 maxTessellationControlPerPatchOutputComponents : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2148 maxTessellationControlTotalOutputComponents : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2149 maxTessellationEvaluationInputComponents : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2150 maxTessellationEvaluationOutputComponents : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2151 maxGeometryShaderInvocations : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2152 maxGeometryInputComponents : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2153 maxGeometryOutputComponents : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2154 maxGeometryOutputVertices : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2155 maxGeometryTotalOutputComponents : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2156 maxFragmentInputComponents : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2157 maxFragmentOutputAttachments : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2158 maxFragmentDualSrcAttachments : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2159 maxFragmentCombinedOutputResources : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2160 maxComputeSharedMemorySize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2161 maxComputeWorkGroupCount : aliased VkPhysicalDeviceLimits_array1331; -- vulkan_core.h:2162 maxComputeWorkGroupInvocations : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2163 maxComputeWorkGroupSize : aliased VkPhysicalDeviceLimits_array1331; -- vulkan_core.h:2164 subPixelPrecisionBits : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2165 subTexelPrecisionBits : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2166 mipmapPrecisionBits : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2167 maxDrawIndexedIndexValue : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2168 maxDrawIndirectCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2169 maxSamplerLodBias : aliased float; -- vulkan_core.h:2170 maxSamplerAnisotropy : aliased float; -- vulkan_core.h:2171 maxViewports : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2172 maxViewportDimensions : aliased VkPhysicalDeviceLimits_array1333; -- vulkan_core.h:2173 viewportBoundsRange : aliased VkPhysicalDeviceLimits_array1334; -- vulkan_core.h:2174 viewportSubPixelBits : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2175 minMemoryMapAlignment : aliased size_t; -- vulkan_core.h:2176 minTexelBufferOffsetAlignment : aliased VkDeviceSize; -- vulkan_core.h:2177 minUniformBufferOffsetAlignment : aliased VkDeviceSize; -- vulkan_core.h:2178 minStorageBufferOffsetAlignment : aliased VkDeviceSize; -- vulkan_core.h:2179 minTexelOffset : aliased Interfaces.C.short; -- vulkan_core.h:2180 maxTexelOffset : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2181 minTexelGatherOffset : aliased Interfaces.C.short; -- vulkan_core.h:2182 maxTexelGatherOffset : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2183 minInterpolationOffset : aliased float; -- vulkan_core.h:2184 maxInterpolationOffset : aliased float; -- vulkan_core.h:2185 subPixelInterpolationOffsetBits : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2186 maxFramebufferWidth : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2187 maxFramebufferHeight : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2188 maxFramebufferLayers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2189 framebufferColorSampleCounts : aliased VkSampleCountFlags; -- vulkan_core.h:2190 framebufferDepthSampleCounts : aliased VkSampleCountFlags; -- vulkan_core.h:2191 framebufferStencilSampleCounts : aliased VkSampleCountFlags; -- vulkan_core.h:2192 framebufferNoAttachmentsSampleCounts : aliased VkSampleCountFlags; -- vulkan_core.h:2193 maxColorAttachments : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2194 sampledImageColorSampleCounts : aliased VkSampleCountFlags; -- vulkan_core.h:2195 sampledImageIntegerSampleCounts : aliased VkSampleCountFlags; -- vulkan_core.h:2196 sampledImageDepthSampleCounts : aliased VkSampleCountFlags; -- vulkan_core.h:2197 sampledImageStencilSampleCounts : aliased VkSampleCountFlags; -- vulkan_core.h:2198 storageImageSampleCounts : aliased VkSampleCountFlags; -- vulkan_core.h:2199 maxSampleMaskWords : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2200 timestampComputeAndGraphics : aliased VkBool32; -- vulkan_core.h:2201 timestampPeriod : aliased float; -- vulkan_core.h:2202 maxClipDistances : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2203 maxCullDistances : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2204 maxCombinedClipAndCullDistances : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2205 discreteQueuePriorities : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2206 pointSizeRange : aliased VkPhysicalDeviceLimits_array1334; -- vulkan_core.h:2207 lineWidthRange : aliased VkPhysicalDeviceLimits_array1334; -- vulkan_core.h:2208 pointSizeGranularity : aliased float; -- vulkan_core.h:2209 lineWidthGranularity : aliased float; -- vulkan_core.h:2210 strictLines : aliased VkBool32; -- vulkan_core.h:2211 standardSampleLocations : aliased VkBool32; -- vulkan_core.h:2212 optimalBufferCopyOffsetAlignment : aliased VkDeviceSize; -- vulkan_core.h:2213 optimalBufferCopyRowPitchAlignment : aliased VkDeviceSize; -- vulkan_core.h:2214 nonCoherentAtomSize : aliased VkDeviceSize; -- vulkan_core.h:2215 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2109 type VkPhysicalDeviceSparseProperties is record residencyStandard2DBlockShape : aliased VkBool32; -- vulkan_core.h:2219 residencyStandard2DMultisampleBlockShape : aliased VkBool32; -- vulkan_core.h:2220 residencyStandard3DBlockShape : aliased VkBool32; -- vulkan_core.h:2221 residencyAlignedMipSize : aliased VkBool32; -- vulkan_core.h:2222 residencyNonResidentStrict : aliased VkBool32; -- vulkan_core.h:2223 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2218 subtype VkPhysicalDeviceProperties_array1342 is Interfaces.C.char_array (0 .. 255); type VkPhysicalDeviceProperties_array1345 is array (0 .. 15) of aliased Interfaces.C.unsigned_char; type VkPhysicalDeviceProperties is record apiVersion : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2227 driverVersion : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2228 vendorID : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2229 deviceID : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2230 deviceType : aliased VkPhysicalDeviceType; -- vulkan_core.h:2231 deviceName : aliased VkPhysicalDeviceProperties_array1342; -- vulkan_core.h:2232 pipelineCacheUUID : aliased VkPhysicalDeviceProperties_array1345; -- vulkan_core.h:2233 limits : aliased VkPhysicalDeviceLimits; -- vulkan_core.h:2234 sparseProperties : aliased VkPhysicalDeviceSparseProperties; -- vulkan_core.h:2235 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2226 type VkQueueFamilyProperties is record queueFlags : aliased VkQueueFlags; -- vulkan_core.h:2239 queueCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2240 timestampValidBits : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2241 minImageTransferGranularity : aliased VkExtent3D; -- vulkan_core.h:2242 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2238 type VkMemoryType is record propertyFlags : aliased VkMemoryPropertyFlags; -- vulkan_core.h:2246 heapIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2247 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2245 type VkMemoryHeap is record size : aliased VkDeviceSize; -- vulkan_core.h:2251 flags : aliased VkMemoryHeapFlags; -- vulkan_core.h:2252 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2250 type VkPhysicalDeviceMemoryProperties_array1360 is array (0 .. 31) of aliased VkMemoryType; type VkPhysicalDeviceMemoryProperties_array1362 is array (0 .. 15) of aliased VkMemoryHeap; type VkPhysicalDeviceMemoryProperties is record memoryTypeCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2256 memoryTypes : aliased VkPhysicalDeviceMemoryProperties_array1360; -- vulkan_core.h:2257 memoryHeapCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2258 memoryHeaps : aliased VkPhysicalDeviceMemoryProperties_array1362; -- vulkan_core.h:2259 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2255 type PFN_vkVoidFunction is access procedure with Convention => C; -- vulkan_core.h:2262 type VkDeviceQueueCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2264 pNext : System.Address; -- vulkan_core.h:2265 flags : aliased VkDeviceQueueCreateFlags; -- vulkan_core.h:2266 queueFamilyIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2267 queueCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2268 pQueuePriorities : access float; -- vulkan_core.h:2269 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2263 type VkDeviceCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2273 pNext : System.Address; -- vulkan_core.h:2274 flags : aliased VkDeviceCreateFlags; -- vulkan_core.h:2275 queueCreateInfoCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2276 pQueueCreateInfos : access constant VkDeviceQueueCreateInfo; -- vulkan_core.h:2277 enabledLayerCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2278 ppEnabledLayerNames : System.Address; -- vulkan_core.h:2279 enabledExtensionCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2280 ppEnabledExtensionNames : System.Address; -- vulkan_core.h:2281 pEnabledFeatures : access constant VkPhysicalDeviceFeatures; -- vulkan_core.h:2282 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2272 subtype VkExtensionProperties_array1342 is Interfaces.C.char_array (0 .. 255); type VkExtensionProperties is record extensionName : aliased VkExtensionProperties_array1342; -- vulkan_core.h:2286 specVersion : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2287 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2285 subtype VkLayerProperties_array1342 is Interfaces.C.char_array (0 .. 255); type VkLayerProperties is record layerName : aliased VkLayerProperties_array1342; -- vulkan_core.h:2291 specVersion : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2292 implementationVersion : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2293 description : aliased VkLayerProperties_array1342; -- vulkan_core.h:2294 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2290 type VkSubmitInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2298 pNext : System.Address; -- vulkan_core.h:2299 waitSemaphoreCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2300 pWaitSemaphores : System.Address; -- vulkan_core.h:2301 pWaitDstStageMask : access VkPipelineStageFlags; -- vulkan_core.h:2302 commandBufferCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2303 pCommandBuffers : System.Address; -- vulkan_core.h:2304 signalSemaphoreCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2305 pSignalSemaphores : System.Address; -- vulkan_core.h:2306 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2297 type VkMemoryAllocateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2310 pNext : System.Address; -- vulkan_core.h:2311 allocationSize : aliased VkDeviceSize; -- vulkan_core.h:2312 memoryTypeIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2313 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2309 type VkMappedMemoryRange is record sType : aliased VkStructureType; -- vulkan_core.h:2317 pNext : System.Address; -- vulkan_core.h:2318 memory : VkDeviceMemory; -- vulkan_core.h:2319 offset : aliased VkDeviceSize; -- vulkan_core.h:2320 size : aliased VkDeviceSize; -- vulkan_core.h:2321 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2316 type VkMemoryRequirements is record size : aliased VkDeviceSize; -- vulkan_core.h:2325 alignment : aliased VkDeviceSize; -- vulkan_core.h:2326 memoryTypeBits : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2327 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2324 type VkSparseImageFormatProperties is record aspectMask : aliased VkImageAspectFlags; -- vulkan_core.h:2331 imageGranularity : aliased VkExtent3D; -- vulkan_core.h:2332 flags : aliased VkSparseImageFormatFlags; -- vulkan_core.h:2333 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2330 type VkSparseImageMemoryRequirements is record formatProperties : aliased VkSparseImageFormatProperties; -- vulkan_core.h:2337 imageMipTailFirstLod : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2338 imageMipTailSize : aliased VkDeviceSize; -- vulkan_core.h:2339 imageMipTailOffset : aliased VkDeviceSize; -- vulkan_core.h:2340 imageMipTailStride : aliased VkDeviceSize; -- vulkan_core.h:2341 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2336 type VkSparseMemoryBind is record resourceOffset : aliased VkDeviceSize; -- vulkan_core.h:2345 size : aliased VkDeviceSize; -- vulkan_core.h:2346 memory : VkDeviceMemory; -- vulkan_core.h:2347 memoryOffset : aliased VkDeviceSize; -- vulkan_core.h:2348 flags : aliased VkSparseMemoryBindFlags; -- vulkan_core.h:2349 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2344 type VkSparseBufferMemoryBindInfo is record buffer : VkBuffer; -- vulkan_core.h:2353 bindCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2354 pBinds : access constant VkSparseMemoryBind; -- vulkan_core.h:2355 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2352 type VkSparseImageOpaqueMemoryBindInfo is record image : VkImage; -- vulkan_core.h:2359 bindCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2360 pBinds : access constant VkSparseMemoryBind; -- vulkan_core.h:2361 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2358 type VkImageSubresource is record aspectMask : aliased VkImageAspectFlags; -- vulkan_core.h:2365 mipLevel : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2366 arrayLayer : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2367 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2364 type VkOffset3D is record x : aliased Interfaces.C.short; -- vulkan_core.h:2371 y : aliased Interfaces.C.short; -- vulkan_core.h:2372 z : aliased Interfaces.C.short; -- vulkan_core.h:2373 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2370 type VkSparseImageMemoryBind is record subresource : aliased VkImageSubresource; -- vulkan_core.h:2377 offset : aliased VkOffset3D; -- vulkan_core.h:2378 extent : aliased VkExtent3D; -- vulkan_core.h:2379 memory : VkDeviceMemory; -- vulkan_core.h:2380 memoryOffset : aliased VkDeviceSize; -- vulkan_core.h:2381 flags : aliased VkSparseMemoryBindFlags; -- vulkan_core.h:2382 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2376 type VkSparseImageMemoryBindInfo is record image : VkImage; -- vulkan_core.h:2386 bindCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2387 pBinds : access constant VkSparseImageMemoryBind; -- vulkan_core.h:2388 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2385 type VkBindSparseInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2392 pNext : System.Address; -- vulkan_core.h:2393 waitSemaphoreCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2394 pWaitSemaphores : System.Address; -- vulkan_core.h:2395 bufferBindCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2396 pBufferBinds : access constant VkSparseBufferMemoryBindInfo; -- vulkan_core.h:2397 imageOpaqueBindCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2398 pImageOpaqueBinds : access constant VkSparseImageOpaqueMemoryBindInfo; -- vulkan_core.h:2399 imageBindCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2400 pImageBinds : access constant VkSparseImageMemoryBindInfo; -- vulkan_core.h:2401 signalSemaphoreCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2402 pSignalSemaphores : System.Address; -- vulkan_core.h:2403 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2391 type VkFenceCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2407 pNext : System.Address; -- vulkan_core.h:2408 flags : aliased VkFenceCreateFlags; -- vulkan_core.h:2409 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2406 type VkSemaphoreCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2413 pNext : System.Address; -- vulkan_core.h:2414 flags : aliased VkSemaphoreCreateFlags; -- vulkan_core.h:2415 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2412 type VkEventCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2419 pNext : System.Address; -- vulkan_core.h:2420 flags : aliased VkEventCreateFlags; -- vulkan_core.h:2421 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2418 type VkQueryPoolCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2425 pNext : System.Address; -- vulkan_core.h:2426 flags : aliased VkQueryPoolCreateFlags; -- vulkan_core.h:2427 queryType : aliased VkQueryType; -- vulkan_core.h:2428 queryCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2429 pipelineStatistics : aliased VkQueryPipelineStatisticFlags; -- vulkan_core.h:2430 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2424 type VkBufferCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2434 pNext : System.Address; -- vulkan_core.h:2435 flags : aliased VkBufferCreateFlags; -- vulkan_core.h:2436 size : aliased VkDeviceSize; -- vulkan_core.h:2437 usage : aliased VkBufferUsageFlags; -- vulkan_core.h:2438 sharingMode : aliased VkSharingMode; -- vulkan_core.h:2439 queueFamilyIndexCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2440 pQueueFamilyIndices : access Interfaces.C.unsigned_short; -- vulkan_core.h:2441 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2433 type VkBufferViewCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2445 pNext : System.Address; -- vulkan_core.h:2446 flags : aliased VkBufferViewCreateFlags; -- vulkan_core.h:2447 buffer : VkBuffer; -- vulkan_core.h:2448 format : aliased VkFormat; -- vulkan_core.h:2449 offset : aliased VkDeviceSize; -- vulkan_core.h:2450 c_range : aliased VkDeviceSize; -- vulkan_core.h:2451 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2444 type VkImageCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2455 pNext : System.Address; -- vulkan_core.h:2456 flags : aliased VkImageCreateFlags; -- vulkan_core.h:2457 imageType : aliased VkImageType; -- vulkan_core.h:2458 format : aliased VkFormat; -- vulkan_core.h:2459 extent : aliased VkExtent3D; -- vulkan_core.h:2460 mipLevels : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2461 arrayLayers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2462 samples : aliased VkSampleCountFlagBits; -- vulkan_core.h:2463 tiling : aliased VkImageTiling; -- vulkan_core.h:2464 usage : aliased VkImageUsageFlags; -- vulkan_core.h:2465 sharingMode : aliased VkSharingMode; -- vulkan_core.h:2466 queueFamilyIndexCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2467 pQueueFamilyIndices : access Interfaces.C.unsigned_short; -- vulkan_core.h:2468 initialLayout : aliased VkImageLayout; -- vulkan_core.h:2469 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2454 type VkSubresourceLayout is record offset : aliased VkDeviceSize; -- vulkan_core.h:2473 size : aliased VkDeviceSize; -- vulkan_core.h:2474 rowPitch : aliased VkDeviceSize; -- vulkan_core.h:2475 arrayPitch : aliased VkDeviceSize; -- vulkan_core.h:2476 depthPitch : aliased VkDeviceSize; -- vulkan_core.h:2477 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2472 type VkComponentMapping is record r : aliased VkComponentSwizzle; -- vulkan_core.h:2481 g : aliased VkComponentSwizzle; -- vulkan_core.h:2482 b : aliased VkComponentSwizzle; -- vulkan_core.h:2483 a : aliased VkComponentSwizzle; -- vulkan_core.h:2484 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2480 type VkImageSubresourceRange is record aspectMask : aliased VkImageAspectFlags; -- vulkan_core.h:2488 baseMipLevel : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2489 levelCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2490 baseArrayLayer : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2491 layerCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2492 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2487 type VkImageViewCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2496 pNext : System.Address; -- vulkan_core.h:2497 flags : aliased VkImageViewCreateFlags; -- vulkan_core.h:2498 image : VkImage; -- vulkan_core.h:2499 viewType : aliased VkImageViewType; -- vulkan_core.h:2500 format : aliased VkFormat; -- vulkan_core.h:2501 components : aliased VkComponentMapping; -- vulkan_core.h:2502 subresourceRange : aliased VkImageSubresourceRange; -- vulkan_core.h:2503 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2495 type VkShaderModuleCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2507 pNext : System.Address; -- vulkan_core.h:2508 flags : aliased VkShaderModuleCreateFlags; -- vulkan_core.h:2509 codeSize : aliased size_t; -- vulkan_core.h:2510 pCode : access Interfaces.C.unsigned_short; -- vulkan_core.h:2511 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2506 type VkPipelineCacheCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2515 pNext : System.Address; -- vulkan_core.h:2516 flags : aliased VkPipelineCacheCreateFlags; -- vulkan_core.h:2517 initialDataSize : aliased size_t; -- vulkan_core.h:2518 pInitialData : System.Address; -- vulkan_core.h:2519 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2514 type VkSpecializationMapEntry is record constantID : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2523 offset : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2524 size : aliased size_t; -- vulkan_core.h:2525 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2522 type VkSpecializationInfo is record mapEntryCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2529 pMapEntries : access constant VkSpecializationMapEntry; -- vulkan_core.h:2530 dataSize : aliased size_t; -- vulkan_core.h:2531 pData : System.Address; -- vulkan_core.h:2532 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2528 type VkPipelineShaderStageCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2536 pNext : System.Address; -- vulkan_core.h:2537 flags : aliased VkPipelineShaderStageCreateFlags; -- vulkan_core.h:2538 stage : aliased VkShaderStageFlagBits; -- vulkan_core.h:2539 module : VkShaderModule; -- vulkan_core.h:2540 pName : Interfaces.C.Strings.chars_ptr; -- vulkan_core.h:2541 pSpecializationInfo : access constant VkSpecializationInfo; -- vulkan_core.h:2542 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2535 type VkVertexInputBindingDescription is record binding : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2546 stride : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2547 inputRate : aliased VkVertexInputRate; -- vulkan_core.h:2548 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2545 type VkVertexInputAttributeDescription is record location : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2552 binding : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2553 format : aliased VkFormat; -- vulkan_core.h:2554 offset : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2555 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2551 type VkPipelineVertexInputStateCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2559 pNext : System.Address; -- vulkan_core.h:2560 flags : aliased VkPipelineVertexInputStateCreateFlags; -- vulkan_core.h:2561 vertexBindingDescriptionCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2562 pVertexBindingDescriptions : access constant VkVertexInputBindingDescription; -- vulkan_core.h:2563 vertexAttributeDescriptionCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2564 pVertexAttributeDescriptions : access constant VkVertexInputAttributeDescription; -- vulkan_core.h:2565 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2558 type VkPipelineInputAssemblyStateCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2569 pNext : System.Address; -- vulkan_core.h:2570 flags : aliased VkPipelineInputAssemblyStateCreateFlags; -- vulkan_core.h:2571 topology : aliased VkPrimitiveTopology; -- vulkan_core.h:2572 primitiveRestartEnable : aliased VkBool32; -- vulkan_core.h:2573 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2568 type VkPipelineTessellationStateCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2577 pNext : System.Address; -- vulkan_core.h:2578 flags : aliased VkPipelineTessellationStateCreateFlags; -- vulkan_core.h:2579 patchControlPoints : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2580 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2576 type VkViewport is record x : aliased float; -- vulkan_core.h:2584 y : aliased float; -- vulkan_core.h:2585 width : aliased float; -- vulkan_core.h:2586 height : aliased float; -- vulkan_core.h:2587 minDepth : aliased float; -- vulkan_core.h:2588 maxDepth : aliased float; -- vulkan_core.h:2589 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2583 type VkOffset2D is record x : aliased Interfaces.C.short; -- vulkan_core.h:2593 y : aliased Interfaces.C.short; -- vulkan_core.h:2594 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2592 type VkExtent2D is record width : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2598 height : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2599 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2597 type VkRect2D is record offset : aliased VkOffset2D; -- vulkan_core.h:2603 extent : aliased VkExtent2D; -- vulkan_core.h:2604 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2602 type VkPipelineViewportStateCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2608 pNext : System.Address; -- vulkan_core.h:2609 flags : aliased VkPipelineViewportStateCreateFlags; -- vulkan_core.h:2610 viewportCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2611 pViewports : access constant VkViewport; -- vulkan_core.h:2612 scissorCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2613 pScissors : access constant VkRect2D; -- vulkan_core.h:2614 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2607 type VkPipelineRasterizationStateCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2618 pNext : System.Address; -- vulkan_core.h:2619 flags : aliased VkPipelineRasterizationStateCreateFlags; -- vulkan_core.h:2620 depthClampEnable : aliased VkBool32; -- vulkan_core.h:2621 rasterizerDiscardEnable : aliased VkBool32; -- vulkan_core.h:2622 polygonMode : aliased VkPolygonMode; -- vulkan_core.h:2623 cullMode : aliased VkCullModeFlags; -- vulkan_core.h:2624 frontFace : aliased VkFrontFace; -- vulkan_core.h:2625 depthBiasEnable : aliased VkBool32; -- vulkan_core.h:2626 depthBiasConstantFactor : aliased float; -- vulkan_core.h:2627 depthBiasClamp : aliased float; -- vulkan_core.h:2628 depthBiasSlopeFactor : aliased float; -- vulkan_core.h:2629 lineWidth : aliased float; -- vulkan_core.h:2630 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2617 type VkPipelineMultisampleStateCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2634 pNext : System.Address; -- vulkan_core.h:2635 flags : aliased VkPipelineMultisampleStateCreateFlags; -- vulkan_core.h:2636 rasterizationSamples : aliased VkSampleCountFlagBits; -- vulkan_core.h:2637 sampleShadingEnable : aliased VkBool32; -- vulkan_core.h:2638 minSampleShading : aliased float; -- vulkan_core.h:2639 pSampleMask : access VkSampleMask; -- vulkan_core.h:2640 alphaToCoverageEnable : aliased VkBool32; -- vulkan_core.h:2641 alphaToOneEnable : aliased VkBool32; -- vulkan_core.h:2642 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2633 type VkStencilOpState is record failOp : aliased VkStencilOp; -- vulkan_core.h:2646 passOp : aliased VkStencilOp; -- vulkan_core.h:2647 depthFailOp : aliased VkStencilOp; -- vulkan_core.h:2648 compareOp : aliased VkCompareOp; -- vulkan_core.h:2649 compareMask : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2650 writeMask : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2651 reference : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2652 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2645 type VkPipelineDepthStencilStateCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2656 pNext : System.Address; -- vulkan_core.h:2657 flags : aliased VkPipelineDepthStencilStateCreateFlags; -- vulkan_core.h:2658 depthTestEnable : aliased VkBool32; -- vulkan_core.h:2659 depthWriteEnable : aliased VkBool32; -- vulkan_core.h:2660 depthCompareOp : aliased VkCompareOp; -- vulkan_core.h:2661 depthBoundsTestEnable : aliased VkBool32; -- vulkan_core.h:2662 stencilTestEnable : aliased VkBool32; -- vulkan_core.h:2663 front : aliased VkStencilOpState; -- vulkan_core.h:2664 back : aliased VkStencilOpState; -- vulkan_core.h:2665 minDepthBounds : aliased float; -- vulkan_core.h:2666 maxDepthBounds : aliased float; -- vulkan_core.h:2667 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2655 type VkPipelineColorBlendAttachmentState is record blendEnable : aliased VkBool32; -- vulkan_core.h:2671 srcColorBlendFactor : aliased VkBlendFactor; -- vulkan_core.h:2672 dstColorBlendFactor : aliased VkBlendFactor; -- vulkan_core.h:2673 colorBlendOp : aliased VkBlendOp; -- vulkan_core.h:2674 srcAlphaBlendFactor : aliased VkBlendFactor; -- vulkan_core.h:2675 dstAlphaBlendFactor : aliased VkBlendFactor; -- vulkan_core.h:2676 alphaBlendOp : aliased VkBlendOp; -- vulkan_core.h:2677 colorWriteMask : aliased VkColorComponentFlags; -- vulkan_core.h:2678 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2670 type VkPipelineColorBlendStateCreateInfo_array1588 is array (0 .. 3) of aliased float; type VkPipelineColorBlendStateCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2682 pNext : System.Address; -- vulkan_core.h:2683 flags : aliased VkPipelineColorBlendStateCreateFlags; -- vulkan_core.h:2684 logicOpEnable : aliased VkBool32; -- vulkan_core.h:2685 logicOp : aliased VkLogicOp; -- vulkan_core.h:2686 attachmentCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2687 pAttachments : access constant VkPipelineColorBlendAttachmentState; -- vulkan_core.h:2688 blendConstants : aliased VkPipelineColorBlendStateCreateInfo_array1588; -- vulkan_core.h:2689 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2681 type VkPipelineDynamicStateCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2693 pNext : System.Address; -- vulkan_core.h:2694 flags : aliased VkPipelineDynamicStateCreateFlags; -- vulkan_core.h:2695 dynamicStateCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2696 pDynamicStates : access VkDynamicState; -- vulkan_core.h:2697 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2692 type VkGraphicsPipelineCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2701 pNext : System.Address; -- vulkan_core.h:2702 flags : aliased VkPipelineCreateFlags; -- vulkan_core.h:2703 stageCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2704 pStages : access constant VkPipelineShaderStageCreateInfo; -- vulkan_core.h:2705 pVertexInputState : access constant VkPipelineVertexInputStateCreateInfo; -- vulkan_core.h:2706 pInputAssemblyState : access constant VkPipelineInputAssemblyStateCreateInfo; -- vulkan_core.h:2707 pTessellationState : access constant VkPipelineTessellationStateCreateInfo; -- vulkan_core.h:2708 pViewportState : access constant VkPipelineViewportStateCreateInfo; -- vulkan_core.h:2709 pRasterizationState : access constant VkPipelineRasterizationStateCreateInfo; -- vulkan_core.h:2710 pMultisampleState : access constant VkPipelineMultisampleStateCreateInfo; -- vulkan_core.h:2711 pDepthStencilState : access constant VkPipelineDepthStencilStateCreateInfo; -- vulkan_core.h:2712 pColorBlendState : access constant VkPipelineColorBlendStateCreateInfo; -- vulkan_core.h:2713 pDynamicState : access constant VkPipelineDynamicStateCreateInfo; -- vulkan_core.h:2714 layout : VkPipelineLayout; -- vulkan_core.h:2715 renderPass : VkRenderPass; -- vulkan_core.h:2716 subpass : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2717 basePipelineHandle : VkPipeline; -- vulkan_core.h:2718 basePipelineIndex : aliased Interfaces.C.short; -- vulkan_core.h:2719 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2700 type VkComputePipelineCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2723 pNext : System.Address; -- vulkan_core.h:2724 flags : aliased VkPipelineCreateFlags; -- vulkan_core.h:2725 stage : aliased VkPipelineShaderStageCreateInfo; -- vulkan_core.h:2726 layout : VkPipelineLayout; -- vulkan_core.h:2727 basePipelineHandle : VkPipeline; -- vulkan_core.h:2728 basePipelineIndex : aliased Interfaces.C.short; -- vulkan_core.h:2729 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2722 type VkPushConstantRange is record stageFlags : aliased VkShaderStageFlags; -- vulkan_core.h:2733 offset : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2734 size : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2735 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2732 type VkPipelineLayoutCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2739 pNext : System.Address; -- vulkan_core.h:2740 flags : aliased VkPipelineLayoutCreateFlags; -- vulkan_core.h:2741 setLayoutCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2742 pSetLayouts : System.Address; -- vulkan_core.h:2743 pushConstantRangeCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2744 pPushConstantRanges : access constant VkPushConstantRange; -- vulkan_core.h:2745 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2738 type VkSamplerCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2749 pNext : System.Address; -- vulkan_core.h:2750 flags : aliased VkSamplerCreateFlags; -- vulkan_core.h:2751 magFilter : aliased VkFilter; -- vulkan_core.h:2752 minFilter : aliased VkFilter; -- vulkan_core.h:2753 mipmapMode : aliased VkSamplerMipmapMode; -- vulkan_core.h:2754 addressModeU : aliased VkSamplerAddressMode; -- vulkan_core.h:2755 addressModeV : aliased VkSamplerAddressMode; -- vulkan_core.h:2756 addressModeW : aliased VkSamplerAddressMode; -- vulkan_core.h:2757 mipLodBias : aliased float; -- vulkan_core.h:2758 anisotropyEnable : aliased VkBool32; -- vulkan_core.h:2759 maxAnisotropy : aliased float; -- vulkan_core.h:2760 compareEnable : aliased VkBool32; -- vulkan_core.h:2761 compareOp : aliased VkCompareOp; -- vulkan_core.h:2762 minLod : aliased float; -- vulkan_core.h:2763 maxLod : aliased float; -- vulkan_core.h:2764 borderColor : aliased VkBorderColor; -- vulkan_core.h:2765 unnormalizedCoordinates : aliased VkBool32; -- vulkan_core.h:2766 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2748 type VkDescriptorSetLayoutBinding is record binding : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2770 descriptorType : aliased VkDescriptorType; -- vulkan_core.h:2771 descriptorCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2772 stageFlags : aliased VkShaderStageFlags; -- vulkan_core.h:2773 pImmutableSamplers : System.Address; -- vulkan_core.h:2774 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2769 type VkDescriptorSetLayoutCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2778 pNext : System.Address; -- vulkan_core.h:2779 flags : aliased VkDescriptorSetLayoutCreateFlags; -- vulkan_core.h:2780 bindingCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2781 pBindings : access constant VkDescriptorSetLayoutBinding; -- vulkan_core.h:2782 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2777 type VkDescriptorPoolSize is record c_type : aliased VkDescriptorType; -- vulkan_core.h:2786 descriptorCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2787 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2785 type VkDescriptorPoolCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2791 pNext : System.Address; -- vulkan_core.h:2792 flags : aliased VkDescriptorPoolCreateFlags; -- vulkan_core.h:2793 maxSets : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2794 poolSizeCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2795 pPoolSizes : access constant VkDescriptorPoolSize; -- vulkan_core.h:2796 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2790 type VkDescriptorSetAllocateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2800 pNext : System.Address; -- vulkan_core.h:2801 descriptorPool : VkDescriptorPool; -- vulkan_core.h:2802 descriptorSetCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2803 pSetLayouts : System.Address; -- vulkan_core.h:2804 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2799 type VkDescriptorImageInfo is record sampler : VkSampler; -- vulkan_core.h:2808 imageView : VkImageView; -- vulkan_core.h:2809 imageLayout : aliased VkImageLayout; -- vulkan_core.h:2810 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2807 type VkDescriptorBufferInfo is record buffer : VkBuffer; -- vulkan_core.h:2814 offset : aliased VkDeviceSize; -- vulkan_core.h:2815 c_range : aliased VkDeviceSize; -- vulkan_core.h:2816 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2813 type VkWriteDescriptorSet is record sType : aliased VkStructureType; -- vulkan_core.h:2820 pNext : System.Address; -- vulkan_core.h:2821 dstSet : VkDescriptorSet; -- vulkan_core.h:2822 dstBinding : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2823 dstArrayElement : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2824 descriptorCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2825 descriptorType : aliased VkDescriptorType; -- vulkan_core.h:2826 pImageInfo : access constant VkDescriptorImageInfo; -- vulkan_core.h:2827 pBufferInfo : access constant VkDescriptorBufferInfo; -- vulkan_core.h:2828 pTexelBufferView : System.Address; -- vulkan_core.h:2829 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2819 type VkCopyDescriptorSet is record sType : aliased VkStructureType; -- vulkan_core.h:2833 pNext : System.Address; -- vulkan_core.h:2834 srcSet : VkDescriptorSet; -- vulkan_core.h:2835 srcBinding : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2836 srcArrayElement : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2837 dstSet : VkDescriptorSet; -- vulkan_core.h:2838 dstBinding : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2839 dstArrayElement : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2840 descriptorCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2841 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2832 type VkFramebufferCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2845 pNext : System.Address; -- vulkan_core.h:2846 flags : aliased VkFramebufferCreateFlags; -- vulkan_core.h:2847 renderPass : VkRenderPass; -- vulkan_core.h:2848 attachmentCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2849 pAttachments : System.Address; -- vulkan_core.h:2850 width : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2851 height : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2852 layers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2853 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2844 type VkAttachmentDescription is record flags : aliased VkAttachmentDescriptionFlags; -- vulkan_core.h:2857 format : aliased VkFormat; -- vulkan_core.h:2858 samples : aliased VkSampleCountFlagBits; -- vulkan_core.h:2859 loadOp : aliased VkAttachmentLoadOp; -- vulkan_core.h:2860 storeOp : aliased VkAttachmentStoreOp; -- vulkan_core.h:2861 stencilLoadOp : aliased VkAttachmentLoadOp; -- vulkan_core.h:2862 stencilStoreOp : aliased VkAttachmentStoreOp; -- vulkan_core.h:2863 initialLayout : aliased VkImageLayout; -- vulkan_core.h:2864 finalLayout : aliased VkImageLayout; -- vulkan_core.h:2865 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2856 type VkAttachmentReference is record attachment : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2869 layout : aliased VkImageLayout; -- vulkan_core.h:2870 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2868 type VkSubpassDescription is record flags : aliased VkSubpassDescriptionFlags; -- vulkan_core.h:2874 pipelineBindPoint : aliased VkPipelineBindPoint; -- vulkan_core.h:2875 inputAttachmentCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2876 pInputAttachments : access constant VkAttachmentReference; -- vulkan_core.h:2877 colorAttachmentCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2878 pColorAttachments : access constant VkAttachmentReference; -- vulkan_core.h:2879 pResolveAttachments : access constant VkAttachmentReference; -- vulkan_core.h:2880 pDepthStencilAttachment : access constant VkAttachmentReference; -- vulkan_core.h:2881 preserveAttachmentCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2882 pPreserveAttachments : access Interfaces.C.unsigned_short; -- vulkan_core.h:2883 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2873 type VkSubpassDependency is record srcSubpass : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2887 dstSubpass : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2888 srcStageMask : aliased VkPipelineStageFlags; -- vulkan_core.h:2889 dstStageMask : aliased VkPipelineStageFlags; -- vulkan_core.h:2890 srcAccessMask : aliased VkAccessFlags; -- vulkan_core.h:2891 dstAccessMask : aliased VkAccessFlags; -- vulkan_core.h:2892 dependencyFlags : aliased VkDependencyFlags; -- vulkan_core.h:2893 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2886 type VkRenderPassCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2897 pNext : System.Address; -- vulkan_core.h:2898 flags : aliased VkRenderPassCreateFlags; -- vulkan_core.h:2899 attachmentCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2900 pAttachments : access constant VkAttachmentDescription; -- vulkan_core.h:2901 subpassCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2902 pSubpasses : access constant VkSubpassDescription; -- vulkan_core.h:2903 dependencyCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2904 pDependencies : access constant VkSubpassDependency; -- vulkan_core.h:2905 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2896 type VkCommandPoolCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2909 pNext : System.Address; -- vulkan_core.h:2910 flags : aliased VkCommandPoolCreateFlags; -- vulkan_core.h:2911 queueFamilyIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2912 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2908 type VkCommandBufferAllocateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2916 pNext : System.Address; -- vulkan_core.h:2917 commandPool : VkCommandPool; -- vulkan_core.h:2918 level : aliased VkCommandBufferLevel; -- vulkan_core.h:2919 commandBufferCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2920 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2915 type VkCommandBufferInheritanceInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2924 pNext : System.Address; -- vulkan_core.h:2925 renderPass : VkRenderPass; -- vulkan_core.h:2926 subpass : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2927 framebuffer : VkFramebuffer; -- vulkan_core.h:2928 occlusionQueryEnable : aliased VkBool32; -- vulkan_core.h:2929 queryFlags : aliased VkQueryControlFlags; -- vulkan_core.h:2930 pipelineStatistics : aliased VkQueryPipelineStatisticFlags; -- vulkan_core.h:2931 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2923 type VkCommandBufferBeginInfo is record sType : aliased VkStructureType; -- vulkan_core.h:2935 pNext : System.Address; -- vulkan_core.h:2936 flags : aliased VkCommandBufferUsageFlags; -- vulkan_core.h:2937 pInheritanceInfo : access constant VkCommandBufferInheritanceInfo; -- vulkan_core.h:2938 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2934 type VkBufferCopy is record srcOffset : aliased VkDeviceSize; -- vulkan_core.h:2942 dstOffset : aliased VkDeviceSize; -- vulkan_core.h:2943 size : aliased VkDeviceSize; -- vulkan_core.h:2944 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2941 type VkImageSubresourceLayers is record aspectMask : aliased VkImageAspectFlags; -- vulkan_core.h:2948 mipLevel : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2949 baseArrayLayer : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2950 layerCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2951 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2947 type VkImageCopy is record srcSubresource : aliased VkImageSubresourceLayers; -- vulkan_core.h:2955 srcOffset : aliased VkOffset3D; -- vulkan_core.h:2956 dstSubresource : aliased VkImageSubresourceLayers; -- vulkan_core.h:2957 dstOffset : aliased VkOffset3D; -- vulkan_core.h:2958 extent : aliased VkExtent3D; -- vulkan_core.h:2959 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2954 type VkImageBlit_array1777 is array (0 .. 1) of aliased VkOffset3D; type VkImageBlit is record srcSubresource : aliased VkImageSubresourceLayers; -- vulkan_core.h:2963 srcOffsets : aliased VkImageBlit_array1777; -- vulkan_core.h:2964 dstSubresource : aliased VkImageSubresourceLayers; -- vulkan_core.h:2965 dstOffsets : aliased VkImageBlit_array1777; -- vulkan_core.h:2966 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2962 type VkBufferImageCopy is record bufferOffset : aliased VkDeviceSize; -- vulkan_core.h:2970 bufferRowLength : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2971 bufferImageHeight : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2972 imageSubresource : aliased VkImageSubresourceLayers; -- vulkan_core.h:2973 imageOffset : aliased VkOffset3D; -- vulkan_core.h:2974 imageExtent : aliased VkExtent3D; -- vulkan_core.h:2975 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2969 type VkClearColorValue_array1588 is array (0 .. 3) of aliased float; type VkClearColorValue_array1785 is array (0 .. 3) of aliased Interfaces.C.short; type VkClearColorValue_array1787 is array (0 .. 3) of aliased Interfaces.C.unsigned_short; type VkClearColorValue (discr : unsigned := 0) is record case discr is when 0 => float32 : aliased VkClearColorValue_array1588; -- vulkan_core.h:2979 when 1 => int32 : aliased VkClearColorValue_array1785; -- vulkan_core.h:2980 when others => uint32 : aliased VkClearColorValue_array1787; -- vulkan_core.h:2981 end case; end record with Convention => C_Pass_By_Copy, Unchecked_Union => True; -- vulkan_core.h:2978 type VkClearDepthStencilValue is record depth : aliased float; -- vulkan_core.h:2985 stencil : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2986 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2984 type VkClearValue (discr : unsigned := 0) is record case discr is when 0 => color : aliased VkClearColorValue; -- vulkan_core.h:2990 when others => depthStencil : aliased VkClearDepthStencilValue; -- vulkan_core.h:2991 end case; end record with Convention => C_Pass_By_Copy, Unchecked_Union => True; -- vulkan_core.h:2989 type VkClearAttachment is record aspectMask : aliased VkImageAspectFlags; -- vulkan_core.h:2995 colorAttachment : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:2996 clearValue : aliased VkClearValue; -- vulkan_core.h:2997 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:2994 type VkClearRect is record rect : aliased VkRect2D; -- vulkan_core.h:3001 baseArrayLayer : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3002 layerCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3003 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:3000 type VkImageResolve is record srcSubresource : aliased VkImageSubresourceLayers; -- vulkan_core.h:3007 srcOffset : aliased VkOffset3D; -- vulkan_core.h:3008 dstSubresource : aliased VkImageSubresourceLayers; -- vulkan_core.h:3009 dstOffset : aliased VkOffset3D; -- vulkan_core.h:3010 extent : aliased VkExtent3D; -- vulkan_core.h:3011 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:3006 type VkMemoryBarrier is record sType : aliased VkStructureType; -- vulkan_core.h:3015 pNext : System.Address; -- vulkan_core.h:3016 srcAccessMask : aliased VkAccessFlags; -- vulkan_core.h:3017 dstAccessMask : aliased VkAccessFlags; -- vulkan_core.h:3018 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:3014 type VkBufferMemoryBarrier is record sType : aliased VkStructureType; -- vulkan_core.h:3022 pNext : System.Address; -- vulkan_core.h:3023 srcAccessMask : aliased VkAccessFlags; -- vulkan_core.h:3024 dstAccessMask : aliased VkAccessFlags; -- vulkan_core.h:3025 srcQueueFamilyIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3026 dstQueueFamilyIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3027 buffer : VkBuffer; -- vulkan_core.h:3028 offset : aliased VkDeviceSize; -- vulkan_core.h:3029 size : aliased VkDeviceSize; -- vulkan_core.h:3030 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:3021 type VkImageMemoryBarrier is record sType : aliased VkStructureType; -- vulkan_core.h:3034 pNext : System.Address; -- vulkan_core.h:3035 srcAccessMask : aliased VkAccessFlags; -- vulkan_core.h:3036 dstAccessMask : aliased VkAccessFlags; -- vulkan_core.h:3037 oldLayout : aliased VkImageLayout; -- vulkan_core.h:3038 newLayout : aliased VkImageLayout; -- vulkan_core.h:3039 srcQueueFamilyIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3040 dstQueueFamilyIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3041 image : VkImage; -- vulkan_core.h:3042 subresourceRange : aliased VkImageSubresourceRange; -- vulkan_core.h:3043 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:3033 type VkRenderPassBeginInfo is record sType : aliased VkStructureType; -- vulkan_core.h:3047 pNext : System.Address; -- vulkan_core.h:3048 renderPass : VkRenderPass; -- vulkan_core.h:3049 framebuffer : VkFramebuffer; -- vulkan_core.h:3050 renderArea : aliased VkRect2D; -- vulkan_core.h:3051 clearValueCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3052 pClearValues : access constant VkClearValue; -- vulkan_core.h:3053 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:3046 type VkDispatchIndirectCommand is record x : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3057 y : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3058 z : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3059 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:3056 type VkDrawIndexedIndirectCommand is record indexCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3063 instanceCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3064 firstIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3065 vertexOffset : aliased Interfaces.C.short; -- vulkan_core.h:3066 firstInstance : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3067 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:3062 type VkDrawIndirectCommand is record vertexCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3071 instanceCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3072 firstVertex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3073 firstInstance : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:3074 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:3070 type VkBaseOutStructure; type VkBaseOutStructure is record sType : aliased VkStructureType; -- vulkan_core.h:3078 pNext : access VkBaseOutStructure; -- vulkan_core.h:3079 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:3077 type VkBaseInStructure; type VkBaseInStructure is record sType : aliased VkStructureType; -- vulkan_core.h:3083 pNext : access constant VkBaseInStructure; -- vulkan_core.h:3084 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:3082 type PFN_vkCreateInstance is access function (arg1 : access constant VkInstanceCreateInfo; arg2 : access constant VkAllocationCallbacks; arg3 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3087 type PFN_vkDestroyInstance is access procedure (arg1 : VkInstance; arg2 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3088 type PFN_vkEnumeratePhysicalDevices is access function (arg1 : VkInstance; arg2 : access Interfaces.C.unsigned_short; arg3 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3089 type PFN_vkGetPhysicalDeviceFeatures is access procedure (arg1 : VkPhysicalDevice; arg2 : access VkPhysicalDeviceFeatures) with Convention => C; -- vulkan_core.h:3090 type PFN_vkGetPhysicalDeviceFormatProperties is access procedure (arg1 : VkPhysicalDevice; arg2 : VkFormat; arg3 : access VkFormatProperties) with Convention => C; -- vulkan_core.h:3091 type PFN_vkGetPhysicalDeviceImageFormatProperties is access function (arg1 : VkPhysicalDevice; arg2 : VkFormat; arg3 : VkImageType; arg4 : VkImageTiling; arg5 : VkImageUsageFlags; arg6 : VkImageCreateFlags; arg7 : access VkImageFormatProperties) return VkResult with Convention => C; -- vulkan_core.h:3092 type PFN_vkGetPhysicalDeviceProperties is access procedure (arg1 : VkPhysicalDevice; arg2 : access VkPhysicalDeviceProperties) with Convention => C; -- vulkan_core.h:3093 type PFN_vkGetPhysicalDeviceQueueFamilyProperties is access procedure (arg1 : VkPhysicalDevice; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkQueueFamilyProperties) with Convention => C; -- vulkan_core.h:3094 type PFN_vkGetPhysicalDeviceMemoryProperties is access procedure (arg1 : VkPhysicalDevice; arg2 : access VkPhysicalDeviceMemoryProperties) with Convention => C; -- vulkan_core.h:3095 type PFN_vkGetInstanceProcAddr is access function (arg1 : VkInstance; arg2 : Interfaces.C.Strings.chars_ptr) return PFN_vkVoidFunction with Convention => C; -- vulkan_core.h:3096 type PFN_vkGetDeviceProcAddr is access function (arg1 : VkDevice; arg2 : Interfaces.C.Strings.chars_ptr) return PFN_vkVoidFunction with Convention => C; -- vulkan_core.h:3097 type PFN_vkCreateDevice is access function (arg1 : VkPhysicalDevice; arg2 : access constant VkDeviceCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3098 type PFN_vkDestroyDevice is access procedure (arg1 : VkDevice; arg2 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3099 type PFN_vkEnumerateInstanceExtensionProperties is access function (arg1 : Interfaces.C.Strings.chars_ptr; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkExtensionProperties) return VkResult with Convention => C; -- vulkan_core.h:3100 type PFN_vkEnumerateDeviceExtensionProperties is access function (arg1 : VkPhysicalDevice; arg2 : Interfaces.C.Strings.chars_ptr; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkExtensionProperties) return VkResult with Convention => C; -- vulkan_core.h:3101 type PFN_vkEnumerateInstanceLayerProperties is access function (arg1 : access Interfaces.C.unsigned_short; arg2 : access VkLayerProperties) return VkResult with Convention => C; -- vulkan_core.h:3102 type PFN_vkEnumerateDeviceLayerProperties is access function (arg1 : VkPhysicalDevice; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkLayerProperties) return VkResult with Convention => C; -- vulkan_core.h:3103 type PFN_vkGetDeviceQueue is access procedure (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : System.Address) with Convention => C; -- vulkan_core.h:3104 type PFN_vkQueueSubmit is access function (arg1 : VkQueue; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkSubmitInfo; arg4 : VkFence) return VkResult with Convention => C; -- vulkan_core.h:3105 type PFN_vkQueueWaitIdle is access function (arg1 : VkQueue) return VkResult with Convention => C; -- vulkan_core.h:3106 type PFN_vkDeviceWaitIdle is access function (arg1 : VkDevice) return VkResult with Convention => C; -- vulkan_core.h:3107 type PFN_vkAllocateMemory is access function (arg1 : VkDevice; arg2 : access constant VkMemoryAllocateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3108 type PFN_vkFreeMemory is access procedure (arg1 : VkDevice; arg2 : VkDeviceMemory; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3109 type PFN_vkMapMemory is access function (arg1 : VkDevice; arg2 : VkDeviceMemory; arg3 : VkDeviceSize; arg4 : VkDeviceSize; arg5 : VkMemoryMapFlags; arg6 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3110 type PFN_vkUnmapMemory is access procedure (arg1 : VkDevice; arg2 : VkDeviceMemory) with Convention => C; -- vulkan_core.h:3111 type PFN_vkFlushMappedMemoryRanges is access function (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkMappedMemoryRange) return VkResult with Convention => C; -- vulkan_core.h:3112 type PFN_vkInvalidateMappedMemoryRanges is access function (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkMappedMemoryRange) return VkResult with Convention => C; -- vulkan_core.h:3113 type PFN_vkGetDeviceMemoryCommitment is access procedure (arg1 : VkDevice; arg2 : VkDeviceMemory; arg3 : access VkDeviceSize) with Convention => C; -- vulkan_core.h:3114 type PFN_vkBindBufferMemory is access function (arg1 : VkDevice; arg2 : VkBuffer; arg3 : VkDeviceMemory; arg4 : VkDeviceSize) return VkResult with Convention => C; -- vulkan_core.h:3115 type PFN_vkBindImageMemory is access function (arg1 : VkDevice; arg2 : VkImage; arg3 : VkDeviceMemory; arg4 : VkDeviceSize) return VkResult with Convention => C; -- vulkan_core.h:3116 type PFN_vkGetBufferMemoryRequirements is access procedure (arg1 : VkDevice; arg2 : VkBuffer; arg3 : access VkMemoryRequirements) with Convention => C; -- vulkan_core.h:3117 type PFN_vkGetImageMemoryRequirements is access procedure (arg1 : VkDevice; arg2 : VkImage; arg3 : access VkMemoryRequirements) with Convention => C; -- vulkan_core.h:3118 type PFN_vkGetImageSparseMemoryRequirements is access procedure (arg1 : VkDevice; arg2 : VkImage; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkSparseImageMemoryRequirements) with Convention => C; -- vulkan_core.h:3119 type PFN_vkGetPhysicalDeviceSparseImageFormatProperties is access procedure (arg1 : VkPhysicalDevice; arg2 : VkFormat; arg3 : VkImageType; arg4 : VkSampleCountFlagBits; arg5 : VkImageUsageFlags; arg6 : VkImageTiling; arg7 : access Interfaces.C.unsigned_short; arg8 : access VkSparseImageFormatProperties) with Convention => C; -- vulkan_core.h:3120 type PFN_vkQueueBindSparse is access function (arg1 : VkQueue; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkBindSparseInfo; arg4 : VkFence) return VkResult with Convention => C; -- vulkan_core.h:3121 type PFN_vkCreateFence is access function (arg1 : VkDevice; arg2 : access constant VkFenceCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3122 type PFN_vkDestroyFence is access procedure (arg1 : VkDevice; arg2 : VkFence; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3123 type PFN_vkResetFences is access function (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3124 type PFN_vkGetFenceStatus is access function (arg1 : VkDevice; arg2 : VkFence) return VkResult with Convention => C; -- vulkan_core.h:3125 type PFN_vkWaitForFences is access function (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : System.Address; arg4 : VkBool32; arg5 : Interfaces.C.unsigned_long) return VkResult with Convention => C; -- vulkan_core.h:3126 type PFN_vkCreateSemaphore is access function (arg1 : VkDevice; arg2 : access constant VkSemaphoreCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3127 type PFN_vkDestroySemaphore is access procedure (arg1 : VkDevice; arg2 : VkSemaphore; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3128 type PFN_vkCreateEvent is access function (arg1 : VkDevice; arg2 : access constant VkEventCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3129 type PFN_vkDestroyEvent is access procedure (arg1 : VkDevice; arg2 : VkEvent; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3130 type PFN_vkGetEventStatus is access function (arg1 : VkDevice; arg2 : VkEvent) return VkResult with Convention => C; -- vulkan_core.h:3131 type PFN_vkSetEvent is access function (arg1 : VkDevice; arg2 : VkEvent) return VkResult with Convention => C; -- vulkan_core.h:3132 type PFN_vkResetEvent is access function (arg1 : VkDevice; arg2 : VkEvent) return VkResult with Convention => C; -- vulkan_core.h:3133 type PFN_vkCreateQueryPool is access function (arg1 : VkDevice; arg2 : access constant VkQueryPoolCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3134 type PFN_vkDestroyQueryPool is access procedure (arg1 : VkDevice; arg2 : VkQueryPool; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3135 type PFN_vkGetQueryPoolResults is access function (arg1 : VkDevice; arg2 : VkQueryPool; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short; arg5 : size_t; arg6 : System.Address; arg7 : VkDeviceSize; arg8 : VkQueryResultFlags) return VkResult with Convention => C; -- vulkan_core.h:3136 type PFN_vkCreateBuffer is access function (arg1 : VkDevice; arg2 : access constant VkBufferCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3137 type PFN_vkDestroyBuffer is access procedure (arg1 : VkDevice; arg2 : VkBuffer; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3138 type PFN_vkCreateBufferView is access function (arg1 : VkDevice; arg2 : access constant VkBufferViewCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3139 type PFN_vkDestroyBufferView is access procedure (arg1 : VkDevice; arg2 : VkBufferView; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3140 type PFN_vkCreateImage is access function (arg1 : VkDevice; arg2 : access constant VkImageCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3141 type PFN_vkDestroyImage is access procedure (arg1 : VkDevice; arg2 : VkImage; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3142 type PFN_vkGetImageSubresourceLayout is access procedure (arg1 : VkDevice; arg2 : VkImage; arg3 : access constant VkImageSubresource; arg4 : access VkSubresourceLayout) with Convention => C; -- vulkan_core.h:3143 type PFN_vkCreateImageView is access function (arg1 : VkDevice; arg2 : access constant VkImageViewCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3144 type PFN_vkDestroyImageView is access procedure (arg1 : VkDevice; arg2 : VkImageView; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3145 type PFN_vkCreateShaderModule is access function (arg1 : VkDevice; arg2 : access constant VkShaderModuleCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3146 type PFN_vkDestroyShaderModule is access procedure (arg1 : VkDevice; arg2 : VkShaderModule; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3147 type PFN_vkCreatePipelineCache is access function (arg1 : VkDevice; arg2 : access constant VkPipelineCacheCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3148 type PFN_vkDestroyPipelineCache is access procedure (arg1 : VkDevice; arg2 : VkPipelineCache; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3149 type PFN_vkGetPipelineCacheData is access function (arg1 : VkDevice; arg2 : VkPipelineCache; arg3 : access size_t; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3150 type PFN_vkMergePipelineCaches is access function (arg1 : VkDevice; arg2 : VkPipelineCache; arg3 : Interfaces.C.unsigned_short; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3151 type PFN_vkCreateGraphicsPipelines is access function (arg1 : VkDevice; arg2 : VkPipelineCache; arg3 : Interfaces.C.unsigned_short; arg4 : access constant VkGraphicsPipelineCreateInfo; arg5 : access constant VkAllocationCallbacks; arg6 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3152 type PFN_vkCreateComputePipelines is access function (arg1 : VkDevice; arg2 : VkPipelineCache; arg3 : Interfaces.C.unsigned_short; arg4 : access constant VkComputePipelineCreateInfo; arg5 : access constant VkAllocationCallbacks; arg6 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3153 type PFN_vkDestroyPipeline is access procedure (arg1 : VkDevice; arg2 : VkPipeline; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3154 type PFN_vkCreatePipelineLayout is access function (arg1 : VkDevice; arg2 : access constant VkPipelineLayoutCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3155 type PFN_vkDestroyPipelineLayout is access procedure (arg1 : VkDevice; arg2 : VkPipelineLayout; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3156 type PFN_vkCreateSampler is access function (arg1 : VkDevice; arg2 : access constant VkSamplerCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3157 type PFN_vkDestroySampler is access procedure (arg1 : VkDevice; arg2 : VkSampler; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3158 type PFN_vkCreateDescriptorSetLayout is access function (arg1 : VkDevice; arg2 : access constant VkDescriptorSetLayoutCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3159 type PFN_vkDestroyDescriptorSetLayout is access procedure (arg1 : VkDevice; arg2 : VkDescriptorSetLayout; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3160 type PFN_vkCreateDescriptorPool is access function (arg1 : VkDevice; arg2 : access constant VkDescriptorPoolCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3161 type PFN_vkDestroyDescriptorPool is access procedure (arg1 : VkDevice; arg2 : VkDescriptorPool; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3162 type PFN_vkResetDescriptorPool is access function (arg1 : VkDevice; arg2 : VkDescriptorPool; arg3 : VkDescriptorPoolResetFlags) return VkResult with Convention => C; -- vulkan_core.h:3163 type PFN_vkAllocateDescriptorSets is access function (arg1 : VkDevice; arg2 : access constant VkDescriptorSetAllocateInfo; arg3 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3164 type PFN_vkFreeDescriptorSets is access function (arg1 : VkDevice; arg2 : VkDescriptorPool; arg3 : Interfaces.C.unsigned_short; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3165 type PFN_vkUpdateDescriptorSets is access procedure (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkWriteDescriptorSet; arg4 : Interfaces.C.unsigned_short; arg5 : access constant VkCopyDescriptorSet) with Convention => C; -- vulkan_core.h:3166 type PFN_vkCreateFramebuffer is access function (arg1 : VkDevice; arg2 : access constant VkFramebufferCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3167 type PFN_vkDestroyFramebuffer is access procedure (arg1 : VkDevice; arg2 : VkFramebuffer; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3168 type PFN_vkCreateRenderPass is access function (arg1 : VkDevice; arg2 : access constant VkRenderPassCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3169 type PFN_vkDestroyRenderPass is access procedure (arg1 : VkDevice; arg2 : VkRenderPass; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3170 type PFN_vkGetRenderAreaGranularity is access procedure (arg1 : VkDevice; arg2 : VkRenderPass; arg3 : access VkExtent2D) with Convention => C; -- vulkan_core.h:3171 type PFN_vkCreateCommandPool is access function (arg1 : VkDevice; arg2 : access constant VkCommandPoolCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3172 type PFN_vkDestroyCommandPool is access procedure (arg1 : VkDevice; arg2 : VkCommandPool; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:3173 type PFN_vkResetCommandPool is access function (arg1 : VkDevice; arg2 : VkCommandPool; arg3 : VkCommandPoolResetFlags) return VkResult with Convention => C; -- vulkan_core.h:3174 type PFN_vkAllocateCommandBuffers is access function (arg1 : VkDevice; arg2 : access constant VkCommandBufferAllocateInfo; arg3 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:3175 type PFN_vkFreeCommandBuffers is access procedure (arg1 : VkDevice; arg2 : VkCommandPool; arg3 : Interfaces.C.unsigned_short; arg4 : System.Address) with Convention => C; -- vulkan_core.h:3176 type PFN_vkBeginCommandBuffer is access function (arg1 : VkCommandBuffer; arg2 : access constant VkCommandBufferBeginInfo) return VkResult with Convention => C; -- vulkan_core.h:3177 type PFN_vkEndCommandBuffer is access function (arg1 : VkCommandBuffer) return VkResult with Convention => C; -- vulkan_core.h:3178 type PFN_vkResetCommandBuffer is access function (arg1 : VkCommandBuffer; arg2 : VkCommandBufferResetFlags) return VkResult with Convention => C; -- vulkan_core.h:3179 type PFN_vkCmdBindPipeline is access procedure (arg1 : VkCommandBuffer; arg2 : VkPipelineBindPoint; arg3 : VkPipeline) with Convention => C; -- vulkan_core.h:3180 type PFN_vkCmdSetViewport is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : access constant VkViewport) with Convention => C; -- vulkan_core.h:3181 type PFN_vkCmdSetScissor is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : access constant VkRect2D) with Convention => C; -- vulkan_core.h:3182 type PFN_vkCmdSetLineWidth is access procedure (arg1 : VkCommandBuffer; arg2 : float) with Convention => C; -- vulkan_core.h:3183 type PFN_vkCmdSetDepthBias is access procedure (arg1 : VkCommandBuffer; arg2 : float; arg3 : float; arg4 : float) with Convention => C; -- vulkan_core.h:3184 type PFN_vkCmdSetBlendConstants is access procedure (arg1 : VkCommandBuffer; arg2 : access float) with Convention => C; -- vulkan_core.h:3185 type PFN_vkCmdSetDepthBounds is access procedure (arg1 : VkCommandBuffer; arg2 : float; arg3 : float) with Convention => C; -- vulkan_core.h:3186 type PFN_vkCmdSetStencilCompareMask is access procedure (arg1 : VkCommandBuffer; arg2 : VkStencilFaceFlags; arg3 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3187 type PFN_vkCmdSetStencilWriteMask is access procedure (arg1 : VkCommandBuffer; arg2 : VkStencilFaceFlags; arg3 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3188 type PFN_vkCmdSetStencilReference is access procedure (arg1 : VkCommandBuffer; arg2 : VkStencilFaceFlags; arg3 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3189 type PFN_vkCmdBindDescriptorSets is access procedure (arg1 : VkCommandBuffer; arg2 : VkPipelineBindPoint; arg3 : VkPipelineLayout; arg4 : Interfaces.C.unsigned_short; arg5 : Interfaces.C.unsigned_short; arg6 : System.Address; arg7 : Interfaces.C.unsigned_short; arg8 : access Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3190 type PFN_vkCmdBindIndexBuffer is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : VkIndexType) with Convention => C; -- vulkan_core.h:3191 type PFN_vkCmdBindVertexBuffers is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : System.Address; arg5 : access VkDeviceSize) with Convention => C; -- vulkan_core.h:3192 type PFN_vkCmdDraw is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short; arg5 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3193 type PFN_vkCmdDrawIndexed is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short; arg5 : Interfaces.C.short; arg6 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3194 type PFN_vkCmdDrawIndirect is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : Interfaces.C.unsigned_short; arg5 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3195 type PFN_vkCmdDrawIndexedIndirect is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : Interfaces.C.unsigned_short; arg5 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3196 type PFN_vkCmdDispatch is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3197 type PFN_vkCmdDispatchIndirect is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize) with Convention => C; -- vulkan_core.h:3198 type PFN_vkCmdCopyBuffer is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkBuffer; arg4 : Interfaces.C.unsigned_short; arg5 : access constant VkBufferCopy) with Convention => C; -- vulkan_core.h:3199 type PFN_vkCmdCopyImage is access procedure (arg1 : VkCommandBuffer; arg2 : VkImage; arg3 : VkImageLayout; arg4 : VkImage; arg5 : VkImageLayout; arg6 : Interfaces.C.unsigned_short; arg7 : access constant VkImageCopy) with Convention => C; -- vulkan_core.h:3200 type PFN_vkCmdBlitImage is access procedure (arg1 : VkCommandBuffer; arg2 : VkImage; arg3 : VkImageLayout; arg4 : VkImage; arg5 : VkImageLayout; arg6 : Interfaces.C.unsigned_short; arg7 : access constant VkImageBlit; arg8 : VkFilter) with Convention => C; -- vulkan_core.h:3201 type PFN_vkCmdCopyBufferToImage is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkImage; arg4 : VkImageLayout; arg5 : Interfaces.C.unsigned_short; arg6 : access constant VkBufferImageCopy) with Convention => C; -- vulkan_core.h:3202 type PFN_vkCmdCopyImageToBuffer is access procedure (arg1 : VkCommandBuffer; arg2 : VkImage; arg3 : VkImageLayout; arg4 : VkBuffer; arg5 : Interfaces.C.unsigned_short; arg6 : access constant VkBufferImageCopy) with Convention => C; -- vulkan_core.h:3203 type PFN_vkCmdUpdateBuffer is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : VkDeviceSize; arg5 : System.Address) with Convention => C; -- vulkan_core.h:3204 type PFN_vkCmdFillBuffer is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : VkDeviceSize; arg5 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3205 type PFN_vkCmdClearColorImage is access procedure (arg1 : VkCommandBuffer; arg2 : VkImage; arg3 : VkImageLayout; arg4 : access constant VkClearColorValue; arg5 : Interfaces.C.unsigned_short; arg6 : access constant VkImageSubresourceRange) with Convention => C; -- vulkan_core.h:3206 type PFN_vkCmdClearDepthStencilImage is access procedure (arg1 : VkCommandBuffer; arg2 : VkImage; arg3 : VkImageLayout; arg4 : access constant VkClearDepthStencilValue; arg5 : Interfaces.C.unsigned_short; arg6 : access constant VkImageSubresourceRange) with Convention => C; -- vulkan_core.h:3207 type PFN_vkCmdClearAttachments is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkClearAttachment; arg4 : Interfaces.C.unsigned_short; arg5 : access constant VkClearRect) with Convention => C; -- vulkan_core.h:3208 type PFN_vkCmdResolveImage is access procedure (arg1 : VkCommandBuffer; arg2 : VkImage; arg3 : VkImageLayout; arg4 : VkImage; arg5 : VkImageLayout; arg6 : Interfaces.C.unsigned_short; arg7 : access constant VkImageResolve) with Convention => C; -- vulkan_core.h:3209 type PFN_vkCmdSetEvent is access procedure (arg1 : VkCommandBuffer; arg2 : VkEvent; arg3 : VkPipelineStageFlags) with Convention => C; -- vulkan_core.h:3210 type PFN_vkCmdResetEvent is access procedure (arg1 : VkCommandBuffer; arg2 : VkEvent; arg3 : VkPipelineStageFlags) with Convention => C; -- vulkan_core.h:3211 type PFN_vkCmdWaitEvents is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : System.Address; arg4 : VkPipelineStageFlags; arg5 : VkPipelineStageFlags; arg6 : Interfaces.C.unsigned_short; arg7 : access constant VkMemoryBarrier; arg8 : Interfaces.C.unsigned_short; arg9 : access constant VkBufferMemoryBarrier; arg10 : Interfaces.C.unsigned_short; arg11 : access constant VkImageMemoryBarrier) with Convention => C; -- vulkan_core.h:3212 type PFN_vkCmdPipelineBarrier is access procedure (arg1 : VkCommandBuffer; arg2 : VkPipelineStageFlags; arg3 : VkPipelineStageFlags; arg4 : VkDependencyFlags; arg5 : Interfaces.C.unsigned_short; arg6 : access constant VkMemoryBarrier; arg7 : Interfaces.C.unsigned_short; arg8 : access constant VkBufferMemoryBarrier; arg9 : Interfaces.C.unsigned_short; arg10 : access constant VkImageMemoryBarrier) with Convention => C; -- vulkan_core.h:3213 type PFN_vkCmdBeginQuery is access procedure (arg1 : VkCommandBuffer; arg2 : VkQueryPool; arg3 : Interfaces.C.unsigned_short; arg4 : VkQueryControlFlags) with Convention => C; -- vulkan_core.h:3214 type PFN_vkCmdEndQuery is access procedure (arg1 : VkCommandBuffer; arg2 : VkQueryPool; arg3 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3215 type PFN_vkCmdResetQueryPool is access procedure (arg1 : VkCommandBuffer; arg2 : VkQueryPool; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3216 type PFN_vkCmdWriteTimestamp is access procedure (arg1 : VkCommandBuffer; arg2 : VkPipelineStageFlagBits; arg3 : VkQueryPool; arg4 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:3217 type PFN_vkCmdCopyQueryPoolResults is access procedure (arg1 : VkCommandBuffer; arg2 : VkQueryPool; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short; arg5 : VkBuffer; arg6 : VkDeviceSize; arg7 : VkDeviceSize; arg8 : VkQueryResultFlags) with Convention => C; -- vulkan_core.h:3218 type PFN_vkCmdPushConstants is access procedure (arg1 : VkCommandBuffer; arg2 : VkPipelineLayout; arg3 : VkShaderStageFlags; arg4 : Interfaces.C.unsigned_short; arg5 : Interfaces.C.unsigned_short; arg6 : System.Address) with Convention => C; -- vulkan_core.h:3219 type PFN_vkCmdBeginRenderPass is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkRenderPassBeginInfo; arg3 : VkSubpassContents) with Convention => C; -- vulkan_core.h:3220 type PFN_vkCmdNextSubpass is access procedure (arg1 : VkCommandBuffer; arg2 : VkSubpassContents) with Convention => C; -- vulkan_core.h:3221 type PFN_vkCmdEndRenderPass is access procedure (arg1 : VkCommandBuffer) with Convention => C; -- vulkan_core.h:3222 type PFN_vkCmdExecuteCommands is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : System.Address) with Convention => C; -- vulkan_core.h:3223 function vkCreateInstance (pCreateInfo : access constant VkInstanceCreateInfo; pAllocator : access constant VkAllocationCallbacks; pInstance : System.Address) return VkResult -- vulkan_core.h:3226 with Import => True, Convention => C, External_Name => "vkCreateInstance"; procedure vkDestroyInstance (instance : VkInstance; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3231 with Import => True, Convention => C, External_Name => "vkDestroyInstance"; function vkEnumeratePhysicalDevices (instance : VkInstance; pPhysicalDeviceCount : access Interfaces.C.unsigned_short; pPhysicalDevices : System.Address) return VkResult -- vulkan_core.h:3235 with Import => True, Convention => C, External_Name => "vkEnumeratePhysicalDevices"; procedure vkGetPhysicalDeviceFeatures (physicalDevice : VkPhysicalDevice; pFeatures : access VkPhysicalDeviceFeatures) -- vulkan_core.h:3240 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceFeatures"; procedure vkGetPhysicalDeviceFormatProperties (physicalDevice : VkPhysicalDevice; format : VkFormat; pFormatProperties : access VkFormatProperties) -- vulkan_core.h:3244 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceFormatProperties"; function vkGetPhysicalDeviceImageFormatProperties (physicalDevice : VkPhysicalDevice; format : VkFormat; c_type : VkImageType; tiling : VkImageTiling; usage : VkImageUsageFlags; flags : VkImageCreateFlags; pImageFormatProperties : access VkImageFormatProperties) return VkResult -- vulkan_core.h:3249 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceImageFormatProperties"; procedure vkGetPhysicalDeviceProperties (physicalDevice : VkPhysicalDevice; pProperties : access VkPhysicalDeviceProperties) -- vulkan_core.h:3258 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceProperties"; procedure vkGetPhysicalDeviceQueueFamilyProperties (physicalDevice : VkPhysicalDevice; pQueueFamilyPropertyCount : access Interfaces.C.unsigned_short; pQueueFamilyProperties : access VkQueueFamilyProperties) -- vulkan_core.h:3262 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceQueueFamilyProperties"; procedure vkGetPhysicalDeviceMemoryProperties (physicalDevice : VkPhysicalDevice; pMemoryProperties : access VkPhysicalDeviceMemoryProperties) -- vulkan_core.h:3267 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceMemoryProperties"; function vkGetInstanceProcAddr (instance : VkInstance; pName : Interfaces.C.Strings.chars_ptr) return PFN_vkVoidFunction -- vulkan_core.h:3271 with Import => True, Convention => C, External_Name => "vkGetInstanceProcAddr"; function vkGetDeviceProcAddr (device : VkDevice; pName : Interfaces.C.Strings.chars_ptr) return PFN_vkVoidFunction -- vulkan_core.h:3275 with Import => True, Convention => C, External_Name => "vkGetDeviceProcAddr"; function vkCreateDevice (physicalDevice : VkPhysicalDevice; pCreateInfo : access constant VkDeviceCreateInfo; pAllocator : access constant VkAllocationCallbacks; pDevice : System.Address) return VkResult -- vulkan_core.h:3279 with Import => True, Convention => C, External_Name => "vkCreateDevice"; procedure vkDestroyDevice (device : VkDevice; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3285 with Import => True, Convention => C, External_Name => "vkDestroyDevice"; function vkEnumerateInstanceExtensionProperties (pLayerName : Interfaces.C.Strings.chars_ptr; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkExtensionProperties) return VkResult -- vulkan_core.h:3289 with Import => True, Convention => C, External_Name => "vkEnumerateInstanceExtensionProperties"; function vkEnumerateDeviceExtensionProperties (physicalDevice : VkPhysicalDevice; pLayerName : Interfaces.C.Strings.chars_ptr; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkExtensionProperties) return VkResult -- vulkan_core.h:3294 with Import => True, Convention => C, External_Name => "vkEnumerateDeviceExtensionProperties"; function vkEnumerateInstanceLayerProperties (pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkLayerProperties) return VkResult -- vulkan_core.h:3300 with Import => True, Convention => C, External_Name => "vkEnumerateInstanceLayerProperties"; function vkEnumerateDeviceLayerProperties (physicalDevice : VkPhysicalDevice; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkLayerProperties) return VkResult -- vulkan_core.h:3304 with Import => True, Convention => C, External_Name => "vkEnumerateDeviceLayerProperties"; procedure vkGetDeviceQueue (device : VkDevice; queueFamilyIndex : Interfaces.C.unsigned_short; queueIndex : Interfaces.C.unsigned_short; pQueue : System.Address) -- vulkan_core.h:3309 with Import => True, Convention => C, External_Name => "vkGetDeviceQueue"; function vkQueueSubmit (queue : VkQueue; submitCount : Interfaces.C.unsigned_short; pSubmits : access constant VkSubmitInfo; fence : VkFence) return VkResult -- vulkan_core.h:3315 with Import => True, Convention => C, External_Name => "vkQueueSubmit"; function vkQueueWaitIdle (queue : VkQueue) return VkResult -- vulkan_core.h:3321 with Import => True, Convention => C, External_Name => "vkQueueWaitIdle"; function vkDeviceWaitIdle (device : VkDevice) return VkResult -- vulkan_core.h:3324 with Import => True, Convention => C, External_Name => "vkDeviceWaitIdle"; function vkAllocateMemory (device : VkDevice; pAllocateInfo : access constant VkMemoryAllocateInfo; pAllocator : access constant VkAllocationCallbacks; pMemory : System.Address) return VkResult -- vulkan_core.h:3327 with Import => True, Convention => C, External_Name => "vkAllocateMemory"; procedure vkFreeMemory (device : VkDevice; memory : VkDeviceMemory; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3333 with Import => True, Convention => C, External_Name => "vkFreeMemory"; function vkMapMemory (device : VkDevice; memory : VkDeviceMemory; offset : VkDeviceSize; size : VkDeviceSize; flags : VkMemoryMapFlags; ppData : System.Address) return VkResult -- vulkan_core.h:3338 with Import => True, Convention => C, External_Name => "vkMapMemory"; procedure vkUnmapMemory (device : VkDevice; memory : VkDeviceMemory) -- vulkan_core.h:3346 with Import => True, Convention => C, External_Name => "vkUnmapMemory"; function vkFlushMappedMemoryRanges (device : VkDevice; memoryRangeCount : Interfaces.C.unsigned_short; pMemoryRanges : access constant VkMappedMemoryRange) return VkResult -- vulkan_core.h:3350 with Import => True, Convention => C, External_Name => "vkFlushMappedMemoryRanges"; function vkInvalidateMappedMemoryRanges (device : VkDevice; memoryRangeCount : Interfaces.C.unsigned_short; pMemoryRanges : access constant VkMappedMemoryRange) return VkResult -- vulkan_core.h:3355 with Import => True, Convention => C, External_Name => "vkInvalidateMappedMemoryRanges"; procedure vkGetDeviceMemoryCommitment (device : VkDevice; memory : VkDeviceMemory; pCommittedMemoryInBytes : access VkDeviceSize) -- vulkan_core.h:3360 with Import => True, Convention => C, External_Name => "vkGetDeviceMemoryCommitment"; function vkBindBufferMemory (device : VkDevice; buffer : VkBuffer; memory : VkDeviceMemory; memoryOffset : VkDeviceSize) return VkResult -- vulkan_core.h:3365 with Import => True, Convention => C, External_Name => "vkBindBufferMemory"; function vkBindImageMemory (device : VkDevice; image : VkImage; memory : VkDeviceMemory; memoryOffset : VkDeviceSize) return VkResult -- vulkan_core.h:3371 with Import => True, Convention => C, External_Name => "vkBindImageMemory"; procedure vkGetBufferMemoryRequirements (device : VkDevice; buffer : VkBuffer; pMemoryRequirements : access VkMemoryRequirements) -- vulkan_core.h:3377 with Import => True, Convention => C, External_Name => "vkGetBufferMemoryRequirements"; procedure vkGetImageMemoryRequirements (device : VkDevice; image : VkImage; pMemoryRequirements : access VkMemoryRequirements) -- vulkan_core.h:3382 with Import => True, Convention => C, External_Name => "vkGetImageMemoryRequirements"; procedure vkGetImageSparseMemoryRequirements (device : VkDevice; image : VkImage; pSparseMemoryRequirementCount : access Interfaces.C.unsigned_short; pSparseMemoryRequirements : access VkSparseImageMemoryRequirements) -- vulkan_core.h:3387 with Import => True, Convention => C, External_Name => "vkGetImageSparseMemoryRequirements"; procedure vkGetPhysicalDeviceSparseImageFormatProperties (physicalDevice : VkPhysicalDevice; format : VkFormat; c_type : VkImageType; samples : VkSampleCountFlagBits; usage : VkImageUsageFlags; tiling : VkImageTiling; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkSparseImageFormatProperties) -- vulkan_core.h:3393 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceSparseImageFormatProperties"; function vkQueueBindSparse (queue : VkQueue; bindInfoCount : Interfaces.C.unsigned_short; pBindInfo : access constant VkBindSparseInfo; fence : VkFence) return VkResult -- vulkan_core.h:3403 with Import => True, Convention => C, External_Name => "vkQueueBindSparse"; function vkCreateFence (device : VkDevice; pCreateInfo : access constant VkFenceCreateInfo; pAllocator : access constant VkAllocationCallbacks; pFence : System.Address) return VkResult -- vulkan_core.h:3409 with Import => True, Convention => C, External_Name => "vkCreateFence"; procedure vkDestroyFence (device : VkDevice; fence : VkFence; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3415 with Import => True, Convention => C, External_Name => "vkDestroyFence"; function vkResetFences (device : VkDevice; fenceCount : Interfaces.C.unsigned_short; pFences : System.Address) return VkResult -- vulkan_core.h:3420 with Import => True, Convention => C, External_Name => "vkResetFences"; function vkGetFenceStatus (device : VkDevice; fence : VkFence) return VkResult -- vulkan_core.h:3425 with Import => True, Convention => C, External_Name => "vkGetFenceStatus"; function vkWaitForFences (device : VkDevice; fenceCount : Interfaces.C.unsigned_short; pFences : System.Address; waitAll : VkBool32; timeout : Interfaces.C.unsigned_long) return VkResult -- vulkan_core.h:3429 with Import => True, Convention => C, External_Name => "vkWaitForFences"; function vkCreateSemaphore (device : VkDevice; pCreateInfo : access constant VkSemaphoreCreateInfo; pAllocator : access constant VkAllocationCallbacks; pSemaphore : System.Address) return VkResult -- vulkan_core.h:3436 with Import => True, Convention => C, External_Name => "vkCreateSemaphore"; procedure vkDestroySemaphore (device : VkDevice; semaphore : VkSemaphore; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3442 with Import => True, Convention => C, External_Name => "vkDestroySemaphore"; function vkCreateEvent (device : VkDevice; pCreateInfo : access constant VkEventCreateInfo; pAllocator : access constant VkAllocationCallbacks; pEvent : System.Address) return VkResult -- vulkan_core.h:3447 with Import => True, Convention => C, External_Name => "vkCreateEvent"; procedure vkDestroyEvent (device : VkDevice; event : VkEvent; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3453 with Import => True, Convention => C, External_Name => "vkDestroyEvent"; function vkGetEventStatus (device : VkDevice; event : VkEvent) return VkResult -- vulkan_core.h:3458 with Import => True, Convention => C, External_Name => "vkGetEventStatus"; function vkSetEvent (device : VkDevice; event : VkEvent) return VkResult -- vulkan_core.h:3462 with Import => True, Convention => C, External_Name => "vkSetEvent"; function vkResetEvent (device : VkDevice; event : VkEvent) return VkResult -- vulkan_core.h:3466 with Import => True, Convention => C, External_Name => "vkResetEvent"; function vkCreateQueryPool (device : VkDevice; pCreateInfo : access constant VkQueryPoolCreateInfo; pAllocator : access constant VkAllocationCallbacks; pQueryPool : System.Address) return VkResult -- vulkan_core.h:3470 with Import => True, Convention => C, External_Name => "vkCreateQueryPool"; procedure vkDestroyQueryPool (device : VkDevice; queryPool : VkQueryPool; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3476 with Import => True, Convention => C, External_Name => "vkDestroyQueryPool"; function vkGetQueryPoolResults (device : VkDevice; queryPool : VkQueryPool; firstQuery : Interfaces.C.unsigned_short; queryCount : Interfaces.C.unsigned_short; dataSize : size_t; pData : System.Address; stride : VkDeviceSize; flags : VkQueryResultFlags) return VkResult -- vulkan_core.h:3481 with Import => True, Convention => C, External_Name => "vkGetQueryPoolResults"; function vkCreateBuffer (device : VkDevice; pCreateInfo : access constant VkBufferCreateInfo; pAllocator : access constant VkAllocationCallbacks; pBuffer : System.Address) return VkResult -- vulkan_core.h:3491 with Import => True, Convention => C, External_Name => "vkCreateBuffer"; procedure vkDestroyBuffer (device : VkDevice; buffer : VkBuffer; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3497 with Import => True, Convention => C, External_Name => "vkDestroyBuffer"; function vkCreateBufferView (device : VkDevice; pCreateInfo : access constant VkBufferViewCreateInfo; pAllocator : access constant VkAllocationCallbacks; pView : System.Address) return VkResult -- vulkan_core.h:3502 with Import => True, Convention => C, External_Name => "vkCreateBufferView"; procedure vkDestroyBufferView (device : VkDevice; bufferView : VkBufferView; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3508 with Import => True, Convention => C, External_Name => "vkDestroyBufferView"; function vkCreateImage (device : VkDevice; pCreateInfo : access constant VkImageCreateInfo; pAllocator : access constant VkAllocationCallbacks; pImage : System.Address) return VkResult -- vulkan_core.h:3513 with Import => True, Convention => C, External_Name => "vkCreateImage"; procedure vkDestroyImage (device : VkDevice; image : VkImage; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3519 with Import => True, Convention => C, External_Name => "vkDestroyImage"; procedure vkGetImageSubresourceLayout (device : VkDevice; image : VkImage; pSubresource : access constant VkImageSubresource; pLayout : access VkSubresourceLayout) -- vulkan_core.h:3524 with Import => True, Convention => C, External_Name => "vkGetImageSubresourceLayout"; function vkCreateImageView (device : VkDevice; pCreateInfo : access constant VkImageViewCreateInfo; pAllocator : access constant VkAllocationCallbacks; pView : System.Address) return VkResult -- vulkan_core.h:3530 with Import => True, Convention => C, External_Name => "vkCreateImageView"; procedure vkDestroyImageView (device : VkDevice; imageView : VkImageView; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3536 with Import => True, Convention => C, External_Name => "vkDestroyImageView"; function vkCreateShaderModule (device : VkDevice; pCreateInfo : access constant VkShaderModuleCreateInfo; pAllocator : access constant VkAllocationCallbacks; pShaderModule : System.Address) return VkResult -- vulkan_core.h:3541 with Import => True, Convention => C, External_Name => "vkCreateShaderModule"; procedure vkDestroyShaderModule (device : VkDevice; shaderModule : VkShaderModule; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3547 with Import => True, Convention => C, External_Name => "vkDestroyShaderModule"; function vkCreatePipelineCache (device : VkDevice; pCreateInfo : access constant VkPipelineCacheCreateInfo; pAllocator : access constant VkAllocationCallbacks; pPipelineCache : System.Address) return VkResult -- vulkan_core.h:3552 with Import => True, Convention => C, External_Name => "vkCreatePipelineCache"; procedure vkDestroyPipelineCache (device : VkDevice; pipelineCache : VkPipelineCache; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3558 with Import => True, Convention => C, External_Name => "vkDestroyPipelineCache"; function vkGetPipelineCacheData (device : VkDevice; pipelineCache : VkPipelineCache; pDataSize : access size_t; pData : System.Address) return VkResult -- vulkan_core.h:3563 with Import => True, Convention => C, External_Name => "vkGetPipelineCacheData"; function vkMergePipelineCaches (device : VkDevice; dstCache : VkPipelineCache; srcCacheCount : Interfaces.C.unsigned_short; pSrcCaches : System.Address) return VkResult -- vulkan_core.h:3569 with Import => True, Convention => C, External_Name => "vkMergePipelineCaches"; function vkCreateGraphicsPipelines (device : VkDevice; pipelineCache : VkPipelineCache; createInfoCount : Interfaces.C.unsigned_short; pCreateInfos : access constant VkGraphicsPipelineCreateInfo; pAllocator : access constant VkAllocationCallbacks; pPipelines : System.Address) return VkResult -- vulkan_core.h:3575 with Import => True, Convention => C, External_Name => "vkCreateGraphicsPipelines"; function vkCreateComputePipelines (device : VkDevice; pipelineCache : VkPipelineCache; createInfoCount : Interfaces.C.unsigned_short; pCreateInfos : access constant VkComputePipelineCreateInfo; pAllocator : access constant VkAllocationCallbacks; pPipelines : System.Address) return VkResult -- vulkan_core.h:3583 with Import => True, Convention => C, External_Name => "vkCreateComputePipelines"; procedure vkDestroyPipeline (device : VkDevice; pipeline : VkPipeline; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3591 with Import => True, Convention => C, External_Name => "vkDestroyPipeline"; function vkCreatePipelineLayout (device : VkDevice; pCreateInfo : access constant VkPipelineLayoutCreateInfo; pAllocator : access constant VkAllocationCallbacks; pPipelineLayout : System.Address) return VkResult -- vulkan_core.h:3596 with Import => True, Convention => C, External_Name => "vkCreatePipelineLayout"; procedure vkDestroyPipelineLayout (device : VkDevice; pipelineLayout : VkPipelineLayout; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3602 with Import => True, Convention => C, External_Name => "vkDestroyPipelineLayout"; function vkCreateSampler (device : VkDevice; pCreateInfo : access constant VkSamplerCreateInfo; pAllocator : access constant VkAllocationCallbacks; pSampler : System.Address) return VkResult -- vulkan_core.h:3607 with Import => True, Convention => C, External_Name => "vkCreateSampler"; procedure vkDestroySampler (device : VkDevice; sampler : VkSampler; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3613 with Import => True, Convention => C, External_Name => "vkDestroySampler"; function vkCreateDescriptorSetLayout (device : VkDevice; pCreateInfo : access constant VkDescriptorSetLayoutCreateInfo; pAllocator : access constant VkAllocationCallbacks; pSetLayout : System.Address) return VkResult -- vulkan_core.h:3618 with Import => True, Convention => C, External_Name => "vkCreateDescriptorSetLayout"; procedure vkDestroyDescriptorSetLayout (device : VkDevice; descriptorSetLayout : VkDescriptorSetLayout; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3624 with Import => True, Convention => C, External_Name => "vkDestroyDescriptorSetLayout"; function vkCreateDescriptorPool (device : VkDevice; pCreateInfo : access constant VkDescriptorPoolCreateInfo; pAllocator : access constant VkAllocationCallbacks; pDescriptorPool : System.Address) return VkResult -- vulkan_core.h:3629 with Import => True, Convention => C, External_Name => "vkCreateDescriptorPool"; procedure vkDestroyDescriptorPool (device : VkDevice; descriptorPool : VkDescriptorPool; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3635 with Import => True, Convention => C, External_Name => "vkDestroyDescriptorPool"; function vkResetDescriptorPool (device : VkDevice; descriptorPool : VkDescriptorPool; flags : VkDescriptorPoolResetFlags) return VkResult -- vulkan_core.h:3640 with Import => True, Convention => C, External_Name => "vkResetDescriptorPool"; function vkAllocateDescriptorSets (device : VkDevice; pAllocateInfo : access constant VkDescriptorSetAllocateInfo; pDescriptorSets : System.Address) return VkResult -- vulkan_core.h:3645 with Import => True, Convention => C, External_Name => "vkAllocateDescriptorSets"; function vkFreeDescriptorSets (device : VkDevice; descriptorPool : VkDescriptorPool; descriptorSetCount : Interfaces.C.unsigned_short; pDescriptorSets : System.Address) return VkResult -- vulkan_core.h:3650 with Import => True, Convention => C, External_Name => "vkFreeDescriptorSets"; procedure vkUpdateDescriptorSets (device : VkDevice; descriptorWriteCount : Interfaces.C.unsigned_short; pDescriptorWrites : access constant VkWriteDescriptorSet; descriptorCopyCount : Interfaces.C.unsigned_short; pDescriptorCopies : access constant VkCopyDescriptorSet) -- vulkan_core.h:3656 with Import => True, Convention => C, External_Name => "vkUpdateDescriptorSets"; function vkCreateFramebuffer (device : VkDevice; pCreateInfo : access constant VkFramebufferCreateInfo; pAllocator : access constant VkAllocationCallbacks; pFramebuffer : System.Address) return VkResult -- vulkan_core.h:3663 with Import => True, Convention => C, External_Name => "vkCreateFramebuffer"; procedure vkDestroyFramebuffer (device : VkDevice; framebuffer : VkFramebuffer; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3669 with Import => True, Convention => C, External_Name => "vkDestroyFramebuffer"; function vkCreateRenderPass (device : VkDevice; pCreateInfo : access constant VkRenderPassCreateInfo; pAllocator : access constant VkAllocationCallbacks; pRenderPass : System.Address) return VkResult -- vulkan_core.h:3674 with Import => True, Convention => C, External_Name => "vkCreateRenderPass"; procedure vkDestroyRenderPass (device : VkDevice; renderPass : VkRenderPass; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3680 with Import => True, Convention => C, External_Name => "vkDestroyRenderPass"; procedure vkGetRenderAreaGranularity (device : VkDevice; renderPass : VkRenderPass; pGranularity : access VkExtent2D) -- vulkan_core.h:3685 with Import => True, Convention => C, External_Name => "vkGetRenderAreaGranularity"; function vkCreateCommandPool (device : VkDevice; pCreateInfo : access constant VkCommandPoolCreateInfo; pAllocator : access constant VkAllocationCallbacks; pCommandPool : System.Address) return VkResult -- vulkan_core.h:3690 with Import => True, Convention => C, External_Name => "vkCreateCommandPool"; procedure vkDestroyCommandPool (device : VkDevice; commandPool : VkCommandPool; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:3696 with Import => True, Convention => C, External_Name => "vkDestroyCommandPool"; function vkResetCommandPool (device : VkDevice; commandPool : VkCommandPool; flags : VkCommandPoolResetFlags) return VkResult -- vulkan_core.h:3701 with Import => True, Convention => C, External_Name => "vkResetCommandPool"; function vkAllocateCommandBuffers (device : VkDevice; pAllocateInfo : access constant VkCommandBufferAllocateInfo; pCommandBuffers : System.Address) return VkResult -- vulkan_core.h:3706 with Import => True, Convention => C, External_Name => "vkAllocateCommandBuffers"; procedure vkFreeCommandBuffers (device : VkDevice; commandPool : VkCommandPool; commandBufferCount : Interfaces.C.unsigned_short; pCommandBuffers : System.Address) -- vulkan_core.h:3711 with Import => True, Convention => C, External_Name => "vkFreeCommandBuffers"; function vkBeginCommandBuffer (commandBuffer : VkCommandBuffer; pBeginInfo : access constant VkCommandBufferBeginInfo) return VkResult -- vulkan_core.h:3717 with Import => True, Convention => C, External_Name => "vkBeginCommandBuffer"; function vkEndCommandBuffer (commandBuffer : VkCommandBuffer) return VkResult -- vulkan_core.h:3721 with Import => True, Convention => C, External_Name => "vkEndCommandBuffer"; function vkResetCommandBuffer (commandBuffer : VkCommandBuffer; flags : VkCommandBufferResetFlags) return VkResult -- vulkan_core.h:3724 with Import => True, Convention => C, External_Name => "vkResetCommandBuffer"; procedure vkCmdBindPipeline (commandBuffer : VkCommandBuffer; pipelineBindPoint : VkPipelineBindPoint; pipeline : VkPipeline) -- vulkan_core.h:3728 with Import => True, Convention => C, External_Name => "vkCmdBindPipeline"; procedure vkCmdSetViewport (commandBuffer : VkCommandBuffer; firstViewport : Interfaces.C.unsigned_short; viewportCount : Interfaces.C.unsigned_short; pViewports : access constant VkViewport) -- vulkan_core.h:3733 with Import => True, Convention => C, External_Name => "vkCmdSetViewport"; procedure vkCmdSetScissor (commandBuffer : VkCommandBuffer; firstScissor : Interfaces.C.unsigned_short; scissorCount : Interfaces.C.unsigned_short; pScissors : access constant VkRect2D) -- vulkan_core.h:3739 with Import => True, Convention => C, External_Name => "vkCmdSetScissor"; procedure vkCmdSetLineWidth (commandBuffer : VkCommandBuffer; lineWidth : float) -- vulkan_core.h:3745 with Import => True, Convention => C, External_Name => "vkCmdSetLineWidth"; procedure vkCmdSetDepthBias (commandBuffer : VkCommandBuffer; depthBiasConstantFactor : float; depthBiasClamp : float; depthBiasSlopeFactor : float) -- vulkan_core.h:3749 with Import => True, Convention => C, External_Name => "vkCmdSetDepthBias"; procedure vkCmdSetBlendConstants (commandBuffer : VkCommandBuffer; blendConstants : access float) -- vulkan_core.h:3755 with Import => True, Convention => C, External_Name => "vkCmdSetBlendConstants"; procedure vkCmdSetDepthBounds (commandBuffer : VkCommandBuffer; minDepthBounds : float; maxDepthBounds : float) -- vulkan_core.h:3759 with Import => True, Convention => C, External_Name => "vkCmdSetDepthBounds"; procedure vkCmdSetStencilCompareMask (commandBuffer : VkCommandBuffer; faceMask : VkStencilFaceFlags; compareMask : Interfaces.C.unsigned_short) -- vulkan_core.h:3764 with Import => True, Convention => C, External_Name => "vkCmdSetStencilCompareMask"; procedure vkCmdSetStencilWriteMask (commandBuffer : VkCommandBuffer; faceMask : VkStencilFaceFlags; writeMask : Interfaces.C.unsigned_short) -- vulkan_core.h:3769 with Import => True, Convention => C, External_Name => "vkCmdSetStencilWriteMask"; procedure vkCmdSetStencilReference (commandBuffer : VkCommandBuffer; faceMask : VkStencilFaceFlags; reference : Interfaces.C.unsigned_short) -- vulkan_core.h:3774 with Import => True, Convention => C, External_Name => "vkCmdSetStencilReference"; procedure vkCmdBindDescriptorSets (commandBuffer : VkCommandBuffer; pipelineBindPoint : VkPipelineBindPoint; layout : VkPipelineLayout; firstSet : Interfaces.C.unsigned_short; descriptorSetCount : Interfaces.C.unsigned_short; pDescriptorSets : System.Address; dynamicOffsetCount : Interfaces.C.unsigned_short; pDynamicOffsets : access Interfaces.C.unsigned_short) -- vulkan_core.h:3779 with Import => True, Convention => C, External_Name => "vkCmdBindDescriptorSets"; procedure vkCmdBindIndexBuffer (commandBuffer : VkCommandBuffer; buffer : VkBuffer; offset : VkDeviceSize; indexType : VkIndexType) -- vulkan_core.h:3789 with Import => True, Convention => C, External_Name => "vkCmdBindIndexBuffer"; procedure vkCmdBindVertexBuffers (commandBuffer : VkCommandBuffer; firstBinding : Interfaces.C.unsigned_short; bindingCount : Interfaces.C.unsigned_short; pBuffers : System.Address; pOffsets : access VkDeviceSize) -- vulkan_core.h:3795 with Import => True, Convention => C, External_Name => "vkCmdBindVertexBuffers"; procedure vkCmdDraw (commandBuffer : VkCommandBuffer; vertexCount : Interfaces.C.unsigned_short; instanceCount : Interfaces.C.unsigned_short; firstVertex : Interfaces.C.unsigned_short; firstInstance : Interfaces.C.unsigned_short) -- vulkan_core.h:3802 with Import => True, Convention => C, External_Name => "vkCmdDraw"; procedure vkCmdDrawIndexed (commandBuffer : VkCommandBuffer; indexCount : Interfaces.C.unsigned_short; instanceCount : Interfaces.C.unsigned_short; firstIndex : Interfaces.C.unsigned_short; vertexOffset : Interfaces.C.short; firstInstance : Interfaces.C.unsigned_short) -- vulkan_core.h:3809 with Import => True, Convention => C, External_Name => "vkCmdDrawIndexed"; procedure vkCmdDrawIndirect (commandBuffer : VkCommandBuffer; buffer : VkBuffer; offset : VkDeviceSize; drawCount : Interfaces.C.unsigned_short; stride : Interfaces.C.unsigned_short) -- vulkan_core.h:3817 with Import => True, Convention => C, External_Name => "vkCmdDrawIndirect"; procedure vkCmdDrawIndexedIndirect (commandBuffer : VkCommandBuffer; buffer : VkBuffer; offset : VkDeviceSize; drawCount : Interfaces.C.unsigned_short; stride : Interfaces.C.unsigned_short) -- vulkan_core.h:3824 with Import => True, Convention => C, External_Name => "vkCmdDrawIndexedIndirect"; procedure vkCmdDispatch (commandBuffer : VkCommandBuffer; groupCountX : Interfaces.C.unsigned_short; groupCountY : Interfaces.C.unsigned_short; groupCountZ : Interfaces.C.unsigned_short) -- vulkan_core.h:3831 with Import => True, Convention => C, External_Name => "vkCmdDispatch"; procedure vkCmdDispatchIndirect (commandBuffer : VkCommandBuffer; buffer : VkBuffer; offset : VkDeviceSize) -- vulkan_core.h:3837 with Import => True, Convention => C, External_Name => "vkCmdDispatchIndirect"; procedure vkCmdCopyBuffer (commandBuffer : VkCommandBuffer; srcBuffer : VkBuffer; dstBuffer : VkBuffer; regionCount : Interfaces.C.unsigned_short; pRegions : access constant VkBufferCopy) -- vulkan_core.h:3842 with Import => True, Convention => C, External_Name => "vkCmdCopyBuffer"; procedure vkCmdCopyImage (commandBuffer : VkCommandBuffer; srcImage : VkImage; srcImageLayout : VkImageLayout; dstImage : VkImage; dstImageLayout : VkImageLayout; regionCount : Interfaces.C.unsigned_short; pRegions : access constant VkImageCopy) -- vulkan_core.h:3849 with Import => True, Convention => C, External_Name => "vkCmdCopyImage"; procedure vkCmdBlitImage (commandBuffer : VkCommandBuffer; srcImage : VkImage; srcImageLayout : VkImageLayout; dstImage : VkImage; dstImageLayout : VkImageLayout; regionCount : Interfaces.C.unsigned_short; pRegions : access constant VkImageBlit; filter : VkFilter) -- vulkan_core.h:3858 with Import => True, Convention => C, External_Name => "vkCmdBlitImage"; procedure vkCmdCopyBufferToImage (commandBuffer : VkCommandBuffer; srcBuffer : VkBuffer; dstImage : VkImage; dstImageLayout : VkImageLayout; regionCount : Interfaces.C.unsigned_short; pRegions : access constant VkBufferImageCopy) -- vulkan_core.h:3868 with Import => True, Convention => C, External_Name => "vkCmdCopyBufferToImage"; procedure vkCmdCopyImageToBuffer (commandBuffer : VkCommandBuffer; srcImage : VkImage; srcImageLayout : VkImageLayout; dstBuffer : VkBuffer; regionCount : Interfaces.C.unsigned_short; pRegions : access constant VkBufferImageCopy) -- vulkan_core.h:3876 with Import => True, Convention => C, External_Name => "vkCmdCopyImageToBuffer"; procedure vkCmdUpdateBuffer (commandBuffer : VkCommandBuffer; dstBuffer : VkBuffer; dstOffset : VkDeviceSize; dataSize : VkDeviceSize; pData : System.Address) -- vulkan_core.h:3884 with Import => True, Convention => C, External_Name => "vkCmdUpdateBuffer"; procedure vkCmdFillBuffer (commandBuffer : VkCommandBuffer; dstBuffer : VkBuffer; dstOffset : VkDeviceSize; size : VkDeviceSize; data : Interfaces.C.unsigned_short) -- vulkan_core.h:3891 with Import => True, Convention => C, External_Name => "vkCmdFillBuffer"; procedure vkCmdClearColorImage (commandBuffer : VkCommandBuffer; image : VkImage; imageLayout : VkImageLayout; pColor : access constant VkClearColorValue; rangeCount : Interfaces.C.unsigned_short; pRanges : access constant VkImageSubresourceRange) -- vulkan_core.h:3898 with Import => True, Convention => C, External_Name => "vkCmdClearColorImage"; procedure vkCmdClearDepthStencilImage (commandBuffer : VkCommandBuffer; image : VkImage; imageLayout : VkImageLayout; pDepthStencil : access constant VkClearDepthStencilValue; rangeCount : Interfaces.C.unsigned_short; pRanges : access constant VkImageSubresourceRange) -- vulkan_core.h:3906 with Import => True, Convention => C, External_Name => "vkCmdClearDepthStencilImage"; procedure vkCmdClearAttachments (commandBuffer : VkCommandBuffer; attachmentCount : Interfaces.C.unsigned_short; pAttachments : access constant VkClearAttachment; rectCount : Interfaces.C.unsigned_short; pRects : access constant VkClearRect) -- vulkan_core.h:3914 with Import => True, Convention => C, External_Name => "vkCmdClearAttachments"; procedure vkCmdResolveImage (commandBuffer : VkCommandBuffer; srcImage : VkImage; srcImageLayout : VkImageLayout; dstImage : VkImage; dstImageLayout : VkImageLayout; regionCount : Interfaces.C.unsigned_short; pRegions : access constant VkImageResolve) -- vulkan_core.h:3921 with Import => True, Convention => C, External_Name => "vkCmdResolveImage"; procedure vkCmdSetEvent (commandBuffer : VkCommandBuffer; event : VkEvent; stageMask : VkPipelineStageFlags) -- vulkan_core.h:3930 with Import => True, Convention => C, External_Name => "vkCmdSetEvent"; procedure vkCmdResetEvent (commandBuffer : VkCommandBuffer; event : VkEvent; stageMask : VkPipelineStageFlags) -- vulkan_core.h:3935 with Import => True, Convention => C, External_Name => "vkCmdResetEvent"; procedure vkCmdWaitEvents (commandBuffer : VkCommandBuffer; eventCount : Interfaces.C.unsigned_short; pEvents : System.Address; srcStageMask : VkPipelineStageFlags; dstStageMask : VkPipelineStageFlags; memoryBarrierCount : Interfaces.C.unsigned_short; pMemoryBarriers : access constant VkMemoryBarrier; bufferMemoryBarrierCount : Interfaces.C.unsigned_short; pBufferMemoryBarriers : access constant VkBufferMemoryBarrier; imageMemoryBarrierCount : Interfaces.C.unsigned_short; pImageMemoryBarriers : access constant VkImageMemoryBarrier) -- vulkan_core.h:3940 with Import => True, Convention => C, External_Name => "vkCmdWaitEvents"; procedure vkCmdPipelineBarrier (commandBuffer : VkCommandBuffer; srcStageMask : VkPipelineStageFlags; dstStageMask : VkPipelineStageFlags; dependencyFlags : VkDependencyFlags; memoryBarrierCount : Interfaces.C.unsigned_short; pMemoryBarriers : access constant VkMemoryBarrier; bufferMemoryBarrierCount : Interfaces.C.unsigned_short; pBufferMemoryBarriers : access constant VkBufferMemoryBarrier; imageMemoryBarrierCount : Interfaces.C.unsigned_short; pImageMemoryBarriers : access constant VkImageMemoryBarrier) -- vulkan_core.h:3953 with Import => True, Convention => C, External_Name => "vkCmdPipelineBarrier"; procedure vkCmdBeginQuery (commandBuffer : VkCommandBuffer; queryPool : VkQueryPool; query : Interfaces.C.unsigned_short; flags : VkQueryControlFlags) -- vulkan_core.h:3965 with Import => True, Convention => C, External_Name => "vkCmdBeginQuery"; procedure vkCmdEndQuery (commandBuffer : VkCommandBuffer; queryPool : VkQueryPool; query : Interfaces.C.unsigned_short) -- vulkan_core.h:3971 with Import => True, Convention => C, External_Name => "vkCmdEndQuery"; procedure vkCmdResetQueryPool (commandBuffer : VkCommandBuffer; queryPool : VkQueryPool; firstQuery : Interfaces.C.unsigned_short; queryCount : Interfaces.C.unsigned_short) -- vulkan_core.h:3976 with Import => True, Convention => C, External_Name => "vkCmdResetQueryPool"; procedure vkCmdWriteTimestamp (commandBuffer : VkCommandBuffer; pipelineStage : VkPipelineStageFlagBits; queryPool : VkQueryPool; query : Interfaces.C.unsigned_short) -- vulkan_core.h:3982 with Import => True, Convention => C, External_Name => "vkCmdWriteTimestamp"; procedure vkCmdCopyQueryPoolResults (commandBuffer : VkCommandBuffer; queryPool : VkQueryPool; firstQuery : Interfaces.C.unsigned_short; queryCount : Interfaces.C.unsigned_short; dstBuffer : VkBuffer; dstOffset : VkDeviceSize; stride : VkDeviceSize; flags : VkQueryResultFlags) -- vulkan_core.h:3988 with Import => True, Convention => C, External_Name => "vkCmdCopyQueryPoolResults"; procedure vkCmdPushConstants (commandBuffer : VkCommandBuffer; layout : VkPipelineLayout; stageFlags : VkShaderStageFlags; offset : Interfaces.C.unsigned_short; size : Interfaces.C.unsigned_short; pValues : System.Address) -- vulkan_core.h:3998 with Import => True, Convention => C, External_Name => "vkCmdPushConstants"; procedure vkCmdBeginRenderPass (commandBuffer : VkCommandBuffer; pRenderPassBegin : access constant VkRenderPassBeginInfo; contents : VkSubpassContents) -- vulkan_core.h:4006 with Import => True, Convention => C, External_Name => "vkCmdBeginRenderPass"; procedure vkCmdNextSubpass (commandBuffer : VkCommandBuffer; contents : VkSubpassContents) -- vulkan_core.h:4011 with Import => True, Convention => C, External_Name => "vkCmdNextSubpass"; procedure vkCmdEndRenderPass (commandBuffer : VkCommandBuffer) -- vulkan_core.h:4015 with Import => True, Convention => C, External_Name => "vkCmdEndRenderPass"; procedure vkCmdExecuteCommands (commandBuffer : VkCommandBuffer; commandBufferCount : Interfaces.C.unsigned_short; pCommandBuffers : System.Address) -- vulkan_core.h:4018 with Import => True, Convention => C, External_Name => "vkCmdExecuteCommands"; -- Vulkan 1.1 version number type VkSamplerYcbcrConversion_T is null record; -- incomplete struct type VkSamplerYcbcrConversion is access all VkSamplerYcbcrConversion_T; -- vulkan_core.h:4029 type VkDescriptorUpdateTemplate_T is null record; -- incomplete struct type VkDescriptorUpdateTemplate is access all VkDescriptorUpdateTemplate_T; -- vulkan_core.h:4030 subtype VkPointClippingBehavior is unsigned; VK_POINT_CLIPPING_BEHAVIOR_ALL_CLIP_PLANES : constant unsigned := 0; VK_POINT_CLIPPING_BEHAVIOR_USER_CLIP_PLANES_ONLY : constant unsigned := 1; VK_POINT_CLIPPING_BEHAVIOR_ALL_CLIP_PLANES_KHR : constant unsigned := 0; VK_POINT_CLIPPING_BEHAVIOR_USER_CLIP_PLANES_ONLY_KHR : constant unsigned := 1; VK_POINT_CLIPPING_BEHAVIOR_BEGIN_RANGE : constant unsigned := 0; VK_POINT_CLIPPING_BEHAVIOR_END_RANGE : constant unsigned := 1; VK_POINT_CLIPPING_BEHAVIOR_RANGE_SIZE : constant unsigned := 2; VK_POINT_CLIPPING_BEHAVIOR_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4035 subtype VkTessellationDomainOrigin is unsigned; VK_TESSELLATION_DOMAIN_ORIGIN_UPPER_LEFT : constant unsigned := 0; VK_TESSELLATION_DOMAIN_ORIGIN_LOWER_LEFT : constant unsigned := 1; VK_TESSELLATION_DOMAIN_ORIGIN_UPPER_LEFT_KHR : constant unsigned := 0; VK_TESSELLATION_DOMAIN_ORIGIN_LOWER_LEFT_KHR : constant unsigned := 1; VK_TESSELLATION_DOMAIN_ORIGIN_BEGIN_RANGE : constant unsigned := 0; VK_TESSELLATION_DOMAIN_ORIGIN_END_RANGE : constant unsigned := 1; VK_TESSELLATION_DOMAIN_ORIGIN_RANGE_SIZE : constant unsigned := 2; VK_TESSELLATION_DOMAIN_ORIGIN_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4046 subtype VkSamplerYcbcrModelConversion is unsigned; VK_SAMPLER_YCBCR_MODEL_CONVERSION_RGB_IDENTITY : constant unsigned := 0; VK_SAMPLER_YCBCR_MODEL_CONVERSION_YCBCR_IDENTITY : constant unsigned := 1; VK_SAMPLER_YCBCR_MODEL_CONVERSION_YCBCR_709 : constant unsigned := 2; VK_SAMPLER_YCBCR_MODEL_CONVERSION_YCBCR_601 : constant unsigned := 3; VK_SAMPLER_YCBCR_MODEL_CONVERSION_YCBCR_2020 : constant unsigned := 4; VK_SAMPLER_YCBCR_MODEL_CONVERSION_RGB_IDENTITY_KHR : constant unsigned := 0; VK_SAMPLER_YCBCR_MODEL_CONVERSION_YCBCR_IDENTITY_KHR : constant unsigned := 1; VK_SAMPLER_YCBCR_MODEL_CONVERSION_YCBCR_709_KHR : constant unsigned := 2; VK_SAMPLER_YCBCR_MODEL_CONVERSION_YCBCR_601_KHR : constant unsigned := 3; VK_SAMPLER_YCBCR_MODEL_CONVERSION_YCBCR_2020_KHR : constant unsigned := 4; VK_SAMPLER_YCBCR_MODEL_CONVERSION_BEGIN_RANGE : constant unsigned := 0; VK_SAMPLER_YCBCR_MODEL_CONVERSION_END_RANGE : constant unsigned := 4; VK_SAMPLER_YCBCR_MODEL_CONVERSION_RANGE_SIZE : constant unsigned := 5; VK_SAMPLER_YCBCR_MODEL_CONVERSION_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4057 subtype VkSamplerYcbcrRange is unsigned; VK_SAMPLER_YCBCR_RANGE_ITU_FULL : constant unsigned := 0; VK_SAMPLER_YCBCR_RANGE_ITU_NARROW : constant unsigned := 1; VK_SAMPLER_YCBCR_RANGE_ITU_FULL_KHR : constant unsigned := 0; VK_SAMPLER_YCBCR_RANGE_ITU_NARROW_KHR : constant unsigned := 1; VK_SAMPLER_YCBCR_RANGE_BEGIN_RANGE : constant unsigned := 0; VK_SAMPLER_YCBCR_RANGE_END_RANGE : constant unsigned := 1; VK_SAMPLER_YCBCR_RANGE_RANGE_SIZE : constant unsigned := 2; VK_SAMPLER_YCBCR_RANGE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4074 subtype VkChromaLocation is unsigned; VK_CHROMA_LOCATION_COSITED_EVEN : constant unsigned := 0; VK_CHROMA_LOCATION_MIDPOINT : constant unsigned := 1; VK_CHROMA_LOCATION_COSITED_EVEN_KHR : constant unsigned := 0; VK_CHROMA_LOCATION_MIDPOINT_KHR : constant unsigned := 1; VK_CHROMA_LOCATION_BEGIN_RANGE : constant unsigned := 0; VK_CHROMA_LOCATION_END_RANGE : constant unsigned := 1; VK_CHROMA_LOCATION_RANGE_SIZE : constant unsigned := 2; VK_CHROMA_LOCATION_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4085 subtype VkDescriptorUpdateTemplateType is unsigned; VK_DESCRIPTOR_UPDATE_TEMPLATE_TYPE_DESCRIPTOR_SET : constant unsigned := 0; VK_DESCRIPTOR_UPDATE_TEMPLATE_TYPE_PUSH_DESCRIPTORS_KHR : constant unsigned := 1; VK_DESCRIPTOR_UPDATE_TEMPLATE_TYPE_DESCRIPTOR_SET_KHR : constant unsigned := 0; VK_DESCRIPTOR_UPDATE_TEMPLATE_TYPE_BEGIN_RANGE : constant unsigned := 0; VK_DESCRIPTOR_UPDATE_TEMPLATE_TYPE_END_RANGE : constant unsigned := 0; VK_DESCRIPTOR_UPDATE_TEMPLATE_TYPE_RANGE_SIZE : constant unsigned := 1; VK_DESCRIPTOR_UPDATE_TEMPLATE_TYPE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4096 subtype VkSubgroupFeatureFlagBits is unsigned; VK_SUBGROUP_FEATURE_BASIC_BIT : constant unsigned := 1; VK_SUBGROUP_FEATURE_VOTE_BIT : constant unsigned := 2; VK_SUBGROUP_FEATURE_ARITHMETIC_BIT : constant unsigned := 4; VK_SUBGROUP_FEATURE_BALLOT_BIT : constant unsigned := 8; VK_SUBGROUP_FEATURE_SHUFFLE_BIT : constant unsigned := 16; VK_SUBGROUP_FEATURE_SHUFFLE_RELATIVE_BIT : constant unsigned := 32; VK_SUBGROUP_FEATURE_CLUSTERED_BIT : constant unsigned := 64; VK_SUBGROUP_FEATURE_QUAD_BIT : constant unsigned := 128; VK_SUBGROUP_FEATURE_PARTITIONED_BIT_NV : constant unsigned := 256; VK_SUBGROUP_FEATURE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4106 subtype VkSubgroupFeatureFlags is VkFlags; -- vulkan_core.h:4118 subtype VkPeerMemoryFeatureFlagBits is unsigned; VK_PEER_MEMORY_FEATURE_COPY_SRC_BIT : constant unsigned := 1; VK_PEER_MEMORY_FEATURE_COPY_DST_BIT : constant unsigned := 2; VK_PEER_MEMORY_FEATURE_GENERIC_SRC_BIT : constant unsigned := 4; VK_PEER_MEMORY_FEATURE_GENERIC_DST_BIT : constant unsigned := 8; VK_PEER_MEMORY_FEATURE_COPY_SRC_BIT_KHR : constant unsigned := 1; VK_PEER_MEMORY_FEATURE_COPY_DST_BIT_KHR : constant unsigned := 2; VK_PEER_MEMORY_FEATURE_GENERIC_SRC_BIT_KHR : constant unsigned := 4; VK_PEER_MEMORY_FEATURE_GENERIC_DST_BIT_KHR : constant unsigned := 8; VK_PEER_MEMORY_FEATURE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4120 subtype VkPeerMemoryFeatureFlags is VkFlags; -- vulkan_core.h:4131 subtype VkMemoryAllocateFlagBits is unsigned; VK_MEMORY_ALLOCATE_DEVICE_MASK_BIT : constant unsigned := 1; VK_MEMORY_ALLOCATE_DEVICE_ADDRESS_BIT : constant unsigned := 2; VK_MEMORY_ALLOCATE_DEVICE_ADDRESS_CAPTURE_REPLAY_BIT : constant unsigned := 4; VK_MEMORY_ALLOCATE_DEVICE_MASK_BIT_KHR : constant unsigned := 1; VK_MEMORY_ALLOCATE_DEVICE_ADDRESS_BIT_KHR : constant unsigned := 2; VK_MEMORY_ALLOCATE_DEVICE_ADDRESS_CAPTURE_REPLAY_BIT_KHR : constant unsigned := 4; VK_MEMORY_ALLOCATE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4133 subtype VkMemoryAllocateFlags is VkFlags; -- vulkan_core.h:4142 subtype VkCommandPoolTrimFlags is VkFlags; -- vulkan_core.h:4143 subtype VkDescriptorUpdateTemplateCreateFlags is VkFlags; -- vulkan_core.h:4144 subtype VkExternalMemoryHandleTypeFlagBits is unsigned; VK_EXTERNAL_MEMORY_HANDLE_TYPE_OPAQUE_FD_BIT : constant unsigned := 1; VK_EXTERNAL_MEMORY_HANDLE_TYPE_OPAQUE_WIN32_BIT : constant unsigned := 2; VK_EXTERNAL_MEMORY_HANDLE_TYPE_OPAQUE_WIN32_KMT_BIT : constant unsigned := 4; VK_EXTERNAL_MEMORY_HANDLE_TYPE_D3D11_TEXTURE_BIT : constant unsigned := 8; VK_EXTERNAL_MEMORY_HANDLE_TYPE_D3D11_TEXTURE_KMT_BIT : constant unsigned := 16; VK_EXTERNAL_MEMORY_HANDLE_TYPE_D3D12_HEAP_BIT : constant unsigned := 32; VK_EXTERNAL_MEMORY_HANDLE_TYPE_D3D12_RESOURCE_BIT : constant unsigned := 64; VK_EXTERNAL_MEMORY_HANDLE_TYPE_DMA_BUF_BIT_EXT : constant unsigned := 512; VK_EXTERNAL_MEMORY_HANDLE_TYPE_ANDROID_HARDWARE_BUFFER_BIT_ANDROID : constant unsigned := 1024; VK_EXTERNAL_MEMORY_HANDLE_TYPE_HOST_ALLOCATION_BIT_EXT : constant unsigned := 128; VK_EXTERNAL_MEMORY_HANDLE_TYPE_HOST_MAPPED_FOREIGN_MEMORY_BIT_EXT : constant unsigned := 256; VK_EXTERNAL_MEMORY_HANDLE_TYPE_OPAQUE_FD_BIT_KHR : constant unsigned := 1; VK_EXTERNAL_MEMORY_HANDLE_TYPE_OPAQUE_WIN32_BIT_KHR : constant unsigned := 2; VK_EXTERNAL_MEMORY_HANDLE_TYPE_OPAQUE_WIN32_KMT_BIT_KHR : constant unsigned := 4; VK_EXTERNAL_MEMORY_HANDLE_TYPE_D3D11_TEXTURE_BIT_KHR : constant unsigned := 8; VK_EXTERNAL_MEMORY_HANDLE_TYPE_D3D11_TEXTURE_KMT_BIT_KHR : constant unsigned := 16; VK_EXTERNAL_MEMORY_HANDLE_TYPE_D3D12_HEAP_BIT_KHR : constant unsigned := 32; VK_EXTERNAL_MEMORY_HANDLE_TYPE_D3D12_RESOURCE_BIT_KHR : constant unsigned := 64; VK_EXTERNAL_MEMORY_HANDLE_TYPE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4146 subtype VkExternalMemoryHandleTypeFlags is VkFlags; -- vulkan_core.h:4167 subtype VkExternalMemoryFeatureFlagBits is unsigned; VK_EXTERNAL_MEMORY_FEATURE_DEDICATED_ONLY_BIT : constant unsigned := 1; VK_EXTERNAL_MEMORY_FEATURE_EXPORTABLE_BIT : constant unsigned := 2; VK_EXTERNAL_MEMORY_FEATURE_IMPORTABLE_BIT : constant unsigned := 4; VK_EXTERNAL_MEMORY_FEATURE_DEDICATED_ONLY_BIT_KHR : constant unsigned := 1; VK_EXTERNAL_MEMORY_FEATURE_EXPORTABLE_BIT_KHR : constant unsigned := 2; VK_EXTERNAL_MEMORY_FEATURE_IMPORTABLE_BIT_KHR : constant unsigned := 4; VK_EXTERNAL_MEMORY_FEATURE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4169 subtype VkExternalMemoryFeatureFlags is VkFlags; -- vulkan_core.h:4178 subtype VkExternalFenceHandleTypeFlagBits is unsigned; VK_EXTERNAL_FENCE_HANDLE_TYPE_OPAQUE_FD_BIT : constant unsigned := 1; VK_EXTERNAL_FENCE_HANDLE_TYPE_OPAQUE_WIN32_BIT : constant unsigned := 2; VK_EXTERNAL_FENCE_HANDLE_TYPE_OPAQUE_WIN32_KMT_BIT : constant unsigned := 4; VK_EXTERNAL_FENCE_HANDLE_TYPE_SYNC_FD_BIT : constant unsigned := 8; VK_EXTERNAL_FENCE_HANDLE_TYPE_OPAQUE_FD_BIT_KHR : constant unsigned := 1; VK_EXTERNAL_FENCE_HANDLE_TYPE_OPAQUE_WIN32_BIT_KHR : constant unsigned := 2; VK_EXTERNAL_FENCE_HANDLE_TYPE_OPAQUE_WIN32_KMT_BIT_KHR : constant unsigned := 4; VK_EXTERNAL_FENCE_HANDLE_TYPE_SYNC_FD_BIT_KHR : constant unsigned := 8; VK_EXTERNAL_FENCE_HANDLE_TYPE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4180 subtype VkExternalFenceHandleTypeFlags is VkFlags; -- vulkan_core.h:4191 subtype VkExternalFenceFeatureFlagBits is unsigned; VK_EXTERNAL_FENCE_FEATURE_EXPORTABLE_BIT : constant unsigned := 1; VK_EXTERNAL_FENCE_FEATURE_IMPORTABLE_BIT : constant unsigned := 2; VK_EXTERNAL_FENCE_FEATURE_EXPORTABLE_BIT_KHR : constant unsigned := 1; VK_EXTERNAL_FENCE_FEATURE_IMPORTABLE_BIT_KHR : constant unsigned := 2; VK_EXTERNAL_FENCE_FEATURE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4193 subtype VkExternalFenceFeatureFlags is VkFlags; -- vulkan_core.h:4200 subtype VkFenceImportFlagBits is unsigned; VK_FENCE_IMPORT_TEMPORARY_BIT : constant unsigned := 1; VK_FENCE_IMPORT_TEMPORARY_BIT_KHR : constant unsigned := 1; VK_FENCE_IMPORT_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4202 subtype VkFenceImportFlags is VkFlags; -- vulkan_core.h:4207 subtype VkSemaphoreImportFlagBits is unsigned; VK_SEMAPHORE_IMPORT_TEMPORARY_BIT : constant unsigned := 1; VK_SEMAPHORE_IMPORT_TEMPORARY_BIT_KHR : constant unsigned := 1; VK_SEMAPHORE_IMPORT_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4209 subtype VkSemaphoreImportFlags is VkFlags; -- vulkan_core.h:4214 subtype VkExternalSemaphoreHandleTypeFlagBits is unsigned; VK_EXTERNAL_SEMAPHORE_HANDLE_TYPE_OPAQUE_FD_BIT : constant unsigned := 1; VK_EXTERNAL_SEMAPHORE_HANDLE_TYPE_OPAQUE_WIN32_BIT : constant unsigned := 2; VK_EXTERNAL_SEMAPHORE_HANDLE_TYPE_OPAQUE_WIN32_KMT_BIT : constant unsigned := 4; VK_EXTERNAL_SEMAPHORE_HANDLE_TYPE_D3D12_FENCE_BIT : constant unsigned := 8; VK_EXTERNAL_SEMAPHORE_HANDLE_TYPE_SYNC_FD_BIT : constant unsigned := 16; VK_EXTERNAL_SEMAPHORE_HANDLE_TYPE_OPAQUE_FD_BIT_KHR : constant unsigned := 1; VK_EXTERNAL_SEMAPHORE_HANDLE_TYPE_OPAQUE_WIN32_BIT_KHR : constant unsigned := 2; VK_EXTERNAL_SEMAPHORE_HANDLE_TYPE_OPAQUE_WIN32_KMT_BIT_KHR : constant unsigned := 4; VK_EXTERNAL_SEMAPHORE_HANDLE_TYPE_D3D12_FENCE_BIT_KHR : constant unsigned := 8; VK_EXTERNAL_SEMAPHORE_HANDLE_TYPE_SYNC_FD_BIT_KHR : constant unsigned := 16; VK_EXTERNAL_SEMAPHORE_HANDLE_TYPE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4216 subtype VkExternalSemaphoreHandleTypeFlags is VkFlags; -- vulkan_core.h:4229 subtype VkExternalSemaphoreFeatureFlagBits is unsigned; VK_EXTERNAL_SEMAPHORE_FEATURE_EXPORTABLE_BIT : constant unsigned := 1; VK_EXTERNAL_SEMAPHORE_FEATURE_IMPORTABLE_BIT : constant unsigned := 2; VK_EXTERNAL_SEMAPHORE_FEATURE_EXPORTABLE_BIT_KHR : constant unsigned := 1; VK_EXTERNAL_SEMAPHORE_FEATURE_IMPORTABLE_BIT_KHR : constant unsigned := 2; VK_EXTERNAL_SEMAPHORE_FEATURE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4231 subtype VkExternalSemaphoreFeatureFlags is VkFlags; -- vulkan_core.h:4238 type VkPhysicalDeviceSubgroupProperties is record sType : aliased VkStructureType; -- vulkan_core.h:4240 pNext : System.Address; -- vulkan_core.h:4241 subgroupSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4242 supportedStages : aliased VkShaderStageFlags; -- vulkan_core.h:4243 supportedOperations : aliased VkSubgroupFeatureFlags; -- vulkan_core.h:4244 quadOperationsInAllStages : aliased VkBool32; -- vulkan_core.h:4245 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4239 type VkBindBufferMemoryInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4249 pNext : System.Address; -- vulkan_core.h:4250 buffer : VkBuffer; -- vulkan_core.h:4251 memory : VkDeviceMemory; -- vulkan_core.h:4252 memoryOffset : aliased VkDeviceSize; -- vulkan_core.h:4253 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4248 type VkBindImageMemoryInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4257 pNext : System.Address; -- vulkan_core.h:4258 image : VkImage; -- vulkan_core.h:4259 memory : VkDeviceMemory; -- vulkan_core.h:4260 memoryOffset : aliased VkDeviceSize; -- vulkan_core.h:4261 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4256 type VkPhysicalDevice16BitStorageFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:4265 pNext : System.Address; -- vulkan_core.h:4266 storageBuffer16BitAccess : aliased VkBool32; -- vulkan_core.h:4267 uniformAndStorageBuffer16BitAccess : aliased VkBool32; -- vulkan_core.h:4268 storagePushConstant16 : aliased VkBool32; -- vulkan_core.h:4269 storageInputOutput16 : aliased VkBool32; -- vulkan_core.h:4270 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4264 type VkMemoryDedicatedRequirements is record sType : aliased VkStructureType; -- vulkan_core.h:4274 pNext : System.Address; -- vulkan_core.h:4275 prefersDedicatedAllocation : aliased VkBool32; -- vulkan_core.h:4276 requiresDedicatedAllocation : aliased VkBool32; -- vulkan_core.h:4277 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4273 type VkMemoryDedicatedAllocateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4281 pNext : System.Address; -- vulkan_core.h:4282 image : VkImage; -- vulkan_core.h:4283 buffer : VkBuffer; -- vulkan_core.h:4284 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4280 type VkMemoryAllocateFlagsInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4288 pNext : System.Address; -- vulkan_core.h:4289 flags : aliased VkMemoryAllocateFlags; -- vulkan_core.h:4290 deviceMask : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4291 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4287 type VkDeviceGroupRenderPassBeginInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4295 pNext : System.Address; -- vulkan_core.h:4296 deviceMask : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4297 deviceRenderAreaCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4298 pDeviceRenderAreas : access constant VkRect2D; -- vulkan_core.h:4299 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4294 type VkDeviceGroupCommandBufferBeginInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4303 pNext : System.Address; -- vulkan_core.h:4304 deviceMask : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4305 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4302 type VkDeviceGroupSubmitInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4309 pNext : System.Address; -- vulkan_core.h:4310 waitSemaphoreCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4311 pWaitSemaphoreDeviceIndices : access Interfaces.C.unsigned_short; -- vulkan_core.h:4312 commandBufferCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4313 pCommandBufferDeviceMasks : access Interfaces.C.unsigned_short; -- vulkan_core.h:4314 signalSemaphoreCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4315 pSignalSemaphoreDeviceIndices : access Interfaces.C.unsigned_short; -- vulkan_core.h:4316 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4308 type VkDeviceGroupBindSparseInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4320 pNext : System.Address; -- vulkan_core.h:4321 resourceDeviceIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4322 memoryDeviceIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4323 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4319 type VkBindBufferMemoryDeviceGroupInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4327 pNext : System.Address; -- vulkan_core.h:4328 deviceIndexCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4329 pDeviceIndices : access Interfaces.C.unsigned_short; -- vulkan_core.h:4330 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4326 type VkBindImageMemoryDeviceGroupInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4334 pNext : System.Address; -- vulkan_core.h:4335 deviceIndexCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4336 pDeviceIndices : access Interfaces.C.unsigned_short; -- vulkan_core.h:4337 splitInstanceBindRegionCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4338 pSplitInstanceBindRegions : access constant VkRect2D; -- vulkan_core.h:4339 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4333 type VkPhysicalDeviceGroupProperties_array2893 is array (0 .. 31) of VkPhysicalDevice; type VkPhysicalDeviceGroupProperties is record sType : aliased VkStructureType; -- vulkan_core.h:4343 pNext : System.Address; -- vulkan_core.h:4344 physicalDeviceCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4345 physicalDevices : VkPhysicalDeviceGroupProperties_array2893; -- vulkan_core.h:4346 subsetAllocation : aliased VkBool32; -- vulkan_core.h:4347 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4342 type VkDeviceGroupDeviceCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4351 pNext : System.Address; -- vulkan_core.h:4352 physicalDeviceCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4353 pPhysicalDevices : System.Address; -- vulkan_core.h:4354 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4350 type VkBufferMemoryRequirementsInfo2 is record sType : aliased VkStructureType; -- vulkan_core.h:4358 pNext : System.Address; -- vulkan_core.h:4359 buffer : VkBuffer; -- vulkan_core.h:4360 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4357 type VkImageMemoryRequirementsInfo2 is record sType : aliased VkStructureType; -- vulkan_core.h:4364 pNext : System.Address; -- vulkan_core.h:4365 image : VkImage; -- vulkan_core.h:4366 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4363 type VkImageSparseMemoryRequirementsInfo2 is record sType : aliased VkStructureType; -- vulkan_core.h:4370 pNext : System.Address; -- vulkan_core.h:4371 image : VkImage; -- vulkan_core.h:4372 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4369 type VkMemoryRequirements2 is record sType : aliased VkStructureType; -- vulkan_core.h:4376 pNext : System.Address; -- vulkan_core.h:4377 memoryRequirements : aliased VkMemoryRequirements; -- vulkan_core.h:4378 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4375 subtype VkMemoryRequirements2KHR is VkMemoryRequirements2; -- vulkan_core.h:4381 type VkSparseImageMemoryRequirements2 is record sType : aliased VkStructureType; -- vulkan_core.h:4384 pNext : System.Address; -- vulkan_core.h:4385 memoryRequirements : aliased VkSparseImageMemoryRequirements; -- vulkan_core.h:4386 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4383 type VkPhysicalDeviceFeatures2 is record sType : aliased VkStructureType; -- vulkan_core.h:4390 pNext : System.Address; -- vulkan_core.h:4391 features : aliased VkPhysicalDeviceFeatures; -- vulkan_core.h:4392 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4389 type VkPhysicalDeviceProperties2 is record sType : aliased VkStructureType; -- vulkan_core.h:4396 pNext : System.Address; -- vulkan_core.h:4397 properties : aliased VkPhysicalDeviceProperties; -- vulkan_core.h:4398 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4395 type VkFormatProperties2 is record sType : aliased VkStructureType; -- vulkan_core.h:4402 pNext : System.Address; -- vulkan_core.h:4403 formatProperties : aliased VkFormatProperties; -- vulkan_core.h:4404 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4401 type VkImageFormatProperties2 is record sType : aliased VkStructureType; -- vulkan_core.h:4408 pNext : System.Address; -- vulkan_core.h:4409 imageFormatProperties : aliased VkImageFormatProperties; -- vulkan_core.h:4410 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4407 type VkPhysicalDeviceImageFormatInfo2 is record sType : aliased VkStructureType; -- vulkan_core.h:4414 pNext : System.Address; -- vulkan_core.h:4415 format : aliased VkFormat; -- vulkan_core.h:4416 c_type : aliased VkImageType; -- vulkan_core.h:4417 tiling : aliased VkImageTiling; -- vulkan_core.h:4418 usage : aliased VkImageUsageFlags; -- vulkan_core.h:4419 flags : aliased VkImageCreateFlags; -- vulkan_core.h:4420 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4413 type VkQueueFamilyProperties2 is record sType : aliased VkStructureType; -- vulkan_core.h:4424 pNext : System.Address; -- vulkan_core.h:4425 queueFamilyProperties : aliased VkQueueFamilyProperties; -- vulkan_core.h:4426 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4423 type VkPhysicalDeviceMemoryProperties2 is record sType : aliased VkStructureType; -- vulkan_core.h:4430 pNext : System.Address; -- vulkan_core.h:4431 memoryProperties : aliased VkPhysicalDeviceMemoryProperties; -- vulkan_core.h:4432 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4429 type VkSparseImageFormatProperties2 is record sType : aliased VkStructureType; -- vulkan_core.h:4436 pNext : System.Address; -- vulkan_core.h:4437 properties : aliased VkSparseImageFormatProperties; -- vulkan_core.h:4438 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4435 type VkPhysicalDeviceSparseImageFormatInfo2 is record sType : aliased VkStructureType; -- vulkan_core.h:4442 pNext : System.Address; -- vulkan_core.h:4443 format : aliased VkFormat; -- vulkan_core.h:4444 c_type : aliased VkImageType; -- vulkan_core.h:4445 samples : aliased VkSampleCountFlagBits; -- vulkan_core.h:4446 usage : aliased VkImageUsageFlags; -- vulkan_core.h:4447 tiling : aliased VkImageTiling; -- vulkan_core.h:4448 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4441 type VkPhysicalDevicePointClippingProperties is record sType : aliased VkStructureType; -- vulkan_core.h:4452 pNext : System.Address; -- vulkan_core.h:4453 pointClippingBehavior : aliased VkPointClippingBehavior; -- vulkan_core.h:4454 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4451 type VkInputAttachmentAspectReference is record subpass : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4458 inputAttachmentIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4459 aspectMask : aliased VkImageAspectFlags; -- vulkan_core.h:4460 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4457 type VkRenderPassInputAttachmentAspectCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4464 pNext : System.Address; -- vulkan_core.h:4465 aspectReferenceCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4466 pAspectReferences : access constant VkInputAttachmentAspectReference; -- vulkan_core.h:4467 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4463 type VkImageViewUsageCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4471 pNext : System.Address; -- vulkan_core.h:4472 usage : aliased VkImageUsageFlags; -- vulkan_core.h:4473 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4470 type VkPipelineTessellationDomainOriginStateCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4477 pNext : System.Address; -- vulkan_core.h:4478 domainOrigin : aliased VkTessellationDomainOrigin; -- vulkan_core.h:4479 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4476 type VkRenderPassMultiviewCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4483 pNext : System.Address; -- vulkan_core.h:4484 subpassCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4485 pViewMasks : access Interfaces.C.unsigned_short; -- vulkan_core.h:4486 dependencyCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4487 pViewOffsets : access Interfaces.C.short; -- vulkan_core.h:4488 correlationMaskCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4489 pCorrelationMasks : access Interfaces.C.unsigned_short; -- vulkan_core.h:4490 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4482 type VkPhysicalDeviceMultiviewFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:4494 pNext : System.Address; -- vulkan_core.h:4495 multiview : aliased VkBool32; -- vulkan_core.h:4496 multiviewGeometryShader : aliased VkBool32; -- vulkan_core.h:4497 multiviewTessellationShader : aliased VkBool32; -- vulkan_core.h:4498 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4493 type VkPhysicalDeviceMultiviewProperties is record sType : aliased VkStructureType; -- vulkan_core.h:4502 pNext : System.Address; -- vulkan_core.h:4503 maxMultiviewViewCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4504 maxMultiviewInstanceIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4505 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4501 type VkPhysicalDeviceVariablePointersFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:4509 pNext : System.Address; -- vulkan_core.h:4510 variablePointersStorageBuffer : aliased VkBool32; -- vulkan_core.h:4511 variablePointers : aliased VkBool32; -- vulkan_core.h:4512 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4508 subtype VkPhysicalDeviceVariablePointerFeatures is VkPhysicalDeviceVariablePointersFeatures; -- vulkan_core.h:4515 type VkPhysicalDeviceProtectedMemoryFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:4518 pNext : System.Address; -- vulkan_core.h:4519 protectedMemory : aliased VkBool32; -- vulkan_core.h:4520 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4517 type VkPhysicalDeviceProtectedMemoryProperties is record sType : aliased VkStructureType; -- vulkan_core.h:4524 pNext : System.Address; -- vulkan_core.h:4525 protectedNoFault : aliased VkBool32; -- vulkan_core.h:4526 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4523 type VkDeviceQueueInfo2 is record sType : aliased VkStructureType; -- vulkan_core.h:4530 pNext : System.Address; -- vulkan_core.h:4531 flags : aliased VkDeviceQueueCreateFlags; -- vulkan_core.h:4532 queueFamilyIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4533 queueIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4534 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4529 type VkProtectedSubmitInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4538 pNext : System.Address; -- vulkan_core.h:4539 protectedSubmit : aliased VkBool32; -- vulkan_core.h:4540 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4537 type VkSamplerYcbcrConversionCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4544 pNext : System.Address; -- vulkan_core.h:4545 format : aliased VkFormat; -- vulkan_core.h:4546 ycbcrModel : aliased VkSamplerYcbcrModelConversion; -- vulkan_core.h:4547 ycbcrRange : aliased VkSamplerYcbcrRange; -- vulkan_core.h:4548 components : aliased VkComponentMapping; -- vulkan_core.h:4549 xChromaOffset : aliased VkChromaLocation; -- vulkan_core.h:4550 yChromaOffset : aliased VkChromaLocation; -- vulkan_core.h:4551 chromaFilter : aliased VkFilter; -- vulkan_core.h:4552 forceExplicitReconstruction : aliased VkBool32; -- vulkan_core.h:4553 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4543 type VkSamplerYcbcrConversionInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4557 pNext : System.Address; -- vulkan_core.h:4558 conversion : VkSamplerYcbcrConversion; -- vulkan_core.h:4559 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4556 type VkBindImagePlaneMemoryInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4563 pNext : System.Address; -- vulkan_core.h:4564 planeAspect : aliased VkImageAspectFlagBits; -- vulkan_core.h:4565 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4562 type VkImagePlaneMemoryRequirementsInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4569 pNext : System.Address; -- vulkan_core.h:4570 planeAspect : aliased VkImageAspectFlagBits; -- vulkan_core.h:4571 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4568 type VkPhysicalDeviceSamplerYcbcrConversionFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:4575 pNext : System.Address; -- vulkan_core.h:4576 samplerYcbcrConversion : aliased VkBool32; -- vulkan_core.h:4577 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4574 type VkSamplerYcbcrConversionImageFormatProperties is record sType : aliased VkStructureType; -- vulkan_core.h:4581 pNext : System.Address; -- vulkan_core.h:4582 combinedImageSamplerDescriptorCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4583 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4580 type VkDescriptorUpdateTemplateEntry is record dstBinding : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4587 dstArrayElement : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4588 descriptorCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4589 descriptorType : aliased VkDescriptorType; -- vulkan_core.h:4590 offset : aliased size_t; -- vulkan_core.h:4591 stride : aliased size_t; -- vulkan_core.h:4592 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4586 type VkDescriptorUpdateTemplateCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4596 pNext : System.Address; -- vulkan_core.h:4597 flags : aliased VkDescriptorUpdateTemplateCreateFlags; -- vulkan_core.h:4598 descriptorUpdateEntryCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4599 pDescriptorUpdateEntries : access constant VkDescriptorUpdateTemplateEntry; -- vulkan_core.h:4600 templateType : aliased VkDescriptorUpdateTemplateType; -- vulkan_core.h:4601 descriptorSetLayout : VkDescriptorSetLayout; -- vulkan_core.h:4602 pipelineBindPoint : aliased VkPipelineBindPoint; -- vulkan_core.h:4603 pipelineLayout : VkPipelineLayout; -- vulkan_core.h:4604 set : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4605 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4595 type VkExternalMemoryProperties is record externalMemoryFeatures : aliased VkExternalMemoryFeatureFlags; -- vulkan_core.h:4609 exportFromImportedHandleTypes : aliased VkExternalMemoryHandleTypeFlags; -- vulkan_core.h:4610 compatibleHandleTypes : aliased VkExternalMemoryHandleTypeFlags; -- vulkan_core.h:4611 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4608 type VkPhysicalDeviceExternalImageFormatInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4615 pNext : System.Address; -- vulkan_core.h:4616 handleType : aliased VkExternalMemoryHandleTypeFlagBits; -- vulkan_core.h:4617 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4614 type VkExternalImageFormatProperties is record sType : aliased VkStructureType; -- vulkan_core.h:4621 pNext : System.Address; -- vulkan_core.h:4622 externalMemoryProperties : aliased VkExternalMemoryProperties; -- vulkan_core.h:4623 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4620 type VkPhysicalDeviceExternalBufferInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4627 pNext : System.Address; -- vulkan_core.h:4628 flags : aliased VkBufferCreateFlags; -- vulkan_core.h:4629 usage : aliased VkBufferUsageFlags; -- vulkan_core.h:4630 handleType : aliased VkExternalMemoryHandleTypeFlagBits; -- vulkan_core.h:4631 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4626 type VkExternalBufferProperties is record sType : aliased VkStructureType; -- vulkan_core.h:4635 pNext : System.Address; -- vulkan_core.h:4636 externalMemoryProperties : aliased VkExternalMemoryProperties; -- vulkan_core.h:4637 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4634 type VkPhysicalDeviceIDProperties_array1345 is array (0 .. 15) of aliased Interfaces.C.unsigned_char; type VkPhysicalDeviceIDProperties_array3040 is array (0 .. 7) of aliased Interfaces.C.unsigned_char; type VkPhysicalDeviceIDProperties is record sType : aliased VkStructureType; -- vulkan_core.h:4641 pNext : System.Address; -- vulkan_core.h:4642 deviceUUID : aliased VkPhysicalDeviceIDProperties_array1345; -- vulkan_core.h:4643 driverUUID : aliased VkPhysicalDeviceIDProperties_array1345; -- vulkan_core.h:4644 deviceLUID : aliased VkPhysicalDeviceIDProperties_array3040; -- vulkan_core.h:4645 deviceNodeMask : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4646 deviceLUIDValid : aliased VkBool32; -- vulkan_core.h:4647 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4640 type VkExternalMemoryImageCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4651 pNext : System.Address; -- vulkan_core.h:4652 handleTypes : aliased VkExternalMemoryHandleTypeFlags; -- vulkan_core.h:4653 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4650 type VkExternalMemoryBufferCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4657 pNext : System.Address; -- vulkan_core.h:4658 handleTypes : aliased VkExternalMemoryHandleTypeFlags; -- vulkan_core.h:4659 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4656 type VkExportMemoryAllocateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4663 pNext : System.Address; -- vulkan_core.h:4664 handleTypes : aliased VkExternalMemoryHandleTypeFlags; -- vulkan_core.h:4665 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4662 type VkPhysicalDeviceExternalFenceInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4669 pNext : System.Address; -- vulkan_core.h:4670 handleType : aliased VkExternalFenceHandleTypeFlagBits; -- vulkan_core.h:4671 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4668 type VkExternalFenceProperties is record sType : aliased VkStructureType; -- vulkan_core.h:4675 pNext : System.Address; -- vulkan_core.h:4676 exportFromImportedHandleTypes : aliased VkExternalFenceHandleTypeFlags; -- vulkan_core.h:4677 compatibleHandleTypes : aliased VkExternalFenceHandleTypeFlags; -- vulkan_core.h:4678 externalFenceFeatures : aliased VkExternalFenceFeatureFlags; -- vulkan_core.h:4679 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4674 type VkExportFenceCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4683 pNext : System.Address; -- vulkan_core.h:4684 handleTypes : aliased VkExternalFenceHandleTypeFlags; -- vulkan_core.h:4685 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4682 type VkExportSemaphoreCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4689 pNext : System.Address; -- vulkan_core.h:4690 handleTypes : aliased VkExternalSemaphoreHandleTypeFlags; -- vulkan_core.h:4691 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4688 type VkPhysicalDeviceExternalSemaphoreInfo is record sType : aliased VkStructureType; -- vulkan_core.h:4695 pNext : System.Address; -- vulkan_core.h:4696 handleType : aliased VkExternalSemaphoreHandleTypeFlagBits; -- vulkan_core.h:4697 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4694 type VkExternalSemaphoreProperties is record sType : aliased VkStructureType; -- vulkan_core.h:4701 pNext : System.Address; -- vulkan_core.h:4702 exportFromImportedHandleTypes : aliased VkExternalSemaphoreHandleTypeFlags; -- vulkan_core.h:4703 compatibleHandleTypes : aliased VkExternalSemaphoreHandleTypeFlags; -- vulkan_core.h:4704 externalSemaphoreFeatures : aliased VkExternalSemaphoreFeatureFlags; -- vulkan_core.h:4705 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4700 type VkPhysicalDeviceMaintenance3Properties is record sType : aliased VkStructureType; -- vulkan_core.h:4709 pNext : System.Address; -- vulkan_core.h:4710 maxPerSetDescriptors : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:4711 maxMemoryAllocationSize : aliased VkDeviceSize; -- vulkan_core.h:4712 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4708 type VkDescriptorSetLayoutSupport is record sType : aliased VkStructureType; -- vulkan_core.h:4716 pNext : System.Address; -- vulkan_core.h:4717 supported : aliased VkBool32; -- vulkan_core.h:4718 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4715 type VkPhysicalDeviceShaderDrawParametersFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:4722 pNext : System.Address; -- vulkan_core.h:4723 shaderDrawParameters : aliased VkBool32; -- vulkan_core.h:4724 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:4721 subtype VkPhysicalDeviceShaderDrawParameterFeatures is VkPhysicalDeviceShaderDrawParametersFeatures; -- vulkan_core.h:4727 type PFN_vkEnumerateInstanceVersion is access function (arg1 : access Interfaces.C.unsigned_short) return VkResult with Convention => C; -- vulkan_core.h:4729 type PFN_vkBindBufferMemory2 is access function (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkBindBufferMemoryInfo) return VkResult with Convention => C; -- vulkan_core.h:4730 type PFN_vkBindImageMemory2 is access function (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkBindImageMemoryInfo) return VkResult with Convention => C; -- vulkan_core.h:4731 type PFN_vkGetDeviceGroupPeerMemoryFeatures is access procedure (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short; arg5 : access VkPeerMemoryFeatureFlags) with Convention => C; -- vulkan_core.h:4732 type PFN_vkCmdSetDeviceMask is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:4733 type PFN_vkCmdDispatchBase is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short; arg5 : Interfaces.C.unsigned_short; arg6 : Interfaces.C.unsigned_short; arg7 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:4734 type PFN_vkEnumeratePhysicalDeviceGroups is access function (arg1 : VkInstance; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkPhysicalDeviceGroupProperties) return VkResult with Convention => C; -- vulkan_core.h:4735 type PFN_vkGetImageMemoryRequirements2 is access procedure (arg1 : VkDevice; arg2 : access constant VkImageMemoryRequirementsInfo2; arg3 : access VkMemoryRequirements2) with Convention => C; -- vulkan_core.h:4736 type PFN_vkGetBufferMemoryRequirements2 is access procedure (arg1 : VkDevice; arg2 : access constant VkBufferMemoryRequirementsInfo2; arg3 : access VkMemoryRequirements2) with Convention => C; -- vulkan_core.h:4737 type PFN_vkGetImageSparseMemoryRequirements2 is access procedure (arg1 : VkDevice; arg2 : access constant VkImageSparseMemoryRequirementsInfo2; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkSparseImageMemoryRequirements2) with Convention => C; -- vulkan_core.h:4738 type PFN_vkGetPhysicalDeviceFeatures2 is access procedure (arg1 : VkPhysicalDevice; arg2 : access VkPhysicalDeviceFeatures2) with Convention => C; -- vulkan_core.h:4739 type PFN_vkGetPhysicalDeviceProperties2 is access procedure (arg1 : VkPhysicalDevice; arg2 : access VkPhysicalDeviceProperties2) with Convention => C; -- vulkan_core.h:4740 type PFN_vkGetPhysicalDeviceFormatProperties2 is access procedure (arg1 : VkPhysicalDevice; arg2 : VkFormat; arg3 : access VkFormatProperties2) with Convention => C; -- vulkan_core.h:4741 type PFN_vkGetPhysicalDeviceImageFormatProperties2 is access function (arg1 : VkPhysicalDevice; arg2 : access constant VkPhysicalDeviceImageFormatInfo2; arg3 : access VkImageFormatProperties2) return VkResult with Convention => C; -- vulkan_core.h:4742 type PFN_vkGetPhysicalDeviceQueueFamilyProperties2 is access procedure (arg1 : VkPhysicalDevice; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkQueueFamilyProperties2) with Convention => C; -- vulkan_core.h:4743 type PFN_vkGetPhysicalDeviceMemoryProperties2 is access procedure (arg1 : VkPhysicalDevice; arg2 : access VkPhysicalDeviceMemoryProperties2) with Convention => C; -- vulkan_core.h:4744 type PFN_vkGetPhysicalDeviceSparseImageFormatProperties2 is access procedure (arg1 : VkPhysicalDevice; arg2 : access constant VkPhysicalDeviceSparseImageFormatInfo2; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkSparseImageFormatProperties2) with Convention => C; -- vulkan_core.h:4745 type PFN_vkTrimCommandPool is access procedure (arg1 : VkDevice; arg2 : VkCommandPool; arg3 : VkCommandPoolTrimFlags) with Convention => C; -- vulkan_core.h:4746 type PFN_vkGetDeviceQueue2 is access procedure (arg1 : VkDevice; arg2 : access constant VkDeviceQueueInfo2; arg3 : System.Address) with Convention => C; -- vulkan_core.h:4747 type PFN_vkCreateSamplerYcbcrConversion is access function (arg1 : VkDevice; arg2 : access constant VkSamplerYcbcrConversionCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:4748 type PFN_vkDestroySamplerYcbcrConversion is access procedure (arg1 : VkDevice; arg2 : VkSamplerYcbcrConversion; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:4749 type PFN_vkCreateDescriptorUpdateTemplate is access function (arg1 : VkDevice; arg2 : access constant VkDescriptorUpdateTemplateCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:4750 type PFN_vkDestroyDescriptorUpdateTemplate is access procedure (arg1 : VkDevice; arg2 : VkDescriptorUpdateTemplate; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:4751 type PFN_vkUpdateDescriptorSetWithTemplate is access procedure (arg1 : VkDevice; arg2 : VkDescriptorSet; arg3 : VkDescriptorUpdateTemplate; arg4 : System.Address) with Convention => C; -- vulkan_core.h:4752 type PFN_vkGetPhysicalDeviceExternalBufferProperties is access procedure (arg1 : VkPhysicalDevice; arg2 : access constant VkPhysicalDeviceExternalBufferInfo; arg3 : access VkExternalBufferProperties) with Convention => C; -- vulkan_core.h:4753 type PFN_vkGetPhysicalDeviceExternalFenceProperties is access procedure (arg1 : VkPhysicalDevice; arg2 : access constant VkPhysicalDeviceExternalFenceInfo; arg3 : access VkExternalFenceProperties) with Convention => C; -- vulkan_core.h:4754 type PFN_vkGetPhysicalDeviceExternalSemaphoreProperties is access procedure (arg1 : VkPhysicalDevice; arg2 : access constant VkPhysicalDeviceExternalSemaphoreInfo; arg3 : access VkExternalSemaphoreProperties) with Convention => C; -- vulkan_core.h:4755 type PFN_vkGetDescriptorSetLayoutSupport is access procedure (arg1 : VkDevice; arg2 : access constant VkDescriptorSetLayoutCreateInfo; arg3 : access VkDescriptorSetLayoutSupport) with Convention => C; -- vulkan_core.h:4756 function vkEnumerateInstanceVersion (pApiVersion : access Interfaces.C.unsigned_short) return VkResult -- vulkan_core.h:4759 with Import => True, Convention => C, External_Name => "vkEnumerateInstanceVersion"; function vkBindBufferMemory2 (device : VkDevice; bindInfoCount : Interfaces.C.unsigned_short; pBindInfos : access constant VkBindBufferMemoryInfo) return VkResult -- vulkan_core.h:4762 with Import => True, Convention => C, External_Name => "vkBindBufferMemory2"; function vkBindImageMemory2 (device : VkDevice; bindInfoCount : Interfaces.C.unsigned_short; pBindInfos : access constant VkBindImageMemoryInfo) return VkResult -- vulkan_core.h:4767 with Import => True, Convention => C, External_Name => "vkBindImageMemory2"; procedure vkGetDeviceGroupPeerMemoryFeatures (device : VkDevice; heapIndex : Interfaces.C.unsigned_short; localDeviceIndex : Interfaces.C.unsigned_short; remoteDeviceIndex : Interfaces.C.unsigned_short; pPeerMemoryFeatures : access VkPeerMemoryFeatureFlags) -- vulkan_core.h:4772 with Import => True, Convention => C, External_Name => "vkGetDeviceGroupPeerMemoryFeatures"; procedure vkCmdSetDeviceMask (commandBuffer : VkCommandBuffer; deviceMask : Interfaces.C.unsigned_short) -- vulkan_core.h:4779 with Import => True, Convention => C, External_Name => "vkCmdSetDeviceMask"; procedure vkCmdDispatchBase (commandBuffer : VkCommandBuffer; baseGroupX : Interfaces.C.unsigned_short; baseGroupY : Interfaces.C.unsigned_short; baseGroupZ : Interfaces.C.unsigned_short; groupCountX : Interfaces.C.unsigned_short; groupCountY : Interfaces.C.unsigned_short; groupCountZ : Interfaces.C.unsigned_short) -- vulkan_core.h:4783 with Import => True, Convention => C, External_Name => "vkCmdDispatchBase"; function vkEnumeratePhysicalDeviceGroups (instance : VkInstance; pPhysicalDeviceGroupCount : access Interfaces.C.unsigned_short; pPhysicalDeviceGroupProperties : access VkPhysicalDeviceGroupProperties) return VkResult -- vulkan_core.h:4792 with Import => True, Convention => C, External_Name => "vkEnumeratePhysicalDeviceGroups"; procedure vkGetImageMemoryRequirements2 (device : VkDevice; pInfo : access constant VkImageMemoryRequirementsInfo2; pMemoryRequirements : access VkMemoryRequirements2) -- vulkan_core.h:4797 with Import => True, Convention => C, External_Name => "vkGetImageMemoryRequirements2"; procedure vkGetBufferMemoryRequirements2 (device : VkDevice; pInfo : access constant VkBufferMemoryRequirementsInfo2; pMemoryRequirements : access VkMemoryRequirements2) -- vulkan_core.h:4802 with Import => True, Convention => C, External_Name => "vkGetBufferMemoryRequirements2"; procedure vkGetImageSparseMemoryRequirements2 (device : VkDevice; pInfo : access constant VkImageSparseMemoryRequirementsInfo2; pSparseMemoryRequirementCount : access Interfaces.C.unsigned_short; pSparseMemoryRequirements : access VkSparseImageMemoryRequirements2) -- vulkan_core.h:4807 with Import => True, Convention => C, External_Name => "vkGetImageSparseMemoryRequirements2"; procedure vkGetPhysicalDeviceFeatures2 (physicalDevice : VkPhysicalDevice; pFeatures : access VkPhysicalDeviceFeatures2) -- vulkan_core.h:4813 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceFeatures2"; procedure vkGetPhysicalDeviceProperties2 (physicalDevice : VkPhysicalDevice; pProperties : access VkPhysicalDeviceProperties2) -- vulkan_core.h:4817 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceProperties2"; procedure vkGetPhysicalDeviceFormatProperties2 (physicalDevice : VkPhysicalDevice; format : VkFormat; pFormatProperties : access VkFormatProperties2) -- vulkan_core.h:4821 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceFormatProperties2"; function vkGetPhysicalDeviceImageFormatProperties2 (physicalDevice : VkPhysicalDevice; pImageFormatInfo : access constant VkPhysicalDeviceImageFormatInfo2; pImageFormatProperties : access VkImageFormatProperties2) return VkResult -- vulkan_core.h:4826 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceImageFormatProperties2"; procedure vkGetPhysicalDeviceQueueFamilyProperties2 (physicalDevice : VkPhysicalDevice; pQueueFamilyPropertyCount : access Interfaces.C.unsigned_short; pQueueFamilyProperties : access VkQueueFamilyProperties2) -- vulkan_core.h:4831 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceQueueFamilyProperties2"; procedure vkGetPhysicalDeviceMemoryProperties2 (physicalDevice : VkPhysicalDevice; pMemoryProperties : access VkPhysicalDeviceMemoryProperties2) -- vulkan_core.h:4836 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceMemoryProperties2"; procedure vkGetPhysicalDeviceSparseImageFormatProperties2 (physicalDevice : VkPhysicalDevice; pFormatInfo : access constant VkPhysicalDeviceSparseImageFormatInfo2; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkSparseImageFormatProperties2) -- vulkan_core.h:4840 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceSparseImageFormatProperties2"; procedure vkTrimCommandPool (device : VkDevice; commandPool : VkCommandPool; flags : VkCommandPoolTrimFlags) -- vulkan_core.h:4846 with Import => True, Convention => C, External_Name => "vkTrimCommandPool"; procedure vkGetDeviceQueue2 (device : VkDevice; pQueueInfo : access constant VkDeviceQueueInfo2; pQueue : System.Address) -- vulkan_core.h:4851 with Import => True, Convention => C, External_Name => "vkGetDeviceQueue2"; function vkCreateSamplerYcbcrConversion (device : VkDevice; pCreateInfo : access constant VkSamplerYcbcrConversionCreateInfo; pAllocator : access constant VkAllocationCallbacks; pYcbcrConversion : System.Address) return VkResult -- vulkan_core.h:4856 with Import => True, Convention => C, External_Name => "vkCreateSamplerYcbcrConversion"; procedure vkDestroySamplerYcbcrConversion (device : VkDevice; ycbcrConversion : VkSamplerYcbcrConversion; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:4862 with Import => True, Convention => C, External_Name => "vkDestroySamplerYcbcrConversion"; function vkCreateDescriptorUpdateTemplate (device : VkDevice; pCreateInfo : access constant VkDescriptorUpdateTemplateCreateInfo; pAllocator : access constant VkAllocationCallbacks; pDescriptorUpdateTemplate : System.Address) return VkResult -- vulkan_core.h:4867 with Import => True, Convention => C, External_Name => "vkCreateDescriptorUpdateTemplate"; procedure vkDestroyDescriptorUpdateTemplate (device : VkDevice; descriptorUpdateTemplate : VkDescriptorUpdateTemplate; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:4873 with Import => True, Convention => C, External_Name => "vkDestroyDescriptorUpdateTemplate"; procedure vkUpdateDescriptorSetWithTemplate (device : VkDevice; descriptorSet : VkDescriptorSet; descriptorUpdateTemplate : VkDescriptorUpdateTemplate; pData : System.Address) -- vulkan_core.h:4878 with Import => True, Convention => C, External_Name => "vkUpdateDescriptorSetWithTemplate"; procedure vkGetPhysicalDeviceExternalBufferProperties (physicalDevice : VkPhysicalDevice; pExternalBufferInfo : access constant VkPhysicalDeviceExternalBufferInfo; pExternalBufferProperties : access VkExternalBufferProperties) -- vulkan_core.h:4884 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceExternalBufferProperties"; procedure vkGetPhysicalDeviceExternalFenceProperties (physicalDevice : VkPhysicalDevice; pExternalFenceInfo : access constant VkPhysicalDeviceExternalFenceInfo; pExternalFenceProperties : access VkExternalFenceProperties) -- vulkan_core.h:4889 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceExternalFenceProperties"; procedure vkGetPhysicalDeviceExternalSemaphoreProperties (physicalDevice : VkPhysicalDevice; pExternalSemaphoreInfo : access constant VkPhysicalDeviceExternalSemaphoreInfo; pExternalSemaphoreProperties : access VkExternalSemaphoreProperties) -- vulkan_core.h:4894 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceExternalSemaphoreProperties"; procedure vkGetDescriptorSetLayoutSupport (device : VkDevice; pCreateInfo : access constant VkDescriptorSetLayoutCreateInfo; pSupport : access VkDescriptorSetLayoutSupport) -- vulkan_core.h:4899 with Import => True, Convention => C, External_Name => "vkGetDescriptorSetLayoutSupport"; -- Vulkan 1.2 version number subtype VkDeviceAddress is Interfaces.C.unsigned_long; -- vulkan_core.h:4910 subtype VkDriverId is unsigned; VK_DRIVER_ID_AMD_PROPRIETARY : constant unsigned := 1; VK_DRIVER_ID_AMD_OPEN_SOURCE : constant unsigned := 2; VK_DRIVER_ID_MESA_RADV : constant unsigned := 3; VK_DRIVER_ID_NVIDIA_PROPRIETARY : constant unsigned := 4; VK_DRIVER_ID_INTEL_PROPRIETARY_WINDOWS : constant unsigned := 5; VK_DRIVER_ID_INTEL_OPEN_SOURCE_MESA : constant unsigned := 6; VK_DRIVER_ID_IMAGINATION_PROPRIETARY : constant unsigned := 7; VK_DRIVER_ID_QUALCOMM_PROPRIETARY : constant unsigned := 8; VK_DRIVER_ID_ARM_PROPRIETARY : constant unsigned := 9; VK_DRIVER_ID_GOOGLE_SWIFTSHADER : constant unsigned := 10; VK_DRIVER_ID_GGP_PROPRIETARY : constant unsigned := 11; VK_DRIVER_ID_BROADCOM_PROPRIETARY : constant unsigned := 12; VK_DRIVER_ID_AMD_PROPRIETARY_KHR : constant unsigned := 1; VK_DRIVER_ID_AMD_OPEN_SOURCE_KHR : constant unsigned := 2; VK_DRIVER_ID_MESA_RADV_KHR : constant unsigned := 3; VK_DRIVER_ID_NVIDIA_PROPRIETARY_KHR : constant unsigned := 4; VK_DRIVER_ID_INTEL_PROPRIETARY_WINDOWS_KHR : constant unsigned := 5; VK_DRIVER_ID_INTEL_OPEN_SOURCE_MESA_KHR : constant unsigned := 6; VK_DRIVER_ID_IMAGINATION_PROPRIETARY_KHR : constant unsigned := 7; VK_DRIVER_ID_QUALCOMM_PROPRIETARY_KHR : constant unsigned := 8; VK_DRIVER_ID_ARM_PROPRIETARY_KHR : constant unsigned := 9; VK_DRIVER_ID_GOOGLE_SWIFTSHADER_KHR : constant unsigned := 10; VK_DRIVER_ID_GGP_PROPRIETARY_KHR : constant unsigned := 11; VK_DRIVER_ID_BROADCOM_PROPRIETARY_KHR : constant unsigned := 12; VK_DRIVER_ID_BEGIN_RANGE : constant unsigned := 1; VK_DRIVER_ID_END_RANGE : constant unsigned := 12; VK_DRIVER_ID_RANGE_SIZE : constant unsigned := 12; VK_DRIVER_ID_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4914 subtype VkShaderFloatControlsIndependence is unsigned; VK_SHADER_FLOAT_CONTROLS_INDEPENDENCE_32_BIT_ONLY : constant unsigned := 0; VK_SHADER_FLOAT_CONTROLS_INDEPENDENCE_ALL : constant unsigned := 1; VK_SHADER_FLOAT_CONTROLS_INDEPENDENCE_NONE : constant unsigned := 2; VK_SHADER_FLOAT_CONTROLS_INDEPENDENCE_32_BIT_ONLY_KHR : constant unsigned := 0; VK_SHADER_FLOAT_CONTROLS_INDEPENDENCE_ALL_KHR : constant unsigned := 1; VK_SHADER_FLOAT_CONTROLS_INDEPENDENCE_NONE_KHR : constant unsigned := 2; VK_SHADER_FLOAT_CONTROLS_INDEPENDENCE_BEGIN_RANGE : constant unsigned := 0; VK_SHADER_FLOAT_CONTROLS_INDEPENDENCE_END_RANGE : constant unsigned := 2; VK_SHADER_FLOAT_CONTROLS_INDEPENDENCE_RANGE_SIZE : constant unsigned := 3; VK_SHADER_FLOAT_CONTROLS_INDEPENDENCE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4945 subtype VkSamplerReductionMode is unsigned; VK_SAMPLER_REDUCTION_MODE_WEIGHTED_AVERAGE : constant unsigned := 0; VK_SAMPLER_REDUCTION_MODE_MIN : constant unsigned := 1; VK_SAMPLER_REDUCTION_MODE_MAX : constant unsigned := 2; VK_SAMPLER_REDUCTION_MODE_WEIGHTED_AVERAGE_EXT : constant unsigned := 0; VK_SAMPLER_REDUCTION_MODE_MIN_EXT : constant unsigned := 1; VK_SAMPLER_REDUCTION_MODE_MAX_EXT : constant unsigned := 2; VK_SAMPLER_REDUCTION_MODE_BEGIN_RANGE : constant unsigned := 0; VK_SAMPLER_REDUCTION_MODE_END_RANGE : constant unsigned := 2; VK_SAMPLER_REDUCTION_MODE_RANGE_SIZE : constant unsigned := 3; VK_SAMPLER_REDUCTION_MODE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4958 subtype VkSemaphoreType is unsigned; VK_SEMAPHORE_TYPE_BINARY : constant unsigned := 0; VK_SEMAPHORE_TYPE_TIMELINE : constant unsigned := 1; VK_SEMAPHORE_TYPE_BINARY_KHR : constant unsigned := 0; VK_SEMAPHORE_TYPE_TIMELINE_KHR : constant unsigned := 1; VK_SEMAPHORE_TYPE_BEGIN_RANGE : constant unsigned := 0; VK_SEMAPHORE_TYPE_END_RANGE : constant unsigned := 1; VK_SEMAPHORE_TYPE_RANGE_SIZE : constant unsigned := 2; VK_SEMAPHORE_TYPE_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4971 subtype VkResolveModeFlagBits is unsigned; VK_RESOLVE_MODE_NONE : constant unsigned := 0; VK_RESOLVE_MODE_SAMPLE_ZERO_BIT : constant unsigned := 1; VK_RESOLVE_MODE_AVERAGE_BIT : constant unsigned := 2; VK_RESOLVE_MODE_MIN_BIT : constant unsigned := 4; VK_RESOLVE_MODE_MAX_BIT : constant unsigned := 8; VK_RESOLVE_MODE_NONE_KHR : constant unsigned := 0; VK_RESOLVE_MODE_SAMPLE_ZERO_BIT_KHR : constant unsigned := 1; VK_RESOLVE_MODE_AVERAGE_BIT_KHR : constant unsigned := 2; VK_RESOLVE_MODE_MIN_BIT_KHR : constant unsigned := 4; VK_RESOLVE_MODE_MAX_BIT_KHR : constant unsigned := 8; VK_RESOLVE_MODE_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4982 subtype VkResolveModeFlags is VkFlags; -- vulkan_core.h:4995 subtype VkDescriptorBindingFlagBits is unsigned; VK_DESCRIPTOR_BINDING_UPDATE_AFTER_BIND_BIT : constant unsigned := 1; VK_DESCRIPTOR_BINDING_UPDATE_UNUSED_WHILE_PENDING_BIT : constant unsigned := 2; VK_DESCRIPTOR_BINDING_PARTIALLY_BOUND_BIT : constant unsigned := 4; VK_DESCRIPTOR_BINDING_VARIABLE_DESCRIPTOR_COUNT_BIT : constant unsigned := 8; VK_DESCRIPTOR_BINDING_UPDATE_AFTER_BIND_BIT_EXT : constant unsigned := 1; VK_DESCRIPTOR_BINDING_UPDATE_UNUSED_WHILE_PENDING_BIT_EXT : constant unsigned := 2; VK_DESCRIPTOR_BINDING_PARTIALLY_BOUND_BIT_EXT : constant unsigned := 4; VK_DESCRIPTOR_BINDING_VARIABLE_DESCRIPTOR_COUNT_BIT_EXT : constant unsigned := 8; VK_DESCRIPTOR_BINDING_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:4997 subtype VkDescriptorBindingFlags is VkFlags; -- vulkan_core.h:5008 subtype VkSemaphoreWaitFlagBits is unsigned; VK_SEMAPHORE_WAIT_ANY_BIT : constant unsigned := 1; VK_SEMAPHORE_WAIT_ANY_BIT_KHR : constant unsigned := 1; VK_SEMAPHORE_WAIT_FLAG_BITS_MAX_ENUM : constant unsigned := 2147483647; -- vulkan_core.h:5010 subtype VkSemaphoreWaitFlags is VkFlags; -- vulkan_core.h:5015 type VkPhysicalDeviceVulkan11Features is record sType : aliased VkStructureType; -- vulkan_core.h:5017 pNext : System.Address; -- vulkan_core.h:5018 storageBuffer16BitAccess : aliased VkBool32; -- vulkan_core.h:5019 uniformAndStorageBuffer16BitAccess : aliased VkBool32; -- vulkan_core.h:5020 storagePushConstant16 : aliased VkBool32; -- vulkan_core.h:5021 storageInputOutput16 : aliased VkBool32; -- vulkan_core.h:5022 multiview : aliased VkBool32; -- vulkan_core.h:5023 multiviewGeometryShader : aliased VkBool32; -- vulkan_core.h:5024 multiviewTessellationShader : aliased VkBool32; -- vulkan_core.h:5025 variablePointersStorageBuffer : aliased VkBool32; -- vulkan_core.h:5026 variablePointers : aliased VkBool32; -- vulkan_core.h:5027 protectedMemory : aliased VkBool32; -- vulkan_core.h:5028 samplerYcbcrConversion : aliased VkBool32; -- vulkan_core.h:5029 shaderDrawParameters : aliased VkBool32; -- vulkan_core.h:5030 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5016 type VkPhysicalDeviceVulkan11Properties_array1345 is array (0 .. 15) of aliased Interfaces.C.unsigned_char; type VkPhysicalDeviceVulkan11Properties_array3040 is array (0 .. 7) of aliased Interfaces.C.unsigned_char; type VkPhysicalDeviceVulkan11Properties is record sType : aliased VkStructureType; -- vulkan_core.h:5034 pNext : System.Address; -- vulkan_core.h:5035 deviceUUID : aliased VkPhysicalDeviceVulkan11Properties_array1345; -- vulkan_core.h:5036 driverUUID : aliased VkPhysicalDeviceVulkan11Properties_array1345; -- vulkan_core.h:5037 deviceLUID : aliased VkPhysicalDeviceVulkan11Properties_array3040; -- vulkan_core.h:5038 deviceNodeMask : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5039 deviceLUIDValid : aliased VkBool32; -- vulkan_core.h:5040 subgroupSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5041 subgroupSupportedStages : aliased VkShaderStageFlags; -- vulkan_core.h:5042 subgroupSupportedOperations : aliased VkSubgroupFeatureFlags; -- vulkan_core.h:5043 subgroupQuadOperationsInAllStages : aliased VkBool32; -- vulkan_core.h:5044 pointClippingBehavior : aliased VkPointClippingBehavior; -- vulkan_core.h:5045 maxMultiviewViewCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5046 maxMultiviewInstanceIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5047 protectedNoFault : aliased VkBool32; -- vulkan_core.h:5048 maxPerSetDescriptors : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5049 maxMemoryAllocationSize : aliased VkDeviceSize; -- vulkan_core.h:5050 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5033 type VkPhysicalDeviceVulkan12Features is record sType : aliased VkStructureType; -- vulkan_core.h:5054 pNext : System.Address; -- vulkan_core.h:5055 samplerMirrorClampToEdge : aliased VkBool32; -- vulkan_core.h:5056 drawIndirectCount : aliased VkBool32; -- vulkan_core.h:5057 storageBuffer8BitAccess : aliased VkBool32; -- vulkan_core.h:5058 uniformAndStorageBuffer8BitAccess : aliased VkBool32; -- vulkan_core.h:5059 storagePushConstant8 : aliased VkBool32; -- vulkan_core.h:5060 shaderBufferInt64Atomics : aliased VkBool32; -- vulkan_core.h:5061 shaderSharedInt64Atomics : aliased VkBool32; -- vulkan_core.h:5062 shaderFloat16 : aliased VkBool32; -- vulkan_core.h:5063 shaderInt8 : aliased VkBool32; -- vulkan_core.h:5064 descriptorIndexing : aliased VkBool32; -- vulkan_core.h:5065 shaderInputAttachmentArrayDynamicIndexing : aliased VkBool32; -- vulkan_core.h:5066 shaderUniformTexelBufferArrayDynamicIndexing : aliased VkBool32; -- vulkan_core.h:5067 shaderStorageTexelBufferArrayDynamicIndexing : aliased VkBool32; -- vulkan_core.h:5068 shaderUniformBufferArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5069 shaderSampledImageArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5070 shaderStorageBufferArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5071 shaderStorageImageArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5072 shaderInputAttachmentArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5073 shaderUniformTexelBufferArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5074 shaderStorageTexelBufferArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5075 descriptorBindingUniformBufferUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5076 descriptorBindingSampledImageUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5077 descriptorBindingStorageImageUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5078 descriptorBindingStorageBufferUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5079 descriptorBindingUniformTexelBufferUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5080 descriptorBindingStorageTexelBufferUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5081 descriptorBindingUpdateUnusedWhilePending : aliased VkBool32; -- vulkan_core.h:5082 descriptorBindingPartiallyBound : aliased VkBool32; -- vulkan_core.h:5083 descriptorBindingVariableDescriptorCount : aliased VkBool32; -- vulkan_core.h:5084 runtimeDescriptorArray : aliased VkBool32; -- vulkan_core.h:5085 samplerFilterMinmax : aliased VkBool32; -- vulkan_core.h:5086 scalarBlockLayout : aliased VkBool32; -- vulkan_core.h:5087 imagelessFramebuffer : aliased VkBool32; -- vulkan_core.h:5088 uniformBufferStandardLayout : aliased VkBool32; -- vulkan_core.h:5089 shaderSubgroupExtendedTypes : aliased VkBool32; -- vulkan_core.h:5090 separateDepthStencilLayouts : aliased VkBool32; -- vulkan_core.h:5091 hostQueryReset : aliased VkBool32; -- vulkan_core.h:5092 timelineSemaphore : aliased VkBool32; -- vulkan_core.h:5093 bufferDeviceAddress : aliased VkBool32; -- vulkan_core.h:5094 bufferDeviceAddressCaptureReplay : aliased VkBool32; -- vulkan_core.h:5095 bufferDeviceAddressMultiDevice : aliased VkBool32; -- vulkan_core.h:5096 vulkanMemoryModel : aliased VkBool32; -- vulkan_core.h:5097 vulkanMemoryModelDeviceScope : aliased VkBool32; -- vulkan_core.h:5098 vulkanMemoryModelAvailabilityVisibilityChains : aliased VkBool32; -- vulkan_core.h:5099 shaderOutputViewportIndex : aliased VkBool32; -- vulkan_core.h:5100 shaderOutputLayer : aliased VkBool32; -- vulkan_core.h:5101 subgroupBroadcastDynamicId : aliased VkBool32; -- vulkan_core.h:5102 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5053 type VkConformanceVersion is record major : aliased Interfaces.C.unsigned_char; -- vulkan_core.h:5106 minor : aliased Interfaces.C.unsigned_char; -- vulkan_core.h:5107 subminor : aliased Interfaces.C.unsigned_char; -- vulkan_core.h:5108 patch : aliased Interfaces.C.unsigned_char; -- vulkan_core.h:5109 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5105 subtype VkPhysicalDeviceVulkan12Properties_array1342 is Interfaces.C.char_array (0 .. 255); type VkPhysicalDeviceVulkan12Properties is record sType : aliased VkStructureType; -- vulkan_core.h:5113 pNext : System.Address; -- vulkan_core.h:5114 driverID : aliased VkDriverId; -- vulkan_core.h:5115 driverName : aliased VkPhysicalDeviceVulkan12Properties_array1342; -- vulkan_core.h:5116 driverInfo : aliased VkPhysicalDeviceVulkan12Properties_array1342; -- vulkan_core.h:5117 conformanceVersion : aliased VkConformanceVersion; -- vulkan_core.h:5118 denormBehaviorIndependence : aliased VkShaderFloatControlsIndependence; -- vulkan_core.h:5119 roundingModeIndependence : aliased VkShaderFloatControlsIndependence; -- vulkan_core.h:5120 shaderSignedZeroInfNanPreserveFloat16 : aliased VkBool32; -- vulkan_core.h:5121 shaderSignedZeroInfNanPreserveFloat32 : aliased VkBool32; -- vulkan_core.h:5122 shaderSignedZeroInfNanPreserveFloat64 : aliased VkBool32; -- vulkan_core.h:5123 shaderDenormPreserveFloat16 : aliased VkBool32; -- vulkan_core.h:5124 shaderDenormPreserveFloat32 : aliased VkBool32; -- vulkan_core.h:5125 shaderDenormPreserveFloat64 : aliased VkBool32; -- vulkan_core.h:5126 shaderDenormFlushToZeroFloat16 : aliased VkBool32; -- vulkan_core.h:5127 shaderDenormFlushToZeroFloat32 : aliased VkBool32; -- vulkan_core.h:5128 shaderDenormFlushToZeroFloat64 : aliased VkBool32; -- vulkan_core.h:5129 shaderRoundingModeRTEFloat16 : aliased VkBool32; -- vulkan_core.h:5130 shaderRoundingModeRTEFloat32 : aliased VkBool32; -- vulkan_core.h:5131 shaderRoundingModeRTEFloat64 : aliased VkBool32; -- vulkan_core.h:5132 shaderRoundingModeRTZFloat16 : aliased VkBool32; -- vulkan_core.h:5133 shaderRoundingModeRTZFloat32 : aliased VkBool32; -- vulkan_core.h:5134 shaderRoundingModeRTZFloat64 : aliased VkBool32; -- vulkan_core.h:5135 maxUpdateAfterBindDescriptorsInAllPools : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5136 shaderUniformBufferArrayNonUniformIndexingNative : aliased VkBool32; -- vulkan_core.h:5137 shaderSampledImageArrayNonUniformIndexingNative : aliased VkBool32; -- vulkan_core.h:5138 shaderStorageBufferArrayNonUniformIndexingNative : aliased VkBool32; -- vulkan_core.h:5139 shaderStorageImageArrayNonUniformIndexingNative : aliased VkBool32; -- vulkan_core.h:5140 shaderInputAttachmentArrayNonUniformIndexingNative : aliased VkBool32; -- vulkan_core.h:5141 robustBufferAccessUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5142 quadDivergentImplicitLod : aliased VkBool32; -- vulkan_core.h:5143 maxPerStageDescriptorUpdateAfterBindSamplers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5144 maxPerStageDescriptorUpdateAfterBindUniformBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5145 maxPerStageDescriptorUpdateAfterBindStorageBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5146 maxPerStageDescriptorUpdateAfterBindSampledImages : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5147 maxPerStageDescriptorUpdateAfterBindStorageImages : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5148 maxPerStageDescriptorUpdateAfterBindInputAttachments : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5149 maxPerStageUpdateAfterBindResources : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5150 maxDescriptorSetUpdateAfterBindSamplers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5151 maxDescriptorSetUpdateAfterBindUniformBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5152 maxDescriptorSetUpdateAfterBindUniformBuffersDynamic : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5153 maxDescriptorSetUpdateAfterBindStorageBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5154 maxDescriptorSetUpdateAfterBindStorageBuffersDynamic : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5155 maxDescriptorSetUpdateAfterBindSampledImages : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5156 maxDescriptorSetUpdateAfterBindStorageImages : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5157 maxDescriptorSetUpdateAfterBindInputAttachments : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5158 supportedDepthResolveModes : aliased VkResolveModeFlags; -- vulkan_core.h:5159 supportedStencilResolveModes : aliased VkResolveModeFlags; -- vulkan_core.h:5160 independentResolveNone : aliased VkBool32; -- vulkan_core.h:5161 independentResolve : aliased VkBool32; -- vulkan_core.h:5162 filterMinmaxSingleComponentFormats : aliased VkBool32; -- vulkan_core.h:5163 filterMinmaxImageComponentMapping : aliased VkBool32; -- vulkan_core.h:5164 maxTimelineSemaphoreValueDifference : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:5165 framebufferIntegerColorSampleCounts : aliased VkSampleCountFlags; -- vulkan_core.h:5166 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5112 type VkImageFormatListCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5170 pNext : System.Address; -- vulkan_core.h:5171 viewFormatCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5172 pViewFormats : access VkFormat; -- vulkan_core.h:5173 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5169 type VkAttachmentDescription2 is record sType : aliased VkStructureType; -- vulkan_core.h:5177 pNext : System.Address; -- vulkan_core.h:5178 flags : aliased VkAttachmentDescriptionFlags; -- vulkan_core.h:5179 format : aliased VkFormat; -- vulkan_core.h:5180 samples : aliased VkSampleCountFlagBits; -- vulkan_core.h:5181 loadOp : aliased VkAttachmentLoadOp; -- vulkan_core.h:5182 storeOp : aliased VkAttachmentStoreOp; -- vulkan_core.h:5183 stencilLoadOp : aliased VkAttachmentLoadOp; -- vulkan_core.h:5184 stencilStoreOp : aliased VkAttachmentStoreOp; -- vulkan_core.h:5185 initialLayout : aliased VkImageLayout; -- vulkan_core.h:5186 finalLayout : aliased VkImageLayout; -- vulkan_core.h:5187 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5176 type VkAttachmentReference2 is record sType : aliased VkStructureType; -- vulkan_core.h:5191 pNext : System.Address; -- vulkan_core.h:5192 attachment : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5193 layout : aliased VkImageLayout; -- vulkan_core.h:5194 aspectMask : aliased VkImageAspectFlags; -- vulkan_core.h:5195 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5190 type VkSubpassDescription2 is record sType : aliased VkStructureType; -- vulkan_core.h:5199 pNext : System.Address; -- vulkan_core.h:5200 flags : aliased VkSubpassDescriptionFlags; -- vulkan_core.h:5201 pipelineBindPoint : aliased VkPipelineBindPoint; -- vulkan_core.h:5202 viewMask : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5203 inputAttachmentCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5204 pInputAttachments : access constant VkAttachmentReference2; -- vulkan_core.h:5205 colorAttachmentCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5206 pColorAttachments : access constant VkAttachmentReference2; -- vulkan_core.h:5207 pResolveAttachments : access constant VkAttachmentReference2; -- vulkan_core.h:5208 pDepthStencilAttachment : access constant VkAttachmentReference2; -- vulkan_core.h:5209 preserveAttachmentCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5210 pPreserveAttachments : access Interfaces.C.unsigned_short; -- vulkan_core.h:5211 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5198 type VkSubpassDependency2 is record sType : aliased VkStructureType; -- vulkan_core.h:5215 pNext : System.Address; -- vulkan_core.h:5216 srcSubpass : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5217 dstSubpass : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5218 srcStageMask : aliased VkPipelineStageFlags; -- vulkan_core.h:5219 dstStageMask : aliased VkPipelineStageFlags; -- vulkan_core.h:5220 srcAccessMask : aliased VkAccessFlags; -- vulkan_core.h:5221 dstAccessMask : aliased VkAccessFlags; -- vulkan_core.h:5222 dependencyFlags : aliased VkDependencyFlags; -- vulkan_core.h:5223 viewOffset : aliased Interfaces.C.short; -- vulkan_core.h:5224 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5214 type VkRenderPassCreateInfo2 is record sType : aliased VkStructureType; -- vulkan_core.h:5228 pNext : System.Address; -- vulkan_core.h:5229 flags : aliased VkRenderPassCreateFlags; -- vulkan_core.h:5230 attachmentCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5231 pAttachments : access constant VkAttachmentDescription2; -- vulkan_core.h:5232 subpassCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5233 pSubpasses : access constant VkSubpassDescription2; -- vulkan_core.h:5234 dependencyCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5235 pDependencies : access constant VkSubpassDependency2; -- vulkan_core.h:5236 correlatedViewMaskCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5237 pCorrelatedViewMasks : access Interfaces.C.unsigned_short; -- vulkan_core.h:5238 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5227 type VkSubpassBeginInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5242 pNext : System.Address; -- vulkan_core.h:5243 contents : aliased VkSubpassContents; -- vulkan_core.h:5244 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5241 type VkSubpassEndInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5248 pNext : System.Address; -- vulkan_core.h:5249 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5247 type VkPhysicalDevice8BitStorageFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:5253 pNext : System.Address; -- vulkan_core.h:5254 storageBuffer8BitAccess : aliased VkBool32; -- vulkan_core.h:5255 uniformAndStorageBuffer8BitAccess : aliased VkBool32; -- vulkan_core.h:5256 storagePushConstant8 : aliased VkBool32; -- vulkan_core.h:5257 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5252 subtype VkPhysicalDeviceDriverProperties_array1342 is Interfaces.C.char_array (0 .. 255); type VkPhysicalDeviceDriverProperties is record sType : aliased VkStructureType; -- vulkan_core.h:5261 pNext : System.Address; -- vulkan_core.h:5262 driverID : aliased VkDriverId; -- vulkan_core.h:5263 driverName : aliased VkPhysicalDeviceDriverProperties_array1342; -- vulkan_core.h:5264 driverInfo : aliased VkPhysicalDeviceDriverProperties_array1342; -- vulkan_core.h:5265 conformanceVersion : aliased VkConformanceVersion; -- vulkan_core.h:5266 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5260 type VkPhysicalDeviceShaderAtomicInt64Features is record sType : aliased VkStructureType; -- vulkan_core.h:5270 pNext : System.Address; -- vulkan_core.h:5271 shaderBufferInt64Atomics : aliased VkBool32; -- vulkan_core.h:5272 shaderSharedInt64Atomics : aliased VkBool32; -- vulkan_core.h:5273 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5269 type VkPhysicalDeviceShaderFloat16Int8Features is record sType : aliased VkStructureType; -- vulkan_core.h:5277 pNext : System.Address; -- vulkan_core.h:5278 shaderFloat16 : aliased VkBool32; -- vulkan_core.h:5279 shaderInt8 : aliased VkBool32; -- vulkan_core.h:5280 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5276 type VkPhysicalDeviceFloatControlsProperties is record sType : aliased VkStructureType; -- vulkan_core.h:5284 pNext : System.Address; -- vulkan_core.h:5285 denormBehaviorIndependence : aliased VkShaderFloatControlsIndependence; -- vulkan_core.h:5286 roundingModeIndependence : aliased VkShaderFloatControlsIndependence; -- vulkan_core.h:5287 shaderSignedZeroInfNanPreserveFloat16 : aliased VkBool32; -- vulkan_core.h:5288 shaderSignedZeroInfNanPreserveFloat32 : aliased VkBool32; -- vulkan_core.h:5289 shaderSignedZeroInfNanPreserveFloat64 : aliased VkBool32; -- vulkan_core.h:5290 shaderDenormPreserveFloat16 : aliased VkBool32; -- vulkan_core.h:5291 shaderDenormPreserveFloat32 : aliased VkBool32; -- vulkan_core.h:5292 shaderDenormPreserveFloat64 : aliased VkBool32; -- vulkan_core.h:5293 shaderDenormFlushToZeroFloat16 : aliased VkBool32; -- vulkan_core.h:5294 shaderDenormFlushToZeroFloat32 : aliased VkBool32; -- vulkan_core.h:5295 shaderDenormFlushToZeroFloat64 : aliased VkBool32; -- vulkan_core.h:5296 shaderRoundingModeRTEFloat16 : aliased VkBool32; -- vulkan_core.h:5297 shaderRoundingModeRTEFloat32 : aliased VkBool32; -- vulkan_core.h:5298 shaderRoundingModeRTEFloat64 : aliased VkBool32; -- vulkan_core.h:5299 shaderRoundingModeRTZFloat16 : aliased VkBool32; -- vulkan_core.h:5300 shaderRoundingModeRTZFloat32 : aliased VkBool32; -- vulkan_core.h:5301 shaderRoundingModeRTZFloat64 : aliased VkBool32; -- vulkan_core.h:5302 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5283 type VkDescriptorSetLayoutBindingFlagsCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5306 pNext : System.Address; -- vulkan_core.h:5307 bindingCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5308 pBindingFlags : access VkDescriptorBindingFlags; -- vulkan_core.h:5309 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5305 type VkPhysicalDeviceDescriptorIndexingFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:5313 pNext : System.Address; -- vulkan_core.h:5314 shaderInputAttachmentArrayDynamicIndexing : aliased VkBool32; -- vulkan_core.h:5315 shaderUniformTexelBufferArrayDynamicIndexing : aliased VkBool32; -- vulkan_core.h:5316 shaderStorageTexelBufferArrayDynamicIndexing : aliased VkBool32; -- vulkan_core.h:5317 shaderUniformBufferArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5318 shaderSampledImageArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5319 shaderStorageBufferArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5320 shaderStorageImageArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5321 shaderInputAttachmentArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5322 shaderUniformTexelBufferArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5323 shaderStorageTexelBufferArrayNonUniformIndexing : aliased VkBool32; -- vulkan_core.h:5324 descriptorBindingUniformBufferUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5325 descriptorBindingSampledImageUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5326 descriptorBindingStorageImageUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5327 descriptorBindingStorageBufferUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5328 descriptorBindingUniformTexelBufferUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5329 descriptorBindingStorageTexelBufferUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5330 descriptorBindingUpdateUnusedWhilePending : aliased VkBool32; -- vulkan_core.h:5331 descriptorBindingPartiallyBound : aliased VkBool32; -- vulkan_core.h:5332 descriptorBindingVariableDescriptorCount : aliased VkBool32; -- vulkan_core.h:5333 runtimeDescriptorArray : aliased VkBool32; -- vulkan_core.h:5334 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5312 type VkPhysicalDeviceDescriptorIndexingProperties is record sType : aliased VkStructureType; -- vulkan_core.h:5338 pNext : System.Address; -- vulkan_core.h:5339 maxUpdateAfterBindDescriptorsInAllPools : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5340 shaderUniformBufferArrayNonUniformIndexingNative : aliased VkBool32; -- vulkan_core.h:5341 shaderSampledImageArrayNonUniformIndexingNative : aliased VkBool32; -- vulkan_core.h:5342 shaderStorageBufferArrayNonUniformIndexingNative : aliased VkBool32; -- vulkan_core.h:5343 shaderStorageImageArrayNonUniformIndexingNative : aliased VkBool32; -- vulkan_core.h:5344 shaderInputAttachmentArrayNonUniformIndexingNative : aliased VkBool32; -- vulkan_core.h:5345 robustBufferAccessUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:5346 quadDivergentImplicitLod : aliased VkBool32; -- vulkan_core.h:5347 maxPerStageDescriptorUpdateAfterBindSamplers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5348 maxPerStageDescriptorUpdateAfterBindUniformBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5349 maxPerStageDescriptorUpdateAfterBindStorageBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5350 maxPerStageDescriptorUpdateAfterBindSampledImages : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5351 maxPerStageDescriptorUpdateAfterBindStorageImages : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5352 maxPerStageDescriptorUpdateAfterBindInputAttachments : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5353 maxPerStageUpdateAfterBindResources : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5354 maxDescriptorSetUpdateAfterBindSamplers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5355 maxDescriptorSetUpdateAfterBindUniformBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5356 maxDescriptorSetUpdateAfterBindUniformBuffersDynamic : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5357 maxDescriptorSetUpdateAfterBindStorageBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5358 maxDescriptorSetUpdateAfterBindStorageBuffersDynamic : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5359 maxDescriptorSetUpdateAfterBindSampledImages : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5360 maxDescriptorSetUpdateAfterBindStorageImages : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5361 maxDescriptorSetUpdateAfterBindInputAttachments : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5362 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5337 type VkDescriptorSetVariableDescriptorCountAllocateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5366 pNext : System.Address; -- vulkan_core.h:5367 descriptorSetCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5368 pDescriptorCounts : access Interfaces.C.unsigned_short; -- vulkan_core.h:5369 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5365 type VkDescriptorSetVariableDescriptorCountLayoutSupport is record sType : aliased VkStructureType; -- vulkan_core.h:5373 pNext : System.Address; -- vulkan_core.h:5374 maxVariableDescriptorCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5375 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5372 type VkSubpassDescriptionDepthStencilResolve is record sType : aliased VkStructureType; -- vulkan_core.h:5379 pNext : System.Address; -- vulkan_core.h:5380 depthResolveMode : aliased VkResolveModeFlagBits; -- vulkan_core.h:5381 stencilResolveMode : aliased VkResolveModeFlagBits; -- vulkan_core.h:5382 pDepthStencilResolveAttachment : access constant VkAttachmentReference2; -- vulkan_core.h:5383 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5378 type VkPhysicalDeviceDepthStencilResolveProperties is record sType : aliased VkStructureType; -- vulkan_core.h:5387 pNext : System.Address; -- vulkan_core.h:5388 supportedDepthResolveModes : aliased VkResolveModeFlags; -- vulkan_core.h:5389 supportedStencilResolveModes : aliased VkResolveModeFlags; -- vulkan_core.h:5390 independentResolveNone : aliased VkBool32; -- vulkan_core.h:5391 independentResolve : aliased VkBool32; -- vulkan_core.h:5392 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5386 type VkPhysicalDeviceScalarBlockLayoutFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:5396 pNext : System.Address; -- vulkan_core.h:5397 scalarBlockLayout : aliased VkBool32; -- vulkan_core.h:5398 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5395 type VkImageStencilUsageCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5402 pNext : System.Address; -- vulkan_core.h:5403 stencilUsage : aliased VkImageUsageFlags; -- vulkan_core.h:5404 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5401 type VkSamplerReductionModeCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5408 pNext : System.Address; -- vulkan_core.h:5409 reductionMode : aliased VkSamplerReductionMode; -- vulkan_core.h:5410 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5407 type VkPhysicalDeviceSamplerFilterMinmaxProperties is record sType : aliased VkStructureType; -- vulkan_core.h:5414 pNext : System.Address; -- vulkan_core.h:5415 filterMinmaxSingleComponentFormats : aliased VkBool32; -- vulkan_core.h:5416 filterMinmaxImageComponentMapping : aliased VkBool32; -- vulkan_core.h:5417 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5413 type VkPhysicalDeviceVulkanMemoryModelFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:5421 pNext : System.Address; -- vulkan_core.h:5422 vulkanMemoryModel : aliased VkBool32; -- vulkan_core.h:5423 vulkanMemoryModelDeviceScope : aliased VkBool32; -- vulkan_core.h:5424 vulkanMemoryModelAvailabilityVisibilityChains : aliased VkBool32; -- vulkan_core.h:5425 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5420 type VkPhysicalDeviceImagelessFramebufferFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:5429 pNext : System.Address; -- vulkan_core.h:5430 imagelessFramebuffer : aliased VkBool32; -- vulkan_core.h:5431 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5428 type VkFramebufferAttachmentImageInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5435 pNext : System.Address; -- vulkan_core.h:5436 flags : aliased VkImageCreateFlags; -- vulkan_core.h:5437 usage : aliased VkImageUsageFlags; -- vulkan_core.h:5438 width : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5439 height : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5440 layerCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5441 viewFormatCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5442 pViewFormats : access VkFormat; -- vulkan_core.h:5443 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5434 type VkFramebufferAttachmentsCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5447 pNext : System.Address; -- vulkan_core.h:5448 attachmentImageInfoCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5449 pAttachmentImageInfos : access constant VkFramebufferAttachmentImageInfo; -- vulkan_core.h:5450 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5446 type VkRenderPassAttachmentBeginInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5454 pNext : System.Address; -- vulkan_core.h:5455 attachmentCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5456 pAttachments : System.Address; -- vulkan_core.h:5457 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5453 type VkPhysicalDeviceUniformBufferStandardLayoutFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:5461 pNext : System.Address; -- vulkan_core.h:5462 uniformBufferStandardLayout : aliased VkBool32; -- vulkan_core.h:5463 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5460 type VkPhysicalDeviceShaderSubgroupExtendedTypesFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:5467 pNext : System.Address; -- vulkan_core.h:5468 shaderSubgroupExtendedTypes : aliased VkBool32; -- vulkan_core.h:5469 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5466 type VkPhysicalDeviceSeparateDepthStencilLayoutsFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:5473 pNext : System.Address; -- vulkan_core.h:5474 separateDepthStencilLayouts : aliased VkBool32; -- vulkan_core.h:5475 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5472 type VkAttachmentReferenceStencilLayout is record sType : aliased VkStructureType; -- vulkan_core.h:5479 pNext : System.Address; -- vulkan_core.h:5480 stencilLayout : aliased VkImageLayout; -- vulkan_core.h:5481 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5478 type VkAttachmentDescriptionStencilLayout is record sType : aliased VkStructureType; -- vulkan_core.h:5485 pNext : System.Address; -- vulkan_core.h:5486 stencilInitialLayout : aliased VkImageLayout; -- vulkan_core.h:5487 stencilFinalLayout : aliased VkImageLayout; -- vulkan_core.h:5488 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5484 type VkPhysicalDeviceHostQueryResetFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:5492 pNext : System.Address; -- vulkan_core.h:5493 hostQueryReset : aliased VkBool32; -- vulkan_core.h:5494 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5491 type VkPhysicalDeviceTimelineSemaphoreFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:5498 pNext : System.Address; -- vulkan_core.h:5499 timelineSemaphore : aliased VkBool32; -- vulkan_core.h:5500 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5497 type VkPhysicalDeviceTimelineSemaphoreProperties is record sType : aliased VkStructureType; -- vulkan_core.h:5504 pNext : System.Address; -- vulkan_core.h:5505 maxTimelineSemaphoreValueDifference : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:5506 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5503 type VkSemaphoreTypeCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5510 pNext : System.Address; -- vulkan_core.h:5511 semaphoreType : aliased VkSemaphoreType; -- vulkan_core.h:5512 initialValue : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:5513 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5509 type VkTimelineSemaphoreSubmitInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5517 pNext : System.Address; -- vulkan_core.h:5518 waitSemaphoreValueCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5519 pWaitSemaphoreValues : access Interfaces.C.unsigned_long; -- vulkan_core.h:5520 signalSemaphoreValueCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5521 pSignalSemaphoreValues : access Interfaces.C.unsigned_long; -- vulkan_core.h:5522 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5516 type VkSemaphoreWaitInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5526 pNext : System.Address; -- vulkan_core.h:5527 flags : aliased VkSemaphoreWaitFlags; -- vulkan_core.h:5528 semaphoreCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5529 pSemaphores : System.Address; -- vulkan_core.h:5530 pValues : access Interfaces.C.unsigned_long; -- vulkan_core.h:5531 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5525 type VkSemaphoreSignalInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5535 pNext : System.Address; -- vulkan_core.h:5536 semaphore : VkSemaphore; -- vulkan_core.h:5537 value : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:5538 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5534 type VkPhysicalDeviceBufferDeviceAddressFeatures is record sType : aliased VkStructureType; -- vulkan_core.h:5542 pNext : System.Address; -- vulkan_core.h:5543 bufferDeviceAddress : aliased VkBool32; -- vulkan_core.h:5544 bufferDeviceAddressCaptureReplay : aliased VkBool32; -- vulkan_core.h:5545 bufferDeviceAddressMultiDevice : aliased VkBool32; -- vulkan_core.h:5546 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5541 type VkBufferDeviceAddressInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5550 pNext : System.Address; -- vulkan_core.h:5551 buffer : VkBuffer; -- vulkan_core.h:5552 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5549 type VkBufferOpaqueCaptureAddressCreateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5556 pNext : System.Address; -- vulkan_core.h:5557 opaqueCaptureAddress : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:5558 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5555 type VkMemoryOpaqueCaptureAddressAllocateInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5562 pNext : System.Address; -- vulkan_core.h:5563 opaqueCaptureAddress : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:5564 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5561 type VkDeviceMemoryOpaqueCaptureAddressInfo is record sType : aliased VkStructureType; -- vulkan_core.h:5568 pNext : System.Address; -- vulkan_core.h:5569 memory : VkDeviceMemory; -- vulkan_core.h:5570 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5567 type PFN_vkCmdDrawIndirectCount is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : VkBuffer; arg5 : VkDeviceSize; arg6 : Interfaces.C.unsigned_short; arg7 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:5573 type PFN_vkCmdDrawIndexedIndirectCount is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : VkBuffer; arg5 : VkDeviceSize; arg6 : Interfaces.C.unsigned_short; arg7 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:5574 type PFN_vkCreateRenderPass2 is access function (arg1 : VkDevice; arg2 : access constant VkRenderPassCreateInfo2; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:5575 type PFN_vkCmdBeginRenderPass2 is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkRenderPassBeginInfo; arg3 : access constant VkSubpassBeginInfo) with Convention => C; -- vulkan_core.h:5576 type PFN_vkCmdNextSubpass2 is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkSubpassBeginInfo; arg3 : access constant VkSubpassEndInfo) with Convention => C; -- vulkan_core.h:5577 type PFN_vkCmdEndRenderPass2 is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkSubpassEndInfo) with Convention => C; -- vulkan_core.h:5578 type PFN_vkResetQueryPool is access procedure (arg1 : VkDevice; arg2 : VkQueryPool; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:5579 type PFN_vkGetSemaphoreCounterValue is access function (arg1 : VkDevice; arg2 : VkSemaphore; arg3 : access Interfaces.C.unsigned_long) return VkResult with Convention => C; -- vulkan_core.h:5580 type PFN_vkWaitSemaphores is access function (arg1 : VkDevice; arg2 : access constant VkSemaphoreWaitInfo; arg3 : Interfaces.C.unsigned_long) return VkResult with Convention => C; -- vulkan_core.h:5581 type PFN_vkSignalSemaphore is access function (arg1 : VkDevice; arg2 : access constant VkSemaphoreSignalInfo) return VkResult with Convention => C; -- vulkan_core.h:5582 type PFN_vkGetBufferDeviceAddress is access function (arg1 : VkDevice; arg2 : access constant VkBufferDeviceAddressInfo) return VkDeviceAddress with Convention => C; -- vulkan_core.h:5583 type PFN_vkGetBufferOpaqueCaptureAddress is access function (arg1 : VkDevice; arg2 : access constant VkBufferDeviceAddressInfo) return Interfaces.C.unsigned_long with Convention => C; -- vulkan_core.h:5584 type PFN_vkGetDeviceMemoryOpaqueCaptureAddress is access function (arg1 : VkDevice; arg2 : access constant VkDeviceMemoryOpaqueCaptureAddressInfo) return Interfaces.C.unsigned_long with Convention => C; -- vulkan_core.h:5585 procedure vkCmdDrawIndirectCount (commandBuffer : VkCommandBuffer; buffer : VkBuffer; offset : VkDeviceSize; countBuffer : VkBuffer; countBufferOffset : VkDeviceSize; maxDrawCount : Interfaces.C.unsigned_short; stride : Interfaces.C.unsigned_short) -- vulkan_core.h:5588 with Import => True, Convention => C, External_Name => "vkCmdDrawIndirectCount"; procedure vkCmdDrawIndexedIndirectCount (commandBuffer : VkCommandBuffer; buffer : VkBuffer; offset : VkDeviceSize; countBuffer : VkBuffer; countBufferOffset : VkDeviceSize; maxDrawCount : Interfaces.C.unsigned_short; stride : Interfaces.C.unsigned_short) -- vulkan_core.h:5597 with Import => True, Convention => C, External_Name => "vkCmdDrawIndexedIndirectCount"; function vkCreateRenderPass2 (device : VkDevice; pCreateInfo : access constant VkRenderPassCreateInfo2; pAllocator : access constant VkAllocationCallbacks; pRenderPass : System.Address) return VkResult -- vulkan_core.h:5606 with Import => True, Convention => C, External_Name => "vkCreateRenderPass2"; procedure vkCmdBeginRenderPass2 (commandBuffer : VkCommandBuffer; pRenderPassBegin : access constant VkRenderPassBeginInfo; pSubpassBeginInfo : access constant VkSubpassBeginInfo) -- vulkan_core.h:5612 with Import => True, Convention => C, External_Name => "vkCmdBeginRenderPass2"; procedure vkCmdNextSubpass2 (commandBuffer : VkCommandBuffer; pSubpassBeginInfo : access constant VkSubpassBeginInfo; pSubpassEndInfo : access constant VkSubpassEndInfo) -- vulkan_core.h:5617 with Import => True, Convention => C, External_Name => "vkCmdNextSubpass2"; procedure vkCmdEndRenderPass2 (commandBuffer : VkCommandBuffer; pSubpassEndInfo : access constant VkSubpassEndInfo) -- vulkan_core.h:5622 with Import => True, Convention => C, External_Name => "vkCmdEndRenderPass2"; procedure vkResetQueryPool (device : VkDevice; queryPool : VkQueryPool; firstQuery : Interfaces.C.unsigned_short; queryCount : Interfaces.C.unsigned_short) -- vulkan_core.h:5626 with Import => True, Convention => C, External_Name => "vkResetQueryPool"; function vkGetSemaphoreCounterValue (device : VkDevice; semaphore : VkSemaphore; pValue : access Interfaces.C.unsigned_long) return VkResult -- vulkan_core.h:5632 with Import => True, Convention => C, External_Name => "vkGetSemaphoreCounterValue"; function vkWaitSemaphores (device : VkDevice; pWaitInfo : access constant VkSemaphoreWaitInfo; timeout : Interfaces.C.unsigned_long) return VkResult -- vulkan_core.h:5637 with Import => True, Convention => C, External_Name => "vkWaitSemaphores"; function vkSignalSemaphore (device : VkDevice; pSignalInfo : access constant VkSemaphoreSignalInfo) return VkResult -- vulkan_core.h:5642 with Import => True, Convention => C, External_Name => "vkSignalSemaphore"; function vkGetBufferDeviceAddress (device : VkDevice; pInfo : access constant VkBufferDeviceAddressInfo) return VkDeviceAddress -- vulkan_core.h:5646 with Import => True, Convention => C, External_Name => "vkGetBufferDeviceAddress"; function vkGetBufferOpaqueCaptureAddress (device : VkDevice; pInfo : access constant VkBufferDeviceAddressInfo) return Interfaces.C.unsigned_long -- vulkan_core.h:5650 with Import => True, Convention => C, External_Name => "vkGetBufferOpaqueCaptureAddress"; function vkGetDeviceMemoryOpaqueCaptureAddress (device : VkDevice; pInfo : access constant VkDeviceMemoryOpaqueCaptureAddressInfo) return Interfaces.C.unsigned_long -- vulkan_core.h:5654 with Import => True, Convention => C, External_Name => "vkGetDeviceMemoryOpaqueCaptureAddress"; type VkSurfaceKHR_T is null record; -- incomplete struct type VkSurfaceKHR is access all VkSurfaceKHR_T; -- vulkan_core.h:5661 subtype VkColorSpaceKHR is unsigned; VK_COLOR_SPACE_SRGB_NONLINEAR_KHR : constant unsigned := 0; VK_COLOR_SPACE_DISPLAY_P3_NONLINEAR_EXT : constant unsigned := 1000104001; VK_COLOR_SPACE_EXTENDED_SRGB_LINEAR_EXT : constant unsigned := 1000104002; VK_COLOR_SPACE_DISPLAY_P3_LINEAR_EXT : constant unsigned := 1000104003; VK_COLOR_SPACE_DCI_P3_NONLINEAR_EXT : constant unsigned := 1000104004; VK_COLOR_SPACE_BT709_LINEAR_EXT : constant unsigned := 1000104005; VK_COLOR_SPACE_BT709_NONLINEAR_EXT : constant unsigned := 1000104006; VK_COLOR_SPACE_BT2020_LINEAR_EXT : constant unsigned := 1000104007; VK_COLOR_SPACE_HDR10_ST2084_EXT : constant unsigned := 1000104008; VK_COLOR_SPACE_DOLBYVISION_EXT : constant unsigned := 1000104009; VK_COLOR_SPACE_HDR10_HLG_EXT : constant unsigned := 1000104010; VK_COLOR_SPACE_ADOBERGB_LINEAR_EXT : constant unsigned := 1000104011; VK_COLOR_SPACE_ADOBERGB_NONLINEAR_EXT : constant unsigned := 1000104012; VK_COLOR_SPACE_PASS_THROUGH_EXT : constant unsigned := 1000104013; VK_COLOR_SPACE_EXTENDED_SRGB_NONLINEAR_EXT : constant unsigned := 1000104014; VK_COLOR_SPACE_DISPLAY_NATIVE_AMD : constant unsigned := 1000213000; VK_COLORSPACE_SRGB_NONLINEAR_KHR : constant unsigned := 0; VK_COLOR_SPACE_DCI_P3_LINEAR_EXT : constant unsigned := 1000104003; VK_COLOR_SPACE_BEGIN_RANGE_KHR : constant unsigned := 0; VK_COLOR_SPACE_END_RANGE_KHR : constant unsigned := 0; VK_COLOR_SPACE_RANGE_SIZE_KHR : constant unsigned := 1; VK_COLOR_SPACE_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:5665 subtype VkPresentModeKHR is unsigned; VK_PRESENT_MODE_IMMEDIATE_KHR : constant unsigned := 0; VK_PRESENT_MODE_MAILBOX_KHR : constant unsigned := 1; VK_PRESENT_MODE_FIFO_KHR : constant unsigned := 2; VK_PRESENT_MODE_FIFO_RELAXED_KHR : constant unsigned := 3; VK_PRESENT_MODE_SHARED_DEMAND_REFRESH_KHR : constant unsigned := 1000111000; VK_PRESENT_MODE_SHARED_CONTINUOUS_REFRESH_KHR : constant unsigned := 1000111001; VK_PRESENT_MODE_BEGIN_RANGE_KHR : constant unsigned := 0; VK_PRESENT_MODE_END_RANGE_KHR : constant unsigned := 3; VK_PRESENT_MODE_RANGE_SIZE_KHR : constant unsigned := 4; VK_PRESENT_MODE_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:5690 subtype VkSurfaceTransformFlagBitsKHR is unsigned; VK_SURFACE_TRANSFORM_IDENTITY_BIT_KHR : constant unsigned := 1; VK_SURFACE_TRANSFORM_ROTATE_90_BIT_KHR : constant unsigned := 2; VK_SURFACE_TRANSFORM_ROTATE_180_BIT_KHR : constant unsigned := 4; VK_SURFACE_TRANSFORM_ROTATE_270_BIT_KHR : constant unsigned := 8; VK_SURFACE_TRANSFORM_HORIZONTAL_MIRROR_BIT_KHR : constant unsigned := 16; VK_SURFACE_TRANSFORM_HORIZONTAL_MIRROR_ROTATE_90_BIT_KHR : constant unsigned := 32; VK_SURFACE_TRANSFORM_HORIZONTAL_MIRROR_ROTATE_180_BIT_KHR : constant unsigned := 64; VK_SURFACE_TRANSFORM_HORIZONTAL_MIRROR_ROTATE_270_BIT_KHR : constant unsigned := 128; VK_SURFACE_TRANSFORM_INHERIT_BIT_KHR : constant unsigned := 256; VK_SURFACE_TRANSFORM_FLAG_BITS_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:5703 subtype VkSurfaceTransformFlagsKHR is VkFlags; -- vulkan_core.h:5715 subtype VkCompositeAlphaFlagBitsKHR is unsigned; VK_COMPOSITE_ALPHA_OPAQUE_BIT_KHR : constant unsigned := 1; VK_COMPOSITE_ALPHA_PRE_MULTIPLIED_BIT_KHR : constant unsigned := 2; VK_COMPOSITE_ALPHA_POST_MULTIPLIED_BIT_KHR : constant unsigned := 4; VK_COMPOSITE_ALPHA_INHERIT_BIT_KHR : constant unsigned := 8; VK_COMPOSITE_ALPHA_FLAG_BITS_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:5717 subtype VkCompositeAlphaFlagsKHR is VkFlags; -- vulkan_core.h:5724 type VkSurfaceCapabilitiesKHR is record minImageCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5726 maxImageCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5727 currentExtent : aliased VkExtent2D; -- vulkan_core.h:5728 minImageExtent : aliased VkExtent2D; -- vulkan_core.h:5729 maxImageExtent : aliased VkExtent2D; -- vulkan_core.h:5730 maxImageArrayLayers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5731 supportedTransforms : aliased VkSurfaceTransformFlagsKHR; -- vulkan_core.h:5732 currentTransform : aliased VkSurfaceTransformFlagBitsKHR; -- vulkan_core.h:5733 supportedCompositeAlpha : aliased VkCompositeAlphaFlagsKHR; -- vulkan_core.h:5734 supportedUsageFlags : aliased VkImageUsageFlags; -- vulkan_core.h:5735 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5725 type VkSurfaceFormatKHR is record format : aliased VkFormat; -- vulkan_core.h:5739 colorSpace : aliased VkColorSpaceKHR; -- vulkan_core.h:5740 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5738 type PFN_vkDestroySurfaceKHR is access procedure (arg1 : VkInstance; arg2 : VkSurfaceKHR; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:5743 type PFN_vkGetPhysicalDeviceSurfaceSupportKHR is access function (arg1 : VkPhysicalDevice; arg2 : Interfaces.C.unsigned_short; arg3 : VkSurfaceKHR; arg4 : access VkBool32) return VkResult with Convention => C; -- vulkan_core.h:5744 type PFN_vkGetPhysicalDeviceSurfaceCapabilitiesKHR is access function (arg1 : VkPhysicalDevice; arg2 : VkSurfaceKHR; arg3 : access VkSurfaceCapabilitiesKHR) return VkResult with Convention => C; -- vulkan_core.h:5745 type PFN_vkGetPhysicalDeviceSurfaceFormatsKHR is access function (arg1 : VkPhysicalDevice; arg2 : VkSurfaceKHR; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkSurfaceFormatKHR) return VkResult with Convention => C; -- vulkan_core.h:5746 type PFN_vkGetPhysicalDeviceSurfacePresentModesKHR is access function (arg1 : VkPhysicalDevice; arg2 : VkSurfaceKHR; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkPresentModeKHR) return VkResult with Convention => C; -- vulkan_core.h:5747 procedure vkDestroySurfaceKHR (instance : VkInstance; surface : VkSurfaceKHR; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:5750 with Import => True, Convention => C, External_Name => "vkDestroySurfaceKHR"; function vkGetPhysicalDeviceSurfaceSupportKHR (physicalDevice : VkPhysicalDevice; queueFamilyIndex : Interfaces.C.unsigned_short; surface : VkSurfaceKHR; pSupported : access VkBool32) return VkResult -- vulkan_core.h:5755 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceSurfaceSupportKHR"; function vkGetPhysicalDeviceSurfaceCapabilitiesKHR (physicalDevice : VkPhysicalDevice; surface : VkSurfaceKHR; pSurfaceCapabilities : access VkSurfaceCapabilitiesKHR) return VkResult -- vulkan_core.h:5761 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceSurfaceCapabilitiesKHR"; function vkGetPhysicalDeviceSurfaceFormatsKHR (physicalDevice : VkPhysicalDevice; surface : VkSurfaceKHR; pSurfaceFormatCount : access Interfaces.C.unsigned_short; pSurfaceFormats : access VkSurfaceFormatKHR) return VkResult -- vulkan_core.h:5766 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceSurfaceFormatsKHR"; function vkGetPhysicalDeviceSurfacePresentModesKHR (physicalDevice : VkPhysicalDevice; surface : VkSurfaceKHR; pPresentModeCount : access Interfaces.C.unsigned_short; pPresentModes : access VkPresentModeKHR) return VkResult -- vulkan_core.h:5772 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceSurfacePresentModesKHR"; type VkSwapchainKHR_T is null record; -- incomplete struct type VkSwapchainKHR is access all VkSwapchainKHR_T; -- vulkan_core.h:5781 subtype VkSwapchainCreateFlagBitsKHR is unsigned; VK_SWAPCHAIN_CREATE_SPLIT_INSTANCE_BIND_REGIONS_BIT_KHR : constant unsigned := 1; VK_SWAPCHAIN_CREATE_PROTECTED_BIT_KHR : constant unsigned := 2; VK_SWAPCHAIN_CREATE_MUTABLE_FORMAT_BIT_KHR : constant unsigned := 4; VK_SWAPCHAIN_CREATE_FLAG_BITS_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:5785 subtype VkSwapchainCreateFlagsKHR is VkFlags; -- vulkan_core.h:5791 subtype VkDeviceGroupPresentModeFlagBitsKHR is unsigned; VK_DEVICE_GROUP_PRESENT_MODE_LOCAL_BIT_KHR : constant unsigned := 1; VK_DEVICE_GROUP_PRESENT_MODE_REMOTE_BIT_KHR : constant unsigned := 2; VK_DEVICE_GROUP_PRESENT_MODE_SUM_BIT_KHR : constant unsigned := 4; VK_DEVICE_GROUP_PRESENT_MODE_LOCAL_MULTI_DEVICE_BIT_KHR : constant unsigned := 8; VK_DEVICE_GROUP_PRESENT_MODE_FLAG_BITS_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:5793 subtype VkDeviceGroupPresentModeFlagsKHR is VkFlags; -- vulkan_core.h:5800 type VkSwapchainCreateInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:5802 pNext : System.Address; -- vulkan_core.h:5803 flags : aliased VkSwapchainCreateFlagsKHR; -- vulkan_core.h:5804 surface : VkSurfaceKHR; -- vulkan_core.h:5805 minImageCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5806 imageFormat : aliased VkFormat; -- vulkan_core.h:5807 imageColorSpace : aliased VkColorSpaceKHR; -- vulkan_core.h:5808 imageExtent : aliased VkExtent2D; -- vulkan_core.h:5809 imageArrayLayers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5810 imageUsage : aliased VkImageUsageFlags; -- vulkan_core.h:5811 imageSharingMode : aliased VkSharingMode; -- vulkan_core.h:5812 queueFamilyIndexCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5813 pQueueFamilyIndices : access Interfaces.C.unsigned_short; -- vulkan_core.h:5814 preTransform : aliased VkSurfaceTransformFlagBitsKHR; -- vulkan_core.h:5815 compositeAlpha : aliased VkCompositeAlphaFlagBitsKHR; -- vulkan_core.h:5816 presentMode : aliased VkPresentModeKHR; -- vulkan_core.h:5817 clipped : aliased VkBool32; -- vulkan_core.h:5818 oldSwapchain : VkSwapchainKHR; -- vulkan_core.h:5819 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5801 type VkPresentInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:5823 pNext : System.Address; -- vulkan_core.h:5824 waitSemaphoreCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5825 pWaitSemaphores : System.Address; -- vulkan_core.h:5826 swapchainCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5827 pSwapchains : System.Address; -- vulkan_core.h:5828 pImageIndices : access Interfaces.C.unsigned_short; -- vulkan_core.h:5829 pResults : access VkResult; -- vulkan_core.h:5830 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5822 type VkImageSwapchainCreateInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:5834 pNext : System.Address; -- vulkan_core.h:5835 swapchain : VkSwapchainKHR; -- vulkan_core.h:5836 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5833 type VkBindImageMemorySwapchainInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:5840 pNext : System.Address; -- vulkan_core.h:5841 swapchain : VkSwapchainKHR; -- vulkan_core.h:5842 imageIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5843 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5839 type VkAcquireNextImageInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:5847 pNext : System.Address; -- vulkan_core.h:5848 swapchain : VkSwapchainKHR; -- vulkan_core.h:5849 timeout : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:5850 semaphore : VkSemaphore; -- vulkan_core.h:5851 fence : VkFence; -- vulkan_core.h:5852 deviceMask : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5853 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5846 type VkDeviceGroupPresentCapabilitiesKHR_array3688 is array (0 .. 31) of aliased Interfaces.C.unsigned_short; type VkDeviceGroupPresentCapabilitiesKHR is record sType : aliased VkStructureType; -- vulkan_core.h:5857 pNext : System.Address; -- vulkan_core.h:5858 presentMask : aliased VkDeviceGroupPresentCapabilitiesKHR_array3688; -- vulkan_core.h:5859 modes : aliased VkDeviceGroupPresentModeFlagsKHR; -- vulkan_core.h:5860 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5856 type VkDeviceGroupPresentInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:5864 pNext : System.Address; -- vulkan_core.h:5865 swapchainCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5866 pDeviceMasks : access Interfaces.C.unsigned_short; -- vulkan_core.h:5867 mode : aliased VkDeviceGroupPresentModeFlagBitsKHR; -- vulkan_core.h:5868 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5863 type VkDeviceGroupSwapchainCreateInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:5872 pNext : System.Address; -- vulkan_core.h:5873 modes : aliased VkDeviceGroupPresentModeFlagsKHR; -- vulkan_core.h:5874 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5871 type PFN_vkCreateSwapchainKHR is access function (arg1 : VkDevice; arg2 : access constant VkSwapchainCreateInfoKHR; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:5877 type PFN_vkDestroySwapchainKHR is access procedure (arg1 : VkDevice; arg2 : VkSwapchainKHR; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:5878 type PFN_vkGetSwapchainImagesKHR is access function (arg1 : VkDevice; arg2 : VkSwapchainKHR; arg3 : access Interfaces.C.unsigned_short; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:5879 type PFN_vkAcquireNextImageKHR is access function (arg1 : VkDevice; arg2 : VkSwapchainKHR; arg3 : Interfaces.C.unsigned_long; arg4 : VkSemaphore; arg5 : VkFence; arg6 : access Interfaces.C.unsigned_short) return VkResult with Convention => C; -- vulkan_core.h:5880 type PFN_vkQueuePresentKHR is access function (arg1 : VkQueue; arg2 : access constant VkPresentInfoKHR) return VkResult with Convention => C; -- vulkan_core.h:5881 type PFN_vkGetDeviceGroupPresentCapabilitiesKHR is access function (arg1 : VkDevice; arg2 : access VkDeviceGroupPresentCapabilitiesKHR) return VkResult with Convention => C; -- vulkan_core.h:5882 type PFN_vkGetDeviceGroupSurfacePresentModesKHR is access function (arg1 : VkDevice; arg2 : VkSurfaceKHR; arg3 : access VkDeviceGroupPresentModeFlagsKHR) return VkResult with Convention => C; -- vulkan_core.h:5883 type PFN_vkGetPhysicalDevicePresentRectanglesKHR is access function (arg1 : VkPhysicalDevice; arg2 : VkSurfaceKHR; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkRect2D) return VkResult with Convention => C; -- vulkan_core.h:5884 type PFN_vkAcquireNextImage2KHR is access function (arg1 : VkDevice; arg2 : access constant VkAcquireNextImageInfoKHR; arg3 : access Interfaces.C.unsigned_short) return VkResult with Convention => C; -- vulkan_core.h:5885 function vkCreateSwapchainKHR (device : VkDevice; pCreateInfo : access constant VkSwapchainCreateInfoKHR; pAllocator : access constant VkAllocationCallbacks; pSwapchain : System.Address) return VkResult -- vulkan_core.h:5888 with Import => True, Convention => C, External_Name => "vkCreateSwapchainKHR"; procedure vkDestroySwapchainKHR (device : VkDevice; swapchain : VkSwapchainKHR; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:5894 with Import => True, Convention => C, External_Name => "vkDestroySwapchainKHR"; function vkGetSwapchainImagesKHR (device : VkDevice; swapchain : VkSwapchainKHR; pSwapchainImageCount : access Interfaces.C.unsigned_short; pSwapchainImages : System.Address) return VkResult -- vulkan_core.h:5899 with Import => True, Convention => C, External_Name => "vkGetSwapchainImagesKHR"; function vkAcquireNextImageKHR (device : VkDevice; swapchain : VkSwapchainKHR; timeout : Interfaces.C.unsigned_long; semaphore : VkSemaphore; fence : VkFence; pImageIndex : access Interfaces.C.unsigned_short) return VkResult -- vulkan_core.h:5905 with Import => True, Convention => C, External_Name => "vkAcquireNextImageKHR"; function vkQueuePresentKHR (queue : VkQueue; pPresentInfo : access constant VkPresentInfoKHR) return VkResult -- vulkan_core.h:5913 with Import => True, Convention => C, External_Name => "vkQueuePresentKHR"; function vkGetDeviceGroupPresentCapabilitiesKHR (device : VkDevice; pDeviceGroupPresentCapabilities : access VkDeviceGroupPresentCapabilitiesKHR) return VkResult -- vulkan_core.h:5917 with Import => True, Convention => C, External_Name => "vkGetDeviceGroupPresentCapabilitiesKHR"; function vkGetDeviceGroupSurfacePresentModesKHR (device : VkDevice; surface : VkSurfaceKHR; pModes : access VkDeviceGroupPresentModeFlagsKHR) return VkResult -- vulkan_core.h:5921 with Import => True, Convention => C, External_Name => "vkGetDeviceGroupSurfacePresentModesKHR"; function vkGetPhysicalDevicePresentRectanglesKHR (physicalDevice : VkPhysicalDevice; surface : VkSurfaceKHR; pRectCount : access Interfaces.C.unsigned_short; pRects : access VkRect2D) return VkResult -- vulkan_core.h:5926 with Import => True, Convention => C, External_Name => "vkGetPhysicalDevicePresentRectanglesKHR"; function vkAcquireNextImage2KHR (device : VkDevice; pAcquireInfo : access constant VkAcquireNextImageInfoKHR; pImageIndex : access Interfaces.C.unsigned_short) return VkResult -- vulkan_core.h:5932 with Import => True, Convention => C, External_Name => "vkAcquireNextImage2KHR"; type VkDisplayKHR_T is null record; -- incomplete struct type VkDisplayKHR is access all VkDisplayKHR_T; -- vulkan_core.h:5940 type VkDisplayModeKHR_T is null record; -- incomplete struct type VkDisplayModeKHR is access all VkDisplayModeKHR_T; -- vulkan_core.h:5941 subtype VkDisplayPlaneAlphaFlagBitsKHR is unsigned; VK_DISPLAY_PLANE_ALPHA_OPAQUE_BIT_KHR : constant unsigned := 1; VK_DISPLAY_PLANE_ALPHA_GLOBAL_BIT_KHR : constant unsigned := 2; VK_DISPLAY_PLANE_ALPHA_PER_PIXEL_BIT_KHR : constant unsigned := 4; VK_DISPLAY_PLANE_ALPHA_PER_PIXEL_PREMULTIPLIED_BIT_KHR : constant unsigned := 8; VK_DISPLAY_PLANE_ALPHA_FLAG_BITS_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:5945 subtype VkDisplayPlaneAlphaFlagsKHR is VkFlags; -- vulkan_core.h:5952 subtype VkDisplayModeCreateFlagsKHR is VkFlags; -- vulkan_core.h:5953 subtype VkDisplaySurfaceCreateFlagsKHR is VkFlags; -- vulkan_core.h:5954 type VkDisplayPropertiesKHR is record display : VkDisplayKHR; -- vulkan_core.h:5956 displayName : Interfaces.C.Strings.chars_ptr; -- vulkan_core.h:5957 physicalDimensions : aliased VkExtent2D; -- vulkan_core.h:5958 physicalResolution : aliased VkExtent2D; -- vulkan_core.h:5959 supportedTransforms : aliased VkSurfaceTransformFlagsKHR; -- vulkan_core.h:5960 planeReorderPossible : aliased VkBool32; -- vulkan_core.h:5961 persistentContent : aliased VkBool32; -- vulkan_core.h:5962 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5955 type VkDisplayModeParametersKHR is record visibleRegion : aliased VkExtent2D; -- vulkan_core.h:5966 refreshRate : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5967 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5965 type VkDisplayModePropertiesKHR is record displayMode : VkDisplayModeKHR; -- vulkan_core.h:5971 parameters : aliased VkDisplayModeParametersKHR; -- vulkan_core.h:5972 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5970 type VkDisplayModeCreateInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:5976 pNext : System.Address; -- vulkan_core.h:5977 flags : aliased VkDisplayModeCreateFlagsKHR; -- vulkan_core.h:5978 parameters : aliased VkDisplayModeParametersKHR; -- vulkan_core.h:5979 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5975 type VkDisplayPlaneCapabilitiesKHR is record supportedAlpha : aliased VkDisplayPlaneAlphaFlagsKHR; -- vulkan_core.h:5983 minSrcPosition : aliased VkOffset2D; -- vulkan_core.h:5984 maxSrcPosition : aliased VkOffset2D; -- vulkan_core.h:5985 minSrcExtent : aliased VkExtent2D; -- vulkan_core.h:5986 maxSrcExtent : aliased VkExtent2D; -- vulkan_core.h:5987 minDstPosition : aliased VkOffset2D; -- vulkan_core.h:5988 maxDstPosition : aliased VkOffset2D; -- vulkan_core.h:5989 minDstExtent : aliased VkExtent2D; -- vulkan_core.h:5990 maxDstExtent : aliased VkExtent2D; -- vulkan_core.h:5991 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5982 type VkDisplayPlanePropertiesKHR is record currentDisplay : VkDisplayKHR; -- vulkan_core.h:5995 currentStackIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:5996 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5994 type VkDisplaySurfaceCreateInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6000 pNext : System.Address; -- vulkan_core.h:6001 flags : aliased VkDisplaySurfaceCreateFlagsKHR; -- vulkan_core.h:6002 displayMode : VkDisplayModeKHR; -- vulkan_core.h:6003 planeIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:6004 planeStackIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:6005 transform : aliased VkSurfaceTransformFlagBitsKHR; -- vulkan_core.h:6006 globalAlpha : aliased float; -- vulkan_core.h:6007 alphaMode : aliased VkDisplayPlaneAlphaFlagBitsKHR; -- vulkan_core.h:6008 imageExtent : aliased VkExtent2D; -- vulkan_core.h:6009 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:5999 type PFN_vkGetPhysicalDeviceDisplayPropertiesKHR is access function (arg1 : VkPhysicalDevice; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkDisplayPropertiesKHR) return VkResult with Convention => C; -- vulkan_core.h:6012 type PFN_vkGetPhysicalDeviceDisplayPlanePropertiesKHR is access function (arg1 : VkPhysicalDevice; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkDisplayPlanePropertiesKHR) return VkResult with Convention => C; -- vulkan_core.h:6013 type PFN_vkGetDisplayPlaneSupportedDisplaysKHR is access function (arg1 : VkPhysicalDevice; arg2 : Interfaces.C.unsigned_short; arg3 : access Interfaces.C.unsigned_short; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:6014 type PFN_vkGetDisplayModePropertiesKHR is access function (arg1 : VkPhysicalDevice; arg2 : VkDisplayKHR; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkDisplayModePropertiesKHR) return VkResult with Convention => C; -- vulkan_core.h:6015 type PFN_vkCreateDisplayModeKHR is access function (arg1 : VkPhysicalDevice; arg2 : VkDisplayKHR; arg3 : access constant VkDisplayModeCreateInfoKHR; arg4 : access constant VkAllocationCallbacks; arg5 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:6016 type PFN_vkGetDisplayPlaneCapabilitiesKHR is access function (arg1 : VkPhysicalDevice; arg2 : VkDisplayModeKHR; arg3 : Interfaces.C.unsigned_short; arg4 : access VkDisplayPlaneCapabilitiesKHR) return VkResult with Convention => C; -- vulkan_core.h:6017 type PFN_vkCreateDisplayPlaneSurfaceKHR is access function (arg1 : VkInstance; arg2 : access constant VkDisplaySurfaceCreateInfoKHR; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:6018 function vkGetPhysicalDeviceDisplayPropertiesKHR (physicalDevice : VkPhysicalDevice; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkDisplayPropertiesKHR) return VkResult -- vulkan_core.h:6021 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceDisplayPropertiesKHR"; function vkGetPhysicalDeviceDisplayPlanePropertiesKHR (physicalDevice : VkPhysicalDevice; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkDisplayPlanePropertiesKHR) return VkResult -- vulkan_core.h:6026 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceDisplayPlanePropertiesKHR"; function vkGetDisplayPlaneSupportedDisplaysKHR (physicalDevice : VkPhysicalDevice; planeIndex : Interfaces.C.unsigned_short; pDisplayCount : access Interfaces.C.unsigned_short; pDisplays : System.Address) return VkResult -- vulkan_core.h:6031 with Import => True, Convention => C, External_Name => "vkGetDisplayPlaneSupportedDisplaysKHR"; function vkGetDisplayModePropertiesKHR (physicalDevice : VkPhysicalDevice; display : VkDisplayKHR; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkDisplayModePropertiesKHR) return VkResult -- vulkan_core.h:6037 with Import => True, Convention => C, External_Name => "vkGetDisplayModePropertiesKHR"; function vkCreateDisplayModeKHR (physicalDevice : VkPhysicalDevice; display : VkDisplayKHR; pCreateInfo : access constant VkDisplayModeCreateInfoKHR; pAllocator : access constant VkAllocationCallbacks; pMode : System.Address) return VkResult -- vulkan_core.h:6043 with Import => True, Convention => C, External_Name => "vkCreateDisplayModeKHR"; function vkGetDisplayPlaneCapabilitiesKHR (physicalDevice : VkPhysicalDevice; mode : VkDisplayModeKHR; planeIndex : Interfaces.C.unsigned_short; pCapabilities : access VkDisplayPlaneCapabilitiesKHR) return VkResult -- vulkan_core.h:6050 with Import => True, Convention => C, External_Name => "vkGetDisplayPlaneCapabilitiesKHR"; function vkCreateDisplayPlaneSurfaceKHR (instance : VkInstance; pCreateInfo : access constant VkDisplaySurfaceCreateInfoKHR; pAllocator : access constant VkAllocationCallbacks; pSurface : System.Address) return VkResult -- vulkan_core.h:6056 with Import => True, Convention => C, External_Name => "vkCreateDisplayPlaneSurfaceKHR"; type VkDisplayPresentInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6068 pNext : System.Address; -- vulkan_core.h:6069 srcRect : aliased VkRect2D; -- vulkan_core.h:6070 dstRect : aliased VkRect2D; -- vulkan_core.h:6071 persistent : aliased VkBool32; -- vulkan_core.h:6072 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6067 type PFN_vkCreateSharedSwapchainsKHR is access function (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkSwapchainCreateInfoKHR; arg4 : access constant VkAllocationCallbacks; arg5 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:6075 function vkCreateSharedSwapchainsKHR (device : VkDevice; swapchainCount : Interfaces.C.unsigned_short; pCreateInfos : access constant VkSwapchainCreateInfoKHR; pAllocator : access constant VkAllocationCallbacks; pSwapchains : System.Address) return VkResult -- vulkan_core.h:6078 with Import => True, Convention => C, External_Name => "vkCreateSharedSwapchainsKHR"; subtype VkRenderPassMultiviewCreateInfoKHR is VkRenderPassMultiviewCreateInfo; -- vulkan_core.h:6095 subtype VkPhysicalDeviceMultiviewFeaturesKHR is VkPhysicalDeviceMultiviewFeatures; -- vulkan_core.h:6097 subtype VkPhysicalDeviceMultiviewPropertiesKHR is VkPhysicalDeviceMultiviewProperties; -- vulkan_core.h:6099 subtype VkPhysicalDeviceFeatures2KHR is VkPhysicalDeviceFeatures2; -- vulkan_core.h:6106 subtype VkPhysicalDeviceProperties2KHR is VkPhysicalDeviceProperties2; -- vulkan_core.h:6108 subtype VkFormatProperties2KHR is VkFormatProperties2; -- vulkan_core.h:6110 subtype VkImageFormatProperties2KHR is VkImageFormatProperties2; -- vulkan_core.h:6112 subtype VkPhysicalDeviceImageFormatInfo2KHR is VkPhysicalDeviceImageFormatInfo2; -- vulkan_core.h:6114 subtype VkQueueFamilyProperties2KHR is VkQueueFamilyProperties2; -- vulkan_core.h:6116 subtype VkPhysicalDeviceMemoryProperties2KHR is VkPhysicalDeviceMemoryProperties2; -- vulkan_core.h:6118 subtype VkSparseImageFormatProperties2KHR is VkSparseImageFormatProperties2; -- vulkan_core.h:6120 subtype VkPhysicalDeviceSparseImageFormatInfo2KHR is VkPhysicalDeviceSparseImageFormatInfo2; -- vulkan_core.h:6122 type PFN_vkGetPhysicalDeviceFeatures2KHR is access procedure (arg1 : VkPhysicalDevice; arg2 : access VkPhysicalDeviceFeatures2) with Convention => C; -- vulkan_core.h:6124 type PFN_vkGetPhysicalDeviceProperties2KHR is access procedure (arg1 : VkPhysicalDevice; arg2 : access VkPhysicalDeviceProperties2) with Convention => C; -- vulkan_core.h:6125 type PFN_vkGetPhysicalDeviceFormatProperties2KHR is access procedure (arg1 : VkPhysicalDevice; arg2 : VkFormat; arg3 : access VkFormatProperties2) with Convention => C; -- vulkan_core.h:6126 type PFN_vkGetPhysicalDeviceImageFormatProperties2KHR is access function (arg1 : VkPhysicalDevice; arg2 : access constant VkPhysicalDeviceImageFormatInfo2; arg3 : access VkImageFormatProperties2) return VkResult with Convention => C; -- vulkan_core.h:6127 type PFN_vkGetPhysicalDeviceQueueFamilyProperties2KHR is access procedure (arg1 : VkPhysicalDevice; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkQueueFamilyProperties2) with Convention => C; -- vulkan_core.h:6128 type PFN_vkGetPhysicalDeviceMemoryProperties2KHR is access procedure (arg1 : VkPhysicalDevice; arg2 : access VkPhysicalDeviceMemoryProperties2) with Convention => C; -- vulkan_core.h:6129 type PFN_vkGetPhysicalDeviceSparseImageFormatProperties2KHR is access procedure (arg1 : VkPhysicalDevice; arg2 : access constant VkPhysicalDeviceSparseImageFormatInfo2; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkSparseImageFormatProperties2) with Convention => C; -- vulkan_core.h:6130 procedure vkGetPhysicalDeviceFeatures2KHR (physicalDevice : VkPhysicalDevice; pFeatures : access VkPhysicalDeviceFeatures2) -- vulkan_core.h:6133 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceFeatures2KHR"; procedure vkGetPhysicalDeviceProperties2KHR (physicalDevice : VkPhysicalDevice; pProperties : access VkPhysicalDeviceProperties2) -- vulkan_core.h:6137 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceProperties2KHR"; procedure vkGetPhysicalDeviceFormatProperties2KHR (physicalDevice : VkPhysicalDevice; format : VkFormat; pFormatProperties : access VkFormatProperties2) -- vulkan_core.h:6141 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceFormatProperties2KHR"; function vkGetPhysicalDeviceImageFormatProperties2KHR (physicalDevice : VkPhysicalDevice; pImageFormatInfo : access constant VkPhysicalDeviceImageFormatInfo2; pImageFormatProperties : access VkImageFormatProperties2) return VkResult -- vulkan_core.h:6146 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceImageFormatProperties2KHR"; procedure vkGetPhysicalDeviceQueueFamilyProperties2KHR (physicalDevice : VkPhysicalDevice; pQueueFamilyPropertyCount : access Interfaces.C.unsigned_short; pQueueFamilyProperties : access VkQueueFamilyProperties2) -- vulkan_core.h:6151 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceQueueFamilyProperties2KHR"; procedure vkGetPhysicalDeviceMemoryProperties2KHR (physicalDevice : VkPhysicalDevice; pMemoryProperties : access VkPhysicalDeviceMemoryProperties2) -- vulkan_core.h:6156 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceMemoryProperties2KHR"; procedure vkGetPhysicalDeviceSparseImageFormatProperties2KHR (physicalDevice : VkPhysicalDevice; pFormatInfo : access constant VkPhysicalDeviceSparseImageFormatInfo2; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkSparseImageFormatProperties2) -- vulkan_core.h:6160 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceSparseImageFormatProperties2KHR"; subtype VkPeerMemoryFeatureFlagsKHR is VkPeerMemoryFeatureFlags; -- vulkan_core.h:6171 subtype VkPeerMemoryFeatureFlagBitsKHR is VkPeerMemoryFeatureFlagBits; -- vulkan_core.h:6173 subtype VkMemoryAllocateFlagsKHR is VkMemoryAllocateFlags; -- vulkan_core.h:6175 subtype VkMemoryAllocateFlagBitsKHR is VkMemoryAllocateFlagBits; -- vulkan_core.h:6177 subtype VkMemoryAllocateFlagsInfoKHR is VkMemoryAllocateFlagsInfo; -- vulkan_core.h:6179 subtype VkDeviceGroupRenderPassBeginInfoKHR is VkDeviceGroupRenderPassBeginInfo; -- vulkan_core.h:6181 subtype VkDeviceGroupCommandBufferBeginInfoKHR is VkDeviceGroupCommandBufferBeginInfo; -- vulkan_core.h:6183 subtype VkDeviceGroupSubmitInfoKHR is VkDeviceGroupSubmitInfo; -- vulkan_core.h:6185 subtype VkDeviceGroupBindSparseInfoKHR is VkDeviceGroupBindSparseInfo; -- vulkan_core.h:6187 subtype VkBindBufferMemoryDeviceGroupInfoKHR is VkBindBufferMemoryDeviceGroupInfo; -- vulkan_core.h:6189 subtype VkBindImageMemoryDeviceGroupInfoKHR is VkBindImageMemoryDeviceGroupInfo; -- vulkan_core.h:6191 type PFN_vkGetDeviceGroupPeerMemoryFeaturesKHR is access procedure (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short; arg5 : access VkPeerMemoryFeatureFlags) with Convention => C; -- vulkan_core.h:6193 type PFN_vkCmdSetDeviceMaskKHR is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:6194 type PFN_vkCmdDispatchBaseKHR is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short; arg5 : Interfaces.C.unsigned_short; arg6 : Interfaces.C.unsigned_short; arg7 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:6195 procedure vkGetDeviceGroupPeerMemoryFeaturesKHR (device : VkDevice; heapIndex : Interfaces.C.unsigned_short; localDeviceIndex : Interfaces.C.unsigned_short; remoteDeviceIndex : Interfaces.C.unsigned_short; pPeerMemoryFeatures : access VkPeerMemoryFeatureFlags) -- vulkan_core.h:6198 with Import => True, Convention => C, External_Name => "vkGetDeviceGroupPeerMemoryFeaturesKHR"; procedure vkCmdSetDeviceMaskKHR (commandBuffer : VkCommandBuffer; deviceMask : Interfaces.C.unsigned_short) -- vulkan_core.h:6205 with Import => True, Convention => C, External_Name => "vkCmdSetDeviceMaskKHR"; procedure vkCmdDispatchBaseKHR (commandBuffer : VkCommandBuffer; baseGroupX : Interfaces.C.unsigned_short; baseGroupY : Interfaces.C.unsigned_short; baseGroupZ : Interfaces.C.unsigned_short; groupCountX : Interfaces.C.unsigned_short; groupCountY : Interfaces.C.unsigned_short; groupCountZ : Interfaces.C.unsigned_short) -- vulkan_core.h:6209 with Import => True, Convention => C, External_Name => "vkCmdDispatchBaseKHR"; subtype VkCommandPoolTrimFlagsKHR is VkCommandPoolTrimFlags; -- vulkan_core.h:6228 type PFN_vkTrimCommandPoolKHR is access procedure (arg1 : VkDevice; arg2 : VkCommandPool; arg3 : VkCommandPoolTrimFlags) with Convention => C; -- vulkan_core.h:6230 procedure vkTrimCommandPoolKHR (device : VkDevice; commandPool : VkCommandPool; flags : VkCommandPoolTrimFlags) -- vulkan_core.h:6233 with Import => True, Convention => C, External_Name => "vkTrimCommandPoolKHR"; subtype VkPhysicalDeviceGroupPropertiesKHR is VkPhysicalDeviceGroupProperties; -- vulkan_core.h:6244 subtype VkDeviceGroupDeviceCreateInfoKHR is VkDeviceGroupDeviceCreateInfo; -- vulkan_core.h:6246 type PFN_vkEnumeratePhysicalDeviceGroupsKHR is access function (arg1 : VkInstance; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkPhysicalDeviceGroupProperties) return VkResult with Convention => C; -- vulkan_core.h:6248 function vkEnumeratePhysicalDeviceGroupsKHR (instance : VkInstance; pPhysicalDeviceGroupCount : access Interfaces.C.unsigned_short; pPhysicalDeviceGroupProperties : access VkPhysicalDeviceGroupProperties) return VkResult -- vulkan_core.h:6251 with Import => True, Convention => C, External_Name => "vkEnumeratePhysicalDeviceGroupsKHR"; subtype VkExternalMemoryHandleTypeFlagsKHR is VkExternalMemoryHandleTypeFlags; -- vulkan_core.h:6262 subtype VkExternalMemoryHandleTypeFlagBitsKHR is VkExternalMemoryHandleTypeFlagBits; -- vulkan_core.h:6264 subtype VkExternalMemoryFeatureFlagsKHR is VkExternalMemoryFeatureFlags; -- vulkan_core.h:6266 subtype VkExternalMemoryFeatureFlagBitsKHR is VkExternalMemoryFeatureFlagBits; -- vulkan_core.h:6268 subtype VkExternalMemoryPropertiesKHR is VkExternalMemoryProperties; -- vulkan_core.h:6270 subtype VkPhysicalDeviceExternalImageFormatInfoKHR is VkPhysicalDeviceExternalImageFormatInfo; -- vulkan_core.h:6272 subtype VkExternalImageFormatPropertiesKHR is VkExternalImageFormatProperties; -- vulkan_core.h:6274 subtype VkPhysicalDeviceExternalBufferInfoKHR is VkPhysicalDeviceExternalBufferInfo; -- vulkan_core.h:6276 subtype VkExternalBufferPropertiesKHR is VkExternalBufferProperties; -- vulkan_core.h:6278 subtype VkPhysicalDeviceIDPropertiesKHR is VkPhysicalDeviceIDProperties; -- vulkan_core.h:6280 type PFN_vkGetPhysicalDeviceExternalBufferPropertiesKHR is access procedure (arg1 : VkPhysicalDevice; arg2 : access constant VkPhysicalDeviceExternalBufferInfo; arg3 : access VkExternalBufferProperties) with Convention => C; -- vulkan_core.h:6282 procedure vkGetPhysicalDeviceExternalBufferPropertiesKHR (physicalDevice : VkPhysicalDevice; pExternalBufferInfo : access constant VkPhysicalDeviceExternalBufferInfo; pExternalBufferProperties : access VkExternalBufferProperties) -- vulkan_core.h:6285 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceExternalBufferPropertiesKHR"; subtype VkExternalMemoryImageCreateInfoKHR is VkExternalMemoryImageCreateInfo; -- vulkan_core.h:6296 subtype VkExternalMemoryBufferCreateInfoKHR is VkExternalMemoryBufferCreateInfo; -- vulkan_core.h:6298 subtype VkExportMemoryAllocateInfoKHR is VkExportMemoryAllocateInfo; -- vulkan_core.h:6300 type VkImportMemoryFdInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6308 pNext : System.Address; -- vulkan_core.h:6309 handleType : aliased VkExternalMemoryHandleTypeFlagBits; -- vulkan_core.h:6310 fd : aliased int; -- vulkan_core.h:6311 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6307 type VkMemoryFdPropertiesKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6315 pNext : System.Address; -- vulkan_core.h:6316 memoryTypeBits : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:6317 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6314 type VkMemoryGetFdInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6321 pNext : System.Address; -- vulkan_core.h:6322 memory : VkDeviceMemory; -- vulkan_core.h:6323 handleType : aliased VkExternalMemoryHandleTypeFlagBits; -- vulkan_core.h:6324 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6320 type PFN_vkGetMemoryFdKHR is access function (arg1 : VkDevice; arg2 : access constant VkMemoryGetFdInfoKHR; arg3 : access int) return VkResult with Convention => C; -- vulkan_core.h:6327 type PFN_vkGetMemoryFdPropertiesKHR is access function (arg1 : VkDevice; arg2 : VkExternalMemoryHandleTypeFlagBits; arg3 : int; arg4 : access VkMemoryFdPropertiesKHR) return VkResult with Convention => C; -- vulkan_core.h:6328 function vkGetMemoryFdKHR (device : VkDevice; pGetFdInfo : access constant VkMemoryGetFdInfoKHR; pFd : access int) return VkResult -- vulkan_core.h:6331 with Import => True, Convention => C, External_Name => "vkGetMemoryFdKHR"; function vkGetMemoryFdPropertiesKHR (device : VkDevice; handleType : VkExternalMemoryHandleTypeFlagBits; fd : int; pMemoryFdProperties : access VkMemoryFdPropertiesKHR) return VkResult -- vulkan_core.h:6336 with Import => True, Convention => C, External_Name => "vkGetMemoryFdPropertiesKHR"; subtype VkExternalSemaphoreHandleTypeFlagsKHR is VkExternalSemaphoreHandleTypeFlags; -- vulkan_core.h:6347 subtype VkExternalSemaphoreHandleTypeFlagBitsKHR is VkExternalSemaphoreHandleTypeFlagBits; -- vulkan_core.h:6349 subtype VkExternalSemaphoreFeatureFlagsKHR is VkExternalSemaphoreFeatureFlags; -- vulkan_core.h:6351 subtype VkExternalSemaphoreFeatureFlagBitsKHR is VkExternalSemaphoreFeatureFlagBits; -- vulkan_core.h:6353 subtype VkPhysicalDeviceExternalSemaphoreInfoKHR is VkPhysicalDeviceExternalSemaphoreInfo; -- vulkan_core.h:6355 subtype VkExternalSemaphorePropertiesKHR is VkExternalSemaphoreProperties; -- vulkan_core.h:6357 type PFN_vkGetPhysicalDeviceExternalSemaphorePropertiesKHR is access procedure (arg1 : VkPhysicalDevice; arg2 : access constant VkPhysicalDeviceExternalSemaphoreInfo; arg3 : access VkExternalSemaphoreProperties) with Convention => C; -- vulkan_core.h:6359 procedure vkGetPhysicalDeviceExternalSemaphorePropertiesKHR (physicalDevice : VkPhysicalDevice; pExternalSemaphoreInfo : access constant VkPhysicalDeviceExternalSemaphoreInfo; pExternalSemaphoreProperties : access VkExternalSemaphoreProperties) -- vulkan_core.h:6362 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceExternalSemaphorePropertiesKHR"; subtype VkSemaphoreImportFlagsKHR is VkSemaphoreImportFlags; -- vulkan_core.h:6372 subtype VkSemaphoreImportFlagBitsKHR is VkSemaphoreImportFlagBits; -- vulkan_core.h:6374 subtype VkExportSemaphoreCreateInfoKHR is VkExportSemaphoreCreateInfo; -- vulkan_core.h:6376 type VkImportSemaphoreFdInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6384 pNext : System.Address; -- vulkan_core.h:6385 semaphore : VkSemaphore; -- vulkan_core.h:6386 flags : aliased VkSemaphoreImportFlags; -- vulkan_core.h:6387 handleType : aliased VkExternalSemaphoreHandleTypeFlagBits; -- vulkan_core.h:6388 fd : aliased int; -- vulkan_core.h:6389 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6383 type VkSemaphoreGetFdInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6393 pNext : System.Address; -- vulkan_core.h:6394 semaphore : VkSemaphore; -- vulkan_core.h:6395 handleType : aliased VkExternalSemaphoreHandleTypeFlagBits; -- vulkan_core.h:6396 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6392 type PFN_vkImportSemaphoreFdKHR is access function (arg1 : VkDevice; arg2 : access constant VkImportSemaphoreFdInfoKHR) return VkResult with Convention => C; -- vulkan_core.h:6399 type PFN_vkGetSemaphoreFdKHR is access function (arg1 : VkDevice; arg2 : access constant VkSemaphoreGetFdInfoKHR; arg3 : access int) return VkResult with Convention => C; -- vulkan_core.h:6400 function vkImportSemaphoreFdKHR (device : VkDevice; pImportSemaphoreFdInfo : access constant VkImportSemaphoreFdInfoKHR) return VkResult -- vulkan_core.h:6403 with Import => True, Convention => C, External_Name => "vkImportSemaphoreFdKHR"; function vkGetSemaphoreFdKHR (device : VkDevice; pGetFdInfo : access constant VkSemaphoreGetFdInfoKHR; pFd : access int) return VkResult -- vulkan_core.h:6407 with Import => True, Convention => C, External_Name => "vkGetSemaphoreFdKHR"; type VkPhysicalDevicePushDescriptorPropertiesKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6418 pNext : System.Address; -- vulkan_core.h:6419 maxPushDescriptors : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:6420 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6417 type PFN_vkCmdPushDescriptorSetKHR is access procedure (arg1 : VkCommandBuffer; arg2 : VkPipelineBindPoint; arg3 : VkPipelineLayout; arg4 : Interfaces.C.unsigned_short; arg5 : Interfaces.C.unsigned_short; arg6 : access constant VkWriteDescriptorSet) with Convention => C; -- vulkan_core.h:6423 type PFN_vkCmdPushDescriptorSetWithTemplateKHR is access procedure (arg1 : VkCommandBuffer; arg2 : VkDescriptorUpdateTemplate; arg3 : VkPipelineLayout; arg4 : Interfaces.C.unsigned_short; arg5 : System.Address) with Convention => C; -- vulkan_core.h:6424 procedure vkCmdPushDescriptorSetKHR (commandBuffer : VkCommandBuffer; pipelineBindPoint : VkPipelineBindPoint; layout : VkPipelineLayout; set : Interfaces.C.unsigned_short; descriptorWriteCount : Interfaces.C.unsigned_short; pDescriptorWrites : access constant VkWriteDescriptorSet) -- vulkan_core.h:6427 with Import => True, Convention => C, External_Name => "vkCmdPushDescriptorSetKHR"; procedure vkCmdPushDescriptorSetWithTemplateKHR (commandBuffer : VkCommandBuffer; descriptorUpdateTemplate : VkDescriptorUpdateTemplate; layout : VkPipelineLayout; set : Interfaces.C.unsigned_short; pData : System.Address) -- vulkan_core.h:6435 with Import => True, Convention => C, External_Name => "vkCmdPushDescriptorSetWithTemplateKHR"; subtype VkPhysicalDeviceShaderFloat16Int8FeaturesKHR is VkPhysicalDeviceShaderFloat16Int8Features; -- vulkan_core.h:6447 subtype VkPhysicalDeviceFloat16Int8FeaturesKHR is VkPhysicalDeviceShaderFloat16Int8Features; -- vulkan_core.h:6449 subtype VkPhysicalDevice16BitStorageFeaturesKHR is VkPhysicalDevice16BitStorageFeatures; -- vulkan_core.h:6456 type VkRectLayerKHR is record offset : aliased VkOffset2D; -- vulkan_core.h:6464 extent : aliased VkExtent2D; -- vulkan_core.h:6465 layer : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:6466 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6463 type VkPresentRegionKHR is record rectangleCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:6470 pRectangles : access constant VkRectLayerKHR; -- vulkan_core.h:6471 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6469 type VkPresentRegionsKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6475 pNext : System.Address; -- vulkan_core.h:6476 swapchainCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:6477 pRegions : access constant VkPresentRegionKHR; -- vulkan_core.h:6478 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6474 subtype VkDescriptorUpdateTemplateKHR is VkDescriptorUpdateTemplate; -- vulkan_core.h:6484 subtype VkDescriptorUpdateTemplateTypeKHR is VkDescriptorUpdateTemplateType; -- vulkan_core.h:6488 subtype VkDescriptorUpdateTemplateCreateFlagsKHR is VkDescriptorUpdateTemplateCreateFlags; -- vulkan_core.h:6490 subtype VkDescriptorUpdateTemplateEntryKHR is VkDescriptorUpdateTemplateEntry; -- vulkan_core.h:6492 subtype VkDescriptorUpdateTemplateCreateInfoKHR is VkDescriptorUpdateTemplateCreateInfo; -- vulkan_core.h:6494 type PFN_vkCreateDescriptorUpdateTemplateKHR is access function (arg1 : VkDevice; arg2 : access constant VkDescriptorUpdateTemplateCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:6496 type PFN_vkDestroyDescriptorUpdateTemplateKHR is access procedure (arg1 : VkDevice; arg2 : VkDescriptorUpdateTemplate; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:6497 type PFN_vkUpdateDescriptorSetWithTemplateKHR is access procedure (arg1 : VkDevice; arg2 : VkDescriptorSet; arg3 : VkDescriptorUpdateTemplate; arg4 : System.Address) with Convention => C; -- vulkan_core.h:6498 function vkCreateDescriptorUpdateTemplateKHR (device : VkDevice; pCreateInfo : access constant VkDescriptorUpdateTemplateCreateInfo; pAllocator : access constant VkAllocationCallbacks; pDescriptorUpdateTemplate : System.Address) return VkResult -- vulkan_core.h:6501 with Import => True, Convention => C, External_Name => "vkCreateDescriptorUpdateTemplateKHR"; procedure vkDestroyDescriptorUpdateTemplateKHR (device : VkDevice; descriptorUpdateTemplate : VkDescriptorUpdateTemplate; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:6507 with Import => True, Convention => C, External_Name => "vkDestroyDescriptorUpdateTemplateKHR"; procedure vkUpdateDescriptorSetWithTemplateKHR (device : VkDevice; descriptorSet : VkDescriptorSet; descriptorUpdateTemplate : VkDescriptorUpdateTemplate; pData : System.Address) -- vulkan_core.h:6512 with Import => True, Convention => C, External_Name => "vkUpdateDescriptorSetWithTemplateKHR"; subtype VkPhysicalDeviceImagelessFramebufferFeaturesKHR is VkPhysicalDeviceImagelessFramebufferFeatures; -- vulkan_core.h:6523 subtype VkFramebufferAttachmentsCreateInfoKHR is VkFramebufferAttachmentsCreateInfo; -- vulkan_core.h:6525 subtype VkFramebufferAttachmentImageInfoKHR is VkFramebufferAttachmentImageInfo; -- vulkan_core.h:6527 subtype VkRenderPassAttachmentBeginInfoKHR is VkRenderPassAttachmentBeginInfo; -- vulkan_core.h:6529 subtype VkRenderPassCreateInfo2KHR is VkRenderPassCreateInfo2; -- vulkan_core.h:6536 subtype VkAttachmentDescription2KHR is VkAttachmentDescription2; -- vulkan_core.h:6538 subtype VkAttachmentReference2KHR is VkAttachmentReference2; -- vulkan_core.h:6540 subtype VkSubpassDescription2KHR is VkSubpassDescription2; -- vulkan_core.h:6542 subtype VkSubpassDependency2KHR is VkSubpassDependency2; -- vulkan_core.h:6544 subtype VkSubpassBeginInfoKHR is VkSubpassBeginInfo; -- vulkan_core.h:6546 subtype VkSubpassEndInfoKHR is VkSubpassEndInfo; -- vulkan_core.h:6548 type PFN_vkCreateRenderPass2KHR is access function (arg1 : VkDevice; arg2 : access constant VkRenderPassCreateInfo2; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:6550 type PFN_vkCmdBeginRenderPass2KHR is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkRenderPassBeginInfo; arg3 : access constant VkSubpassBeginInfo) with Convention => C; -- vulkan_core.h:6551 type PFN_vkCmdNextSubpass2KHR is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkSubpassBeginInfo; arg3 : access constant VkSubpassEndInfo) with Convention => C; -- vulkan_core.h:6552 type PFN_vkCmdEndRenderPass2KHR is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkSubpassEndInfo) with Convention => C; -- vulkan_core.h:6553 function vkCreateRenderPass2KHR (device : VkDevice; pCreateInfo : access constant VkRenderPassCreateInfo2; pAllocator : access constant VkAllocationCallbacks; pRenderPass : System.Address) return VkResult -- vulkan_core.h:6556 with Import => True, Convention => C, External_Name => "vkCreateRenderPass2KHR"; procedure vkCmdBeginRenderPass2KHR (commandBuffer : VkCommandBuffer; pRenderPassBegin : access constant VkRenderPassBeginInfo; pSubpassBeginInfo : access constant VkSubpassBeginInfo) -- vulkan_core.h:6562 with Import => True, Convention => C, External_Name => "vkCmdBeginRenderPass2KHR"; procedure vkCmdNextSubpass2KHR (commandBuffer : VkCommandBuffer; pSubpassBeginInfo : access constant VkSubpassBeginInfo; pSubpassEndInfo : access constant VkSubpassEndInfo) -- vulkan_core.h:6567 with Import => True, Convention => C, External_Name => "vkCmdNextSubpass2KHR"; procedure vkCmdEndRenderPass2KHR (commandBuffer : VkCommandBuffer; pSubpassEndInfo : access constant VkSubpassEndInfo) -- vulkan_core.h:6572 with Import => True, Convention => C, External_Name => "vkCmdEndRenderPass2KHR"; type VkSharedPresentSurfaceCapabilitiesKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6582 pNext : System.Address; -- vulkan_core.h:6583 sharedPresentSupportedUsageFlags : aliased VkImageUsageFlags; -- vulkan_core.h:6584 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6581 type PFN_vkGetSwapchainStatusKHR is access function (arg1 : VkDevice; arg2 : VkSwapchainKHR) return VkResult with Convention => C; -- vulkan_core.h:6587 function vkGetSwapchainStatusKHR (device : VkDevice; swapchain : VkSwapchainKHR) return VkResult -- vulkan_core.h:6590 with Import => True, Convention => C, External_Name => "vkGetSwapchainStatusKHR"; subtype VkExternalFenceHandleTypeFlagsKHR is VkExternalFenceHandleTypeFlags; -- vulkan_core.h:6599 subtype VkExternalFenceHandleTypeFlagBitsKHR is VkExternalFenceHandleTypeFlagBits; -- vulkan_core.h:6601 subtype VkExternalFenceFeatureFlagsKHR is VkExternalFenceFeatureFlags; -- vulkan_core.h:6603 subtype VkExternalFenceFeatureFlagBitsKHR is VkExternalFenceFeatureFlagBits; -- vulkan_core.h:6605 subtype VkPhysicalDeviceExternalFenceInfoKHR is VkPhysicalDeviceExternalFenceInfo; -- vulkan_core.h:6607 subtype VkExternalFencePropertiesKHR is VkExternalFenceProperties; -- vulkan_core.h:6609 type PFN_vkGetPhysicalDeviceExternalFencePropertiesKHR is access procedure (arg1 : VkPhysicalDevice; arg2 : access constant VkPhysicalDeviceExternalFenceInfo; arg3 : access VkExternalFenceProperties) with Convention => C; -- vulkan_core.h:6611 procedure vkGetPhysicalDeviceExternalFencePropertiesKHR (physicalDevice : VkPhysicalDevice; pExternalFenceInfo : access constant VkPhysicalDeviceExternalFenceInfo; pExternalFenceProperties : access VkExternalFenceProperties) -- vulkan_core.h:6614 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceExternalFencePropertiesKHR"; subtype VkFenceImportFlagsKHR is VkFenceImportFlags; -- vulkan_core.h:6624 subtype VkFenceImportFlagBitsKHR is VkFenceImportFlagBits; -- vulkan_core.h:6626 subtype VkExportFenceCreateInfoKHR is VkExportFenceCreateInfo; -- vulkan_core.h:6628 type VkImportFenceFdInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6636 pNext : System.Address; -- vulkan_core.h:6637 fence : VkFence; -- vulkan_core.h:6638 flags : aliased VkFenceImportFlags; -- vulkan_core.h:6639 handleType : aliased VkExternalFenceHandleTypeFlagBits; -- vulkan_core.h:6640 fd : aliased int; -- vulkan_core.h:6641 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6635 type VkFenceGetFdInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6645 pNext : System.Address; -- vulkan_core.h:6646 fence : VkFence; -- vulkan_core.h:6647 handleType : aliased VkExternalFenceHandleTypeFlagBits; -- vulkan_core.h:6648 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6644 type PFN_vkImportFenceFdKHR is access function (arg1 : VkDevice; arg2 : access constant VkImportFenceFdInfoKHR) return VkResult with Convention => C; -- vulkan_core.h:6651 type PFN_vkGetFenceFdKHR is access function (arg1 : VkDevice; arg2 : access constant VkFenceGetFdInfoKHR; arg3 : access int) return VkResult with Convention => C; -- vulkan_core.h:6652 function vkImportFenceFdKHR (device : VkDevice; pImportFenceFdInfo : access constant VkImportFenceFdInfoKHR) return VkResult -- vulkan_core.h:6655 with Import => True, Convention => C, External_Name => "vkImportFenceFdKHR"; function vkGetFenceFdKHR (device : VkDevice; pGetFdInfo : access constant VkFenceGetFdInfoKHR; pFd : access int) return VkResult -- vulkan_core.h:6659 with Import => True, Convention => C, External_Name => "vkGetFenceFdKHR"; subtype VkPerformanceCounterUnitKHR is unsigned; VK_PERFORMANCE_COUNTER_UNIT_GENERIC_KHR : constant unsigned := 0; VK_PERFORMANCE_COUNTER_UNIT_PERCENTAGE_KHR : constant unsigned := 1; VK_PERFORMANCE_COUNTER_UNIT_NANOSECONDS_KHR : constant unsigned := 2; VK_PERFORMANCE_COUNTER_UNIT_BYTES_KHR : constant unsigned := 3; VK_PERFORMANCE_COUNTER_UNIT_BYTES_PER_SECOND_KHR : constant unsigned := 4; VK_PERFORMANCE_COUNTER_UNIT_KELVIN_KHR : constant unsigned := 5; VK_PERFORMANCE_COUNTER_UNIT_WATTS_KHR : constant unsigned := 6; VK_PERFORMANCE_COUNTER_UNIT_VOLTS_KHR : constant unsigned := 7; VK_PERFORMANCE_COUNTER_UNIT_AMPS_KHR : constant unsigned := 8; VK_PERFORMANCE_COUNTER_UNIT_HERTZ_KHR : constant unsigned := 9; VK_PERFORMANCE_COUNTER_UNIT_CYCLES_KHR : constant unsigned := 10; VK_PERFORMANCE_COUNTER_UNIT_BEGIN_RANGE_KHR : constant unsigned := 0; VK_PERFORMANCE_COUNTER_UNIT_END_RANGE_KHR : constant unsigned := 10; VK_PERFORMANCE_COUNTER_UNIT_RANGE_SIZE_KHR : constant unsigned := 11; VK_PERFORMANCE_COUNTER_UNIT_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:6670 subtype VkPerformanceCounterScopeKHR is unsigned; VK_PERFORMANCE_COUNTER_SCOPE_COMMAND_BUFFER_KHR : constant unsigned := 0; VK_PERFORMANCE_COUNTER_SCOPE_RENDER_PASS_KHR : constant unsigned := 1; VK_PERFORMANCE_COUNTER_SCOPE_COMMAND_KHR : constant unsigned := 2; VK_QUERY_SCOPE_COMMAND_BUFFER_KHR : constant unsigned := 0; VK_QUERY_SCOPE_RENDER_PASS_KHR : constant unsigned := 1; VK_QUERY_SCOPE_COMMAND_KHR : constant unsigned := 2; VK_PERFORMANCE_COUNTER_SCOPE_BEGIN_RANGE_KHR : constant unsigned := 0; VK_PERFORMANCE_COUNTER_SCOPE_END_RANGE_KHR : constant unsigned := 2; VK_PERFORMANCE_COUNTER_SCOPE_RANGE_SIZE_KHR : constant unsigned := 3; VK_PERFORMANCE_COUNTER_SCOPE_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:6688 subtype VkPerformanceCounterStorageKHR is unsigned; VK_PERFORMANCE_COUNTER_STORAGE_INT32_KHR : constant unsigned := 0; VK_PERFORMANCE_COUNTER_STORAGE_INT64_KHR : constant unsigned := 1; VK_PERFORMANCE_COUNTER_STORAGE_UINT32_KHR : constant unsigned := 2; VK_PERFORMANCE_COUNTER_STORAGE_UINT64_KHR : constant unsigned := 3; VK_PERFORMANCE_COUNTER_STORAGE_FLOAT32_KHR : constant unsigned := 4; VK_PERFORMANCE_COUNTER_STORAGE_FLOAT64_KHR : constant unsigned := 5; VK_PERFORMANCE_COUNTER_STORAGE_BEGIN_RANGE_KHR : constant unsigned := 0; VK_PERFORMANCE_COUNTER_STORAGE_END_RANGE_KHR : constant unsigned := 5; VK_PERFORMANCE_COUNTER_STORAGE_RANGE_SIZE_KHR : constant unsigned := 6; VK_PERFORMANCE_COUNTER_STORAGE_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:6701 subtype VkPerformanceCounterDescriptionFlagBitsKHR is unsigned; VK_PERFORMANCE_COUNTER_DESCRIPTION_PERFORMANCE_IMPACTING_KHR : constant unsigned := 1; VK_PERFORMANCE_COUNTER_DESCRIPTION_CONCURRENTLY_IMPACTED_KHR : constant unsigned := 2; VK_PERFORMANCE_COUNTER_DESCRIPTION_FLAG_BITS_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:6714 subtype VkPerformanceCounterDescriptionFlagsKHR is VkFlags; -- vulkan_core.h:6719 subtype VkAcquireProfilingLockFlagBitsKHR is unsigned; VK_ACQUIRE_PROFILING_LOCK_FLAG_BITS_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:6721 subtype VkAcquireProfilingLockFlagsKHR is VkFlags; -- vulkan_core.h:6724 type VkPhysicalDevicePerformanceQueryFeaturesKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6726 pNext : System.Address; -- vulkan_core.h:6727 performanceCounterQueryPools : aliased VkBool32; -- vulkan_core.h:6728 performanceCounterMultipleQueryPools : aliased VkBool32; -- vulkan_core.h:6729 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6725 type VkPhysicalDevicePerformanceQueryPropertiesKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6733 pNext : System.Address; -- vulkan_core.h:6734 allowCommandBufferQueryCopies : aliased VkBool32; -- vulkan_core.h:6735 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6732 type VkPerformanceCounterKHR_array1345 is array (0 .. 15) of aliased Interfaces.C.unsigned_char; type VkPerformanceCounterKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6739 pNext : System.Address; -- vulkan_core.h:6740 unit : aliased VkPerformanceCounterUnitKHR; -- vulkan_core.h:6741 scope : aliased VkPerformanceCounterScopeKHR; -- vulkan_core.h:6742 storage : aliased VkPerformanceCounterStorageKHR; -- vulkan_core.h:6743 uuid : aliased VkPerformanceCounterKHR_array1345; -- vulkan_core.h:6744 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6738 subtype VkPerformanceCounterDescriptionKHR_array1342 is Interfaces.C.char_array (0 .. 255); type VkPerformanceCounterDescriptionKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6748 pNext : System.Address; -- vulkan_core.h:6749 flags : aliased VkPerformanceCounterDescriptionFlagsKHR; -- vulkan_core.h:6750 name : aliased VkPerformanceCounterDescriptionKHR_array1342; -- vulkan_core.h:6751 category : aliased VkPerformanceCounterDescriptionKHR_array1342; -- vulkan_core.h:6752 description : aliased VkPerformanceCounterDescriptionKHR_array1342; -- vulkan_core.h:6753 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6747 type VkQueryPoolPerformanceCreateInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6757 pNext : System.Address; -- vulkan_core.h:6758 queueFamilyIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:6759 counterIndexCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:6760 pCounterIndices : access Interfaces.C.unsigned_short; -- vulkan_core.h:6761 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6756 type VkPerformanceCounterResultKHR (discr : unsigned := 0) is record case discr is when 0 => int32 : aliased Interfaces.C.short; -- vulkan_core.h:6765 when 1 => int64 : aliased Interfaces.C.long; -- vulkan_core.h:6766 when 2 => uint32 : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:6767 when 3 => uint64 : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:6768 when 4 => float32 : aliased float; -- vulkan_core.h:6769 when others => float64 : aliased double; -- vulkan_core.h:6770 end case; end record with Convention => C_Pass_By_Copy, Unchecked_Union => True; -- vulkan_core.h:6764 type VkAcquireProfilingLockInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6774 pNext : System.Address; -- vulkan_core.h:6775 flags : aliased VkAcquireProfilingLockFlagsKHR; -- vulkan_core.h:6776 timeout : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:6777 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6773 type VkPerformanceQuerySubmitInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:6781 pNext : System.Address; -- vulkan_core.h:6782 counterPassIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:6783 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6780 type PFN_vkEnumeratePhysicalDeviceQueueFamilyPerformanceQueryCountersKHR is access function (arg1 : VkPhysicalDevice; arg2 : Interfaces.C.unsigned_short; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkPerformanceCounterKHR; arg5 : access VkPerformanceCounterDescriptionKHR) return VkResult with Convention => C; -- vulkan_core.h:6786 type PFN_vkGetPhysicalDeviceQueueFamilyPerformanceQueryPassesKHR is access procedure (arg1 : VkPhysicalDevice; arg2 : access constant VkQueryPoolPerformanceCreateInfoKHR; arg3 : access Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:6787 type PFN_vkAcquireProfilingLockKHR is access function (arg1 : VkDevice; arg2 : access constant VkAcquireProfilingLockInfoKHR) return VkResult with Convention => C; -- vulkan_core.h:6788 type PFN_vkReleaseProfilingLockKHR is access procedure (arg1 : VkDevice) with Convention => C; -- vulkan_core.h:6789 function vkEnumeratePhysicalDeviceQueueFamilyPerformanceQueryCountersKHR (physicalDevice : VkPhysicalDevice; queueFamilyIndex : Interfaces.C.unsigned_short; pCounterCount : access Interfaces.C.unsigned_short; pCounters : access VkPerformanceCounterKHR; pCounterDescriptions : access VkPerformanceCounterDescriptionKHR) return VkResult -- vulkan_core.h:6792 with Import => True, Convention => C, External_Name => "vkEnumeratePhysicalDeviceQueueFamilyPerformanceQueryCountersKHR"; procedure vkGetPhysicalDeviceQueueFamilyPerformanceQueryPassesKHR (physicalDevice : VkPhysicalDevice; pPerformanceQueryCreateInfo : access constant VkQueryPoolPerformanceCreateInfoKHR; pNumPasses : access Interfaces.C.unsigned_short) -- vulkan_core.h:6799 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceQueueFamilyPerformanceQueryPassesKHR"; function vkAcquireProfilingLockKHR (device : VkDevice; pInfo : access constant VkAcquireProfilingLockInfoKHR) return VkResult -- vulkan_core.h:6804 with Import => True, Convention => C, External_Name => "vkAcquireProfilingLockKHR"; procedure vkReleaseProfilingLockKHR (device : VkDevice) -- vulkan_core.h:6808 with Import => True, Convention => C, External_Name => "vkReleaseProfilingLockKHR"; subtype VkPointClippingBehaviorKHR is VkPointClippingBehavior; -- vulkan_core.h:6816 subtype VkTessellationDomainOriginKHR is VkTessellationDomainOrigin; -- vulkan_core.h:6818 subtype VkPhysicalDevicePointClippingPropertiesKHR is VkPhysicalDevicePointClippingProperties; -- vulkan_core.h:6820 subtype VkRenderPassInputAttachmentAspectCreateInfoKHR is VkRenderPassInputAttachmentAspectCreateInfo; -- vulkan_core.h:6822 subtype VkInputAttachmentAspectReferenceKHR is VkInputAttachmentAspectReference; -- vulkan_core.h:6824 subtype VkImageViewUsageCreateInfoKHR is VkImageViewUsageCreateInfo; -- vulkan_core.h:6826 subtype VkPipelineTessellationDomainOriginStateCreateInfoKHR is VkPipelineTessellationDomainOriginStateCreateInfo; -- vulkan_core.h:6828 type VkPhysicalDeviceSurfaceInfo2KHR is record sType : aliased VkStructureType; -- vulkan_core.h:6836 pNext : System.Address; -- vulkan_core.h:6837 surface : VkSurfaceKHR; -- vulkan_core.h:6838 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6835 type VkSurfaceCapabilities2KHR is record sType : aliased VkStructureType; -- vulkan_core.h:6842 pNext : System.Address; -- vulkan_core.h:6843 surfaceCapabilities : aliased VkSurfaceCapabilitiesKHR; -- vulkan_core.h:6844 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6841 type VkSurfaceFormat2KHR is record sType : aliased VkStructureType; -- vulkan_core.h:6848 pNext : System.Address; -- vulkan_core.h:6849 surfaceFormat : aliased VkSurfaceFormatKHR; -- vulkan_core.h:6850 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6847 type PFN_vkGetPhysicalDeviceSurfaceCapabilities2KHR is access function (arg1 : VkPhysicalDevice; arg2 : access constant VkPhysicalDeviceSurfaceInfo2KHR; arg3 : access VkSurfaceCapabilities2KHR) return VkResult with Convention => C; -- vulkan_core.h:6853 type PFN_vkGetPhysicalDeviceSurfaceFormats2KHR is access function (arg1 : VkPhysicalDevice; arg2 : access constant VkPhysicalDeviceSurfaceInfo2KHR; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkSurfaceFormat2KHR) return VkResult with Convention => C; -- vulkan_core.h:6854 function vkGetPhysicalDeviceSurfaceCapabilities2KHR (physicalDevice : VkPhysicalDevice; pSurfaceInfo : access constant VkPhysicalDeviceSurfaceInfo2KHR; pSurfaceCapabilities : access VkSurfaceCapabilities2KHR) return VkResult -- vulkan_core.h:6857 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceSurfaceCapabilities2KHR"; function vkGetPhysicalDeviceSurfaceFormats2KHR (physicalDevice : VkPhysicalDevice; pSurfaceInfo : access constant VkPhysicalDeviceSurfaceInfo2KHR; pSurfaceFormatCount : access Interfaces.C.unsigned_short; pSurfaceFormats : access VkSurfaceFormat2KHR) return VkResult -- vulkan_core.h:6862 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceSurfaceFormats2KHR"; subtype VkPhysicalDeviceVariablePointerFeaturesKHR is VkPhysicalDeviceVariablePointersFeatures; -- vulkan_core.h:6873 subtype VkPhysicalDeviceVariablePointersFeaturesKHR is VkPhysicalDeviceVariablePointersFeatures; -- vulkan_core.h:6875 type VkDisplayProperties2KHR is record sType : aliased VkStructureType; -- vulkan_core.h:6883 pNext : System.Address; -- vulkan_core.h:6884 displayProperties : aliased VkDisplayPropertiesKHR; -- vulkan_core.h:6885 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6882 type VkDisplayPlaneProperties2KHR is record sType : aliased VkStructureType; -- vulkan_core.h:6889 pNext : System.Address; -- vulkan_core.h:6890 displayPlaneProperties : aliased VkDisplayPlanePropertiesKHR; -- vulkan_core.h:6891 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6888 type VkDisplayModeProperties2KHR is record sType : aliased VkStructureType; -- vulkan_core.h:6895 pNext : System.Address; -- vulkan_core.h:6896 displayModeProperties : aliased VkDisplayModePropertiesKHR; -- vulkan_core.h:6897 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6894 type VkDisplayPlaneInfo2KHR is record sType : aliased VkStructureType; -- vulkan_core.h:6901 pNext : System.Address; -- vulkan_core.h:6902 mode : VkDisplayModeKHR; -- vulkan_core.h:6903 planeIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:6904 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6900 type VkDisplayPlaneCapabilities2KHR is record sType : aliased VkStructureType; -- vulkan_core.h:6908 pNext : System.Address; -- vulkan_core.h:6909 capabilities : aliased VkDisplayPlaneCapabilitiesKHR; -- vulkan_core.h:6910 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:6907 type PFN_vkGetPhysicalDeviceDisplayProperties2KHR is access function (arg1 : VkPhysicalDevice; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkDisplayProperties2KHR) return VkResult with Convention => C; -- vulkan_core.h:6913 type PFN_vkGetPhysicalDeviceDisplayPlaneProperties2KHR is access function (arg1 : VkPhysicalDevice; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkDisplayPlaneProperties2KHR) return VkResult with Convention => C; -- vulkan_core.h:6914 type PFN_vkGetDisplayModeProperties2KHR is access function (arg1 : VkPhysicalDevice; arg2 : VkDisplayKHR; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkDisplayModeProperties2KHR) return VkResult with Convention => C; -- vulkan_core.h:6915 type PFN_vkGetDisplayPlaneCapabilities2KHR is access function (arg1 : VkPhysicalDevice; arg2 : access constant VkDisplayPlaneInfo2KHR; arg3 : access VkDisplayPlaneCapabilities2KHR) return VkResult with Convention => C; -- vulkan_core.h:6916 function vkGetPhysicalDeviceDisplayProperties2KHR (physicalDevice : VkPhysicalDevice; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkDisplayProperties2KHR) return VkResult -- vulkan_core.h:6919 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceDisplayProperties2KHR"; function vkGetPhysicalDeviceDisplayPlaneProperties2KHR (physicalDevice : VkPhysicalDevice; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkDisplayPlaneProperties2KHR) return VkResult -- vulkan_core.h:6924 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceDisplayPlaneProperties2KHR"; function vkGetDisplayModeProperties2KHR (physicalDevice : VkPhysicalDevice; display : VkDisplayKHR; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkDisplayModeProperties2KHR) return VkResult -- vulkan_core.h:6929 with Import => True, Convention => C, External_Name => "vkGetDisplayModeProperties2KHR"; function vkGetDisplayPlaneCapabilities2KHR (physicalDevice : VkPhysicalDevice; pDisplayPlaneInfo : access constant VkDisplayPlaneInfo2KHR; pCapabilities : access VkDisplayPlaneCapabilities2KHR) return VkResult -- vulkan_core.h:6935 with Import => True, Convention => C, External_Name => "vkGetDisplayPlaneCapabilities2KHR"; subtype VkMemoryDedicatedRequirementsKHR is VkMemoryDedicatedRequirements; -- vulkan_core.h:6945 subtype VkMemoryDedicatedAllocateInfoKHR is VkMemoryDedicatedAllocateInfo; -- vulkan_core.h:6947 subtype VkBufferMemoryRequirementsInfo2KHR is VkBufferMemoryRequirementsInfo2; -- vulkan_core.h:6964 subtype VkImageMemoryRequirementsInfo2KHR is VkImageMemoryRequirementsInfo2; -- vulkan_core.h:6966 subtype VkImageSparseMemoryRequirementsInfo2KHR is VkImageSparseMemoryRequirementsInfo2; -- vulkan_core.h:6968 subtype VkSparseImageMemoryRequirements2KHR is VkSparseImageMemoryRequirements2; -- vulkan_core.h:6970 type PFN_vkGetImageMemoryRequirements2KHR is access procedure (arg1 : VkDevice; arg2 : access constant VkImageMemoryRequirementsInfo2; arg3 : access VkMemoryRequirements2) with Convention => C; -- vulkan_core.h:6972 type PFN_vkGetBufferMemoryRequirements2KHR is access procedure (arg1 : VkDevice; arg2 : access constant VkBufferMemoryRequirementsInfo2; arg3 : access VkMemoryRequirements2) with Convention => C; -- vulkan_core.h:6973 type PFN_vkGetImageSparseMemoryRequirements2KHR is access procedure (arg1 : VkDevice; arg2 : access constant VkImageSparseMemoryRequirementsInfo2; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkSparseImageMemoryRequirements2) with Convention => C; -- vulkan_core.h:6974 procedure vkGetImageMemoryRequirements2KHR (device : VkDevice; pInfo : access constant VkImageMemoryRequirementsInfo2; pMemoryRequirements : access VkMemoryRequirements2) -- vulkan_core.h:6977 with Import => True, Convention => C, External_Name => "vkGetImageMemoryRequirements2KHR"; procedure vkGetBufferMemoryRequirements2KHR (device : VkDevice; pInfo : access constant VkBufferMemoryRequirementsInfo2; pMemoryRequirements : access VkMemoryRequirements2) -- vulkan_core.h:6982 with Import => True, Convention => C, External_Name => "vkGetBufferMemoryRequirements2KHR"; procedure vkGetImageSparseMemoryRequirements2KHR (device : VkDevice; pInfo : access constant VkImageSparseMemoryRequirementsInfo2; pSparseMemoryRequirementCount : access Interfaces.C.unsigned_short; pSparseMemoryRequirements : access VkSparseImageMemoryRequirements2) -- vulkan_core.h:6987 with Import => True, Convention => C, External_Name => "vkGetImageSparseMemoryRequirements2KHR"; subtype VkImageFormatListCreateInfoKHR is VkImageFormatListCreateInfo; -- vulkan_core.h:6998 subtype VkSamplerYcbcrConversionKHR is VkSamplerYcbcrConversion; -- vulkan_core.h:7003 subtype VkSamplerYcbcrModelConversionKHR is VkSamplerYcbcrModelConversion; -- vulkan_core.h:7007 subtype VkSamplerYcbcrRangeKHR is VkSamplerYcbcrRange; -- vulkan_core.h:7009 subtype VkChromaLocationKHR is VkChromaLocation; -- vulkan_core.h:7011 subtype VkSamplerYcbcrConversionCreateInfoKHR is VkSamplerYcbcrConversionCreateInfo; -- vulkan_core.h:7013 subtype VkSamplerYcbcrConversionInfoKHR is VkSamplerYcbcrConversionInfo; -- vulkan_core.h:7015 subtype VkBindImagePlaneMemoryInfoKHR is VkBindImagePlaneMemoryInfo; -- vulkan_core.h:7017 subtype VkImagePlaneMemoryRequirementsInfoKHR is VkImagePlaneMemoryRequirementsInfo; -- vulkan_core.h:7019 subtype VkPhysicalDeviceSamplerYcbcrConversionFeaturesKHR is VkPhysicalDeviceSamplerYcbcrConversionFeatures; -- vulkan_core.h:7021 subtype VkSamplerYcbcrConversionImageFormatPropertiesKHR is VkSamplerYcbcrConversionImageFormatProperties; -- vulkan_core.h:7023 type PFN_vkCreateSamplerYcbcrConversionKHR is access function (arg1 : VkDevice; arg2 : access constant VkSamplerYcbcrConversionCreateInfo; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:7025 type PFN_vkDestroySamplerYcbcrConversionKHR is access procedure (arg1 : VkDevice; arg2 : VkSamplerYcbcrConversion; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:7026 function vkCreateSamplerYcbcrConversionKHR (device : VkDevice; pCreateInfo : access constant VkSamplerYcbcrConversionCreateInfo; pAllocator : access constant VkAllocationCallbacks; pYcbcrConversion : System.Address) return VkResult -- vulkan_core.h:7029 with Import => True, Convention => C, External_Name => "vkCreateSamplerYcbcrConversionKHR"; procedure vkDestroySamplerYcbcrConversionKHR (device : VkDevice; ycbcrConversion : VkSamplerYcbcrConversion; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:7035 with Import => True, Convention => C, External_Name => "vkDestroySamplerYcbcrConversionKHR"; subtype VkBindBufferMemoryInfoKHR is VkBindBufferMemoryInfo; -- vulkan_core.h:7045 subtype VkBindImageMemoryInfoKHR is VkBindImageMemoryInfo; -- vulkan_core.h:7047 type PFN_vkBindBufferMemory2KHR is access function (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkBindBufferMemoryInfo) return VkResult with Convention => C; -- vulkan_core.h:7049 type PFN_vkBindImageMemory2KHR is access function (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkBindImageMemoryInfo) return VkResult with Convention => C; -- vulkan_core.h:7050 function vkBindBufferMemory2KHR (device : VkDevice; bindInfoCount : Interfaces.C.unsigned_short; pBindInfos : access constant VkBindBufferMemoryInfo) return VkResult -- vulkan_core.h:7053 with Import => True, Convention => C, External_Name => "vkBindBufferMemory2KHR"; function vkBindImageMemory2KHR (device : VkDevice; bindInfoCount : Interfaces.C.unsigned_short; pBindInfos : access constant VkBindImageMemoryInfo) return VkResult -- vulkan_core.h:7058 with Import => True, Convention => C, External_Name => "vkBindImageMemory2KHR"; subtype VkPhysicalDeviceMaintenance3PropertiesKHR is VkPhysicalDeviceMaintenance3Properties; -- vulkan_core.h:7068 subtype VkDescriptorSetLayoutSupportKHR is VkDescriptorSetLayoutSupport; -- vulkan_core.h:7070 type PFN_vkGetDescriptorSetLayoutSupportKHR is access procedure (arg1 : VkDevice; arg2 : access constant VkDescriptorSetLayoutCreateInfo; arg3 : access VkDescriptorSetLayoutSupport) with Convention => C; -- vulkan_core.h:7072 procedure vkGetDescriptorSetLayoutSupportKHR (device : VkDevice; pCreateInfo : access constant VkDescriptorSetLayoutCreateInfo; pSupport : access VkDescriptorSetLayoutSupport) -- vulkan_core.h:7075 with Import => True, Convention => C, External_Name => "vkGetDescriptorSetLayoutSupportKHR"; type PFN_vkCmdDrawIndirectCountKHR is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : VkBuffer; arg5 : VkDeviceSize; arg6 : Interfaces.C.unsigned_short; arg7 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:7085 type PFN_vkCmdDrawIndexedIndirectCountKHR is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : VkBuffer; arg5 : VkDeviceSize; arg6 : Interfaces.C.unsigned_short; arg7 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:7086 procedure vkCmdDrawIndirectCountKHR (commandBuffer : VkCommandBuffer; buffer : VkBuffer; offset : VkDeviceSize; countBuffer : VkBuffer; countBufferOffset : VkDeviceSize; maxDrawCount : Interfaces.C.unsigned_short; stride : Interfaces.C.unsigned_short) -- vulkan_core.h:7089 with Import => True, Convention => C, External_Name => "vkCmdDrawIndirectCountKHR"; procedure vkCmdDrawIndexedIndirectCountKHR (commandBuffer : VkCommandBuffer; buffer : VkBuffer; offset : VkDeviceSize; countBuffer : VkBuffer; countBufferOffset : VkDeviceSize; maxDrawCount : Interfaces.C.unsigned_short; stride : Interfaces.C.unsigned_short) -- vulkan_core.h:7098 with Import => True, Convention => C, External_Name => "vkCmdDrawIndexedIndirectCountKHR"; subtype VkPhysicalDeviceShaderSubgroupExtendedTypesFeaturesKHR is VkPhysicalDeviceShaderSubgroupExtendedTypesFeatures; -- vulkan_core.h:7112 subtype VkPhysicalDevice8BitStorageFeaturesKHR is VkPhysicalDevice8BitStorageFeatures; -- vulkan_core.h:7119 subtype VkPhysicalDeviceShaderAtomicInt64FeaturesKHR is VkPhysicalDeviceShaderAtomicInt64Features; -- vulkan_core.h:7126 type VkPhysicalDeviceShaderClockFeaturesKHR is record sType : aliased VkStructureType; -- vulkan_core.h:7134 pNext : System.Address; -- vulkan_core.h:7135 shaderSubgroupClock : aliased VkBool32; -- vulkan_core.h:7136 shaderDeviceClock : aliased VkBool32; -- vulkan_core.h:7137 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7133 subtype VkDriverIdKHR is VkDriverId; -- vulkan_core.h:7147 subtype VkConformanceVersionKHR is VkConformanceVersion; -- vulkan_core.h:7149 subtype VkPhysicalDeviceDriverPropertiesKHR is VkPhysicalDeviceDriverProperties; -- vulkan_core.h:7151 subtype VkShaderFloatControlsIndependenceKHR is VkShaderFloatControlsIndependence; -- vulkan_core.h:7158 subtype VkPhysicalDeviceFloatControlsPropertiesKHR is VkPhysicalDeviceFloatControlsProperties; -- vulkan_core.h:7160 subtype VkResolveModeFlagBitsKHR is VkResolveModeFlagBits; -- vulkan_core.h:7167 subtype VkResolveModeFlagsKHR is VkResolveModeFlags; -- vulkan_core.h:7169 subtype VkSubpassDescriptionDepthStencilResolveKHR is VkSubpassDescriptionDepthStencilResolve; -- vulkan_core.h:7171 subtype VkPhysicalDeviceDepthStencilResolvePropertiesKHR is VkPhysicalDeviceDepthStencilResolveProperties; -- vulkan_core.h:7173 subtype VkSemaphoreTypeKHR is VkSemaphoreType; -- vulkan_core.h:7185 subtype VkSemaphoreWaitFlagBitsKHR is VkSemaphoreWaitFlagBits; -- vulkan_core.h:7187 subtype VkSemaphoreWaitFlagsKHR is VkSemaphoreWaitFlags; -- vulkan_core.h:7189 subtype VkPhysicalDeviceTimelineSemaphoreFeaturesKHR is VkPhysicalDeviceTimelineSemaphoreFeatures; -- vulkan_core.h:7191 subtype VkPhysicalDeviceTimelineSemaphorePropertiesKHR is VkPhysicalDeviceTimelineSemaphoreProperties; -- vulkan_core.h:7193 subtype VkSemaphoreTypeCreateInfoKHR is VkSemaphoreTypeCreateInfo; -- vulkan_core.h:7195 subtype VkTimelineSemaphoreSubmitInfoKHR is VkTimelineSemaphoreSubmitInfo; -- vulkan_core.h:7197 subtype VkSemaphoreWaitInfoKHR is VkSemaphoreWaitInfo; -- vulkan_core.h:7199 subtype VkSemaphoreSignalInfoKHR is VkSemaphoreSignalInfo; -- vulkan_core.h:7201 type PFN_vkGetSemaphoreCounterValueKHR is access function (arg1 : VkDevice; arg2 : VkSemaphore; arg3 : access Interfaces.C.unsigned_long) return VkResult with Convention => C; -- vulkan_core.h:7203 type PFN_vkWaitSemaphoresKHR is access function (arg1 : VkDevice; arg2 : access constant VkSemaphoreWaitInfo; arg3 : Interfaces.C.unsigned_long) return VkResult with Convention => C; -- vulkan_core.h:7204 type PFN_vkSignalSemaphoreKHR is access function (arg1 : VkDevice; arg2 : access constant VkSemaphoreSignalInfo) return VkResult with Convention => C; -- vulkan_core.h:7205 function vkGetSemaphoreCounterValueKHR (device : VkDevice; semaphore : VkSemaphore; pValue : access Interfaces.C.unsigned_long) return VkResult -- vulkan_core.h:7208 with Import => True, Convention => C, External_Name => "vkGetSemaphoreCounterValueKHR"; function vkWaitSemaphoresKHR (device : VkDevice; pWaitInfo : access constant VkSemaphoreWaitInfo; timeout : Interfaces.C.unsigned_long) return VkResult -- vulkan_core.h:7213 with Import => True, Convention => C, External_Name => "vkWaitSemaphoresKHR"; function vkSignalSemaphoreKHR (device : VkDevice; pSignalInfo : access constant VkSemaphoreSignalInfo) return VkResult -- vulkan_core.h:7218 with Import => True, Convention => C, External_Name => "vkSignalSemaphoreKHR"; subtype VkPhysicalDeviceVulkanMemoryModelFeaturesKHR is VkPhysicalDeviceVulkanMemoryModelFeatures; -- vulkan_core.h:7227 type VkSurfaceProtectedCapabilitiesKHR is record sType : aliased VkStructureType; -- vulkan_core.h:7240 pNext : System.Address; -- vulkan_core.h:7241 supportsProtected : aliased VkBool32; -- vulkan_core.h:7242 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7239 subtype VkPhysicalDeviceSeparateDepthStencilLayoutsFeaturesKHR is VkPhysicalDeviceSeparateDepthStencilLayoutsFeatures; -- vulkan_core.h:7250 subtype VkAttachmentReferenceStencilLayoutKHR is VkAttachmentReferenceStencilLayout; -- vulkan_core.h:7252 subtype VkAttachmentDescriptionStencilLayoutKHR is VkAttachmentDescriptionStencilLayout; -- vulkan_core.h:7254 subtype VkPhysicalDeviceUniformBufferStandardLayoutFeaturesKHR is VkPhysicalDeviceUniformBufferStandardLayoutFeatures; -- vulkan_core.h:7261 subtype VkPhysicalDeviceBufferDeviceAddressFeaturesKHR is VkPhysicalDeviceBufferDeviceAddressFeatures; -- vulkan_core.h:7268 subtype VkBufferDeviceAddressInfoKHR is VkBufferDeviceAddressInfo; -- vulkan_core.h:7270 subtype VkBufferOpaqueCaptureAddressCreateInfoKHR is VkBufferOpaqueCaptureAddressCreateInfo; -- vulkan_core.h:7272 subtype VkMemoryOpaqueCaptureAddressAllocateInfoKHR is VkMemoryOpaqueCaptureAddressAllocateInfo; -- vulkan_core.h:7274 subtype VkDeviceMemoryOpaqueCaptureAddressInfoKHR is VkDeviceMemoryOpaqueCaptureAddressInfo; -- vulkan_core.h:7276 type PFN_vkGetBufferDeviceAddressKHR is access function (arg1 : VkDevice; arg2 : access constant VkBufferDeviceAddressInfo) return VkDeviceAddress with Convention => C; -- vulkan_core.h:7278 type PFN_vkGetBufferOpaqueCaptureAddressKHR is access function (arg1 : VkDevice; arg2 : access constant VkBufferDeviceAddressInfo) return Interfaces.C.unsigned_long with Convention => C; -- vulkan_core.h:7279 type PFN_vkGetDeviceMemoryOpaqueCaptureAddressKHR is access function (arg1 : VkDevice; arg2 : access constant VkDeviceMemoryOpaqueCaptureAddressInfo) return Interfaces.C.unsigned_long with Convention => C; -- vulkan_core.h:7280 function vkGetBufferDeviceAddressKHR (device : VkDevice; pInfo : access constant VkBufferDeviceAddressInfo) return VkDeviceAddress -- vulkan_core.h:7283 with Import => True, Convention => C, External_Name => "vkGetBufferDeviceAddressKHR"; function vkGetBufferOpaqueCaptureAddressKHR (device : VkDevice; pInfo : access constant VkBufferDeviceAddressInfo) return Interfaces.C.unsigned_long -- vulkan_core.h:7287 with Import => True, Convention => C, External_Name => "vkGetBufferOpaqueCaptureAddressKHR"; function vkGetDeviceMemoryOpaqueCaptureAddressKHR (device : VkDevice; pInfo : access constant VkDeviceMemoryOpaqueCaptureAddressInfo) return Interfaces.C.unsigned_long -- vulkan_core.h:7291 with Import => True, Convention => C, External_Name => "vkGetDeviceMemoryOpaqueCaptureAddressKHR"; subtype VkPipelineExecutableStatisticFormatKHR is unsigned; VK_PIPELINE_EXECUTABLE_STATISTIC_FORMAT_BOOL32_KHR : constant unsigned := 0; VK_PIPELINE_EXECUTABLE_STATISTIC_FORMAT_INT64_KHR : constant unsigned := 1; VK_PIPELINE_EXECUTABLE_STATISTIC_FORMAT_UINT64_KHR : constant unsigned := 2; VK_PIPELINE_EXECUTABLE_STATISTIC_FORMAT_FLOAT64_KHR : constant unsigned := 3; VK_PIPELINE_EXECUTABLE_STATISTIC_FORMAT_BEGIN_RANGE_KHR : constant unsigned := 0; VK_PIPELINE_EXECUTABLE_STATISTIC_FORMAT_END_RANGE_KHR : constant unsigned := 3; VK_PIPELINE_EXECUTABLE_STATISTIC_FORMAT_RANGE_SIZE_KHR : constant unsigned := 4; VK_PIPELINE_EXECUTABLE_STATISTIC_FORMAT_MAX_ENUM_KHR : constant unsigned := 2147483647; -- vulkan_core.h:7301 type VkPhysicalDevicePipelineExecutablePropertiesFeaturesKHR is record sType : aliased VkStructureType; -- vulkan_core.h:7312 pNext : System.Address; -- vulkan_core.h:7313 pipelineExecutableInfo : aliased VkBool32; -- vulkan_core.h:7314 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7311 type VkPipelineInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:7318 pNext : System.Address; -- vulkan_core.h:7319 pipeline : VkPipeline; -- vulkan_core.h:7320 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7317 subtype VkPipelineExecutablePropertiesKHR_array1342 is Interfaces.C.char_array (0 .. 255); type VkPipelineExecutablePropertiesKHR is record sType : aliased VkStructureType; -- vulkan_core.h:7324 pNext : System.Address; -- vulkan_core.h:7325 stages : aliased VkShaderStageFlags; -- vulkan_core.h:7326 name : aliased VkPipelineExecutablePropertiesKHR_array1342; -- vulkan_core.h:7327 description : aliased VkPipelineExecutablePropertiesKHR_array1342; -- vulkan_core.h:7328 subgroupSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7329 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7323 type VkPipelineExecutableInfoKHR is record sType : aliased VkStructureType; -- vulkan_core.h:7333 pNext : System.Address; -- vulkan_core.h:7334 pipeline : VkPipeline; -- vulkan_core.h:7335 executableIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7336 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7332 type VkPipelineExecutableStatisticValueKHR (discr : unsigned := 0) is record case discr is when 0 => b32 : aliased VkBool32; -- vulkan_core.h:7340 when 1 => i64 : aliased Interfaces.C.long; -- vulkan_core.h:7341 when 2 => u64 : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:7342 when others => f64 : aliased double; -- vulkan_core.h:7343 end case; end record with Convention => C_Pass_By_Copy, Unchecked_Union => True; -- vulkan_core.h:7339 subtype VkPipelineExecutableStatisticKHR_array1342 is Interfaces.C.char_array (0 .. 255); type VkPipelineExecutableStatisticKHR is record sType : aliased VkStructureType; -- vulkan_core.h:7347 pNext : System.Address; -- vulkan_core.h:7348 name : aliased VkPipelineExecutableStatisticKHR_array1342; -- vulkan_core.h:7349 description : aliased VkPipelineExecutableStatisticKHR_array1342; -- vulkan_core.h:7350 format : aliased VkPipelineExecutableStatisticFormatKHR; -- vulkan_core.h:7351 value : aliased VkPipelineExecutableStatisticValueKHR; -- vulkan_core.h:7352 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7346 subtype VkPipelineExecutableInternalRepresentationKHR_array1342 is Interfaces.C.char_array (0 .. 255); type VkPipelineExecutableInternalRepresentationKHR is record sType : aliased VkStructureType; -- vulkan_core.h:7356 pNext : System.Address; -- vulkan_core.h:7357 name : aliased VkPipelineExecutableInternalRepresentationKHR_array1342; -- vulkan_core.h:7358 description : aliased VkPipelineExecutableInternalRepresentationKHR_array1342; -- vulkan_core.h:7359 isText : aliased VkBool32; -- vulkan_core.h:7360 dataSize : aliased size_t; -- vulkan_core.h:7361 pData : System.Address; -- vulkan_core.h:7362 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7355 type PFN_vkGetPipelineExecutablePropertiesKHR is access function (arg1 : VkDevice; arg2 : access constant VkPipelineInfoKHR; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkPipelineExecutablePropertiesKHR) return VkResult with Convention => C; -- vulkan_core.h:7365 type PFN_vkGetPipelineExecutableStatisticsKHR is access function (arg1 : VkDevice; arg2 : access constant VkPipelineExecutableInfoKHR; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkPipelineExecutableStatisticKHR) return VkResult with Convention => C; -- vulkan_core.h:7366 type PFN_vkGetPipelineExecutableInternalRepresentationsKHR is access function (arg1 : VkDevice; arg2 : access constant VkPipelineExecutableInfoKHR; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkPipelineExecutableInternalRepresentationKHR) return VkResult with Convention => C; -- vulkan_core.h:7367 function vkGetPipelineExecutablePropertiesKHR (device : VkDevice; pPipelineInfo : access constant VkPipelineInfoKHR; pExecutableCount : access Interfaces.C.unsigned_short; pProperties : access VkPipelineExecutablePropertiesKHR) return VkResult -- vulkan_core.h:7370 with Import => True, Convention => C, External_Name => "vkGetPipelineExecutablePropertiesKHR"; function vkGetPipelineExecutableStatisticsKHR (device : VkDevice; pExecutableInfo : access constant VkPipelineExecutableInfoKHR; pStatisticCount : access Interfaces.C.unsigned_short; pStatistics : access VkPipelineExecutableStatisticKHR) return VkResult -- vulkan_core.h:7376 with Import => True, Convention => C, External_Name => "vkGetPipelineExecutableStatisticsKHR"; function vkGetPipelineExecutableInternalRepresentationsKHR (device : VkDevice; pExecutableInfo : access constant VkPipelineExecutableInfoKHR; pInternalRepresentationCount : access Interfaces.C.unsigned_short; pInternalRepresentations : access VkPipelineExecutableInternalRepresentationKHR) return VkResult -- vulkan_core.h:7382 with Import => True, Convention => C, External_Name => "vkGetPipelineExecutableInternalRepresentationsKHR"; type VkDebugReportCallbackEXT_T is null record; -- incomplete struct type VkDebugReportCallbackEXT is access all VkDebugReportCallbackEXT_T; -- vulkan_core.h:7391 subtype VkDebugReportObjectTypeEXT is unsigned; VK_DEBUG_REPORT_OBJECT_TYPE_UNKNOWN_EXT : constant unsigned := 0; VK_DEBUG_REPORT_OBJECT_TYPE_INSTANCE_EXT : constant unsigned := 1; VK_DEBUG_REPORT_OBJECT_TYPE_PHYSICAL_DEVICE_EXT : constant unsigned := 2; VK_DEBUG_REPORT_OBJECT_TYPE_DEVICE_EXT : constant unsigned := 3; VK_DEBUG_REPORT_OBJECT_TYPE_QUEUE_EXT : constant unsigned := 4; VK_DEBUG_REPORT_OBJECT_TYPE_SEMAPHORE_EXT : constant unsigned := 5; VK_DEBUG_REPORT_OBJECT_TYPE_COMMAND_BUFFER_EXT : constant unsigned := 6; VK_DEBUG_REPORT_OBJECT_TYPE_FENCE_EXT : constant unsigned := 7; VK_DEBUG_REPORT_OBJECT_TYPE_DEVICE_MEMORY_EXT : constant unsigned := 8; VK_DEBUG_REPORT_OBJECT_TYPE_BUFFER_EXT : constant unsigned := 9; VK_DEBUG_REPORT_OBJECT_TYPE_IMAGE_EXT : constant unsigned := 10; VK_DEBUG_REPORT_OBJECT_TYPE_EVENT_EXT : constant unsigned := 11; VK_DEBUG_REPORT_OBJECT_TYPE_QUERY_POOL_EXT : constant unsigned := 12; VK_DEBUG_REPORT_OBJECT_TYPE_BUFFER_VIEW_EXT : constant unsigned := 13; VK_DEBUG_REPORT_OBJECT_TYPE_IMAGE_VIEW_EXT : constant unsigned := 14; VK_DEBUG_REPORT_OBJECT_TYPE_SHADER_MODULE_EXT : constant unsigned := 15; VK_DEBUG_REPORT_OBJECT_TYPE_PIPELINE_CACHE_EXT : constant unsigned := 16; VK_DEBUG_REPORT_OBJECT_TYPE_PIPELINE_LAYOUT_EXT : constant unsigned := 17; VK_DEBUG_REPORT_OBJECT_TYPE_RENDER_PASS_EXT : constant unsigned := 18; VK_DEBUG_REPORT_OBJECT_TYPE_PIPELINE_EXT : constant unsigned := 19; VK_DEBUG_REPORT_OBJECT_TYPE_DESCRIPTOR_SET_LAYOUT_EXT : constant unsigned := 20; VK_DEBUG_REPORT_OBJECT_TYPE_SAMPLER_EXT : constant unsigned := 21; VK_DEBUG_REPORT_OBJECT_TYPE_DESCRIPTOR_POOL_EXT : constant unsigned := 22; VK_DEBUG_REPORT_OBJECT_TYPE_DESCRIPTOR_SET_EXT : constant unsigned := 23; VK_DEBUG_REPORT_OBJECT_TYPE_FRAMEBUFFER_EXT : constant unsigned := 24; VK_DEBUG_REPORT_OBJECT_TYPE_COMMAND_POOL_EXT : constant unsigned := 25; VK_DEBUG_REPORT_OBJECT_TYPE_SURFACE_KHR_EXT : constant unsigned := 26; VK_DEBUG_REPORT_OBJECT_TYPE_SWAPCHAIN_KHR_EXT : constant unsigned := 27; VK_DEBUG_REPORT_OBJECT_TYPE_DEBUG_REPORT_CALLBACK_EXT_EXT : constant unsigned := 28; VK_DEBUG_REPORT_OBJECT_TYPE_DISPLAY_KHR_EXT : constant unsigned := 29; VK_DEBUG_REPORT_OBJECT_TYPE_DISPLAY_MODE_KHR_EXT : constant unsigned := 30; VK_DEBUG_REPORT_OBJECT_TYPE_OBJECT_TABLE_NVX_EXT : constant unsigned := 31; VK_DEBUG_REPORT_OBJECT_TYPE_INDIRECT_COMMANDS_LAYOUT_NVX_EXT : constant unsigned := 32; VK_DEBUG_REPORT_OBJECT_TYPE_VALIDATION_CACHE_EXT_EXT : constant unsigned := 33; VK_DEBUG_REPORT_OBJECT_TYPE_SAMPLER_YCBCR_CONVERSION_EXT : constant unsigned := 1000156000; VK_DEBUG_REPORT_OBJECT_TYPE_DESCRIPTOR_UPDATE_TEMPLATE_EXT : constant unsigned := 1000085000; VK_DEBUG_REPORT_OBJECT_TYPE_ACCELERATION_STRUCTURE_NV_EXT : constant unsigned := 1000165000; VK_DEBUG_REPORT_OBJECT_TYPE_DEBUG_REPORT_EXT : constant unsigned := 28; VK_DEBUG_REPORT_OBJECT_TYPE_VALIDATION_CACHE_EXT : constant unsigned := 33; VK_DEBUG_REPORT_OBJECT_TYPE_DESCRIPTOR_UPDATE_TEMPLATE_KHR_EXT : constant unsigned := 1000085000; VK_DEBUG_REPORT_OBJECT_TYPE_SAMPLER_YCBCR_CONVERSION_KHR_EXT : constant unsigned := 1000156000; VK_DEBUG_REPORT_OBJECT_TYPE_BEGIN_RANGE_EXT : constant unsigned := 0; VK_DEBUG_REPORT_OBJECT_TYPE_END_RANGE_EXT : constant unsigned := 33; VK_DEBUG_REPORT_OBJECT_TYPE_RANGE_SIZE_EXT : constant unsigned := 34; VK_DEBUG_REPORT_OBJECT_TYPE_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:7395 subtype VkDebugReportFlagBitsEXT is unsigned; VK_DEBUG_REPORT_INFORMATION_BIT_EXT : constant unsigned := 1; VK_DEBUG_REPORT_WARNING_BIT_EXT : constant unsigned := 2; VK_DEBUG_REPORT_PERFORMANCE_WARNING_BIT_EXT : constant unsigned := 4; VK_DEBUG_REPORT_ERROR_BIT_EXT : constant unsigned := 8; VK_DEBUG_REPORT_DEBUG_BIT_EXT : constant unsigned := 16; VK_DEBUG_REPORT_FLAG_BITS_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:7443 subtype VkDebugReportFlagsEXT is VkFlags; -- vulkan_core.h:7451 type PFN_vkDebugReportCallbackEXT is access function (arg1 : VkDebugReportFlagsEXT; arg2 : VkDebugReportObjectTypeEXT; arg3 : Interfaces.C.unsigned_long; arg4 : size_t; arg5 : Interfaces.C.short; arg6 : Interfaces.C.Strings.chars_ptr; arg7 : Interfaces.C.Strings.chars_ptr; arg8 : System.Address) return VkBool32 with Convention => C; -- vulkan_core.h:7452 type VkDebugReportCallbackCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7463 pNext : System.Address; -- vulkan_core.h:7464 flags : aliased VkDebugReportFlagsEXT; -- vulkan_core.h:7465 pfnCallback : PFN_vkDebugReportCallbackEXT; -- vulkan_core.h:7466 pUserData : System.Address; -- vulkan_core.h:7467 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7462 type PFN_vkCreateDebugReportCallbackEXT is access function (arg1 : VkInstance; arg2 : access constant VkDebugReportCallbackCreateInfoEXT; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:7470 type PFN_vkDestroyDebugReportCallbackEXT is access procedure (arg1 : VkInstance; arg2 : VkDebugReportCallbackEXT; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:7471 type PFN_vkDebugReportMessageEXT is access procedure (arg1 : VkInstance; arg2 : VkDebugReportFlagsEXT; arg3 : VkDebugReportObjectTypeEXT; arg4 : Interfaces.C.unsigned_long; arg5 : size_t; arg6 : Interfaces.C.short; arg7 : Interfaces.C.Strings.chars_ptr; arg8 : Interfaces.C.Strings.chars_ptr) with Convention => C; -- vulkan_core.h:7472 function vkCreateDebugReportCallbackEXT (instance : VkInstance; pCreateInfo : access constant VkDebugReportCallbackCreateInfoEXT; pAllocator : access constant VkAllocationCallbacks; pCallback : System.Address) return VkResult -- vulkan_core.h:7475 with Import => True, Convention => C, External_Name => "vkCreateDebugReportCallbackEXT"; procedure vkDestroyDebugReportCallbackEXT (instance : VkInstance; callback : VkDebugReportCallbackEXT; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:7481 with Import => True, Convention => C, External_Name => "vkDestroyDebugReportCallbackEXT"; procedure vkDebugReportMessageEXT (instance : VkInstance; flags : VkDebugReportFlagsEXT; objectType : VkDebugReportObjectTypeEXT; object : Interfaces.C.unsigned_long; location : size_t; messageCode : Interfaces.C.short; pLayerPrefix : Interfaces.C.Strings.chars_ptr; pMessage : Interfaces.C.Strings.chars_ptr) -- vulkan_core.h:7486 with Import => True, Convention => C, External_Name => "vkDebugReportMessageEXT"; subtype VkRasterizationOrderAMD is unsigned; VK_RASTERIZATION_ORDER_STRICT_AMD : constant unsigned := 0; VK_RASTERIZATION_ORDER_RELAXED_AMD : constant unsigned := 1; VK_RASTERIZATION_ORDER_BEGIN_RANGE_AMD : constant unsigned := 0; VK_RASTERIZATION_ORDER_END_RANGE_AMD : constant unsigned := 1; VK_RASTERIZATION_ORDER_RANGE_SIZE_AMD : constant unsigned := 2; VK_RASTERIZATION_ORDER_MAX_ENUM_AMD : constant unsigned := 2147483647; -- vulkan_core.h:7517 type VkPipelineRasterizationStateRasterizationOrderAMD is record sType : aliased VkStructureType; -- vulkan_core.h:7526 pNext : System.Address; -- vulkan_core.h:7527 rasterizationOrder : aliased VkRasterizationOrderAMD; -- vulkan_core.h:7528 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7525 type VkDebugMarkerObjectNameInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7547 pNext : System.Address; -- vulkan_core.h:7548 objectType : aliased VkDebugReportObjectTypeEXT; -- vulkan_core.h:7549 object : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:7550 pObjectName : Interfaces.C.Strings.chars_ptr; -- vulkan_core.h:7551 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7546 type VkDebugMarkerObjectTagInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7555 pNext : System.Address; -- vulkan_core.h:7556 objectType : aliased VkDebugReportObjectTypeEXT; -- vulkan_core.h:7557 object : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:7558 tagName : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:7559 tagSize : aliased size_t; -- vulkan_core.h:7560 pTag : System.Address; -- vulkan_core.h:7561 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7554 type VkDebugMarkerMarkerInfoEXT_array1588 is array (0 .. 3) of aliased float; type VkDebugMarkerMarkerInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7565 pNext : System.Address; -- vulkan_core.h:7566 pMarkerName : Interfaces.C.Strings.chars_ptr; -- vulkan_core.h:7567 color : aliased VkDebugMarkerMarkerInfoEXT_array1588; -- vulkan_core.h:7568 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7564 type PFN_vkDebugMarkerSetObjectTagEXT is access function (arg1 : VkDevice; arg2 : access constant VkDebugMarkerObjectTagInfoEXT) return VkResult with Convention => C; -- vulkan_core.h:7571 type PFN_vkDebugMarkerSetObjectNameEXT is access function (arg1 : VkDevice; arg2 : access constant VkDebugMarkerObjectNameInfoEXT) return VkResult with Convention => C; -- vulkan_core.h:7572 type PFN_vkCmdDebugMarkerBeginEXT is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkDebugMarkerMarkerInfoEXT) with Convention => C; -- vulkan_core.h:7573 type PFN_vkCmdDebugMarkerEndEXT is access procedure (arg1 : VkCommandBuffer) with Convention => C; -- vulkan_core.h:7574 type PFN_vkCmdDebugMarkerInsertEXT is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkDebugMarkerMarkerInfoEXT) with Convention => C; -- vulkan_core.h:7575 function vkDebugMarkerSetObjectTagEXT (device : VkDevice; pTagInfo : access constant VkDebugMarkerObjectTagInfoEXT) return VkResult -- vulkan_core.h:7578 with Import => True, Convention => C, External_Name => "vkDebugMarkerSetObjectTagEXT"; function vkDebugMarkerSetObjectNameEXT (device : VkDevice; pNameInfo : access constant VkDebugMarkerObjectNameInfoEXT) return VkResult -- vulkan_core.h:7582 with Import => True, Convention => C, External_Name => "vkDebugMarkerSetObjectNameEXT"; procedure vkCmdDebugMarkerBeginEXT (commandBuffer : VkCommandBuffer; pMarkerInfo : access constant VkDebugMarkerMarkerInfoEXT) -- vulkan_core.h:7586 with Import => True, Convention => C, External_Name => "vkCmdDebugMarkerBeginEXT"; procedure vkCmdDebugMarkerEndEXT (commandBuffer : VkCommandBuffer) -- vulkan_core.h:7590 with Import => True, Convention => C, External_Name => "vkCmdDebugMarkerEndEXT"; procedure vkCmdDebugMarkerInsertEXT (commandBuffer : VkCommandBuffer; pMarkerInfo : access constant VkDebugMarkerMarkerInfoEXT) -- vulkan_core.h:7593 with Import => True, Convention => C, External_Name => "vkCmdDebugMarkerInsertEXT"; type VkDedicatedAllocationImageCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:7608 pNext : System.Address; -- vulkan_core.h:7609 dedicatedAllocation : aliased VkBool32; -- vulkan_core.h:7610 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7607 type VkDedicatedAllocationBufferCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:7614 pNext : System.Address; -- vulkan_core.h:7615 dedicatedAllocation : aliased VkBool32; -- vulkan_core.h:7616 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7613 type VkDedicatedAllocationMemoryAllocateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:7620 pNext : System.Address; -- vulkan_core.h:7621 image : VkImage; -- vulkan_core.h:7622 buffer : VkBuffer; -- vulkan_core.h:7623 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7619 subtype VkPipelineRasterizationStateStreamCreateFlagsEXT is VkFlags; -- vulkan_core.h:7631 type VkPhysicalDeviceTransformFeedbackFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7633 pNext : System.Address; -- vulkan_core.h:7634 transformFeedback : aliased VkBool32; -- vulkan_core.h:7635 geometryStreams : aliased VkBool32; -- vulkan_core.h:7636 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7632 type VkPhysicalDeviceTransformFeedbackPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7640 pNext : System.Address; -- vulkan_core.h:7641 maxTransformFeedbackStreams : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7642 maxTransformFeedbackBuffers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7643 maxTransformFeedbackBufferSize : aliased VkDeviceSize; -- vulkan_core.h:7644 maxTransformFeedbackStreamDataSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7645 maxTransformFeedbackBufferDataSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7646 maxTransformFeedbackBufferDataStride : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7647 transformFeedbackQueries : aliased VkBool32; -- vulkan_core.h:7648 transformFeedbackStreamsLinesTriangles : aliased VkBool32; -- vulkan_core.h:7649 transformFeedbackRasterizationStreamSelect : aliased VkBool32; -- vulkan_core.h:7650 transformFeedbackDraw : aliased VkBool32; -- vulkan_core.h:7651 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7639 type VkPipelineRasterizationStateStreamCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7655 pNext : System.Address; -- vulkan_core.h:7656 flags : aliased VkPipelineRasterizationStateStreamCreateFlagsEXT; -- vulkan_core.h:7657 rasterizationStream : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7658 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7654 type PFN_vkCmdBindTransformFeedbackBuffersEXT is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : System.Address; arg5 : access VkDeviceSize; arg6 : access VkDeviceSize) with Convention => C; -- vulkan_core.h:7661 type PFN_vkCmdBeginTransformFeedbackEXT is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : System.Address; arg5 : access VkDeviceSize) with Convention => C; -- vulkan_core.h:7662 type PFN_vkCmdEndTransformFeedbackEXT is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : System.Address; arg5 : access VkDeviceSize) with Convention => C; -- vulkan_core.h:7663 type PFN_vkCmdBeginQueryIndexedEXT is access procedure (arg1 : VkCommandBuffer; arg2 : VkQueryPool; arg3 : Interfaces.C.unsigned_short; arg4 : VkQueryControlFlags; arg5 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:7664 type PFN_vkCmdEndQueryIndexedEXT is access procedure (arg1 : VkCommandBuffer; arg2 : VkQueryPool; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:7665 type PFN_vkCmdDrawIndirectByteCountEXT is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : VkBuffer; arg5 : VkDeviceSize; arg6 : Interfaces.C.unsigned_short; arg7 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:7666 procedure vkCmdBindTransformFeedbackBuffersEXT (commandBuffer : VkCommandBuffer; firstBinding : Interfaces.C.unsigned_short; bindingCount : Interfaces.C.unsigned_short; pBuffers : System.Address; pOffsets : access VkDeviceSize; pSizes : access VkDeviceSize) -- vulkan_core.h:7669 with Import => True, Convention => C, External_Name => "vkCmdBindTransformFeedbackBuffersEXT"; procedure vkCmdBeginTransformFeedbackEXT (commandBuffer : VkCommandBuffer; firstCounterBuffer : Interfaces.C.unsigned_short; counterBufferCount : Interfaces.C.unsigned_short; pCounterBuffers : System.Address; pCounterBufferOffsets : access VkDeviceSize) -- vulkan_core.h:7677 with Import => True, Convention => C, External_Name => "vkCmdBeginTransformFeedbackEXT"; procedure vkCmdEndTransformFeedbackEXT (commandBuffer : VkCommandBuffer; firstCounterBuffer : Interfaces.C.unsigned_short; counterBufferCount : Interfaces.C.unsigned_short; pCounterBuffers : System.Address; pCounterBufferOffsets : access VkDeviceSize) -- vulkan_core.h:7684 with Import => True, Convention => C, External_Name => "vkCmdEndTransformFeedbackEXT"; procedure vkCmdBeginQueryIndexedEXT (commandBuffer : VkCommandBuffer; queryPool : VkQueryPool; query : Interfaces.C.unsigned_short; flags : VkQueryControlFlags; index : Interfaces.C.unsigned_short) -- vulkan_core.h:7691 with Import => True, Convention => C, External_Name => "vkCmdBeginQueryIndexedEXT"; procedure vkCmdEndQueryIndexedEXT (commandBuffer : VkCommandBuffer; queryPool : VkQueryPool; query : Interfaces.C.unsigned_short; index : Interfaces.C.unsigned_short) -- vulkan_core.h:7698 with Import => True, Convention => C, External_Name => "vkCmdEndQueryIndexedEXT"; procedure vkCmdDrawIndirectByteCountEXT (commandBuffer : VkCommandBuffer; instanceCount : Interfaces.C.unsigned_short; firstInstance : Interfaces.C.unsigned_short; counterBuffer : VkBuffer; counterBufferOffset : VkDeviceSize; counterOffset : Interfaces.C.unsigned_short; vertexStride : Interfaces.C.unsigned_short) -- vulkan_core.h:7704 with Import => True, Convention => C, External_Name => "vkCmdDrawIndirectByteCountEXT"; type VkImageViewHandleInfoNVX is record sType : aliased VkStructureType; -- vulkan_core.h:7719 pNext : System.Address; -- vulkan_core.h:7720 imageView : VkImageView; -- vulkan_core.h:7721 descriptorType : aliased VkDescriptorType; -- vulkan_core.h:7722 sampler : VkSampler; -- vulkan_core.h:7723 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7718 type PFN_vkGetImageViewHandleNVX is access function (arg1 : VkDevice; arg2 : access constant VkImageViewHandleInfoNVX) return Interfaces.C.unsigned_short with Convention => C; -- vulkan_core.h:7726 function vkGetImageViewHandleNVX (device : VkDevice; pInfo : access constant VkImageViewHandleInfoNVX) return Interfaces.C.unsigned_short -- vulkan_core.h:7729 with Import => True, Convention => C, External_Name => "vkGetImageViewHandleNVX"; type PFN_vkCmdDrawIndirectCountAMD is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : VkBuffer; arg5 : VkDeviceSize; arg6 : Interfaces.C.unsigned_short; arg7 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:7738 type PFN_vkCmdDrawIndexedIndirectCountAMD is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : VkBuffer; arg5 : VkDeviceSize; arg6 : Interfaces.C.unsigned_short; arg7 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:7739 procedure vkCmdDrawIndirectCountAMD (commandBuffer : VkCommandBuffer; buffer : VkBuffer; offset : VkDeviceSize; countBuffer : VkBuffer; countBufferOffset : VkDeviceSize; maxDrawCount : Interfaces.C.unsigned_short; stride : Interfaces.C.unsigned_short) -- vulkan_core.h:7742 with Import => True, Convention => C, External_Name => "vkCmdDrawIndirectCountAMD"; procedure vkCmdDrawIndexedIndirectCountAMD (commandBuffer : VkCommandBuffer; buffer : VkBuffer; offset : VkDeviceSize; countBuffer : VkBuffer; countBufferOffset : VkDeviceSize; maxDrawCount : Interfaces.C.unsigned_short; stride : Interfaces.C.unsigned_short) -- vulkan_core.h:7751 with Import => True, Convention => C, External_Name => "vkCmdDrawIndexedIndirectCountAMD"; type VkTextureLODGatherFormatPropertiesAMD is record sType : aliased VkStructureType; -- vulkan_core.h:7781 pNext : System.Address; -- vulkan_core.h:7782 supportsTextureGatherLODBiasAMD : aliased VkBool32; -- vulkan_core.h:7783 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7780 subtype VkShaderInfoTypeAMD is unsigned; VK_SHADER_INFO_TYPE_STATISTICS_AMD : constant unsigned := 0; VK_SHADER_INFO_TYPE_BINARY_AMD : constant unsigned := 1; VK_SHADER_INFO_TYPE_DISASSEMBLY_AMD : constant unsigned := 2; VK_SHADER_INFO_TYPE_BEGIN_RANGE_AMD : constant unsigned := 0; VK_SHADER_INFO_TYPE_END_RANGE_AMD : constant unsigned := 2; VK_SHADER_INFO_TYPE_RANGE_SIZE_AMD : constant unsigned := 3; VK_SHADER_INFO_TYPE_MAX_ENUM_AMD : constant unsigned := 2147483647; -- vulkan_core.h:7792 type VkShaderResourceUsageAMD is record numUsedVgprs : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7802 numUsedSgprs : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7803 ldsSizePerLocalWorkGroup : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7804 ldsUsageSizeInBytes : aliased size_t; -- vulkan_core.h:7805 scratchMemUsageInBytes : aliased size_t; -- vulkan_core.h:7806 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7801 type VkShaderStatisticsInfoAMD_array1331 is array (0 .. 2) of aliased Interfaces.C.unsigned_short; type VkShaderStatisticsInfoAMD is record shaderStageMask : aliased VkShaderStageFlags; -- vulkan_core.h:7810 resourceUsage : aliased VkShaderResourceUsageAMD; -- vulkan_core.h:7811 numPhysicalVgprs : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7812 numPhysicalSgprs : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7813 numAvailableVgprs : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7814 numAvailableSgprs : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7815 computeWorkGroupSize : aliased VkShaderStatisticsInfoAMD_array1331; -- vulkan_core.h:7816 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7809 type PFN_vkGetShaderInfoAMD is access function (arg1 : VkDevice; arg2 : VkPipeline; arg3 : VkShaderStageFlagBits; arg4 : VkShaderInfoTypeAMD; arg5 : access size_t; arg6 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:7819 function vkGetShaderInfoAMD (device : VkDevice; pipeline : VkPipeline; shaderStage : VkShaderStageFlagBits; infoType : VkShaderInfoTypeAMD; pInfoSize : access size_t; pInfo : System.Address) return VkResult -- vulkan_core.h:7822 with Import => True, Convention => C, External_Name => "vkGetShaderInfoAMD"; type VkPhysicalDeviceCornerSampledImageFeaturesNV is record sType : aliased VkStructureType; -- vulkan_core.h:7841 pNext : System.Address; -- vulkan_core.h:7842 cornerSampledImage : aliased VkBool32; -- vulkan_core.h:7843 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7840 subtype VkExternalMemoryHandleTypeFlagBitsNV is unsigned; VK_EXTERNAL_MEMORY_HANDLE_TYPE_OPAQUE_WIN32_BIT_NV : constant unsigned := 1; VK_EXTERNAL_MEMORY_HANDLE_TYPE_OPAQUE_WIN32_KMT_BIT_NV : constant unsigned := 2; VK_EXTERNAL_MEMORY_HANDLE_TYPE_D3D11_IMAGE_BIT_NV : constant unsigned := 4; VK_EXTERNAL_MEMORY_HANDLE_TYPE_D3D11_IMAGE_KMT_BIT_NV : constant unsigned := 8; VK_EXTERNAL_MEMORY_HANDLE_TYPE_FLAG_BITS_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:7857 subtype VkExternalMemoryHandleTypeFlagsNV is VkFlags; -- vulkan_core.h:7864 subtype VkExternalMemoryFeatureFlagBitsNV is unsigned; VK_EXTERNAL_MEMORY_FEATURE_DEDICATED_ONLY_BIT_NV : constant unsigned := 1; VK_EXTERNAL_MEMORY_FEATURE_EXPORTABLE_BIT_NV : constant unsigned := 2; VK_EXTERNAL_MEMORY_FEATURE_IMPORTABLE_BIT_NV : constant unsigned := 4; VK_EXTERNAL_MEMORY_FEATURE_FLAG_BITS_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:7866 subtype VkExternalMemoryFeatureFlagsNV is VkFlags; -- vulkan_core.h:7872 type VkExternalImageFormatPropertiesNV is record imageFormatProperties : aliased VkImageFormatProperties; -- vulkan_core.h:7874 externalMemoryFeatures : aliased VkExternalMemoryFeatureFlagsNV; -- vulkan_core.h:7875 exportFromImportedHandleTypes : aliased VkExternalMemoryHandleTypeFlagsNV; -- vulkan_core.h:7876 compatibleHandleTypes : aliased VkExternalMemoryHandleTypeFlagsNV; -- vulkan_core.h:7877 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7873 type PFN_vkGetPhysicalDeviceExternalImageFormatPropertiesNV is access function (arg1 : VkPhysicalDevice; arg2 : VkFormat; arg3 : VkImageType; arg4 : VkImageTiling; arg5 : VkImageUsageFlags; arg6 : VkImageCreateFlags; arg7 : VkExternalMemoryHandleTypeFlagsNV; arg8 : access VkExternalImageFormatPropertiesNV) return VkResult with Convention => C; -- vulkan_core.h:7880 function vkGetPhysicalDeviceExternalImageFormatPropertiesNV (physicalDevice : VkPhysicalDevice; format : VkFormat; c_type : VkImageType; tiling : VkImageTiling; usage : VkImageUsageFlags; flags : VkImageCreateFlags; externalHandleType : VkExternalMemoryHandleTypeFlagsNV; pExternalImageFormatProperties : access VkExternalImageFormatPropertiesNV) return VkResult -- vulkan_core.h:7883 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceExternalImageFormatPropertiesNV"; type VkExternalMemoryImageCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:7899 pNext : System.Address; -- vulkan_core.h:7900 handleTypes : aliased VkExternalMemoryHandleTypeFlagsNV; -- vulkan_core.h:7901 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7898 type VkExportMemoryAllocateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:7905 pNext : System.Address; -- vulkan_core.h:7906 handleTypes : aliased VkExternalMemoryHandleTypeFlagsNV; -- vulkan_core.h:7907 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7904 subtype VkValidationCheckEXT is unsigned; VK_VALIDATION_CHECK_ALL_EXT : constant unsigned := 0; VK_VALIDATION_CHECK_SHADERS_EXT : constant unsigned := 1; VK_VALIDATION_CHECK_BEGIN_RANGE_EXT : constant unsigned := 0; VK_VALIDATION_CHECK_END_RANGE_EXT : constant unsigned := 1; VK_VALIDATION_CHECK_RANGE_SIZE_EXT : constant unsigned := 2; VK_VALIDATION_CHECK_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:7916 type VkValidationFlagsEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7925 pNext : System.Address; -- vulkan_core.h:7926 disabledValidationCheckCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:7927 pDisabledValidationChecks : access VkValidationCheckEXT; -- vulkan_core.h:7928 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7924 type VkPhysicalDeviceTextureCompressionASTCHDRFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7947 pNext : System.Address; -- vulkan_core.h:7948 textureCompressionASTC_HDR : aliased VkBool32; -- vulkan_core.h:7949 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7946 type VkImageViewASTCDecodeModeEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7958 pNext : System.Address; -- vulkan_core.h:7959 decodeMode : aliased VkFormat; -- vulkan_core.h:7960 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7957 type VkPhysicalDeviceASTCDecodeFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7964 pNext : System.Address; -- vulkan_core.h:7965 decodeModeSharedExponent : aliased VkBool32; -- vulkan_core.h:7966 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7963 subtype VkConditionalRenderingFlagBitsEXT is unsigned; VK_CONDITIONAL_RENDERING_INVERTED_BIT_EXT : constant unsigned := 1; VK_CONDITIONAL_RENDERING_FLAG_BITS_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:7975 subtype VkConditionalRenderingFlagsEXT is VkFlags; -- vulkan_core.h:7979 type VkConditionalRenderingBeginInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7981 pNext : System.Address; -- vulkan_core.h:7982 buffer : VkBuffer; -- vulkan_core.h:7983 offset : aliased VkDeviceSize; -- vulkan_core.h:7984 flags : aliased VkConditionalRenderingFlagsEXT; -- vulkan_core.h:7985 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7980 type VkPhysicalDeviceConditionalRenderingFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7989 pNext : System.Address; -- vulkan_core.h:7990 conditionalRendering : aliased VkBool32; -- vulkan_core.h:7991 inheritedConditionalRendering : aliased VkBool32; -- vulkan_core.h:7992 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7988 type VkCommandBufferInheritanceConditionalRenderingInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:7996 pNext : System.Address; -- vulkan_core.h:7997 conditionalRenderingEnable : aliased VkBool32; -- vulkan_core.h:7998 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:7995 type PFN_vkCmdBeginConditionalRenderingEXT is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkConditionalRenderingBeginInfoEXT) with Convention => C; -- vulkan_core.h:8001 type PFN_vkCmdEndConditionalRenderingEXT is access procedure (arg1 : VkCommandBuffer) with Convention => C; -- vulkan_core.h:8002 procedure vkCmdBeginConditionalRenderingEXT (commandBuffer : VkCommandBuffer; pConditionalRenderingBegin : access constant VkConditionalRenderingBeginInfoEXT) -- vulkan_core.h:8005 with Import => True, Convention => C, External_Name => "vkCmdBeginConditionalRenderingEXT"; procedure vkCmdEndConditionalRenderingEXT (commandBuffer : VkCommandBuffer) -- vulkan_core.h:8009 with Import => True, Convention => C, External_Name => "vkCmdEndConditionalRenderingEXT"; type VkObjectTableNVX_T is null record; -- incomplete struct type VkObjectTableNVX is access all VkObjectTableNVX_T; -- vulkan_core.h:8015 type VkIndirectCommandsLayoutNVX_T is null record; -- incomplete struct type VkIndirectCommandsLayoutNVX is access all VkIndirectCommandsLayoutNVX_T; -- vulkan_core.h:8016 subtype VkIndirectCommandsTokenTypeNVX is unsigned; VK_INDIRECT_COMMANDS_TOKEN_TYPE_PIPELINE_NVX : constant unsigned := 0; VK_INDIRECT_COMMANDS_TOKEN_TYPE_DESCRIPTOR_SET_NVX : constant unsigned := 1; VK_INDIRECT_COMMANDS_TOKEN_TYPE_INDEX_BUFFER_NVX : constant unsigned := 2; VK_INDIRECT_COMMANDS_TOKEN_TYPE_VERTEX_BUFFER_NVX : constant unsigned := 3; VK_INDIRECT_COMMANDS_TOKEN_TYPE_PUSH_CONSTANT_NVX : constant unsigned := 4; VK_INDIRECT_COMMANDS_TOKEN_TYPE_DRAW_INDEXED_NVX : constant unsigned := 5; VK_INDIRECT_COMMANDS_TOKEN_TYPE_DRAW_NVX : constant unsigned := 6; VK_INDIRECT_COMMANDS_TOKEN_TYPE_DISPATCH_NVX : constant unsigned := 7; VK_INDIRECT_COMMANDS_TOKEN_TYPE_BEGIN_RANGE_NVX : constant unsigned := 0; VK_INDIRECT_COMMANDS_TOKEN_TYPE_END_RANGE_NVX : constant unsigned := 7; VK_INDIRECT_COMMANDS_TOKEN_TYPE_RANGE_SIZE_NVX : constant unsigned := 8; VK_INDIRECT_COMMANDS_TOKEN_TYPE_MAX_ENUM_NVX : constant unsigned := 2147483647; -- vulkan_core.h:8020 subtype VkObjectEntryTypeNVX is unsigned; VK_OBJECT_ENTRY_TYPE_DESCRIPTOR_SET_NVX : constant unsigned := 0; VK_OBJECT_ENTRY_TYPE_PIPELINE_NVX : constant unsigned := 1; VK_OBJECT_ENTRY_TYPE_INDEX_BUFFER_NVX : constant unsigned := 2; VK_OBJECT_ENTRY_TYPE_VERTEX_BUFFER_NVX : constant unsigned := 3; VK_OBJECT_ENTRY_TYPE_PUSH_CONSTANT_NVX : constant unsigned := 4; VK_OBJECT_ENTRY_TYPE_BEGIN_RANGE_NVX : constant unsigned := 0; VK_OBJECT_ENTRY_TYPE_END_RANGE_NVX : constant unsigned := 4; VK_OBJECT_ENTRY_TYPE_RANGE_SIZE_NVX : constant unsigned := 5; VK_OBJECT_ENTRY_TYPE_MAX_ENUM_NVX : constant unsigned := 2147483647; -- vulkan_core.h:8035 subtype VkIndirectCommandsLayoutUsageFlagBitsNVX is unsigned; VK_INDIRECT_COMMANDS_LAYOUT_USAGE_UNORDERED_SEQUENCES_BIT_NVX : constant unsigned := 1; VK_INDIRECT_COMMANDS_LAYOUT_USAGE_SPARSE_SEQUENCES_BIT_NVX : constant unsigned := 2; VK_INDIRECT_COMMANDS_LAYOUT_USAGE_EMPTY_EXECUTIONS_BIT_NVX : constant unsigned := 4; VK_INDIRECT_COMMANDS_LAYOUT_USAGE_INDEXED_SEQUENCES_BIT_NVX : constant unsigned := 8; VK_INDIRECT_COMMANDS_LAYOUT_USAGE_FLAG_BITS_MAX_ENUM_NVX : constant unsigned := 2147483647; -- vulkan_core.h:8047 subtype VkIndirectCommandsLayoutUsageFlagsNVX is VkFlags; -- vulkan_core.h:8054 subtype VkObjectEntryUsageFlagBitsNVX is unsigned; VK_OBJECT_ENTRY_USAGE_GRAPHICS_BIT_NVX : constant unsigned := 1; VK_OBJECT_ENTRY_USAGE_COMPUTE_BIT_NVX : constant unsigned := 2; VK_OBJECT_ENTRY_USAGE_FLAG_BITS_MAX_ENUM_NVX : constant unsigned := 2147483647; -- vulkan_core.h:8056 subtype VkObjectEntryUsageFlagsNVX is VkFlags; -- vulkan_core.h:8061 type VkDeviceGeneratedCommandsFeaturesNVX is record sType : aliased VkStructureType; -- vulkan_core.h:8063 pNext : System.Address; -- vulkan_core.h:8064 computeBindingPointSupport : aliased VkBool32; -- vulkan_core.h:8065 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8062 type VkDeviceGeneratedCommandsLimitsNVX is record sType : aliased VkStructureType; -- vulkan_core.h:8069 pNext : System.Address; -- vulkan_core.h:8070 maxIndirectCommandsLayoutTokenCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8071 maxObjectEntryCounts : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8072 minSequenceCountBufferOffsetAlignment : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8073 minSequenceIndexBufferOffsetAlignment : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8074 minCommandsTokenBufferOffsetAlignment : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8075 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8068 type VkIndirectCommandsTokenNVX is record tokenType : aliased VkIndirectCommandsTokenTypeNVX; -- vulkan_core.h:8079 buffer : VkBuffer; -- vulkan_core.h:8080 offset : aliased VkDeviceSize; -- vulkan_core.h:8081 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8078 type VkIndirectCommandsLayoutTokenNVX is record tokenType : aliased VkIndirectCommandsTokenTypeNVX; -- vulkan_core.h:8085 bindingUnit : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8086 dynamicCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8087 divisor : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8088 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8084 type VkIndirectCommandsLayoutCreateInfoNVX is record sType : aliased VkStructureType; -- vulkan_core.h:8092 pNext : System.Address; -- vulkan_core.h:8093 pipelineBindPoint : aliased VkPipelineBindPoint; -- vulkan_core.h:8094 flags : aliased VkIndirectCommandsLayoutUsageFlagsNVX; -- vulkan_core.h:8095 tokenCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8096 pTokens : access constant VkIndirectCommandsLayoutTokenNVX; -- vulkan_core.h:8097 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8091 type VkCmdProcessCommandsInfoNVX is record sType : aliased VkStructureType; -- vulkan_core.h:8101 pNext : System.Address; -- vulkan_core.h:8102 objectTable : VkObjectTableNVX; -- vulkan_core.h:8103 indirectCommandsLayout : VkIndirectCommandsLayoutNVX; -- vulkan_core.h:8104 indirectCommandsTokenCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8105 pIndirectCommandsTokens : access constant VkIndirectCommandsTokenNVX; -- vulkan_core.h:8106 maxSequencesCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8107 targetCommandBuffer : VkCommandBuffer; -- vulkan_core.h:8108 sequencesCountBuffer : VkBuffer; -- vulkan_core.h:8109 sequencesCountOffset : aliased VkDeviceSize; -- vulkan_core.h:8110 sequencesIndexBuffer : VkBuffer; -- vulkan_core.h:8111 sequencesIndexOffset : aliased VkDeviceSize; -- vulkan_core.h:8112 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8100 type VkCmdReserveSpaceForCommandsInfoNVX is record sType : aliased VkStructureType; -- vulkan_core.h:8116 pNext : System.Address; -- vulkan_core.h:8117 objectTable : VkObjectTableNVX; -- vulkan_core.h:8118 indirectCommandsLayout : VkIndirectCommandsLayoutNVX; -- vulkan_core.h:8119 maxSequencesCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8120 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8115 type VkObjectTableCreateInfoNVX is record sType : aliased VkStructureType; -- vulkan_core.h:8124 pNext : System.Address; -- vulkan_core.h:8125 objectCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8126 pObjectEntryTypes : access VkObjectEntryTypeNVX; -- vulkan_core.h:8127 pObjectEntryCounts : access Interfaces.C.unsigned_short; -- vulkan_core.h:8128 pObjectEntryUsageFlags : access VkObjectEntryUsageFlagsNVX; -- vulkan_core.h:8129 maxUniformBuffersPerDescriptor : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8130 maxStorageBuffersPerDescriptor : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8131 maxStorageImagesPerDescriptor : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8132 maxSampledImagesPerDescriptor : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8133 maxPipelineLayouts : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8134 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8123 type VkObjectTableEntryNVX is record c_type : aliased VkObjectEntryTypeNVX; -- vulkan_core.h:8138 flags : aliased VkObjectEntryUsageFlagsNVX; -- vulkan_core.h:8139 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8137 type VkObjectTablePipelineEntryNVX is record c_type : aliased VkObjectEntryTypeNVX; -- vulkan_core.h:8143 flags : aliased VkObjectEntryUsageFlagsNVX; -- vulkan_core.h:8144 pipeline : VkPipeline; -- vulkan_core.h:8145 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8142 type VkObjectTableDescriptorSetEntryNVX is record c_type : aliased VkObjectEntryTypeNVX; -- vulkan_core.h:8149 flags : aliased VkObjectEntryUsageFlagsNVX; -- vulkan_core.h:8150 pipelineLayout : VkPipelineLayout; -- vulkan_core.h:8151 descriptorSet : VkDescriptorSet; -- vulkan_core.h:8152 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8148 type VkObjectTableVertexBufferEntryNVX is record c_type : aliased VkObjectEntryTypeNVX; -- vulkan_core.h:8156 flags : aliased VkObjectEntryUsageFlagsNVX; -- vulkan_core.h:8157 buffer : VkBuffer; -- vulkan_core.h:8158 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8155 type VkObjectTableIndexBufferEntryNVX is record c_type : aliased VkObjectEntryTypeNVX; -- vulkan_core.h:8162 flags : aliased VkObjectEntryUsageFlagsNVX; -- vulkan_core.h:8163 buffer : VkBuffer; -- vulkan_core.h:8164 indexType : aliased VkIndexType; -- vulkan_core.h:8165 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8161 type VkObjectTablePushConstantEntryNVX is record c_type : aliased VkObjectEntryTypeNVX; -- vulkan_core.h:8169 flags : aliased VkObjectEntryUsageFlagsNVX; -- vulkan_core.h:8170 pipelineLayout : VkPipelineLayout; -- vulkan_core.h:8171 stageFlags : aliased VkShaderStageFlags; -- vulkan_core.h:8172 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8168 type PFN_vkCmdProcessCommandsNVX is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkCmdProcessCommandsInfoNVX) with Convention => C; -- vulkan_core.h:8175 type PFN_vkCmdReserveSpaceForCommandsNVX is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkCmdReserveSpaceForCommandsInfoNVX) with Convention => C; -- vulkan_core.h:8176 type PFN_vkCreateIndirectCommandsLayoutNVX is access function (arg1 : VkDevice; arg2 : access constant VkIndirectCommandsLayoutCreateInfoNVX; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:8177 type PFN_vkDestroyIndirectCommandsLayoutNVX is access procedure (arg1 : VkDevice; arg2 : VkIndirectCommandsLayoutNVX; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:8178 type PFN_vkCreateObjectTableNVX is access function (arg1 : VkDevice; arg2 : access constant VkObjectTableCreateInfoNVX; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:8179 type PFN_vkDestroyObjectTableNVX is access procedure (arg1 : VkDevice; arg2 : VkObjectTableNVX; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:8180 type PFN_vkRegisterObjectsNVX is access function (arg1 : VkDevice; arg2 : VkObjectTableNVX; arg3 : Interfaces.C.unsigned_short; arg4 : System.Address; arg5 : access Interfaces.C.unsigned_short) return VkResult with Convention => C; -- vulkan_core.h:8181 type PFN_vkUnregisterObjectsNVX is access function (arg1 : VkDevice; arg2 : VkObjectTableNVX; arg3 : Interfaces.C.unsigned_short; arg4 : access VkObjectEntryTypeNVX; arg5 : access Interfaces.C.unsigned_short) return VkResult with Convention => C; -- vulkan_core.h:8182 type PFN_vkGetPhysicalDeviceGeneratedCommandsPropertiesNVX is access procedure (arg1 : VkPhysicalDevice; arg2 : access VkDeviceGeneratedCommandsFeaturesNVX; arg3 : access VkDeviceGeneratedCommandsLimitsNVX) with Convention => C; -- vulkan_core.h:8183 procedure vkCmdProcessCommandsNVX (commandBuffer : VkCommandBuffer; pProcessCommandsInfo : access constant VkCmdProcessCommandsInfoNVX) -- vulkan_core.h:8186 with Import => True, Convention => C, External_Name => "vkCmdProcessCommandsNVX"; procedure vkCmdReserveSpaceForCommandsNVX (commandBuffer : VkCommandBuffer; pReserveSpaceInfo : access constant VkCmdReserveSpaceForCommandsInfoNVX) -- vulkan_core.h:8190 with Import => True, Convention => C, External_Name => "vkCmdReserveSpaceForCommandsNVX"; function vkCreateIndirectCommandsLayoutNVX (device : VkDevice; pCreateInfo : access constant VkIndirectCommandsLayoutCreateInfoNVX; pAllocator : access constant VkAllocationCallbacks; pIndirectCommandsLayout : System.Address) return VkResult -- vulkan_core.h:8194 with Import => True, Convention => C, External_Name => "vkCreateIndirectCommandsLayoutNVX"; procedure vkDestroyIndirectCommandsLayoutNVX (device : VkDevice; indirectCommandsLayout : VkIndirectCommandsLayoutNVX; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:8200 with Import => True, Convention => C, External_Name => "vkDestroyIndirectCommandsLayoutNVX"; function vkCreateObjectTableNVX (device : VkDevice; pCreateInfo : access constant VkObjectTableCreateInfoNVX; pAllocator : access constant VkAllocationCallbacks; pObjectTable : System.Address) return VkResult -- vulkan_core.h:8205 with Import => True, Convention => C, External_Name => "vkCreateObjectTableNVX"; procedure vkDestroyObjectTableNVX (device : VkDevice; objectTable : VkObjectTableNVX; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:8211 with Import => True, Convention => C, External_Name => "vkDestroyObjectTableNVX"; function vkRegisterObjectsNVX (device : VkDevice; objectTable : VkObjectTableNVX; objectCount : Interfaces.C.unsigned_short; ppObjectTableEntries : System.Address; pObjectIndices : access Interfaces.C.unsigned_short) return VkResult -- vulkan_core.h:8216 with Import => True, Convention => C, External_Name => "vkRegisterObjectsNVX"; function vkUnregisterObjectsNVX (device : VkDevice; objectTable : VkObjectTableNVX; objectCount : Interfaces.C.unsigned_short; pObjectEntryTypes : access VkObjectEntryTypeNVX; pObjectIndices : access Interfaces.C.unsigned_short) return VkResult -- vulkan_core.h:8223 with Import => True, Convention => C, External_Name => "vkUnregisterObjectsNVX"; procedure vkGetPhysicalDeviceGeneratedCommandsPropertiesNVX (physicalDevice : VkPhysicalDevice; pFeatures : access VkDeviceGeneratedCommandsFeaturesNVX; pLimits : access VkDeviceGeneratedCommandsLimitsNVX) -- vulkan_core.h:8230 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceGeneratedCommandsPropertiesNVX"; type VkViewportWScalingNV is record xcoeff : aliased float; -- vulkan_core.h:8241 ycoeff : aliased float; -- vulkan_core.h:8242 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8240 type VkPipelineViewportWScalingStateCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:8246 pNext : System.Address; -- vulkan_core.h:8247 viewportWScalingEnable : aliased VkBool32; -- vulkan_core.h:8248 viewportCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8249 pViewportWScalings : access constant VkViewportWScalingNV; -- vulkan_core.h:8250 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8245 type PFN_vkCmdSetViewportWScalingNV is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : access constant VkViewportWScalingNV) with Convention => C; -- vulkan_core.h:8253 procedure vkCmdSetViewportWScalingNV (commandBuffer : VkCommandBuffer; firstViewport : Interfaces.C.unsigned_short; viewportCount : Interfaces.C.unsigned_short; pViewportWScalings : access constant VkViewportWScalingNV) -- vulkan_core.h:8256 with Import => True, Convention => C, External_Name => "vkCmdSetViewportWScalingNV"; type PFN_vkReleaseDisplayEXT is access function (arg1 : VkPhysicalDevice; arg2 : VkDisplayKHR) return VkResult with Convention => C; -- vulkan_core.h:8267 function vkReleaseDisplayEXT (physicalDevice : VkPhysicalDevice; display : VkDisplayKHR) return VkResult -- vulkan_core.h:8270 with Import => True, Convention => C, External_Name => "vkReleaseDisplayEXT"; subtype VkSurfaceCounterFlagBitsEXT is unsigned; VK_SURFACE_COUNTER_VBLANK_EXT : constant unsigned := 1; VK_SURFACE_COUNTER_FLAG_BITS_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:8280 subtype VkSurfaceCounterFlagsEXT is VkFlags; -- vulkan_core.h:8284 type VkSurfaceCapabilities2EXT is record sType : aliased VkStructureType; -- vulkan_core.h:8286 pNext : System.Address; -- vulkan_core.h:8287 minImageCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8288 maxImageCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8289 currentExtent : aliased VkExtent2D; -- vulkan_core.h:8290 minImageExtent : aliased VkExtent2D; -- vulkan_core.h:8291 maxImageExtent : aliased VkExtent2D; -- vulkan_core.h:8292 maxImageArrayLayers : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8293 supportedTransforms : aliased VkSurfaceTransformFlagsKHR; -- vulkan_core.h:8294 currentTransform : aliased VkSurfaceTransformFlagBitsKHR; -- vulkan_core.h:8295 supportedCompositeAlpha : aliased VkCompositeAlphaFlagsKHR; -- vulkan_core.h:8296 supportedUsageFlags : aliased VkImageUsageFlags; -- vulkan_core.h:8297 supportedSurfaceCounters : aliased VkSurfaceCounterFlagsEXT; -- vulkan_core.h:8298 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8285 type PFN_vkGetPhysicalDeviceSurfaceCapabilities2EXT is access function (arg1 : VkPhysicalDevice; arg2 : VkSurfaceKHR; arg3 : access VkSurfaceCapabilities2EXT) return VkResult with Convention => C; -- vulkan_core.h:8301 function vkGetPhysicalDeviceSurfaceCapabilities2EXT (physicalDevice : VkPhysicalDevice; surface : VkSurfaceKHR; pSurfaceCapabilities : access VkSurfaceCapabilities2EXT) return VkResult -- vulkan_core.h:8304 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceSurfaceCapabilities2EXT"; subtype VkDisplayPowerStateEXT is unsigned; VK_DISPLAY_POWER_STATE_OFF_EXT : constant unsigned := 0; VK_DISPLAY_POWER_STATE_SUSPEND_EXT : constant unsigned := 1; VK_DISPLAY_POWER_STATE_ON_EXT : constant unsigned := 2; VK_DISPLAY_POWER_STATE_BEGIN_RANGE_EXT : constant unsigned := 0; VK_DISPLAY_POWER_STATE_END_RANGE_EXT : constant unsigned := 2; VK_DISPLAY_POWER_STATE_RANGE_SIZE_EXT : constant unsigned := 3; VK_DISPLAY_POWER_STATE_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:8315 subtype VkDeviceEventTypeEXT is unsigned; VK_DEVICE_EVENT_TYPE_DISPLAY_HOTPLUG_EXT : constant unsigned := 0; VK_DEVICE_EVENT_TYPE_BEGIN_RANGE_EXT : constant unsigned := 0; VK_DEVICE_EVENT_TYPE_END_RANGE_EXT : constant unsigned := 0; VK_DEVICE_EVENT_TYPE_RANGE_SIZE_EXT : constant unsigned := 1; VK_DEVICE_EVENT_TYPE_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:8325 subtype VkDisplayEventTypeEXT is unsigned; VK_DISPLAY_EVENT_TYPE_FIRST_PIXEL_OUT_EXT : constant unsigned := 0; VK_DISPLAY_EVENT_TYPE_BEGIN_RANGE_EXT : constant unsigned := 0; VK_DISPLAY_EVENT_TYPE_END_RANGE_EXT : constant unsigned := 0; VK_DISPLAY_EVENT_TYPE_RANGE_SIZE_EXT : constant unsigned := 1; VK_DISPLAY_EVENT_TYPE_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:8333 type VkDisplayPowerInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8341 pNext : System.Address; -- vulkan_core.h:8342 powerState : aliased VkDisplayPowerStateEXT; -- vulkan_core.h:8343 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8340 type VkDeviceEventInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8347 pNext : System.Address; -- vulkan_core.h:8348 deviceEvent : aliased VkDeviceEventTypeEXT; -- vulkan_core.h:8349 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8346 type VkDisplayEventInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8353 pNext : System.Address; -- vulkan_core.h:8354 displayEvent : aliased VkDisplayEventTypeEXT; -- vulkan_core.h:8355 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8352 type VkSwapchainCounterCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8359 pNext : System.Address; -- vulkan_core.h:8360 surfaceCounters : aliased VkSurfaceCounterFlagsEXT; -- vulkan_core.h:8361 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8358 type PFN_vkDisplayPowerControlEXT is access function (arg1 : VkDevice; arg2 : VkDisplayKHR; arg3 : access constant VkDisplayPowerInfoEXT) return VkResult with Convention => C; -- vulkan_core.h:8364 type PFN_vkRegisterDeviceEventEXT is access function (arg1 : VkDevice; arg2 : access constant VkDeviceEventInfoEXT; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:8365 type PFN_vkRegisterDisplayEventEXT is access function (arg1 : VkDevice; arg2 : VkDisplayKHR; arg3 : access constant VkDisplayEventInfoEXT; arg4 : access constant VkAllocationCallbacks; arg5 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:8366 type PFN_vkGetSwapchainCounterEXT is access function (arg1 : VkDevice; arg2 : VkSwapchainKHR; arg3 : VkSurfaceCounterFlagBitsEXT; arg4 : access Interfaces.C.unsigned_long) return VkResult with Convention => C; -- vulkan_core.h:8367 function vkDisplayPowerControlEXT (device : VkDevice; display : VkDisplayKHR; pDisplayPowerInfo : access constant VkDisplayPowerInfoEXT) return VkResult -- vulkan_core.h:8370 with Import => True, Convention => C, External_Name => "vkDisplayPowerControlEXT"; function vkRegisterDeviceEventEXT (device : VkDevice; pDeviceEventInfo : access constant VkDeviceEventInfoEXT; pAllocator : access constant VkAllocationCallbacks; pFence : System.Address) return VkResult -- vulkan_core.h:8375 with Import => True, Convention => C, External_Name => "vkRegisterDeviceEventEXT"; function vkRegisterDisplayEventEXT (device : VkDevice; display : VkDisplayKHR; pDisplayEventInfo : access constant VkDisplayEventInfoEXT; pAllocator : access constant VkAllocationCallbacks; pFence : System.Address) return VkResult -- vulkan_core.h:8381 with Import => True, Convention => C, External_Name => "vkRegisterDisplayEventEXT"; function vkGetSwapchainCounterEXT (device : VkDevice; swapchain : VkSwapchainKHR; counter : VkSurfaceCounterFlagBitsEXT; pCounterValue : access Interfaces.C.unsigned_long) return VkResult -- vulkan_core.h:8388 with Import => True, Convention => C, External_Name => "vkGetSwapchainCounterEXT"; type VkRefreshCycleDurationGOOGLE is record refreshDuration : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:8400 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8399 type VkPastPresentationTimingGOOGLE is record presentID : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8404 desiredPresentTime : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:8405 actualPresentTime : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:8406 earliestPresentTime : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:8407 presentMargin : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:8408 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8403 type VkPresentTimeGOOGLE is record presentID : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8412 desiredPresentTime : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:8413 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8411 type VkPresentTimesInfoGOOGLE is record sType : aliased VkStructureType; -- vulkan_core.h:8417 pNext : System.Address; -- vulkan_core.h:8418 swapchainCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8419 pTimes : access constant VkPresentTimeGOOGLE; -- vulkan_core.h:8420 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8416 type PFN_vkGetRefreshCycleDurationGOOGLE is access function (arg1 : VkDevice; arg2 : VkSwapchainKHR; arg3 : access VkRefreshCycleDurationGOOGLE) return VkResult with Convention => C; -- vulkan_core.h:8423 type PFN_vkGetPastPresentationTimingGOOGLE is access function (arg1 : VkDevice; arg2 : VkSwapchainKHR; arg3 : access Interfaces.C.unsigned_short; arg4 : access VkPastPresentationTimingGOOGLE) return VkResult with Convention => C; -- vulkan_core.h:8424 function vkGetRefreshCycleDurationGOOGLE (device : VkDevice; swapchain : VkSwapchainKHR; pDisplayTimingProperties : access VkRefreshCycleDurationGOOGLE) return VkResult -- vulkan_core.h:8427 with Import => True, Convention => C, External_Name => "vkGetRefreshCycleDurationGOOGLE"; function vkGetPastPresentationTimingGOOGLE (device : VkDevice; swapchain : VkSwapchainKHR; pPresentationTimingCount : access Interfaces.C.unsigned_short; pPresentationTimings : access VkPastPresentationTimingGOOGLE) return VkResult -- vulkan_core.h:8432 with Import => True, Convention => C, External_Name => "vkGetPastPresentationTimingGOOGLE"; type VkPhysicalDeviceMultiviewPerViewAttributesPropertiesNVX is record sType : aliased VkStructureType; -- vulkan_core.h:8459 pNext : System.Address; -- vulkan_core.h:8460 perViewPositionAllComponents : aliased VkBool32; -- vulkan_core.h:8461 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8458 subtype VkViewportCoordinateSwizzleNV is unsigned; VK_VIEWPORT_COORDINATE_SWIZZLE_POSITIVE_X_NV : constant unsigned := 0; VK_VIEWPORT_COORDINATE_SWIZZLE_NEGATIVE_X_NV : constant unsigned := 1; VK_VIEWPORT_COORDINATE_SWIZZLE_POSITIVE_Y_NV : constant unsigned := 2; VK_VIEWPORT_COORDINATE_SWIZZLE_NEGATIVE_Y_NV : constant unsigned := 3; VK_VIEWPORT_COORDINATE_SWIZZLE_POSITIVE_Z_NV : constant unsigned := 4; VK_VIEWPORT_COORDINATE_SWIZZLE_NEGATIVE_Z_NV : constant unsigned := 5; VK_VIEWPORT_COORDINATE_SWIZZLE_POSITIVE_W_NV : constant unsigned := 6; VK_VIEWPORT_COORDINATE_SWIZZLE_NEGATIVE_W_NV : constant unsigned := 7; VK_VIEWPORT_COORDINATE_SWIZZLE_BEGIN_RANGE_NV : constant unsigned := 0; VK_VIEWPORT_COORDINATE_SWIZZLE_END_RANGE_NV : constant unsigned := 7; VK_VIEWPORT_COORDINATE_SWIZZLE_RANGE_SIZE_NV : constant unsigned := 8; VK_VIEWPORT_COORDINATE_SWIZZLE_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:8470 subtype VkPipelineViewportSwizzleStateCreateFlagsNV is VkFlags; -- vulkan_core.h:8484 type VkViewportSwizzleNV is record x : aliased VkViewportCoordinateSwizzleNV; -- vulkan_core.h:8486 y : aliased VkViewportCoordinateSwizzleNV; -- vulkan_core.h:8487 z : aliased VkViewportCoordinateSwizzleNV; -- vulkan_core.h:8488 w : aliased VkViewportCoordinateSwizzleNV; -- vulkan_core.h:8489 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8485 type VkPipelineViewportSwizzleStateCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:8493 pNext : System.Address; -- vulkan_core.h:8494 flags : aliased VkPipelineViewportSwizzleStateCreateFlagsNV; -- vulkan_core.h:8495 viewportCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8496 pViewportSwizzles : access constant VkViewportSwizzleNV; -- vulkan_core.h:8497 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8492 subtype VkDiscardRectangleModeEXT is unsigned; VK_DISCARD_RECTANGLE_MODE_INCLUSIVE_EXT : constant unsigned := 0; VK_DISCARD_RECTANGLE_MODE_EXCLUSIVE_EXT : constant unsigned := 1; VK_DISCARD_RECTANGLE_MODE_BEGIN_RANGE_EXT : constant unsigned := 0; VK_DISCARD_RECTANGLE_MODE_END_RANGE_EXT : constant unsigned := 1; VK_DISCARD_RECTANGLE_MODE_RANGE_SIZE_EXT : constant unsigned := 2; VK_DISCARD_RECTANGLE_MODE_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:8506 subtype VkPipelineDiscardRectangleStateCreateFlagsEXT is VkFlags; -- vulkan_core.h:8514 type VkPhysicalDeviceDiscardRectanglePropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8516 pNext : System.Address; -- vulkan_core.h:8517 maxDiscardRectangles : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8518 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8515 type VkPipelineDiscardRectangleStateCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8522 pNext : System.Address; -- vulkan_core.h:8523 flags : aliased VkPipelineDiscardRectangleStateCreateFlagsEXT; -- vulkan_core.h:8524 discardRectangleMode : aliased VkDiscardRectangleModeEXT; -- vulkan_core.h:8525 discardRectangleCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8526 pDiscardRectangles : access constant VkRect2D; -- vulkan_core.h:8527 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8521 type PFN_vkCmdSetDiscardRectangleEXT is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : access constant VkRect2D) with Convention => C; -- vulkan_core.h:8530 procedure vkCmdSetDiscardRectangleEXT (commandBuffer : VkCommandBuffer; firstDiscardRectangle : Interfaces.C.unsigned_short; discardRectangleCount : Interfaces.C.unsigned_short; pDiscardRectangles : access constant VkRect2D) -- vulkan_core.h:8533 with Import => True, Convention => C, External_Name => "vkCmdSetDiscardRectangleEXT"; subtype VkConservativeRasterizationModeEXT is unsigned; VK_CONSERVATIVE_RASTERIZATION_MODE_DISABLED_EXT : constant unsigned := 0; VK_CONSERVATIVE_RASTERIZATION_MODE_OVERESTIMATE_EXT : constant unsigned := 1; VK_CONSERVATIVE_RASTERIZATION_MODE_UNDERESTIMATE_EXT : constant unsigned := 2; VK_CONSERVATIVE_RASTERIZATION_MODE_BEGIN_RANGE_EXT : constant unsigned := 0; VK_CONSERVATIVE_RASTERIZATION_MODE_END_RANGE_EXT : constant unsigned := 2; VK_CONSERVATIVE_RASTERIZATION_MODE_RANGE_SIZE_EXT : constant unsigned := 3; VK_CONSERVATIVE_RASTERIZATION_MODE_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:8545 subtype VkPipelineRasterizationConservativeStateCreateFlagsEXT is VkFlags; -- vulkan_core.h:8554 type VkPhysicalDeviceConservativeRasterizationPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8556 pNext : System.Address; -- vulkan_core.h:8557 primitiveOverestimationSize : aliased float; -- vulkan_core.h:8558 maxExtraPrimitiveOverestimationSize : aliased float; -- vulkan_core.h:8559 extraPrimitiveOverestimationSizeGranularity : aliased float; -- vulkan_core.h:8560 primitiveUnderestimation : aliased VkBool32; -- vulkan_core.h:8561 conservativePointAndLineRasterization : aliased VkBool32; -- vulkan_core.h:8562 degenerateTrianglesRasterized : aliased VkBool32; -- vulkan_core.h:8563 degenerateLinesRasterized : aliased VkBool32; -- vulkan_core.h:8564 fullyCoveredFragmentShaderInputVariable : aliased VkBool32; -- vulkan_core.h:8565 conservativeRasterizationPostDepthCoverage : aliased VkBool32; -- vulkan_core.h:8566 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8555 type VkPipelineRasterizationConservativeStateCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8570 pNext : System.Address; -- vulkan_core.h:8571 flags : aliased VkPipelineRasterizationConservativeStateCreateFlagsEXT; -- vulkan_core.h:8572 conservativeRasterizationMode : aliased VkConservativeRasterizationModeEXT; -- vulkan_core.h:8573 extraPrimitiveOverestimationSize : aliased float; -- vulkan_core.h:8574 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8569 subtype VkPipelineRasterizationDepthClipStateCreateFlagsEXT is VkFlags; -- vulkan_core.h:8582 type VkPhysicalDeviceDepthClipEnableFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8584 pNext : System.Address; -- vulkan_core.h:8585 depthClipEnable : aliased VkBool32; -- vulkan_core.h:8586 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8583 type VkPipelineRasterizationDepthClipStateCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8590 pNext : System.Address; -- vulkan_core.h:8591 flags : aliased VkPipelineRasterizationDepthClipStateCreateFlagsEXT; -- vulkan_core.h:8592 depthClipEnable : aliased VkBool32; -- vulkan_core.h:8593 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8589 type VkXYColorEXT is record x : aliased float; -- vulkan_core.h:8607 y : aliased float; -- vulkan_core.h:8608 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8606 type VkHdrMetadataEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8612 pNext : System.Address; -- vulkan_core.h:8613 displayPrimaryRed : aliased VkXYColorEXT; -- vulkan_core.h:8614 displayPrimaryGreen : aliased VkXYColorEXT; -- vulkan_core.h:8615 displayPrimaryBlue : aliased VkXYColorEXT; -- vulkan_core.h:8616 whitePoint : aliased VkXYColorEXT; -- vulkan_core.h:8617 maxLuminance : aliased float; -- vulkan_core.h:8618 minLuminance : aliased float; -- vulkan_core.h:8619 maxContentLightLevel : aliased float; -- vulkan_core.h:8620 maxFrameAverageLightLevel : aliased float; -- vulkan_core.h:8621 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8611 type PFN_vkSetHdrMetadataEXT is access procedure (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : System.Address; arg4 : access constant VkHdrMetadataEXT) with Convention => C; -- vulkan_core.h:8624 procedure vkSetHdrMetadataEXT (device : VkDevice; swapchainCount : Interfaces.C.unsigned_short; pSwapchains : System.Address; pMetadata : access constant VkHdrMetadataEXT) -- vulkan_core.h:8627 with Import => True, Convention => C, External_Name => "vkSetHdrMetadataEXT"; type VkDebugUtilsMessengerEXT_T is null record; -- incomplete struct type VkDebugUtilsMessengerEXT is access all VkDebugUtilsMessengerEXT_T; -- vulkan_core.h:8647 subtype VkDebugUtilsMessengerCallbackDataFlagsEXT is VkFlags; -- vulkan_core.h:8650 subtype VkDebugUtilsMessengerCreateFlagsEXT is VkFlags; -- vulkan_core.h:8651 subtype VkDebugUtilsMessageSeverityFlagBitsEXT is unsigned; VK_DEBUG_UTILS_MESSAGE_SEVERITY_VERBOSE_BIT_EXT : constant unsigned := 1; VK_DEBUG_UTILS_MESSAGE_SEVERITY_INFO_BIT_EXT : constant unsigned := 16; VK_DEBUG_UTILS_MESSAGE_SEVERITY_WARNING_BIT_EXT : constant unsigned := 256; VK_DEBUG_UTILS_MESSAGE_SEVERITY_ERROR_BIT_EXT : constant unsigned := 4096; VK_DEBUG_UTILS_MESSAGE_SEVERITY_FLAG_BITS_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:8653 subtype VkDebugUtilsMessageSeverityFlagsEXT is VkFlags; -- vulkan_core.h:8660 subtype VkDebugUtilsMessageTypeFlagBitsEXT is unsigned; VK_DEBUG_UTILS_MESSAGE_TYPE_GENERAL_BIT_EXT : constant unsigned := 1; VK_DEBUG_UTILS_MESSAGE_TYPE_VALIDATION_BIT_EXT : constant unsigned := 2; VK_DEBUG_UTILS_MESSAGE_TYPE_PERFORMANCE_BIT_EXT : constant unsigned := 4; VK_DEBUG_UTILS_MESSAGE_TYPE_FLAG_BITS_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:8662 subtype VkDebugUtilsMessageTypeFlagsEXT is VkFlags; -- vulkan_core.h:8668 type VkDebugUtilsObjectNameInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8670 pNext : System.Address; -- vulkan_core.h:8671 objectType : aliased VkObjectType; -- vulkan_core.h:8672 objectHandle : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:8673 pObjectName : Interfaces.C.Strings.chars_ptr; -- vulkan_core.h:8674 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8669 type VkDebugUtilsObjectTagInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8678 pNext : System.Address; -- vulkan_core.h:8679 objectType : aliased VkObjectType; -- vulkan_core.h:8680 objectHandle : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:8681 tagName : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:8682 tagSize : aliased size_t; -- vulkan_core.h:8683 pTag : System.Address; -- vulkan_core.h:8684 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8677 type VkDebugUtilsLabelEXT_array1588 is array (0 .. 3) of aliased float; type VkDebugUtilsLabelEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8688 pNext : System.Address; -- vulkan_core.h:8689 pLabelName : Interfaces.C.Strings.chars_ptr; -- vulkan_core.h:8690 color : aliased VkDebugUtilsLabelEXT_array1588; -- vulkan_core.h:8691 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8687 type VkDebugUtilsMessengerCallbackDataEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8695 pNext : System.Address; -- vulkan_core.h:8696 flags : aliased VkDebugUtilsMessengerCallbackDataFlagsEXT; -- vulkan_core.h:8697 pMessageIdName : Interfaces.C.Strings.chars_ptr; -- vulkan_core.h:8698 messageIdNumber : aliased Interfaces.C.short; -- vulkan_core.h:8699 pMessage : Interfaces.C.Strings.chars_ptr; -- vulkan_core.h:8700 queueLabelCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8701 pQueueLabels : access constant VkDebugUtilsLabelEXT; -- vulkan_core.h:8702 cmdBufLabelCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8703 pCmdBufLabels : access constant VkDebugUtilsLabelEXT; -- vulkan_core.h:8704 objectCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8705 pObjects : access constant VkDebugUtilsObjectNameInfoEXT; -- vulkan_core.h:8706 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8694 type PFN_vkDebugUtilsMessengerCallbackEXT is access function (arg1 : VkDebugUtilsMessageSeverityFlagBitsEXT; arg2 : VkDebugUtilsMessageTypeFlagsEXT; arg3 : access constant VkDebugUtilsMessengerCallbackDataEXT; arg4 : System.Address) return VkBool32 with Convention => C; -- vulkan_core.h:8709 type VkDebugUtilsMessengerCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8716 pNext : System.Address; -- vulkan_core.h:8717 flags : aliased VkDebugUtilsMessengerCreateFlagsEXT; -- vulkan_core.h:8718 messageSeverity : aliased VkDebugUtilsMessageSeverityFlagsEXT; -- vulkan_core.h:8719 messageType : aliased VkDebugUtilsMessageTypeFlagsEXT; -- vulkan_core.h:8720 pfnUserCallback : PFN_vkDebugUtilsMessengerCallbackEXT; -- vulkan_core.h:8721 pUserData : System.Address; -- vulkan_core.h:8722 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8715 type PFN_vkSetDebugUtilsObjectNameEXT is access function (arg1 : VkDevice; arg2 : access constant VkDebugUtilsObjectNameInfoEXT) return VkResult with Convention => C; -- vulkan_core.h:8725 type PFN_vkSetDebugUtilsObjectTagEXT is access function (arg1 : VkDevice; arg2 : access constant VkDebugUtilsObjectTagInfoEXT) return VkResult with Convention => C; -- vulkan_core.h:8726 type PFN_vkQueueBeginDebugUtilsLabelEXT is access procedure (arg1 : VkQueue; arg2 : access constant VkDebugUtilsLabelEXT) with Convention => C; -- vulkan_core.h:8727 type PFN_vkQueueEndDebugUtilsLabelEXT is access procedure (arg1 : VkQueue) with Convention => C; -- vulkan_core.h:8728 type PFN_vkQueueInsertDebugUtilsLabelEXT is access procedure (arg1 : VkQueue; arg2 : access constant VkDebugUtilsLabelEXT) with Convention => C; -- vulkan_core.h:8729 type PFN_vkCmdBeginDebugUtilsLabelEXT is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkDebugUtilsLabelEXT) with Convention => C; -- vulkan_core.h:8730 type PFN_vkCmdEndDebugUtilsLabelEXT is access procedure (arg1 : VkCommandBuffer) with Convention => C; -- vulkan_core.h:8731 type PFN_vkCmdInsertDebugUtilsLabelEXT is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkDebugUtilsLabelEXT) with Convention => C; -- vulkan_core.h:8732 type PFN_vkCreateDebugUtilsMessengerEXT is access function (arg1 : VkInstance; arg2 : access constant VkDebugUtilsMessengerCreateInfoEXT; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:8733 type PFN_vkDestroyDebugUtilsMessengerEXT is access procedure (arg1 : VkInstance; arg2 : VkDebugUtilsMessengerEXT; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:8734 type PFN_vkSubmitDebugUtilsMessageEXT is access procedure (arg1 : VkInstance; arg2 : VkDebugUtilsMessageSeverityFlagBitsEXT; arg3 : VkDebugUtilsMessageTypeFlagsEXT; arg4 : access constant VkDebugUtilsMessengerCallbackDataEXT) with Convention => C; -- vulkan_core.h:8735 function vkSetDebugUtilsObjectNameEXT (device : VkDevice; pNameInfo : access constant VkDebugUtilsObjectNameInfoEXT) return VkResult -- vulkan_core.h:8738 with Import => True, Convention => C, External_Name => "vkSetDebugUtilsObjectNameEXT"; function vkSetDebugUtilsObjectTagEXT (device : VkDevice; pTagInfo : access constant VkDebugUtilsObjectTagInfoEXT) return VkResult -- vulkan_core.h:8742 with Import => True, Convention => C, External_Name => "vkSetDebugUtilsObjectTagEXT"; procedure vkQueueBeginDebugUtilsLabelEXT (queue : VkQueue; pLabelInfo : access constant VkDebugUtilsLabelEXT) -- vulkan_core.h:8746 with Import => True, Convention => C, External_Name => "vkQueueBeginDebugUtilsLabelEXT"; procedure vkQueueEndDebugUtilsLabelEXT (queue : VkQueue) -- vulkan_core.h:8750 with Import => True, Convention => C, External_Name => "vkQueueEndDebugUtilsLabelEXT"; procedure vkQueueInsertDebugUtilsLabelEXT (queue : VkQueue; pLabelInfo : access constant VkDebugUtilsLabelEXT) -- vulkan_core.h:8753 with Import => True, Convention => C, External_Name => "vkQueueInsertDebugUtilsLabelEXT"; procedure vkCmdBeginDebugUtilsLabelEXT (commandBuffer : VkCommandBuffer; pLabelInfo : access constant VkDebugUtilsLabelEXT) -- vulkan_core.h:8757 with Import => True, Convention => C, External_Name => "vkCmdBeginDebugUtilsLabelEXT"; procedure vkCmdEndDebugUtilsLabelEXT (commandBuffer : VkCommandBuffer) -- vulkan_core.h:8761 with Import => True, Convention => C, External_Name => "vkCmdEndDebugUtilsLabelEXT"; procedure vkCmdInsertDebugUtilsLabelEXT (commandBuffer : VkCommandBuffer; pLabelInfo : access constant VkDebugUtilsLabelEXT) -- vulkan_core.h:8764 with Import => True, Convention => C, External_Name => "vkCmdInsertDebugUtilsLabelEXT"; function vkCreateDebugUtilsMessengerEXT (instance : VkInstance; pCreateInfo : access constant VkDebugUtilsMessengerCreateInfoEXT; pAllocator : access constant VkAllocationCallbacks; pMessenger : System.Address) return VkResult -- vulkan_core.h:8768 with Import => True, Convention => C, External_Name => "vkCreateDebugUtilsMessengerEXT"; procedure vkDestroyDebugUtilsMessengerEXT (instance : VkInstance; messenger : VkDebugUtilsMessengerEXT; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:8774 with Import => True, Convention => C, External_Name => "vkDestroyDebugUtilsMessengerEXT"; procedure vkSubmitDebugUtilsMessageEXT (instance : VkInstance; messageSeverity : VkDebugUtilsMessageSeverityFlagBitsEXT; messageTypes : VkDebugUtilsMessageTypeFlagsEXT; pCallbackData : access constant VkDebugUtilsMessengerCallbackDataEXT) -- vulkan_core.h:8779 with Import => True, Convention => C, External_Name => "vkSubmitDebugUtilsMessageEXT"; subtype VkSamplerReductionModeEXT is VkSamplerReductionMode; -- vulkan_core.h:8790 subtype VkSamplerReductionModeCreateInfoEXT is VkSamplerReductionModeCreateInfo; -- vulkan_core.h:8792 subtype VkPhysicalDeviceSamplerFilterMinmaxPropertiesEXT is VkPhysicalDeviceSamplerFilterMinmaxProperties; -- vulkan_core.h:8794 type VkPhysicalDeviceInlineUniformBlockFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8817 pNext : System.Address; -- vulkan_core.h:8818 inlineUniformBlock : aliased VkBool32; -- vulkan_core.h:8819 descriptorBindingInlineUniformBlockUpdateAfterBind : aliased VkBool32; -- vulkan_core.h:8820 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8816 type VkPhysicalDeviceInlineUniformBlockPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8824 pNext : System.Address; -- vulkan_core.h:8825 maxInlineUniformBlockSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8826 maxPerStageDescriptorInlineUniformBlocks : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8827 maxPerStageDescriptorUpdateAfterBindInlineUniformBlocks : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8828 maxDescriptorSetInlineUniformBlocks : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8829 maxDescriptorSetUpdateAfterBindInlineUniformBlocks : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8830 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8823 type VkWriteDescriptorSetInlineUniformBlockEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8834 pNext : System.Address; -- vulkan_core.h:8835 dataSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8836 pData : System.Address; -- vulkan_core.h:8837 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8833 type VkDescriptorPoolInlineUniformBlockCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8841 pNext : System.Address; -- vulkan_core.h:8842 maxInlineUniformBlockBindings : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8843 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8840 type VkSampleLocationEXT is record x : aliased float; -- vulkan_core.h:8857 y : aliased float; -- vulkan_core.h:8858 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8856 type VkSampleLocationsInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8862 pNext : System.Address; -- vulkan_core.h:8863 sampleLocationsPerPixel : aliased VkSampleCountFlagBits; -- vulkan_core.h:8864 sampleLocationGridSize : aliased VkExtent2D; -- vulkan_core.h:8865 sampleLocationsCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8866 pSampleLocations : access constant VkSampleLocationEXT; -- vulkan_core.h:8867 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8861 type VkAttachmentSampleLocationsEXT is record attachmentIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8871 sampleLocationsInfo : aliased VkSampleLocationsInfoEXT; -- vulkan_core.h:8872 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8870 type VkSubpassSampleLocationsEXT is record subpassIndex : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8876 sampleLocationsInfo : aliased VkSampleLocationsInfoEXT; -- vulkan_core.h:8877 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8875 type VkRenderPassSampleLocationsBeginInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8881 pNext : System.Address; -- vulkan_core.h:8882 attachmentInitialSampleLocationsCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8883 pAttachmentInitialSampleLocations : access constant VkAttachmentSampleLocationsEXT; -- vulkan_core.h:8884 postSubpassSampleLocationsCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8885 pPostSubpassSampleLocations : access constant VkSubpassSampleLocationsEXT; -- vulkan_core.h:8886 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8880 type VkPipelineSampleLocationsStateCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8890 pNext : System.Address; -- vulkan_core.h:8891 sampleLocationsEnable : aliased VkBool32; -- vulkan_core.h:8892 sampleLocationsInfo : aliased VkSampleLocationsInfoEXT; -- vulkan_core.h:8893 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8889 type VkPhysicalDeviceSampleLocationsPropertiesEXT_array1334 is array (0 .. 1) of aliased float; type VkPhysicalDeviceSampleLocationsPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8897 pNext : System.Address; -- vulkan_core.h:8898 sampleLocationSampleCounts : aliased VkSampleCountFlags; -- vulkan_core.h:8899 maxSampleLocationGridSize : aliased VkExtent2D; -- vulkan_core.h:8900 sampleLocationCoordinateRange : aliased VkPhysicalDeviceSampleLocationsPropertiesEXT_array1334; -- vulkan_core.h:8901 sampleLocationSubPixelBits : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8902 variableSampleLocations : aliased VkBool32; -- vulkan_core.h:8903 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8896 type VkMultisamplePropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8907 pNext : System.Address; -- vulkan_core.h:8908 maxSampleLocationGridSize : aliased VkExtent2D; -- vulkan_core.h:8909 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8906 type PFN_vkCmdSetSampleLocationsEXT is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkSampleLocationsInfoEXT) with Convention => C; -- vulkan_core.h:8912 type PFN_vkGetPhysicalDeviceMultisamplePropertiesEXT is access procedure (arg1 : VkPhysicalDevice; arg2 : VkSampleCountFlagBits; arg3 : access VkMultisamplePropertiesEXT) with Convention => C; -- vulkan_core.h:8913 procedure vkCmdSetSampleLocationsEXT (commandBuffer : VkCommandBuffer; pSampleLocationsInfo : access constant VkSampleLocationsInfoEXT) -- vulkan_core.h:8916 with Import => True, Convention => C, External_Name => "vkCmdSetSampleLocationsEXT"; procedure vkGetPhysicalDeviceMultisamplePropertiesEXT (physicalDevice : VkPhysicalDevice; samples : VkSampleCountFlagBits; pMultisampleProperties : access VkMultisamplePropertiesEXT) -- vulkan_core.h:8920 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceMultisamplePropertiesEXT"; subtype VkBlendOverlapEXT is unsigned; VK_BLEND_OVERLAP_UNCORRELATED_EXT : constant unsigned := 0; VK_BLEND_OVERLAP_DISJOINT_EXT : constant unsigned := 1; VK_BLEND_OVERLAP_CONJOINT_EXT : constant unsigned := 2; VK_BLEND_OVERLAP_BEGIN_RANGE_EXT : constant unsigned := 0; VK_BLEND_OVERLAP_END_RANGE_EXT : constant unsigned := 2; VK_BLEND_OVERLAP_RANGE_SIZE_EXT : constant unsigned := 3; VK_BLEND_OVERLAP_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:8931 type VkPhysicalDeviceBlendOperationAdvancedFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8941 pNext : System.Address; -- vulkan_core.h:8942 advancedBlendCoherentOperations : aliased VkBool32; -- vulkan_core.h:8943 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8940 type VkPhysicalDeviceBlendOperationAdvancedPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8947 pNext : System.Address; -- vulkan_core.h:8948 advancedBlendMaxColorAttachments : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8949 advancedBlendIndependentBlend : aliased VkBool32; -- vulkan_core.h:8950 advancedBlendNonPremultipliedSrcColor : aliased VkBool32; -- vulkan_core.h:8951 advancedBlendNonPremultipliedDstColor : aliased VkBool32; -- vulkan_core.h:8952 advancedBlendCorrelatedOverlap : aliased VkBool32; -- vulkan_core.h:8953 advancedBlendAllOperations : aliased VkBool32; -- vulkan_core.h:8954 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8946 type VkPipelineColorBlendAdvancedStateCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:8958 pNext : System.Address; -- vulkan_core.h:8959 srcPremultiplied : aliased VkBool32; -- vulkan_core.h:8960 dstPremultiplied : aliased VkBool32; -- vulkan_core.h:8961 blendOverlap : aliased VkBlendOverlapEXT; -- vulkan_core.h:8962 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8957 subtype VkPipelineCoverageToColorStateCreateFlagsNV is VkFlags; -- vulkan_core.h:8970 type VkPipelineCoverageToColorStateCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:8972 pNext : System.Address; -- vulkan_core.h:8973 flags : aliased VkPipelineCoverageToColorStateCreateFlagsNV; -- vulkan_core.h:8974 coverageToColorEnable : aliased VkBool32; -- vulkan_core.h:8975 coverageToColorLocation : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:8976 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8971 subtype VkCoverageModulationModeNV is unsigned; VK_COVERAGE_MODULATION_MODE_NONE_NV : constant unsigned := 0; VK_COVERAGE_MODULATION_MODE_RGB_NV : constant unsigned := 1; VK_COVERAGE_MODULATION_MODE_ALPHA_NV : constant unsigned := 2; VK_COVERAGE_MODULATION_MODE_RGBA_NV : constant unsigned := 3; VK_COVERAGE_MODULATION_MODE_BEGIN_RANGE_NV : constant unsigned := 0; VK_COVERAGE_MODULATION_MODE_END_RANGE_NV : constant unsigned := 3; VK_COVERAGE_MODULATION_MODE_RANGE_SIZE_NV : constant unsigned := 4; VK_COVERAGE_MODULATION_MODE_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:8985 subtype VkPipelineCoverageModulationStateCreateFlagsNV is VkFlags; -- vulkan_core.h:8995 type VkPipelineCoverageModulationStateCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:8997 pNext : System.Address; -- vulkan_core.h:8998 flags : aliased VkPipelineCoverageModulationStateCreateFlagsNV; -- vulkan_core.h:8999 coverageModulationMode : aliased VkCoverageModulationModeNV; -- vulkan_core.h:9000 coverageModulationTableEnable : aliased VkBool32; -- vulkan_core.h:9001 coverageModulationTableCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9002 pCoverageModulationTable : access float; -- vulkan_core.h:9003 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:8996 type VkPhysicalDeviceShaderSMBuiltinsPropertiesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9017 pNext : System.Address; -- vulkan_core.h:9018 shaderSMCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9019 shaderWarpsPerSM : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9020 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9016 type VkPhysicalDeviceShaderSMBuiltinsFeaturesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9024 pNext : System.Address; -- vulkan_core.h:9025 shaderSMBuiltins : aliased VkBool32; -- vulkan_core.h:9026 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9023 type VkDrmFormatModifierPropertiesEXT is record drmFormatModifier : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:9040 drmFormatModifierPlaneCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9041 drmFormatModifierTilingFeatures : aliased VkFormatFeatureFlags; -- vulkan_core.h:9042 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9039 type VkDrmFormatModifierPropertiesListEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9046 pNext : System.Address; -- vulkan_core.h:9047 drmFormatModifierCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9048 pDrmFormatModifierProperties : access VkDrmFormatModifierPropertiesEXT; -- vulkan_core.h:9049 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9045 type VkPhysicalDeviceImageDrmFormatModifierInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9053 pNext : System.Address; -- vulkan_core.h:9054 drmFormatModifier : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:9055 sharingMode : aliased VkSharingMode; -- vulkan_core.h:9056 queueFamilyIndexCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9057 pQueueFamilyIndices : access Interfaces.C.unsigned_short; -- vulkan_core.h:9058 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9052 type VkImageDrmFormatModifierListCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9062 pNext : System.Address; -- vulkan_core.h:9063 drmFormatModifierCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9064 pDrmFormatModifiers : access Interfaces.C.unsigned_long; -- vulkan_core.h:9065 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9061 type VkImageDrmFormatModifierExplicitCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9069 pNext : System.Address; -- vulkan_core.h:9070 drmFormatModifier : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:9071 drmFormatModifierPlaneCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9072 pPlaneLayouts : access constant VkSubresourceLayout; -- vulkan_core.h:9073 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9068 type VkImageDrmFormatModifierPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9077 pNext : System.Address; -- vulkan_core.h:9078 drmFormatModifier : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:9079 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9076 type PFN_vkGetImageDrmFormatModifierPropertiesEXT is access function (arg1 : VkDevice; arg2 : VkImage; arg3 : access VkImageDrmFormatModifierPropertiesEXT) return VkResult with Convention => C; -- vulkan_core.h:9082 function vkGetImageDrmFormatModifierPropertiesEXT (device : VkDevice; image : VkImage; pProperties : access VkImageDrmFormatModifierPropertiesEXT) return VkResult -- vulkan_core.h:9085 with Import => True, Convention => C, External_Name => "vkGetImageDrmFormatModifierPropertiesEXT"; type VkValidationCacheEXT_T is null record; -- incomplete struct type VkValidationCacheEXT is access all VkValidationCacheEXT_T; -- vulkan_core.h:9093 subtype VkValidationCacheHeaderVersionEXT is unsigned; VK_VALIDATION_CACHE_HEADER_VERSION_ONE_EXT : constant unsigned := 1; VK_VALIDATION_CACHE_HEADER_VERSION_BEGIN_RANGE_EXT : constant unsigned := 1; VK_VALIDATION_CACHE_HEADER_VERSION_END_RANGE_EXT : constant unsigned := 1; VK_VALIDATION_CACHE_HEADER_VERSION_RANGE_SIZE_EXT : constant unsigned := 1; VK_VALIDATION_CACHE_HEADER_VERSION_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:9097 subtype VkValidationCacheCreateFlagsEXT is VkFlags; -- vulkan_core.h:9104 type VkValidationCacheCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9106 pNext : System.Address; -- vulkan_core.h:9107 flags : aliased VkValidationCacheCreateFlagsEXT; -- vulkan_core.h:9108 initialDataSize : aliased size_t; -- vulkan_core.h:9109 pInitialData : System.Address; -- vulkan_core.h:9110 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9105 type VkShaderModuleValidationCacheCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9114 pNext : System.Address; -- vulkan_core.h:9115 validationCache : VkValidationCacheEXT; -- vulkan_core.h:9116 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9113 type PFN_vkCreateValidationCacheEXT is access function (arg1 : VkDevice; arg2 : access constant VkValidationCacheCreateInfoEXT; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:9119 type PFN_vkDestroyValidationCacheEXT is access procedure (arg1 : VkDevice; arg2 : VkValidationCacheEXT; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:9120 type PFN_vkMergeValidationCachesEXT is access function (arg1 : VkDevice; arg2 : VkValidationCacheEXT; arg3 : Interfaces.C.unsigned_short; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:9121 type PFN_vkGetValidationCacheDataEXT is access function (arg1 : VkDevice; arg2 : VkValidationCacheEXT; arg3 : access size_t; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:9122 function vkCreateValidationCacheEXT (device : VkDevice; pCreateInfo : access constant VkValidationCacheCreateInfoEXT; pAllocator : access constant VkAllocationCallbacks; pValidationCache : System.Address) return VkResult -- vulkan_core.h:9125 with Import => True, Convention => C, External_Name => "vkCreateValidationCacheEXT"; procedure vkDestroyValidationCacheEXT (device : VkDevice; validationCache : VkValidationCacheEXT; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:9131 with Import => True, Convention => C, External_Name => "vkDestroyValidationCacheEXT"; function vkMergeValidationCachesEXT (device : VkDevice; dstCache : VkValidationCacheEXT; srcCacheCount : Interfaces.C.unsigned_short; pSrcCaches : System.Address) return VkResult -- vulkan_core.h:9136 with Import => True, Convention => C, External_Name => "vkMergeValidationCachesEXT"; function vkGetValidationCacheDataEXT (device : VkDevice; validationCache : VkValidationCacheEXT; pDataSize : access size_t; pData : System.Address) return VkResult -- vulkan_core.h:9142 with Import => True, Convention => C, External_Name => "vkGetValidationCacheDataEXT"; subtype VkDescriptorBindingFlagBitsEXT is VkDescriptorBindingFlagBits; -- vulkan_core.h:9153 subtype VkDescriptorBindingFlagsEXT is VkDescriptorBindingFlags; -- vulkan_core.h:9155 subtype VkDescriptorSetLayoutBindingFlagsCreateInfoEXT is VkDescriptorSetLayoutBindingFlagsCreateInfo; -- vulkan_core.h:9157 subtype VkPhysicalDeviceDescriptorIndexingFeaturesEXT is VkPhysicalDeviceDescriptorIndexingFeatures; -- vulkan_core.h:9159 subtype VkPhysicalDeviceDescriptorIndexingPropertiesEXT is VkPhysicalDeviceDescriptorIndexingProperties; -- vulkan_core.h:9161 subtype VkDescriptorSetVariableDescriptorCountAllocateInfoEXT is VkDescriptorSetVariableDescriptorCountAllocateInfo; -- vulkan_core.h:9163 subtype VkDescriptorSetVariableDescriptorCountLayoutSupportEXT is VkDescriptorSetVariableDescriptorCountLayoutSupport; -- vulkan_core.h:9165 subtype VkShadingRatePaletteEntryNV is unsigned; VK_SHADING_RATE_PALETTE_ENTRY_NO_INVOCATIONS_NV : constant unsigned := 0; VK_SHADING_RATE_PALETTE_ENTRY_16_INVOCATIONS_PER_PIXEL_NV : constant unsigned := 1; VK_SHADING_RATE_PALETTE_ENTRY_8_INVOCATIONS_PER_PIXEL_NV : constant unsigned := 2; VK_SHADING_RATE_PALETTE_ENTRY_4_INVOCATIONS_PER_PIXEL_NV : constant unsigned := 3; VK_SHADING_RATE_PALETTE_ENTRY_2_INVOCATIONS_PER_PIXEL_NV : constant unsigned := 4; VK_SHADING_RATE_PALETTE_ENTRY_1_INVOCATION_PER_PIXEL_NV : constant unsigned := 5; VK_SHADING_RATE_PALETTE_ENTRY_1_INVOCATION_PER_2X1_PIXELS_NV : constant unsigned := 6; VK_SHADING_RATE_PALETTE_ENTRY_1_INVOCATION_PER_1X2_PIXELS_NV : constant unsigned := 7; VK_SHADING_RATE_PALETTE_ENTRY_1_INVOCATION_PER_2X2_PIXELS_NV : constant unsigned := 8; VK_SHADING_RATE_PALETTE_ENTRY_1_INVOCATION_PER_4X2_PIXELS_NV : constant unsigned := 9; VK_SHADING_RATE_PALETTE_ENTRY_1_INVOCATION_PER_2X4_PIXELS_NV : constant unsigned := 10; VK_SHADING_RATE_PALETTE_ENTRY_1_INVOCATION_PER_4X4_PIXELS_NV : constant unsigned := 11; VK_SHADING_RATE_PALETTE_ENTRY_BEGIN_RANGE_NV : constant unsigned := 0; VK_SHADING_RATE_PALETTE_ENTRY_END_RANGE_NV : constant unsigned := 11; VK_SHADING_RATE_PALETTE_ENTRY_RANGE_SIZE_NV : constant unsigned := 12; VK_SHADING_RATE_PALETTE_ENTRY_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:9178 subtype VkCoarseSampleOrderTypeNV is unsigned; VK_COARSE_SAMPLE_ORDER_TYPE_DEFAULT_NV : constant unsigned := 0; VK_COARSE_SAMPLE_ORDER_TYPE_CUSTOM_NV : constant unsigned := 1; VK_COARSE_SAMPLE_ORDER_TYPE_PIXEL_MAJOR_NV : constant unsigned := 2; VK_COARSE_SAMPLE_ORDER_TYPE_SAMPLE_MAJOR_NV : constant unsigned := 3; VK_COARSE_SAMPLE_ORDER_TYPE_BEGIN_RANGE_NV : constant unsigned := 0; VK_COARSE_SAMPLE_ORDER_TYPE_END_RANGE_NV : constant unsigned := 3; VK_COARSE_SAMPLE_ORDER_TYPE_RANGE_SIZE_NV : constant unsigned := 4; VK_COARSE_SAMPLE_ORDER_TYPE_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:9197 type VkShadingRatePaletteNV is record shadingRatePaletteEntryCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9208 pShadingRatePaletteEntries : access VkShadingRatePaletteEntryNV; -- vulkan_core.h:9209 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9207 type VkPipelineViewportShadingRateImageStateCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:9213 pNext : System.Address; -- vulkan_core.h:9214 shadingRateImageEnable : aliased VkBool32; -- vulkan_core.h:9215 viewportCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9216 pShadingRatePalettes : access constant VkShadingRatePaletteNV; -- vulkan_core.h:9217 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9212 type VkPhysicalDeviceShadingRateImageFeaturesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9221 pNext : System.Address; -- vulkan_core.h:9222 shadingRateImage : aliased VkBool32; -- vulkan_core.h:9223 shadingRateCoarseSampleOrder : aliased VkBool32; -- vulkan_core.h:9224 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9220 type VkPhysicalDeviceShadingRateImagePropertiesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9228 pNext : System.Address; -- vulkan_core.h:9229 shadingRateTexelSize : aliased VkExtent2D; -- vulkan_core.h:9230 shadingRatePaletteSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9231 shadingRateMaxCoarseSamples : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9232 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9227 type VkCoarseSampleLocationNV is record pixelX : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9236 pixelY : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9237 sample : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9238 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9235 type VkCoarseSampleOrderCustomNV is record shadingRate : aliased VkShadingRatePaletteEntryNV; -- vulkan_core.h:9242 sampleCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9243 sampleLocationCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9244 pSampleLocations : access constant VkCoarseSampleLocationNV; -- vulkan_core.h:9245 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9241 type VkPipelineViewportCoarseSampleOrderStateCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:9249 pNext : System.Address; -- vulkan_core.h:9250 sampleOrderType : aliased VkCoarseSampleOrderTypeNV; -- vulkan_core.h:9251 customSampleOrderCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9252 pCustomSampleOrders : access constant VkCoarseSampleOrderCustomNV; -- vulkan_core.h:9253 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9248 type PFN_vkCmdBindShadingRateImageNV is access procedure (arg1 : VkCommandBuffer; arg2 : VkImageView; arg3 : VkImageLayout) with Convention => C; -- vulkan_core.h:9256 type PFN_vkCmdSetViewportShadingRatePaletteNV is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : access constant VkShadingRatePaletteNV) with Convention => C; -- vulkan_core.h:9257 type PFN_vkCmdSetCoarseSampleOrderNV is access procedure (arg1 : VkCommandBuffer; arg2 : VkCoarseSampleOrderTypeNV; arg3 : Interfaces.C.unsigned_short; arg4 : access constant VkCoarseSampleOrderCustomNV) with Convention => C; -- vulkan_core.h:9258 procedure vkCmdBindShadingRateImageNV (commandBuffer : VkCommandBuffer; imageView : VkImageView; imageLayout : VkImageLayout) -- vulkan_core.h:9261 with Import => True, Convention => C, External_Name => "vkCmdBindShadingRateImageNV"; procedure vkCmdSetViewportShadingRatePaletteNV (commandBuffer : VkCommandBuffer; firstViewport : Interfaces.C.unsigned_short; viewportCount : Interfaces.C.unsigned_short; pShadingRatePalettes : access constant VkShadingRatePaletteNV) -- vulkan_core.h:9266 with Import => True, Convention => C, External_Name => "vkCmdSetViewportShadingRatePaletteNV"; procedure vkCmdSetCoarseSampleOrderNV (commandBuffer : VkCommandBuffer; sampleOrderType : VkCoarseSampleOrderTypeNV; customSampleOrderCount : Interfaces.C.unsigned_short; pCustomSampleOrders : access constant VkCoarseSampleOrderCustomNV) -- vulkan_core.h:9272 with Import => True, Convention => C, External_Name => "vkCmdSetCoarseSampleOrderNV"; type VkAccelerationStructureNV_T is null record; -- incomplete struct type VkAccelerationStructureNV is access all VkAccelerationStructureNV_T; -- vulkan_core.h:9281 subtype VkAccelerationStructureTypeNV is unsigned; VK_ACCELERATION_STRUCTURE_TYPE_TOP_LEVEL_NV : constant unsigned := 0; VK_ACCELERATION_STRUCTURE_TYPE_BOTTOM_LEVEL_NV : constant unsigned := 1; VK_ACCELERATION_STRUCTURE_TYPE_BEGIN_RANGE_NV : constant unsigned := 0; VK_ACCELERATION_STRUCTURE_TYPE_END_RANGE_NV : constant unsigned := 1; VK_ACCELERATION_STRUCTURE_TYPE_RANGE_SIZE_NV : constant unsigned := 2; VK_ACCELERATION_STRUCTURE_TYPE_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:9286 subtype VkRayTracingShaderGroupTypeNV is unsigned; VK_RAY_TRACING_SHADER_GROUP_TYPE_GENERAL_NV : constant unsigned := 0; VK_RAY_TRACING_SHADER_GROUP_TYPE_TRIANGLES_HIT_GROUP_NV : constant unsigned := 1; VK_RAY_TRACING_SHADER_GROUP_TYPE_PROCEDURAL_HIT_GROUP_NV : constant unsigned := 2; VK_RAY_TRACING_SHADER_GROUP_TYPE_BEGIN_RANGE_NV : constant unsigned := 0; VK_RAY_TRACING_SHADER_GROUP_TYPE_END_RANGE_NV : constant unsigned := 2; VK_RAY_TRACING_SHADER_GROUP_TYPE_RANGE_SIZE_NV : constant unsigned := 3; VK_RAY_TRACING_SHADER_GROUP_TYPE_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:9295 subtype VkGeometryTypeNV is unsigned; VK_GEOMETRY_TYPE_TRIANGLES_NV : constant unsigned := 0; VK_GEOMETRY_TYPE_AABBS_NV : constant unsigned := 1; VK_GEOMETRY_TYPE_BEGIN_RANGE_NV : constant unsigned := 0; VK_GEOMETRY_TYPE_END_RANGE_NV : constant unsigned := 1; VK_GEOMETRY_TYPE_RANGE_SIZE_NV : constant unsigned := 2; VK_GEOMETRY_TYPE_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:9305 subtype VkCopyAccelerationStructureModeNV is unsigned; VK_COPY_ACCELERATION_STRUCTURE_MODE_CLONE_NV : constant unsigned := 0; VK_COPY_ACCELERATION_STRUCTURE_MODE_COMPACT_NV : constant unsigned := 1; VK_COPY_ACCELERATION_STRUCTURE_MODE_BEGIN_RANGE_NV : constant unsigned := 0; VK_COPY_ACCELERATION_STRUCTURE_MODE_END_RANGE_NV : constant unsigned := 1; VK_COPY_ACCELERATION_STRUCTURE_MODE_RANGE_SIZE_NV : constant unsigned := 2; VK_COPY_ACCELERATION_STRUCTURE_MODE_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:9314 subtype VkAccelerationStructureMemoryRequirementsTypeNV is unsigned; VK_ACCELERATION_STRUCTURE_MEMORY_REQUIREMENTS_TYPE_OBJECT_NV : constant unsigned := 0; VK_ACCELERATION_STRUCTURE_MEMORY_REQUIREMENTS_TYPE_BUILD_SCRATCH_NV : constant unsigned := 1; VK_ACCELERATION_STRUCTURE_MEMORY_REQUIREMENTS_TYPE_UPDATE_SCRATCH_NV : constant unsigned := 2; VK_ACCELERATION_STRUCTURE_MEMORY_REQUIREMENTS_TYPE_BEGIN_RANGE_NV : constant unsigned := 0; VK_ACCELERATION_STRUCTURE_MEMORY_REQUIREMENTS_TYPE_END_RANGE_NV : constant unsigned := 2; VK_ACCELERATION_STRUCTURE_MEMORY_REQUIREMENTS_TYPE_RANGE_SIZE_NV : constant unsigned := 3; VK_ACCELERATION_STRUCTURE_MEMORY_REQUIREMENTS_TYPE_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:9323 subtype VkGeometryFlagBitsNV is unsigned; VK_GEOMETRY_OPAQUE_BIT_NV : constant unsigned := 1; VK_GEOMETRY_NO_DUPLICATE_ANY_HIT_INVOCATION_BIT_NV : constant unsigned := 2; VK_GEOMETRY_FLAG_BITS_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:9333 subtype VkGeometryFlagsNV is VkFlags; -- vulkan_core.h:9338 subtype VkGeometryInstanceFlagBitsNV is unsigned; VK_GEOMETRY_INSTANCE_TRIANGLE_CULL_DISABLE_BIT_NV : constant unsigned := 1; VK_GEOMETRY_INSTANCE_TRIANGLE_FRONT_COUNTERCLOCKWISE_BIT_NV : constant unsigned := 2; VK_GEOMETRY_INSTANCE_FORCE_OPAQUE_BIT_NV : constant unsigned := 4; VK_GEOMETRY_INSTANCE_FORCE_NO_OPAQUE_BIT_NV : constant unsigned := 8; VK_GEOMETRY_INSTANCE_FLAG_BITS_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:9340 subtype VkGeometryInstanceFlagsNV is VkFlags; -- vulkan_core.h:9347 subtype VkBuildAccelerationStructureFlagBitsNV is unsigned; VK_BUILD_ACCELERATION_STRUCTURE_ALLOW_UPDATE_BIT_NV : constant unsigned := 1; VK_BUILD_ACCELERATION_STRUCTURE_ALLOW_COMPACTION_BIT_NV : constant unsigned := 2; VK_BUILD_ACCELERATION_STRUCTURE_PREFER_FAST_TRACE_BIT_NV : constant unsigned := 4; VK_BUILD_ACCELERATION_STRUCTURE_PREFER_FAST_BUILD_BIT_NV : constant unsigned := 8; VK_BUILD_ACCELERATION_STRUCTURE_LOW_MEMORY_BIT_NV : constant unsigned := 16; VK_BUILD_ACCELERATION_STRUCTURE_FLAG_BITS_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:9349 subtype VkBuildAccelerationStructureFlagsNV is VkFlags; -- vulkan_core.h:9357 type VkRayTracingShaderGroupCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:9359 pNext : System.Address; -- vulkan_core.h:9360 c_type : aliased VkRayTracingShaderGroupTypeNV; -- vulkan_core.h:9361 generalShader : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9362 closestHitShader : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9363 anyHitShader : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9364 intersectionShader : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9365 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9358 type VkRayTracingPipelineCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:9369 pNext : System.Address; -- vulkan_core.h:9370 flags : aliased VkPipelineCreateFlags; -- vulkan_core.h:9371 stageCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9372 pStages : access constant VkPipelineShaderStageCreateInfo; -- vulkan_core.h:9373 groupCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9374 pGroups : access constant VkRayTracingShaderGroupCreateInfoNV; -- vulkan_core.h:9375 maxRecursionDepth : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9376 layout : VkPipelineLayout; -- vulkan_core.h:9377 basePipelineHandle : VkPipeline; -- vulkan_core.h:9378 basePipelineIndex : aliased Interfaces.C.short; -- vulkan_core.h:9379 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9368 type VkGeometryTrianglesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9383 pNext : System.Address; -- vulkan_core.h:9384 vertexData : VkBuffer; -- vulkan_core.h:9385 vertexOffset : aliased VkDeviceSize; -- vulkan_core.h:9386 vertexCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9387 vertexStride : aliased VkDeviceSize; -- vulkan_core.h:9388 vertexFormat : aliased VkFormat; -- vulkan_core.h:9389 indexData : VkBuffer; -- vulkan_core.h:9390 indexOffset : aliased VkDeviceSize; -- vulkan_core.h:9391 indexCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9392 indexType : aliased VkIndexType; -- vulkan_core.h:9393 transformData : VkBuffer; -- vulkan_core.h:9394 transformOffset : aliased VkDeviceSize; -- vulkan_core.h:9395 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9382 type VkGeometryAABBNV is record sType : aliased VkStructureType; -- vulkan_core.h:9399 pNext : System.Address; -- vulkan_core.h:9400 aabbData : VkBuffer; -- vulkan_core.h:9401 numAABBs : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9402 stride : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9403 offset : aliased VkDeviceSize; -- vulkan_core.h:9404 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9398 type VkGeometryDataNV is record triangles : aliased VkGeometryTrianglesNV; -- vulkan_core.h:9408 aabbs : aliased VkGeometryAABBNV; -- vulkan_core.h:9409 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9407 type VkGeometryNV is record sType : aliased VkStructureType; -- vulkan_core.h:9413 pNext : System.Address; -- vulkan_core.h:9414 geometryType : aliased VkGeometryTypeNV; -- vulkan_core.h:9415 geometry : aliased VkGeometryDataNV; -- vulkan_core.h:9416 flags : aliased VkGeometryFlagsNV; -- vulkan_core.h:9417 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9412 type VkAccelerationStructureInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:9421 pNext : System.Address; -- vulkan_core.h:9422 c_type : aliased VkAccelerationStructureTypeNV; -- vulkan_core.h:9423 flags : aliased VkBuildAccelerationStructureFlagsNV; -- vulkan_core.h:9424 instanceCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9425 geometryCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9426 pGeometries : access constant VkGeometryNV; -- vulkan_core.h:9427 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9420 type VkAccelerationStructureCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:9431 pNext : System.Address; -- vulkan_core.h:9432 compactedSize : aliased VkDeviceSize; -- vulkan_core.h:9433 info : aliased VkAccelerationStructureInfoNV; -- vulkan_core.h:9434 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9430 type VkBindAccelerationStructureMemoryInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:9438 pNext : System.Address; -- vulkan_core.h:9439 accelerationStructure : VkAccelerationStructureNV; -- vulkan_core.h:9440 memory : VkDeviceMemory; -- vulkan_core.h:9441 memoryOffset : aliased VkDeviceSize; -- vulkan_core.h:9442 deviceIndexCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9443 pDeviceIndices : access Interfaces.C.unsigned_short; -- vulkan_core.h:9444 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9437 type VkWriteDescriptorSetAccelerationStructureNV is record sType : aliased VkStructureType; -- vulkan_core.h:9448 pNext : System.Address; -- vulkan_core.h:9449 accelerationStructureCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9450 pAccelerationStructures : System.Address; -- vulkan_core.h:9451 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9447 type VkAccelerationStructureMemoryRequirementsInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:9455 pNext : System.Address; -- vulkan_core.h:9456 c_type : aliased VkAccelerationStructureMemoryRequirementsTypeNV; -- vulkan_core.h:9457 accelerationStructure : VkAccelerationStructureNV; -- vulkan_core.h:9458 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9454 type VkPhysicalDeviceRayTracingPropertiesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9462 pNext : System.Address; -- vulkan_core.h:9463 shaderGroupHandleSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9464 maxRecursionDepth : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9465 maxShaderGroupStride : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9466 shaderGroupBaseAlignment : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9467 maxGeometryCount : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:9468 maxInstanceCount : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:9469 maxTriangleCount : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:9470 maxDescriptorSetAccelerationStructures : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9471 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9461 type PFN_vkCreateAccelerationStructureNV is access function (arg1 : VkDevice; arg2 : access constant VkAccelerationStructureCreateInfoNV; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:9474 type PFN_vkDestroyAccelerationStructureNV is access procedure (arg1 : VkDevice; arg2 : VkAccelerationStructureNV; arg3 : access constant VkAllocationCallbacks) with Convention => C; -- vulkan_core.h:9475 type PFN_vkGetAccelerationStructureMemoryRequirementsNV is access procedure (arg1 : VkDevice; arg2 : access constant VkAccelerationStructureMemoryRequirementsInfoNV; arg3 : access VkMemoryRequirements2KHR) with Convention => C; -- vulkan_core.h:9476 type PFN_vkBindAccelerationStructureMemoryNV is access function (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkBindAccelerationStructureMemoryInfoNV) return VkResult with Convention => C; -- vulkan_core.h:9477 type PFN_vkCmdBuildAccelerationStructureNV is access procedure (arg1 : VkCommandBuffer; arg2 : access constant VkAccelerationStructureInfoNV; arg3 : VkBuffer; arg4 : VkDeviceSize; arg5 : VkBool32; arg6 : VkAccelerationStructureNV; arg7 : VkAccelerationStructureNV; arg8 : VkBuffer; arg9 : VkDeviceSize) with Convention => C; -- vulkan_core.h:9478 type PFN_vkCmdCopyAccelerationStructureNV is access procedure (arg1 : VkCommandBuffer; arg2 : VkAccelerationStructureNV; arg3 : VkAccelerationStructureNV; arg4 : VkCopyAccelerationStructureModeNV) with Convention => C; -- vulkan_core.h:9479 type PFN_vkCmdTraceRaysNV is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : VkBuffer; arg5 : VkDeviceSize; arg6 : VkDeviceSize; arg7 : VkBuffer; arg8 : VkDeviceSize; arg9 : VkDeviceSize; arg10 : VkBuffer; arg11 : VkDeviceSize; arg12 : VkDeviceSize; arg13 : Interfaces.C.unsigned_short; arg14 : Interfaces.C.unsigned_short; arg15 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:9480 type PFN_vkCreateRayTracingPipelinesNV is access function (arg1 : VkDevice; arg2 : VkPipelineCache; arg3 : Interfaces.C.unsigned_short; arg4 : access constant VkRayTracingPipelineCreateInfoNV; arg5 : access constant VkAllocationCallbacks; arg6 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:9481 type PFN_vkGetRayTracingShaderGroupHandlesNV is access function (arg1 : VkDevice; arg2 : VkPipeline; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short; arg5 : size_t; arg6 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:9482 type PFN_vkGetAccelerationStructureHandleNV is access function (arg1 : VkDevice; arg2 : VkAccelerationStructureNV; arg3 : size_t; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:9483 type PFN_vkCmdWriteAccelerationStructuresPropertiesNV is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : System.Address; arg4 : VkQueryType; arg5 : VkQueryPool; arg6 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:9484 type PFN_vkCompileDeferredNV is access function (arg1 : VkDevice; arg2 : VkPipeline; arg3 : Interfaces.C.unsigned_short) return VkResult with Convention => C; -- vulkan_core.h:9485 function vkCreateAccelerationStructureNV (device : VkDevice; pCreateInfo : access constant VkAccelerationStructureCreateInfoNV; pAllocator : access constant VkAllocationCallbacks; pAccelerationStructure : System.Address) return VkResult -- vulkan_core.h:9488 with Import => True, Convention => C, External_Name => "vkCreateAccelerationStructureNV"; procedure vkDestroyAccelerationStructureNV (device : VkDevice; accelerationStructure : VkAccelerationStructureNV; pAllocator : access constant VkAllocationCallbacks) -- vulkan_core.h:9494 with Import => True, Convention => C, External_Name => "vkDestroyAccelerationStructureNV"; procedure vkGetAccelerationStructureMemoryRequirementsNV (device : VkDevice; pInfo : access constant VkAccelerationStructureMemoryRequirementsInfoNV; pMemoryRequirements : access VkMemoryRequirements2KHR) -- vulkan_core.h:9499 with Import => True, Convention => C, External_Name => "vkGetAccelerationStructureMemoryRequirementsNV"; function vkBindAccelerationStructureMemoryNV (device : VkDevice; bindInfoCount : Interfaces.C.unsigned_short; pBindInfos : access constant VkBindAccelerationStructureMemoryInfoNV) return VkResult -- vulkan_core.h:9504 with Import => True, Convention => C, External_Name => "vkBindAccelerationStructureMemoryNV"; procedure vkCmdBuildAccelerationStructureNV (commandBuffer : VkCommandBuffer; pInfo : access constant VkAccelerationStructureInfoNV; instanceData : VkBuffer; instanceOffset : VkDeviceSize; update : VkBool32; dst : VkAccelerationStructureNV; src : VkAccelerationStructureNV; scratch : VkBuffer; scratchOffset : VkDeviceSize) -- vulkan_core.h:9509 with Import => True, Convention => C, External_Name => "vkCmdBuildAccelerationStructureNV"; procedure vkCmdCopyAccelerationStructureNV (commandBuffer : VkCommandBuffer; dst : VkAccelerationStructureNV; src : VkAccelerationStructureNV; mode : VkCopyAccelerationStructureModeNV) -- vulkan_core.h:9520 with Import => True, Convention => C, External_Name => "vkCmdCopyAccelerationStructureNV"; procedure vkCmdTraceRaysNV (commandBuffer : VkCommandBuffer; raygenShaderBindingTableBuffer : VkBuffer; raygenShaderBindingOffset : VkDeviceSize; missShaderBindingTableBuffer : VkBuffer; missShaderBindingOffset : VkDeviceSize; missShaderBindingStride : VkDeviceSize; hitShaderBindingTableBuffer : VkBuffer; hitShaderBindingOffset : VkDeviceSize; hitShaderBindingStride : VkDeviceSize; callableShaderBindingTableBuffer : VkBuffer; callableShaderBindingOffset : VkDeviceSize; callableShaderBindingStride : VkDeviceSize; width : Interfaces.C.unsigned_short; height : Interfaces.C.unsigned_short; depth : Interfaces.C.unsigned_short) -- vulkan_core.h:9526 with Import => True, Convention => C, External_Name => "vkCmdTraceRaysNV"; function vkCreateRayTracingPipelinesNV (device : VkDevice; pipelineCache : VkPipelineCache; createInfoCount : Interfaces.C.unsigned_short; pCreateInfos : access constant VkRayTracingPipelineCreateInfoNV; pAllocator : access constant VkAllocationCallbacks; pPipelines : System.Address) return VkResult -- vulkan_core.h:9543 with Import => True, Convention => C, External_Name => "vkCreateRayTracingPipelinesNV"; function vkGetRayTracingShaderGroupHandlesNV (device : VkDevice; pipeline : VkPipeline; firstGroup : Interfaces.C.unsigned_short; groupCount : Interfaces.C.unsigned_short; dataSize : size_t; pData : System.Address) return VkResult -- vulkan_core.h:9551 with Import => True, Convention => C, External_Name => "vkGetRayTracingShaderGroupHandlesNV"; function vkGetAccelerationStructureHandleNV (device : VkDevice; accelerationStructure : VkAccelerationStructureNV; dataSize : size_t; pData : System.Address) return VkResult -- vulkan_core.h:9559 with Import => True, Convention => C, External_Name => "vkGetAccelerationStructureHandleNV"; procedure vkCmdWriteAccelerationStructuresPropertiesNV (commandBuffer : VkCommandBuffer; accelerationStructureCount : Interfaces.C.unsigned_short; pAccelerationStructures : System.Address; queryType : VkQueryType; queryPool : VkQueryPool; firstQuery : Interfaces.C.unsigned_short) -- vulkan_core.h:9565 with Import => True, Convention => C, External_Name => "vkCmdWriteAccelerationStructuresPropertiesNV"; function vkCompileDeferredNV (device : VkDevice; pipeline : VkPipeline; shader : Interfaces.C.unsigned_short) return VkResult -- vulkan_core.h:9573 with Import => True, Convention => C, External_Name => "vkCompileDeferredNV"; type VkPhysicalDeviceRepresentativeFragmentTestFeaturesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9584 pNext : System.Address; -- vulkan_core.h:9585 representativeFragmentTest : aliased VkBool32; -- vulkan_core.h:9586 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9583 type VkPipelineRepresentativeFragmentTestStateCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:9590 pNext : System.Address; -- vulkan_core.h:9591 representativeFragmentTestEnable : aliased VkBool32; -- vulkan_core.h:9592 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9589 type VkPhysicalDeviceImageViewImageFormatInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9601 pNext : System.Address; -- vulkan_core.h:9602 imageViewType : aliased VkImageViewType; -- vulkan_core.h:9603 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9600 type VkFilterCubicImageViewImageFormatPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9607 pNext : System.Address; -- vulkan_core.h:9608 filterCubic : aliased VkBool32; -- vulkan_core.h:9609 filterCubicMinmax : aliased VkBool32; -- vulkan_core.h:9610 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9606 subtype VkQueueGlobalPriorityEXT is unsigned; VK_QUEUE_GLOBAL_PRIORITY_LOW_EXT : constant unsigned := 128; VK_QUEUE_GLOBAL_PRIORITY_MEDIUM_EXT : constant unsigned := 256; VK_QUEUE_GLOBAL_PRIORITY_HIGH_EXT : constant unsigned := 512; VK_QUEUE_GLOBAL_PRIORITY_REALTIME_EXT : constant unsigned := 1024; VK_QUEUE_GLOBAL_PRIORITY_BEGIN_RANGE_EXT : constant unsigned := 128; VK_QUEUE_GLOBAL_PRIORITY_END_RANGE_EXT : constant unsigned := 1024; VK_QUEUE_GLOBAL_PRIORITY_RANGE_SIZE_EXT : constant unsigned := 897; VK_QUEUE_GLOBAL_PRIORITY_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:9619 type VkDeviceQueueGlobalPriorityCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9630 pNext : System.Address; -- vulkan_core.h:9631 globalPriority : aliased VkQueueGlobalPriorityEXT; -- vulkan_core.h:9632 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9629 type VkImportMemoryHostPointerInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9641 pNext : System.Address; -- vulkan_core.h:9642 handleType : aliased VkExternalMemoryHandleTypeFlagBits; -- vulkan_core.h:9643 pHostPointer : System.Address; -- vulkan_core.h:9644 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9640 type VkMemoryHostPointerPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9648 pNext : System.Address; -- vulkan_core.h:9649 memoryTypeBits : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9650 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9647 type VkPhysicalDeviceExternalMemoryHostPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9654 pNext : System.Address; -- vulkan_core.h:9655 minImportedHostPointerAlignment : aliased VkDeviceSize; -- vulkan_core.h:9656 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9653 type PFN_vkGetMemoryHostPointerPropertiesEXT is access function (arg1 : VkDevice; arg2 : VkExternalMemoryHandleTypeFlagBits; arg3 : System.Address; arg4 : access VkMemoryHostPointerPropertiesEXT) return VkResult with Convention => C; -- vulkan_core.h:9659 function vkGetMemoryHostPointerPropertiesEXT (device : VkDevice; handleType : VkExternalMemoryHandleTypeFlagBits; pHostPointer : System.Address; pMemoryHostPointerProperties : access VkMemoryHostPointerPropertiesEXT) return VkResult -- vulkan_core.h:9662 with Import => True, Convention => C, External_Name => "vkGetMemoryHostPointerPropertiesEXT"; type PFN_vkCmdWriteBufferMarkerAMD is access procedure (arg1 : VkCommandBuffer; arg2 : VkPipelineStageFlagBits; arg3 : VkBuffer; arg4 : VkDeviceSize; arg5 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:9673 procedure vkCmdWriteBufferMarkerAMD (commandBuffer : VkCommandBuffer; pipelineStage : VkPipelineStageFlagBits; dstBuffer : VkBuffer; dstOffset : VkDeviceSize; marker : Interfaces.C.unsigned_short) -- vulkan_core.h:9676 with Import => True, Convention => C, External_Name => "vkCmdWriteBufferMarkerAMD"; subtype VkPipelineCompilerControlFlagBitsAMD is unsigned; VK_PIPELINE_COMPILER_CONTROL_FLAG_BITS_MAX_ENUM_AMD : constant unsigned := 2147483647; -- vulkan_core.h:9689 subtype VkPipelineCompilerControlFlagsAMD is VkFlags; -- vulkan_core.h:9692 type VkPipelineCompilerControlCreateInfoAMD is record sType : aliased VkStructureType; -- vulkan_core.h:9694 pNext : System.Address; -- vulkan_core.h:9695 compilerControlFlags : aliased VkPipelineCompilerControlFlagsAMD; -- vulkan_core.h:9696 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9693 subtype VkTimeDomainEXT is unsigned; VK_TIME_DOMAIN_DEVICE_EXT : constant unsigned := 0; VK_TIME_DOMAIN_CLOCK_MONOTONIC_EXT : constant unsigned := 1; VK_TIME_DOMAIN_CLOCK_MONOTONIC_RAW_EXT : constant unsigned := 2; VK_TIME_DOMAIN_QUERY_PERFORMANCE_COUNTER_EXT : constant unsigned := 3; VK_TIME_DOMAIN_BEGIN_RANGE_EXT : constant unsigned := 0; VK_TIME_DOMAIN_END_RANGE_EXT : constant unsigned := 3; VK_TIME_DOMAIN_RANGE_SIZE_EXT : constant unsigned := 4; VK_TIME_DOMAIN_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:9705 type VkCalibratedTimestampInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9716 pNext : System.Address; -- vulkan_core.h:9717 timeDomain : aliased VkTimeDomainEXT; -- vulkan_core.h:9718 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9715 type PFN_vkGetPhysicalDeviceCalibrateableTimeDomainsEXT is access function (arg1 : VkPhysicalDevice; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkTimeDomainEXT) return VkResult with Convention => C; -- vulkan_core.h:9721 type PFN_vkGetCalibratedTimestampsEXT is access function (arg1 : VkDevice; arg2 : Interfaces.C.unsigned_short; arg3 : access constant VkCalibratedTimestampInfoEXT; arg4 : access Interfaces.C.unsigned_long; arg5 : access Interfaces.C.unsigned_long) return VkResult with Convention => C; -- vulkan_core.h:9722 function vkGetPhysicalDeviceCalibrateableTimeDomainsEXT (physicalDevice : VkPhysicalDevice; pTimeDomainCount : access Interfaces.C.unsigned_short; pTimeDomains : access VkTimeDomainEXT) return VkResult -- vulkan_core.h:9725 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceCalibrateableTimeDomainsEXT"; function vkGetCalibratedTimestampsEXT (device : VkDevice; timestampCount : Interfaces.C.unsigned_short; pTimestampInfos : access constant VkCalibratedTimestampInfoEXT; pTimestamps : access Interfaces.C.unsigned_long; pMaxDeviation : access Interfaces.C.unsigned_long) return VkResult -- vulkan_core.h:9730 with Import => True, Convention => C, External_Name => "vkGetCalibratedTimestampsEXT"; type VkPhysicalDeviceShaderCorePropertiesAMD is record sType : aliased VkStructureType; -- vulkan_core.h:9743 pNext : System.Address; -- vulkan_core.h:9744 shaderEngineCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9745 shaderArraysPerEngineCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9746 computeUnitsPerShaderArray : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9747 simdPerComputeUnit : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9748 wavefrontsPerSimd : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9749 wavefrontSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9750 sgprsPerSimd : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9751 minSgprAllocation : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9752 maxSgprAllocation : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9753 sgprAllocationGranularity : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9754 vgprsPerSimd : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9755 minVgprAllocation : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9756 maxVgprAllocation : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9757 vgprAllocationGranularity : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9758 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9742 subtype VkMemoryOverallocationBehaviorAMD is unsigned; VK_MEMORY_OVERALLOCATION_BEHAVIOR_DEFAULT_AMD : constant unsigned := 0; VK_MEMORY_OVERALLOCATION_BEHAVIOR_ALLOWED_AMD : constant unsigned := 1; VK_MEMORY_OVERALLOCATION_BEHAVIOR_DISALLOWED_AMD : constant unsigned := 2; VK_MEMORY_OVERALLOCATION_BEHAVIOR_BEGIN_RANGE_AMD : constant unsigned := 0; VK_MEMORY_OVERALLOCATION_BEHAVIOR_END_RANGE_AMD : constant unsigned := 2; VK_MEMORY_OVERALLOCATION_BEHAVIOR_RANGE_SIZE_AMD : constant unsigned := 3; VK_MEMORY_OVERALLOCATION_BEHAVIOR_MAX_ENUM_AMD : constant unsigned := 2147483647; -- vulkan_core.h:9767 type VkDeviceMemoryOverallocationCreateInfoAMD is record sType : aliased VkStructureType; -- vulkan_core.h:9777 pNext : System.Address; -- vulkan_core.h:9778 overallocationBehavior : aliased VkMemoryOverallocationBehaviorAMD; -- vulkan_core.h:9779 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9776 type VkPhysicalDeviceVertexAttributeDivisorPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9788 pNext : System.Address; -- vulkan_core.h:9789 maxVertexAttribDivisor : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9790 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9787 type VkVertexInputBindingDivisorDescriptionEXT is record binding : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9794 divisor : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9795 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9793 type VkPipelineVertexInputDivisorStateCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9799 pNext : System.Address; -- vulkan_core.h:9800 vertexBindingDivisorCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9801 pVertexBindingDivisors : access constant VkVertexInputBindingDivisorDescriptionEXT; -- vulkan_core.h:9802 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9798 type VkPhysicalDeviceVertexAttributeDivisorFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9806 pNext : System.Address; -- vulkan_core.h:9807 vertexAttributeInstanceRateDivisor : aliased VkBool32; -- vulkan_core.h:9808 vertexAttributeInstanceRateZeroDivisor : aliased VkBool32; -- vulkan_core.h:9809 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9805 subtype VkPipelineCreationFeedbackFlagBitsEXT is unsigned; VK_PIPELINE_CREATION_FEEDBACK_VALID_BIT_EXT : constant unsigned := 1; VK_PIPELINE_CREATION_FEEDBACK_APPLICATION_PIPELINE_CACHE_HIT_BIT_EXT : constant unsigned := 2; VK_PIPELINE_CREATION_FEEDBACK_BASE_PIPELINE_ACCELERATION_BIT_EXT : constant unsigned := 4; VK_PIPELINE_CREATION_FEEDBACK_FLAG_BITS_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:9818 subtype VkPipelineCreationFeedbackFlagsEXT is VkFlags; -- vulkan_core.h:9824 type VkPipelineCreationFeedbackEXT is record flags : aliased VkPipelineCreationFeedbackFlagsEXT; -- vulkan_core.h:9826 duration : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:9827 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9825 type VkPipelineCreationFeedbackCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:9831 pNext : System.Address; -- vulkan_core.h:9832 pPipelineCreationFeedback : access VkPipelineCreationFeedbackEXT; -- vulkan_core.h:9833 pipelineStageCreationFeedbackCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9834 pPipelineStageCreationFeedbacks : access VkPipelineCreationFeedbackEXT; -- vulkan_core.h:9835 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9830 type VkPhysicalDeviceComputeShaderDerivativesFeaturesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9849 pNext : System.Address; -- vulkan_core.h:9850 computeDerivativeGroupQuads : aliased VkBool32; -- vulkan_core.h:9851 computeDerivativeGroupLinear : aliased VkBool32; -- vulkan_core.h:9852 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9848 type VkPhysicalDeviceMeshShaderFeaturesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9861 pNext : System.Address; -- vulkan_core.h:9862 taskShader : aliased VkBool32; -- vulkan_core.h:9863 meshShader : aliased VkBool32; -- vulkan_core.h:9864 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9860 type VkPhysicalDeviceMeshShaderPropertiesNV_array1331 is array (0 .. 2) of aliased Interfaces.C.unsigned_short; type VkPhysicalDeviceMeshShaderPropertiesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9868 pNext : System.Address; -- vulkan_core.h:9869 maxDrawMeshTasksCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9870 maxTaskWorkGroupInvocations : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9871 maxTaskWorkGroupSize : aliased VkPhysicalDeviceMeshShaderPropertiesNV_array1331; -- vulkan_core.h:9872 maxTaskTotalMemorySize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9873 maxTaskOutputCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9874 maxMeshWorkGroupInvocations : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9875 maxMeshWorkGroupSize : aliased VkPhysicalDeviceMeshShaderPropertiesNV_array1331; -- vulkan_core.h:9876 maxMeshTotalMemorySize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9877 maxMeshOutputVertices : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9878 maxMeshOutputPrimitives : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9879 maxMeshMultiviewViewCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9880 meshOutputPerVertexGranularity : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9881 meshOutputPerPrimitiveGranularity : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9882 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9867 type VkDrawMeshTasksIndirectCommandNV is record taskCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9886 firstTask : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9887 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9885 type PFN_vkCmdDrawMeshTasksNV is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:9890 type PFN_vkCmdDrawMeshTasksIndirectNV is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : Interfaces.C.unsigned_short; arg5 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:9891 type PFN_vkCmdDrawMeshTasksIndirectCountNV is access procedure (arg1 : VkCommandBuffer; arg2 : VkBuffer; arg3 : VkDeviceSize; arg4 : VkBuffer; arg5 : VkDeviceSize; arg6 : Interfaces.C.unsigned_short; arg7 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:9892 procedure vkCmdDrawMeshTasksNV (commandBuffer : VkCommandBuffer; taskCount : Interfaces.C.unsigned_short; firstTask : Interfaces.C.unsigned_short) -- vulkan_core.h:9895 with Import => True, Convention => C, External_Name => "vkCmdDrawMeshTasksNV"; procedure vkCmdDrawMeshTasksIndirectNV (commandBuffer : VkCommandBuffer; buffer : VkBuffer; offset : VkDeviceSize; drawCount : Interfaces.C.unsigned_short; stride : Interfaces.C.unsigned_short) -- vulkan_core.h:9900 with Import => True, Convention => C, External_Name => "vkCmdDrawMeshTasksIndirectNV"; procedure vkCmdDrawMeshTasksIndirectCountNV (commandBuffer : VkCommandBuffer; buffer : VkBuffer; offset : VkDeviceSize; countBuffer : VkBuffer; countBufferOffset : VkDeviceSize; maxDrawCount : Interfaces.C.unsigned_short; stride : Interfaces.C.unsigned_short) -- vulkan_core.h:9907 with Import => True, Convention => C, External_Name => "vkCmdDrawMeshTasksIndirectCountNV"; type VkPhysicalDeviceFragmentShaderBarycentricFeaturesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9922 pNext : System.Address; -- vulkan_core.h:9923 fragmentShaderBarycentric : aliased VkBool32; -- vulkan_core.h:9924 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9921 type VkPhysicalDeviceShaderImageFootprintFeaturesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9933 pNext : System.Address; -- vulkan_core.h:9934 imageFootprint : aliased VkBool32; -- vulkan_core.h:9935 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9932 type VkPipelineViewportExclusiveScissorStateCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:9944 pNext : System.Address; -- vulkan_core.h:9945 exclusiveScissorCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:9946 pExclusiveScissors : access constant VkRect2D; -- vulkan_core.h:9947 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9943 type VkPhysicalDeviceExclusiveScissorFeaturesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9951 pNext : System.Address; -- vulkan_core.h:9952 exclusiveScissor : aliased VkBool32; -- vulkan_core.h:9953 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9950 type PFN_vkCmdSetExclusiveScissorNV is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short; arg4 : access constant VkRect2D) with Convention => C; -- vulkan_core.h:9956 procedure vkCmdSetExclusiveScissorNV (commandBuffer : VkCommandBuffer; firstExclusiveScissor : Interfaces.C.unsigned_short; exclusiveScissorCount : Interfaces.C.unsigned_short; pExclusiveScissors : access constant VkRect2D) -- vulkan_core.h:9959 with Import => True, Convention => C, External_Name => "vkCmdSetExclusiveScissorNV"; type VkQueueFamilyCheckpointPropertiesNV is record sType : aliased VkStructureType; -- vulkan_core.h:9971 pNext : System.Address; -- vulkan_core.h:9972 checkpointExecutionStageMask : aliased VkPipelineStageFlags; -- vulkan_core.h:9973 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9970 type VkCheckpointDataNV is record sType : aliased VkStructureType; -- vulkan_core.h:9977 pNext : System.Address; -- vulkan_core.h:9978 stage : aliased VkPipelineStageFlagBits; -- vulkan_core.h:9979 pCheckpointMarker : System.Address; -- vulkan_core.h:9980 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:9976 type PFN_vkCmdSetCheckpointNV is access procedure (arg1 : VkCommandBuffer; arg2 : System.Address) with Convention => C; -- vulkan_core.h:9983 type PFN_vkGetQueueCheckpointDataNV is access procedure (arg1 : VkQueue; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkCheckpointDataNV) with Convention => C; -- vulkan_core.h:9984 procedure vkCmdSetCheckpointNV (commandBuffer : VkCommandBuffer; pCheckpointMarker : System.Address) -- vulkan_core.h:9987 with Import => True, Convention => C, External_Name => "vkCmdSetCheckpointNV"; procedure vkGetQueueCheckpointDataNV (queue : VkQueue; pCheckpointDataCount : access Interfaces.C.unsigned_short; pCheckpointData : access VkCheckpointDataNV) -- vulkan_core.h:9991 with Import => True, Convention => C, External_Name => "vkGetQueueCheckpointDataNV"; type VkPhysicalDeviceShaderIntegerFunctions2FeaturesINTEL is record sType : aliased VkStructureType; -- vulkan_core.h:10002 pNext : System.Address; -- vulkan_core.h:10003 shaderIntegerFunctions2 : aliased VkBool32; -- vulkan_core.h:10004 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10001 type VkPerformanceConfigurationINTEL_T is null record; -- incomplete struct type VkPerformanceConfigurationINTEL is access all VkPerformanceConfigurationINTEL_T; -- vulkan_core.h:10010 subtype VkPerformanceConfigurationTypeINTEL is unsigned; VK_PERFORMANCE_CONFIGURATION_TYPE_COMMAND_QUEUE_METRICS_DISCOVERY_ACTIVATED_INTEL : constant unsigned := 0; VK_PERFORMANCE_CONFIGURATION_TYPE_BEGIN_RANGE_INTEL : constant unsigned := 0; VK_PERFORMANCE_CONFIGURATION_TYPE_END_RANGE_INTEL : constant unsigned := 0; VK_PERFORMANCE_CONFIGURATION_TYPE_RANGE_SIZE_INTEL : constant unsigned := 1; VK_PERFORMANCE_CONFIGURATION_TYPE_MAX_ENUM_INTEL : constant unsigned := 2147483647; -- vulkan_core.h:10014 subtype VkQueryPoolSamplingModeINTEL is unsigned; VK_QUERY_POOL_SAMPLING_MODE_MANUAL_INTEL : constant unsigned := 0; VK_QUERY_POOL_SAMPLING_MODE_BEGIN_RANGE_INTEL : constant unsigned := 0; VK_QUERY_POOL_SAMPLING_MODE_END_RANGE_INTEL : constant unsigned := 0; VK_QUERY_POOL_SAMPLING_MODE_RANGE_SIZE_INTEL : constant unsigned := 1; VK_QUERY_POOL_SAMPLING_MODE_MAX_ENUM_INTEL : constant unsigned := 2147483647; -- vulkan_core.h:10022 subtype VkPerformanceOverrideTypeINTEL is unsigned; VK_PERFORMANCE_OVERRIDE_TYPE_NULL_HARDWARE_INTEL : constant unsigned := 0; VK_PERFORMANCE_OVERRIDE_TYPE_FLUSH_GPU_CACHES_INTEL : constant unsigned := 1; VK_PERFORMANCE_OVERRIDE_TYPE_BEGIN_RANGE_INTEL : constant unsigned := 0; VK_PERFORMANCE_OVERRIDE_TYPE_END_RANGE_INTEL : constant unsigned := 1; VK_PERFORMANCE_OVERRIDE_TYPE_RANGE_SIZE_INTEL : constant unsigned := 2; VK_PERFORMANCE_OVERRIDE_TYPE_MAX_ENUM_INTEL : constant unsigned := 2147483647; -- vulkan_core.h:10030 subtype VkPerformanceParameterTypeINTEL is unsigned; VK_PERFORMANCE_PARAMETER_TYPE_HW_COUNTERS_SUPPORTED_INTEL : constant unsigned := 0; VK_PERFORMANCE_PARAMETER_TYPE_STREAM_MARKER_VALID_BITS_INTEL : constant unsigned := 1; VK_PERFORMANCE_PARAMETER_TYPE_BEGIN_RANGE_INTEL : constant unsigned := 0; VK_PERFORMANCE_PARAMETER_TYPE_END_RANGE_INTEL : constant unsigned := 1; VK_PERFORMANCE_PARAMETER_TYPE_RANGE_SIZE_INTEL : constant unsigned := 2; VK_PERFORMANCE_PARAMETER_TYPE_MAX_ENUM_INTEL : constant unsigned := 2147483647; -- vulkan_core.h:10039 subtype VkPerformanceValueTypeINTEL is unsigned; VK_PERFORMANCE_VALUE_TYPE_UINT32_INTEL : constant unsigned := 0; VK_PERFORMANCE_VALUE_TYPE_UINT64_INTEL : constant unsigned := 1; VK_PERFORMANCE_VALUE_TYPE_FLOAT_INTEL : constant unsigned := 2; VK_PERFORMANCE_VALUE_TYPE_BOOL_INTEL : constant unsigned := 3; VK_PERFORMANCE_VALUE_TYPE_STRING_INTEL : constant unsigned := 4; VK_PERFORMANCE_VALUE_TYPE_BEGIN_RANGE_INTEL : constant unsigned := 0; VK_PERFORMANCE_VALUE_TYPE_END_RANGE_INTEL : constant unsigned := 4; VK_PERFORMANCE_VALUE_TYPE_RANGE_SIZE_INTEL : constant unsigned := 5; VK_PERFORMANCE_VALUE_TYPE_MAX_ENUM_INTEL : constant unsigned := 2147483647; -- vulkan_core.h:10048 type VkPerformanceValueDataINTEL (discr : unsigned := 0) is record case discr is when 0 => value32 : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10060 when 1 => value64 : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:10061 when 2 => valueFloat : aliased float; -- vulkan_core.h:10062 when 3 => valueBool : aliased VkBool32; -- vulkan_core.h:10063 when others => valueString : Interfaces.C.Strings.chars_ptr; -- vulkan_core.h:10064 end case; end record with Convention => C_Pass_By_Copy, Unchecked_Union => True; -- vulkan_core.h:10059 type VkPerformanceValueINTEL is record c_type : aliased VkPerformanceValueTypeINTEL; -- vulkan_core.h:10068 data : aliased VkPerformanceValueDataINTEL; -- vulkan_core.h:10069 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10067 type VkInitializePerformanceApiInfoINTEL is record sType : aliased VkStructureType; -- vulkan_core.h:10073 pNext : System.Address; -- vulkan_core.h:10074 pUserData : System.Address; -- vulkan_core.h:10075 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10072 type VkQueryPoolCreateInfoINTEL is record sType : aliased VkStructureType; -- vulkan_core.h:10079 pNext : System.Address; -- vulkan_core.h:10080 performanceCountersSampling : aliased VkQueryPoolSamplingModeINTEL; -- vulkan_core.h:10081 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10078 type VkPerformanceMarkerInfoINTEL is record sType : aliased VkStructureType; -- vulkan_core.h:10085 pNext : System.Address; -- vulkan_core.h:10086 marker : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:10087 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10084 type VkPerformanceStreamMarkerInfoINTEL is record sType : aliased VkStructureType; -- vulkan_core.h:10091 pNext : System.Address; -- vulkan_core.h:10092 marker : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10093 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10090 type VkPerformanceOverrideInfoINTEL is record sType : aliased VkStructureType; -- vulkan_core.h:10097 pNext : System.Address; -- vulkan_core.h:10098 c_type : aliased VkPerformanceOverrideTypeINTEL; -- vulkan_core.h:10099 enable : aliased VkBool32; -- vulkan_core.h:10100 parameter : aliased Interfaces.C.unsigned_long; -- vulkan_core.h:10101 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10096 type VkPerformanceConfigurationAcquireInfoINTEL is record sType : aliased VkStructureType; -- vulkan_core.h:10105 pNext : System.Address; -- vulkan_core.h:10106 c_type : aliased VkPerformanceConfigurationTypeINTEL; -- vulkan_core.h:10107 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10104 type PFN_vkInitializePerformanceApiINTEL is access function (arg1 : VkDevice; arg2 : access constant VkInitializePerformanceApiInfoINTEL) return VkResult with Convention => C; -- vulkan_core.h:10110 type PFN_vkUninitializePerformanceApiINTEL is access procedure (arg1 : VkDevice) with Convention => C; -- vulkan_core.h:10111 type PFN_vkCmdSetPerformanceMarkerINTEL is access function (arg1 : VkCommandBuffer; arg2 : access constant VkPerformanceMarkerInfoINTEL) return VkResult with Convention => C; -- vulkan_core.h:10112 type PFN_vkCmdSetPerformanceStreamMarkerINTEL is access function (arg1 : VkCommandBuffer; arg2 : access constant VkPerformanceStreamMarkerInfoINTEL) return VkResult with Convention => C; -- vulkan_core.h:10113 type PFN_vkCmdSetPerformanceOverrideINTEL is access function (arg1 : VkCommandBuffer; arg2 : access constant VkPerformanceOverrideInfoINTEL) return VkResult with Convention => C; -- vulkan_core.h:10114 type PFN_vkAcquirePerformanceConfigurationINTEL is access function (arg1 : VkDevice; arg2 : access constant VkPerformanceConfigurationAcquireInfoINTEL; arg3 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:10115 type PFN_vkReleasePerformanceConfigurationINTEL is access function (arg1 : VkDevice; arg2 : VkPerformanceConfigurationINTEL) return VkResult with Convention => C; -- vulkan_core.h:10116 type PFN_vkQueueSetPerformanceConfigurationINTEL is access function (arg1 : VkQueue; arg2 : VkPerformanceConfigurationINTEL) return VkResult with Convention => C; -- vulkan_core.h:10117 type PFN_vkGetPerformanceParameterINTEL is access function (arg1 : VkDevice; arg2 : VkPerformanceParameterTypeINTEL; arg3 : access VkPerformanceValueINTEL) return VkResult with Convention => C; -- vulkan_core.h:10118 function vkInitializePerformanceApiINTEL (device : VkDevice; pInitializeInfo : access constant VkInitializePerformanceApiInfoINTEL) return VkResult -- vulkan_core.h:10121 with Import => True, Convention => C, External_Name => "vkInitializePerformanceApiINTEL"; procedure vkUninitializePerformanceApiINTEL (device : VkDevice) -- vulkan_core.h:10125 with Import => True, Convention => C, External_Name => "vkUninitializePerformanceApiINTEL"; function vkCmdSetPerformanceMarkerINTEL (commandBuffer : VkCommandBuffer; pMarkerInfo : access constant VkPerformanceMarkerInfoINTEL) return VkResult -- vulkan_core.h:10128 with Import => True, Convention => C, External_Name => "vkCmdSetPerformanceMarkerINTEL"; function vkCmdSetPerformanceStreamMarkerINTEL (commandBuffer : VkCommandBuffer; pMarkerInfo : access constant VkPerformanceStreamMarkerInfoINTEL) return VkResult -- vulkan_core.h:10132 with Import => True, Convention => C, External_Name => "vkCmdSetPerformanceStreamMarkerINTEL"; function vkCmdSetPerformanceOverrideINTEL (commandBuffer : VkCommandBuffer; pOverrideInfo : access constant VkPerformanceOverrideInfoINTEL) return VkResult -- vulkan_core.h:10136 with Import => True, Convention => C, External_Name => "vkCmdSetPerformanceOverrideINTEL"; function vkAcquirePerformanceConfigurationINTEL (device : VkDevice; pAcquireInfo : access constant VkPerformanceConfigurationAcquireInfoINTEL; pConfiguration : System.Address) return VkResult -- vulkan_core.h:10140 with Import => True, Convention => C, External_Name => "vkAcquirePerformanceConfigurationINTEL"; function vkReleasePerformanceConfigurationINTEL (device : VkDevice; configuration : VkPerformanceConfigurationINTEL) return VkResult -- vulkan_core.h:10145 with Import => True, Convention => C, External_Name => "vkReleasePerformanceConfigurationINTEL"; function vkQueueSetPerformanceConfigurationINTEL (queue : VkQueue; configuration : VkPerformanceConfigurationINTEL) return VkResult -- vulkan_core.h:10149 with Import => True, Convention => C, External_Name => "vkQueueSetPerformanceConfigurationINTEL"; function vkGetPerformanceParameterINTEL (device : VkDevice; parameter : VkPerformanceParameterTypeINTEL; pValue : access VkPerformanceValueINTEL) return VkResult -- vulkan_core.h:10153 with Import => True, Convention => C, External_Name => "vkGetPerformanceParameterINTEL"; type VkPhysicalDevicePCIBusInfoPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10164 pNext : System.Address; -- vulkan_core.h:10165 pciDomain : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10166 pciBus : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10167 pciDevice : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10168 pciFunction : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10169 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10163 type VkDisplayNativeHdrSurfaceCapabilitiesAMD is record sType : aliased VkStructureType; -- vulkan_core.h:10178 pNext : System.Address; -- vulkan_core.h:10179 localDimmingSupport : aliased VkBool32; -- vulkan_core.h:10180 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10177 type VkSwapchainDisplayNativeHdrCreateInfoAMD is record sType : aliased VkStructureType; -- vulkan_core.h:10184 pNext : System.Address; -- vulkan_core.h:10185 localDimmingEnable : aliased VkBool32; -- vulkan_core.h:10186 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10183 type PFN_vkSetLocalDimmingAMD is access procedure (arg1 : VkDevice; arg2 : VkSwapchainKHR; arg3 : VkBool32) with Convention => C; -- vulkan_core.h:10189 procedure vkSetLocalDimmingAMD (device : VkDevice; swapChain : VkSwapchainKHR; localDimmingEnable : VkBool32) -- vulkan_core.h:10192 with Import => True, Convention => C, External_Name => "vkSetLocalDimmingAMD"; type VkPhysicalDeviceFragmentDensityMapFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10203 pNext : System.Address; -- vulkan_core.h:10204 fragmentDensityMap : aliased VkBool32; -- vulkan_core.h:10205 fragmentDensityMapDynamic : aliased VkBool32; -- vulkan_core.h:10206 fragmentDensityMapNonSubsampledImages : aliased VkBool32; -- vulkan_core.h:10207 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10202 type VkPhysicalDeviceFragmentDensityMapPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10211 pNext : System.Address; -- vulkan_core.h:10212 minFragmentDensityTexelSize : aliased VkExtent2D; -- vulkan_core.h:10213 maxFragmentDensityTexelSize : aliased VkExtent2D; -- vulkan_core.h:10214 fragmentDensityInvocations : aliased VkBool32; -- vulkan_core.h:10215 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10210 type VkRenderPassFragmentDensityMapCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10219 pNext : System.Address; -- vulkan_core.h:10220 fragmentDensityMapAttachment : aliased VkAttachmentReference; -- vulkan_core.h:10221 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10218 subtype VkPhysicalDeviceScalarBlockLayoutFeaturesEXT is VkPhysicalDeviceScalarBlockLayoutFeatures; -- vulkan_core.h:10229 type VkPhysicalDeviceSubgroupSizeControlFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10247 pNext : System.Address; -- vulkan_core.h:10248 subgroupSizeControl : aliased VkBool32; -- vulkan_core.h:10249 computeFullSubgroups : aliased VkBool32; -- vulkan_core.h:10250 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10246 type VkPhysicalDeviceSubgroupSizeControlPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10254 pNext : System.Address; -- vulkan_core.h:10255 minSubgroupSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10256 maxSubgroupSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10257 maxComputeWorkgroupSubgroups : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10258 requiredSubgroupSizeStages : aliased VkShaderStageFlags; -- vulkan_core.h:10259 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10253 type VkPipelineShaderStageRequiredSubgroupSizeCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10263 pNext : System.Address; -- vulkan_core.h:10264 requiredSubgroupSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10265 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10262 subtype VkShaderCorePropertiesFlagBitsAMD is unsigned; VK_SHADER_CORE_PROPERTIES_FLAG_BITS_MAX_ENUM_AMD : constant unsigned := 2147483647; -- vulkan_core.h:10274 subtype VkShaderCorePropertiesFlagsAMD is VkFlags; -- vulkan_core.h:10277 type VkPhysicalDeviceShaderCoreProperties2AMD is record sType : aliased VkStructureType; -- vulkan_core.h:10279 pNext : System.Address; -- vulkan_core.h:10280 shaderCoreFeatures : aliased VkShaderCorePropertiesFlagsAMD; -- vulkan_core.h:10281 activeComputeUnitCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10282 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10278 type VkPhysicalDeviceCoherentMemoryFeaturesAMD is record sType : aliased VkStructureType; -- vulkan_core.h:10291 pNext : System.Address; -- vulkan_core.h:10292 deviceCoherentMemory : aliased VkBool32; -- vulkan_core.h:10293 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10290 type VkPhysicalDeviceMemoryBudgetPropertiesEXT_array5703 is array (0 .. 15) of aliased VkDeviceSize; type VkPhysicalDeviceMemoryBudgetPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10302 pNext : System.Address; -- vulkan_core.h:10303 heapBudget : aliased VkPhysicalDeviceMemoryBudgetPropertiesEXT_array5703; -- vulkan_core.h:10304 heapUsage : aliased VkPhysicalDeviceMemoryBudgetPropertiesEXT_array5703; -- vulkan_core.h:10305 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10301 type VkPhysicalDeviceMemoryPriorityFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10314 pNext : System.Address; -- vulkan_core.h:10315 memoryPriority : aliased VkBool32; -- vulkan_core.h:10316 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10313 type VkMemoryPriorityAllocateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10320 pNext : System.Address; -- vulkan_core.h:10321 priority : aliased float; -- vulkan_core.h:10322 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10319 type VkPhysicalDeviceDedicatedAllocationImageAliasingFeaturesNV is record sType : aliased VkStructureType; -- vulkan_core.h:10331 pNext : System.Address; -- vulkan_core.h:10332 dedicatedAllocationImageAliasing : aliased VkBool32; -- vulkan_core.h:10333 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10330 type VkPhysicalDeviceBufferDeviceAddressFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10342 pNext : System.Address; -- vulkan_core.h:10343 bufferDeviceAddress : aliased VkBool32; -- vulkan_core.h:10344 bufferDeviceAddressCaptureReplay : aliased VkBool32; -- vulkan_core.h:10345 bufferDeviceAddressMultiDevice : aliased VkBool32; -- vulkan_core.h:10346 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10341 subtype VkPhysicalDeviceBufferAddressFeaturesEXT is VkPhysicalDeviceBufferDeviceAddressFeaturesEXT; -- vulkan_core.h:10349 subtype VkBufferDeviceAddressInfoEXT is VkBufferDeviceAddressInfo; -- vulkan_core.h:10351 type VkBufferDeviceAddressCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10354 pNext : System.Address; -- vulkan_core.h:10355 deviceAddress : aliased VkDeviceAddress; -- vulkan_core.h:10356 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10353 type PFN_vkGetBufferDeviceAddressEXT is access function (arg1 : VkDevice; arg2 : access constant VkBufferDeviceAddressInfo) return VkDeviceAddress with Convention => C; -- vulkan_core.h:10359 function vkGetBufferDeviceAddressEXT (device : VkDevice; pInfo : access constant VkBufferDeviceAddressInfo) return VkDeviceAddress -- vulkan_core.h:10362 with Import => True, Convention => C, External_Name => "vkGetBufferDeviceAddressEXT"; subtype VkToolPurposeFlagBitsEXT is unsigned; VK_TOOL_PURPOSE_VALIDATION_BIT_EXT : constant unsigned := 1; VK_TOOL_PURPOSE_PROFILING_BIT_EXT : constant unsigned := 2; VK_TOOL_PURPOSE_TRACING_BIT_EXT : constant unsigned := 4; VK_TOOL_PURPOSE_ADDITIONAL_FEATURES_BIT_EXT : constant unsigned := 8; VK_TOOL_PURPOSE_MODIFYING_FEATURES_BIT_EXT : constant unsigned := 16; VK_TOOL_PURPOSE_DEBUG_REPORTING_BIT_EXT : constant unsigned := 32; VK_TOOL_PURPOSE_DEBUG_MARKERS_BIT_EXT : constant unsigned := 64; VK_TOOL_PURPOSE_FLAG_BITS_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:10372 subtype VkToolPurposeFlagsEXT is VkFlags; -- vulkan_core.h:10382 subtype VkPhysicalDeviceToolPropertiesEXT_array1342 is Interfaces.C.char_array (0 .. 255); type VkPhysicalDeviceToolPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10384 pNext : System.Address; -- vulkan_core.h:10385 name : aliased VkPhysicalDeviceToolPropertiesEXT_array1342; -- vulkan_core.h:10386 version : aliased VkPhysicalDeviceToolPropertiesEXT_array1342; -- vulkan_core.h:10387 purposes : aliased VkToolPurposeFlagsEXT; -- vulkan_core.h:10388 description : aliased VkPhysicalDeviceToolPropertiesEXT_array1342; -- vulkan_core.h:10389 layer : aliased VkPhysicalDeviceToolPropertiesEXT_array1342; -- vulkan_core.h:10390 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10383 type PFN_vkGetPhysicalDeviceToolPropertiesEXT is access function (arg1 : VkPhysicalDevice; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkPhysicalDeviceToolPropertiesEXT) return VkResult with Convention => C; -- vulkan_core.h:10393 function vkGetPhysicalDeviceToolPropertiesEXT (physicalDevice : VkPhysicalDevice; pToolCount : access Interfaces.C.unsigned_short; pToolProperties : access VkPhysicalDeviceToolPropertiesEXT) return VkResult -- vulkan_core.h:10396 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceToolPropertiesEXT"; subtype VkImageStencilUsageCreateInfoEXT is VkImageStencilUsageCreateInfo; -- vulkan_core.h:10406 subtype VkValidationFeatureEnableEXT is unsigned; VK_VALIDATION_FEATURE_ENABLE_GPU_ASSISTED_EXT : constant unsigned := 0; VK_VALIDATION_FEATURE_ENABLE_GPU_ASSISTED_RESERVE_BINDING_SLOT_EXT : constant unsigned := 1; VK_VALIDATION_FEATURE_ENABLE_BEST_PRACTICES_EXT : constant unsigned := 2; VK_VALIDATION_FEATURE_ENABLE_BEGIN_RANGE_EXT : constant unsigned := 0; VK_VALIDATION_FEATURE_ENABLE_END_RANGE_EXT : constant unsigned := 2; VK_VALIDATION_FEATURE_ENABLE_RANGE_SIZE_EXT : constant unsigned := 3; VK_VALIDATION_FEATURE_ENABLE_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:10414 subtype VkValidationFeatureDisableEXT is unsigned; VK_VALIDATION_FEATURE_DISABLE_ALL_EXT : constant unsigned := 0; VK_VALIDATION_FEATURE_DISABLE_SHADERS_EXT : constant unsigned := 1; VK_VALIDATION_FEATURE_DISABLE_THREAD_SAFETY_EXT : constant unsigned := 2; VK_VALIDATION_FEATURE_DISABLE_API_PARAMETERS_EXT : constant unsigned := 3; VK_VALIDATION_FEATURE_DISABLE_OBJECT_LIFETIMES_EXT : constant unsigned := 4; VK_VALIDATION_FEATURE_DISABLE_CORE_CHECKS_EXT : constant unsigned := 5; VK_VALIDATION_FEATURE_DISABLE_UNIQUE_HANDLES_EXT : constant unsigned := 6; VK_VALIDATION_FEATURE_DISABLE_BEGIN_RANGE_EXT : constant unsigned := 0; VK_VALIDATION_FEATURE_DISABLE_END_RANGE_EXT : constant unsigned := 6; VK_VALIDATION_FEATURE_DISABLE_RANGE_SIZE_EXT : constant unsigned := 7; VK_VALIDATION_FEATURE_DISABLE_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:10424 type VkValidationFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10438 pNext : System.Address; -- vulkan_core.h:10439 enabledValidationFeatureCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10440 pEnabledValidationFeatures : access VkValidationFeatureEnableEXT; -- vulkan_core.h:10441 disabledValidationFeatureCount : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10442 pDisabledValidationFeatures : access VkValidationFeatureDisableEXT; -- vulkan_core.h:10443 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10437 subtype VkComponentTypeNV is unsigned; VK_COMPONENT_TYPE_FLOAT16_NV : constant unsigned := 0; VK_COMPONENT_TYPE_FLOAT32_NV : constant unsigned := 1; VK_COMPONENT_TYPE_FLOAT64_NV : constant unsigned := 2; VK_COMPONENT_TYPE_SINT8_NV : constant unsigned := 3; VK_COMPONENT_TYPE_SINT16_NV : constant unsigned := 4; VK_COMPONENT_TYPE_SINT32_NV : constant unsigned := 5; VK_COMPONENT_TYPE_SINT64_NV : constant unsigned := 6; VK_COMPONENT_TYPE_UINT8_NV : constant unsigned := 7; VK_COMPONENT_TYPE_UINT16_NV : constant unsigned := 8; VK_COMPONENT_TYPE_UINT32_NV : constant unsigned := 9; VK_COMPONENT_TYPE_UINT64_NV : constant unsigned := 10; VK_COMPONENT_TYPE_BEGIN_RANGE_NV : constant unsigned := 0; VK_COMPONENT_TYPE_END_RANGE_NV : constant unsigned := 10; VK_COMPONENT_TYPE_RANGE_SIZE_NV : constant unsigned := 11; VK_COMPONENT_TYPE_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:10452 subtype VkScopeNV is unsigned; VK_SCOPE_DEVICE_NV : constant unsigned := 1; VK_SCOPE_WORKGROUP_NV : constant unsigned := 2; VK_SCOPE_SUBGROUP_NV : constant unsigned := 3; VK_SCOPE_QUEUE_FAMILY_NV : constant unsigned := 5; VK_SCOPE_BEGIN_RANGE_NV : constant unsigned := 1; VK_SCOPE_END_RANGE_NV : constant unsigned := 5; VK_SCOPE_RANGE_SIZE_NV : constant unsigned := 5; VK_SCOPE_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:10470 type VkCooperativeMatrixPropertiesNV is record sType : aliased VkStructureType; -- vulkan_core.h:10481 pNext : System.Address; -- vulkan_core.h:10482 MSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10483 NSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10484 KSize : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10485 AType : aliased VkComponentTypeNV; -- vulkan_core.h:10486 BType : aliased VkComponentTypeNV; -- vulkan_core.h:10487 CType : aliased VkComponentTypeNV; -- vulkan_core.h:10488 DType : aliased VkComponentTypeNV; -- vulkan_core.h:10489 scope : aliased VkScopeNV; -- vulkan_core.h:10490 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10480 type VkPhysicalDeviceCooperativeMatrixFeaturesNV is record sType : aliased VkStructureType; -- vulkan_core.h:10494 pNext : System.Address; -- vulkan_core.h:10495 cooperativeMatrix : aliased VkBool32; -- vulkan_core.h:10496 cooperativeMatrixRobustBufferAccess : aliased VkBool32; -- vulkan_core.h:10497 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10493 type VkPhysicalDeviceCooperativeMatrixPropertiesNV is record sType : aliased VkStructureType; -- vulkan_core.h:10501 pNext : System.Address; -- vulkan_core.h:10502 cooperativeMatrixSupportedStages : aliased VkShaderStageFlags; -- vulkan_core.h:10503 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10500 type PFN_vkGetPhysicalDeviceCooperativeMatrixPropertiesNV is access function (arg1 : VkPhysicalDevice; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkCooperativeMatrixPropertiesNV) return VkResult with Convention => C; -- vulkan_core.h:10506 function vkGetPhysicalDeviceCooperativeMatrixPropertiesNV (physicalDevice : VkPhysicalDevice; pPropertyCount : access Interfaces.C.unsigned_short; pProperties : access VkCooperativeMatrixPropertiesNV) return VkResult -- vulkan_core.h:10509 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceCooperativeMatrixPropertiesNV"; subtype VkCoverageReductionModeNV is unsigned; VK_COVERAGE_REDUCTION_MODE_MERGE_NV : constant unsigned := 0; VK_COVERAGE_REDUCTION_MODE_TRUNCATE_NV : constant unsigned := 1; VK_COVERAGE_REDUCTION_MODE_BEGIN_RANGE_NV : constant unsigned := 0; VK_COVERAGE_REDUCTION_MODE_END_RANGE_NV : constant unsigned := 1; VK_COVERAGE_REDUCTION_MODE_RANGE_SIZE_NV : constant unsigned := 2; VK_COVERAGE_REDUCTION_MODE_MAX_ENUM_NV : constant unsigned := 2147483647; -- vulkan_core.h:10520 subtype VkPipelineCoverageReductionStateCreateFlagsNV is VkFlags; -- vulkan_core.h:10528 type VkPhysicalDeviceCoverageReductionModeFeaturesNV is record sType : aliased VkStructureType; -- vulkan_core.h:10530 pNext : System.Address; -- vulkan_core.h:10531 coverageReductionMode : aliased VkBool32; -- vulkan_core.h:10532 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10529 type VkPipelineCoverageReductionStateCreateInfoNV is record sType : aliased VkStructureType; -- vulkan_core.h:10536 pNext : System.Address; -- vulkan_core.h:10537 flags : aliased VkPipelineCoverageReductionStateCreateFlagsNV; -- vulkan_core.h:10538 coverageReductionMode : aliased VkCoverageReductionModeNV; -- vulkan_core.h:10539 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10535 type VkFramebufferMixedSamplesCombinationNV is record sType : aliased VkStructureType; -- vulkan_core.h:10543 pNext : System.Address; -- vulkan_core.h:10544 coverageReductionMode : aliased VkCoverageReductionModeNV; -- vulkan_core.h:10545 rasterizationSamples : aliased VkSampleCountFlagBits; -- vulkan_core.h:10546 depthStencilSamples : aliased VkSampleCountFlags; -- vulkan_core.h:10547 colorSamples : aliased VkSampleCountFlags; -- vulkan_core.h:10548 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10542 type PFN_vkGetPhysicalDeviceSupportedFramebufferMixedSamplesCombinationsNV is access function (arg1 : VkPhysicalDevice; arg2 : access Interfaces.C.unsigned_short; arg3 : access VkFramebufferMixedSamplesCombinationNV) return VkResult with Convention => C; -- vulkan_core.h:10551 function vkGetPhysicalDeviceSupportedFramebufferMixedSamplesCombinationsNV (physicalDevice : VkPhysicalDevice; pCombinationCount : access Interfaces.C.unsigned_short; pCombinations : access VkFramebufferMixedSamplesCombinationNV) return VkResult -- vulkan_core.h:10554 with Import => True, Convention => C, External_Name => "vkGetPhysicalDeviceSupportedFramebufferMixedSamplesCombinationsNV"; type VkPhysicalDeviceFragmentShaderInterlockFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10565 pNext : System.Address; -- vulkan_core.h:10566 fragmentShaderSampleInterlock : aliased VkBool32; -- vulkan_core.h:10567 fragmentShaderPixelInterlock : aliased VkBool32; -- vulkan_core.h:10568 fragmentShaderShadingRateInterlock : aliased VkBool32; -- vulkan_core.h:10569 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10564 type VkPhysicalDeviceYcbcrImageArraysFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10578 pNext : System.Address; -- vulkan_core.h:10579 ycbcrImageArrays : aliased VkBool32; -- vulkan_core.h:10580 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10577 subtype VkHeadlessSurfaceCreateFlagsEXT is VkFlags; -- vulkan_core.h:10588 type VkHeadlessSurfaceCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10590 pNext : System.Address; -- vulkan_core.h:10591 flags : aliased VkHeadlessSurfaceCreateFlagsEXT; -- vulkan_core.h:10592 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10589 type PFN_vkCreateHeadlessSurfaceEXT is access function (arg1 : VkInstance; arg2 : access constant VkHeadlessSurfaceCreateInfoEXT; arg3 : access constant VkAllocationCallbacks; arg4 : System.Address) return VkResult with Convention => C; -- vulkan_core.h:10595 function vkCreateHeadlessSurfaceEXT (instance : VkInstance; pCreateInfo : access constant VkHeadlessSurfaceCreateInfoEXT; pAllocator : access constant VkAllocationCallbacks; pSurface : System.Address) return VkResult -- vulkan_core.h:10598 with Import => True, Convention => C, External_Name => "vkCreateHeadlessSurfaceEXT"; subtype VkLineRasterizationModeEXT is unsigned; VK_LINE_RASTERIZATION_MODE_DEFAULT_EXT : constant unsigned := 0; VK_LINE_RASTERIZATION_MODE_RECTANGULAR_EXT : constant unsigned := 1; VK_LINE_RASTERIZATION_MODE_BRESENHAM_EXT : constant unsigned := 2; VK_LINE_RASTERIZATION_MODE_RECTANGULAR_SMOOTH_EXT : constant unsigned := 3; VK_LINE_RASTERIZATION_MODE_BEGIN_RANGE_EXT : constant unsigned := 0; VK_LINE_RASTERIZATION_MODE_END_RANGE_EXT : constant unsigned := 3; VK_LINE_RASTERIZATION_MODE_RANGE_SIZE_EXT : constant unsigned := 4; VK_LINE_RASTERIZATION_MODE_MAX_ENUM_EXT : constant unsigned := 2147483647; -- vulkan_core.h:10610 type VkPhysicalDeviceLineRasterizationFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10621 pNext : System.Address; -- vulkan_core.h:10622 rectangularLines : aliased VkBool32; -- vulkan_core.h:10623 bresenhamLines : aliased VkBool32; -- vulkan_core.h:10624 smoothLines : aliased VkBool32; -- vulkan_core.h:10625 stippledRectangularLines : aliased VkBool32; -- vulkan_core.h:10626 stippledBresenhamLines : aliased VkBool32; -- vulkan_core.h:10627 stippledSmoothLines : aliased VkBool32; -- vulkan_core.h:10628 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10620 type VkPhysicalDeviceLineRasterizationPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10632 pNext : System.Address; -- vulkan_core.h:10633 lineSubPixelPrecisionBits : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10634 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10631 type VkPipelineRasterizationLineStateCreateInfoEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10638 pNext : System.Address; -- vulkan_core.h:10639 lineRasterizationMode : aliased VkLineRasterizationModeEXT; -- vulkan_core.h:10640 stippledLineEnable : aliased VkBool32; -- vulkan_core.h:10641 lineStippleFactor : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10642 lineStipplePattern : aliased Interfaces.C.unsigned_short; -- vulkan_core.h:10643 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10637 type PFN_vkCmdSetLineStippleEXT is access procedure (arg1 : VkCommandBuffer; arg2 : Interfaces.C.unsigned_short; arg3 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:10646 procedure vkCmdSetLineStippleEXT (commandBuffer : VkCommandBuffer; lineStippleFactor : Interfaces.C.unsigned_short; lineStipplePattern : Interfaces.C.unsigned_short) -- vulkan_core.h:10649 with Import => True, Convention => C, External_Name => "vkCmdSetLineStippleEXT"; subtype VkPhysicalDeviceHostQueryResetFeaturesEXT is VkPhysicalDeviceHostQueryResetFeatures; -- vulkan_core.h:10659 type PFN_vkResetQueryPoolEXT is access procedure (arg1 : VkDevice; arg2 : VkQueryPool; arg3 : Interfaces.C.unsigned_short; arg4 : Interfaces.C.unsigned_short) with Convention => C; -- vulkan_core.h:10661 procedure vkResetQueryPoolEXT (device : VkDevice; queryPool : VkQueryPool; firstQuery : Interfaces.C.unsigned_short; queryCount : Interfaces.C.unsigned_short) -- vulkan_core.h:10664 with Import => True, Convention => C, External_Name => "vkResetQueryPoolEXT"; type VkPhysicalDeviceIndexTypeUint8FeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10676 pNext : System.Address; -- vulkan_core.h:10677 indexTypeUint8 : aliased VkBool32; -- vulkan_core.h:10678 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10675 type VkPhysicalDeviceShaderDemoteToHelperInvocationFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10687 pNext : System.Address; -- vulkan_core.h:10688 shaderDemoteToHelperInvocation : aliased VkBool32; -- vulkan_core.h:10689 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10686 type VkPhysicalDeviceTexelBufferAlignmentFeaturesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10698 pNext : System.Address; -- vulkan_core.h:10699 texelBufferAlignment : aliased VkBool32; -- vulkan_core.h:10700 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10697 type VkPhysicalDeviceTexelBufferAlignmentPropertiesEXT is record sType : aliased VkStructureType; -- vulkan_core.h:10704 pNext : System.Address; -- vulkan_core.h:10705 storageTexelBufferOffsetAlignmentBytes : aliased VkDeviceSize; -- vulkan_core.h:10706 storageTexelBufferOffsetSingleTexelAlignment : aliased VkBool32; -- vulkan_core.h:10707 uniformTexelBufferOffsetAlignmentBytes : aliased VkDeviceSize; -- vulkan_core.h:10708 uniformTexelBufferOffsetSingleTexelAlignment : aliased VkBool32; -- vulkan_core.h:10709 end record with Convention => C_Pass_By_Copy; -- vulkan_core.h:10703 end Vulkan.Low_Level.vulkan_core_h;
pauls4GE/RACK
Ada
32
ads
WITH auxiliary; PROCEDURE main;
Tim-Tom/project-euler
Ada
58
ads
package Problem_62 is procedure Solve; end Problem_62;
AdaCore/libadalang
Ada
165
ads
package Q is type T is private; X : constant T; private type T is record Val : Integer := 0; end record; X : constant T := (Val => 1); end Q;
stcarrez/dynamo
Ada
12,738
ads
------------------------------------------------------------------------------ -- -- -- GNAT COMPILER COMPONENTS -- -- -- -- P R J . E N V -- -- -- -- S p e c -- -- -- -- Copyright (C) 2001-2014, Free Software Foundation, Inc. -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License -- -- for more details. You should have received a copy of the GNU General -- -- Public License distributed with GNAT; see file COPYING3. If not, go to -- -- http://www.gnu.org/licenses for a complete copy of the license. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ -- This package implements services for Project-aware tools, mostly related -- to the environment (configuration pragma files, path files, mapping files). with GNAT.Dynamic_HTables; with GNAT.OS_Lib; package Prj.Env is procedure Initialize (In_Tree : Project_Tree_Ref); -- Initialize global components relative to environment variables procedure Print_Sources (In_Tree : Project_Tree_Ref); -- Output the list of sources after Project files have been scanned procedure Create_Mapping (In_Tree : Project_Tree_Ref); -- Create in memory mapping from the sources of all the projects (in body -- of package Fmap), so that Osint.Find_File will find the correct path -- corresponding to a source. procedure Create_Temp_File (Shared : Shared_Project_Tree_Data_Access; Path_FD : out File_Descriptor; Path_Name : out Path_Name_Type; File_Use : String); -- Create temporary file, fail with an error if it could not be created procedure Create_Mapping_File (Project : Project_Id; Language : Name_Id; In_Tree : Project_Tree_Ref; Name : out Path_Name_Type); -- Create a temporary mapping file for project Project. For each source or -- template of Language in the Project, put the mapping of its file name -- and path name in this file. See fmap for a description of the format -- of the mapping file. -- -- Implementation note: we pass a language name, not a language_index here, -- since the latter would have to match exactly the index of that language -- for the specified project, and that is not information available in -- buildgpr.adb. procedure Create_Config_Pragmas_File (For_Project : Project_Id; In_Tree : Project_Tree_Ref); -- If we need SFN pragmas, either for non standard naming schemes or for -- individual units. procedure Create_New_Path_File (Shared : Shared_Project_Tree_Data_Access; Path_FD : out File_Descriptor; Path_Name : out Path_Name_Type); -- Create a new temporary path file, placing file name in Path_Name function Ada_Include_Path (Project : Project_Id; In_Tree : Project_Tree_Ref; Recursive : Boolean := False) return String; -- Get the source search path of a Project file. If Recursive it True, get -- all the source directories of the imported and modified project files -- (recursively). If Recursive is False, just get the path for the source -- directories of Project. Note: the resulting String may be empty if there -- is no source directory in the project file. function Ada_Objects_Path (Project : Project_Id; In_Tree : Project_Tree_Ref; Including_Libraries : Boolean := True) return String_Access; -- Get the ADA_OBJECTS_PATH of a Project file. For the first call with the -- exact same parameters, compute it and cache it. When Including_Libraries -- is True, the object directory of a library project is replaced with the -- library ALI directory of this project (usually the library directory of -- the project, except when attribute Library_ALI_Dir is declared) except -- when the library ALI directory does not contain any ALI file. procedure Set_Ada_Paths (Project : Project_Id; In_Tree : Project_Tree_Ref; Including_Libraries : Boolean; Include_Path : Boolean := True; Objects_Path : Boolean := True); -- Set the environment variables for additional project path files, after -- creating the path files if necessary. function File_Name_Of_Library_Unit_Body (Name : String; Project : Project_Id; In_Tree : Project_Tree_Ref; Main_Project_Only : Boolean := True; Full_Path : Boolean := False) return String; -- Returns the file name of a library unit, in canonical case. Name may or -- may not have an extension (corresponding to the naming scheme of the -- project). If there is no body with this name, but there is a spec, the -- name of the spec is returned. -- -- If Full_Path is False (the default), the simple file name is returned. -- If Full_Path is True, the absolute path name is returned. -- -- If neither a body nor a spec can be found, an empty string is returned. -- If Main_Project_Only is True, the unit must be an immediate source of -- Project. If it is False, it may be a source of one of its imported -- projects. function Project_Of (Name : String; Main_Project : Project_Id; In_Tree : Project_Tree_Ref) return Project_Id; -- Get the project of a source. The source file name may be truncated -- (".adb" or ".ads" may be missing). If the source is in a project being -- extended, return the ultimate extending project. If it is not a source -- of any project, return No_Project. procedure Get_Reference (Source_File_Name : String; In_Tree : Project_Tree_Ref; Project : out Project_Id; Path : out Path_Name_Type); -- Returns the project of a source and its path in displayable form generic with procedure Action (Path : String); procedure For_All_Source_Dirs (Project : Project_Id; In_Tree : Project_Tree_Ref); -- Iterate through all the source directories of a project, including those -- of imported or modified projects. Only returns those directories that -- potentially contain Ada sources (ie ignore projects that have no Ada -- sources generic with procedure Action (Path : String); procedure For_All_Object_Dirs (Project : Project_Id; Tree : Project_Tree_Ref); -- Iterate through all the object directories of a project, including those -- of imported or modified projects. ------------------ -- Project Path -- ------------------ type Project_Search_Path is private; -- An abstraction of the project path. This object provides subprograms -- to search for projects on the path (and caches the results to improve -- efficiency). No_Project_Search_Path : constant Project_Search_Path; procedure Initialize_Default_Project_Path (Self : in out Project_Search_Path; Target_Name : String; Runtime_Name : String := ""); -- Initialize Self. It will then contain the default project path on -- the given target and runtime (including directories specified by the -- environment variables GPR_PROJECT_PATH_FILE, GPR_PROJECT_PATH and -- ADA_PROJECT_PATH). If one of the directory or Target_Name is "-", then -- the path contains only those directories specified by the environment -- variables (except "-"). This does nothing if Self has already been -- initialized. procedure Copy (From : Project_Search_Path; To : out Project_Search_Path); -- Copy From into To procedure Initialize_Empty (Self : in out Project_Search_Path); -- Initialize self with an empty list of directories. If Self had already -- been set, it is reset. function Is_Initialized (Self : Project_Search_Path) return Boolean; -- Whether Self has been initialized procedure Free (Self : in out Project_Search_Path); -- Free the memory used by Self procedure Add_Directories (Self : in out Project_Search_Path; Path : String; Prepend : Boolean := False); -- Add one or more directories to the path. Directories added with this -- procedure are added in order after the current directory and before the -- path given by the environment variable GPR_PROJECT_PATH. A value of "-" -- will remove the default project directory from the project path. -- -- Calls to this subprogram must be performed before the first call to -- Find_Project below, or PATH will be added at the end of the search path. procedure Get_Path (Self : Project_Search_Path; Path : out String_Access); -- Return the current value of the project path, either the value set -- during elaboration of the package or, if procedure Set_Project_Path has -- been called, the value set by the last call to Set_Project_Path. The -- returned value must not be modified. -- Self must have been initialized first. procedure Set_Path (Self : in out Project_Search_Path; Path : String); -- Override the value of the project path. This also removes the implicit -- default search directories. generic with function Check_Filename (Name : String) return Boolean; function Find_Name_In_Path (Self : Project_Search_Path; Path : String) return String_Access; -- Find a name in the project search path of Self. Check_Filename is -- the predicate to valid the search. If Path is an absolute filename, -- simply calls the predicate with Path. Otherwise, calls the predicate -- for each component of the path. Stops as soon as the predicate -- returns True and returns the name, or returns null in case of failure. procedure Find_Project (Self : in out Project_Search_Path; Project_File_Name : String; Directory : String; Path : out Namet.Path_Name_Type); -- Search for a project with the given name either in Directory (which -- often will be the directory contain the project we are currently parsing -- and which we found a reference to another project), or in the project -- path Self. Self must have been initialized first. -- -- Project_File_Name can optionally contain directories, and the extension -- (.gpr) for the file name is optional. -- -- Returns No_Name if no such project was found function Get_Runtime_Path (Self : Project_Search_Path; Name : String) return String_Access; -- Compute the full path for the project-based runtime name. -- Name is simply searched on the project path. private package Projects_Paths is new GNAT.Dynamic_HTables.Simple_HTable (Header_Num => Header_Num, Element => Path_Name_Type, No_Element => No_Path, Key => Name_Id, Hash => Hash, Equal => "="); type Project_Search_Path is record Path : GNAT.OS_Lib.String_Access; -- As a special case, if the first character is '#:" or this variable -- is unset, this means that the PATH has not been fully initialized -- yet (although subprograms above will properly take care of that). Cache : Projects_Paths.Instance; end record; No_Project_Search_Path : constant Project_Search_Path := (Path => null, Cache => Projects_Paths.Nil); end Prj.Env;
reznikmm/matreshka
Ada
5,664
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Web Framework -- -- -- -- Tools Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2015, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Asis.Declarations; package body Properties.Declarations.Ordinary_Type is --------------- -- Alignment -- --------------- function Alignment (Engine : access Engines.Contexts.Context; Element : Asis.Declaration; Name : Engines.Integer_Property) return Integer is begin return Engine.Integer.Get_Property (Asis.Declarations.Type_Declaration_View (Element), Name); end Alignment; ---------- -- Code -- ---------- function Code (Engine : access Engines.Contexts.Context; Element : Asis.Declaration; Name : Engines.Text_Property) return League.Strings.Universal_String is Inside_Package : constant Boolean := Engine.Boolean.Get_Property (Element, Engines.Inside_Package); Result : League.Strings.Universal_String; Down : League.Strings.Universal_String; Name_Image : constant League.Strings.Universal_String := Engine.Text.Get_Property (Asis.Declarations.Names (Element) (1), Name); begin if Inside_Package then Result.Append ("_ec."); else Result.Append ("var "); end if; Result.Append (Name_Image); Result.Append ("="); Down := Engine.Text.Get_Property (Asis.Declarations.Type_Declaration_View (Element), Name); if Down.Is_Empty then Result.Clear; else Result.Append (Down); Result.Append (";"); end if; return Result; end Code; ---------------- -- Initialize -- ---------------- function Initialize (Engine : access Engines.Contexts.Context; Element : Asis.Declaration; Name : Engines.Text_Property) return League.Strings.Universal_String is begin return Engine.Text.Get_Property (Asis.Declarations.Type_Declaration_View (Element), Name); end Initialize; -------------------- -- Is_Simple_Type -- -------------------- function Is_Simple_Type (Engine : access Engines.Contexts.Context; Element : Asis.Declaration; Name : Engines.Boolean_Property) return Boolean is begin return Engine.Boolean.Get_Property (Asis.Declarations.Type_Declaration_View (Element), Name); end Is_Simple_Type; end Properties.Declarations.Ordinary_Type;
reznikmm/matreshka
Ada
4,647
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Text.Restart_On_Page_Attributes is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Text_Restart_On_Page_Attribute_Node is begin return Self : Text_Restart_On_Page_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_Restart_On_Page_Attribute_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Restart_On_Page_Attribute; end Get_Local_Name; begin Matreshka.DOM_Documents.Register_Attribute (Matreshka.ODF_String_Constants.Text_URI, Matreshka.ODF_String_Constants.Restart_On_Page_Attribute, Text_Restart_On_Page_Attribute_Node'Tag); end Matreshka.ODF_Text.Restart_On_Page_Attributes;
AdaCore/libadalang
Ada
76
ads
generic type T is private; package P is function Foo return T; end P;
pombredanne/ravenadm
Ada
93,805
adb
-- This file is covered by the Internet Software Consortium (ISC) License -- Reference: ../License.txt with Ada.Characters.Latin_1; with Ada.Directories; with Ada.Exceptions; with Ada.Calendar; with File_Operations; with Port_Specification.Transform; with Port_Specification.Json; with Port_Specification.Web; with Specification_Parser; with PortScan.Log; with PortScan.Operations; with Parameters; with Utilities; with Replicant; with Signals; with Unix; package body PortScan.Scan is package UTL renames Utilities; package REP renames Replicant; package PM renames Parameters; package LOG renames PortScan.Log; package OPS renames PortScan.Operations; package FOP renames File_Operations; package PAR renames Specification_Parser; package PST renames Port_Specification.Transform; package WEB renames Port_Specification.Web; package PSP renames Port_Specification; package LAT renames Ada.Characters.Latin_1; package DIR renames Ada.Directories; package EX renames Ada.Exceptions; -------------------------------------------------------------------------------------------- -- scan_entire_ports_tree -------------------------------------------------------------------------------------------- function scan_entire_ports_tree (sysrootver : sysroot_characteristics) return Boolean is good_scan : Boolean; using_screen : constant Boolean := Unix.screen_attached; conspiracy : constant String := HT.USS (PM.configuration.dir_conspiracy); unkindness : constant String := HT.USS (PM.configuration.dir_unkindness); begin -- Override BATCH_MODE setting when we build everything PM.configuration.batch_mode := True; -- All scanning done on host system (no need to mount in a slave) prescan_ports_tree (conspiracy, unkindness, sysrootver); prescan_unkindness (unkindness); set_portlist_to_everything; LOG.set_scan_start_time (CAL.Clock); parallel_deep_scan (conspiracy => conspiracy, unkindness => unkindness, sysrootver => sysrootver, success => good_scan, show_progress => using_screen); LOG.set_scan_complete (CAL.Clock); return good_scan; end scan_entire_ports_tree; -------------------------------------------------------------------------------------------- -- generate_entire_website -------------------------------------------------------------------------------------------- function generate_entire_website (www_site : String; sysrootver : sysroot_characteristics) return Boolean is good_operation : Boolean; conspiracy : constant String := HT.USS (PM.configuration.dir_conspiracy); unkindness : constant String := HT.USS (PM.configuration.dir_unkindness); sharedir : constant String := host_localbase & "/share/ravenadm"; ravencss : constant String := "/ravenports.css"; ravenboxpng : constant String := "/ravenports-200.png"; styledir : constant String := www_site & "/style"; begin -- Override BATCH_MODE setting when we build everything PM.configuration.batch_mode := True; -- All scanning done on host system (no need to mount in a slave) prescan_ports_tree (conspiracy, unkindness, sysrootver); prescan_unkindness (unkindness); -- pre-place css file DIR.Create_Path (styledir); DIR.Copy_File (sharedir & ravencss, styledir & ravencss); DIR.Copy_File (sharedir & ravenboxpng, styledir & ravenboxpng); -- subcontract web site generation serially_generate_web_pages (www_site => www_site, sysrootver => sysrootver, success => good_operation); return good_operation; end generate_entire_website; -------------------------------------------------------------------------------------------- -- prescan_ports_tree -------------------------------------------------------------------------------------------- procedure prescan_ports_tree (conspiracy : String; unkindness : String; sysrootver : sysroot_characteristics) is conspindex_path : constant String := conspiracy & conspindex; custom_avail : constant Boolean := unkindness /= PM.no_unkindness; -- Disable parallel scanning (not reliable; make one scanner do everything -- max_lots : constant scanners := get_max_lots; max_lots : constant scanners := 1; begin if not DIR.Exists (conspindex_path) then raise missing_index with conspindex; end if; declare fulldata : String := FOP.get_file_contents (conspindex_path); markers : HT.Line_Markers; linenum : Natural := 0; begin HT.initialize_markers (fulldata, markers); loop exit when not HT.next_line_present (fulldata, markers); linenum := linenum + 1; declare line : constant String := HT.extract_line (fulldata, markers); bucket : constant String := HT.specific_field (line, 1); namebase : constant String := HT.specific_field (line, 2); numvar : constant String := HT.specific_field (line, 3); bsheet : constant String := "/bucket_" & bucket & "/" & namebase; linestr : constant String := ", line " & HT.int2str (linenum); varcount : Integer; begin if bucket'Length /= 2 or else namebase'Length = 0 or else numvar'Length = 0 then raise bad_index_data with conspindex & linestr; end if; begin varcount := Integer'Value (numvar); exception when others => raise bad_index_data with conspindex & ", numvariant fields not an integer" & linestr; end; if not DIR.Exists (conspiracy & bsheet) then raise bad_index_data with conspindex & bsheet & " buildsheet does not exist" & linestr; end if; if custom_avail and then DIR.Exists (unkindness & bsheet) then -- postpone custom port scan (done prescan_unkindness) null; else for varx in Integer range 1 .. varcount loop declare varxname : constant String := HT.specific_field (line, varx + 3); portkey : HT.Text := HT.SUS (namebase & ":" & varxname); kc : portkey_crate.Cursor; success : Boolean; begin if varxname = "" then raise bad_index_data with conspindex & ", less variants than counter" & linestr; end if; ports_keys.Insert (Key => portkey, New_Item => lot_counter, Position => kc, Inserted => success); last_port := lot_counter; all_ports (lot_counter).sequence_id := lot_counter; all_ports (lot_counter).key_cursor := kc; all_ports (lot_counter).port_namebase := HT.SUS (namebase); all_ports (lot_counter).port_variant := HT.SUS (varxname); all_ports (lot_counter).bucket := bucket_code (bucket); all_ports (lot_counter).unkind_custom := False; make_queue (lot_number).Append (lot_counter); lot_counter := lot_counter + 1; if lot_number = max_lots then lot_number := 1; else lot_number := lot_number + 1; end if; end; end loop; end if; end; end loop; end; prescanned := True; end prescan_ports_tree; -------------------------------------------------------------------------------------------- -- prescan_custom -------------------------------------------------------------------------------------------- procedure prescan_custom (unkindness : String; bucket : bucket_code; namebase : String; max_lots : scanners) is -- Assume buildsheet exists (has already been validated) -- Assume it starts with directory separator successful : Boolean; customspec : PSP.Portspecs; arch_focus : supported_arch := x86_64; -- unused, pick one buildsheet : constant String := "/bucket_" & bucket & "/" & namebase; begin PAR.parse_specification_file (dossier => unkindness & buildsheet, specification => customspec, opsys_focus => platform_type, arch_focus => arch_focus, success => successful, stop_at_targets => True); if not successful then raise bsheet_parsing with unkindness & buildsheet & "-> " & PAR.get_parse_error; end if; declare varcount : Natural := customspec.get_number_of_variants; varlist : String := customspec.get_field_value (PSP.sp_variants); begin for varx in Integer range 1 .. varcount loop declare varxname : constant String := HT.specific_field (varlist, varx, ", "); portkey : HT.Text := HT.SUS (namebase & ":" & varxname); kc : portkey_crate.Cursor; success : Boolean; use type portkey_crate.Cursor; begin if ports_keys.Contains (portkey) then kc := ports_keys.Find (portkey); for x in 1 .. last_port loop if all_ports (x).key_cursor = kc then all_ports (x).unkind_custom := True; exit; end if; end loop; else ports_keys.Insert (Key => portkey, New_Item => lot_counter, Position => kc, Inserted => success); last_port := lot_counter; all_ports (lot_counter).sequence_id := lot_counter; all_ports (lot_counter).key_cursor := kc; all_ports (lot_counter).port_namebase := HT.SUS (namebase); all_ports (lot_counter).port_variant := HT.SUS (varxname); all_ports (lot_counter).bucket := bucket; all_ports (lot_counter).unkind_custom := True; make_queue (lot_number).Append (lot_counter); lot_counter := lot_counter + 1; if lot_number = max_lots then lot_number := 1; else lot_number := lot_number + 1; end if; end if; end; end loop; end; end prescan_custom; -------------------------------------------------------------------------------------------- -- prescan_unkindness -------------------------------------------------------------------------------------------- procedure prescan_unkindness (unkindness : String) is -- Disable parallel scanning (not reliable; make one scanner do everything -- max_lots : constant scanners := get_max_lots; max_lots : constant scanners := 1; bucket : bucket_code; begin if unkindness = PM.no_unkindness or else not DIR.Exists (unkindness) then return; end if; for highdigit in AF'Range loop for lowdigit in AF'Range loop bucket := tohex (highdigit) & tohex (lowdigit); declare bucket_dir : constant String := unkindness & "/bucket_" & bucket; Inner_Search : DIR.Search_Type; Inner_Dirent : DIR.Directory_Entry_Type; use type DIR.File_Kind; begin if DIR.Exists (bucket_dir) and then DIR.Kind (bucket_dir) = DIR.Directory then DIR.Start_Search (Search => Inner_Search, Directory => bucket_dir, Filter => (DIR.Ordinary_File => True, others => False), Pattern => "*"); while DIR.More_Entries (Inner_Search) loop DIR.Get_Next_Entry (Inner_Search, Inner_Dirent); declare namebase : String := DIR.Simple_Name (Inner_Dirent); begin prescan_custom (unkindness => unkindness, bucket => bucket, namebase => namebase, max_lots => max_lots); end; end loop; DIR.End_Search (Inner_Search); end if; end; end loop; end loop; end prescan_unkindness; -------------------------------------------------------------------------------------------- -- set_portlist_to_everything -------------------------------------------------------------------------------------------- procedure set_portlist_to_everything is begin for x in 0 .. last_port loop declare portkey : String := get_port_variant (all_ports (x)); begin if not HT.equivalent (all_ports (x).port_namebase, default_compiler) then portlist.Append (HT.SUS (portkey)); end if; end; end loop; end set_portlist_to_everything; -------------------------------------------------------------------------------------------- -- get_max_lots -------------------------------------------------------------------------------------------- function get_max_lots return scanners is first_try : constant Positive := Positive (PM.configuration.number_cores) * 3; begin if first_try > Positive (scanners'Last) then return scanners'Last; else return scanners (first_try); end if; end get_max_lots; -------------------------------------------------------------------------------------------- -- parallel_deep_scan -------------------------------------------------------------------------------------------- procedure parallel_deep_scan (conspiracy : String; unkindness : String; sysrootver : sysroot_characteristics; success : out Boolean; show_progress : Boolean) is finished : array (scanners) of Boolean := (others => False); combined_wait : Boolean := True; aborted : Boolean := False; task type scan (lot : scanners); task body scan is procedure populate (cursor : subqueue.Cursor); procedure populate (cursor : subqueue.Cursor) is target_port : port_index := subqueue.Element (cursor); begin if not aborted then populate_port_data (conspiracy => conspiracy, unkindness => unkindness, target => target_port, always_build => False, sysrootver => sysrootver); mq_progress (lot) := mq_progress (lot) + 1; end if; exception when issue : others => aborted := True; TIO.Put_Line ("Scan aborted"); TIO.Put_Line ("culprit: " & get_port_variant (all_ports (target_port))); TIO.Put_Line (EX.Exception_Information (issue)); end populate; begin make_queue (lot).Iterate (populate'Access); finished (lot) := True; end scan; scan_01 : scan (lot => 1); scan_02 : scan (lot => 2); scan_03 : scan (lot => 3); scan_04 : scan (lot => 4); scan_05 : scan (lot => 5); scan_06 : scan (lot => 6); scan_07 : scan (lot => 7); scan_08 : scan (lot => 8); scan_09 : scan (lot => 9); scan_10 : scan (lot => 10); scan_11 : scan (lot => 11); scan_12 : scan (lot => 12); scan_13 : scan (lot => 13); scan_14 : scan (lot => 14); scan_15 : scan (lot => 15); scan_16 : scan (lot => 16); scan_17 : scan (lot => 17); scan_18 : scan (lot => 18); scan_19 : scan (lot => 19); scan_20 : scan (lot => 20); scan_21 : scan (lot => 21); scan_22 : scan (lot => 22); scan_23 : scan (lot => 23); scan_24 : scan (lot => 24); scan_25 : scan (lot => 25); scan_26 : scan (lot => 26); scan_27 : scan (lot => 27); scan_28 : scan (lot => 28); scan_29 : scan (lot => 29); scan_30 : scan (lot => 30); scan_31 : scan (lot => 31); scan_32 : scan (lot => 32); begin TIO.Put_Line ("Scanning entire ports tree."); while combined_wait loop delay 1.0; if show_progress then TIO.Put (scan_progress); end if; combined_wait := False; for j in scanners'Range loop if not finished (j) then combined_wait := True; exit; end if; end loop; if Signals.graceful_shutdown_requested then aborted := True; end if; end loop; success := not aborted; end parallel_deep_scan; -------------------------------------------------------------------------------------------- -- skeleton_compiler_data -------------------------------------------------------------------------------------------- procedure skeleton_compiler_data (conspiracy : String; unkindness : String; target : port_index; sysrootver : sysroot_characteristics) is rec : port_record renames all_ports (target); function calc_dossier return String; thespec : PSP.Portspecs; successful : Boolean; variant : constant String := HT.USS (rec.port_variant); osrelease : constant String := HT.USS (sysrootver.release); function calc_dossier return String is buildsheet : String := "/bucket_" & rec.bucket & "/" & HT.USS (rec.port_namebase); begin if rec.unkind_custom then return unkindness & buildsheet; else return conspiracy & buildsheet; end if; end calc_dossier; begin OPS.parse_and_transform_buildsheet (specification => thespec, successful => successful, buildsheet => calc_dossier, variant => variant, portloc => "", excl_targets => True, avoid_dialog => True, for_webpage => False, sysrootver => sysrootver); if not successful then raise bsheet_parsing with calc_dossier & "-> " & PAR.get_parse_error; end if; rec.pkgversion := HT.SUS (thespec.calculate_pkgversion); rec.ignore_reason := HT.SUS (thespec.aggregated_ignore_reason); rec.ignored := not HT.IsBlank (rec.ignore_reason); rec.scanned := False; for item in Positive range 1 .. thespec.get_subpackage_length (variant) loop declare newrec : subpackage_record; subpackage : String := thespec.get_subpackage_item (variant, item); begin newrec.subpackage := HT.SUS (subpackage); newrec.never_remote := True; newrec.pkg_present := True; rec.subpackages.Append (newrec); end; end loop; end skeleton_compiler_data; -------------------------------------------------------------------------------------------- -- populate_port_data -------------------------------------------------------------------------------------------- procedure populate_port_data (conspiracy : String; unkindness : String; target : port_index; always_build : Boolean; sysrootver : sysroot_characteristics) is rec : port_record renames all_ports (target); function calc_dossier return String; thespec : PSP.Portspecs; successful : Boolean; variant : constant String := HT.USS (rec.port_variant); osrelease : constant String := HT.USS (sysrootver.release); prime_pkg : HT.Text := HT.blank; function calc_dossier return String is buildsheet : String := "/bucket_" & rec.bucket & "/" & HT.USS (rec.port_namebase); begin if rec.unkind_custom then return unkindness & buildsheet; else return conspiracy & buildsheet; end if; end calc_dossier; begin OPS.parse_and_transform_buildsheet (specification => thespec, successful => successful, buildsheet => calc_dossier, variant => variant, portloc => "", excl_targets => True, avoid_dialog => False, for_webpage => False, sysrootver => sysrootver); if not successful then raise bsheet_parsing with calc_dossier & "-> " & PAR.get_parse_error; end if; rec.pkgversion := HT.SUS (thespec.calculate_pkgversion); rec.ignore_reason := HT.SUS (thespec.aggregated_ignore_reason); rec.ignored := not HT.IsBlank (rec.ignore_reason); rec.scanned := True; for item in Positive range 1 .. thespec.get_list_length (PSP.sp_build_deps) loop populate_set_depends (target, thespec.get_list_item (PSP.sp_build_deps, item), build); end loop; for item in Positive range 1 .. thespec.get_list_length (PSP.sp_buildrun_deps) loop populate_set_depends (target, thespec.get_list_item (PSP.sp_buildrun_deps, item), buildrun); end loop; for item in Positive range 1 .. thespec.get_list_length (PSP.sp_run_deps) loop populate_set_depends (target, thespec.get_list_item (PSP.sp_run_deps, item), runtime); end loop; for item in Positive range 1 .. thespec.get_subpackage_length (variant) loop declare newrec : subpackage_record; subpackage : String := thespec.get_subpackage_item (variant, item); is_primary : Boolean := False; begin newrec.subpackage := HT.SUS (subpackage); newrec.never_remote := always_build; if subpackage /= spkg_complete and then subpackage /= spkg_examples and then subpackage /= spkg_docs and then HT.IsBlank (prime_pkg) then prime_pkg := newrec.subpackage; is_primary := True; end if; for subitem in Positive range 1 .. thespec.get_number_extra_run (subpackage) loop declare dep : String := thespec.get_extra_runtime (subpackage, subitem); begin populate_set_depends (target, dep, extra_runtime); declare -- These will pass because populate_set_depends didn't throw exception portkey : HT.Text := HT.SUS (convert_tuple_to_portkey (dep)); depindex : port_index := ports_keys.Element (portkey); idrec : subpackage_identifier; begin idrec.port := depindex; idrec.subpackage := HT.SUS (extract_subpackage (dep)); if not newrec.spkg_run_deps.Contains (idrec) then newrec.spkg_run_deps.Append (idrec); end if; end; end; end loop; if is_primary then for si in Positive range 1 .. thespec.get_list_length (PSP.sp_buildrun_deps) loop declare dep : String := thespec.get_list_item (PSP.sp_buildrun_deps, si); portkey : HT.Text := HT.SUS (convert_tuple_to_portkey (dep)); depindex : port_index := ports_keys.Element (portkey); idrec : subpackage_identifier; begin idrec.port := depindex; idrec.subpackage := HT.SUS (extract_subpackage (dep)); if not newrec.spkg_run_deps.Contains (idrec) then newrec.spkg_run_deps.Append (idrec); end if; end; end loop; for si in Positive range 1 .. thespec.get_list_length (PSP.sp_run_deps) loop declare dep : String := thespec.get_list_item (PSP.sp_run_deps, si); portkey : HT.Text := HT.SUS (convert_tuple_to_portkey (dep)); depindex : port_index := ports_keys.Element (portkey); idrec : subpackage_identifier; begin idrec.port := depindex; idrec.subpackage := HT.SUS (extract_subpackage (dep)); if not newrec.spkg_run_deps.Contains (idrec) then newrec.spkg_run_deps.Append (idrec); end if; end; end loop; end if; if subpackage = spkg_complete then for si in Positive range 1 .. thespec.get_subpackage_length (variant) loop declare innersub : constant String := thespec.get_subpackage_item (variant, si); idrec : subpackage_identifier; begin if innersub /= spkg_complete then idrec.port := target; idrec.subpackage := HT.SUS (innersub); if not newrec.spkg_run_deps.Contains (idrec) then newrec.spkg_run_deps.Append (idrec); end if; end if; end; end loop; end if; rec.subpackages.Append (newrec); end; end loop; if variant = variant_standard then for item in Positive range 1 .. thespec.get_list_length (PSP.sp_opts_standard) loop declare optname : String := thespec.get_list_item (PSP.sp_opts_standard, item); begin if optname /= options_none then populate_option (target, optname, thespec.option_current_setting (optname)); end if; end; end loop; else for item in Positive range 1 .. thespec.get_list_length (PSP.sp_opts_avail) loop declare optname : String := thespec.get_list_item (PSP.sp_opts_avail, item); begin populate_option (target, optname, thespec.option_current_setting (optname)); end; end loop; end if; end populate_port_data; -------------------------------------------------------------------------------------------- -- populate_option -------------------------------------------------------------------------------------------- procedure populate_option (target : port_index; option_name : String; setting : Boolean) is optname_text : HT.Text := HT.SUS (option_name); begin if not all_ports (target).options.Contains (optname_text) then all_ports (target).options.Insert (Key => optname_text, New_Item => setting); end if; end populate_option; -------------------------------------------------------------------------------------------- -- populate_set_depends -------------------------------------------------------------------------------------------- procedure populate_set_depends (target : port_index; tuple : String; dtype : dependency_type) is portkey : HT.Text := HT.SUS (convert_tuple_to_portkey (tuple)); depindex : port_index; begin if not ports_keys.Contains (portkey) then raise populate_error with "dependency on non-existent port " & tuple; end if; depindex := ports_keys.Element (portkey); if target = depindex then if dtype = extra_runtime then return; else raise populate_error with tuple & " can't depend on itself"; end if; end if; if HT.USS (all_ports (depindex).port_namebase) = default_compiler then if dtype = extra_runtime then return; else raise populate_error with tuple & " belongs to the default compiler which is a " & "special case that can only be specified via EXRUN"; end if; end if; if not all_ports (target).blocked_by.Contains (depindex) then all_ports (target).blocked_by.Insert (depindex, depindex); end if; if dtype in LR_set and then not all_ports (target).run_deps.Contains (depindex) then all_ports (target).run_deps.Insert (Key => depindex, New_Item => depindex); end if; end populate_set_depends; -------------------------------------------------------------------------------------------- -- convert_tuple_to_portkey -------------------------------------------------------------------------------------------- function convert_tuple_to_portkey (tuple : String) return String is -- tuple format is <namebase>:<subpackage>:<variant> -- portkey format is <namebase>-<variant> begin if HT.count_char (tuple, LAT.Colon) /= 2 then raise populate_error with "tuple has invalid format: " & tuple; end if; declare namebase : String := HT.specific_field (tuple, 1, ":"); variant : String := HT.specific_field (tuple, 3, ":"); begin return namebase & LAT.Colon & variant; end; end convert_tuple_to_portkey; -------------------------------------------------------------------------------------------- -- extract_subpackage -------------------------------------------------------------------------------------------- function extract_subpackage (tuple : String) return String is -- tuple format is <namebase>:<subpackage>:<variant> begin if HT.count_char (tuple, LAT.Colon) /= 2 then raise populate_error with "tuple has invalid format: " & tuple; end if; return HT.tail (HT.head (tuple, ":"), ":"); end extract_subpackage; -------------------------------------------------------------------------------------------- -- scan_single_port -------------------------------------------------------------------------------------------- function scan_single_port (namebase : String; variant : String; always_build : Boolean; sysrootver : sysroot_characteristics; fatal : out Boolean) return Boolean is procedure dig (cursor : block_crate.Cursor); conspiracy : constant String := HT.USS (PM.configuration.dir_conspiracy); unkindness : constant String := HT.USS (PM.configuration.dir_unkindness); two_partid : constant String := namebase & LAT.Colon & variant; portkey : HT.Text := HT.SUS (two_partid); target : port_index; aborted : Boolean := False; indy500 : Boolean := False; procedure dig (cursor : block_crate.Cursor) is new_target : port_index := block_crate.Element (cursor); begin if not aborted then if all_ports (new_target).scan_locked then -- We've already seen this (circular dependency) raise circular_logic; end if; if not all_ports (new_target).scanned then populate_port_data (conspiracy => conspiracy, unkindness => unkindness, target => new_target, always_build => False, sysrootver => sysrootver); all_ports (new_target).scan_locked := True; all_ports (new_target).blocked_by.Iterate (dig'Access); all_ports (new_target).scan_locked := False; if indy500 then TIO.Put_Line ("... backtrace " & get_port_variant (all_ports (new_target))); end if; end if; end if; exception when issue : circular_logic => aborted := True; indy500 := True; TIO.Put_Line (LAT.LF & two_partid & " scan aborted because a circular dependency on " & get_port_variant (all_ports (new_target)) & " was detected."); when issue : populate_error => aborted := True; TIO.Put_Line ("Scan aborted during port data population."); TIO.Put_Line (EX.Exception_Message (issue)); when issue : others => aborted := True; TIO.Put_Line ("Scan aborted for an unknown reason."); TIO.Put_Line (EX.Exception_Message (issue)); end dig; begin fatal := False; if not prescanned then prescan_ports_tree (conspiracy, unkindness, sysrootver); end if; if ports_keys.Contains (portkey) then target := ports_keys.Element (portkey); else TIO.Put_Line (namebase & " specification not listed in Mk/Misc/conspiracy-variants, "); TIO.Put_Line ("nor found in the custom ports directory"); return False; end if; begin if all_ports (target).scanned then -- This can happen when a dpendency is also on the build list. return True; else populate_port_data (conspiracy => conspiracy, unkindness => unkindness, target => target, always_build => always_build, sysrootver => sysrootver); end if; exception when issue : others => TIO.Put_Line ("Encountered issue with " & two_partid & " or its dependencies" & LAT.LF & " => " & EX.Exception_Message (issue)); return False; end; all_ports (target).scan_locked := True; all_ports (target).blocked_by.Iterate (dig'Access); all_ports (target).scan_locked := False; if indy500 then TIO.Put_Line ("... backtrace " & two_partid); fatal := True; end if; return not aborted; end scan_single_port; -------------------------------------------------------------------------------------------- -- set_build_priority -------------------------------------------------------------------------------------------- procedure set_build_priority is begin iterate_reverse_deps; iterate_drill_down; end set_build_priority; -------------------------------------------------------------------------------------------- -- iterate_reverse_deps -------------------------------------------------------------------------------------------- procedure iterate_reverse_deps is procedure set_reverse (cursor : block_crate.Cursor); victim : port_index; procedure set_reverse (cursor : block_crate.Cursor) is blocker : port_index renames block_crate.Element (cursor); begin -- Using conditional insert here causes a finalization error when -- the program exists. Reluctantly, do the condition check manually if not all_ports (blocker).blocks.Contains (victim) then all_ports (blocker).blocks.Insert (victim, victim); end if; end set_reverse; begin for port in port_index'First .. last_port loop if all_ports (port).scanned then victim := port; all_ports (port).blocked_by.Iterate (set_reverse'Access); end if; end loop; end iterate_reverse_deps; -------------------------------------------------------------------------------------------- -- iterate_reverse_deps -------------------------------------------------------------------------------------------- procedure iterate_drill_down is monaco : Boolean := False; begin rank_queue.Clear; for port in port_index'First .. last_port loop if all_ports (port).scanned then drill_down (next_target => port, circular_flag => monaco); declare ndx : constant port_index := port_index (all_ports (port).reverse_score); QR : constant queue_record := (ap_index => port, reverse_score => ndx); begin rank_queue.Insert (New_Item => QR); end; end if; if monaco then raise circular_logic with "Circular dependency detected during drill down"; end if; end loop; end iterate_drill_down; -------------------------------------------------------------------------------------------- -- drill_down -------------------------------------------------------------------------------------------- procedure drill_down (next_target : port_index; circular_flag : in out Boolean) is procedure stamp_and_drill (cursor : block_crate.Cursor); procedure slurp_scanned (cursor : block_crate.Cursor); rec : port_record renames all_ports (next_target); procedure slurp_scanned (cursor : block_crate.Cursor) is rev_id : port_index := block_crate.Element (Position => cursor); begin if not all_ports (next_target).all_reverse.Contains (rev_id) then all_ports (next_target).all_reverse.Insert (rev_id, rev_id); end if; end slurp_scanned; procedure stamp_and_drill (cursor : block_crate.Cursor) is pmc : port_index := block_crate.Element (Position => cursor); begin if all_ports (pmc).scan_locked then -- We've already seen this port (circular dependency) circular_flag := True; TIO.Put_Line ("!! Dependency violation on " & get_port_variant (all_ports (pmc))); else if not all_ports (next_target).all_reverse.Contains (pmc) then all_ports (next_target).all_reverse.Insert (pmc, pmc); end if; if not all_ports (pmc).rev_scanned then drill_down (next_target => pmc, circular_flag => circular_flag); end if; all_ports (pmc).all_reverse.Iterate (slurp_scanned'Access); end if; end stamp_and_drill; begin if not rec.scanned then return; end if; if rec.rev_scanned or else circular_flag then -- It is possible to get here if an earlier port scanned this port -- as a reverse dependencies return; end if; rec.scan_locked := True; rec.blocks.Iterate (stamp_and_drill'Access); rec.scan_locked := False; rec.reverse_score := port_index (rec.all_reverse.Length); rec.rev_scanned := True; if circular_flag then TIO.Put_Line ("... backtrace " & get_port_variant (all_ports (next_target))); end if; end drill_down; -------------------------------------------------------------------------------------------- -- scan_provided_list_of_ports -------------------------------------------------------------------------------------------- function scan_provided_list_of_ports (always_build : Boolean; sysrootver : sysroot_characteristics) return Boolean is procedure scan (plcursor : string_crate.Cursor); successful : Boolean := True; just_stop_now : Boolean; compiler_key : HT.Text := HT.SUS (default_compiler & ":" & variant_standard); procedure scan (plcursor : string_crate.Cursor) is origin : constant String := HT.USS (string_crate.Element (plcursor)); namebase : constant String := HT.part_1 (origin, ":"); variant : constant String := HT.part_2 (origin, ":"); begin if not successful then return; end if; if Signals.graceful_shutdown_requested then successful := False; return; end if; if not scan_single_port (namebase => namebase, variant => variant, always_build => always_build, sysrootver => sysrootver, fatal => just_stop_now) then if just_stop_now then -- backtrace outputs, no need for more information. null; else TIO.Put_Line ("Scan of " & origin & " failed, bulk run cancelled"); end if; successful := False; end if; end scan; begin portlist.Iterate (Process => scan'Access); if successful and then not portlist.Contains (compiler_key) then -- We always need current information on the default compiler begin skeleton_compiler_data (conspiracy => HT.USS (PM.configuration.dir_conspiracy), unkindness => HT.USS (PM.configuration.dir_unkindness), target => ports_keys.Element (compiler_key), sysrootver => sysrootver); exception when others => TIO.Put_Line ("Scan of the compiler port failed, fatal issue"); successful := False; end; end if; return successful; end scan_provided_list_of_ports; -------------------------------------------------------------------------------------------- -- generate_conspiracy_index -------------------------------------------------------------------------------------------- function tohex (value : AF) return Character is begin case value is when 0 .. 9 => return Character'Val (Character'Pos ('0') + value); when others => return Character'Val (Character'Pos ('A') + value - 10); end case; end tohex; -------------------------------------------------------------------------------------------- -- generate_conspiracy_index -------------------------------------------------------------------------------------------- procedure generate_conspiracy_index (sysrootver : sysroot_characteristics) is procedure scan_port (position : string_crate.Cursor); conspiracy : constant String := HT.USS (PM.configuration.dir_conspiracy); misc_dir : constant String := conspiracy & "/Mk/Misc/"; finalcvar : constant String := misc_dir & "conspiracy_variants"; finalfpceq : constant String := misc_dir & "fpc_equivalents"; summary : constant String := misc_dir & "summary.txt"; repology : constant String := misc_dir & "repology.json"; indexfile : TIO.File_Type; fpcfile : TIO.File_Type; repofile : TIO.File_Type; bucket : bucket_code; total_ports : Natural := 0; total_variants : Natural := 0; total_subpkgs : Natural := 0; procedure scan_port (position : string_crate.Cursor) is namebase : String := HT.USS (string_crate.Element (position)); successful : Boolean; customspec : PSP.Portspecs; arch_focus : supported_arch := x86_64; -- unused, pick one dossier : constant String := conspiracy & "/bucket_" & bucket & "/" & namebase; begin PAR.parse_specification_file (dossier => dossier, specification => customspec, opsys_focus => platform_type, arch_focus => arch_focus, success => successful, stop_at_targets => True); if not successful then raise bsheet_parsing with dossier & "-> " & PAR.get_parse_error; end if; declare varcnt : Natural := customspec.get_number_of_variants; varlist : String := customspec.get_field_value (PSP.sp_variants); begin total_ports := total_ports + 1; total_variants := total_variants + varcnt; TIO.Put (indexfile, bucket & " " & namebase & " " & HT.int2str (varcnt)); for varx in Integer range 1 .. varcnt loop declare variant : String := HT.specific_field (varlist, varx, ", "); spkgcnt : Natural := customspec.get_subpackage_length (variant); begin total_subpkgs := total_subpkgs + spkgcnt; TIO.Put (indexfile, " " & variant); end; end loop; TIO.Put_Line (indexfile, ""); declare vers : constant String := customspec.get_field_value (PSP.sp_version); begin TIO.Put (fpcfile, namebase & " " & vers & " "); if customspec.port_is_generated then TIO.Put_Line (fpcfile, "generated"); else TIO.Put_Line (fpcfile, customspec.equivalent_fpc_port); end if; end; Port_Specification.Json.describe_port (specs => customspec, dossier => repofile, bucket => bucket, index => total_ports); end; end scan_port; begin LOG.set_scan_start_time (CAL.Clock); TIO.Create (File => indexfile, Mode => TIO.Out_File, Name => finalcvar); TIO.Create (File => fpcfile, Mode => TIO.Out_File, Name => finalfpceq); TIO.Create (File => repofile, Mode => TIO.Out_File, Name => repology); TIO.Put (repofile, UTL.json_object (True, 0, 1) & UTL.json_name_complex ("ravenports", 1, 1) & UTL.json_array (True, 2)); for highdigit in AF'Range loop for lowdigit in AF'Range loop bucket := tohex (highdigit) & tohex (lowdigit); declare bucket_dir : constant String := conspiracy & "/bucket_" & bucket; Inner_Search : DIR.Search_Type; Inner_Dirent : DIR.Directory_Entry_Type; tempstore : string_crate.Vector; use type DIR.File_Kind; begin if DIR.Exists (bucket_dir) and then DIR.Kind (bucket_dir) = DIR.Directory then DIR.Start_Search (Search => Inner_Search, Directory => bucket_dir, Filter => (DIR.Ordinary_File => True, others => False), Pattern => "*"); while DIR.More_Entries (Inner_Search) loop DIR.Get_Next_Entry (Search => Inner_Search, Directory_Entry => Inner_Dirent); tempstore.Append (HT.SUS (DIR.Simple_Name (Inner_Dirent))); end loop; DIR.End_Search (Inner_Search); sorter.Sort (tempstore); tempstore.Iterate (scan_port'Access); end if; end; end loop; end loop; TIO.Close (indexfile); TIO.Close (fpcfile); LOG.set_scan_complete (CAL.Clock); TIO.Put_Line ("Index successfully generated."); TIO.Put_Line (" Total ports : " & HT.int2str (total_ports)); TIO.Put_Line (" Total variants : " & HT.int2str (total_variants)); TIO.Put_Line (" Total packages : " & HT.int2str (total_subpkgs)); TIO.Put_Line (" Linear scan time : " & LOG.scan_duration); TIO.Put_Line (repofile, UTL.json_array (False, 2) & UTL.json_name_complex ("summary", 2, 1) & UTL.json_object (True, 2, 1) & UTL.json_nvpair_integer ("ports", total_ports, 1, 3) & UTL.json_nvpair_integer ("variants", total_variants, 2, 3) & UTL.json_nvpair_integer ("packages", total_subpkgs, 3, 3) & UTL.json_object (False, 2, 1) & LAT.Right_Curly_Bracket); TIO.Create (File => indexfile, Mode => TIO.Out_File, Name => summary); TIO.Put_Line (indexfile, " Statistics derived from generation of conspiracy index"); TIO.Put_Line (indexfile, "=========================================================="); TIO.Put_Line (indexfile, " Total ports : " & HT.int2str (total_ports)); TIO.Put_Line (indexfile, " Total variants : " & HT.int2str (total_variants)); TIO.Put_Line (indexfile, " Total packages : " & HT.int2str (total_subpkgs)); TIO.Put_Line (indexfile, " Linear scan time : " & LOG.scan_duration); TIO.Close (indexfile); exception when issue : others => if TIO.Is_Open (indexfile) then TIO.Close (indexfile); end if; if TIO.Is_Open (fpcfile) then TIO.Close (fpcfile); end if; if TIO.Is_Open (repofile) then TIO.Close (repofile); end if; TIO.Put_Line ("Failure encountered: " & EX.Exception_Message (issue)); end generate_conspiracy_index; -------------------------------------------------------------------------------------------- -- version_difference -------------------------------------------------------------------------------------------- function version_difference (id : port_id; kind : out verdiff) return String is procedure each_subpackage (position : subpackage_crate.Cursor); pkg8 : constant String := HT.USS (PM.configuration.sysroot_pkg8); dir_pkg : constant String := HT.USS (PM.configuration.dir_repository); version : constant String := HT.USS (all_ports (id).pkgversion); origin : constant String := get_port_variant (id); upgrade : HT.Text; all_present : Boolean := True; procedure each_subpackage (position : subpackage_crate.Cursor) is rec : subpackage_record renames subpackage_crate.Element (position); subpackage : String := HT.USS (rec.subpackage); current : String := calculate_package_name (id, subpackage); base_pattern : String := HT.USS (all_ports (id).port_namebase) & "-" & HT.USS (all_ports (id).port_variant) & "-"; pattern : String := base_pattern & "*" & arc_ext; pkg_search : DIR.Search_Type; dirent : DIR.Directory_Entry_Type; begin if rec.pkg_present then return; else all_present := False; end if; if not HT.IsBlank (upgrade) then return; end if; DIR.Start_Search (Search => pkg_search, Directory => dir_pkg, Filter => (DIR.Ordinary_File => True, others => False), Pattern => pattern); while DIR.More_Entries (Search => pkg_search) loop DIR.Get_Next_Entry (Search => pkg_search, Directory_Entry => dirent); declare sname : String := DIR.Simple_Name (dirent); verend : Natural := sname'Length - arc_ext'Length; command : String := pkg8 & " query -F " & dir_pkg & "/" & sname & " %o"; status : Integer; testorigin : HT.Text := Unix.piped_command (command, status); begin if status = 0 and then HT.equivalent (testorigin, origin) then upgrade := HT.SUS (" (" & sname (base_pattern'Length + 1 .. verend) & " => " & version & ")"); end if; end; end loop; DIR.End_Search (pkg_search); end each_subpackage; begin all_ports (id).subpackages.Iterate (each_subpackage'Access); if all_present then kind := rebuild; return " (rebuild " & version & ")"; end if; if not HT.IsBlank (upgrade) then kind := change; return HT.USS (upgrade); end if; kind := newbuild; return " (new " & version & ")"; end version_difference; -------------------------------------------------------------------------------------------- -- display_results_of_dry_run -------------------------------------------------------------------------------------------- procedure display_results_of_dry_run is procedure print (cursor : ranking_crate.Cursor); listlog : TIO.File_Type; filename : constant String := "/tmp/ravenadm_status_results.txt"; max_lots : constant scanners := get_max_lots; elapsed : constant String := LOG.scan_duration; goodlog : Boolean; procedure print (cursor : ranking_crate.Cursor) is id : port_id := ranking_crate.Element (cursor).ap_index; kind : verdiff; diff : constant String := version_difference (id, kind); origin : constant String := get_port_variant (id); begin case kind is when newbuild => TIO.Put_Line (" N => " & origin); when rebuild => TIO.Put_Line (" R => " & origin); when change => TIO.Put_Line (" U => " & origin & diff); end case; if goodlog then TIO.Put_Line (listlog, origin & diff); end if; end print; begin begin TIO.Create (File => listlog, Mode => TIO.Out_File, Name => filename); goodlog := True; exception when others => goodlog := False; end; TIO.Put_Line ("These are the ports that would be built ([N]ew, " & "[R]ebuild, [U]pgrade):"); rank_queue.Iterate (print'Access); TIO.Put_Line ("Total packages that would be built:" & rank_queue.Length'Img); if goodlog then TIO.Put_Line (listlog, LAT.LF & LAT.LF & "------------------------------" & LAT.LF & "-- Statistics" & LAT.LF & "------------------------------" & LAT.LF & " Ports scanned :" & last_port'Img & LAT.LF & " Elapsed time : " & elapsed & LAT.LF & " Parallelism :" & max_lots'Img & " scanners" & " ncpu :" & Parameters.configuration.number_cores'Img); TIO.Close (listlog); TIO.Put_Line ("The complete build list can also be found at:" & LAT.LF & filename); end if; end display_results_of_dry_run; -------------------------------------------------------------------------------------------- -- gather_distfile_set -------------------------------------------------------------------------------------------- function gather_distfile_set (sysrootver : sysroot_characteristics) return Boolean is good_scan : Boolean; using_screen : constant Boolean := Unix.screen_attached; conspiracy : constant String := HT.USS (PM.configuration.dir_conspiracy); unkindness : constant String := HT.USS (PM.configuration.dir_unkindness); begin prescan_conspiracy_index_for_distfiles (conspiracy, unkindness, sysrootver); LOG.set_scan_start_time (CAL.Clock); parallel_distfile_scan (conspiracy => conspiracy, sysrootver => sysrootver, success => good_scan, show_progress => using_screen); LOG.set_scan_complete (CAL.Clock); return good_scan; end gather_distfile_set; -------------------------------------------------------------------------------------------- -- prescan_conspiracy_index_for_distfiles -------------------------------------------------------------------------------------------- procedure prescan_conspiracy_index_for_distfiles (conspiracy : String; unkindness : String; sysrootver : sysroot_characteristics) is conspindex_path : constant String := conspiracy & conspindex; max_lots : constant scanners := get_max_lots; custom_avail : constant Boolean := unkindness /= PM.no_unkindness; begin if not DIR.Exists (conspindex_path) then raise missing_index with conspindex; end if; declare fulldata : String := FOP.get_file_contents (conspindex_path); markers : HT.Line_Markers; linenum : Natural := 0; begin HT.initialize_markers (fulldata, markers); loop exit when not HT.next_line_present (fulldata, markers); linenum := linenum + 1; declare line : constant String := HT.extract_line (fulldata, markers); bucket : constant String := HT.specific_field (line, 1); namebase : constant String := HT.specific_field (line, 2); bsheet : constant String := "/bucket_" & bucket & "/" & namebase; linestr : constant String := ", line " & HT.int2str (linenum); begin if bucket'Length /= 2 or else namebase'Length = 0 then raise bad_index_data with conspindex & linestr; end if; if not DIR.Exists (conspiracy & bsheet) then raise bad_index_data with conspindex & bsheet & " buildsheet does not exist" & linestr; end if; if custom_avail and then DIR.Exists (unkindness & bsheet) then -- postpone custom port scan (done prescan_unkindness) null; else declare portkey : HT.Text := HT.SUS (namebase); kc : portkey_crate.Cursor; success : Boolean; begin ports_keys.Insert (Key => portkey, New_Item => lot_counter, Position => kc, Inserted => success); last_port := lot_counter; all_ports (lot_counter).sequence_id := lot_counter; all_ports (lot_counter).key_cursor := kc; all_ports (lot_counter).port_namebase := HT.SUS (namebase); all_ports (lot_counter).bucket := bucket_code (bucket); all_ports (lot_counter).unkind_custom := False; make_queue (lot_number).Append (lot_counter); lot_counter := lot_counter + 1; if lot_number = max_lots then lot_number := 1; else lot_number := lot_number + 1; end if; end; end if; end; end loop; end; end prescan_conspiracy_index_for_distfiles; -------------------------------------------------------------------------------------------- -- linear_scan_unkindness_for_distfiles -------------------------------------------------------------------------------------------- procedure linear_scan_unkindness_for_distfiles (unkindness : String) is procedure insert_distfile (dist_subdir : String; distfile_group : String); dindex : port_index := 0; procedure insert_distfile (dist_subdir : String; distfile_group : String) is function determine_distname return String; use_subdir : Boolean := (dist_subdir /= ""); function determine_distname return String is distfile : String := HT.part_1 (distfile_group, ":"); begin if use_subdir then return dist_subdir & "/" & distfile; else return distfile; end if; end determine_distname; distfile_path : HT.Text := HT.SUS (determine_distname); begin if not distfile_set.Contains (distfile_path) then dindex := dindex + 1; distfile_set.Insert (distfile_path, dindex); end if; end insert_distfile; begin if unkindness = PM.no_unkindness or else not DIR.Exists (unkindness) then return; end if; for highdigit in AF'Range loop for lowdigit in AF'Range loop declare bucket : bucket_code := tohex (highdigit) & tohex (lowdigit); bucket_dir : constant String := unkindness & "/bucket_" & bucket; Inner_Search : DIR.Search_Type; Inner_Dirent : DIR.Directory_Entry_Type; use type DIR.File_Kind; begin if DIR.Exists (bucket_dir) and then DIR.Kind (bucket_dir) = DIR.Directory then DIR.Start_Search (Search => Inner_Search, Directory => bucket_dir, Filter => (DIR.Ordinary_File => True, others => False), Pattern => "*"); while DIR.More_Entries (Inner_Search) loop DIR.Get_Next_Entry (Inner_Search, Inner_Dirent); declare namebase : String := DIR.Simple_Name (Inner_Dirent); successful : Boolean; customspec : PSP.Portspecs; arch_focus : supported_arch := x86_64; -- unused, pick one buildsheet : constant String := "/bucket_" & bucket & "/" & namebase; begin PAR.parse_specification_file (dossier => unkindness & buildsheet, specification => customspec, opsys_focus => platform_type, arch_focus => arch_focus, success => successful, stop_at_targets => True); if not successful then raise bsheet_parsing with unkindness & buildsheet & "-> " & PAR.get_parse_error; end if; declare dist_subdir : String := customspec.get_field_value (PSP.sp_distsubdir); num_dfiles : Natural := customspec.get_list_length (PSP.sp_distfiles); begin for df in 1 .. num_dfiles loop insert_distfile (dist_subdir, customspec.get_list_item (PSP.sp_distfiles, df)); end loop; end; end; end loop; DIR.End_Search (Inner_Search); end if; end; end loop; end loop; end linear_scan_unkindness_for_distfiles; -------------------------------------------------------------------------------------------- -- parallel_distfile_scan -------------------------------------------------------------------------------------------- procedure parallel_distfile_scan (conspiracy : String; sysrootver : sysroot_characteristics; success : out Boolean; show_progress : Boolean) is procedure combine (position : portkey_crate.Cursor); finished : array (scanners) of Boolean := (others => False); task_storage : array (scanners) of portkey_crate.Map; combined_wait : Boolean := True; aborted : Boolean := False; dindex : port_index := port_index (distfile_set.Length); procedure combine (position : portkey_crate.Cursor) is distfile : HT.Text := portkey_crate.Key (position); begin if not distfile_set.Contains (distfile) then dindex := dindex + 1; distfile_set.Insert (distfile, dindex); end if; end combine; task type scan (lot : scanners); task body scan is procedure populate (cursor : subqueue.Cursor); procedure populate (cursor : subqueue.Cursor) is procedure insert_distfile (dist_subdir : String; distfile : String); target_port : port_index := subqueue.Element (cursor); namebase : String := HT.USS (all_ports (target_port).port_namebase); bucket : bucket_code := all_ports (target_port).bucket; customspec : PSP.Portspecs; successful : Boolean; arch_focus : supported_arch := x86_64; -- unused, pick one buildsheet : constant String := "/bucket_" & bucket & "/" & namebase; procedure insert_distfile (dist_subdir : String; distfile : String) is function determine_distname return String; use_subdir : Boolean := (dist_subdir /= ""); function determine_distname return String is begin if use_subdir then return dist_subdir & "/" & distfile; else return distfile; end if; end determine_distname; distfile_path : HT.Text := HT.SUS (determine_distname); begin if not task_storage (lot).Contains (distfile_path) then task_storage (lot).Insert (distfile_path, 1); end if; end insert_distfile; begin if not aborted then PAR.parse_specification_file (dossier => conspiracy & buildsheet, specification => customspec, opsys_focus => platform_type, arch_focus => arch_focus, success => successful, stop_at_targets => True); if not successful then TIO.Put_Line (LAT.LF & "culprit: " & buildsheet & "-> " & PAR.get_parse_error); aborted := True; end if; declare dist_subdir : String := customspec.get_field_value (PSP.sp_distsubdir); num_dfiles : Natural := customspec.get_list_length (PSP.sp_distfiles); begin for df in 1 .. num_dfiles loop insert_distfile (dist_subdir, customspec.get_list_item (PSP.sp_distfiles, df)); end loop; end; mq_progress (lot) := mq_progress (lot) + 1; end if; end populate; begin make_queue (lot).Iterate (populate'Access); finished (lot) := True; end scan; scan_01 : scan (lot => 1); scan_02 : scan (lot => 2); scan_03 : scan (lot => 3); scan_04 : scan (lot => 4); scan_05 : scan (lot => 5); scan_06 : scan (lot => 6); scan_07 : scan (lot => 7); scan_08 : scan (lot => 8); scan_09 : scan (lot => 9); scan_10 : scan (lot => 10); scan_11 : scan (lot => 11); scan_12 : scan (lot => 12); scan_13 : scan (lot => 13); scan_14 : scan (lot => 14); scan_15 : scan (lot => 15); scan_16 : scan (lot => 16); scan_17 : scan (lot => 17); scan_18 : scan (lot => 18); scan_19 : scan (lot => 19); scan_20 : scan (lot => 20); scan_21 : scan (lot => 21); scan_22 : scan (lot => 22); scan_23 : scan (lot => 23); scan_24 : scan (lot => 24); scan_25 : scan (lot => 25); scan_26 : scan (lot => 26); scan_27 : scan (lot => 27); scan_28 : scan (lot => 28); scan_29 : scan (lot => 29); scan_30 : scan (lot => 30); scan_31 : scan (lot => 31); scan_32 : scan (lot => 32); begin TIO.Put_Line ("Scanning entire ports tree for distfiles."); while combined_wait loop delay 1.0; if show_progress then TIO.Put (scan_progress); end if; combined_wait := False; for j in scanners'Range loop if not finished (j) then combined_wait := True; exit; end if; end loop; if Signals.graceful_shutdown_requested then aborted := True; end if; end loop; success := not aborted; if success then -- Now that the scanners are complete, we can combine the results for j in scanners'Range loop task_storage (j).Iterate (combine'Access); end loop; end if; end parallel_distfile_scan; -------------------------------------------------------------------------------------------- -- display_kmg -------------------------------------------------------------------------------------------- function display_kmg (number : disktype) return String is type kmgtype is delta 0.01 digits 6; kilo : constant disktype := 1024; mega : constant disktype := kilo * kilo; giga : constant disktype := kilo * mega; XXX : kmgtype; begin if number > giga then XXX := kmgtype (number / giga); return XXX'Img & " gigabytes"; elsif number > mega then XXX := kmgtype (number / mega); return XXX'Img & " megabytes"; else XXX := kmgtype (number / kilo); return XXX'Img & " kilobytes"; end if; end display_kmg; -------------------------------------------------------------------------------------------- -- purge_obsolete_distfiles -------------------------------------------------------------------------------------------- procedure purge_obsolete_distfiles is procedure kill (position : portkey_crate.Cursor); procedure find_actual_tarballs (folder : String); distfiles_directory : String := Unix.true_path (HT.USS (PM.configuration.dir_distfiles)); abort_purge : Boolean := False; bytes_purged : disktype := 0; rmfiles : portkey_crate.Map; procedure kill (position : portkey_crate.Cursor) is tarball : String := HT.USS (portkey_crate.Key (position)); path : String := distfiles_directory & "/" & tarball; begin TIO.Put_Line ("Deleting " & tarball); DIR.Delete_File (path); end kill; procedure find_actual_tarballs (folder : String) is procedure walkdir (item : DIR.Directory_Entry_Type); procedure print (item : DIR.Directory_Entry_Type); uniqid : port_id := 0; leftindent : Natural := distfiles_directory'Length + 2; procedure print (item : DIR.Directory_Entry_Type) is FN : constant String := DIR.Full_Name (item); tball : HT.Text := HT.SUS (FN (leftindent .. FN'Last)); begin if not distfile_set.Contains (tball) then if not rmfiles.Contains (tball) then uniqid := uniqid + 1; rmfiles.Insert (Key => tball, New_Item => uniqid); bytes_purged := bytes_purged + disktype (DIR.Size (FN)); end if; end if; end print; procedure walkdir (item : DIR.Directory_Entry_Type) is begin if DIR.Simple_Name (item) /= "." and then DIR.Simple_Name (item) /= ".." then find_actual_tarballs (DIR.Full_Name (item)); end if; exception when DIR.Name_Error => abort_purge := True; TIO.Put_Line ("walkdir: " & folder & " directory does not exist"); end walkdir; begin DIR.Search (folder, "*", (DIR.Ordinary_File => True, others => False), print'Access); DIR.Search (folder, "", (DIR.Directory => True, others => False), walkdir'Access); exception when DIR.Name_Error => abort_purge := True; TIO.Put_Line ("The " & folder & " directory does not exist"); when DIR.Use_Error => abort_purge := True; TIO.Put_Line ("Searching " & folder & " directory is not supported"); when failed : others => abort_purge := True; TIO.Put_Line ("purge_obsolete_distfiles: Unknown error - directory search"); TIO.Put_Line (EX.Exception_Information (failed)); end find_actual_tarballs; begin find_actual_tarballs (distfiles_directory); if abort_purge then TIO.Put_Line ("Distfile purge operation aborted."); else rmfiles.Iterate (kill'Access); TIO.Put_Line ("Recovered" & display_kmg (bytes_purged)); end if; end purge_obsolete_distfiles; -------------------------------------------------------------------------------------------- -- scan_repository -------------------------------------------------------------------------------------------- function scan_repository (repository : String) return Boolean is pkg_search : DIR.Search_Type; dirent : DIR.Directory_Entry_Type; pkg_index : scanners := scanners'First; result : Boolean := False; begin DIR.Start_Search (Search => pkg_search, Directory => repository, Filter => (DIR.Ordinary_File => True, others => False), Pattern => "*" & arc_ext); while DIR.More_Entries (Search => pkg_search) loop DIR.Get_Next_Entry (Search => pkg_search, Directory_Entry => dirent); declare pkgname : HT.Text := HT.SUS (DIR.Simple_Name (dirent)); begin package_list.Append (pkgname); result := True; end; end loop; DIR.End_Search (pkg_search); return result; end scan_repository; -------------------------------------------------------------------------------------------- -- store_port_dependencies -------------------------------------------------------------------------------------------- procedure store_port_dependencies (port : port_index; conspiracy : String; unkindness : String; sysrootver : sysroot_characteristics) is function calc_dossier return String; rec : port_record renames all_ports (port); nbase : constant String := HT.USS (rec.port_namebase); function calc_dossier return String is buildsheet : String := "/bucket_" & rec.bucket & "/" & nbase; begin if rec.unkind_custom then return unkindness & buildsheet; else return conspiracy & buildsheet; end if; end calc_dossier; thespec : PSP.Portspecs; successful : Boolean; dossier : constant String := calc_dossier; variant : constant String := HT.USS (rec.port_variant); begin OPS.parse_and_transform_buildsheet (specification => thespec, successful => successful, buildsheet => dossier, variant => variant, portloc => "", excl_targets => True, avoid_dialog => True, for_webpage => False, sysrootver => sysrootver); if not successful then -- fail silently. The issue is caught in pass #2 return; end if; all_ports (port).ignore_reason := HT.SUS (thespec.get_tagline (variant)); all_ports (port).port_namebase := HT.SUS (nbase); all_ports (port).port_variant := HT.SUS (variant); all_ports (port).pkgversion := HT.SUS (thespec.calculate_pkgversion); all_ports (port).scanned := True; for item in Positive range 1 .. thespec.get_list_length (PSP.sp_build_deps) loop populate_set_depends (port, thespec.get_list_item (PSP.sp_build_deps, item), build); end loop; for item in Positive range 1 .. thespec.get_list_length (PSP.sp_buildrun_deps) loop populate_set_depends (port, thespec.get_list_item (PSP.sp_buildrun_deps, item), buildrun); end loop; for item in Positive range 1 .. thespec.get_list_length (PSP.sp_run_deps) loop populate_set_depends (port, thespec.get_list_item (PSP.sp_run_deps, item), runtime); end loop; for item in Positive range 1 .. thespec.get_subpackage_length (variant) loop declare subpackage : String := thespec.get_subpackage_item (variant, item); begin for subitem in Positive range 1 .. thespec.get_number_extra_run (subpackage) loop declare dep : String := thespec.get_extra_runtime (subpackage, subitem); begin populate_set_depends (port, dep, extra_runtime); end; end loop; end; end loop; end store_port_dependencies; -------------------------------------------------------------------------------------------- -- blocked_text_block -------------------------------------------------------------------------------------------- function blocked_text_block (port : port_index) return String is procedure scan (position : block_crate.Cursor); procedure print (position : string_crate.Cursor); result : HT.Text; tempstore : string_crate.Vector; procedure scan (position : block_crate.Cursor) is blocked : port_index renames block_crate.Element (position); pv : constant String := get_port_variant (all_ports (blocked)); begin tempstore.Append (HT.SUS (pv)); end scan; procedure print (position : string_crate.Cursor) is pvkey : HT.Text renames string_crate.Element (position); pndx : constant port_index := ports_keys.Element (pvkey); namebase : constant String := HT.USS (all_ports (pndx).port_namebase); variant : constant String := HT.USS (all_ports (pndx).port_variant); bucket : constant String := "bucket_" & UTL.bucket (namebase); begin HT.SU.Append (result, get_port_variant (all_ports (pndx)) & ";" & "../../../" & bucket & "/" & namebase & "/" & variant & ";" & HT.USS (all_ports (pndx).ignore_reason) & LAT.LF); end print; begin all_ports (port).blocks.Iterate (scan'Access); sorter.Sort (tempstore); tempstore.Iterate (print'Access); return HT.USS (result); end blocked_text_block; -------------------------------------------------------------------------------------------- -- generate_single_page -------------------------------------------------------------------------------------------- function generate_single_page (port : port_index; workzone : String; www_site : String; conspiracy : String; unkindness : String; cdatetime : CAL.Time; mdatetime : CAL.Time; sysrootver : sysroot_characteristics) return Boolean is function calc_dossier return String; rec : port_record renames all_ports (port); nbase : constant String := HT.USS (rec.port_namebase); function calc_dossier return String is buildsheet : String := "/bucket_" & rec.bucket & "/" & nbase; begin if rec.unkind_custom then return unkindness & buildsheet; else return conspiracy & buildsheet; end if; end calc_dossier; thespec : PSP.Portspecs; successful : Boolean; html_page : TIO.File_Type; variant : constant String := HT.USS (rec.port_variant); page : constant String := www_site & "/bucket_" & rec.bucket & "/" & nbase & "/" & variant & "/index.html"; work_dir : constant String := workzone & "/" & nbase; dossier : constant String := calc_dossier; begin OPS.parse_and_transform_buildsheet (specification => thespec, successful => successful, buildsheet => dossier, variant => variant, portloc => work_dir, excl_targets => False, avoid_dialog => True, for_webpage => True, sysrootver => sysrootver); if successful then begin FOP.mkdirp_from_filename (page); TIO.Create (File => html_page, Mode => TIO.Out_File, Name => page); WEB.produce_page (specs => thespec, variant => variant, dossier => html_page, portdir => work_dir, blocked => blocked_text_block (port), created => cdatetime, changed => mdatetime, devscan => True); REP.clear_workzone_directory (nbase); TIO.Close (html_page); return True; exception when issue : others => if TIO.Is_Open (html_page) then TIO.Close (html_page); end if; TIO.Put_Line ("WWW: Failed to create " & page); end; else TIO.Put_Line ("WWW: Failed to parse " & dossier); end if; return False; end generate_single_page; -------------------------------------------------------------------------------------------- -- generate_catalog_index -------------------------------------------------------------------------------------------- function generate_catalog_index (www_site : String; crate : dates_crate.Map; catcrate : catalog_crate.Set) return Boolean is page : constant String := www_site & "/index.html"; successful : Boolean; html_page : TIO.File_Type; begin TIO.Create (File => html_page, Mode => TIO.Out_File, Name => page); successful := WEB.generate_catalog_index (html_page, catalog_row_block (crate, catcrate)); TIO.Close (html_page); return successful; exception when issue : others => if TIO.Is_Open (html_page) then TIO.Close (html_page); end if; return False; end generate_catalog_index; -------------------------------------------------------------------------------------------- -- serially_generate_web_pages -------------------------------------------------------------------------------------------- procedure serially_generate_web_pages (www_site : String; sysrootver : sysroot_characteristics; success : out Boolean) is procedure set_timestamps (index : port_index); all_good : Boolean := True; workzone : constant String := REP.get_workzone_path; conspiracy : constant String := HT.USS (PM.configuration.dir_conspiracy); unkindness : constant String := HT.USS (PM.configuration.dir_unkindness); crate : dates_crate.Map; catcrate : catalog_crate.Set; cdatetime : CAL.Time; mdatetime : CAL.Time; procedure set_timestamps (index : port_index) is key : HT.Text := all_ports (index).port_namebase; begin if crate.Contains (key) then cdatetime := crate.Element (key).creation; mdatetime := crate.Element (key).lastmod; else cdatetime := CAL.Time_Of (1970, 1, 1); mdatetime := cdatetime; end if; end set_timestamps; begin for x in 0 .. last_port loop store_port_dependencies (port => x, conspiracy => conspiracy, unkindness => unkindness, sysrootver => sysrootver); end loop; iterate_reverse_deps; scan_port_dates (conspiracy, crate, catcrate); REP.launch_workzone; for x in 0 .. last_port loop set_timestamps (x); if not generate_single_page (port => x, workzone => workzone, www_site => www_site, conspiracy => conspiracy, unkindness => unkindness, cdatetime => cdatetime, mdatetime => mdatetime, sysrootver => sysrootver) then all_good := False; end if; end loop; REP.destroy_workzone; if all_good then if generate_catalog_index (www_site, crate, catcrate) then success := True; return; end if; end if; success := False; end serially_generate_web_pages; -------------------------------------------------------------------------------------------- -- scan_port_dates -------------------------------------------------------------------------------------------- procedure scan_port_dates (conspiracy : String; crate : in out dates_crate.Map; catcrate : in out catalog_crate.Set) is package lastmod_crate is new CON.Hashed_Maps (Key_Type => HT.Text, Element_Type => disktype, Hash => port_hash, Equivalent_Keys => HT.equivalent); procedure build_up_catcrate (index : port_index); tempstore : lastmod_crate.Map; procedure build_up_catcrate (index : port_index) is tempkey : HT.Text := all_ports (index).port_namebase; newrec : catalog_record; begin newrec.origin := HT.SUS (get_port_variant (index)); if tempstore.Contains (tempkey) then newrec.lastmod64 := tempstore.Element (tempkey); else newrec.lastmod64 := 205329600; -- dummy: USA bicentennial end if; catcrate.Insert (newrec); end build_up_catcrate; begin crate.Clear; declare filename : constant String := conspiracy & "/" & port_dates; contents : constant String := FOP.get_file_contents (filename); markers : HT.Line_Markers; begin HT.initialize_markers (contents, markers); loop exit when not HT.next_line_present (contents, markers); declare line : constant String := HT.extract_line (contents, markers); key : constant String := HT.specific_field (line, 1); date1 : constant String := HT.specific_field (line, 2); date2 : constant String := HT.specific_field (line, 3); keytxt : HT.Text := HT.SUS (key); newrec : port_dates_record; begin newrec.creation := UTL.convert_unixtime (date1); newrec.lastmod := UTL.convert_unixtime (date2); crate.Insert (keytxt, newrec); tempstore.Insert (keytxt, disktype'Value (date2)); exception when others => null; end; end loop; for x in 0 .. last_port loop build_up_catcrate (x); end loop; exception when issue : others => TIO.Put_Line ("WARNING: Failed to ingest " & port_dates & " file"); end; end scan_port_dates; -------------------------------------------------------------------------------------------- -- "<" for catalog crate ordered sets -------------------------------------------------------------------------------------------- function "<" (L, R : catalog_record) return Boolean is begin if L.lastmod64 = R.lastmod64 then return HT.SU.">" (R.origin, L.origin); end if; return L.lastmod64 > R.lastmod64; end "<"; -------------------------------------------------------------------------------------------- -- catalog_row_block -------------------------------------------------------------------------------------------- function catalog_row_block (crate : dates_crate.Map; catcrate : catalog_crate.Set) return String is procedure scan (position : catalog_crate.Cursor); function get_lastmod (index : port_index) return String; function Q (value : String; first : Boolean := False) return String; result : HT.Text; counter : Positive := 1; function get_lastmod (index : port_index) return String is key : HT.Text := all_ports (index).port_namebase; mdatetime : CAL.Time; begin if crate.Contains (key) then mdatetime := crate.Element (key).lastmod; else mdatetime := CAL.Time_Of (1970, 1, 1); end if; return HT.substring (LOG.timestamp (mdatetime, True), 0, 4); end get_lastmod; function Q (value : String; first : Boolean := False) return String is begin if first then return LAT.Quotation & value & LAT.Quotation; else return LAT.Comma & LAT.Quotation & value & LAT.Quotation; end if; end Q; procedure scan (position : catalog_crate.Cursor) is keytext : HT.Text renames catalog_crate.Element (position).origin; target : port_index := ports_keys.Element (keytext); origin : constant String := get_port_variant (target); pkgver : constant String := HT.USS (all_ports (target).pkgversion); bucket : constant String := all_ports (target).bucket; tstamp : constant String := get_lastmod (target); sindex : constant String := HT.int2str (counter); tagline : constant String := HT.replace_all (HT.USS (all_ports (target).ignore_reason), LAT.Quotation, LAT.Apostrophe); begin HT.SU.Append (result, LAT.HT & "row_assy(" & Q (sindex, True) & Q (bucket) & Q (origin) & Q (pkgver) & Q (tagline) & Q (tstamp) & ");" & LAT.LF); counter := counter + 1; end scan; begin catcrate.Iterate (scan'Access); return (HT.USS (result)); exception when issue : others => TIO.Put_Line ("catalog_row_block: " & Ada.Exceptions.Exception_Message (issue)); return (HT.USS (result)); end catalog_row_block; end PortScan.Scan;
AdaCore/libadalang
Ada
403
adb
with Ada.Numerics; with Ada.Numerics.Elementary_Functions; procedure Test is package EF is function "**" (L, R : Float) return Float; function Lol (L, R : Float) return Float; end EF; -- package EF renames Ada.Numerics.Elementary_Functions; Arg : Float := 123.44444; use Ada.Numerics; F : Float; begin F := EF."**"(e, 122.4); pragma Test_Statement_UID; end Test;
stcarrez/babel
Ada
12,401
adb
-- bkp-files -- File and directories ----------------------------------------------------------------------- -- Copyright (C) 2014 Stephane.Carrez -- Written by Stephane.Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.Calendar.Conversions; with Interfaces.C; with Util.Log.Loggers; with Util.Files; with Util.Encoders.Base16; package body Babel.Files is Log : constant Util.Log.Loggers.Logger := Util.Log.Loggers.Create ("Bkp.Files"); Hex_Encoder : Util.Encoders.Base16.Encoder; -- ------------------------------ -- Compare two files on their name and directory. -- ------------------------------ function "<" (Left, Right : in File_Type) return Boolean is use type Ada.Strings.Unbounded.Unbounded_String; begin if Left = NO_FILE then return False; elsif Right = NO_FILE then return True; elsif Left.Dir = Right.Dir then return Left.Name < Right.Name; elsif Left.Dir = NO_DIRECTORY then return True; elsif Right.Dir = NO_DIRECTORY then return False; else return Left.Dir.Name.all < Right.Dir.Name.all; end if; end "<"; -- ------------------------------ -- Allocate a File_Type entry with the given name for the directory. -- ------------------------------ function Allocate (Name : in String; Dir : in Directory_Type) return File_Type is use Ada.Strings.Unbounded; Result : constant File_Type := new File '(Len => Name'Length, Id => NO_IDENTIFIER, Dir => Dir, Name => Name, others => <>); begin return Result; end Allocate; -- ------------------------------ -- Allocate a Directory_Type entry with the given name for the directory. -- ------------------------------ function Allocate (Name : in String; Dir : in Directory_Type) return Directory_Type is Path : String_Access; Result : constant Directory_Type := new Directory '(Id => NO_IDENTIFIER, Parent => Dir, others => <>); begin if Dir /= null then Path := new String '(Util.Files.Compose (Dir.Name.all, Name)); Result.Name_Pos := Dir.Name'Length + 1; else Path := new String '(Name); Result.Name_Pos := 1; end if; Result.Name := Path; return Result; end Allocate; -- ------------------------------ -- Return true if the file was modified and need a backup. -- ------------------------------ function Is_Modified (Element : in File_Type) return Boolean is use type ADO.Identifier; begin if Element.Id = NO_IDENTIFIER then return True; elsif (Element.Status and FILE_MODIFIED) /= 0 then return True; else return False; end if; end Is_Modified; -- ------------------------------ -- Return true if the file is a new file. -- ------------------------------ function Is_New (Element : in File_Type) return Boolean is use type ADO.Identifier; begin return Element.Id = NO_IDENTIFIER; end Is_New; -- ------------------------------ -- Set the file as modified. -- ------------------------------ procedure Set_Modified (Element : in File_Type) is begin Element.Status := Element.Status or FILE_MODIFIED; end Set_Modified; -- ------------------------------ -- Set the SHA1 signature that was computed for this file. -- If the computed signature is different from the current signature, -- the FILE_MODIFIED flag is set on the file. The FILE_HAS_SHA1 flag -- is set on the file. -- ------------------------------ procedure Set_Signature (Element : in File_Type; Signature : in Util.Encoders.SHA1.Hash_Array) is use type Util.Encoders.SHA1.Hash_Array; begin if (Element.Status and FILE_HAS_SHA1) /= 0 and then Element.SHA1 /= Signature then Element.Status := Element.Status or FILE_MODIFIED; end if; Element.Status := Element.Status or FILE_HAS_SHA1; Element.SHA1 := Signature; end Set_Signature; -- ------------------------------ -- Set the file size. If the new size is different, the FILE_MODIFIED -- flag is set on the file. -- ------------------------------ procedure Set_Size (Element : in File_Type; Size : in File_Size) is begin if Element.Size /= Size then Element.Size := Size; Element.Status := Element.Status or FILE_MODIFIED; end if; end Set_Size; -- ------------------------------ -- Set the owner and group of the file. -- ------------------------------ procedure Set_Owner (Element : in File_Type; User : in Uid_Type; Group : in Gid_Type) is begin Element.User := User; Element.Group := Group; end Set_Owner; -- ------------------------------ -- Set the file modification date. -- ------------------------------ procedure Set_Date (Element : in File_Type; Date : in Util.Systems.Types.Timespec) is begin Set_Date (Element, Ada.Calendar.Conversions.To_Ada_Time (Interfaces.C.long (Date.tv_sec))); end Set_Date; procedure Set_Date (Element : in File_Type; Date : in Ada.Calendar.Time) is use type Ada.Calendar.Time; begin if Element.Date /= Date then Element.Date := Date; Element.Status := Element.Status or FILE_MODIFIED; end if; end Set_Date; -- ------------------------------ -- Return the path for the file. -- ------------------------------ function Get_Path (Element : in File_Type) return String is begin if Element.Dir = null then return Element.Name; else return Util.Files.Compose (Get_Path (Element.Dir), Element.Name); end if; end Get_Path; -- ------------------------------ -- Return the path for the directory. -- ------------------------------ function Get_Path (Element : in Directory_Type) return String is begin return Element.Name.all; end Get_Path; -- ------------------------------ -- Return the SHA1 signature computed for the file. -- ------------------------------ function Get_SHA1 (Element : in File_Type) return String is begin return Hex_Encoder.Transform (Element.SHA1); end Get_SHA1; -- ------------------------------ -- Return the file size. -- ------------------------------ function Get_Size (Element : in File_Type) return File_Size is begin return Element.Size; end Get_Size; -- ------------------------------ -- Return the file modification date. -- ------------------------------ function Get_Date (Element : in File_Type) return Ada.Calendar.Time is begin return Element.Date; end Get_Date; -- ------------------------------ -- Return the user uid. -- ------------------------------ function Get_User (Element : in File_Type) return Uid_Type is begin return Element.User; end Get_User; -- ------------------------------ -- Return the group gid. -- ------------------------------ function Get_Group (Element : in File_Type) return Gid_Type is begin return Element.Group; end Get_Group; -- ------------------------------ -- Return the file unix mode. -- ------------------------------ function Get_Mode (Element : in File_Type) return File_Mode is begin return Element.Mode; end Get_Mode; -- ------------------------------ -- Add the file with the given name in the container. -- ------------------------------ overriding procedure Add_File (Into : in out Default_Container; Element : in File_Type) is begin Into.Files.Append (Element); end Add_File; -- ------------------------------ -- Add the directory with the given name in the container. -- ------------------------------ overriding procedure Add_Directory (Into : in out Default_Container; Element : in Directory_Type) is begin Into.Dirs.Append (Element); end Add_Directory; -- ------------------------------ -- Create a new file instance with the given name in the container. -- ------------------------------ overriding function Create (Into : in Default_Container; Name : in String) return File_Type is begin return Allocate (Name => Name, Dir => Into.Current); end Create; -- ------------------------------ -- Create a new directory instance with the given name in the container. -- ------------------------------ overriding function Create (Into : in Default_Container; Name : in String) return Directory_Type is begin return Allocate (Name => Name, Dir => Into.Current); end Create; -- ------------------------------ -- Find the file with the given name in this file container. -- Returns NO_FILE if the file was not found. -- ------------------------------ overriding function Find (From : in Default_Container; Name : in String) return File_Type is pragma Unreferenced (From, Name); begin return NO_FILE; end Find; -- ------------------------------ -- Find the directory with the given name in this file container. -- Returns NO_DIRECTORY if the directory was not found. -- ------------------------------ overriding function Find (From : in Default_Container; Name : in String) return Directory_Type is pragma Unreferenced (From, Name); begin return NO_DIRECTORY; end Find; -- ------------------------------ -- Set the directory object associated with the container. -- ------------------------------ procedure Set_Directory (Into : in out Default_Container; Directory : in Directory_Type) is begin Into.Current := Directory; Into.Files.Clear; Into.Dirs.Clear; end Set_Directory; -- ------------------------------ -- Execute the Process procedure on each directory found in the container. -- ------------------------------ overriding procedure Each_Directory (Container : in Default_Container; Process : not null access procedure (Dir : in Directory_Type)) is Iter : Directory_Vectors.Cursor := Container.Dirs.First; begin while Directory_Vectors.Has_Element (Iter) loop Process (Directory_Vectors.Element (Iter)); Directory_Vectors.Next (Iter); end loop; end Each_Directory; -- ------------------------------ -- Execute the Process procedure on each file found in the container. -- ------------------------------ overriding procedure Each_File (Container : in Default_Container; Process : not null access procedure (F : in File_Type)) is Iter : File_Vectors.Cursor := Container.Files.First; begin while File_Vectors.Has_Element (Iter) loop Process (File_Vectors.Element (Iter)); File_Vectors.Next (Iter); end loop; end Each_File; end Babel.Files;
AdaCore/training_material
Ada
5,624
ads
pragma Ada_2005; pragma Style_Checks (Off); with Interfaces.C; use Interfaces.C; package avx512dqintrin_h is -- Copyright (C) 2014-2017 Free Software Foundation, Inc. -- This file is part of GCC. -- GCC is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3, or (at your option) -- any later version. -- GCC 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. -- 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/>. -- skipped func _ktest_mask8_u8 -- skipped func _ktestz_mask8_u8 -- skipped func _ktestc_mask8_u8 -- skipped func _ktest_mask16_u8 -- skipped func _ktestz_mask16_u8 -- skipped func _ktestc_mask16_u8 -- skipped func _kortest_mask8_u8 -- skipped func _kortestz_mask8_u8 -- skipped func _kortestc_mask8_u8 -- skipped func _kadd_mask8 -- skipped func _kadd_mask16 -- skipped func _cvtmask8_u32 -- skipped func _cvtu32_mask8 -- skipped func _load_mask8 -- skipped func _store_mask8 -- skipped func _knot_mask8 -- skipped func _kor_mask8 -- skipped func _kxnor_mask8 -- skipped func _kxor_mask8 -- skipped func _kand_mask8 -- skipped func _kandn_mask8 -- skipped func _mm512_broadcast_f64x2 -- skipped func _mm512_mask_broadcast_f64x2 -- skipped func _mm512_maskz_broadcast_f64x2 -- skipped func _mm512_broadcast_i64x2 -- skipped func _mm512_mask_broadcast_i64x2 -- skipped func _mm512_maskz_broadcast_i64x2 -- skipped func _mm512_broadcast_f32x2 -- skipped func _mm512_mask_broadcast_f32x2 -- skipped func _mm512_maskz_broadcast_f32x2 -- skipped func _mm512_broadcast_i32x2 -- skipped func _mm512_mask_broadcast_i32x2 -- skipped func _mm512_maskz_broadcast_i32x2 -- skipped func _mm512_broadcast_f32x8 -- skipped func _mm512_mask_broadcast_f32x8 -- skipped func _mm512_maskz_broadcast_f32x8 -- skipped func _mm512_broadcast_i32x8 -- skipped func _mm512_mask_broadcast_i32x8 -- skipped func _mm512_maskz_broadcast_i32x8 -- skipped func _mm512_mullo_epi64 -- skipped func _mm512_mask_mullo_epi64 -- skipped func _mm512_maskz_mullo_epi64 -- skipped func _mm512_xor_pd -- skipped func _mm512_mask_xor_pd -- skipped func _mm512_maskz_xor_pd -- skipped func _mm512_xor_ps -- skipped func _mm512_mask_xor_ps -- skipped func _mm512_maskz_xor_ps -- skipped func _mm512_or_pd -- skipped func _mm512_mask_or_pd -- skipped func _mm512_maskz_or_pd -- skipped func _mm512_or_ps -- skipped func _mm512_mask_or_ps -- skipped func _mm512_maskz_or_ps -- skipped func _mm512_and_pd -- skipped func _mm512_mask_and_pd -- skipped func _mm512_maskz_and_pd -- skipped func _mm512_and_ps -- skipped func _mm512_mask_and_ps -- skipped func _mm512_maskz_and_ps -- skipped func _mm512_andnot_pd -- skipped func _mm512_mask_andnot_pd -- skipped func _mm512_maskz_andnot_pd -- skipped func _mm512_andnot_ps -- skipped func _mm512_mask_andnot_ps -- skipped func _mm512_maskz_andnot_ps -- skipped func _mm512_movepi32_mask -- skipped func _mm512_movepi64_mask -- skipped func _mm512_movm_epi32 -- skipped func _mm512_movm_epi64 -- skipped func _mm512_cvttpd_epi64 -- skipped func _mm512_mask_cvttpd_epi64 -- skipped func _mm512_maskz_cvttpd_epi64 -- skipped func _mm512_cvttpd_epu64 -- skipped func _mm512_mask_cvttpd_epu64 -- skipped func _mm512_maskz_cvttpd_epu64 -- skipped func _mm512_cvttps_epi64 -- skipped func _mm512_mask_cvttps_epi64 -- skipped func _mm512_maskz_cvttps_epi64 -- skipped func _mm512_cvttps_epu64 -- skipped func _mm512_mask_cvttps_epu64 -- skipped func _mm512_maskz_cvttps_epu64 -- skipped func _mm512_cvtpd_epi64 -- skipped func _mm512_mask_cvtpd_epi64 -- skipped func _mm512_maskz_cvtpd_epi64 -- skipped func _mm512_cvtpd_epu64 -- skipped func _mm512_mask_cvtpd_epu64 -- skipped func _mm512_maskz_cvtpd_epu64 -- skipped func _mm512_cvtps_epi64 -- skipped func _mm512_mask_cvtps_epi64 -- skipped func _mm512_maskz_cvtps_epi64 -- skipped func _mm512_cvtps_epu64 -- skipped func _mm512_mask_cvtps_epu64 -- skipped func _mm512_maskz_cvtps_epu64 -- skipped func _mm512_cvtepi64_ps -- skipped func _mm512_mask_cvtepi64_ps -- skipped func _mm512_maskz_cvtepi64_ps -- skipped func _mm512_cvtepu64_ps -- skipped func _mm512_mask_cvtepu64_ps -- skipped func _mm512_maskz_cvtepu64_ps -- skipped func _mm512_cvtepi64_pd -- skipped func _mm512_mask_cvtepi64_pd -- skipped func _mm512_maskz_cvtepi64_pd -- skipped func _mm512_cvtepu64_pd -- skipped func _mm512_mask_cvtepu64_pd -- skipped func _mm512_maskz_cvtepu64_pd end avx512dqintrin_h;
reznikmm/matreshka
Ada
24,215
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with AMF.Elements; with AMF.Internals.Element_Collections; with AMF.Internals.Helpers; with AMF.Internals.Tables.UML_Attributes; with AMF.Visitors.UML_Iterators; with AMF.Visitors.UML_Visitors; with League.Strings.Internals; with Matreshka.Internals.Strings; package body AMF.Internals.UML_Start_Classifier_Behavior_Actions is ------------------- -- Enter_Element -- ------------------- overriding procedure Enter_Element (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Visitor in AMF.Visitors.UML_Visitors.UML_Visitor'Class then AMF.Visitors.UML_Visitors.UML_Visitor'Class (Visitor).Enter_Start_Classifier_Behavior_Action (AMF.UML.Start_Classifier_Behavior_Actions.UML_Start_Classifier_Behavior_Action_Access (Self), Control); end if; end Enter_Element; ------------------- -- Leave_Element -- ------------------- overriding procedure Leave_Element (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Visitor in AMF.Visitors.UML_Visitors.UML_Visitor'Class then AMF.Visitors.UML_Visitors.UML_Visitor'Class (Visitor).Leave_Start_Classifier_Behavior_Action (AMF.UML.Start_Classifier_Behavior_Actions.UML_Start_Classifier_Behavior_Action_Access (Self), Control); end if; end Leave_Element; ------------------- -- Visit_Element -- ------------------- overriding procedure Visit_Element (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy; Iterator : in out AMF.Visitors.Abstract_Iterator'Class; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Iterator in AMF.Visitors.UML_Iterators.UML_Iterator'Class then AMF.Visitors.UML_Iterators.UML_Iterator'Class (Iterator).Visit_Start_Classifier_Behavior_Action (Visitor, AMF.UML.Start_Classifier_Behavior_Actions.UML_Start_Classifier_Behavior_Action_Access (Self), Control); end if; end Visit_Element; ---------------- -- Get_Object -- ---------------- overriding function Get_Object (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Input_Pins.UML_Input_Pin_Access is begin return AMF.UML.Input_Pins.UML_Input_Pin_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Object (Self.Element))); end Get_Object; ---------------- -- Set_Object -- ---------------- overriding procedure Set_Object (Self : not null access UML_Start_Classifier_Behavior_Action_Proxy; To : AMF.UML.Input_Pins.UML_Input_Pin_Access) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_Object (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Object; ----------------- -- Get_Context -- ----------------- overriding function Get_Context (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Classifiers.UML_Classifier_Access is begin return AMF.UML.Classifiers.UML_Classifier_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Context (Self.Element))); end Get_Context; --------------- -- Get_Input -- --------------- overriding function Get_Input (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Input_Pins.Collections.Ordered_Set_Of_UML_Input_Pin is begin return AMF.UML.Input_Pins.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Input (Self.Element))); end Get_Input; ------------------------------ -- Get_Is_Locally_Reentrant -- ------------------------------ overriding function Get_Is_Locally_Reentrant (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return Boolean is begin return AMF.Internals.Tables.UML_Attributes.Internal_Get_Is_Locally_Reentrant (Self.Element); end Get_Is_Locally_Reentrant; ------------------------------ -- Set_Is_Locally_Reentrant -- ------------------------------ overriding procedure Set_Is_Locally_Reentrant (Self : not null access UML_Start_Classifier_Behavior_Action_Proxy; To : Boolean) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_Is_Locally_Reentrant (Self.Element, To); end Set_Is_Locally_Reentrant; ----------------------------- -- Get_Local_Postcondition -- ----------------------------- overriding function Get_Local_Postcondition (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Constraints.Collections.Set_Of_UML_Constraint is begin return AMF.UML.Constraints.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Local_Postcondition (Self.Element))); end Get_Local_Postcondition; ---------------------------- -- Get_Local_Precondition -- ---------------------------- overriding function Get_Local_Precondition (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Constraints.Collections.Set_Of_UML_Constraint is begin return AMF.UML.Constraints.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Local_Precondition (Self.Element))); end Get_Local_Precondition; ---------------- -- Get_Output -- ---------------- overriding function Get_Output (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Output_Pins.Collections.Ordered_Set_Of_UML_Output_Pin is begin return AMF.UML.Output_Pins.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Output (Self.Element))); end Get_Output; ----------------- -- Get_Handler -- ----------------- overriding function Get_Handler (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Exception_Handlers.Collections.Set_Of_UML_Exception_Handler is begin return AMF.UML.Exception_Handlers.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Handler (Self.Element))); end Get_Handler; ------------------ -- Get_Activity -- ------------------ overriding function Get_Activity (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Activities.UML_Activity_Access is begin return AMF.UML.Activities.UML_Activity_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Activity (Self.Element))); end Get_Activity; ------------------ -- Set_Activity -- ------------------ overriding procedure Set_Activity (Self : not null access UML_Start_Classifier_Behavior_Action_Proxy; To : AMF.UML.Activities.UML_Activity_Access) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_Activity (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Activity; ------------------ -- Get_In_Group -- ------------------ overriding function Get_In_Group (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Activity_Groups.Collections.Set_Of_UML_Activity_Group is begin return AMF.UML.Activity_Groups.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_In_Group (Self.Element))); end Get_In_Group; --------------------------------- -- Get_In_Interruptible_Region -- --------------------------------- overriding function Get_In_Interruptible_Region (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Interruptible_Activity_Regions.Collections.Set_Of_UML_Interruptible_Activity_Region is begin return AMF.UML.Interruptible_Activity_Regions.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_In_Interruptible_Region (Self.Element))); end Get_In_Interruptible_Region; ---------------------- -- Get_In_Partition -- ---------------------- overriding function Get_In_Partition (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Activity_Partitions.Collections.Set_Of_UML_Activity_Partition is begin return AMF.UML.Activity_Partitions.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_In_Partition (Self.Element))); end Get_In_Partition; ---------------------------- -- Get_In_Structured_Node -- ---------------------------- overriding function Get_In_Structured_Node (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Structured_Activity_Nodes.UML_Structured_Activity_Node_Access is begin return AMF.UML.Structured_Activity_Nodes.UML_Structured_Activity_Node_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_In_Structured_Node (Self.Element))); end Get_In_Structured_Node; ---------------------------- -- Set_In_Structured_Node -- ---------------------------- overriding procedure Set_In_Structured_Node (Self : not null access UML_Start_Classifier_Behavior_Action_Proxy; To : AMF.UML.Structured_Activity_Nodes.UML_Structured_Activity_Node_Access) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_In_Structured_Node (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_In_Structured_Node; ------------------ -- Get_Incoming -- ------------------ overriding function Get_Incoming (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Activity_Edges.Collections.Set_Of_UML_Activity_Edge is begin return AMF.UML.Activity_Edges.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Incoming (Self.Element))); end Get_Incoming; ------------------ -- Get_Outgoing -- ------------------ overriding function Get_Outgoing (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Activity_Edges.Collections.Set_Of_UML_Activity_Edge is begin return AMF.UML.Activity_Edges.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Outgoing (Self.Element))); end Get_Outgoing; ------------------------ -- Get_Redefined_Node -- ------------------------ overriding function Get_Redefined_Node (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Activity_Nodes.Collections.Set_Of_UML_Activity_Node is begin return AMF.UML.Activity_Nodes.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Redefined_Node (Self.Element))); end Get_Redefined_Node; ----------------- -- Get_Is_Leaf -- ----------------- overriding function Get_Is_Leaf (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return Boolean is begin return AMF.Internals.Tables.UML_Attributes.Internal_Get_Is_Leaf (Self.Element); end Get_Is_Leaf; ----------------- -- Set_Is_Leaf -- ----------------- overriding procedure Set_Is_Leaf (Self : not null access UML_Start_Classifier_Behavior_Action_Proxy; To : Boolean) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_Is_Leaf (Self.Element, To); end Set_Is_Leaf; --------------------------- -- Get_Redefined_Element -- --------------------------- overriding function Get_Redefined_Element (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Redefinable_Elements.Collections.Set_Of_UML_Redefinable_Element is begin return AMF.UML.Redefinable_Elements.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Redefined_Element (Self.Element))); end Get_Redefined_Element; ------------------------------ -- Get_Redefinition_Context -- ------------------------------ overriding function Get_Redefinition_Context (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Classifiers.Collections.Set_Of_UML_Classifier is begin return AMF.UML.Classifiers.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Redefinition_Context (Self.Element))); end Get_Redefinition_Context; --------------------------- -- Get_Client_Dependency -- --------------------------- overriding function Get_Client_Dependency (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Dependencies.Collections.Set_Of_UML_Dependency is begin return AMF.UML.Dependencies.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Client_Dependency (Self.Element))); end Get_Client_Dependency; ------------------------- -- Get_Name_Expression -- ------------------------- overriding function Get_Name_Expression (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.String_Expressions.UML_String_Expression_Access is begin return AMF.UML.String_Expressions.UML_String_Expression_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Name_Expression (Self.Element))); end Get_Name_Expression; ------------------------- -- Set_Name_Expression -- ------------------------- overriding procedure Set_Name_Expression (Self : not null access UML_Start_Classifier_Behavior_Action_Proxy; To : AMF.UML.String_Expressions.UML_String_Expression_Access) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_Name_Expression (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Name_Expression; ------------------- -- Get_Namespace -- ------------------- overriding function Get_Namespace (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Namespaces.UML_Namespace_Access is begin return AMF.UML.Namespaces.UML_Namespace_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Namespace (Self.Element))); end Get_Namespace; ------------------------ -- Get_Qualified_Name -- ------------------------ overriding function Get_Qualified_Name (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.Optional_String is begin declare use type Matreshka.Internals.Strings.Shared_String_Access; Aux : constant Matreshka.Internals.Strings.Shared_String_Access := AMF.Internals.Tables.UML_Attributes.Internal_Get_Qualified_Name (Self.Element); begin if Aux = null then return (Is_Empty => True); else return (False, League.Strings.Internals.Create (Aux)); end if; end; end Get_Qualified_Name; ------------- -- Context -- ------------- overriding function Context (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Classifiers.UML_Classifier_Access is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Context unimplemented"); raise Program_Error with "Unimplemented procedure UML_Start_Classifier_Behavior_Action_Proxy.Context"; return Context (Self); end Context; ------------------------ -- Is_Consistent_With -- ------------------------ overriding function Is_Consistent_With (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy; Redefinee : AMF.UML.Redefinable_Elements.UML_Redefinable_Element_Access) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Is_Consistent_With unimplemented"); raise Program_Error with "Unimplemented procedure UML_Start_Classifier_Behavior_Action_Proxy.Is_Consistent_With"; return Is_Consistent_With (Self, Redefinee); end Is_Consistent_With; ----------------------------------- -- Is_Redefinition_Context_Valid -- ----------------------------------- overriding function Is_Redefinition_Context_Valid (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy; Redefined : AMF.UML.Redefinable_Elements.UML_Redefinable_Element_Access) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Is_Redefinition_Context_Valid unimplemented"); raise Program_Error with "Unimplemented procedure UML_Start_Classifier_Behavior_Action_Proxy.Is_Redefinition_Context_Valid"; return Is_Redefinition_Context_Valid (Self, Redefined); end Is_Redefinition_Context_Valid; ------------------------- -- All_Owning_Packages -- ------------------------- overriding function All_Owning_Packages (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Packages.Collections.Set_Of_UML_Package is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "All_Owning_Packages unimplemented"); raise Program_Error with "Unimplemented procedure UML_Start_Classifier_Behavior_Action_Proxy.All_Owning_Packages"; return All_Owning_Packages (Self); end All_Owning_Packages; ----------------------------- -- Is_Distinguishable_From -- ----------------------------- overriding function Is_Distinguishable_From (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy; N : AMF.UML.Named_Elements.UML_Named_Element_Access; Ns : AMF.UML.Namespaces.UML_Namespace_Access) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Is_Distinguishable_From unimplemented"); raise Program_Error with "Unimplemented procedure UML_Start_Classifier_Behavior_Action_Proxy.Is_Distinguishable_From"; return Is_Distinguishable_From (Self, N, Ns); end Is_Distinguishable_From; --------------- -- Namespace -- --------------- overriding function Namespace (Self : not null access constant UML_Start_Classifier_Behavior_Action_Proxy) return AMF.UML.Namespaces.UML_Namespace_Access is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Namespace unimplemented"); raise Program_Error with "Unimplemented procedure UML_Start_Classifier_Behavior_Action_Proxy.Namespace"; return Namespace (Self); end Namespace; end AMF.Internals.UML_Start_Classifier_Behavior_Actions;
zhmu/ananas
Ada
2,696
adb
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- A D A . T E X T _ I O . T E X T _ S T R E A M S -- -- -- -- 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.File_IO; package body Ada.Text_IO.Text_Streams is ------------ -- Stream -- ------------ function Stream (File : File_Type) return Stream_Access is begin System.File_IO.Check_File_Open (FCB.AFCB_Ptr (File)); return Stream_Access (File); end Stream; end Ada.Text_IO.Text_Streams;
AdaCore/gpr
Ada
3,760
adb
-- -- Copyright (C) 2014-2022, AdaCore -- SPDX-License-Identifier: Apache-2.0 -- with Ada.Strings.Wide_Wide_Fixed; use Ada.Strings.Wide_Wide_Fixed; package body Gpr_Parser_Support.Slocs is ------------- -- Compare -- ------------- function Compare (Reference, Compared : Source_Location) return Relative_Position is begin -- First compare line numbers... if Compared.Line < Reference.Line then return Before; elsif Reference.Line < Compared.Line then return After; -- Past this point, we know that both are on the same line, so now -- compare column numbers. elsif Compared.Column < Reference.Column then return Before; elsif Reference.Column < Compared.Column then return After; else return Inside; end if; end Compare; ------------- -- Compare -- ------------- function Compare (Sloc_Range : Source_Location_Range; Sloc : Source_Location) return Relative_Position is Inclusive_End_Sloc : Source_Location := End_Sloc (Sloc_Range); begin -- End_Sloc returns an exclusive end sloc. Switch to an inclusive -- representation for computation. Inclusive_End_Sloc.Column := Inclusive_End_Sloc.Column - 1; return (case Compare (Start_Sloc (Sloc_Range), Sloc) is when Before => Before, when Inside | After => (if Compare (Inclusive_End_Sloc, Sloc) = After then After else Inside)); end Compare; ----------- -- Value -- ----------- function Value (T : Text_Type) return Source_Location is Colon_Index : constant Natural := Index (T, ":"); Line_Slice : Text_Type renames T (T'First .. Colon_Index - 1); Column_Slice : Text_Type renames T (Colon_Index + 1 .. T'Last); Line : Line_Number; Column : Column_Number; begin if Colon_Index = 0 then raise Constraint_Error with "invalid source location"; end if; begin Line := Line_Number'Wide_Wide_Value (Line_Slice); exception when Constraint_Error => raise Constraint_Error with "invalid line number: " & Image (Line_Slice, With_Quotes => True); end; begin Column := Column_Number'Wide_Wide_Value (Column_Slice); exception when Constraint_Error => raise Constraint_Error with "invalid column number: " & Image (Column_Slice, With_Quotes => True); end; return (Line, Column); end Value; ----------- -- Value -- ----------- function Value (T : Text_Type) return Source_Location_Range is Dash_Index : constant Natural := Index (T, "-"); Start_Slice : Text_Type renames T (T'First .. Dash_Index - 1); End_Slice : Text_Type renames T (Dash_Index + 1 .. T'Last); begin return Make_Range (Value (Start_Slice), Value (End_Slice)); end Value; ------------------ -- Column_Count -- ------------------ function Column_Count (Line : Text_Type; Tab_Stop : Positive := Default_Tab_Stop) return Column_Number is TS : constant Column_Number := Column_Number (Tab_Stop); Result : Column_Number := 0; begin -- Make horizontal tabulations move by stride of Tab_Stop columns, as -- usually implemented in code editors. for C of Line loop if C = Chars.HT then Result := (Result + TS) / TS * TS; else Result := Result + 1; end if; end loop; return Result; end Column_Count; end Gpr_Parser_Support.Slocs;
emacsmirror/ada-mode
Ada
1,424
ads
-- Abstract : -- -- Run the Ada parser standalone. Useful for debugging grammar issues. -- -- Copyright (C) 2017 - 2020, 2022 Free Software Foundation, Inc. -- -- This program 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 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 -- distributed with this program; see file COPYING. If not, write to -- the Free Software Foundation, 51 Franklin Street, Suite 500, Boston, -- MA 02110-1335, USA. pragma License (GPL); with Ada_Annex_P_Process_LR1_Main; with Gen_Run_Wisi_LR_Text_Rep_Parse; with WisiToken.Parse.LR.McKenzie_Recover.Ada; with Wisi.Ada; procedure Run_Ada_LR1_Parse is new Gen_Run_Wisi_LR_Text_Rep_Parse (Wisi.Ada.Parse_Data_Type, WisiToken.Parse.LR.McKenzie_Recover.Ada.Language_Fixes'Access, WisiToken.Parse.LR.McKenzie_Recover.Ada.Matching_Begin_Tokens'Access, WisiToken.Parse.LR.McKenzie_Recover.Ada.String_ID_Set'Access, "ada_annex_p_lr1_parse_table.txt", Ada_Annex_P_Process_LR1_Main.Create_Parser);
reznikmm/matreshka
Ada
3,777
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2013, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ package Matreshka.ODF_Attributes.Text.Number_Lines is type Text_Number_Lines_Node is new Matreshka.ODF_Attributes.Text.Text_Node_Base with null record; type Text_Number_Lines_Access is access all Text_Number_Lines_Node'Class; overriding function Get_Local_Name (Self : not null access constant Text_Number_Lines_Node) return League.Strings.Universal_String; end Matreshka.ODF_Attributes.Text.Number_Lines;
AaronC98/PlaneSystem
Ada
2,644
ads
------------------------------------------------------------------------------ -- Ada Web Server -- -- -- -- Copyright (C) 2007-2012, AdaCore -- -- -- -- This library is free software; you can redistribute it and/or modify -- -- it under terms of the GNU General Public License as published by the -- -- Free Software Foundation; either version 3, or (at your option) any -- -- later version. This library is distributed in the hope that it will be -- -- useful, but WITHOUT ANY WARRANTY; without even the implied warranty of -- -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- -- -- -- -- -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- -- -- -- -- -- -- -- -- -- -- -- ------------------------------------------------------------------------------ with Ada.Streams; use Ada.Streams; with AWS.Utils; with Memory_Streams; package AWS.Containers.Memory_Streams is new Standard.Memory_Streams (Element => Stream_Element, Element_Index => Stream_Element_Offset, Element_Array => Stream_Element_Array, Element_Access => Utils.Stream_Element_Array_Access, Constant_Access => Utils.Stream_Element_Array_Constant_Access);
reznikmm/matreshka
Ada
4,640
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_Chart.Display_Label_Attributes is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Chart_Display_Label_Attribute_Node is begin return Self : Chart_Display_Label_Attribute_Node do Matreshka.ODF_Chart.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Chart_Prefix); end return; end Create; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Chart_Display_Label_Attribute_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Display_Label_Attribute; end Get_Local_Name; begin Matreshka.DOM_Documents.Register_Attribute (Matreshka.ODF_String_Constants.Chart_URI, Matreshka.ODF_String_Constants.Display_Label_Attribute, Chart_Display_Label_Attribute_Node'Tag); end Matreshka.ODF_Chart.Display_Label_Attributes;
fnarenji/BezierToSTL
Ada
5,939
adb
with Ada.Text_IO; use Ada.Text_IO; with Ada.Characters.Latin_1; use Ada.Characters.Latin_1; with Ada.Directories; with Helper; use Helper; with Courbes; use Courbes; with Courbes.Droites; use Courbes.Droites; with Courbes.Singletons; use Courbes.Singletons; with Courbes.Bezier_Cubiques; use Courbes.Bezier_Cubiques; with Courbes.Bezier_Quadratiques; use Courbes.Bezier_Quadratiques; with Interpolations_Lineaires; use Interpolations_Lineaires; with Vecteurs; use Vecteurs; -- Certains bonnes pratiques ont été sacrifiées -- pour rendre les TU plus courts/simples procedure test_unitaires is -- Activation des assert pragma Assertion_Policy(Check); LF : constant Character := Ada.Characters.Latin_1.LF; procedure Fichier_Ecrire_Chaine(F : String; S : String) is Handle : File_Type; begin begin Open(File => Handle, Mode => Out_File, Name => F); exception when Name_Error => Create(File => Handle, Mode => Out_File, Name => F); end; Put_Line(Handle, S); Close(Handle); end; procedure Test_Trouver_Ligne_Fichier is begin Fichier_Ecrire_Chaine("tu.tmp", "aze" & LF & "rty" & LF & "salut" & LF & "ca va""" & LF & "coucou"); declare Str : constant String := Fichier_Ligne_Commence_Par("tu.tmp", "ca"); begin pragma Assert (Str = " va"); end; Ada.Directories.Delete_File ("tu.tmp"); Debug("OK recherche ligne fichier"); end; procedure Test_Singleton is P : constant Point2D := (1 => 1.0, 2 => 2.0); S : Courbe_Ptr := new Singleton'(Ctor_Singleton(P)); begin pragma Assert (S.Obtenir_Debut = P, "S mauvais debut"); pragma Assert (S.Obtenir_Fin = P, "S mauvais fin"); pragma Assert (S.Obtenir_Point(0.0) = P, "S point 0.0 /= P"); pragma Assert (S.Obtenir_Point(1.0) = P, "S point 1.0 /= P"); pragma Assert (S.Obtenir_Point(0.5) = P, "S point 0.5 /= P"); Liberer_Courbe(S); pragma Assert (S = null, "S deallocated ptr /= null"); Debug("OK singleton"); end; procedure Test_Droite is Deb : constant Point2D := (1 => 1.0, 2 => 2.0); Fin : constant Point2D := (1 => 3.0, 2 => 4.0); Mid : constant Point2D := (Deb + Fin) / 2.0; D : Courbe_Ptr := new Droite'(Ctor_Droite(Deb, Fin)); begin pragma Assert (D.Obtenir_Debut = Deb, "BC mauvais debut"); pragma Assert (D.Obtenir_Fin = Fin, "BC mauvais fin"); pragma Assert (D.Obtenir_Point(0.0) = Deb, "BC point 0.0 /= debut"); pragma Assert (D.Obtenir_Point(1.0) = Fin, "BC point 1.0 /= fin"); pragma Assert (D.Obtenir_Point(0.5) = Mid, "BC point 0.5 /= mid"); Liberer_Courbe(D); pragma Assert (D = null, "D deallocated ptr /= null"); Debug("OK droite"); end; procedure Test_Cubique is Deb : constant Point2D := (1 => 0.0, 2 => 0.0); Fin : constant Point2D := (1 => 2.0, 2 => 2.0); C1 : constant Point2D := (1 => 1.5, 2 => 0.5); C2 : constant Point2D := (1 => 0.5, 2 => 1.5); Mid : constant Point2D := (others => 1.0); BC : Courbe_Ptr := new Bezier_Cubique'(Ctor_Bezier_Cubique(Deb, Fin, C1, C2)); begin pragma Assert (BC.Obtenir_Debut = Deb, "BC mauvais debut"); pragma Assert (BC.Obtenir_Fin = Fin, "BC fin"); pragma Assert (BC.Obtenir_Point(0.0) = Deb, "BC point 0.0 /= debut"); pragma Assert (BC.Obtenir_Point(1.0) = Fin, "BC point 1.0 /= fin"); pragma Assert (BC.Obtenir_Point(0.5) = Mid, "BC point 0.5 /= mid"); Liberer_Courbe(BC); pragma Assert (BC = null, "BC deallocated ptr /= null"); Debug("OK Bezier Cubique"); end; procedure Test_Quadratique is Deb : constant Point2D := (1 => 0.0, 2 => 0.0); Fin : constant Point2D := (1 => 10.0, 2 => 0.0); C : constant Point2D := (1 => 5.0, 2 => 10.0); Mid : constant Point2D := (others => 5.0); BQ : Courbe_Ptr := new Bezier_Quadratique'(Ctor_Bezier_Quadratique(Deb, Fin, C)); begin pragma Assert (BQ.Obtenir_Debut = Deb, "BQ mauvais debut"); pragma Assert (BQ.Obtenir_Fin = Fin, "BQ fin"); pragma Assert (BQ.Obtenir_Point(0.0) = Deb, "BQ point 0.0 /= debut"); pragma Assert (BQ.Obtenir_Point(1.0) = Fin, "BQ point 1.0 /= fin"); pragma Assert (BQ.Obtenir_Point(0.5) = Mid, "BQ point 0.5 /= mid"); Liberer_Courbe(BQ); pragma Assert (BQ = null, "BQ deallocated ptr /= null"); Debug("OK Bezier Quadratique"); end; procedure Test_Interpolation_Lineaire is L : Liste_Courbes.Liste; S : Liste_Points.Liste; Deb : constant Point2D := (1 => 0.0, 2 => 0.0); Fin : constant Point2D := (1 => 2.0, 2 => 2.0); D : Courbe_Ptr := new Droite'(Ctor_Droite(Deb, Fin)); I : Integer := 0; procedure Verif_Helper (P : in out Point2D) is Diff : constant Point2D := P - float(I) / 10.0 * Fin; begin pragma Assert(Diff(1) < 0.001, "Point invalide"); pragma Assert(Diff(2) < 0.001, "Point invalide"); I := I + 1; end; procedure Verif is new Liste_Points.Parcourir(Verif_Helper); begin Liste_Courbes.Insertion_Queue(L, D); Interpolation_Lineaire(L, S, 10, True); pragma Assert (Liste_Points.Taille(S) = 10, "Nb segments invalide"); Verif(S); Liberer_Courbe(D); Liste_Courbes.Vider(L); Liste_Points.Vider(S); Debug("OK Interpolation"); end; begin Afficher_Debug(True); Test_Trouver_Ligne_Fichier; Test_Singleton; Test_Droite; Test_Cubique; Test_Quadratique; Test_Interpolation_Lineaire; end;
zhmu/ananas
Ada
123
adb
package body Renaming8_Pkg3 is function Last_Index return Integer is begin return 16; end; end Renaming8_Pkg3;
melwyncarlo/ProjectEuler
Ada
303
adb
with Ada.Text_IO; with Ada.Integer_Text_IO; -- Copyright 2021 Melwyn Francis Carlo procedure A092 is use Ada.Text_IO; use Ada.Integer_Text_IO; Str : constant String (1 .. 12) := "Hello World "; Num : constant Integer := 2021; begin Put (Str); Put (Num, Width => 0); end A092;
reznikmm/matreshka
Ada
260,103
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2010-2017, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with Matreshka.Internals.Strings; package AMF.Internals.Tables.CMOF_String_Data_00 is -- "qualifiedName" MS_0000 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, others => 16#0000#), others => <>); -- "directedRelationship" MS_0001 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 20, Length => 20, Value => (16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0065#, 16#0064#, 16#0052#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, others => 16#0000#), others => <>); -- "includesMultiplicity" MS_0002 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 20, Length => 20, Value => (16#0069#, 16#006E#, 16#0063#, 16#006C#, 16#0075#, 16#0064#, 16#0065#, 16#0073#, 16#004D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "A_operand_expression" MS_0003 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 20, Length => 20, Value => (16#0041#, 16#005F#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#006E#, 16#0064#, 16#005F#, 16#0065#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "association_ends" MS_0004 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0065#, 16#006E#, 16#0064#, 16#0073#, others => 16#0000#), others => <>); -- "The general classifiers are the classifiers referenced by the generalization relationships." MS_0005 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 91, Length => 91, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "A_ownedEnd_owningAssociation" MS_0006 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 28, Length => 28, Value => (16#0041#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0045#, 16#006E#, 16#0064#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0041#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "Specifies the PackageableElement whose name is to be added to a Namespace." MS_0007 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 74, Length => 74, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0077#, 16#0068#, 16#006F#, 16#0073#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0061#, 16#0064#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "A_precondition_preContext" MS_0008 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 25, Length => 25, Value => (16#0041#, 16#005F#, 16#0070#, 16#0072#, 16#0065#, 16#0063#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0070#, 16#0072#, 16#0065#, 16#0043#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, others => 16#0000#), others => <>); -- "owningConstraint" MS_0009 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0043#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "uri" MS_000A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 3, Length => 3, Value => (16#0075#, 16#0072#, 16#0069#, others => 16#0000#), others => <>); -- "in" MS_000B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 2, Length => 2, Value => (16#0069#, 16#006E#, others => 16#0000#), others => <>); -- "Specifies a String that represents a value to be used when no argument is supplied for the Property." MS_000C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 100, Length => 100, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0053#, 16#0074#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#0061#, 16#0072#, 16#0067#, 16#0075#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0073#, 16#0075#, 16#0070#, 16#0070#, 16#006C#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0050#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "A_nestedPackage_nestingPackage" MS_000D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 30, Length => 30, Value => (16#0041#, 16#005F#, 16#006E#, 16#0065#, 16#0073#, 16#0074#, 16#0065#, 16#0064#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#005F#, 16#006E#, 16#0065#, 16#0073#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, others => 16#0000#), others => <>); -- "redefinee" MS_000E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0065#, others => 16#0000#), others => <>); -- "lower" MS_000F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "org.omg.xmi.nsURI" MS_0010 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#006F#, 16#0072#, 16#0067#, 16#002E#, 16#006F#, 16#006D#, 16#0067#, 16#002E#, 16#0078#, 16#006D#, 16#0069#, 16#002E#, 16#006E#, 16#0073#, 16#0055#, 16#0052#, 16#0049#, others => 16#0000#), others => <>); -- "The query isMultivalued() checks whether this multiplicity has an upper bound greater than one." MS_0011 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 95, Length => 95, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#004D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0064#, 16#0028#, 16#0029#, 16#0020#, 16#0063#, 16#0068#, 16#0065#, 16#0063#, 16#006B#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0075#, 16#0070#, 16#0070#, 16#0065#, 16#0072#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0020#, 16#0067#, 16#0072#, 16#0065#, 16#0061#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "If this operation has a return parameter, isOrdered equals the value of isOrdered for that parameter. Otherwise isOrdered is false." MS_0012 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 131, Length => 131, Value => (16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002C#, 16#0020#, 16#0069#, 16#0073#, 16#004F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0065#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#0073#, 16#004F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002E#, 16#0020#, 16#004F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0077#, 16#0069#, 16#0073#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#004F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "The query mustBeOwned() indicates whether elements of this type must have an owner. Subclasses of Element that do not require an owner must override this operation." MS_0013 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 175, Unused => 164, Length => 164, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0042#, 16#0065#, 16#004F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0028#, 16#0029#, 16#0020#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0072#, 16#002E#, 16#0020#, 16#0053#, 16#0075#, 16#0062#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0064#, 16#006F#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0072#, 16#0065#, 16#0071#, 16#0075#, 16#0069#, 16#0072#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0072#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0076#, 16#0065#, 16#0072#, 16#0072#, 16#0069#, 16#0064#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "If this property is owned by a class, associated with a binary association, and the other end of the association is also owned by a class, then opposite gives the other end." MS_0014 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 183, Unused => 173, Length => 173, Value => (16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#002C#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#0069#, 16#006E#, 16#0061#, 16#0072#, 16#0079#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006C#, 16#0073#, 16#006F#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#006F#, 16#0070#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0065#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "ParameterDirectionKind" MS_0015 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 22, Length => 22, Value => (16#0050#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0044#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#004B#, 16#0069#, 16#006E#, 16#0064#, others => 16#0000#), others => <>); -- "The Attributes owned by the DataType." MS_0016 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 37, Length => 37, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0041#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0044#, 16#0061#, 16#0074#, 16#0061#, 16#0054#, 16#0079#, 16#0070#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "specialized_end_number" MS_0017 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 22, Length => 22, Value => (16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0065#, 16#0064#, 16#005F#, 16#0065#, 16#006E#, 16#0064#, 16#005F#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "References the general classifier in the Generalization relationship." MS_0018 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 69, Length => 69, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0047#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, 16#002E#, others => 16#0000#), others => <>); -- "Indicates that parameter values are passed into the behavioral element by the caller." MS_0019 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 85, Length => 85, Value => (16#0049#, 16#006E#, 16#0064#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "isConsistentWith" MS_001A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, 16#0057#, 16#0069#, 16#0074#, 16#0068#, others => 16#0000#), others => <>); -- "value_specification_boolean" MS_001B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 27, Length => 27, Value => (16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#005F#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0062#, 16#006F#, 16#006F#, 16#006C#, 16#0065#, 16#0061#, 16#006E#, others => 16#0000#), others => <>); -- "The upper bound must be greater than or equal to the lower bound." MS_001C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 65, Length => 65, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0075#, 16#0070#, 16#0070#, 16#0065#, 16#0072#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0065#, 16#0061#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0065#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "Specifies whether the association is derived from other model elements such as other associations or constraints." MS_001D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 113, Length => 113, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0073#, 16#0075#, 16#0063#, 16#0068#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "n" MS_001E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 1, Length => 1, Value => (16#006E#, others => 16#0000#), others => <>); -- "The DataType that owns this Operation." MS_001F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 38, Length => 38, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0044#, 16#0061#, 16#0074#, 16#0061#, 16#0054#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "Enumeration" MS_0020 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#0045#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "isQuery" MS_0021 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0069#, 16#0073#, 16#0051#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, others => 16#0000#), others => <>); -- "BehavioralFeature" MS_0022 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#0042#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, others => 16#0000#), others => <>); -- "A subsetting property may strengthen the type of the subsetted property, and its upper bound may be less." MS_0023 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 105, Length => 105, Value => (16#0041#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0065#, 16#0074#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0065#, 16#006E#, 16#0067#, 16#0074#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0065#, 16#0074#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0075#, 16#0070#, 16#0070#, 16#0065#, 16#0072#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#006C#, 16#0065#, 16#0073#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "The query isDistinguishableFrom() determines whether two BehavioralFeatures may coexist in the same Namespace. It specifies that they have to have different signatures." MS_0024 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 175, Unused => 168, Length => 168, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0044#, 16#0069#, 16#0073#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0075#, 16#0069#, 16#0073#, 16#0068#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0046#, 16#0072#, 16#006F#, 16#006D#, 16#0028#, 16#0029#, 16#0020#, 16#0064#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#006D#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0077#, 16#006F#, 16#0020#, 16#0042#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#0065#, 16#0078#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#002E#, 16#0020#, 16#0049#, 16#0074#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0079#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0064#, 16#0069#, 16#0066#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0073#, 16#0069#, 16#0067#, 16#006E#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "Subsetting may only occur when the context of the subsetting property conforms to the context of the subsetted property." MS_0025 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 120, Length => 120, Value => (16#0053#, 16#0075#, 16#0062#, 16#0073#, 16#0065#, 16#0074#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#006F#, 16#006E#, 16#006C#, 16#0079#, 16#0020#, 16#006F#, 16#0063#, 16#0063#, 16#0075#, 16#0072#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0065#, 16#0074#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0065#, 16#0074#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "Indicates whether a parameter is being sent into or out of a behavioral element." MS_0026 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 80, Length => 80, Value => (16#0049#, 16#006E#, 16#0064#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0062#, 16#0065#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#006F#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "A comment is a textual annotation that can be attached to a set of elements." MS_0027 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 76, Length => 76, Value => (16#0041#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0075#, 16#0061#, 16#006C#, 16#0020#, 16#0061#, 16#006E#, 16#006E#, 16#006F#, 16#0074#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0061#, 16#0074#, 16#0074#, 16#0061#, 16#0063#, 16#0068#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "A public element is visible to all elements that can access the contents of the namespace that owns it." MS_0028 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 103, Length => 103, Value => (16#0041#, 16#0020#, 16#0070#, 16#0075#, 16#0062#, 16#006C#, 16#0069#, 16#0063#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0076#, 16#0069#, 16#0073#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0063#, 16#0063#, 16#0065#, 16#0073#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0069#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "class" MS_0029 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, others => 16#0000#), others => <>); -- "isDistinguishableFrom" MS_002A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 21, Length => 21, Value => (16#0069#, 16#0073#, 16#0044#, 16#0069#, 16#0073#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0075#, 16#0069#, 16#0073#, 16#0068#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0046#, 16#0072#, 16#006F#, 16#006D#, others => 16#0000#), others => <>); -- "Relationship" MS_002B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0052#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, others => 16#0000#), others => <>); -- "A_general_classifier" MS_002C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 20, Length => 20, Value => (16#0041#, 16#005F#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#005F#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "The query bestVisibility() examines a set of VisibilityKinds, and returns public as the preferred visibility." MS_002D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 109, Length => 109, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0073#, 16#0074#, 16#0056#, 16#0069#, 16#0073#, 16#0069#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#0028#, 16#0029#, 16#0020#, 16#0065#, 16#0078#, 16#0061#, 16#006D#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0056#, 16#0069#, 16#0073#, 16#0069#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#004B#, 16#0069#, 16#006E#, 16#0064#, 16#0073#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0073#, 16#0020#, 16#0070#, 16#0075#, 16#0062#, 16#006C#, 16#0069#, 16#0063#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0076#, 16#0069#, 16#0073#, 16#0069#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "binary_associations" MS_002E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 19, Length => 19, Value => (16#0062#, 16#0069#, 16#006E#, 16#0061#, 16#0072#, 16#0079#, 16#005F#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, others => 16#0000#), others => <>); -- "A_navigableOwnedEnd_association" MS_002F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 31, Length => 31, Value => (16#0041#, 16#005F#, 16#006E#, 16#0061#, 16#0076#, 16#0069#, 16#0067#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#004F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0045#, 16#006E#, 16#0064#, 16#005F#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "unlimitedValue" MS_0030 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#0075#, 16#006E#, 16#006C#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, others => 16#0000#), others => <>); -- "An operation can have at most one return parameter; i.e., an owned parameter with the direction set to 'return'" MS_0031 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 111, Length => 111, Value => (16#0041#, 16#006E#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#006D#, 16#006F#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#003B#, 16#0020#, 16#0069#, 16#002E#, 16#0065#, 16#002E#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0027#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0027#, others => 16#0000#), others => <>); -- "tag" MS_0032 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 3, Length => 3, Value => (16#0074#, 16#0061#, 16#0067#, others => 16#0000#), others => <>); -- "A_member_namespace" MS_0033 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0041#, 16#005F#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#005F#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, others => 16#0000#), others => <>); -- "A_inheritedMember_classifier" MS_0034 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 28, Length => 28, Value => (16#0041#, 16#005F#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#004D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#005F#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "A_importedPackage_packageImport" MS_0035 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 31, Length => 31, Value => (16#0041#, 16#005F#, 16#0069#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0065#, 16#0064#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#005F#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0049#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, others => 16#0000#), others => <>); -- "Specifies whether an execution of the BehavioralFeature leaves the state of the system unchanged (isQuery=true) or whether side effects may occur (isQuery=false)." MS_0036 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 167, Unused => 162, Length => 162, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0042#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#006C#, 16#0065#, 16#0061#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#0020#, 16#0075#, 16#006E#, 16#0063#, 16#0068#, 16#0061#, 16#006E#, 16#0067#, 16#0065#, 16#0064#, 16#0020#, 16#0028#, 16#0069#, 16#0073#, 16#0051#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#003D#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#0029#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0073#, 16#0069#, 16#0064#, 16#0065#, 16#0020#, 16#0065#, 16#0066#, 16#0066#, 16#0065#, 16#0063#, 16#0074#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#006F#, 16#0063#, 16#0063#, 16#0075#, 16#0072#, 16#0020#, 16#0028#, 16#0069#, 16#0073#, 16#0051#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#003D#, 16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, 16#0029#, 16#002E#, others => 16#0000#), others => <>); -- "The class that owns the operation." MS_0037 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 34, Length => 34, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "The Element that owns this element." MS_0038 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 35, Length => 35, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "The Operations owned by the DataType." MS_0039 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 37, Length => 37, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0044#, 16#0061#, 16#0074#, 16#0061#, 16#0054#, 16#0079#, 16#0070#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "Specifies all elements inherited by this classifier from the general classifiers." MS_003A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 81, Length => 81, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "public" MS_003B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0070#, 16#0075#, 16#0062#, 16#006C#, 16#0069#, 16#0063#, others => 16#0000#), others => <>); -- "mustBeOwned" MS_003C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0042#, 16#0065#, 16#004F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, others => 16#0000#), others => <>); -- "A data type is a type whose instances are identified only by their value. A data type may contain attributes to support the modeling of structured data types." MS_003D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 167, Unused => 158, Length => 158, Value => (16#0041#, 16#0020#, 16#0064#, 16#0061#, 16#0074#, 16#0061#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#006F#, 16#0073#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0069#, 16#0064#, 16#0065#, 16#006E#, 16#0074#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#006F#, 16#006E#, 16#006C#, 16#0079#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0069#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0064#, 16#0061#, 16#0074#, 16#0061#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0073#, 16#0075#, 16#0070#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0064#, 16#0061#, 16#0074#, 16#0061#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "Specifies the lower bound of the multiplicity interval." MS_003E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 55, Length => 55, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0076#, 16#0061#, 16#006C#, 16#002E#, others => 16#0000#), others => <>); -- "If the language attribute is not empty, then the size of the body and language arrays must be the same." MS_003F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 103, Length => 103, Value => (16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0061#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0065#, 16#006D#, 16#0070#, 16#0074#, 16#0079#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0069#, 16#007A#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#006F#, 16#0064#, 16#0079#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0061#, 16#0072#, 16#0072#, 16#0061#, 16#0079#, 16#0073#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "String" MS_0040 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0053#, 16#0074#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, others => 16#0000#), others => <>); -- "ownedType" MS_0041 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0054#, 16#0079#, 16#0070#, 16#0065#, others => 16#0000#), others => <>); -- "lower_ge_0" MS_0042 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, 16#005F#, 16#0067#, 16#0065#, 16#005F#, 16#0030#, others => 16#0000#), others => <>); -- "The query unlimitedValue() gives a single UnlimitedNatural value when one can be computed." MS_0043 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 90, Length => 90, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0075#, 16#006E#, 16#006C#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0069#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0055#, 16#006E#, 16#006C#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#004E#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0075#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "True when a class is abstract." MS_0044 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 30, Length => 30, Value => (16#0054#, 16#0072#, 16#0075#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0062#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "visibility_public_or_private" MS_0045 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 28, Length => 28, Value => (16#0076#, 16#0069#, 16#0073#, 16#0069#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#005F#, 16#0070#, 16#0075#, 16#0062#, 16#006C#, 16#0069#, 16#0063#, 16#005F#, 16#006F#, 16#0072#, 16#005F#, 16#0070#, 16#0072#, 16#0069#, 16#0076#, 16#0061#, 16#0074#, 16#0065#, others => 16#0000#), others => <>); -- "An association describes a set of tuples whose values refer to typed instances. An instance of an association is called a link.A link is a tuple with one value for each end of the association, where each value is an instance of the type of the end." MS_0046 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 255, Unused => 248, Length => 248, Value => (16#0041#, 16#006E#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0063#, 16#0072#, 16#0069#, 16#0062#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0075#, 16#0070#, 16#006C#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#006F#, 16#0073#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#002E#, 16#0020#, 16#0041#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#006B#, 16#002E#, 16#0041#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#006B#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0075#, 16#0070#, 16#006C#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0065#, 16#0061#, 16#0063#, 16#0068#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002C#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0072#, 16#0065#, 16#0020#, 16#0065#, 16#0061#, 16#0063#, 16#0068#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "The query mustBeOwned() indicates whether elements of this type must have an owner." MS_0047 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 83, Length => 83, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0042#, 16#0065#, 16#004F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0028#, 16#0029#, 16#0020#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "relatedElement" MS_0048 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "importedPackage" MS_0049 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 15, Length => 15, Value => (16#0069#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0065#, 16#0064#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, others => 16#0000#), others => <>); -- "The query allNamespaces() gives the sequence of namespaces in which the NamedElement is nested, working outwards." MS_004A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 113, Length => 113, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0073#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#0071#, 16#0075#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006E#, 16#0065#, 16#0073#, 16#0074#, 16#0065#, 16#0064#, 16#002C#, 16#0020#, 16#0077#, 16#006F#, 16#0072#, 16#006B#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0077#, 16#0061#, 16#0072#, 16#0064#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "Type" MS_004B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0054#, 16#0079#, 16#0070#, 16#0065#, others => 16#0000#), others => <>); -- "p" MS_004C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 1, Length => 1, Value => (16#0070#, others => 16#0000#), others => <>); -- "ns" MS_004D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 2, Length => 2, Value => (16#006E#, 16#0073#, others => 16#0000#), others => <>); -- "The query isNavigable() indicates whether it is possible to navigate across the property." MS_004E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 89, Length => 89, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#004E#, 16#0061#, 16#0076#, 16#0069#, 16#0067#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0028#, 16#0029#, 16#0020#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0070#, 16#006F#, 16#0073#, 16#0073#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#006E#, 16#0061#, 16#0076#, 16#0069#, 16#0067#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0061#, 16#0063#, 16#0072#, 16#006F#, 16#0073#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "A primitive type defines a predefined data type, without any relevant substructure (i.e., it has no parts in the context of UML). A primitive datatype may have an algebra and operations defined outside of UML, for example, mathematically." MS_004F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 247, Unused => 238, Length => 238, Value => (16#0041#, 16#0020#, 16#0070#, 16#0072#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0064#, 16#0061#, 16#0074#, 16#0061#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#002C#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#006F#, 16#0075#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0079#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0065#, 16#0076#, 16#0061#, 16#006E#, 16#0074#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#0028#, 16#0069#, 16#002E#, 16#0065#, 16#002E#, 16#002C#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0055#, 16#004D#, 16#004C#, 16#0029#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0070#, 16#0072#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0064#, 16#0061#, 16#0074#, 16#0061#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#006C#, 16#0067#, 16#0065#, 16#0062#, 16#0072#, 16#0061#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0073#, 16#0069#, 16#0064#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0055#, 16#004D#, 16#004C#, 16#002C#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0065#, 16#0078#, 16#0061#, 16#006D#, 16#0070#, 16#006C#, 16#0065#, 16#002C#, 16#0020#, 16#006D#, 16#0061#, 16#0074#, 16#0068#, 16#0065#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "tagOwner" MS_0050 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0074#, 16#0061#, 16#0067#, 16#004F#, 16#0077#, 16#006E#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "PackageImport" MS_0051 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0049#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, others => 16#0000#), others => <>); -- "ownedAttribute" MS_0052 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0041#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, others => 16#0000#), others => <>); -- "References the Operations that are redefined by this Operation." MS_0053 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 63, Length => 63, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "operation" MS_0054 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "A_ownedMember_namespace" MS_0055 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 23, Length => 23, Value => (16#0041#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#004D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#005F#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, others => 16#0000#), others => <>); -- "navigableOwnedEnd" MS_0056 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#006E#, 16#0061#, 16#0076#, 16#0069#, 16#0067#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#004F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0045#, 16#006E#, 16#0064#, others => 16#0000#), others => <>); -- "A packageable element indicates a named element that may be owned directly by a package." MS_0057 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 88, Length => 88, Value => (16#0041#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0064#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#006C#, 16#0079#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "allOwnedElements" MS_0058 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0061#, 16#006C#, 16#006C#, 16#004F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, others => 16#0000#), others => <>); -- "A_ownedTag_tagOwner" MS_0059 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 19, Length => 19, Value => (16#0041#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0054#, 16#0061#, 16#0067#, 16#005F#, 16#0074#, 16#0061#, 16#0067#, 16#004F#, 16#0077#, 16#006E#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "References the contexts that this element may be redefined from." MS_005A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 64, Length => 64, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "redefinition_context_valid" MS_005B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 26, Length => 26, Value => (16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#005F#, 16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, others => 16#0000#), others => <>); -- "Specifies whether the property is derived as the union of all of the properties that are constrained to subset it." MS_005C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 114, Length => 114, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0075#, 16#006E#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#0069#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "The query stringValue() gives a single String value when one can be computed." MS_005D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 77, Length => 77, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0069#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0053#, 16#0074#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0075#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "Determines where the NamedElement appears within different Namespaces within the overall model, and its accessibility." MS_005E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 118, Length => 118, Value => (16#0044#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#006D#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0072#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0061#, 16#0070#, 16#0070#, 16#0065#, 16#0061#, 16#0072#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0069#, 16#006E#, 16#0020#, 16#0064#, 16#0069#, 16#0066#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0076#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#0063#, 16#0063#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "A_raisedException_behavioralFeature" MS_005F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 35, Length => 35, Value => (16#0041#, 16#005F#, 16#0072#, 16#0061#, 16#0069#, 16#0073#, 16#0065#, 16#0064#, 16#0045#, 16#0078#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, others => 16#0000#), others => <>); -- "isReadOnly" MS_0060 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#0069#, 16#0073#, 16#0052#, 16#0065#, 16#0061#, 16#0064#, 16#004F#, 16#006E#, 16#006C#, 16#0079#, others => 16#0000#), others => <>); -- "A_subsettedProperty_property" MS_0061 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 28, Length => 28, Value => (16#0041#, 16#005F#, 16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0065#, 16#0074#, 16#0074#, 16#0065#, 16#0064#, 16#0050#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#005F#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "EnumerationLiteral" MS_0062 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0045#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#004C#, 16#0069#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, others => 16#0000#), others => <>); -- "The ordered set of Elements referenced by this Constraint." MS_0063 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 58, Length => 58, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0043#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "The query integerValue() gives a single Integer value when one can be computed." MS_0064 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 79, Length => 79, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0067#, 16#0065#, 16#0072#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0069#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0049#, 16#006E#, 16#0074#, 16#0065#, 16#0067#, 16#0065#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0075#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "A_ownedComment_owningElement" MS_0065 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 28, Length => 28, Value => (16#0041#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0043#, 16#006F#, 16#006D#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "Specifies the elements related by the Relationship." MS_0066 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 51, Length => 51, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0052#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, 16#002E#, others => 16#0000#), others => <>); -- "false" MS_0067 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, others => 16#0000#), others => <>); -- "Association" MS_0068 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#0041#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "A property is a structural feature of a classifier that characterizes instances of the classifier. A property related by ownedAttribute to a classifier (other than an association) represents an attribute and might also represent an association end. It relates an instance of the class to a value or set of values of the type of the attribute. A property related by memberEnd or its specializations to an association represents an end of the association. The type of the property is the type of the end of the association." MS_0069 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 543, Unused => 521, Length => 521, Value => (16#0041#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0063#, 16#0068#, 16#0061#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0065#, 16#0072#, 16#0069#, 16#007A#, 16#0065#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0041#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0029#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006D#, 16#0069#, 16#0067#, 16#0068#, 16#0074#, 16#0020#, 16#0061#, 16#006C#, 16#0073#, 16#006F#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#002E#, 16#0020#, 16#0049#, 16#0074#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0045#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "The query separator() gives the string that is used to separate names when constructing a qualified name." MS_006A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 105, Length => 105, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0073#, 16#0065#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#0074#, 16#006F#, 16#0072#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0073#, 16#0065#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0061#, 16#0020#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "memberEnd" MS_006B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0045#, 16#006E#, 16#0064#, others => 16#0000#), others => <>); -- "derived_union_is_derived" MS_006C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 24, Length => 24, Value => (16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#005F#, 16#0075#, 16#006E#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0069#, 16#0073#, 16#005F#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, others => 16#0000#), others => <>); -- "context" MS_006D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, others => 16#0000#), others => <>); -- "redefined_property_inherited" MS_006E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 28, Length => 28, Value => (16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#005F#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#005F#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, others => 16#0000#), others => <>); -- "http://schema.omg.org/spec/MOF/2.0/cmof.xml" MS_006F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 43, Length => 43, Value => (16#0068#, 16#0074#, 16#0074#, 16#0070#, 16#003A#, 16#002F#, 16#002F#, 16#0073#, 16#0063#, 16#0068#, 16#0065#, 16#006D#, 16#0061#, 16#002E#, 16#006F#, 16#006D#, 16#0067#, 16#002E#, 16#006F#, 16#0072#, 16#0067#, 16#002F#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#002F#, 16#004D#, 16#004F#, 16#0046#, 16#002F#, 16#0032#, 16#002E#, 16#0030#, 16#002F#, 16#0063#, 16#006D#, 16#006F#, 16#0066#, 16#002E#, 16#0078#, 16#006D#, 16#006C#, others => 16#0000#), others => <>); -- "The query allFeatures() gives all of the features in the namespace of the classifier. In general, through mechanisms such as inheritance, this will be a larger set than feature." MS_0070 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 183, Unused => 177, Length => 177, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0073#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#002E#, 16#0020#, 16#0049#, 16#006E#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0072#, 16#006F#, 16#0075#, 16#0067#, 16#0068#, 16#0020#, 16#006D#, 16#0065#, 16#0063#, 16#0068#, 16#0061#, 16#006E#, 16#0069#, 16#0073#, 16#006D#, 16#0073#, 16#0020#, 16#0073#, 16#0075#, 16#0063#, 16#0068#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#006C#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0072#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#006E#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "A protected element is visible to elements that have a generalization relationship to the namespace that owns it." MS_0071 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 113, Length => 113, Value => (16#0041#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0074#, 16#0065#, 16#0063#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0076#, 16#0069#, 16#0073#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0069#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "A_memberEnd_association" MS_0072 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 23, Length => 23, Value => (16#0041#, 16#005F#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0045#, 16#006E#, 16#0064#, 16#005F#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "This gives the superclasses of a class." MS_0073 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 39, Length => 39, Value => (16#0054#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0075#, 16#0070#, 16#0065#, 16#0072#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "Operation" MS_0074 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "property" MS_0075 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "Property" MS_0076 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0050#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "bodyCondition" MS_0077 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#0062#, 16#006F#, 16#0064#, 16#0079#, 16#0043#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "A value specification is the specification of a (possibly empty) set of instances, including both objects and data values." MS_0078 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 122, Length => 122, Value => (16#0041#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0028#, 16#0070#, 16#006F#, 16#0073#, 16#0073#, 16#0069#, 16#0062#, 16#006C#, 16#0079#, 16#0020#, 16#0065#, 16#006D#, 16#0070#, 16#0074#, 16#0079#, 16#0029#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#002C#, 16#0020#, 16#0069#, 16#006E#, 16#0063#, 16#006C#, 16#0075#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0062#, 16#006F#, 16#0074#, 16#0068#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0064#, 16#0061#, 16#0074#, 16#0061#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "A named element is an element in a model that may have a name." MS_0079 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 62, Length => 62, Value => (16#0041#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0064#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "The query allOwnedElements() gives all of the direct and indirect owned elements of an element." MS_007A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 95, Length => 95, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#004F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "A_postcondition_postContext" MS_007B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 27, Length => 27, Value => (16#0041#, 16#005F#, 16#0070#, 16#006F#, 16#0073#, 16#0074#, 16#0063#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0070#, 16#006F#, 16#0073#, 16#0074#, 16#0043#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, others => 16#0000#), others => <>); -- "The query inheritableMembers() gives all of the members of a classifier that may be inherited in one of its descendants, subject to whatever visibility restrictions apply." MS_007C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 183, Unused => 171, Length => 171, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#004D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0073#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0063#, 16#0065#, 16#006E#, 16#0064#, 16#0061#, 16#006E#, 16#0074#, 16#0073#, 16#002C#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0077#, 16#0068#, 16#0061#, 16#0074#, 16#0065#, 16#0076#, 16#0065#, 16#0072#, 16#0020#, 16#0076#, 16#0069#, 16#0073#, 16#0069#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0061#, 16#0070#, 16#0070#, 16#006C#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "A_annotatedElement_comment" MS_007D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 26, Length => 26, Value => (16#0041#, 16#005F#, 16#0061#, 16#006E#, 16#006E#, 16#006F#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#005F#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "redefinition_consistent" MS_007E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 23, Length => 23, Value => (16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "When there is a name, and all of the containing namespaces have a name, the qualified name is constructed from the names of the containing namespaces." MS_007F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 159, Unused => 150, Length => 150, Value => (16#0057#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "A constraint is a condition or restriction expressed in natural language text or in a machine readable language for the purpose of declaring some of the semantics of an element." MS_0080 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 183, Unused => 177, Length => 177, Value => (16#0041#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0065#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#006E#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#006C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#0061#, 16#0063#, 16#0068#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#0064#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#006C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0075#, 16#0072#, 16#0070#, 16#006F#, 16#0073#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0064#, 16#0065#, 16#0063#, 16#006C#, 16#0061#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0073#, 16#006F#, 16#006D#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#006D#, 16#0061#, 16#006E#, 16#0074#, 16#0069#, 16#0063#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "References the Types representing exceptions that may be raised during an invocation of this operation." MS_0081 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 103, Length => 103, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0054#, 16#0079#, 16#0070#, 16#0065#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0065#, 16#0078#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0072#, 16#0061#, 16#0069#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0064#, 16#0075#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0076#, 16#006F#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "expression" MS_0082 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#0065#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "has_owner" MS_0083 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0068#, 16#0061#, 16#0073#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "separator" MS_0084 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0073#, 16#0065#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#0074#, 16#006F#, 16#0072#, others => 16#0000#), others => <>); -- "spec" MS_0085 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0073#, 16#0070#, 16#0065#, 16#0063#, others => 16#0000#), others => <>); -- "The ordered set of literals for this Enumeration." MS_0086 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 49, Length => 49, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006C#, 16#0069#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0073#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0045#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "References the Element(s) being commented." MS_0087 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 42, Length => 42, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0028#, 16#0073#, 16#0029#, 16#0020#, 16#0062#, 16#0065#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "ownedTag" MS_0088 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0054#, 16#0061#, 16#0067#, others => 16#0000#), others => <>); -- "The query allParents() gives all of the direct and indirect ancestors of a generalized Classifier." MS_0089 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 98, Length => 98, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0050#, 16#0061#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0074#, 16#006F#, 16#0072#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0065#, 16#0064#, 16#0020#, 16#0043#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "name" MS_008A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#006E#, 16#0061#, 16#006D#, 16#0065#, others => 16#0000#), others => <>); -- "Specifies the targets of the DirectedRelationship." MS_008B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 50, Length => 50, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0044#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0065#, 16#0064#, 16#0052#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, 16#002E#, others => 16#0000#), others => <>); -- "A Boolean type is used for logical expression, consisting of the predefined values true and false." MS_008C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 98, Length => 98, Value => (16#0041#, 16#0020#, 16#0042#, 16#006F#, 16#006F#, 16#006C#, 16#0065#, 16#0061#, 16#006E#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#006C#, 16#006F#, 16#0067#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#002C#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "A private element is only visible inside the namespace that owns it." MS_008D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 68, Length => 68, Value => (16#0041#, 16#0020#, 16#0070#, 16#0072#, 16#0069#, 16#0076#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#006E#, 16#006C#, 16#0079#, 16#0020#, 16#0076#, 16#0069#, 16#0073#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0069#, 16#0064#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0069#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "This information is derived from the return result for this Operation." MS_008E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 70, Length => 70, Value => (16#0054#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "direction" MS_008F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "inheritableMembers" MS_0090 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#004D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0073#, others => 16#0000#), others => <>); -- "A property may not subset a property with the same name." MS_0091 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 56, Length => 56, Value => (16#0041#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "booleanValue" MS_0092 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0062#, 16#006F#, 16#006F#, 16#006C#, 16#0065#, 16#0061#, 16#006E#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, others => 16#0000#), others => <>); -- "hasVisibilityOf" MS_0093 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 15, Length => 15, Value => (16#0068#, 16#0061#, 16#0073#, 16#0056#, 16#0069#, 16#0073#, 16#0069#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#004F#, 16#0066#, others => 16#0000#), others => <>); -- "The query isNull() returns true when it can be computed that the value is null." MS_0094 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 79, Length => 79, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#004E#, 16#0075#, 16#006C#, 16#006C#, 16#0028#, 16#0029#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0075#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006E#, 16#0075#, 16#006C#, 16#006C#, 16#002E#, others => 16#0000#), others => <>); -- "general" MS_0095 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, others => 16#0000#), others => <>); -- "The query importMembers() defines which of a set of PackageableElements are actually imported into the namespace. This excludes hidden ones, i.e., those which have names that conflict with names of owned members, and also excludes elements which would have the same name when imported." MS_0096 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 295, Unused => 285, Length => 285, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#004D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0073#, 16#0028#, 16#0029#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0075#, 16#0061#, 16#006C#, 16#006C#, 16#0079#, 16#0020#, 16#0069#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#0078#, 16#0063#, 16#006C#, 16#0075#, 16#0064#, 16#0065#, 16#0073#, 16#0020#, 16#0068#, 16#0069#, 16#0064#, 16#0064#, 16#0065#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0073#, 16#002C#, 16#0020#, 16#0069#, 16#002E#, 16#0065#, 16#002E#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#006F#, 16#0073#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006C#, 16#0069#, 16#0063#, 16#0074#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0073#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0061#, 16#006C#, 16#0073#, 16#006F#, 16#0020#, 16#0065#, 16#0078#, 16#0063#, 16#006C#, 16#0075#, 16#0064#, 16#0065#, 16#0073#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0077#, 16#006F#, 16#0075#, 16#006C#, 16#0064#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0069#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "References the Operation owning this parameter." MS_0097 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 47, Length => 47, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "Indicates that parameter values are passed as return values from a behavioral element back to the caller." MS_0098 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 105, Length => 105, Value => (16#0049#, 16#006E#, 16#0064#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0062#, 16#0061#, 16#0063#, 16#006B#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "redefined" MS_0099 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, others => 16#0000#), others => <>); -- "A classifier is a classification of instances - it describes a set of instances that have features in common. A classifier can specify a generalization hierarchy by referencing its general classifiers." MS_009A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 207, Unused => 201, Length => 201, Value => (16#0041#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#002D#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0063#, 16#0072#, 16#0069#, 16#0062#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#006F#, 16#006E#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0079#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0068#, 16#0069#, 16#0065#, 16#0072#, 16#0061#, 16#0072#, 16#0063#, 16#0068#, 16#0079#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "subsetted_property_names" MS_009B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 24, Length => 24, Value => (16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0065#, 16#0074#, 16#0074#, 16#0065#, 16#0064#, 16#005F#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#005F#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, others => 16#0000#), others => <>); -- "Indicates that parameter values are passed into a behavioral element by the caller and then back out to the caller from the behavioral element." MS_009C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 151, Unused => 143, Length => 143, Value => (16#0049#, 16#006E#, 16#0064#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0062#, 16#0061#, 16#0063#, 16#006B#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0065#, 16#0072#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "The query conformsTo() gives true for a type that conforms to another. By default, two types do not conform to each other. This query is intended to be redefined for specific conformance situations." MS_009D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 207, Unused => 198, Length => 198, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0073#, 16#0054#, 16#006F#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#006E#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#002E#, 16#0020#, 16#0042#, 16#0079#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#002C#, 16#0020#, 16#0074#, 16#0077#, 16#006F#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0073#, 16#0020#, 16#0064#, 16#006F#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0065#, 16#0061#, 16#0063#, 16#0068#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0073#, 16#0069#, 16#0074#, 16#0075#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "true" MS_009E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0074#, 16#0072#, 16#0075#, 16#0065#, others => 16#0000#), others => <>); -- "opposite" MS_009F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#006F#, 16#0070#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0065#, others => 16#0000#), others => <>); -- "isLeaf" MS_00A0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0069#, 16#0073#, 16#004C#, 16#0065#, 16#0061#, 16#0066#, others => 16#0000#), others => <>); -- "A_attribute_classifier" MS_00A1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 22, Length => 22, Value => (16#0041#, 16#005F#, 16#0061#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#005F#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "inheritedMember" MS_00A2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 15, Length => 15, Value => (16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#004D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "feature" MS_00A3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, others => 16#0000#), others => <>); -- "subsetting_context_conforms" MS_00A4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 27, Length => 27, Value => (16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0065#, 16#0074#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#005F#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#005F#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0073#, others => 16#0000#), others => <>); -- "A_relatedElement_relationship" MS_00A5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 29, Length => 29, Value => (16#0041#, 16#005F#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#005F#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, others => 16#0000#), others => <>); -- "A_ownedOperation_datatype" MS_00A6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 25, Length => 25, Value => (16#0041#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0064#, 16#0061#, 16#0074#, 16#0061#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, others => 16#0000#), others => <>); -- "Parameter" MS_00A7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0050#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "elements_public_or_private" MS_00A8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 26, Length => 26, Value => (16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#005F#, 16#0070#, 16#0075#, 16#0062#, 16#006C#, 16#0069#, 16#0063#, 16#005F#, 16#006F#, 16#0072#, 16#005F#, 16#0070#, 16#0072#, 16#0069#, 16#0076#, 16#0061#, 16#0074#, 16#0065#, others => 16#0000#), others => <>); -- "If this operation has a return parameter, isUnique equals the value of isUnique for that parameter. Otherwise isUnique is true." MS_00A9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 127, Length => 127, Value => (16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002C#, 16#0020#, 16#0069#, 16#0073#, 16#0055#, 16#006E#, 16#0069#, 16#0071#, 16#0075#, 16#0065#, 16#0020#, 16#0065#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#0073#, 16#0055#, 16#006E#, 16#0069#, 16#0071#, 16#0075#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002E#, 16#0020#, 16#004F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0077#, 16#0069#, 16#0073#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0055#, 16#006E#, 16#0069#, 16#0071#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "bestVisibility" MS_00AA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#0062#, 16#0065#, 16#0073#, 16#0074#, 16#0056#, 16#0069#, 16#0073#, 16#0069#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "References the PackageMerges that are owned by this Package." MS_00AB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 60, Length => 60, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#004D#, 16#0065#, 16#0072#, 16#0067#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "navigable_readonly" MS_00AC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#006E#, 16#0061#, 16#0076#, 16#0069#, 16#0067#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#005F#, 16#0072#, 16#0065#, 16#0061#, 16#0064#, 16#006F#, 16#006E#, 16#006C#, 16#0079#, others => 16#0000#), others => <>); -- "The Classifiers that have this Feature as a feature." MS_00AD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 52, Length => 52, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0043#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "A package merge defines how the contents of one package are extended by the contents of another package." MS_00AE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 104, Length => 104, Value => (16#0041#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#006D#, 16#0065#, 16#0072#, 16#0067#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0068#, 16#006F#, 16#0077#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006E#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "An element import identifies an element in another package, and allows the element to be referenced using its name without a qualifier." MS_00AF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 143, Unused => 135, Length => 135, Value => (16#0041#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0020#, 16#0069#, 16#0064#, 16#0065#, 16#006E#, 16#0074#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#006E#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#006F#, 16#0077#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0064#, 16#0020#, 16#0075#, 16#0073#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#006F#, 16#0075#, 16#0074#, 16#0020#, 16#0061#, 16#0020#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "References the properties that are redefined by this property." MS_00B0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 62, Length => 62, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "A behavioral feature is a feature of a classifier that specifies an aspect of the behavior of its instances." MS_00B1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 108, Length => 108, Value => (16#0041#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "If isDerived is true, the value of the attribute is derived from information elsewhere." MS_00B2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 87, Length => 87, Value => (16#0049#, 16#0066#, 16#0020#, 16#0069#, 16#0073#, 16#0044#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0069#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#0073#, 16#0065#, 16#0077#, 16#0068#, 16#0065#, 16#0072#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "packageMerge" MS_00B3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#004D#, 16#0065#, 16#0072#, 16#0067#, 16#0065#, others => 16#0000#), others => <>); -- "isComputable" MS_00B4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006D#, 16#0070#, 16#0075#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "ownedOperation" MS_00B5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "stringValue" MS_00B6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, others => 16#0000#), others => <>); -- "A_type_operation" MS_00B7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0041#, 16#005F#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#005F#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "isFinalSpecialization" MS_00B8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 21, Length => 21, Value => (16#0069#, 16#0073#, 16#0046#, 16#0069#, 16#006E#, 16#0061#, 16#006C#, 16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "isAbstract" MS_00B9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#0069#, 16#0073#, 16#0041#, 16#0062#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, others => 16#0000#), others => <>); -- "A_ownedRule_context" MS_00BA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 19, Length => 19, Value => (16#0041#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0052#, 16#0075#, 16#006C#, 16#0065#, 16#005F#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, others => 16#0000#), others => <>); -- "Specifies a String that represents a value to be used when no argument is supplied for the Parameter." MS_00BB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 101, Length => 101, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0053#, 16#0074#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#0061#, 16#0072#, 16#0067#, 16#0075#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0073#, 16#0075#, 16#0070#, 16#0070#, 16#006C#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0050#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "The query upperBound() returns the upper bound of the multiplicity for a bounded multiplicity as an unlimited natural." MS_00BC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 118, Length => 118, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0075#, 16#0070#, 16#0070#, 16#0065#, 16#0072#, 16#0042#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0028#, 16#0029#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0075#, 16#0070#, 16#0070#, 16#0065#, 16#0072#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0075#, 16#006E#, 16#006C#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#006E#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#002E#, others => 16#0000#), others => <>); -- "ownerFormalParam" MS_00BD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0072#, 16#0046#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#006C#, 16#0050#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, others => 16#0000#), others => <>); -- "A_ownedParameter_operation" MS_00BE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 26, Length => 26, Value => (16#0041#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0050#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#005F#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "The query lowerBound() returns the lower bound of the multiplicity as an integer." MS_00BF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 81, Length => 81, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, 16#0042#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0028#, 16#0029#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0067#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "References the Package that is being extended with the contents of the merged package of the PackageMerge." MS_00C0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 106, Length => 106, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0062#, 16#0065#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0065#, 16#0072#, 16#0067#, 16#0065#, 16#0064#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#004D#, 16#0065#, 16#0072#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "A_ownedParameter_ownerFormalParam" MS_00C1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 33, Length => 33, Value => (16#0041#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0050#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0072#, 16#0046#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#006C#, 16#0050#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, others => 16#0000#), others => <>); -- "A_target_directedRelationship" MS_00C2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 29, Length => 29, Value => (16#0041#, 16#005F#, 16#0074#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0074#, 16#005F#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0065#, 16#0064#, 16#0052#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, others => 16#0000#), others => <>); -- "The query isComputable() determines whether a value specification can be computed in a model. This operation cannot be fully defined in OCL. A conforming implementation is expected to deliver true for this operation for all value specifications that it can compute, and to compute all of those for which the operation is true. A conforming implementation is expected to be able to compute the value of all literals." MS_00C3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 431, Unused => 415, Length => 415, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006D#, 16#0070#, 16#0075#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0028#, 16#0029#, 16#0020#, 16#0064#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#006D#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0075#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0066#, 16#0075#, 16#006C#, 16#006C#, 16#0079#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#004F#, 16#0043#, 16#004C#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0069#, 16#006D#, 16#0070#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#0078#, 16#0070#, 16#0065#, 16#0063#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0064#, 16#0065#, 16#006C#, 16#0069#, 16#0076#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0075#, 16#0074#, 16#0065#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0075#, 16#0074#, 16#0065#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#006F#, 16#0073#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0069#, 16#006D#, 16#0070#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#0078#, 16#0070#, 16#0065#, 16#0063#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0075#, 16#0074#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006C#, 16#0069#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "A_ownedAttribute_class" MS_00C4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 22, Length => 22, Value => (16#0041#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0041#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#005F#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, others => 16#0000#), others => <>); -- "out" MS_00C5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 3, Length => 3, Value => (16#006F#, 16#0075#, 16#0074#, others => 16#0000#), others => <>); -- "language_body_size" MS_00C6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#006C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#005F#, 16#0062#, 16#006F#, 16#0064#, 16#0079#, 16#005F#, 16#0073#, 16#0069#, 16#007A#, 16#0065#, others => 16#0000#), others => <>); -- "An association specializing another association has the same number of ends as the other association." MS_00C7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 101, Length => 101, Value => (16#0041#, 16#006E#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0061#, 16#006E#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "C" MS_00C8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 1, Length => 1, Value => (16#0043#, others => 16#0000#), others => <>); -- "The DataType that owns this Property." MS_00C9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 37, Length => 37, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0044#, 16#0061#, 16#0074#, 16#0061#, 16#0054#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0050#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "Specifies the name that should be added to the namespace of the importing package in lieu of the name of the imported packagable element. The aliased name must not clash with any other member name in the importing package. By default, no alias is used." MS_00CA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 263, Unused => 252, Length => 252, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0073#, 16#0068#, 16#006F#, 16#0075#, 16#006C#, 16#0064#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0061#, 16#0064#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#006C#, 16#0069#, 16#0065#, 16#0075#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#006C#, 16#0069#, 16#0061#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0068#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#006E#, 16#0079#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#002E#, 16#0020#, 16#0042#, 16#0079#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#002C#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#0061#, 16#006C#, 16#0069#, 16#0061#, 16#0073#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "not_apply_to_self" MS_00CB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#006E#, 16#006F#, 16#0074#, 16#005F#, 16#0061#, 16#0070#, 16#0070#, 16#006C#, 16#0079#, 16#005F#, 16#0074#, 16#006F#, 16#005F#, 16#0073#, 16#0065#, 16#006C#, 16#0066#, others => 16#0000#), others => <>); -- "A string is a sequence of characters in some suitable character set used to display information about the model. Character sets may include non-Roman alphabets and characters." MS_00CC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 183, Unused => 175, Length => 175, Value => (16#0041#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#0071#, 16#0075#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0063#, 16#0068#, 16#0061#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0073#, 16#006F#, 16#006D#, 16#0065#, 16#0020#, 16#0073#, 16#0075#, 16#0069#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0063#, 16#0068#, 16#0061#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0064#, 16#0069#, 16#0073#, 16#0070#, 16#006C#, 16#0061#, 16#0079#, 16#0020#, 16#0069#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0061#, 16#0062#, 16#006F#, 16#0075#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#002E#, 16#0020#, 16#0043#, 16#0068#, 16#0061#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0069#, 16#006E#, 16#0063#, 16#006C#, 16#0075#, 16#0064#, 16#0065#, 16#0020#, 16#006E#, 16#006F#, 16#006E#, 16#002D#, 16#0052#, 16#006F#, 16#006D#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#006C#, 16#0070#, 16#0068#, 16#0061#, 16#0062#, 16#0065#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0063#, 16#0068#, 16#0061#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "behavioralFeature" MS_00CD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, others => 16#0000#), others => <>); -- "A_element_tag" MS_00CE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#0041#, 16#005F#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#005F#, 16#0074#, 16#0061#, 16#0067#, others => 16#0000#), others => <>); -- "vis" MS_00CF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 3, Length => 3, Value => (16#0076#, 16#0069#, 16#0073#, others => 16#0000#), others => <>); -- "elementImport" MS_00D0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0049#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, others => 16#0000#), others => <>); -- "If this operation has a return parameter, lower equals the value of lower for that parameter. Otherwise lower is not defined." MS_00D1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 125, Length => 125, Value => (16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002C#, 16#0020#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, 16#0020#, 16#0065#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002E#, 16#0020#, 16#004F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0077#, 16#0069#, 16#0073#, 16#0065#, 16#0020#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "The query isConsistentWith() specifies, for any two Operations in a context in which redefinition is possible, whether redefinition would be consistent in the sense of maintaining type covariance. Other senses of consistency may be required, for example to determine consistency in the sense of contravariance. Users may define alternative queries under names different from 'isConsistentWith()', as for example, users may define a query named 'isContravariantWith()'." MS_00D2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 487, Unused => 468, Length => 468, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, 16#0057#, 16#0069#, 16#0074#, 16#0068#, 16#0028#, 16#0029#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#002C#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#006E#, 16#0079#, 16#0020#, 16#0074#, 16#0077#, 16#006F#, 16#0020#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0070#, 16#006F#, 16#0073#, 16#0073#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#002C#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0077#, 16#006F#, 16#0075#, 16#006C#, 16#0064#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#006E#, 16#0073#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006D#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#0076#, 16#0061#, 16#0072#, 16#0069#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#002E#, 16#0020#, 16#004F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0073#, 16#0065#, 16#006E#, 16#0073#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0065#, 16#006E#, 16#0063#, 16#0079#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0071#, 16#0075#, 16#0069#, 16#0072#, 16#0065#, 16#0064#, 16#002C#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0065#, 16#0078#, 16#0061#, 16#006D#, 16#0070#, 16#006C#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0064#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#006D#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0065#, 16#006E#, 16#0063#, 16#0079#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#006E#, 16#0073#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#0061#, 16#0076#, 16#0061#, 16#0072#, 16#0069#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#002E#, 16#0020#, 16#0055#, 16#0073#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0061#, 16#006C#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0075#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0020#, 16#0064#, 16#0069#, 16#0066#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0027#, 16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, 16#0057#, 16#0069#, 16#0074#, 16#0068#, 16#0028#, 16#0029#, 16#0027#, 16#002C#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0065#, 16#0078#, 16#0061#, 16#006D#, 16#0070#, 16#006C#, 16#0065#, 16#002C#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0064#, 16#0020#, 16#0027#, 16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#0061#, 16#0076#, 16#0061#, 16#0072#, 16#0069#, 16#0061#, 16#006E#, 16#0074#, 16#0057#, 16#0069#, 16#0074#, 16#0068#, 16#0028#, 16#0029#, 16#0027#, 16#002E#, others => 16#0000#), others => <>); -- "getName" MS_00D3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0067#, 16#0065#, 16#0074#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, others => 16#0000#), others => <>); -- "A redefinable element can only redefine non-leaf redefinable elements" MS_00D4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 69, Length => 69, Value => (16#0041#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#006C#, 16#0079#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#006E#, 16#006F#, 16#006E#, 16#002D#, 16#006C#, 16#0065#, 16#0061#, 16#0066#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, others => 16#0000#), others => <>); -- "redefinitionContext" MS_00D5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 19, Length => 19, Value => (16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0043#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, others => 16#0000#), others => <>); -- "The query parents() gives all of the immediate ancestors of a generalized Classifier." MS_00D6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 85, Length => 85, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006D#, 16#006D#, 16#0065#, 16#0064#, 16#0069#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0074#, 16#006F#, 16#0072#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0065#, 16#0064#, 16#0020#, 16#0043#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "The lower bound must be a non-negative integer literal." MS_00D7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 55, Length => 55, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#006F#, 16#006E#, 16#002D#, 16#006E#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0067#, 16#0065#, 16#0072#, 16#0020#, 16#006C#, 16#0069#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#002E#, others => 16#0000#), others => <>); -- "Element" MS_00D8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "An element is a constituent of a model. As such, it has the capability of owning other elements." MS_00D9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 96, Length => 96, Value => (16#0041#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0069#, 16#0074#, 16#0075#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#002E#, 16#0020#, 16#0041#, 16#0073#, 16#0020#, 16#0073#, 16#0075#, 16#0063#, 16#0068#, 16#002C#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#0070#, 16#0061#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "A_ownedOperation_class" MS_00DA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 22, Length => 22, Value => (16#0041#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, others => 16#0000#), others => <>); -- "The visibility of an ElementImport is either public or private." MS_00DB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 63, Length => 63, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0069#, 16#0073#, 16#0069#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0049#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#0069#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#0075#, 16#0062#, 16#006C#, 16#0069#, 16#0063#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0070#, 16#0072#, 16#0069#, 16#0076#, 16#0061#, 16#0074#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "allFeatures" MS_00DC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#0061#, 16#006C#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0073#, others => 16#0000#), others => <>); -- "If isComposite is true, the object containing the attribute is a container for the object or value contained in the attribute." MS_00DD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 126, Length => 126, Value => (16#0049#, 16#0066#, 16#0020#, 16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006D#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0072#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "enumeration" MS_00DE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#0065#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "inout" MS_00DF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0069#, 16#006E#, 16#006F#, 16#0075#, 16#0074#, others => 16#0000#), others => <>); -- "ownedLiteral" MS_00E0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#004C#, 16#0069#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, others => 16#0000#), others => <>); -- "Specifies the packageable elements that are owned by this Package." MS_00E1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 66, Length => 66, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "A_feature_featuringClassifier" MS_00E2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 29, Length => 29, Value => (16#0041#, 16#005F#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#005F#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0043#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "el" MS_00E3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 2, Length => 2, Value => (16#0065#, 16#006C#, others => 16#0000#), others => <>); -- "relationship" MS_00E4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, others => 16#0000#), others => <>); -- "References the packaged elements that are Packages." MS_00E5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 51, Length => 51, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0064#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "target" MS_00E6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0074#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0074#, others => 16#0000#), others => <>); -- "An opaque expression is an uninterpreted textual statement that denotes a (possibly empty) set of values when evaluated in a context." MS_00E7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 143, Unused => 133, Length => 133, Value => (16#0041#, 16#006E#, 16#0020#, 16#006F#, 16#0070#, 16#0061#, 16#0071#, 16#0075#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0075#, 16#006E#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0070#, 16#0072#, 16#0065#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0075#, 16#0061#, 16#006C#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0064#, 16#0065#, 16#006E#, 16#006F#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0028#, 16#0070#, 16#006F#, 16#0073#, 16#0073#, 16#0069#, 16#0062#, 16#006C#, 16#0079#, 16#0020#, 16#0065#, 16#006D#, 16#0070#, 16#0074#, 16#0079#, 16#0029#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0065#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "has_qualified_name" MS_00E8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0068#, 16#0061#, 16#0073#, 16#005F#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#005F#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, others => 16#0000#), others => <>); -- "For a multivalued multiplicity, this attributes specifies whether the values in an instantiation of this element are unique." MS_00E9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 124, Length => 124, Value => (16#0046#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0064#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0074#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0075#, 16#006E#, 16#0069#, 16#0071#, 16#0075#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "References the classifiers that are used as types of the ends of the association." MS_00EA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 81, Length => 81, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "Specifies the Namespace that imports the members from a Package." MS_00EB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 64, Length => 64, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0061#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "subsetting_rules" MS_00EC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0065#, 16#0074#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#005F#, 16#0072#, 16#0075#, 16#006C#, 16#0065#, 16#0073#, others => 16#0000#), others => <>); -- "A_endType_association" MS_00ED : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 21, Length => 21, Value => (16#0041#, 16#005F#, 16#0065#, 16#006E#, 16#0064#, 16#0054#, 16#0079#, 16#0070#, 16#0065#, 16#005F#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "Indicates that parameter values are passed from a behavioral element out to the caller." MS_00EE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 87, Length => 87, Value => (16#0049#, 16#006E#, 16#0064#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "A redefined property must be inherited from a more general classifier containing the redefining property." MS_00EF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 105, Length => 105, Value => (16#0041#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "A collection of NamedElements owned by the Namespace." MS_00F0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 53, Length => 53, Value => (16#0041#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006C#, 16#0065#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "upper" MS_00F1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0075#, 16#0070#, 16#0070#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "References the Class that owns the Property." MS_00F2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 44, Length => 44, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0043#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0050#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "lowerBound" MS_00F3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, 16#0042#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, others => 16#0000#), others => <>); -- "A bodyCondition can only be specified for a query operation." MS_00F4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 60, Length => 60, Value => (16#0041#, 16#0020#, 16#0062#, 16#006F#, 16#0064#, 16#0079#, 16#0043#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#006C#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "Specifies the ordered set of formal parameters of this BehavioralFeature." MS_00F5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 73, Length => 73, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#006C#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0042#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "References the PackageImports owned by the Namespace." MS_00F6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 53, Length => 53, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0049#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "An enumeration literal is a user-defined data value for an enumeration." MS_00F7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 71, Length => 71, Value => (16#0041#, 16#006E#, 16#0020#, 16#0065#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006C#, 16#0069#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0072#, 16#002D#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0064#, 16#0061#, 16#0074#, 16#0061#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "package" MS_00F8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, others => 16#0000#), others => <>); -- "not_own_self" MS_00F9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#006E#, 16#006F#, 16#0074#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#005F#, 16#0073#, 16#0065#, 16#006C#, 16#0066#, others => 16#0000#), others => <>); -- "A_redefinedOperation_operation" MS_00FA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 30, Length => 30, Value => (16#0041#, 16#005F#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "specification" MS_00FB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "constrainedElement" MS_00FC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "importingNamespace" MS_00FD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0069#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, others => 16#0000#), others => <>); -- "importedElement" MS_00FE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 15, Length => 15, Value => (16#0069#, 16#006D#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "A condition that must be true when evaluated in order for the constraint to be satisfied." MS_00FF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 89, Length => 89, Value => (16#0041#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0065#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#0074#, 16#0069#, 16#0073#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); end AMF.Internals.Tables.CMOF_String_Data_00;
reznikmm/matreshka
Ada
4,903
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ -- An interruptible activity region is an activity group that supports -- termination of tokens flowing in the portions of an activity. ------------------------------------------------------------------------------ limited with AMF.UML.Activity_Edges.Collections; with AMF.UML.Activity_Groups; limited with AMF.UML.Activity_Nodes.Collections; package AMF.UML.Interruptible_Activity_Regions is pragma Preelaborate; type UML_Interruptible_Activity_Region is limited interface and AMF.UML.Activity_Groups.UML_Activity_Group; type UML_Interruptible_Activity_Region_Access is access all UML_Interruptible_Activity_Region'Class; for UML_Interruptible_Activity_Region_Access'Storage_Size use 0; not overriding function Get_Interrupting_Edge (Self : not null access constant UML_Interruptible_Activity_Region) return AMF.UML.Activity_Edges.Collections.Set_Of_UML_Activity_Edge is abstract; -- Getter of InterruptibleActivityRegion::interruptingEdge. -- -- The edges leaving the region that will abort other tokens flowing in -- the region. not overriding function Get_Node (Self : not null access constant UML_Interruptible_Activity_Region) return AMF.UML.Activity_Nodes.Collections.Set_Of_UML_Activity_Node is abstract; -- Getter of InterruptibleActivityRegion::node. -- -- Nodes immediately contained in the group. end AMF.UML.Interruptible_Activity_Regions;
MEDiCODEDEV/coinapi-sdk
Ada
2,009
ads
-- OMS _ REST API -- OMS Project -- -- The version of the OpenAPI document: v1 -- -- -- NOTE: This package is auto generated by OpenAPI-Generator 4.3.1. -- https://openapi-generator.tech -- Do not edit the class manually. with .Models; with Swagger.Clients; package .Clients is type Client_Type is new Swagger.Clients.Client_Type with null record; -- Get balances -- Returns all of your balances, including available balance. procedure V1_Balances_Get (Client : in out Client_Type; Exchange_Id : in Swagger.Nullable_UString; Result : out .Models.Balance_Type_Vectors.Vector); -- Cancel all order -- Cancel all existing order. procedure V1_Orders_Cancel_All_Post (Client : in out Client_Type; Cancel_All_Order_Type : in .Models.CancelAllOrder_Type; Result : out .Models.MessagesOk_Type); -- Cancel order -- Cancel an existing order, can be used to cancel margin, exchange, and derivative orders. You can cancel the order by the internal order ID or exchange order ID. procedure V1_Orders_Cancel_Post (Client : in out Client_Type; Cancel_Order_Type : in .Models.CancelOrder_Type; Result : out .Models.OrderLive_Type); -- Get orders -- List your current open orders. procedure V1_Orders_Get (Client : in out Client_Type; Exchange_Id : in Swagger.Nullable_UString; Result : out .Models.Order_Type_Vectors.Vector); -- Create new order -- You can place two types of orders: limit and market. Orders can only be placed if your account has sufficient funds. procedure V1_Orders_Post (Client : in out Client_Type; New_Order_Type : in .Models.NewOrder_Type; Result : out .Models.OrderLive_Type); -- Get positions -- Returns all of your positions. procedure V1_Positions_Get (Client : in out Client_Type; Exchange_Id : in Swagger.Nullable_UString; Result : out .Models.Position_Type_Vectors.Vector); end .Clients;
sungyeon/drake
Ada
7,107
adb
with Ada.Characters.Latin_1; with Ada.Strings.Composites; with Ada.Strings.Fixed; with Ada.Strings.Maps.Constants; with Ada.Strings.Normalization; procedure normalize is use type Ada.Strings.Composites.Class; subtype C is Character; subtype WWC is Wide_Wide_Character; subtype WWS is Wide_Wide_String; begin -- combining class pragma Assert (Ada.Strings.Composites.Combining_Class (WWC'First) = 0); pragma Assert (Ada.Strings.Composites.Combining_Class (WWC'Val (16#0308#)) = 230); pragma Assert (Ada.Strings.Composites.Combining_Class (WWC'Val (16#0323#)) = 220); pragma Assert (Ada.Strings.Composites.Combining_Class (WWC'Val (16#3099#)) = 8); pragma Assert (Ada.Strings.Composites.Combining_Class (WWC'Val (16#e0100#)) = 0); -- VARIATION SELECTOR pragma Assert (Ada.Strings.Composites.Combining_Class (WWC'Last) = 0); declare S : constant Wide_Wide_String := "a" & WWC'Val (16#0323#) & WWC'Val (16#0308#) & WWC'Val (16#304b#) & WWC'Val (16#3099#) -- ka & dakuten & "e" & WWC'Val (16#0323#) & WWC'Val (16#0304#) & WWC'Val (16#0301#); Last : Natural; Is_Illegal_Sequence : Boolean; begin Ada.Strings.Composites.Get_Combined (S, Last, Is_Illegal_Sequence); pragma Assert (Last = 3); pragma Assert (not Is_Illegal_Sequence); Ada.Strings.Composites.Get_Combined (S (Last + 1 .. S'Last), Last, Is_Illegal_Sequence); pragma Assert (Last = 5); pragma Assert (not Is_Illegal_Sequence); Ada.Strings.Composites.Get_Combined (S (Last + 1 .. S'Last), Last, Is_Illegal_Sequence); pragma Assert (Last = 9); pragma Assert (not Is_Illegal_Sequence); end; -- decomposing and composing pragma Assert (Ada.Strings.Normalization.Decompose (WWS'("")) = ""); pragma Assert (Ada.Strings.Normalization.Decompose (WWS'("A")) = "A"); pragma Assert (Ada.Strings.Normalization.Decompose ((1 => WWC'Val (16#304c#))) = WWC'Val (16#304b#) & WWC'Val (16#3099#)); pragma Assert (Ada.Strings.Normalization.Decompose ((1 => WWC'Val (16#0390#))) = WWC'Val (16#03B9#) & WWC'Val (16#0308#) & WWC'Val (16#0301#)); pragma Assert (Ada.Strings.Normalization.Decompose ((1 => WWC'Val (16#0958#))) = WWC'Val (16#0915#) & WWC'Val (16#093C#)); pragma Assert (Ada.Strings.Normalization.Decompose ((1 => WWC'Val (16#AC00#))) = WWC'Val (16#1100#) & WWC'Val (16#1161#)); -- Hangul LV pragma Assert (Ada.Strings.Normalization.Decompose ((1 => WWC'Val (16#AC01#))) = WWC'Val (16#1100#) & WWC'Val (16#1161#) & WWC'Val (16#11A8#)); -- Hangul LVT pragma Assert (Ada.Strings.Normalization.Compose (WWS'("")) = ""); pragma Assert (Ada.Strings.Normalization.Compose (WWS'("A")) = "A"); pragma Assert (Ada.Strings.Normalization.Compose (WWC'Val (16#304b#) & WWC'Val (16#3099#)) = (1 => WWC'Val (16#304c#))); pragma Assert (Ada.Strings.Normalization.Compose (WWC'Val (16#03B9#) & WWC'Val (16#0308#) & WWC'Val (16#0301#)) = (1 => WWC'Val (16#0390#))); pragma Assert (Ada.Strings.Normalization.Compose (WWC'Val (16#0915#) & WWC'Val (16#093C#)) = WWC'Val (16#0915#) & WWC'Val (16#093C#)); -- composition exclusion pragma Assert (Ada.Strings.Normalization.Compose (WWC'Val (16#1100#) & WWC'Val (16#1161#)) = (1 => WWC'Val (16#AC00#))); -- Hangul LV pragma Assert (Ada.Strings.Normalization.Compose (WWC'Val (16#1100#) & WWC'Val (16#1161#) & WWC'Val (16#11A8#)) = (1 => WWC'Val (16#AC01#))); -- Hangul LVT pragma Assert (Ada.Strings.Normalization.Decompose (C'Val (16#e3#) & C'Val (16#81#) & C'Val (16#8c#)) = (C'Val (16#e3#) & C'Val (16#81#) & C'Val (16#8b#) & C'Val (16#e3#) & C'Val (16#82#) & C'Val (16#99#))); -- UTF-8 -- equal pragma Assert (Ada.Strings.Normalization.Equal (WWS'(""), "")); pragma Assert (not Ada.Strings.Normalization.Equal (WWS'(""), "A")); pragma Assert (not Ada.Strings.Normalization.Equal (WWS'("A"), "")); pragma Assert (Ada.Strings.Normalization.Equal (WWS'("A"), "A")); pragma Assert (not Ada.Strings.Normalization.Equal (WWS'("A"), "AA")); pragma Assert (not Ada.Strings.Normalization.Equal (WWS'("AA"), "A")); pragma Assert (not Ada.Strings.Normalization.Equal (WWS'("AA"), "AB")); pragma Assert (not Ada.Strings.Normalization.Equal (WWS'("AB"), "AA")); pragma Assert (not Ada.Strings.Normalization.Equal ((1 => WWC'Val (16#00C0#)), 'A' & WWC'Val (16#0301#))); pragma Assert (Ada.Strings.Normalization.Equal ((1 => WWC'Val (16#00C1#)), 'A' & WWC'Val (16#0301#))); pragma Assert (Ada.Strings.Normalization.Equal ((1 => WWC'Val (16#304c#)), WWC'Val (16#304b#) & WWC'Val (16#3099#))); pragma Assert (Ada.Strings.Normalization.Equal (WWC'Val (16#304b#) & WWC'Val (16#3099#), (1 => WWC'Val (16#304c#)))); -- less pragma Assert (not Ada.Strings.Normalization.Less (WWS'(""), "")); pragma Assert (Ada.Strings.Normalization.Less (WWS'(""), "A")); pragma Assert (not Ada.Strings.Normalization.Less (WWS'("A"), "")); pragma Assert (not Ada.Strings.Normalization.Less (WWS'("A"), "A")); pragma Assert (Ada.Strings.Normalization.Less (WWS'("A"), "AA")); pragma Assert (not Ada.Strings.Normalization.Less (WWS'("AA"), "A")); pragma Assert (Ada.Strings.Normalization.Less (WWS'("AA"), "AB")); pragma Assert (not Ada.Strings.Normalization.Less (WWS'("AB"), "AA")); pragma Assert (Ada.Strings.Normalization.Less ((1 => WWC'Val (16#00C0#)), 'A' & WWC'Val (16#0301#))); pragma Assert (not Ada.Strings.Normalization.Less ((1 => WWC'Val (16#00C1#)), 'A' & WWC'Val (16#0301#))); pragma Assert (not Ada.Strings.Normalization.Less ((1 => WWC'Val (16#304c#)), WWC'Val (16#304b#) & WWC'Val (16#3099#))); pragma Assert (not Ada.Strings.Normalization.Less (WWC'Val (16#304b#) & WWC'Val (16#3099#), (1 => WWC'Val (16#304c#)))); -- To_Base declare package Latin_1 renames Ada.Characters.Latin_1; package F renames Ada.Strings.Fixed; package M renames Ada.Strings.Maps; begin pragma Assert (M.Value (M.Constants.Basic_Map, '6') = '6'); -- 16#36# pragma Assert (M.Value (M.Constants.Basic_Map, 'Y') = 'Y'); -- 16#59# pragma Assert (M.Value (M.Constants.Basic_Map, Latin_1.LC_R) = 'r'); -- 16#72# pragma Assert (F.Translate (Latin_1.UC_O_Acute, M.Constants.Basic_Map) = "O"); -- 16#D4# pragma Assert (F.Translate (Latin_1.UC_O_Tilde, M.Constants.Basic_Map) = "O"); -- 16#D6# pragma Assert (F.Translate (Latin_1.UC_U_Grave, M.Constants.Basic_Map) = "U"); -- 16#D9# pragma Assert (F.Translate (Latin_1.UC_U_Acute, M.Constants.Basic_Map) = "U"); -- 16#DA# pragma Assert (F.Translate (Latin_1.LC_A_Circumflex, M.Constants.Basic_Map) = "a"); -- 16#E2# pragma Assert (F.Translate (Latin_1.LC_A_Tilde, M.Constants.Basic_Map) = "a"); -- 16#E3# pragma Assert (F.Translate (Latin_1.LC_E_Grave, M.Constants.Basic_Map) = "e"); -- 16#E8# pragma Assert (F.Translate (Latin_1.LC_E_Acute, M.Constants.Basic_Map) = "e"); -- 16#E9# pragma Assert (F.Translate (Latin_1.LC_I_Circumflex, M.Constants.Basic_Map) = "i"); -- 16#EE# pragma Assert (F.Translate (Latin_1.LC_I_Diaeresis, M.Constants.Basic_Map) = "i"); -- 16#EF# pragma Assert (F.Translate (Latin_1.LC_Y_Acute, M.Constants.Basic_Map) = "y"); -- 16#FD# pragma Assert (F.Translate (Latin_1.LC_Y_Diaeresis, M.Constants.Basic_Map) = "y"); -- 16#FF# end; pragma Debug (Ada.Debug.Put ("OK")); end normalize;
zhmu/ananas
Ada
7,177
ads
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- S Y S T E M -- -- -- -- S p e c -- -- (GNU-Linux/MIPS Version) -- -- -- -- Copyright (C) 1992-2022, Free Software Foundation, Inc. -- -- -- -- This specification is derived from the Ada Reference Manual for use with -- -- GNAT. The copyright notice above, and the license provisions that follow -- -- apply solely to the contents of the part following the private keyword. -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ package System is pragma Pure; -- Note that we take advantage of the implementation permission to make -- this unit Pure instead of Preelaborable; see RM 13.7.1(15). In Ada -- 2005, this is Pure in any case (AI-362). pragma No_Elaboration_Code_All; -- Allow the use of that restriction in units that WITH this unit type Name is (SYSTEM_NAME_GNAT); System_Name : constant Name := SYSTEM_NAME_GNAT; -- System-Dependent Named Numbers Min_Int : constant := -2 ** (Standard'Max_Integer_Size - 1); Max_Int : constant := 2 ** (Standard'Max_Integer_Size - 1) - 1; Max_Binary_Modulus : constant := 2 ** Standard'Max_Integer_Size; Max_Nonbinary_Modulus : constant := 2 ** Integer'Size - 1; Max_Base_Digits : constant := Long_Long_Float'Digits; Max_Digits : constant := Long_Long_Float'Digits; Max_Mantissa : constant := Standard'Max_Integer_Size - 1; Fine_Delta : constant := 2.0 ** (-Max_Mantissa); Tick : constant := 0.000_001; -- Storage-related Declarations type Address is private; pragma Preelaborable_Initialization (Address); Null_Address : constant Address; Storage_Unit : constant := 8; Word_Size : constant := Standard'Word_Size; Memory_Size : constant := 2 ** Word_Size; -- Address comparison function "<" (Left, Right : Address) return Boolean; function "<=" (Left, Right : Address) return Boolean; function ">" (Left, Right : Address) return Boolean; function ">=" (Left, Right : Address) return Boolean; function "=" (Left, Right : Address) return Boolean; pragma Import (Intrinsic, "<"); pragma Import (Intrinsic, "<="); pragma Import (Intrinsic, ">"); pragma Import (Intrinsic, ">="); pragma Import (Intrinsic, "="); -- Other System-Dependent Declarations type Bit_Order is (High_Order_First, Low_Order_First); Default_Bit_Order : constant Bit_Order := Bit_Order'Val (Standard'Default_Bit_Order); pragma Warnings (Off, Default_Bit_Order); -- kill constant condition warning -- Priority-related Declarations (RM D.1) Max_Priority : constant Positive := 30; Max_Interrupt_Priority : constant Positive := 31; subtype Any_Priority is Integer range 0 .. 31; subtype Priority is Any_Priority range 0 .. 30; subtype Interrupt_Priority is Any_Priority range 31 .. 31; Default_Priority : constant Priority := 15; private type Address is mod Memory_Size; Null_Address : constant Address := 0; -------------------------------------- -- System Implementation Parameters -- -------------------------------------- -- These parameters provide information about the target that is used -- by the compiler. They are in the private part of System, where they -- can be accessed using the special circuitry in the Targparm unit -- whose source should be consulted for more detailed descriptions -- of the individual switch values. Backend_Divide_Checks : constant Boolean := False; Backend_Overflow_Checks : constant Boolean := True; Command_Line_Args : constant Boolean := True; Configurable_Run_Time : constant Boolean := False; Denorm : constant Boolean := True; Duration_32_Bits : constant Boolean := False; Exit_Status_Supported : constant Boolean := True; Machine_Overflows : constant Boolean := False; Machine_Rounds : constant Boolean := True; Preallocated_Stacks : constant Boolean := False; Signed_Zeros : constant Boolean := True; Stack_Check_Default : constant Boolean := False; Stack_Check_Probes : constant Boolean := True; Stack_Check_Limits : constant Boolean := False; Support_Aggregates : constant Boolean := True; Support_Composite_Assign : constant Boolean := True; Support_Composite_Compare : constant Boolean := True; Support_Long_Shifts : constant Boolean := True; Always_Compatible_Rep : constant Boolean := False; Suppress_Standard_Library : constant Boolean := False; Use_Ada_Main_Program_Name : constant Boolean := False; Frontend_Exceptions : constant Boolean := False; ZCX_By_Default : constant Boolean := True; end System;
reznikmm/matreshka
Ada
3,674
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Elements; package ODF.DOM.Text_Word_Count_Elements is pragma Preelaborate; type ODF_Text_Word_Count is limited interface and XML.DOM.Elements.DOM_Element; type ODF_Text_Word_Count_Access is access all ODF_Text_Word_Count'Class with Storage_Size => 0; end ODF.DOM.Text_Word_Count_Elements;
reznikmm/matreshka
Ada
18,375
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with AMF.Elements; with AMF.Internals.Element_Collections; with AMF.Internals.Helpers; with AMF.Internals.Tables.UML_Attributes; with AMF.Visitors.UML_Iterators; with AMF.Visitors.UML_Visitors; with League.Strings.Internals; with Matreshka.Internals.Strings; package body AMF.Internals.UML_Activity_Final_Nodes is ------------------- -- Enter_Element -- ------------------- overriding procedure Enter_Element (Self : not null access constant UML_Activity_Final_Node_Proxy; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Visitor in AMF.Visitors.UML_Visitors.UML_Visitor'Class then AMF.Visitors.UML_Visitors.UML_Visitor'Class (Visitor).Enter_Activity_Final_Node (AMF.UML.Activity_Final_Nodes.UML_Activity_Final_Node_Access (Self), Control); end if; end Enter_Element; ------------------- -- Leave_Element -- ------------------- overriding procedure Leave_Element (Self : not null access constant UML_Activity_Final_Node_Proxy; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Visitor in AMF.Visitors.UML_Visitors.UML_Visitor'Class then AMF.Visitors.UML_Visitors.UML_Visitor'Class (Visitor).Leave_Activity_Final_Node (AMF.UML.Activity_Final_Nodes.UML_Activity_Final_Node_Access (Self), Control); end if; end Leave_Element; ------------------- -- Visit_Element -- ------------------- overriding procedure Visit_Element (Self : not null access constant UML_Activity_Final_Node_Proxy; Iterator : in out AMF.Visitors.Abstract_Iterator'Class; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Iterator in AMF.Visitors.UML_Iterators.UML_Iterator'Class then AMF.Visitors.UML_Iterators.UML_Iterator'Class (Iterator).Visit_Activity_Final_Node (Visitor, AMF.UML.Activity_Final_Nodes.UML_Activity_Final_Node_Access (Self), Control); end if; end Visit_Element; ------------------ -- Get_Activity -- ------------------ overriding function Get_Activity (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Activities.UML_Activity_Access is begin return AMF.UML.Activities.UML_Activity_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Activity (Self.Element))); end Get_Activity; ------------------ -- Set_Activity -- ------------------ overriding procedure Set_Activity (Self : not null access UML_Activity_Final_Node_Proxy; To : AMF.UML.Activities.UML_Activity_Access) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_Activity (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Activity; ------------------ -- Get_In_Group -- ------------------ overriding function Get_In_Group (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Activity_Groups.Collections.Set_Of_UML_Activity_Group is begin return AMF.UML.Activity_Groups.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_In_Group (Self.Element))); end Get_In_Group; --------------------------------- -- Get_In_Interruptible_Region -- --------------------------------- overriding function Get_In_Interruptible_Region (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Interruptible_Activity_Regions.Collections.Set_Of_UML_Interruptible_Activity_Region is begin return AMF.UML.Interruptible_Activity_Regions.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_In_Interruptible_Region (Self.Element))); end Get_In_Interruptible_Region; ---------------------- -- Get_In_Partition -- ---------------------- overriding function Get_In_Partition (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Activity_Partitions.Collections.Set_Of_UML_Activity_Partition is begin return AMF.UML.Activity_Partitions.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_In_Partition (Self.Element))); end Get_In_Partition; ---------------------------- -- Get_In_Structured_Node -- ---------------------------- overriding function Get_In_Structured_Node (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Structured_Activity_Nodes.UML_Structured_Activity_Node_Access is begin return AMF.UML.Structured_Activity_Nodes.UML_Structured_Activity_Node_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_In_Structured_Node (Self.Element))); end Get_In_Structured_Node; ---------------------------- -- Set_In_Structured_Node -- ---------------------------- overriding procedure Set_In_Structured_Node (Self : not null access UML_Activity_Final_Node_Proxy; To : AMF.UML.Structured_Activity_Nodes.UML_Structured_Activity_Node_Access) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_In_Structured_Node (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_In_Structured_Node; ------------------ -- Get_Incoming -- ------------------ overriding function Get_Incoming (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Activity_Edges.Collections.Set_Of_UML_Activity_Edge is begin return AMF.UML.Activity_Edges.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Incoming (Self.Element))); end Get_Incoming; ------------------ -- Get_Outgoing -- ------------------ overriding function Get_Outgoing (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Activity_Edges.Collections.Set_Of_UML_Activity_Edge is begin return AMF.UML.Activity_Edges.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Outgoing (Self.Element))); end Get_Outgoing; ------------------------ -- Get_Redefined_Node -- ------------------------ overriding function Get_Redefined_Node (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Activity_Nodes.Collections.Set_Of_UML_Activity_Node is begin return AMF.UML.Activity_Nodes.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Redefined_Node (Self.Element))); end Get_Redefined_Node; ----------------- -- Get_Is_Leaf -- ----------------- overriding function Get_Is_Leaf (Self : not null access constant UML_Activity_Final_Node_Proxy) return Boolean is begin return AMF.Internals.Tables.UML_Attributes.Internal_Get_Is_Leaf (Self.Element); end Get_Is_Leaf; ----------------- -- Set_Is_Leaf -- ----------------- overriding procedure Set_Is_Leaf (Self : not null access UML_Activity_Final_Node_Proxy; To : Boolean) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_Is_Leaf (Self.Element, To); end Set_Is_Leaf; --------------------------- -- Get_Redefined_Element -- --------------------------- overriding function Get_Redefined_Element (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Redefinable_Elements.Collections.Set_Of_UML_Redefinable_Element is begin return AMF.UML.Redefinable_Elements.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Redefined_Element (Self.Element))); end Get_Redefined_Element; ------------------------------ -- Get_Redefinition_Context -- ------------------------------ overriding function Get_Redefinition_Context (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Classifiers.Collections.Set_Of_UML_Classifier is begin return AMF.UML.Classifiers.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Redefinition_Context (Self.Element))); end Get_Redefinition_Context; --------------------------- -- Get_Client_Dependency -- --------------------------- overriding function Get_Client_Dependency (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Dependencies.Collections.Set_Of_UML_Dependency is begin return AMF.UML.Dependencies.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Client_Dependency (Self.Element))); end Get_Client_Dependency; ------------------------- -- Get_Name_Expression -- ------------------------- overriding function Get_Name_Expression (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.String_Expressions.UML_String_Expression_Access is begin return AMF.UML.String_Expressions.UML_String_Expression_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Name_Expression (Self.Element))); end Get_Name_Expression; ------------------------- -- Set_Name_Expression -- ------------------------- overriding procedure Set_Name_Expression (Self : not null access UML_Activity_Final_Node_Proxy; To : AMF.UML.String_Expressions.UML_String_Expression_Access) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_Name_Expression (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Name_Expression; ------------------- -- Get_Namespace -- ------------------- overriding function Get_Namespace (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Namespaces.UML_Namespace_Access is begin return AMF.UML.Namespaces.UML_Namespace_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Namespace (Self.Element))); end Get_Namespace; ------------------------ -- Get_Qualified_Name -- ------------------------ overriding function Get_Qualified_Name (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.Optional_String is begin declare use type Matreshka.Internals.Strings.Shared_String_Access; Aux : constant Matreshka.Internals.Strings.Shared_String_Access := AMF.Internals.Tables.UML_Attributes.Internal_Get_Qualified_Name (Self.Element); begin if Aux = null then return (Is_Empty => True); else return (False, League.Strings.Internals.Create (Aux)); end if; end; end Get_Qualified_Name; ------------------------ -- Is_Consistent_With -- ------------------------ overriding function Is_Consistent_With (Self : not null access constant UML_Activity_Final_Node_Proxy; Redefinee : AMF.UML.Redefinable_Elements.UML_Redefinable_Element_Access) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Is_Consistent_With unimplemented"); raise Program_Error with "Unimplemented procedure UML_Activity_Final_Node_Proxy.Is_Consistent_With"; return Is_Consistent_With (Self, Redefinee); end Is_Consistent_With; ----------------------------------- -- Is_Redefinition_Context_Valid -- ----------------------------------- overriding function Is_Redefinition_Context_Valid (Self : not null access constant UML_Activity_Final_Node_Proxy; Redefined : AMF.UML.Redefinable_Elements.UML_Redefinable_Element_Access) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Is_Redefinition_Context_Valid unimplemented"); raise Program_Error with "Unimplemented procedure UML_Activity_Final_Node_Proxy.Is_Redefinition_Context_Valid"; return Is_Redefinition_Context_Valid (Self, Redefined); end Is_Redefinition_Context_Valid; ------------------------- -- All_Owning_Packages -- ------------------------- overriding function All_Owning_Packages (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Packages.Collections.Set_Of_UML_Package is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "All_Owning_Packages unimplemented"); raise Program_Error with "Unimplemented procedure UML_Activity_Final_Node_Proxy.All_Owning_Packages"; return All_Owning_Packages (Self); end All_Owning_Packages; ----------------------------- -- Is_Distinguishable_From -- ----------------------------- overriding function Is_Distinguishable_From (Self : not null access constant UML_Activity_Final_Node_Proxy; N : AMF.UML.Named_Elements.UML_Named_Element_Access; Ns : AMF.UML.Namespaces.UML_Namespace_Access) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Is_Distinguishable_From unimplemented"); raise Program_Error with "Unimplemented procedure UML_Activity_Final_Node_Proxy.Is_Distinguishable_From"; return Is_Distinguishable_From (Self, N, Ns); end Is_Distinguishable_From; --------------- -- Namespace -- --------------- overriding function Namespace (Self : not null access constant UML_Activity_Final_Node_Proxy) return AMF.UML.Namespaces.UML_Namespace_Access is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Namespace unimplemented"); raise Program_Error with "Unimplemented procedure UML_Activity_Final_Node_Proxy.Namespace"; return Namespace (Self); end Namespace; end AMF.Internals.UML_Activity_Final_Nodes;
AdaCore/libadalang
Ada
101
ads
package Pkg is type T1 is tagged null record; type T2 is abstract tagged null record; end Pkg;
stcarrez/ada-util
Ada
5,692
adb
----------------------------------------------------------------------- -- util-systems-dlls-tests -- Unit tests for shared libraries -- Copyright (C) 2013, 2017, 2019, 2022 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Util.Test_Caller; package body Util.Systems.DLLs.Tests is use Util.Tests; use type System.Address; procedure Load_Library (T : in out Test; Lib : out Handle); package Caller is new Util.Test_Caller (Test, "Systems.Dlls"); procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite) is begin Caller.Add_Test (Suite, "Test Util.Systems.Dlls.Load", Test_Load'Access); Caller.Add_Test (Suite, "Test Util.Systems.Dlls.Get_Symbol", Test_Get_Symbol'Access); end Add_Tests; procedure Load_Library (T : in out Test; Lib : out Handle) is Lib1 : Handle; Lib2 : Handle; Lib3 : Handle; Lib4 : Handle; Lib5 : Handle; Lib6 : Handle; begin begin Lib1 := Util.Systems.DLLs.Load ("libcrypto.so"); T.Assert (Lib1 /= Null_Handle, "Load operation returned null"); Lib := Lib1; exception when Load_Error => Lib1 := Null_Handle; end; begin Lib2 := Util.Systems.DLLs.Load ("libgmp.dylib"); T.Assert (Lib2 /= Null_Handle, "Load operation returned null"); Lib := Lib2; exception when Load_Error => Lib2 := Null_Handle; end; begin Lib3 := Util.Systems.DLLs.Load ("zlib1.dll"); T.Assert (Lib3 /= Null_Handle, "Load operation returned null"); Lib := Lib3; exception when Load_Error => Lib3 := Null_Handle; end; begin Lib4 := Util.Systems.DLLs.Load ("libz.so"); T.Assert (Lib4 /= Null_Handle, "Load operation returned null"); Lib := Lib4; exception when Load_Error => Lib4 := Null_Handle; end; begin Lib5 := Util.Systems.DLLs.Load ("libgmp.so"); T.Assert (Lib5 /= Null_Handle, "Load operation returned null"); Lib := Lib5; exception when Load_Error => Lib5 := Null_Handle; end; begin Lib6 := Util.Systems.DLLs.Load ("libexpat-1.dll"); T.Assert (Lib6 /= Null_Handle, "Load operation returned null"); Lib := Lib6; exception when Load_Error => Lib6 := Null_Handle; end; T.Assert (Lib1 /= Null_Handle or else Lib2 /= Null_Handle or else Lib3 /= Null_Handle or else Lib4 /= Null_Handle or else Lib5 /= Null_Handle or else Lib6 /= Null_Handle, "At least one Load operation should have succeeded"); end Load_Library; -- ------------------------------ -- Test the loading a shared library. -- ------------------------------ procedure Test_Load (T : in out Test) is Lib : Handle; begin Load_Library (T, Lib); begin Lib := Util.Systems.DLLs.Load ("some-invalid-library"); T.Fail ("Load must raise an exception"); exception when Load_Error => null; end; end Test_Load; -- ------------------------------ -- Test getting a shared library symbol. -- ------------------------------ procedure Test_Get_Symbol (T : in out Test) is Lib : Handle; Sym : System.Address := System.Null_Address; begin Load_Library (T, Lib); T.Assert (Lib /= Null_Handle, "Load operation returned null"); begin Sym := Util.Systems.DLLs.Get_Symbol (Lib, "EVP_sha1"); T.Assert (Sym /= System.Null_Address, "Get_Symbol returned null"); exception when Not_Found => null; end; begin Sym := Util.Systems.DLLs.Get_Symbol (Lib, "compress"); T.Assert (Sym /= System.Null_Address, "Get_Symbol returned null"); exception when Not_Found => null; end; begin Sym := Util.Systems.DLLs.Get_Symbol (Lib, "__gmpf_cmp"); T.Assert (Sym /= System.Null_Address, "Get_Symbol returned null"); exception when Not_Found => null; end; begin Sym := Util.Systems.DLLs.Get_Symbol (Lib, "XML_ParserCreate"); T.Assert (Sym /= System.Null_Address, "Get_Symbol returned null"); exception when Not_Found => null; end; -- We must have found one of the two symbols T.Assert (Sym /= System.Null_Address, "Get_Symbol returned null"); begin Sym := Util.Systems.DLLs.Get_Symbol (Lib, "some-invalid-symbol"); T.Fail ("The Get_Symbol operation must raise an exception"); exception when Not_Found => null; end; end Test_Get_Symbol; end Util.Systems.DLLs.Tests;
persan/A-gst
Ada
3,086
ads
pragma Ada_2005; pragma Style_Checks (Off); pragma Warnings (Off); with Interfaces.C; use Interfaces.C; with glib; package GStreamer.GST_Low_Level.gstreamer_0_10_gst_interfaces_photography_enumtypes_h is -- unsupported macro: GST_TYPE_PHOTOGRAPHY_NOISE_REDUCTION (gst_photography_noise_reduction_get_type()) -- unsupported macro: GST_TYPE_WHITE_BALANCE_MODE (gst_white_balance_mode_get_type()) -- unsupported macro: GST_TYPE_COLOUR_TONE_MODE (gst_colour_tone_mode_get_type()) -- unsupported macro: GST_TYPE_SCENE_MODE (gst_scene_mode_get_type()) -- unsupported macro: GST_TYPE_FLASH_MODE (gst_flash_mode_get_type()) -- unsupported macro: GST_TYPE_FOCUS_STATUS (gst_focus_status_get_type()) -- unsupported macro: GST_TYPE_PHOTO_CAPS (gst_photo_caps_get_type()) -- unsupported macro: GST_TYPE_PHOTO_SHAKE_RISK (gst_photo_shake_risk_get_type()) -- unsupported macro: GST_TYPE_FLICKER_REDUCTION_MODE (gst_flicker_reduction_mode_get_type()) -- unsupported macro: GST_TYPE_FOCUS_MODE (gst_focus_mode_get_type()) -- enumerations from "photography.h" function gst_photography_noise_reduction_get_type return GLIB.GType; -- gst/interfaces/photography-enumtypes.h:12 pragma Import (C, gst_photography_noise_reduction_get_type, "gst_photography_noise_reduction_get_type"); function gst_white_balance_mode_get_type return GLIB.GType; -- gst/interfaces/photography-enumtypes.h:14 pragma Import (C, gst_white_balance_mode_get_type, "gst_white_balance_mode_get_type"); function gst_colour_tone_mode_get_type return GLIB.GType; -- gst/interfaces/photography-enumtypes.h:16 pragma Import (C, gst_colour_tone_mode_get_type, "gst_colour_tone_mode_get_type"); function gst_scene_mode_get_type return GLIB.GType; -- gst/interfaces/photography-enumtypes.h:18 pragma Import (C, gst_scene_mode_get_type, "gst_scene_mode_get_type"); function gst_flash_mode_get_type return GLIB.GType; -- gst/interfaces/photography-enumtypes.h:20 pragma Import (C, gst_flash_mode_get_type, "gst_flash_mode_get_type"); function gst_focus_status_get_type return GLIB.GType; -- gst/interfaces/photography-enumtypes.h:22 pragma Import (C, gst_focus_status_get_type, "gst_focus_status_get_type"); function gst_photo_caps_get_type return GLIB.GType; -- gst/interfaces/photography-enumtypes.h:24 pragma Import (C, gst_photo_caps_get_type, "gst_photo_caps_get_type"); function gst_photo_shake_risk_get_type return GLIB.GType; -- gst/interfaces/photography-enumtypes.h:26 pragma Import (C, gst_photo_shake_risk_get_type, "gst_photo_shake_risk_get_type"); function gst_flicker_reduction_mode_get_type return GLIB.GType; -- gst/interfaces/photography-enumtypes.h:28 pragma Import (C, gst_flicker_reduction_mode_get_type, "gst_flicker_reduction_mode_get_type"); function gst_focus_mode_get_type return GLIB.GType; -- gst/interfaces/photography-enumtypes.h:30 pragma Import (C, gst_focus_mode_get_type, "gst_focus_mode_get_type"); end GStreamer.GST_Low_Level.gstreamer_0_10_gst_interfaces_photography_enumtypes_h;
AdaCore/training_material
Ada
1,739
ads
pragma Ada_2005; pragma Style_Checks (Off); with Interfaces.C; use Interfaces.C; package avx512erintrin_h is -- Copyright (C) 2013-2017 Free Software Foundation, Inc. -- This file is part of GCC. -- GCC is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3, or (at your option) -- any later version. -- GCC 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. -- 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/>. -- Internal data types for implementing the intrinsics. subtype uu_v8df is <vector>; -- d:\install\gpl2018\lib\gcc\x86_64-pc-mingw32\7.3.1\include\avx512erintrin.h:38 subtype uu_v16sf is <vector>; -- d:\install\gpl2018\lib\gcc\x86_64-pc-mingw32\7.3.1\include\avx512erintrin.h:39 -- The Intel API is flexible enough that we must allow aliasing with other -- vector types, and their scalar components. subtype uu_m512 is <vector>; -- d:\install\gpl2018\lib\gcc\x86_64-pc-mingw32\7.3.1\include\avx512erintrin.h:43 end avx512erintrin_h;
HackInvent/Ada_Drivers_Library
Ada
2,690
adb
------------------------------------------------------------------------------ -- -- -- Copyright (C) 2015-2016, AdaCore -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions are -- -- met: -- -- 1. Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- 2. Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in -- -- the documentation and/or other materials provided with the -- -- distribution. -- -- 3. Neither the name of the copyright holder nor the names of its -- -- contributors may be used to endorse or promote products derived -- -- from this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT -- -- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, -- -- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY -- -- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT -- -- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE -- -- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ with STM32_SVD.RCC; use STM32_SVD.RCC; package body STM32.RCC is ------------------------- -- SYSCFG_Clock_Enable -- ------------------------- procedure SYSCFG_Clock_Enable is begin RCC_Periph.APB4ENR.SYSCFGEN := True; -- BEH changed from APB2 end SYSCFG_Clock_Enable; end STM32.RCC;
RREE/build-avr-ada-toolchain
Ada
3,917
ads
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME LIBRARY (GNARL) COMPONENTS -- -- -- -- A D A . C A L E N D A R . D E L A Y S -- -- -- -- S p e c -- -- -- -- Copyright (C) 1992-2005, Free Software Foundation, Inc. -- -- -- -- GNARL is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 2, or (at your option) any later ver- -- -- sion. GNARL 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 GNARL; see file COPYING. If not, write -- -- to the Free Software Foundation, 51 Franklin Street, Fifth Floor, -- -- Boston, MA 02110-1301, USA. -- -- -- -- As a special exception, if other files instantiate generics from this -- -- unit, or you link this unit with other files to produce an executable, -- -- this unit does not by itself cause the resulting executable to be -- -- covered by the GNU General Public License. This exception does not -- -- however invalidate any other reasons why the executable file might be -- -- covered by the GNU Public License. -- -- -- -- GNARL was developed by the GNARL team at Florida State University. -- -- Extensive contributions were provided by Ada Core Technologies, Inc. -- -- -- ------------------------------------------------------------------------------ -- This package implements Calendar.Time delays using AVR.Real_Time.Delays. -- Note: the compiler generates direct calls to this interface, in the -- processing of time types. with Interfaces; package Ada.Calendar.Delays is -- The type declarations here have to match the corresponding type -- declarations in AVR.Real_Time. subtype Day_Count is Interfaces.Integer_16; -- type Duration is delta 0.001 digits 9 range -24.0 * 3600.0 -- .. 48.0 * 3600.0; -- for Duration'Size use 32; type Time is record Days : Day_Count; Secs : Duration; end record; procedure Delay_For (D : Duration); -- Delay until an interval of length (at least) D seconds has passed, -- or the task is aborted to at least the current ATC nesting level. -- This is an abort completion point. -- The body of this procedure must perform all the processing -- required for an abortion point. procedure Delay_Until (T : Time); -- Delay until Clock has reached (at least) time T, -- or the task is aborted to at least the current ATC nesting level. -- The body of this procedure must perform all the processing -- required for an abortion point. private pragma Import (Ada, Delay_For, "ada__calendar__delays__delay_for"); pragma Import (Ada, Delay_Until, "ada__calendar__delays__delay_until"); end Ada.Calendar.Delays;
AdaCore/gpr
Ada
25
ads
package Pck2 is end Pck2;
jscparker/math_packages
Ada
10,648
adb
--with Text_io; use Text_io; package body Sorted_Array is Empty_Slot : constant Item := Item'Last; -- make type Item bigger if possible than data *set*. -- eg Item = Parent_Random_Int; or Random_Int'Base. -- would prefer Empty_Slot is out of range of actual data. -- not necessary tho. type Table is array (Table_Index) of Item; T : Table := (others => Empty_Slot); Index_of_Next_Item_to_Read : Table_Index := Table_Index'First; No_More_Items_Remaining : Boolean := False; -- Routines for reading the array sequentially (from beginning to end): -------------------------------------- -- Start_Reading_Array_at_Beginning -- -------------------------------------- procedure Start_Reading_Array_at_Beginning is begin Index_of_Next_Item_to_Read := Table_Index'First; end Start_Reading_Array_at_Beginning; ------------------------------- -- Set_Index_to_Present_Item -- ------------------------------- -- procedure Set_Index_to_Present_Item leaves index alone if it points -- a readable item, or else goes to next item if it exists, or to end of array -- if there are no more items. So if after calling Set_Index_to_Next_Item we -- find that T(Index_of_Next_Item_to_Read) = Empty_Slot then that means we have -- read every item in array already: set No_More_Items_Remaining := True. procedure Set_Index_to_Present_Item is begin if T(Index_of_Next_Item_to_Read) /= Empty_Slot then return; -- Index is set to proper next Item. Leave it here. end if; for i in table_Index loop if Index_of_Next_Item_to_Read < Table_Index'Last then Index_of_Next_Item_to_Read := Index_of_Next_Item_to_Read + 1; else No_More_Items_Remaining := True; return; -- Index_of_Next_Item_to_Read = Table_Index'Last, and no Item found end if; if T(Index_of_Next_Item_to_Read) /= Empty_Slot then -- Index is set to proper next Item. Leave it here. return; end if; end loop; end Set_Index_to_Present_Item; procedure Get_Next_Item (X : out Item; Item_is_Invalid : out Boolean) is begin -- init out param: Item_is_Invalid := False; Set_Index_to_Present_Item; -- stay at present index unless empty slot; skip all possible empty slots if No_More_Items_Remaining then -- go home early. Item_is_Invalid := True; X := Empty_Slot; return; end if; X := T(Index_of_Next_Item_to_Read); -- if we got to Table_Index'Last then Item at Table_Index'Last was valid, -- but now there may be no Items left: if Index_of_Next_Item_to_Read = Table_Index'Last then No_More_Items_Remaining := True; -- the reason we need No_More_Items_Re.. else -- Set_Index so Next Item is found next time around: Index_of_Next_Item_to_Read := Index_of_Next_Item_to_Read + 1; end if; end Get_Next_Item; -- Overflow Stacks: subtype Stack_Index is Table_Index range 0 .. Size_of_Overflow_Stacks - 1; type Item_Array is array (Stack_Index) of Item; type Stack is record Storage : Item_Array := (others => Empty_Slot); Next_Free_Slot_id : Stack_Index := Stack_Index'First; end record; Collision_Stack : Stack; type Sorted_Stack is record Storage : Item_Array := (others => Empty_Slot); Next_Free_Slot_id : Stack_Index := Stack_Index'First; end record; Low_End_Stack, High_End_Stack : Sorted_Stack; function No_of_Items_in_Low_Stack return Table_Index is begin return Table_Index (Low_End_Stack.Next_Free_Slot_id); end No_of_Items_in_Low_Stack; ----------------------------------- -- Initialize_Table_for_Restart -- ----------------------------------- procedure Initialize_Table_for_Restart is begin T := (others => Empty_Slot); Collision_Stack.Storage := (others => Empty_Slot); Low_End_Stack.Storage := (others => Empty_Slot); High_End_Stack.Storage := (others => Empty_Slot); Collision_Stack.Next_Free_Slot_id := Stack_Index'First; Low_End_Stack.Next_Free_Slot_id := Stack_Index'First; High_End_Stack.Next_Free_Slot_id := Stack_Index'First; No_More_Items_Remaining := False; Index_of_Next_Item_to_Read := Table_Index'First; end Initialize_Table_for_Restart; ---------- -- Push -- ---------- procedure Push (X : in Item; Stack_id : in out Stack) is pragma Assert (Stack_Index'First = 0); -- So No of items in stack = Next_Free_Slot_id S : Item_Array renames Stack_id.Storage; Next_Free_Slot_id : Stack_Index renames Stack_id.Next_Free_Slot_id; begin S (Next_Free_Slot_id) := X; if Next_Free_Slot_id = Stack_Index'Last then raise Constraint_Error; end if; Next_Free_Slot_id := Next_Free_Slot_id + 1; end Push; ------------------- -- Push_and_Sort -- ------------------- -- only way to update a Sorted_Stack, or sort fails. procedure Push_and_Sort (X : in Item; Stack_id : in out Sorted_Stack) is pragma Assert (Stack_Index'First = 0); X_Item_Size : constant Item := X; tmp : Item; S : Item_Array renames Stack_id.Storage; Next_Free_Slot_id : Stack_Index renames Stack_id.Next_Free_Slot_id; begin S (Next_Free_Slot_id) := X; bubble_sort: for i in reverse Stack_Index'First+1 .. Next_Free_Slot_id loop if X_Item_Size < S (i-1) then -- X is now in S(Next_Free_Slot_id) tmp := S (i-1); S (i-1) := S (i); S (i) := tmp; elsif X_Item_Size = S (i-1) then Push (X, Collision_Stack); exit bubble_sort; else -- X_Item_Size > S (i-1) exit bubble_sort; end if; end loop bubble_sort; if Next_Free_Slot_id = Stack_Index'Last then raise Constraint_Error; end if; Next_Free_Slot_id := Next_Free_Slot_id + 1; end Push_and_Sort; --------------------- -- Insert_and_Sort -- --------------------- -- X is both the item to be inserted, and the Item_Size procedure Insert_and_Sort (X : in Item) is X_Item_Size : constant Item := X; X_index_0 : constant Table_Index := Table_Index (X_Item_Size / Items_per_Table_Entry); Empty_Slot_id : Table_Index; Empty_Slot_Detected : Boolean := False; begin if X = Empty_Slot then -- value Empty_Slot signifies empty space in array, so is reserved. Push_and_Sort (X, High_End_Stack); return; end if; if T (X_index_0) = Empty_Slot then T (X_index_0) := X; return; end if; if X_Item_Size = T(X_index_0) then Push (X, Collision_Stack); return; elsif X_Item_Size < T (X_index_0) then if X_index_0 = Table_Index'First then Push_and_Sort (X, Low_End_Stack); return; end if; Empty_Slot_Detected := False; Find_Empty_Slot_Lower_Down: for i in reverse Table_Index range Table_Index'First .. X_index_0-1 loop if T(i) = Empty_Slot then Empty_Slot_id := i; Empty_Slot_Detected := True; exit Find_Empty_Slot_Lower_Down; end if; end loop Find_Empty_Slot_Lower_Down; if Empty_Slot_Detected = False then Push_and_Sort (X, Low_End_Stack); return; end if; -- shift the empty slot back to the rt place, and fill it with X: -- common short cut: if Empty_Slot_id = X_index_0-1 then -- put X into the table T(Empty_Slot_id) := X; return; end if; Shift_Slot_Up: for i in Empty_Slot_id+1 .. X_index_0 loop -- i-1 is the empty slot. if X_Item_Size > T(i) then T(i-1) := T(i); -- shift T(i) into the Empty Slot (at i-1) --T(i) := Empty_Slot;-- will fill this below with X elsif X_Item_Size = T(i) then Push (X, Collision_Stack); T(i-1) := X; return; else T(i-1) := X; return; end if; end loop Shift_Slot_Up; elsif X_Item_Size > T (X_index_0) then if X_index_0 = Table_Index'Last then Push_and_Sort (X, High_End_Stack); return; end if; Empty_Slot_Detected := False; Find_Empty_Slot_Higher_Up: for i in Table_Index range X_index_0+1 .. Table_Index'Last loop if T(i) = Empty_Slot then Empty_Slot_id := i; Empty_Slot_Detected := True; exit Find_Empty_Slot_Higher_Up; end if; end loop Find_Empty_Slot_Higher_Up; if Empty_Slot_Detected = False then Push_and_Sort (X, High_End_Stack); return; end if; -- shift the empty slot back to the rt place, and fill it with X: -- common short cut: if Empty_Slot_id = X_index_0+1 then -- put X into the table T(Empty_Slot_id) := X; return; end if; Shift_Slot_Down: for i in reverse X_index_0 .. Empty_Slot_id-1 loop -- i+1 is the empty slot. if X_Item_Size < T(i) then T(i+1) := T(i); -- put T(i) into the Empty Slot (at i+1) --T(i) := Empty_Slot;-- will fill this below with X elsif X_Item_Size = T(i) then Push (X, Collision_Stack); T(i+1) := X; return; else T(i+1) := X; return; end if; end loop Shift_Slot_Down; end if; end Insert_and_Sort; --------------------------- -- Array_Sort_Successful -- --------------------------- function Array_Sort_Successful return Boolean is Hi, Lo : Item; Non_Empty_Slot_id : Table_Index; begin Find_Non_Empty_Slot_Higher_Up: for i in Table_Index loop if T(i) /= Empty_Slot then Non_Empty_Slot_id := i; Lo := T(i); exit Find_Non_Empty_Slot_Higher_Up; end if; end loop Find_Non_Empty_Slot_Higher_Up; for i in Non_Empty_Slot_id+1 .. Table_Index'Last loop if T(i) = Empty_Slot then null; else Hi := T(i); if Hi < Lo then return False; end if; Hi := Lo; end if; end loop; return True; end Array_Sort_Successful; ------------------------------- -- No_of_Collisions_Detected -- ------------------------------- function No_of_Collisions_Detected return Table_Index is begin return Collision_Stack.Next_Free_Slot_id - Stack_Index'First; -- subtype of Table_Index end No_of_Collisions_Detected; end Sorted_Array;
SayCV/rtems-addon-packages
Ada
17,237
adb
------------------------------------------------------------------------------ -- -- -- GNAT ncurses Binding Samples -- -- -- -- ncurses -- -- -- -- B O D Y -- -- -- ------------------------------------------------------------------------------ -- Copyright (c) 2000-2006,2011 Free Software Foundation, Inc. -- -- -- -- Permission is hereby granted, free of charge, to any person obtaining a -- -- copy of this software and associated documentation files (the -- -- "Software"), to deal in the Software without restriction, including -- -- without limitation the rights to use, copy, modify, merge, publish, -- -- distribute, distribute with modifications, sublicense, and/or sell -- -- copies of the Software, and to permit persons to whom the Software is -- -- furnished to do so, subject to the following conditions: -- -- -- -- The above copyright notice and this permission notice shall be included -- -- in all copies or substantial portions of the Software. -- -- -- -- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS -- -- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF -- -- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. -- -- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, -- -- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR -- -- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR -- -- THE USE OR OTHER DEALINGS IN THE SOFTWARE. -- -- -- -- Except as contained in this notice, the name(s) of the above copyright -- -- holders shall not be used in advertising or otherwise to promote the -- -- sale, use or other dealings in this Software without prior written -- -- authorization. -- ------------------------------------------------------------------------------ -- Author: Eugene V. Melaragno <[email protected]> 2000 -- Version Control -- $Revision$ -- $Date$ -- Binding Version 01.00 ------------------------------------------------------------------------------ with ncurses2.util; use ncurses2.util; with Terminal_Interface.Curses; use Terminal_Interface.Curses; with Terminal_Interface.Curses.Forms; use Terminal_Interface.Curses.Forms; with Terminal_Interface.Curses.Forms.Field_User_Data; with Ada.Characters.Handling; with Ada.Strings; with Ada.Strings.Bounded; procedure ncurses2.demo_forms is package BS is new Ada.Strings.Bounded.Generic_Bounded_Length (80); type myptr is access Integer; -- The C version stores a pointer in the userptr and -- converts it into a long integer. -- The correct, but inconvenient way to do it is to use a -- pointer to long and keep the pointer constant. -- It just adds one memory piece to allocate and deallocate (not done here) package StringData is new Terminal_Interface.Curses.Forms.Field_User_Data (Integer, myptr); function edit_secure (me : Field; c_in : Key_Code) return Key_Code; function form_virtualize (f : Form; w : Window) return Key_Code; function my_form_driver (f : Form; c : Key_Code) return Boolean; function make_label (frow : Line_Position; fcol : Column_Position; label : String) return Field; function make_field (frow : Line_Position; fcol : Column_Position; rows : Line_Count; cols : Column_Count; secure : Boolean) return Field; procedure display_form (f : Form); procedure erase_form (f : Form); -- prints '*' instead of characters. -- Not that this keeps a bug from the C version: -- type in the psasword field then move off and back. -- the cursor is at position one, but -- this assumes it as at the end so text gets appended instead -- of overwtitting. function edit_secure (me : Field; c_in : Key_Code) return Key_Code is rows, frow : Line_Position; nrow : Natural; cols, fcol : Column_Position; nbuf : Buffer_Number; c : Key_Code := c_in; c2 : Character; use StringData; begin Info (me, rows, cols, frow, fcol, nrow, nbuf); -- TODO if result = Form_Ok and nbuf > 0 then -- C version checked the return value -- of Info, the Ada binding throws an exception I think. if nbuf > 0 then declare temp : BS.Bounded_String; temps : String (1 .. 10); -- TODO Get_Buffer povides no information on the field length? len : myptr; begin Get_Buffer (me, 1, Str => temps); -- strcpy(temp, field_buffer(me, 1)); Get_User_Data (me, len); temp := BS.To_Bounded_String (temps (1 .. len.all)); if c <= Key_Max then c2 := Code_To_Char (c); if Ada.Characters.Handling.Is_Graphic (c2) then BS.Append (temp, c2); len.all := len.all + 1; Set_Buffer (me, 1, BS.To_String (temp)); c := Character'Pos ('*'); else c := 0; end if; else case c is when REQ_BEG_FIELD | REQ_CLR_EOF | REQ_CLR_EOL | REQ_DEL_LINE | REQ_DEL_WORD | REQ_DOWN_CHAR | REQ_END_FIELD | REQ_INS_CHAR | REQ_INS_LINE | REQ_LEFT_CHAR | REQ_NEW_LINE | REQ_NEXT_WORD | REQ_PREV_WORD | REQ_RIGHT_CHAR | REQ_UP_CHAR => c := 0; -- we don't want to do inline editing when REQ_CLR_FIELD => if len.all /= 0 then temp := BS.To_Bounded_String (""); Set_Buffer (me, 1, BS.To_String (temp)); len.all := 0; end if; when REQ_DEL_CHAR | REQ_DEL_PREV => if len.all /= 0 then BS.Delete (temp, BS.Length (temp), BS.Length (temp)); Set_Buffer (me, 1, BS.To_String (temp)); len.all := len.all - 1; end if; when others => null; end case; end if; end; end if; return c; end edit_secure; mode : Key_Code := REQ_INS_MODE; function form_virtualize (f : Form; w : Window) return Key_Code is type lookup_t is record code : Key_Code; result : Key_Code; -- should be Form_Request_Code, but we need MAX_COMMAND + 1 end record; lookup : constant array (Positive range <>) of lookup_t := ( ( Character'Pos ('A') mod 16#20#, REQ_NEXT_CHOICE ), ( Character'Pos ('B') mod 16#20#, REQ_PREV_WORD ), ( Character'Pos ('C') mod 16#20#, REQ_CLR_EOL ), ( Character'Pos ('D') mod 16#20#, REQ_DOWN_FIELD ), ( Character'Pos ('E') mod 16#20#, REQ_END_FIELD ), ( Character'Pos ('F') mod 16#20#, REQ_NEXT_PAGE ), ( Character'Pos ('G') mod 16#20#, REQ_DEL_WORD ), ( Character'Pos ('H') mod 16#20#, REQ_DEL_PREV ), ( Character'Pos ('I') mod 16#20#, REQ_INS_CHAR ), ( Character'Pos ('K') mod 16#20#, REQ_CLR_EOF ), ( Character'Pos ('L') mod 16#20#, REQ_LEFT_FIELD ), ( Character'Pos ('M') mod 16#20#, REQ_NEW_LINE ), ( Character'Pos ('N') mod 16#20#, REQ_NEXT_FIELD ), ( Character'Pos ('O') mod 16#20#, REQ_INS_LINE ), ( Character'Pos ('P') mod 16#20#, REQ_PREV_FIELD ), ( Character'Pos ('R') mod 16#20#, REQ_RIGHT_FIELD ), ( Character'Pos ('S') mod 16#20#, REQ_BEG_FIELD ), ( Character'Pos ('U') mod 16#20#, REQ_UP_FIELD ), ( Character'Pos ('V') mod 16#20#, REQ_DEL_CHAR ), ( Character'Pos ('W') mod 16#20#, REQ_NEXT_WORD ), ( Character'Pos ('X') mod 16#20#, REQ_CLR_FIELD ), ( Character'Pos ('Y') mod 16#20#, REQ_DEL_LINE ), ( Character'Pos ('Z') mod 16#20#, REQ_PREV_CHOICE ), ( Character'Pos ('[') mod 16#20#, -- ESCAPE Form_Request_Code'Last + 1 ), ( Key_Backspace, REQ_DEL_PREV ), ( KEY_DOWN, REQ_DOWN_CHAR ), ( Key_End, REQ_LAST_FIELD ), ( Key_Home, REQ_FIRST_FIELD ), ( KEY_LEFT, REQ_LEFT_CHAR ), ( KEY_LL, REQ_LAST_FIELD ), ( Key_Next, REQ_NEXT_FIELD ), ( KEY_NPAGE, REQ_NEXT_PAGE ), ( KEY_PPAGE, REQ_PREV_PAGE ), ( Key_Previous, REQ_PREV_FIELD ), ( KEY_RIGHT, REQ_RIGHT_CHAR ), ( KEY_UP, REQ_UP_CHAR ), ( Character'Pos ('Q') mod 16#20#, -- QUIT Form_Request_Code'Last + 1 -- TODO MAX_FORM_COMMAND + 1 ) ); c : Key_Code := Getchar (w); me : constant Field := Current (f); begin if c = Character'Pos (']') mod 16#20# then if mode = REQ_INS_MODE then mode := REQ_OVL_MODE; else mode := REQ_INS_MODE; end if; c := mode; else for n in lookup'Range loop if lookup (n).code = c then c := lookup (n).result; exit; end if; end loop; end if; -- Force the field that the user is typing into to be in reverse video, -- while the other fields are shown underlined. if c <= Key_Max then c := edit_secure (me, c); Set_Background (me, (Reverse_Video => True, others => False)); elsif c <= Form_Request_Code'Last then c := edit_secure (me, c); Set_Background (me, (Under_Line => True, others => False)); end if; return c; end form_virtualize; function my_form_driver (f : Form; c : Key_Code) return Boolean is flag : constant Driver_Result := Driver (f, F_Validate_Field); begin if c = Form_Request_Code'Last + 1 and flag = Form_Ok then return True; else Beep; return False; end if; end my_form_driver; function make_label (frow : Line_Position; fcol : Column_Position; label : String) return Field is f : constant Field := Create (1, label'Length, frow, fcol, 0, 0); o : Field_Option_Set := Get_Options (f); begin if f /= Null_Field then Set_Buffer (f, 0, label); o.Active := False; Set_Options (f, o); end if; return f; end make_label; function make_field (frow : Line_Position; fcol : Column_Position; rows : Line_Count; cols : Column_Count; secure : Boolean) return Field is f : Field; use StringData; len : myptr; begin if secure then f := Create (rows, cols, frow, fcol, 0, 1); else f := Create (rows, cols, frow, fcol, 0, 0); end if; if f /= Null_Field then Set_Background (f, (Under_Line => True, others => False)); len := new Integer; len.all := 0; Set_User_Data (f, len); end if; return f; end make_field; procedure display_form (f : Form) is w : Window; rows : Line_Count; cols : Column_Count; begin Scale (f, rows, cols); w := New_Window (rows + 2, cols + 4, 0, 0); if w /= Null_Window then Set_Window (f, w); Set_Sub_Window (f, Derived_Window (w, rows, cols, 1, 2)); Box (w); -- 0,0 Set_KeyPad_Mode (w, True); end if; -- TODO if Post(f) /= Form_Ok then it's a procedure declare begin Post (f); exception when Eti_System_Error | Eti_Bad_Argument | Eti_Posted | Eti_Connected | Eti_Bad_State | Eti_No_Room | Eti_Not_Posted | Eti_Unknown_Command | Eti_No_Match | Eti_Not_Selectable | Eti_Not_Connected | Eti_Request_Denied | Eti_Invalid_Field | Eti_Current => Refresh (w); end; -- end if; end display_form; procedure erase_form (f : Form) is w : Window := Get_Window (f); s : Window := Get_Sub_Window (f); begin Post (f, False); Erase (w); Refresh (w); Delete (s); Delete (w); end erase_form; finished : Boolean := False; f : constant Field_Array_Access := new Field_Array (1 .. 12); secure : Field; myform : Form; w : Window; c : Key_Code; result : Driver_Result; begin Move_Cursor (Line => 18, Column => 0); Add (Str => "Defined form-traversal keys: ^Q/ESC- exit form"); Add (Ch => newl); Add (Str => "^N -- go to next field ^P -- go to previous field"); Add (Ch => newl); Add (Str => "Home -- go to first field End -- go to last field"); Add (Ch => newl); Add (Str => "^L -- go to field to left ^R -- go to field to right"); Add (Ch => newl); Add (Str => "^U -- move upward to field ^D -- move downward to field"); Add (Ch => newl); Add (Str => "^W -- go to next word ^B -- go to previous word"); Add (Ch => newl); Add (Str => "^S -- go to start of field ^E -- go to end of field"); Add (Ch => newl); Add (Str => "^H -- delete previous char ^Y -- delete line"); Add (Ch => newl); Add (Str => "^G -- delete current word ^C -- clear to end of line"); Add (Ch => newl); Add (Str => "^K -- clear to end of field ^X -- clear field"); Add (Ch => newl); Add (Str => "Arrow keys move within a field as you would expect."); Add (Line => 4, Column => 57, Str => "Forms Entry Test"); Refresh; -- describe the form f.all (1) := make_label (0, 15, "Sample Form"); f.all (2) := make_label (2, 0, "Last Name"); f.all (3) := make_field (3, 0, 1, 18, False); f.all (4) := make_label (2, 20, "First Name"); f.all (5) := make_field (3, 20, 1, 12, False); f.all (6) := make_label (2, 34, "Middle Name"); f.all (7) := make_field (3, 34, 1, 12, False); f.all (8) := make_label (5, 0, "Comments"); f.all (9) := make_field (6, 0, 4, 46, False); f.all (10) := make_label (5, 20, "Password:"); f.all (11) := make_field (5, 30, 1, 9, True); secure := f.all (11); f.all (12) := Null_Field; myform := New_Form (f); display_form (myform); w := Get_Window (myform); Set_Raw_Mode (SwitchOn => True); Set_NL_Mode (SwitchOn => True); -- lets us read ^M's while not finished loop c := form_virtualize (myform, w); result := Driver (myform, c); case result is when Form_Ok => Add (Line => 5, Column => 57, Str => Get_Buffer (secure, 1)); Clear_To_End_Of_Line; Refresh; when Unknown_Request => finished := my_form_driver (myform, c); when others => Beep; end case; end loop; erase_form (myform); -- TODO Free_Form(myform); -- for (c = 0; f[c] != 0; c++) free_field(f[c]); Set_Raw_Mode (SwitchOn => False); Set_NL_Mode (SwitchOn => True); end ncurses2.demo_forms;
reznikmm/matreshka
Ada
6,980
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.Conditional_Text_Elements is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters) return Text_Conditional_Text_Element_Node is begin return Self : Text_Conditional_Text_Element_Node do Matreshka.ODF_Text.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Text_Prefix); end return; end Create; ---------------- -- Enter_Node -- ---------------- overriding procedure Enter_Node (Self : not null access Text_Conditional_Text_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control) is begin if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then ODF.DOM.Visitors.Abstract_ODF_Visitor'Class (Visitor).Enter_Text_Conditional_Text (ODF.DOM.Text_Conditional_Text_Elements.ODF_Text_Conditional_Text_Access (Self), Control); else Matreshka.DOM_Elements.Abstract_Element_Node (Self.all).Enter_Node (Visitor, Control); end if; end Enter_Node; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Text_Conditional_Text_Element_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Conditional_Text_Element; end Get_Local_Name; ---------------- -- Leave_Node -- ---------------- overriding procedure Leave_Node (Self : not null access Text_Conditional_Text_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control) is begin if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then ODF.DOM.Visitors.Abstract_ODF_Visitor'Class (Visitor).Leave_Text_Conditional_Text (ODF.DOM.Text_Conditional_Text_Elements.ODF_Text_Conditional_Text_Access (Self), Control); else Matreshka.DOM_Elements.Abstract_Element_Node (Self.all).Leave_Node (Visitor, Control); end if; end Leave_Node; ---------------- -- Visit_Node -- ---------------- overriding procedure Visit_Node (Self : not null access Text_Conditional_Text_Element_Node; Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control) is begin if Iterator in ODF.DOM.Iterators.Abstract_ODF_Iterator'Class then ODF.DOM.Iterators.Abstract_ODF_Iterator'Class (Iterator).Visit_Text_Conditional_Text (Visitor, ODF.DOM.Text_Conditional_Text_Elements.ODF_Text_Conditional_Text_Access (Self), Control); else Matreshka.DOM_Elements.Abstract_Element_Node (Self.all).Visit_Node (Iterator, Visitor, Control); end if; end Visit_Node; begin Matreshka.DOM_Documents.Register_Element (Matreshka.ODF_String_Constants.Text_URI, Matreshka.ODF_String_Constants.Conditional_Text_Element, Text_Conditional_Text_Element_Node'Tag); end Matreshka.ODF_Text.Conditional_Text_Elements;
reznikmm/matreshka
Ada
5,262
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Generic_Collections; package AMF.UML.Duration_Constraints.Collections is pragma Preelaborate; package UML_Duration_Constraint_Collections is new AMF.Generic_Collections (UML_Duration_Constraint, UML_Duration_Constraint_Access); type Set_Of_UML_Duration_Constraint is new UML_Duration_Constraint_Collections.Set with null record; Empty_Set_Of_UML_Duration_Constraint : constant Set_Of_UML_Duration_Constraint; type Ordered_Set_Of_UML_Duration_Constraint is new UML_Duration_Constraint_Collections.Ordered_Set with null record; Empty_Ordered_Set_Of_UML_Duration_Constraint : constant Ordered_Set_Of_UML_Duration_Constraint; type Bag_Of_UML_Duration_Constraint is new UML_Duration_Constraint_Collections.Bag with null record; Empty_Bag_Of_UML_Duration_Constraint : constant Bag_Of_UML_Duration_Constraint; type Sequence_Of_UML_Duration_Constraint is new UML_Duration_Constraint_Collections.Sequence with null record; Empty_Sequence_Of_UML_Duration_Constraint : constant Sequence_Of_UML_Duration_Constraint; private Empty_Set_Of_UML_Duration_Constraint : constant Set_Of_UML_Duration_Constraint := (UML_Duration_Constraint_Collections.Set with null record); Empty_Ordered_Set_Of_UML_Duration_Constraint : constant Ordered_Set_Of_UML_Duration_Constraint := (UML_Duration_Constraint_Collections.Ordered_Set with null record); Empty_Bag_Of_UML_Duration_Constraint : constant Bag_Of_UML_Duration_Constraint := (UML_Duration_Constraint_Collections.Bag with null record); Empty_Sequence_Of_UML_Duration_Constraint : constant Sequence_Of_UML_Duration_Constraint := (UML_Duration_Constraint_Collections.Sequence with null record); end AMF.UML.Duration_Constraints.Collections;
Salvatore-tech/Sistemas-de-Tiempo-Real
Ada
26,624
ads
pragma Warnings (Off); pragma Ada_95; with System; with System.Parameters; with System.Secondary_Stack; package ada_main is gnat_argc : Integer; gnat_argv : System.Address; gnat_envp : System.Address; pragma Import (C, gnat_argc); pragma Import (C, gnat_argv); pragma Import (C, gnat_envp); gnat_exit_status : Integer; pragma Import (C, gnat_exit_status); GNAT_Version : constant String := "GNAT Version: Community 2020 (20200818-93)" & ASCII.NUL; pragma Export (C, GNAT_Version, "__gnat_version"); Ada_Main_Program_Name : constant String := "_ada_main" & ASCII.NUL; pragma Export (C, Ada_Main_Program_Name, "__gnat_ada_main_program_name"); procedure adainit; pragma Export (C, adainit, "adainit"); procedure adafinal; pragma Export (C, adafinal, "adafinal"); function main (argc : Integer; argv : System.Address; envp : System.Address) return Integer; pragma Export (C, main, "main"); type Version_32 is mod 2 ** 32; u00001 : constant Version_32 := 16#46db03c7#; pragma Export (C, u00001, "mainB"); u00002 : constant Version_32 := 16#67c8d842#; pragma Export (C, u00002, "system__standard_libraryB"); u00003 : constant Version_32 := 16#5741b5a5#; pragma Export (C, u00003, "system__standard_libraryS"); u00004 : constant Version_32 := 16#76789da1#; pragma Export (C, u00004, "adaS"); u00005 : constant Version_32 := 16#e18a47a0#; pragma Export (C, u00005, "ada__float_text_ioB"); u00006 : constant Version_32 := 16#39060f6c#; pragma Export (C, u00006, "ada__float_text_ioS"); u00007 : constant Version_32 := 16#f34ff985#; pragma Export (C, u00007, "ada__exceptionsB"); u00008 : constant Version_32 := 16#cfbb5cc5#; pragma Export (C, u00008, "ada__exceptionsS"); u00009 : constant Version_32 := 16#35e1815f#; pragma Export (C, u00009, "ada__exceptions__last_chance_handlerB"); u00010 : constant Version_32 := 16#cfec26ee#; pragma Export (C, u00010, "ada__exceptions__last_chance_handlerS"); u00011 : constant Version_32 := 16#32a08138#; pragma Export (C, u00011, "systemS"); u00012 : constant Version_32 := 16#ae860117#; pragma Export (C, u00012, "system__soft_linksB"); u00013 : constant Version_32 := 16#4d9536d3#; pragma Export (C, u00013, "system__soft_linksS"); u00014 : constant Version_32 := 16#59d61025#; pragma Export (C, u00014, "system__secondary_stackB"); u00015 : constant Version_32 := 16#c30bb6bc#; pragma Export (C, u00015, "system__secondary_stackS"); u00016 : constant Version_32 := 16#896564a3#; pragma Export (C, u00016, "system__parametersB"); u00017 : constant Version_32 := 16#75f245f3#; pragma Export (C, u00017, "system__parametersS"); u00018 : constant Version_32 := 16#ced09590#; pragma Export (C, u00018, "system__storage_elementsB"); u00019 : constant Version_32 := 16#1f63cb3c#; pragma Export (C, u00019, "system__storage_elementsS"); u00020 : constant Version_32 := 16#ce3e0e21#; pragma Export (C, u00020, "system__soft_links__initializeB"); u00021 : constant Version_32 := 16#5697fc2b#; pragma Export (C, u00021, "system__soft_links__initializeS"); u00022 : constant Version_32 := 16#41837d1e#; pragma Export (C, u00022, "system__stack_checkingB"); u00023 : constant Version_32 := 16#bc1fead0#; pragma Export (C, u00023, "system__stack_checkingS"); u00024 : constant Version_32 := 16#34742901#; pragma Export (C, u00024, "system__exception_tableB"); u00025 : constant Version_32 := 16#0dc9c2c8#; pragma Export (C, u00025, "system__exception_tableS"); u00026 : constant Version_32 := 16#ce4af020#; pragma Export (C, u00026, "system__exceptionsB"); u00027 : constant Version_32 := 16#5ac3ecce#; pragma Export (C, u00027, "system__exceptionsS"); u00028 : constant Version_32 := 16#69416224#; pragma Export (C, u00028, "system__exceptions__machineB"); u00029 : constant Version_32 := 16#5c74e542#; pragma Export (C, u00029, "system__exceptions__machineS"); u00030 : constant Version_32 := 16#aa0563fc#; pragma Export (C, u00030, "system__exceptions_debugB"); u00031 : constant Version_32 := 16#2eed524e#; pragma Export (C, u00031, "system__exceptions_debugS"); u00032 : constant Version_32 := 16#6c2f8802#; pragma Export (C, u00032, "system__img_intB"); u00033 : constant Version_32 := 16#307b61fa#; pragma Export (C, u00033, "system__img_intS"); u00034 : constant Version_32 := 16#39df8c17#; pragma Export (C, u00034, "system__tracebackB"); u00035 : constant Version_32 := 16#6c825ffc#; pragma Export (C, u00035, "system__tracebackS"); u00036 : constant Version_32 := 16#9ed49525#; pragma Export (C, u00036, "system__traceback_entriesB"); u00037 : constant Version_32 := 16#32fb7748#; pragma Export (C, u00037, "system__traceback_entriesS"); u00038 : constant Version_32 := 16#3f39e75e#; pragma Export (C, u00038, "system__traceback__symbolicB"); u00039 : constant Version_32 := 16#46491211#; pragma Export (C, u00039, "system__traceback__symbolicS"); u00040 : constant Version_32 := 16#179d7d28#; pragma Export (C, u00040, "ada__containersS"); u00041 : constant Version_32 := 16#701f9d88#; pragma Export (C, u00041, "ada__exceptions__tracebackB"); u00042 : constant Version_32 := 16#ae2d2db5#; pragma Export (C, u00042, "ada__exceptions__tracebackS"); u00043 : constant Version_32 := 16#e865e681#; pragma Export (C, u00043, "system__bounded_stringsB"); u00044 : constant Version_32 := 16#455da021#; pragma Export (C, u00044, "system__bounded_stringsS"); u00045 : constant Version_32 := 16#7b499e82#; pragma Export (C, u00045, "system__crtlS"); u00046 : constant Version_32 := 16#641e2245#; pragma Export (C, u00046, "system__dwarf_linesB"); u00047 : constant Version_32 := 16#40ce1ea3#; pragma Export (C, u00047, "system__dwarf_linesS"); u00048 : constant Version_32 := 16#5b4659fa#; pragma Export (C, u00048, "ada__charactersS"); u00049 : constant Version_32 := 16#8f637df8#; pragma Export (C, u00049, "ada__characters__handlingB"); u00050 : constant Version_32 := 16#3b3f6154#; pragma Export (C, u00050, "ada__characters__handlingS"); u00051 : constant Version_32 := 16#4b7bb96a#; pragma Export (C, u00051, "ada__characters__latin_1S"); u00052 : constant Version_32 := 16#e6d4fa36#; pragma Export (C, u00052, "ada__stringsS"); u00053 : constant Version_32 := 16#96df1a3f#; pragma Export (C, u00053, "ada__strings__mapsB"); u00054 : constant Version_32 := 16#1e526bec#; pragma Export (C, u00054, "ada__strings__mapsS"); u00055 : constant Version_32 := 16#465aa89c#; pragma Export (C, u00055, "system__bit_opsB"); u00056 : constant Version_32 := 16#0765e3a3#; pragma Export (C, u00056, "system__bit_opsS"); u00057 : constant Version_32 := 16#6c6ff32a#; pragma Export (C, u00057, "system__unsigned_typesS"); u00058 : constant Version_32 := 16#92f05f13#; pragma Export (C, u00058, "ada__strings__maps__constantsS"); u00059 : constant Version_32 := 16#5ab55268#; pragma Export (C, u00059, "interfacesS"); u00060 : constant Version_32 := 16#a0d3d22b#; pragma Export (C, u00060, "system__address_imageB"); u00061 : constant Version_32 := 16#934c1c02#; pragma Export (C, u00061, "system__address_imageS"); u00062 : constant Version_32 := 16#8631cc2e#; pragma Export (C, u00062, "system__img_unsB"); u00063 : constant Version_32 := 16#f39bcfdd#; pragma Export (C, u00063, "system__img_unsS"); u00064 : constant Version_32 := 16#20ec7aa3#; pragma Export (C, u00064, "system__ioB"); u00065 : constant Version_32 := 16#ace27677#; pragma Export (C, u00065, "system__ioS"); u00066 : constant Version_32 := 16#3080f2ca#; pragma Export (C, u00066, "system__mmapB"); u00067 : constant Version_32 := 16#9ad4d587#; pragma Export (C, u00067, "system__mmapS"); u00068 : constant Version_32 := 16#92d882c5#; pragma Export (C, u00068, "ada__io_exceptionsS"); u00069 : constant Version_32 := 16#a8ba7b3b#; pragma Export (C, u00069, "system__mmap__os_interfaceB"); u00070 : constant Version_32 := 16#8f4541b8#; pragma Export (C, u00070, "system__mmap__os_interfaceS"); u00071 : constant Version_32 := 16#657efc5a#; pragma Export (C, u00071, "system__os_libB"); u00072 : constant Version_32 := 16#d872da39#; pragma Export (C, u00072, "system__os_libS"); u00073 : constant Version_32 := 16#ec4d5631#; pragma Export (C, u00073, "system__case_utilB"); u00074 : constant Version_32 := 16#0d75376c#; pragma Export (C, u00074, "system__case_utilS"); u00075 : constant Version_32 := 16#2a8e89ad#; pragma Export (C, u00075, "system__stringsB"); u00076 : constant Version_32 := 16#52b6adad#; pragma Export (C, u00076, "system__stringsS"); u00077 : constant Version_32 := 16#e49bce3e#; pragma Export (C, u00077, "interfaces__cB"); u00078 : constant Version_32 := 16#dbc36ce0#; pragma Export (C, u00078, "interfaces__cS"); u00079 : constant Version_32 := 16#c83ab8ef#; pragma Export (C, u00079, "system__object_readerB"); u00080 : constant Version_32 := 16#f6d45c39#; pragma Export (C, u00080, "system__object_readerS"); u00081 : constant Version_32 := 16#914b0305#; pragma Export (C, u00081, "system__val_lliB"); u00082 : constant Version_32 := 16#5ece13c8#; pragma Export (C, u00082, "system__val_lliS"); u00083 : constant Version_32 := 16#d2ae2792#; pragma Export (C, u00083, "system__val_lluB"); u00084 : constant Version_32 := 16#01a17ec8#; pragma Export (C, u00084, "system__val_lluS"); u00085 : constant Version_32 := 16#269742a9#; pragma Export (C, u00085, "system__val_utilB"); u00086 : constant Version_32 := 16#9e0037c6#; pragma Export (C, u00086, "system__val_utilS"); u00087 : constant Version_32 := 16#b578159b#; pragma Export (C, u00087, "system__exception_tracesB"); u00088 : constant Version_32 := 16#167fa1a2#; pragma Export (C, u00088, "system__exception_tracesS"); u00089 : constant Version_32 := 16#e1282880#; pragma Export (C, u00089, "system__win32S"); u00090 : constant Version_32 := 16#8c33a517#; pragma Export (C, u00090, "system__wch_conB"); u00091 : constant Version_32 := 16#29dda3ea#; pragma Export (C, u00091, "system__wch_conS"); u00092 : constant Version_32 := 16#9721e840#; pragma Export (C, u00092, "system__wch_stwB"); u00093 : constant Version_32 := 16#04cc8feb#; pragma Export (C, u00093, "system__wch_stwS"); u00094 : constant Version_32 := 16#a831679c#; pragma Export (C, u00094, "system__wch_cnvB"); u00095 : constant Version_32 := 16#266a1919#; pragma Export (C, u00095, "system__wch_cnvS"); u00096 : constant Version_32 := 16#ece6fdb6#; pragma Export (C, u00096, "system__wch_jisB"); u00097 : constant Version_32 := 16#a61a0038#; pragma Export (C, u00097, "system__wch_jisS"); u00098 : constant Version_32 := 16#f4e097a7#; pragma Export (C, u00098, "ada__text_ioB"); u00099 : constant Version_32 := 16#03e83e15#; pragma Export (C, u00099, "ada__text_ioS"); u00100 : constant Version_32 := 16#10558b11#; pragma Export (C, u00100, "ada__streamsB"); u00101 : constant Version_32 := 16#67e31212#; pragma Export (C, u00101, "ada__streamsS"); u00102 : constant Version_32 := 16#f9576a72#; pragma Export (C, u00102, "ada__tagsB"); u00103 : constant Version_32 := 16#b6661f55#; pragma Export (C, u00103, "ada__tagsS"); u00104 : constant Version_32 := 16#796f31f1#; pragma Export (C, u00104, "system__htableB"); u00105 : constant Version_32 := 16#b66232d2#; pragma Export (C, u00105, "system__htableS"); u00106 : constant Version_32 := 16#089f5cd0#; pragma Export (C, u00106, "system__string_hashB"); u00107 : constant Version_32 := 16#143c59ac#; pragma Export (C, u00107, "system__string_hashS"); u00108 : constant Version_32 := 16#73d2d764#; pragma Export (C, u00108, "interfaces__c_streamsB"); u00109 : constant Version_32 := 16#b1330297#; pragma Export (C, u00109, "interfaces__c_streamsS"); u00110 : constant Version_32 := 16#ec9c64c3#; pragma Export (C, u00110, "system__file_ioB"); u00111 : constant Version_32 := 16#95d1605d#; pragma Export (C, u00111, "system__file_ioS"); u00112 : constant Version_32 := 16#86c56e5a#; pragma Export (C, u00112, "ada__finalizationS"); u00113 : constant Version_32 := 16#95817ed8#; pragma Export (C, u00113, "system__finalization_rootB"); u00114 : constant Version_32 := 16#7d52f2a8#; pragma Export (C, u00114, "system__finalization_rootS"); u00115 : constant Version_32 := 16#cf3f1b90#; pragma Export (C, u00115, "system__file_control_blockS"); u00116 : constant Version_32 := 16#4c77a326#; pragma Export (C, u00116, "ada__text_io__float_auxB"); u00117 : constant Version_32 := 16#6ecdea4c#; pragma Export (C, u00117, "ada__text_io__float_auxS"); u00118 : constant Version_32 := 16#181dc502#; pragma Export (C, u00118, "ada__text_io__generic_auxB"); u00119 : constant Version_32 := 16#305a076a#; pragma Export (C, u00119, "ada__text_io__generic_auxS"); u00120 : constant Version_32 := 16#8f828546#; pragma Export (C, u00120, "system__img_realB"); u00121 : constant Version_32 := 16#ad3b16aa#; pragma Export (C, u00121, "system__img_realS"); u00122 : constant Version_32 := 16#36373acb#; pragma Export (C, u00122, "system__fat_llfS"); u00123 : constant Version_32 := 16#1b28662b#; pragma Export (C, u00123, "system__float_controlB"); u00124 : constant Version_32 := 16#d25cc204#; pragma Export (C, u00124, "system__float_controlS"); u00125 : constant Version_32 := 16#54da27e6#; pragma Export (C, u00125, "system__img_lluB"); u00126 : constant Version_32 := 16#25a6f3e9#; pragma Export (C, u00126, "system__img_lluS"); u00127 : constant Version_32 := 16#62d0e74f#; pragma Export (C, u00127, "system__powten_tableS"); u00128 : constant Version_32 := 16#406460f1#; pragma Export (C, u00128, "system__val_realB"); u00129 : constant Version_32 := 16#3cdf6ded#; pragma Export (C, u00129, "system__val_realS"); u00130 : constant Version_32 := 16#b2a569d2#; pragma Export (C, u00130, "system__exn_llfB"); u00131 : constant Version_32 := 16#8ede3ae4#; pragma Export (C, u00131, "system__exn_llfS"); u00132 : constant Version_32 := 16#6ad59d2c#; pragma Export (C, u00132, "system__fat_fltS"); u00133 : constant Version_32 := 16#f64b89a4#; pragma Export (C, u00133, "ada__integer_text_ioB"); u00134 : constant Version_32 := 16#2ec7c168#; pragma Export (C, u00134, "ada__integer_text_ioS"); u00135 : constant Version_32 := 16#fdedfd10#; pragma Export (C, u00135, "ada__text_io__integer_auxB"); u00136 : constant Version_32 := 16#2fe01d89#; pragma Export (C, u00136, "ada__text_io__integer_auxS"); u00137 : constant Version_32 := 16#db42ae56#; pragma Export (C, u00137, "system__img_biuB"); u00138 : constant Version_32 := 16#aa4d7b67#; pragma Export (C, u00138, "system__img_biuS"); u00139 : constant Version_32 := 16#244fa59d#; pragma Export (C, u00139, "system__img_llbB"); u00140 : constant Version_32 := 16#eb8a6b99#; pragma Export (C, u00140, "system__img_llbS"); u00141 : constant Version_32 := 16#9dca6636#; pragma Export (C, u00141, "system__img_lliB"); u00142 : constant Version_32 := 16#23efd4e9#; pragma Export (C, u00142, "system__img_lliS"); u00143 : constant Version_32 := 16#cd1fde06#; pragma Export (C, u00143, "system__img_llwB"); u00144 : constant Version_32 := 16#42e6480f#; pragma Export (C, u00144, "system__img_llwS"); u00145 : constant Version_32 := 16#811cd12a#; pragma Export (C, u00145, "system__img_wiuB"); u00146 : constant Version_32 := 16#c40cfcf5#; pragma Export (C, u00146, "system__img_wiuS"); u00147 : constant Version_32 := 16#65de8d35#; pragma Export (C, u00147, "system__val_intB"); u00148 : constant Version_32 := 16#875fe85b#; pragma Export (C, u00148, "system__val_intS"); u00149 : constant Version_32 := 16#5276dcb7#; pragma Export (C, u00149, "system__val_unsB"); u00150 : constant Version_32 := 16#59698e93#; pragma Export (C, u00150, "system__val_unsS"); u00151 : constant Version_32 := 16#553ad4ac#; pragma Export (C, u00151, "ada__real_timeB"); u00152 : constant Version_32 := 16#1ad7dfc0#; pragma Export (C, u00152, "ada__real_timeS"); u00153 : constant Version_32 := 16#0d140719#; pragma Export (C, u00153, "system__taskingB"); u00154 : constant Version_32 := 16#c6674d66#; pragma Export (C, u00154, "system__taskingS"); u00155 : constant Version_32 := 16#dc410cef#; pragma Export (C, u00155, "system__task_primitivesS"); u00156 : constant Version_32 := 16#4cfe4fc8#; pragma Export (C, u00156, "system__os_interfaceS"); u00157 : constant Version_32 := 16#1d638357#; pragma Export (C, u00157, "interfaces__c__stringsB"); u00158 : constant Version_32 := 16#f239f79c#; pragma Export (C, u00158, "interfaces__c__stringsS"); u00159 : constant Version_32 := 16#152ee045#; pragma Export (C, u00159, "system__task_primitives__operationsB"); u00160 : constant Version_32 := 16#5a0b0d58#; pragma Export (C, u00160, "system__task_primitives__operationsS"); u00161 : constant Version_32 := 16#6387a759#; pragma Export (C, u00161, "system__interrupt_managementB"); u00162 : constant Version_32 := 16#246e2885#; pragma Export (C, u00162, "system__interrupt_managementS"); u00163 : constant Version_32 := 16#64507e17#; pragma Export (C, u00163, "system__multiprocessorsB"); u00164 : constant Version_32 := 16#0a0c1e4b#; pragma Export (C, u00164, "system__multiprocessorsS"); u00165 : constant Version_32 := 16#24ec69e6#; pragma Export (C, u00165, "system__os_primitivesB"); u00166 : constant Version_32 := 16#355de4ce#; pragma Export (C, u00166, "system__os_primitivesS"); u00167 : constant Version_32 := 16#05c60a38#; pragma Export (C, u00167, "system__task_lockB"); u00168 : constant Version_32 := 16#532ab656#; pragma Export (C, u00168, "system__task_lockS"); u00169 : constant Version_32 := 16#b8c476a4#; pragma Export (C, u00169, "system__win32__extS"); u00170 : constant Version_32 := 16#ce7dfb56#; pragma Export (C, u00170, "system__task_infoB"); u00171 : constant Version_32 := 16#4713b9b1#; pragma Export (C, u00171, "system__task_infoS"); u00172 : constant Version_32 := 16#1bbc5086#; pragma Export (C, u00172, "system__tasking__debugB"); u00173 : constant Version_32 := 16#48f9280e#; pragma Export (C, u00173, "system__tasking__debugS"); u00174 : constant Version_32 := 16#fd83e873#; pragma Export (C, u00174, "system__concat_2B"); u00175 : constant Version_32 := 16#300056e8#; pragma Export (C, u00175, "system__concat_2S"); u00176 : constant Version_32 := 16#2b70b149#; pragma Export (C, u00176, "system__concat_3B"); u00177 : constant Version_32 := 16#39d0dd9d#; pragma Export (C, u00177, "system__concat_3S"); u00178 : constant Version_32 := 16#b31a5821#; pragma Export (C, u00178, "system__img_enum_newB"); u00179 : constant Version_32 := 16#53ec87f8#; pragma Export (C, u00179, "system__img_enum_newS"); u00180 : constant Version_32 := 16#617d5887#; pragma Export (C, u00180, "system__stack_usageB"); u00181 : constant Version_32 := 16#3a3ac346#; pragma Export (C, u00181, "system__stack_usageS"); u00182 : constant Version_32 := 16#dfe9469b#; pragma Export (C, u00182, "formula_strB"); u00183 : constant Version_32 := 16#c607493a#; pragma Export (C, u00183, "formula_strS"); u00184 : constant Version_32 := 16#78cb869e#; pragma Export (C, u00184, "system__concat_9B"); u00185 : constant Version_32 := 16#eeeab51c#; pragma Export (C, u00185, "system__concat_9S"); u00186 : constant Version_32 := 16#46b1f5ea#; pragma Export (C, u00186, "system__concat_8B"); u00187 : constant Version_32 := 16#d1a7ccef#; pragma Export (C, u00187, "system__concat_8S"); u00188 : constant Version_32 := 16#46899fd1#; pragma Export (C, u00188, "system__concat_7B"); u00189 : constant Version_32 := 16#ce67da27#; pragma Export (C, u00189, "system__concat_7S"); u00190 : constant Version_32 := 16#a83b7c85#; pragma Export (C, u00190, "system__concat_6B"); u00191 : constant Version_32 := 16#e067ac8a#; pragma Export (C, u00191, "system__concat_6S"); u00192 : constant Version_32 := 16#608e2cd1#; pragma Export (C, u00192, "system__concat_5B"); u00193 : constant Version_32 := 16#b5fec216#; pragma Export (C, u00193, "system__concat_5S"); u00194 : constant Version_32 := 16#932a4690#; pragma Export (C, u00194, "system__concat_4B"); u00195 : constant Version_32 := 16#4cc4aa18#; pragma Export (C, u00195, "system__concat_4S"); u00196 : constant Version_32 := 16#eca5ecae#; pragma Export (C, u00196, "system__memoryB"); u00197 : constant Version_32 := 16#6bdde70c#; pragma Export (C, u00197, "system__memoryS"); -- BEGIN ELABORATION ORDER -- ada%s -- ada.characters%s -- ada.characters.latin_1%s -- interfaces%s -- system%s -- system.exn_llf%s -- system.exn_llf%b -- system.float_control%s -- system.float_control%b -- system.img_enum_new%s -- system.img_enum_new%b -- system.img_int%s -- system.img_int%b -- system.img_lli%s -- system.img_lli%b -- system.io%s -- system.io%b -- system.parameters%s -- system.parameters%b -- system.crtl%s -- interfaces.c_streams%s -- interfaces.c_streams%b -- system.powten_table%s -- system.storage_elements%s -- system.storage_elements%b -- system.stack_checking%s -- system.stack_checking%b -- system.stack_usage%s -- system.stack_usage%b -- system.string_hash%s -- system.string_hash%b -- system.htable%s -- system.htable%b -- system.strings%s -- system.strings%b -- system.traceback_entries%s -- system.traceback_entries%b -- system.unsigned_types%s -- system.img_biu%s -- system.img_biu%b -- system.img_llb%s -- system.img_llb%b -- system.img_llu%s -- system.img_llu%b -- system.img_llw%s -- system.img_llw%b -- system.img_uns%s -- system.img_uns%b -- system.img_wiu%s -- system.img_wiu%b -- system.wch_con%s -- system.wch_con%b -- system.wch_jis%s -- system.wch_jis%b -- system.wch_cnv%s -- system.wch_cnv%b -- system.concat_2%s -- system.concat_2%b -- system.concat_3%s -- system.concat_3%b -- system.concat_4%s -- system.concat_4%b -- system.concat_5%s -- system.concat_5%b -- system.concat_6%s -- system.concat_6%b -- system.concat_7%s -- system.concat_7%b -- system.concat_8%s -- system.concat_8%b -- system.concat_9%s -- system.concat_9%b -- system.traceback%s -- system.traceback%b -- ada.characters.handling%s -- system.case_util%s -- system.os_lib%s -- system.secondary_stack%s -- system.standard_library%s -- ada.exceptions%s -- system.exceptions_debug%s -- system.exceptions_debug%b -- system.soft_links%s -- system.val_lli%s -- system.val_llu%s -- system.val_util%s -- system.val_util%b -- system.wch_stw%s -- system.wch_stw%b -- ada.exceptions.last_chance_handler%s -- ada.exceptions.last_chance_handler%b -- ada.exceptions.traceback%s -- ada.exceptions.traceback%b -- system.address_image%s -- system.address_image%b -- system.bit_ops%s -- system.bit_ops%b -- system.bounded_strings%s -- system.bounded_strings%b -- system.case_util%b -- system.exception_table%s -- system.exception_table%b -- ada.containers%s -- ada.io_exceptions%s -- ada.strings%s -- ada.strings.maps%s -- ada.strings.maps%b -- ada.strings.maps.constants%s -- interfaces.c%s -- interfaces.c%b -- system.exceptions%s -- system.exceptions%b -- system.exceptions.machine%s -- system.exceptions.machine%b -- system.win32%s -- ada.characters.handling%b -- system.exception_traces%s -- system.exception_traces%b -- system.memory%s -- system.memory%b -- system.mmap%s -- system.mmap.os_interface%s -- system.mmap.os_interface%b -- system.mmap%b -- system.object_reader%s -- system.object_reader%b -- system.dwarf_lines%s -- system.dwarf_lines%b -- system.os_lib%b -- system.secondary_stack%b -- system.soft_links.initialize%s -- system.soft_links.initialize%b -- system.soft_links%b -- system.standard_library%b -- system.traceback.symbolic%s -- system.traceback.symbolic%b -- ada.exceptions%b -- system.val_lli%b -- system.val_llu%b -- ada.tags%s -- ada.tags%b -- ada.streams%s -- ada.streams%b -- interfaces.c.strings%s -- interfaces.c.strings%b -- system.fat_flt%s -- system.fat_llf%s -- system.file_control_block%s -- system.finalization_root%s -- system.finalization_root%b -- ada.finalization%s -- system.file_io%s -- system.file_io%b -- system.img_real%s -- system.img_real%b -- system.multiprocessors%s -- system.multiprocessors%b -- system.os_interface%s -- system.interrupt_management%s -- system.interrupt_management%b -- system.task_info%s -- system.task_info%b -- system.task_lock%s -- system.task_lock%b -- system.task_primitives%s -- system.val_real%s -- system.val_real%b -- system.val_uns%s -- system.val_uns%b -- system.val_int%s -- system.val_int%b -- system.win32.ext%s -- system.os_primitives%s -- system.os_primitives%b -- system.tasking%s -- system.task_primitives.operations%s -- system.tasking.debug%s -- system.tasking.debug%b -- system.task_primitives.operations%b -- system.tasking%b -- ada.real_time%s -- ada.real_time%b -- ada.text_io%s -- ada.text_io%b -- ada.text_io.generic_aux%s -- ada.text_io.generic_aux%b -- ada.text_io.float_aux%s -- ada.text_io.float_aux%b -- ada.float_text_io%s -- ada.float_text_io%b -- ada.text_io.integer_aux%s -- ada.text_io.integer_aux%b -- ada.integer_text_io%s -- ada.integer_text_io%b -- formula_str%s -- formula_str%b -- main%b -- END ELABORATION ORDER end ada_main;
Hamster-Furtif/JeremyPlusPlus
Ada
1,005
ads
with utils, ada.text_io, ada.Float_Text_IO, ada.Integer_Text_IO; use utils, ada.text_io, ada.Float_Text_IO, ada.Integer_Text_IO; package montecarlo is --E/ cards : T_set --E/S/ sample : T_set --Necessite : Table ne contient pas plus de 5 cartes --Entraine : Genere 50 000 jeux en completant le jeu existant (donne par -- la main et les cartes communes revelees) avec des cartes aleatoires function initSample(sample : in out T_Set; hand : in T_set; table : in T_set) return Integer; --E/ hand, table : T_set --Necessite : hand contient 2 cartes et table contient 1 a 4 cartes --S/ chance de gain : float --Entraine : Calcule la porbabilte de gagner avec la methode de Monte Carlo function chancesOfWinning(hand : T_set; table : T_set) return float; --E/ max : integer --Necessite : none --S/ card : T_carte --Entraine : Renvoie une carte aleatoire function randomCard(max : in Integer) return T_card; end montecarlo;
onox/orka
Ada
1,346
ads
-- SPDX-License-Identifier: Apache-2.0 -- -- Copyright (c) 2021 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. private package AWT.Inputs.Gamepads.Mappings is pragma Preelaborate; type Platform_Kind is (Linux, Windows, Mac_OS_X, iOS, Android); procedure Set_Mappings (Platform : Platform_Kind; Text : String); function Contains (GUID : GUID_String) return Boolean; function Get (GUID : GUID_String) return String; type Mapping_Kind is (Axis_Mapping, Button_Mapping, Hat_Mapping); function Parse_Mapping (Line : String; Set_Mapping : not null access procedure (Kind : Mapping_Kind; Input_Map : Input_Mapping; Output_Map : Output_Mapping; Name : String)) return String; end AWT.Inputs.Gamepads.Mappings;
reznikmm/matreshka
Ada
4,091
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with ODF.DOM.Table_Paragraph_Style_Name_Attributes; package Matreshka.ODF_Table.Paragraph_Style_Name_Attributes is type Table_Paragraph_Style_Name_Attribute_Node is new Matreshka.ODF_Table.Abstract_Table_Attribute_Node and ODF.DOM.Table_Paragraph_Style_Name_Attributes.ODF_Table_Paragraph_Style_Name_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Table_Paragraph_Style_Name_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Table_Paragraph_Style_Name_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Table.Paragraph_Style_Name_Attributes;
AdaCore/spat
Ada
2,128
ads
------------------------------------------------------------------------------ -- Copyright (C) 2020 by Heisenbug Ltd. ([email protected]) -- -- This work is free. You can redistribute it and/or modify it under the -- terms of the Do What The Fuck You Want To Public License, Version 2, -- as published by Sam Hocevar. See the LICENSE file for more details. ------------------------------------------------------------------------------ pragma License (Unrestricted); ------------------------------------------------------------------------------ -- -- SPARK Proof Analysis Tool -- -- S.P.A.T. - Provide atomic ids (counters) to facilitate stable sorting. -- Each instantiation provides its own local counter. -- ------------------------------------------------------------------------------ with GNATCOLL.Atomic; generic package SPAT.Unique_Ids is -- Sometimes entries are identical which makes sorting unstable. To -- counter the issue we add a unique id to each entry which serves as a -- last ditch sorting criterion, making two entries always distinct. -- CAREFUL: This approach only works if the order of elements being -- inserted does not change between runs (I'm thinking further -- parallelization here). But to make sure this works in a -- tasking context anyway we use atomic increments to generate -- our ids. -- Luckily GNATCOLL already serves us, so we don't need to wrap -- it into our own protected type (inefficient) or revert to -- compiler/target specific intrinsics. subtype Id is GNATCOLL.Atomic.Atomic_Counter; -- Our id type. -------------------------------------------------------------------------- -- Next -- -- Returns the next available id. -- Id is a modular type, so it wraps around instead of overflow, but we -- should never be able to exhaust an Id's range, anyway. -------------------------------------------------------------------------- function Next return Id with Volatile_Function => True; end SPAT.Unique_Ids;