max_stars_repo_path
stringlengths 4
261
| max_stars_repo_name
stringlengths 6
106
| max_stars_count
int64 0
38.8k
| id
stringlengths 1
6
| text
stringlengths 7
1.05M
|
---|---|---|---|---|
assemblyCode/testStack.asm
|
lschiavini/Hypothetical-Assembler-Loader
| 0 |
15561
|
; Hello World Program (Subroutines)
; Compile with: nasm -f elf helloworld-len.asm
; Link with (64 bit systems require elf_i386 option): ld -m elf_i386 helloworld-len.o -o helloworld-len
; Run with: ./helloworld-len
global _start
section .data
msg db 'MASSACRATION', 0dH, 0ah ;0dH + 0ah eh CR+LF
section .text
_start:
mov eax, msg ; move the address of our message string into EAX
call strlen ; call our function to calculate the length of the string
mov edx, eax; our function leaves the result in EAX
mov ecx, msg ; this is all the same as before
mov ebx, 1
mov eax, 4
int 80h
mov ebx, 0
mov eax, 1
int 80h
strlen: ; this is our first function declaration
push ebx ; push the value in EBX onto the stack to preserve it while we use EBX in this function
mov ebx, eax ; move the address in EAX into EBX (Both point to the same segment in memory)
nextchar:
cmp byte[eax], 0
push eax
jz finished
inc eax
jmp nextchar
finished:
sub eax, ebx
pop ebx
ret
|
gcc-gcc-7_3_0-release/gcc/ada/lib-xref-spark_specific.adb
|
best08618/asylo
| 7 |
15353
|
<filename>gcc-gcc-7_3_0-release/gcc/ada/lib-xref-spark_specific.adb
------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- L I B . X R E F . S P A R K _ S P E C I F I C --
-- --
-- B o d y --
-- --
-- Copyright (C) 2011-2016, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License --
-- for more details. You should have received a copy of the GNU General --
-- Public License distributed with GNAT; see file COPYING3. If not, go to --
-- http://www.gnu.org/licenses for a complete copy of the license. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Einfo; use Einfo;
with Nmake; use Nmake;
with SPARK_Xrefs; use SPARK_Xrefs;
with GNAT.HTable;
separate (Lib.Xref)
package body SPARK_Specific is
---------------------
-- Local Constants --
---------------------
-- Table of SPARK_Entities, True for each entity kind used in SPARK
SPARK_Entities : constant array (Entity_Kind) of Boolean :=
(E_Constant => True,
E_Entry => True,
E_Function => True,
E_In_Out_Parameter => True,
E_In_Parameter => True,
E_Loop_Parameter => True,
E_Operator => True,
E_Out_Parameter => True,
E_Procedure => True,
E_Variable => True,
others => False);
-- True for each reference type used in SPARK
SPARK_References : constant array (Character) of Boolean :=
('m' => True,
'r' => True,
's' => True,
others => False);
type Entity_Hashed_Range is range 0 .. 255;
-- Size of hash table headers
---------------------
-- Local Variables --
---------------------
Heap : Entity_Id := Empty;
-- A special entity which denotes the heap object
package Drefs is new Table.Table (
Table_Component_Type => Xref_Entry,
Table_Index_Type => Xref_Entry_Number,
Table_Low_Bound => 1,
Table_Initial => Alloc.Drefs_Initial,
Table_Increment => Alloc.Drefs_Increment,
Table_Name => "Drefs");
-- Table of cross-references for reads and writes through explicit
-- dereferences, that are output as reads/writes to the special variable
-- "Heap". These references are added to the regular references when
-- computing SPARK cross-references.
-----------------------
-- Local Subprograms --
-----------------------
procedure Add_SPARK_File (Uspec, Ubody : Unit_Number_Type; Dspec : Nat);
-- Add file and corresponding scopes for unit to the tables
-- SPARK_File_Table and SPARK_Scope_Table. When two units are present
-- for the same compilation unit, as it happens for library-level
-- instantiations of generics, then Ubody is the number of the body
-- unit; otherwise it is No_Unit.
procedure Add_SPARK_Xrefs;
-- Filter table Xrefs to add all references used in SPARK to the table
-- SPARK_Xref_Table.
function Entity_Hash (E : Entity_Id) return Entity_Hashed_Range;
-- Hash function for hash table
--------------------
-- Add_SPARK_File --
--------------------
procedure Add_SPARK_File (Uspec, Ubody : Unit_Number_Type; Dspec : Nat) is
File : constant Source_File_Index := Source_Index (Uspec);
From : constant Scope_Index := SPARK_Scope_Table.Last + 1;
Scope_Id : Pos := 1;
procedure Add_SPARK_Scope (N : Node_Id);
-- Add scope N to the table SPARK_Scope_Table
procedure Detect_And_Add_SPARK_Scope (N : Node_Id);
-- Call Add_SPARK_Scope on scopes
---------------------
-- Add_SPARK_Scope --
---------------------
procedure Add_SPARK_Scope (N : Node_Id) is
E : constant Entity_Id := Defining_Entity (N);
Loc : constant Source_Ptr := Sloc (E);
-- The character describing the kind of scope is chosen to be the
-- same as the one describing the corresponding entity in cross
-- references, see Xref_Entity_Letters in lib-xrefs.ads
Typ : Character;
begin
-- Ignore scopes without a proper location
if Sloc (N) = No_Location then
return;
end if;
case Ekind (E) is
when E_Entry
| E_Entry_Family
| E_Generic_Function
| E_Generic_Package
| E_Generic_Procedure
| E_Package
| E_Protected_Type
| E_Task_Type
=>
Typ := Xref_Entity_Letters (Ekind (E));
when E_Function
| E_Procedure
=>
-- In SPARK we need to distinguish protected functions and
-- procedures from ordinary subprograms, but there are no
-- special Xref letters for them. Since this distiction is
-- only needed to detect protected calls, we pretend that
-- such calls are entry calls.
if Ekind (Scope (E)) = E_Protected_Type then
Typ := Xref_Entity_Letters (E_Entry);
else
Typ := Xref_Entity_Letters (Ekind (E));
end if;
when E_Package_Body
| E_Protected_Body
| E_Subprogram_Body
| E_Task_Body
=>
Typ := Xref_Entity_Letters (Ekind (Unique_Entity (E)));
when E_Void =>
-- Compilation of prj-attr.adb with -gnatn creates a node with
-- entity E_Void for the package defined at a-charac.ads16:13.
-- ??? TBD
return;
when others =>
raise Program_Error;
end case;
-- File_Num and Scope_Num are filled later. From_Xref and To_Xref
-- are filled even later, but are initialized to represent an empty
-- range.
SPARK_Scope_Table.Append
((Scope_Name => new String'(Unique_Name (E)),
File_Num => Dspec,
Scope_Num => Scope_Id,
Spec_File_Num => 0,
Spec_Scope_Num => 0,
Line => Nat (Get_Logical_Line_Number (Loc)),
Stype => Typ,
Col => Nat (Get_Column_Number (Loc)),
From_Xref => 1,
To_Xref => 0,
Scope_Entity => E));
Scope_Id := Scope_Id + 1;
end Add_SPARK_Scope;
--------------------------------
-- Detect_And_Add_SPARK_Scope --
--------------------------------
procedure Detect_And_Add_SPARK_Scope (N : Node_Id) is
begin
-- Entries
if Nkind_In (N, N_Entry_Body, N_Entry_Declaration)
-- Packages
or else Nkind_In (N, N_Package_Body,
N_Package_Body_Stub,
N_Package_Declaration)
-- Protected units
or else Nkind_In (N, N_Protected_Body,
N_Protected_Body_Stub,
N_Protected_Type_Declaration)
-- Subprograms
or else Nkind_In (N, N_Subprogram_Body,
N_Subprogram_Body_Stub,
N_Subprogram_Declaration)
-- Task units
or else Nkind_In (N, N_Task_Body,
N_Task_Body_Stub,
N_Task_Type_Declaration)
then
Add_SPARK_Scope (N);
end if;
end Detect_And_Add_SPARK_Scope;
procedure Traverse_Scopes is new
Traverse_Compilation_Unit (Detect_And_Add_SPARK_Scope);
-- Local variables
File_Name : String_Ptr;
Unit_File_Name : String_Ptr;
-- Start of processing for Add_SPARK_File
begin
-- Source file could be inexistant as a result of an error, if option
-- gnatQ is used.
if File = No_Source_File then
return;
end if;
-- Subunits are traversed as part of the top-level unit to which they
-- belong.
if Nkind (Unit (Cunit (Uspec))) = N_Subunit then
return;
end if;
Traverse_Scopes (CU => Cunit (Uspec), Inside_Stubs => True);
-- When two units are present for the same compilation unit, as it
-- happens for library-level instantiations of generics, then add all
-- scopes to the same SPARK file.
if Ubody /= No_Unit then
Traverse_Scopes (CU => Cunit (Ubody), Inside_Stubs => True);
end if;
-- Make entry for new file in file table
Get_Name_String (Reference_Name (File));
File_Name := new String'(Name_Buffer (1 .. Name_Len));
-- For subunits, also retrieve the file name of the unit. Only do so if
-- unit has an associated compilation unit.
if Present (Cunit (Unit (File)))
and then Nkind (Unit (Cunit (Unit (File)))) = N_Subunit
then
Get_Name_String (Reference_Name (Main_Source_File));
Unit_File_Name := new String'(Name_Buffer (1 .. Name_Len));
else
Unit_File_Name := null;
end if;
SPARK_File_Table.Append (
(File_Name => File_Name,
Unit_File_Name => Unit_File_Name,
File_Num => Dspec,
From_Scope => From,
To_Scope => SPARK_Scope_Table.Last));
end Add_SPARK_File;
---------------------
-- Add_SPARK_Xrefs --
---------------------
procedure Add_SPARK_Xrefs is
function Entity_Of_Scope (S : Scope_Index) return Entity_Id;
-- Return the entity which maps to the input scope index
function Get_Entity_Type (E : Entity_Id) return Character;
-- Return a character representing the type of entity
function Get_Scope_Num (N : Entity_Id) return Nat;
-- Return the scope number associated to entity N
function Is_Constant_Object_Without_Variable_Input
(E : Entity_Id) return Boolean;
-- Return True if E is known to have no variable input, as defined in
-- SPARK RM.
function Is_Future_Scope_Entity
(E : Entity_Id;
S : Scope_Index) return Boolean;
-- Check whether entity E is in SPARK_Scope_Table at index S or higher
function Is_SPARK_Reference
(E : Entity_Id;
Typ : Character) return Boolean;
-- Return whether entity reference E meets SPARK requirements. Typ is
-- the reference type.
function Is_SPARK_Scope (E : Entity_Id) return Boolean;
-- Return whether the entity or reference scope meets requirements for
-- being a SPARK scope.
function Lt (Op1 : Natural; Op2 : Natural) return Boolean;
-- Comparison function for Sort call
procedure Move (From : Natural; To : Natural);
-- Move procedure for Sort call
procedure Set_Scope_Num (N : Entity_Id; Num : Nat);
-- Associate entity N to scope number Num
procedure Update_Scope_Range
(S : Scope_Index;
From : Xref_Index;
To : Xref_Index);
-- Update the scope which maps to S with the new range From .. To
package Sorting is new GNAT.Heap_Sort_G (Move, Lt);
No_Scope : constant Nat := 0;
-- Initial scope counter
type Scope_Rec is record
Num : Nat;
Entity : Entity_Id;
end record;
-- Type used to relate an entity and a scope number
package Scopes is new GNAT.HTable.Simple_HTable
(Header_Num => Entity_Hashed_Range,
Element => Scope_Rec,
No_Element => (Num => No_Scope, Entity => Empty),
Key => Entity_Id,
Hash => Entity_Hash,
Equal => "=");
-- Package used to build a correspondence between entities and scope
-- numbers used in SPARK cross references.
Nrefs : Nat := Xrefs.Last;
-- Number of references in table. This value may get reset (reduced)
-- when we eliminate duplicate reference entries as well as references
-- not suitable for local cross-references.
Nrefs_Add : constant Nat := Drefs.Last;
-- Number of additional references which correspond to dereferences in
-- the source code.
Rnums : array (0 .. Nrefs + Nrefs_Add) of Nat;
-- This array contains numbers of references in the Xrefs table. This
-- list is sorted in output order. The extra 0'th entry is convenient
-- for the call to sort. When we sort the table, we move the indices in
-- Rnums around, but we do not move the original table entries.
---------------------
-- Entity_Of_Scope --
---------------------
function Entity_Of_Scope (S : Scope_Index) return Entity_Id is
begin
return SPARK_Scope_Table.Table (S).Scope_Entity;
end Entity_Of_Scope;
---------------------
-- Get_Entity_Type --
---------------------
function Get_Entity_Type (E : Entity_Id) return Character is
begin
case Ekind (E) is
when E_Out_Parameter => return '<';
when E_In_Out_Parameter => return '=';
when E_In_Parameter => return '>';
when others => return '*';
end case;
end Get_Entity_Type;
-------------------
-- Get_Scope_Num --
-------------------
function Get_Scope_Num (N : Entity_Id) return Nat is
begin
return Scopes.Get (N).Num;
end Get_Scope_Num;
-----------------------------------------------
-- Is_Constant_Object_Without_Variable_Input --
-----------------------------------------------
function Is_Constant_Object_Without_Variable_Input
(E : Entity_Id) return Boolean
is
Result : Boolean;
begin
case Ekind (E) is
-- A constant is known to have no variable input if its
-- initializing expression is static (a value which is
-- compile-time-known is not guaranteed to have no variable input
-- as defined in the SPARK RM). Otherwise, the constant may or not
-- have variable input.
when E_Constant =>
declare
Decl : Node_Id;
begin
if Present (Full_View (E)) then
Decl := Parent (Full_View (E));
else
Decl := Parent (E);
end if;
if Is_Imported (E) then
Result := False;
else
pragma Assert (Present (Expression (Decl)));
Result := Is_Static_Expression (Expression (Decl));
end if;
end;
when E_In_Parameter
| E_Loop_Parameter
=>
Result := True;
when others =>
Result := False;
end case;
return Result;
end Is_Constant_Object_Without_Variable_Input;
----------------------------
-- Is_Future_Scope_Entity --
----------------------------
function Is_Future_Scope_Entity
(E : Entity_Id;
S : Scope_Index) return Boolean
is
function Is_Past_Scope_Entity return Boolean;
-- Check whether entity E is in SPARK_Scope_Table at index strictly
-- lower than S.
--------------------------
-- Is_Past_Scope_Entity --
--------------------------
function Is_Past_Scope_Entity return Boolean is
begin
for Index in SPARK_Scope_Table.First .. S - 1 loop
if SPARK_Scope_Table.Table (Index).Scope_Entity = E then
return True;
end if;
end loop;
return False;
end Is_Past_Scope_Entity;
-- Start of processing for Is_Future_Scope_Entity
begin
for Index in S .. SPARK_Scope_Table.Last loop
if SPARK_Scope_Table.Table (Index).Scope_Entity = E then
return True;
end if;
end loop;
-- If this assertion fails, this means that the scope which we are
-- looking for has been treated already, which reveals a problem in
-- the order of cross-references.
pragma Assert (not Is_Past_Scope_Entity);
return False;
end Is_Future_Scope_Entity;
------------------------
-- Is_SPARK_Reference --
------------------------
function Is_SPARK_Reference
(E : Entity_Id;
Typ : Character) return Boolean
is
begin
-- The only references of interest on callable entities are calls. On
-- uncallable entities, the only references of interest are reads and
-- writes.
if Ekind (E) in Overloadable_Kind then
return Typ = 's';
-- In all other cases, result is true for reference/modify cases,
-- and false for all other cases.
else
return Typ = 'r' or else Typ = 'm';
end if;
end Is_SPARK_Reference;
--------------------
-- Is_SPARK_Scope --
--------------------
function Is_SPARK_Scope (E : Entity_Id) return Boolean is
begin
return Present (E)
and then not Is_Generic_Unit (E)
and then Renamed_Entity (E) = Empty
and then Get_Scope_Num (E) /= No_Scope;
end Is_SPARK_Scope;
--------
-- Lt --
--------
function Lt (Op1 : Natural; Op2 : Natural) return Boolean is
T1 : constant Xref_Entry := Xrefs.Table (Rnums (Nat (Op1)));
T2 : constant Xref_Entry := Xrefs.Table (Rnums (Nat (Op2)));
begin
-- First test: if entity is in different unit, sort by unit. Note:
-- that we use Ent_Scope_File rather than Eun, as Eun may refer to
-- the file where the generic scope is defined, which may differ from
-- the file where the enclosing scope is defined. It is the latter
-- which matters for a correct order here.
if T1.Ent_Scope_File /= T2.Ent_Scope_File then
return Dependency_Num (T1.Ent_Scope_File) <
Dependency_Num (T2.Ent_Scope_File);
-- Second test: within same unit, sort by location of the scope of
-- the entity definition.
elsif Get_Scope_Num (T1.Key.Ent_Scope) /=
Get_Scope_Num (T2.Key.Ent_Scope)
then
return Get_Scope_Num (T1.Key.Ent_Scope) <
Get_Scope_Num (T2.Key.Ent_Scope);
-- Third test: within same unit and scope, sort by location of
-- entity definition.
elsif T1.Def /= T2.Def then
return T1.Def < T2.Def;
else
-- Both entities must be equal at this point
pragma Assert (T1.Key.Ent = T2.Key.Ent);
pragma Assert (T1.Key.Ent_Scope = T2.Key.Ent_Scope);
pragma Assert (T1.Ent_Scope_File = T2.Ent_Scope_File);
-- Fourth test: if reference is in same unit as entity definition,
-- sort first.
if T1.Key.Lun /= T2.Key.Lun
and then T1.Ent_Scope_File = T1.Key.Lun
then
return True;
elsif T1.Key.Lun /= T2.Key.Lun
and then T2.Ent_Scope_File = T2.Key.Lun
then
return False;
-- Fifth test: if reference is in same unit and same scope as
-- entity definition, sort first.
elsif T1.Ent_Scope_File = T1.Key.Lun
and then T1.Key.Ref_Scope /= T2.Key.Ref_Scope
and then T1.Key.Ent_Scope = T1.Key.Ref_Scope
then
return True;
elsif T2.Ent_Scope_File = T2.Key.Lun
and then T1.Key.Ref_Scope /= T2.Key.Ref_Scope
and then T2.Key.Ent_Scope = T2.Key.Ref_Scope
then
return False;
-- Sixth test: for same entity, sort by reference location unit
elsif T1.Key.Lun /= T2.Key.Lun then
return Dependency_Num (T1.Key.Lun) <
Dependency_Num (T2.Key.Lun);
-- Seventh test: for same entity, sort by reference location scope
elsif Get_Scope_Num (T1.Key.Ref_Scope) /=
Get_Scope_Num (T2.Key.Ref_Scope)
then
return Get_Scope_Num (T1.Key.Ref_Scope) <
Get_Scope_Num (T2.Key.Ref_Scope);
-- Eighth test: order of location within referencing unit
elsif T1.Key.Loc /= T2.Key.Loc then
return T1.Key.Loc < T2.Key.Loc;
-- Finally, for two locations at the same address prefer the one
-- that does NOT have the type 'r', so that a modification or
-- extension takes preference, when there are more than one
-- reference at the same location. As a result, in the case of
-- entities that are in-out actuals, the read reference follows
-- the modify reference.
else
return T2.Key.Typ = 'r';
end if;
end if;
end Lt;
----------
-- Move --
----------
procedure Move (From : Natural; To : Natural) is
begin
Rnums (Nat (To)) := Rnums (Nat (From));
end Move;
-------------------
-- Set_Scope_Num --
-------------------
procedure Set_Scope_Num (N : Entity_Id; Num : Nat) is
begin
Scopes.Set (K => N, E => Scope_Rec'(Num => Num, Entity => N));
end Set_Scope_Num;
------------------------
-- Update_Scope_Range --
------------------------
procedure Update_Scope_Range
(S : Scope_Index;
From : Xref_Index;
To : Xref_Index)
is
begin
SPARK_Scope_Table.Table (S).From_Xref := From;
SPARK_Scope_Table.Table (S).To_Xref := To;
end Update_Scope_Range;
-- Local variables
Col : Nat;
From_Index : Xref_Index;
Line : Nat;
Prev_Loc : Source_Ptr;
Prev_Typ : Character;
Ref_Count : Nat;
Ref_Id : Entity_Id;
Ref_Name : String_Ptr;
Scope_Id : Scope_Index;
-- Start of processing for Add_SPARK_Xrefs
begin
for Index in SPARK_Scope_Table.First .. SPARK_Scope_Table.Last loop
declare
S : SPARK_Scope_Record renames SPARK_Scope_Table.Table (Index);
begin
Set_Scope_Num (S.Scope_Entity, S.Scope_Num);
end;
end loop;
declare
Drefs_Table : Drefs.Table_Type
renames Drefs.Table (Drefs.First .. Drefs.Last);
begin
Xrefs.Append_All (Xrefs.Table_Type (Drefs_Table));
Nrefs := Nrefs + Drefs_Table'Length;
end;
-- Capture the definition Sloc values. As in the case of normal cross
-- references, we have to wait until now to get the correct value.
for Index in 1 .. Nrefs loop
Xrefs.Table (Index).Def := Sloc (Xrefs.Table (Index).Key.Ent);
end loop;
-- Eliminate entries not appropriate for SPARK. Done prior to sorting
-- cross-references, as it discards useless references which do not have
-- a proper format for the comparison function (like no location).
Ref_Count := Nrefs;
Nrefs := 0;
for Index in 1 .. Ref_Count loop
declare
Ref : Xref_Key renames Xrefs.Table (Index).Key;
begin
if SPARK_Entities (Ekind (Ref.Ent))
and then SPARK_References (Ref.Typ)
and then Is_SPARK_Scope (Ref.Ent_Scope)
and then Is_SPARK_Scope (Ref.Ref_Scope)
and then Is_SPARK_Reference (Ref.Ent, Ref.Typ)
-- Discard references from unknown scopes, e.g. generic scopes
and then Get_Scope_Num (Ref.Ent_Scope) /= No_Scope
and then Get_Scope_Num (Ref.Ref_Scope) /= No_Scope
then
Nrefs := Nrefs + 1;
Rnums (Nrefs) := Index;
end if;
end;
end loop;
-- Sort the references
Sorting.Sort (Integer (Nrefs));
-- Eliminate duplicate entries
-- We need this test for Ref_Count because if we force ALI file
-- generation in case of errors detected, it may be the case that
-- Nrefs is 0, so we should not reset it here.
if Nrefs >= 2 then
Ref_Count := Nrefs;
Nrefs := 1;
for Index in 2 .. Ref_Count loop
if Xrefs.Table (Rnums (Index)) /= Xrefs.Table (Rnums (Nrefs)) then
Nrefs := Nrefs + 1;
Rnums (Nrefs) := Rnums (Index);
end if;
end loop;
end if;
-- Eliminate the reference if it is at the same location as the previous
-- one, unless it is a read-reference indicating that the entity is an
-- in-out actual in a call.
Ref_Count := Nrefs;
Nrefs := 0;
Prev_Loc := No_Location;
Prev_Typ := 'm';
for Index in 1 .. Ref_Count loop
declare
Ref : Xref_Key renames Xrefs.Table (Rnums (Index)).Key;
begin
if Ref.Loc /= Prev_Loc
or else (Prev_Typ = 'm' and then Ref.Typ = 'r')
then
Prev_Loc := Ref.Loc;
Prev_Typ := Ref.Typ;
Nrefs := Nrefs + 1;
Rnums (Nrefs) := Rnums (Index);
end if;
end;
end loop;
-- The two steps have eliminated all references, nothing to do
if SPARK_Scope_Table.Last = 0 then
return;
end if;
Ref_Id := Empty;
Scope_Id := 1;
From_Index := 1;
-- Loop to output references
for Refno in 1 .. Nrefs loop
declare
Ref_Entry : Xref_Entry renames Xrefs.Table (Rnums (Refno));
Ref : Xref_Key renames Ref_Entry.Key;
Typ : Character;
begin
-- If this assertion fails, the scope which we are looking for is
-- not in SPARK scope table, which reveals either a problem in the
-- construction of the scope table, or an erroneous scope for the
-- current cross-reference.
pragma Assert (Is_Future_Scope_Entity (Ref.Ent_Scope, Scope_Id));
-- Update the range of cross references to which the current scope
-- refers to. This may be the empty range only for the first scope
-- considered.
if Ref.Ent_Scope /= Entity_Of_Scope (Scope_Id) then
Update_Scope_Range
(S => Scope_Id,
From => From_Index,
To => SPARK_Xref_Table.Last);
From_Index := SPARK_Xref_Table.Last + 1;
end if;
while Ref.Ent_Scope /= Entity_Of_Scope (Scope_Id) loop
Scope_Id := Scope_Id + 1;
pragma Assert (Scope_Id <= SPARK_Scope_Table.Last);
end loop;
if Ref.Ent /= Ref_Id then
Ref_Name := new String'(Unique_Name (Ref.Ent));
end if;
if Ref.Ent = Heap then
Line := 0;
Col := 0;
else
Line := Nat (Get_Logical_Line_Number (Ref_Entry.Def));
Col := Nat (Get_Column_Number (Ref_Entry.Def));
end if;
-- References to constant objects without variable inputs (see
-- SPARK RM 3.3.1) are considered specially in SPARK section,
-- because these will be translated as constants in the
-- intermediate language for formal verification, and should
-- therefore never appear in frame conditions. Other constants may
-- later be treated the same, up to GNATprove to decide based on
-- its flow analysis.
if Is_Constant_Object_Without_Variable_Input (Ref.Ent) then
Typ := 'c';
else
Typ := Ref.Typ;
end if;
SPARK_Xref_Table.Append (
(Entity_Name => Ref_Name,
Entity_Line => Line,
Etype => Get_Entity_Type (Ref.Ent),
Entity_Col => Col,
File_Num => Dependency_Num (Ref.Lun),
Scope_Num => Get_Scope_Num (Ref.Ref_Scope),
Line => Nat (Get_Logical_Line_Number (Ref.Loc)),
Rtype => Typ,
Col => Nat (Get_Column_Number (Ref.Loc))));
end;
end loop;
-- Update the range of cross references to which the scope refers to
Update_Scope_Range
(S => Scope_Id,
From => From_Index,
To => SPARK_Xref_Table.Last);
end Add_SPARK_Xrefs;
-------------------------
-- Collect_SPARK_Xrefs --
-------------------------
procedure Collect_SPARK_Xrefs
(Sdep_Table : Unit_Ref_Table;
Num_Sdep : Nat)
is
Sdep : Pos;
Sdep_Next : Pos;
-- Index of the current and next source dependency
Sdep_File : Pos;
-- Index of the file to which the scopes need to be assigned; for
-- library-level instances of generic units this points to the unit
-- of the body, because this is where references are assigned to.
Ubody : Unit_Number_Type;
Uspec : Unit_Number_Type;
-- Unit numbers for the dependency spec and possibly its body (only in
-- the case of library-level instance of a generic package).
begin
-- Cross-references should have been computed first
pragma Assert (Xrefs.Last /= 0);
Initialize_SPARK_Tables;
-- Generate file and scope SPARK cross-reference information
Sdep := 1;
while Sdep <= Num_Sdep loop
-- Skip dependencies with no entity node, e.g. configuration files
-- with pragmas (.adc) or target description (.atp), since they
-- present no interest for SPARK cross references.
if No (Cunit_Entity (Sdep_Table (Sdep))) then
Sdep_Next := Sdep + 1;
-- For library-level instantiation of a generic, two consecutive
-- units refer to the same compilation unit node and entity (one to
-- body, one to spec). In that case, treat them as a single unit for
-- the sake of SPARK cross references by passing to Add_SPARK_File.
else
if Sdep < Num_Sdep
and then Cunit_Entity (Sdep_Table (Sdep)) =
Cunit_Entity (Sdep_Table (Sdep + 1))
then
declare
Cunit1 : Node_Id renames Cunit (Sdep_Table (Sdep));
Cunit2 : Node_Id renames Cunit (Sdep_Table (Sdep + 1));
begin
-- Both Cunits point to compilation unit nodes
pragma Assert
(Nkind (Cunit1) = N_Compilation_Unit
and then Nkind (Cunit2) = N_Compilation_Unit);
-- Do not depend on the sorting order, which is based on
-- Unit_Name, and for library-level instances of nested
-- generic packages they are equal.
-- If declaration comes before the body
if Nkind (Unit (Cunit1)) = N_Package_Declaration
and then Nkind (Unit (Cunit2)) = N_Package_Body
then
Uspec := Sdep_Table (Sdep);
Ubody := Sdep_Table (Sdep + 1);
Sdep_File := Sdep + 1;
-- If body comes before declaration
elsif Nkind (Unit (Cunit1)) = N_Package_Body
and then Nkind (Unit (Cunit2)) = N_Package_Declaration
then
Uspec := Sdep_Table (Sdep + 1);
Ubody := Sdep_Table (Sdep);
Sdep_File := Sdep;
-- Otherwise it is an error
else
raise Program_Error;
end if;
Sdep_Next := Sdep + 2;
end;
-- ??? otherwise?
else
Uspec := Sdep_Table (Sdep);
Ubody := No_Unit;
Sdep_File := Sdep;
Sdep_Next := Sdep + 1;
end if;
Add_SPARK_File
(Uspec => Uspec,
Ubody => Ubody,
Dspec => Sdep_File);
end if;
Sdep := Sdep_Next;
end loop;
-- Fill in the spec information when relevant
declare
package Entity_Hash_Table is new
GNAT.HTable.Simple_HTable
(Header_Num => Entity_Hashed_Range,
Element => Scope_Index,
No_Element => 0,
Key => Entity_Id,
Hash => Entity_Hash,
Equal => "=");
begin
-- Fill in the hash-table
for S in SPARK_Scope_Table.First .. SPARK_Scope_Table.Last loop
declare
Srec : SPARK_Scope_Record renames SPARK_Scope_Table.Table (S);
begin
Entity_Hash_Table.Set (Srec.Scope_Entity, S);
end;
end loop;
-- Use the hash-table to locate spec entities
for S in SPARK_Scope_Table.First .. SPARK_Scope_Table.Last loop
declare
Srec : SPARK_Scope_Record renames SPARK_Scope_Table.Table (S);
Spec_Entity : constant Entity_Id :=
Unique_Entity (Srec.Scope_Entity);
Spec_Scope : constant Scope_Index :=
Entity_Hash_Table.Get (Spec_Entity);
begin
-- Generic spec may be missing in which case Spec_Scope is zero
if Spec_Entity /= Srec.Scope_Entity
and then Spec_Scope /= 0
then
Srec.Spec_File_Num :=
SPARK_Scope_Table.Table (Spec_Scope).File_Num;
Srec.Spec_Scope_Num :=
SPARK_Scope_Table.Table (Spec_Scope).Scope_Num;
end if;
end;
end loop;
end;
-- Generate SPARK cross-reference information
Add_SPARK_Xrefs;
end Collect_SPARK_Xrefs;
-------------------------------------
-- Enclosing_Subprogram_Or_Package --
-------------------------------------
function Enclosing_Subprogram_Or_Library_Package
(N : Node_Id) return Entity_Id
is
Context : Entity_Id;
begin
-- If N is the defining identifier for a subprogram, then return the
-- enclosing subprogram or package, not this subprogram.
if Nkind_In (N, N_Defining_Identifier, N_Defining_Operator_Symbol)
and then (Ekind (N) in Entry_Kind
or else Ekind (N) = E_Subprogram_Body
or else Ekind (N) in Generic_Subprogram_Kind
or else Ekind (N) in Subprogram_Kind)
then
Context := Parent (Unit_Declaration_Node (N));
-- If this was a library-level subprogram then replace Context with
-- its Unit, which points to N_Subprogram_* node.
if Nkind (Context) = N_Compilation_Unit then
Context := Unit (Context);
end if;
else
Context := N;
end if;
while Present (Context) loop
case Nkind (Context) is
when N_Package_Body
| N_Package_Specification
=>
-- Only return a library-level package
if Is_Library_Level_Entity (Defining_Entity (Context)) then
Context := Defining_Entity (Context);
exit;
else
Context := Parent (Context);
end if;
when N_Pragma =>
-- The enclosing subprogram for a precondition, postcondition,
-- or contract case should be the declaration preceding the
-- pragma (skipping any other pragmas between this pragma and
-- this declaration.
while Nkind (Context) = N_Pragma
and then Is_List_Member (Context)
and then Present (Prev (Context))
loop
Context := Prev (Context);
end loop;
if Nkind (Context) = N_Pragma then
Context := Parent (Context);
end if;
when N_Entry_Body
| N_Entry_Declaration
| N_Protected_Type_Declaration
| N_Subprogram_Body
| N_Subprogram_Declaration
| N_Subprogram_Specification
| N_Task_Body
| N_Task_Type_Declaration
=>
Context := Defining_Entity (Context);
exit;
when others =>
Context := Parent (Context);
end case;
end loop;
if Nkind (Context) = N_Defining_Program_Unit_Name then
Context := Defining_Identifier (Context);
end if;
-- Do not return a scope without a proper location
if Present (Context)
and then Sloc (Context) = No_Location
then
return Empty;
end if;
return Context;
end Enclosing_Subprogram_Or_Library_Package;
-----------------
-- Entity_Hash --
-----------------
function Entity_Hash (E : Entity_Id) return Entity_Hashed_Range is
begin
return
Entity_Hashed_Range (E mod (Entity_Id (Entity_Hashed_Range'Last) + 1));
end Entity_Hash;
--------------------------
-- Generate_Dereference --
--------------------------
procedure Generate_Dereference
(N : Node_Id;
Typ : Character := 'r')
is
procedure Create_Heap;
-- Create and decorate the special entity which denotes the heap
-----------------
-- Create_Heap --
-----------------
procedure Create_Heap is
begin
Name_Len := Name_Of_Heap_Variable'Length;
Name_Buffer (1 .. Name_Len) := Name_Of_Heap_Variable;
Heap := Make_Defining_Identifier (Standard_Location, Name_Enter);
Set_Ekind (Heap, E_Variable);
Set_Is_Internal (Heap, True);
Set_Has_Fully_Qualified_Name (Heap);
end Create_Heap;
-- Local variables
Loc : constant Source_Ptr := Sloc (N);
-- Start of processing for Generate_Dereference
begin
if Loc > No_Location then
Drefs.Increment_Last;
declare
Deref_Entry : Xref_Entry renames Drefs.Table (Drefs.Last);
Deref : Xref_Key renames Deref_Entry.Key;
begin
if No (Heap) then
Create_Heap;
end if;
Deref.Ent := Heap;
Deref.Loc := Loc;
Deref.Typ := Typ;
-- It is as if the special "Heap" was defined in the main unit,
-- in the scope of the entity for the main unit. This single
-- definition point is required to ensure that sorting cross
-- references works for "Heap" references as well.
Deref.Eun := Main_Unit;
Deref.Lun := Get_Top_Level_Code_Unit (Loc);
Deref.Ref_Scope := Enclosing_Subprogram_Or_Library_Package (N);
Deref.Ent_Scope := Cunit_Entity (Main_Unit);
Deref_Entry.Def := No_Location;
Deref_Entry.Ent_Scope_File := Main_Unit;
end;
end if;
end Generate_Dereference;
-------------------------------
-- Traverse_Compilation_Unit --
-------------------------------
procedure Traverse_Compilation_Unit
(CU : Node_Id;
Inside_Stubs : Boolean)
is
procedure Traverse_Block (N : Node_Id);
procedure Traverse_Declaration_Or_Statement (N : Node_Id);
procedure Traverse_Declarations_And_HSS (N : Node_Id);
procedure Traverse_Declarations_Or_Statements (L : List_Id);
procedure Traverse_Handled_Statement_Sequence (N : Node_Id);
procedure Traverse_Package_Body (N : Node_Id);
procedure Traverse_Visible_And_Private_Parts (N : Node_Id);
procedure Traverse_Protected_Body (N : Node_Id);
procedure Traverse_Subprogram_Body (N : Node_Id);
procedure Traverse_Task_Body (N : Node_Id);
-- Traverse corresponding construct, calling Process on all declarations
--------------------
-- Traverse_Block --
--------------------
procedure Traverse_Block (N : Node_Id) renames
Traverse_Declarations_And_HSS;
---------------------------------------
-- Traverse_Declaration_Or_Statement --
---------------------------------------
procedure Traverse_Declaration_Or_Statement (N : Node_Id) is
function Traverse_Stub (N : Node_Id) return Boolean;
-- Returns True iff stub N should be traversed
function Traverse_Stub (N : Node_Id) return Boolean is
begin
pragma Assert (Nkind_In (N, N_Package_Body_Stub,
N_Protected_Body_Stub,
N_Subprogram_Body_Stub,
N_Task_Body_Stub));
return Inside_Stubs and then Present (Library_Unit (N));
end Traverse_Stub;
-- Start of processing for Traverse_Declaration_Or_Statement
begin
case Nkind (N) is
when N_Package_Declaration =>
Traverse_Visible_And_Private_Parts (Specification (N));
when N_Package_Body =>
Traverse_Package_Body (N);
when N_Package_Body_Stub =>
if Traverse_Stub (N) then
Traverse_Package_Body (Get_Body_From_Stub (N));
end if;
when N_Subprogram_Body =>
Traverse_Subprogram_Body (N);
when N_Entry_Body =>
Traverse_Subprogram_Body (N);
when N_Subprogram_Body_Stub =>
if Traverse_Stub (N) then
Traverse_Subprogram_Body (Get_Body_From_Stub (N));
end if;
when N_Protected_Body =>
Traverse_Protected_Body (N);
when N_Protected_Body_Stub =>
if Traverse_Stub (N) then
Traverse_Protected_Body (Get_Body_From_Stub (N));
end if;
when N_Protected_Type_Declaration =>
Traverse_Visible_And_Private_Parts (Protected_Definition (N));
when N_Task_Definition =>
Traverse_Visible_And_Private_Parts (N);
when N_Task_Body =>
Traverse_Task_Body (N);
when N_Task_Body_Stub =>
if Traverse_Stub (N) then
Traverse_Task_Body (Get_Body_From_Stub (N));
end if;
when N_Block_Statement =>
Traverse_Block (N);
when N_If_Statement =>
-- Traverse the statements in the THEN part
Traverse_Declarations_Or_Statements (Then_Statements (N));
-- Loop through ELSIF parts if present
if Present (Elsif_Parts (N)) then
declare
Elif : Node_Id := First (Elsif_Parts (N));
begin
while Present (Elif) loop
Traverse_Declarations_Or_Statements
(Then_Statements (Elif));
Next (Elif);
end loop;
end;
end if;
-- Finally traverse the ELSE statements if present
Traverse_Declarations_Or_Statements (Else_Statements (N));
when N_Case_Statement =>
-- Process case branches
declare
Alt : Node_Id := First (Alternatives (N));
begin
loop
Traverse_Declarations_Or_Statements (Statements (Alt));
Next (Alt);
exit when No (Alt);
end loop;
end;
when N_Extended_Return_Statement =>
Traverse_Handled_Statement_Sequence
(Handled_Statement_Sequence (N));
when N_Loop_Statement =>
Traverse_Declarations_Or_Statements (Statements (N));
-- Generic declarations are ignored
when others =>
null;
end case;
end Traverse_Declaration_Or_Statement;
-----------------------------------
-- Traverse_Declarations_And_HSS --
-----------------------------------
procedure Traverse_Declarations_And_HSS (N : Node_Id) is
begin
Traverse_Declarations_Or_Statements (Declarations (N));
Traverse_Handled_Statement_Sequence (Handled_Statement_Sequence (N));
end Traverse_Declarations_And_HSS;
-----------------------------------------
-- Traverse_Declarations_Or_Statements --
-----------------------------------------
procedure Traverse_Declarations_Or_Statements (L : List_Id) is
N : Node_Id;
begin
-- Loop through statements or declarations
N := First (L);
while Present (N) loop
-- Call Process on all declarations
if Nkind (N) in N_Declaration
or else Nkind (N) in N_Later_Decl_Item
or else Nkind (N) = N_Entry_Body
then
Process (N);
end if;
Traverse_Declaration_Or_Statement (N);
Next (N);
end loop;
end Traverse_Declarations_Or_Statements;
-----------------------------------------
-- Traverse_Handled_Statement_Sequence --
-----------------------------------------
procedure Traverse_Handled_Statement_Sequence (N : Node_Id) is
Handler : Node_Id;
begin
if Present (N) then
Traverse_Declarations_Or_Statements (Statements (N));
if Present (Exception_Handlers (N)) then
Handler := First (Exception_Handlers (N));
while Present (Handler) loop
Traverse_Declarations_Or_Statements (Statements (Handler));
Next (Handler);
end loop;
end if;
end if;
end Traverse_Handled_Statement_Sequence;
---------------------------
-- Traverse_Package_Body --
---------------------------
procedure Traverse_Package_Body (N : Node_Id) is
Spec_E : constant Entity_Id := Unique_Defining_Entity (N);
begin
case Ekind (Spec_E) is
when E_Package =>
Traverse_Declarations_And_HSS (N);
when E_Generic_Package =>
null;
when others =>
raise Program_Error;
end case;
end Traverse_Package_Body;
-----------------------------
-- Traverse_Protected_Body --
-----------------------------
procedure Traverse_Protected_Body (N : Node_Id) is
begin
Traverse_Declarations_Or_Statements (Declarations (N));
end Traverse_Protected_Body;
------------------------------
-- Traverse_Subprogram_Body --
------------------------------
procedure Traverse_Subprogram_Body (N : Node_Id) is
Spec_E : constant Entity_Id := Unique_Defining_Entity (N);
begin
case Ekind (Spec_E) is
when Entry_Kind
| E_Function
| E_Procedure
=>
Traverse_Declarations_And_HSS (N);
when Generic_Subprogram_Kind =>
null;
when others =>
raise Program_Error;
end case;
end Traverse_Subprogram_Body;
------------------------
-- Traverse_Task_Body --
------------------------
procedure Traverse_Task_Body (N : Node_Id) renames
Traverse_Declarations_And_HSS;
----------------------------------------
-- Traverse_Visible_And_Private_Parts --
----------------------------------------
procedure Traverse_Visible_And_Private_Parts (N : Node_Id) is
begin
Traverse_Declarations_Or_Statements (Visible_Declarations (N));
Traverse_Declarations_Or_Statements (Private_Declarations (N));
end Traverse_Visible_And_Private_Parts;
-- Local variables
Lu : Node_Id;
-- Start of processing for Traverse_Compilation_Unit
begin
-- Get Unit (checking case of subunit)
Lu := Unit (CU);
if Nkind (Lu) = N_Subunit then
Lu := Proper_Body (Lu);
end if;
-- Do not add scopes for generic units
if Nkind (Lu) = N_Package_Body
and then Ekind (Corresponding_Spec (Lu)) in Generic_Unit_Kind
then
return;
end if;
-- Call Process on all declarations
if Nkind (Lu) in N_Declaration
or else Nkind (Lu) in N_Later_Decl_Item
then
Process (Lu);
end if;
-- Traverse the unit
Traverse_Declaration_Or_Statement (Lu);
end Traverse_Compilation_Unit;
end SPARK_Specific;
|
tests/nonsmoke/functional/CompileTests/experimental_ada_tests/tests/io.ads
|
ouankou/rose
| 488 |
19095
|
<filename>tests/nonsmoke/functional/CompileTests/experimental_ada_tests/tests/io.ads
with SimpleAda.IO;
package IO renames SimpleAda.IO;
|
Orders/Total/Lemmas.agda
|
Smaug123/agdaproofs
| 4 |
3575
|
{-# OPTIONS --safe --warning=error --without-K #-}
open import LogicalFormulae
open import Orders.Total.Definition
module Orders.Total.Lemmas {a b : _} {A : Set a} (order : TotalOrder A {b}) where
open TotalOrder order
equivMin : {x y : A} → (x < y) → min x y ≡ x
equivMin {x} {y} x<y with totality x y
equivMin {x} {y} x<y | inl (inl x₁) = refl
equivMin {x} {y} x<y | inl (inr y<x) = exFalso (irreflexive (<Transitive x<y y<x))
equivMin {x} {y} x<y | inr x=y rewrite x=y = refl
equivMin' : {x y : A} → (min x y ≡ x) → (x < y) || (x ≡ y)
equivMin' {x} {y} minEq with totality x y
equivMin' {x} {y} minEq | inl (inl x<y) = inl x<y
equivMin' {x} {y} minEq | inl (inr y<x) = exFalso (irreflexive (identityOfIndiscernablesLeft _<_ y<x minEq))
equivMin' {x} {y} minEq | inr x=y = inr x=y
minCommutes : (x y : A) → (min x y) ≡ (min y x)
minCommutes x y with totality x y
minCommutes x y | inl (inl x<y) with totality y x
minCommutes x y | inl (inl x<y) | inl (inl y<x) = exFalso (irreflexive (<Transitive y<x x<y))
minCommutes x y | inl (inl x<y) | inl (inr x<y') = refl
minCommutes x y | inl (inl x<y) | inr y=x = equalityCommutative y=x
minCommutes x y | inl (inr y<x) with totality y x
minCommutes x y | inl (inr y<x) | inl (inl y<x') = refl
minCommutes x y | inl (inr y<x) | inl (inr x<y) = exFalso (irreflexive (<Transitive y<x x<y))
minCommutes x y | inl (inr y<x) | inr y=x = refl
minCommutes x y | inr x=y with totality y x
minCommutes x y | inr x=y | inl (inl x₁) = x=y
minCommutes x y | inr x=y | inl (inr x₁) = refl
minCommutes x y | inr x=y | inr x₁ = x=y
minIdempotent : (x : A) → min x x ≡ x
minIdempotent x with totality x x
minIdempotent x | inl (inl x₁) = refl
minIdempotent x | inl (inr x₁) = refl
minIdempotent x | inr x₁ = refl
swapMin : {x y z : A} → (min x (min y z)) ≡ min y (min x z)
swapMin {x} {y} {z} with totality y z
swapMin {x} {y} {z} | inl (inl y<z) with totality x z
swapMin {x} {y} {z} | inl (inl y<z) | inl (inl x<z) = minCommutes x y
swapMin {x} {y} {z} | inl (inl y<z) | inl (inr z<x) with totality x y
swapMin {x} {y} {z} | inl (inl y<z) | inl (inr z<x) | inl (inl x<y) = exFalso (irreflexive (<Transitive y<z (<Transitive z<x x<y)))
swapMin {x} {y} {z} | inl (inl y<z) | inl (inr z<x) | inl (inr y<x) = equalityCommutative (equivMin y<z)
swapMin {x} {y} {z} | inl (inl y<z) | inl (inr z<x) | inr x=y rewrite x=y = equalityCommutative (equivMin y<z)
swapMin {x} {y} {z} | inl (inl y<z) | inr x=z = minCommutes x y
swapMin {x} {y} {z} | inl (inr z<y) with totality x z
swapMin {x} {y} {z} | inl (inr z<y) | inl (inl x<z) rewrite minCommutes y x = equalityCommutative (equivMin (<Transitive x<z z<y))
swapMin {x} {y} {z} | inl (inr z<y) | inl (inr z<x) with totality y z
swapMin {x} {y} {z} | inl (inr z<y) | inl (inr z<x) | inl (inl y<z) = exFalso (irreflexive (<Transitive z<y y<z))
swapMin {x} {y} {z} | inl (inr z<y) | inl (inr z<x) | inl (inr z<y') = refl
swapMin {x} {y} {z} | inl (inr z<y) | inl (inr z<x) | inr y=z = equalityCommutative y=z
swapMin {x} {y} {z} | inl (inr z<y) | inr x=z rewrite x=z | minCommutes y z = equalityCommutative (equivMin z<y)
swapMin {x} {y} {z} | inr y=z with totality x z
swapMin {x} {y} {z} | inr y=z | inl (inl x<z) = minCommutes x y
swapMin {x} {y} {z} | inr y=z | inl (inr z<x) rewrite y=z | minIdempotent z | minCommutes x z = equivMin z<x
swapMin {x} {y} {z} | inr y=z | inr x=z = minCommutes x y
minMin : {x y : A} → (min x (min x y)) ≡ min x y
minMin {x} {y} with totality x y
minMin {x} {y} | inl (inl x<y) = minIdempotent x
minMin {x} {y} | inl (inr y<x) with totality x y
minMin {x} {y} | inl (inr y<x) | inl (inl x<y) = exFalso (irreflexive (<Transitive y<x x<y))
minMin {x} {y} | inl (inr y<x) | inl (inr y<x') = refl
minMin {x} {y} | inl (inr y<x) | inr x=y = x=y
minMin {x} {y} | inr x=y = minIdempotent x
minFromBoth : {l x y : A} → (l < x) → (l < y) → (l < (min x y))
minFromBoth {a} {x = x} {y} prX prY with totality x y
minFromBoth {a} prX prY | inl (inl x<y) = prX
minFromBoth {a} prX prY | inl (inr y<x) = prY
minFromBoth {a} prX prY | inr x=y = prX
|
agda/Itse/Checking.agda
|
Riib11/itse
| 1 |
15372
|
module Itse.Checking where
open import Itse.Grammar
open import Relation.Nullary
open import Relation.Binary.PropositionalEquality
open import Data.Unit
open import Data.Bool
open import Data.List hiding (lookup)
open import Data.Product
open import Data.Maybe
{-
# Checking
-}
{-
## Context
-}
data Context : Set
Closure : Set
infixr 6 _⦂_,_ [_],_
data Context where
∅ : Context
_⦂_,_ : ∀ {e} → Name e → Expr (TypeOf e) → Context → Context
[_],_ : Closure → Context → Context
{-
## Closure
-}
Closure = List (∃[ e ] (Name e × Expr e × Expr (TypeOf e)))
lookup-μ : ∀ {e} → Name e → Closure → Maybe (Expr e × Expr (TypeOf e))
lookup-μ {p} ξ [] = nothing
lookup-μ {p} ξ ((p , υ , α , A) ∷ μ) with ξ ≟-Name υ
lookup-μ {p} ξ ((p , υ , α , A) ∷ μ) | yes refl = just (α , A)
lookup-μ {p} ξ ((p , υ , α , A) ∷ μ) | no _ = lookup-μ ξ μ
lookup-μ {p} ξ ((t , _) ∷ μ) = lookup-μ ξ μ
lookup-μ {t} x [] = nothing
lookup-μ {t} x ((p , _) ∷ μ) = lookup-μ x μ
lookup-μ {t} x ((t , y , a , α) ∷ μ) with x ≟-Name y
lookup-μ {t} x ((t , y , a , α) ∷ μ) | yes refl = just (a , α)
lookup-μ {t} x ((t , y , a , α) ∷ μ) | no _ = lookup-μ x μ
lookup : ∀ {e} → Name e → Context → Maybe (Expr e × Expr (TypeOf e))
lookup x ∅ = nothing
lookup x (_ ⦂ _ , Γ) = lookup x Γ
lookup x ([ μ ], Γ) = lookup-μ x μ
{-
## Substitution
-}
infix 6 ⟦_↦_⟧_
⟦_↦_⟧_ : ∀ {e e′} → Name e → Expr e → Expr e′ → Expr e′
⟦_↦_⟧_ = {!!}
{-
## Wellformed-ness
-}
infix 5 _⊢wf _⊢_ok _⊢_⦂_
data _⊢wf : Context → Set
data _⊢_ok : Context → Closure → Set
data _⊢_⦂_ : ∀ {e} → Context → Expr e → Expr (TypeOf e) → Set
data _⊢wf where
∅⊢wf :
∅ ⊢wf
judgeₚ : ∀ {Γ} {X : Kind} {ξ} →
Γ ⊢wf →
Γ ⊢ X ⦂ `□ₛ →
----
ξ ⦂ X , Γ ⊢wf
judgeₜ : ∀ {Γ} {ξ : Type} {x : Nameₜ} →
Γ ⊢wf →
Γ ⊢ ξ ⦂ `●ₖ →
----
x ⦂ ξ , Γ ⊢wf
closure : ∀ {Γ} {μ} →
Γ ⊢wf →
Γ ⊢ μ ok →
[ μ ], Γ ⊢wf
-- Closure = List (∃[ e ] ∃[ e≢k ] (Name e × Expr e × Expr (TypeOf e {e≢k})))
data _⊢_ok where
-- type :
-- Γ ⊢ μ ok →
-- [ μ ], Γ ⊢
data _⊢_⦂_ where
-- sorting (well-formed kinds)
●ₖ : ∀ {Γ} →
Γ ⊢ `●ₖ ⦂ `□ₛ
λₖₚ-intro : ∀ {Γ} {ξ} {X A} →
ξ ⦂ X , Γ ⊢ A ⦂ `□ₛ →
Γ ⊢ X ⦂ `□ₛ →
----
Γ ⊢ `λₖₚ[ ξ ⦂ X ] A ⦂ `□ₛ
λₖₜ-intro : ∀ {Γ} {ξ} {A} {x} →
x ⦂ ξ , Γ ⊢ A ⦂ `□ₛ →
Γ ⊢ ξ ⦂ `●ₖ →
----
Γ ⊢ `λₖₜ[ x ⦂ ξ ] A ⦂ `□ₛ
-- kinding
λₚₚ-intro : ∀ {Γ} {X} {β} {ξ} →
Γ ⊢ X ⦂ `□ₛ →
ξ ⦂ X , Γ ⊢ β ⦂ `●ₖ →
----
Γ ⊢ `λₚₚ[ ξ ⦂ X ] β ⦂ `λₖₚ[ ξ ⦂ X ] `●ₖ
λₚₜ-intro : ∀ {Γ} {ξ} {β} {x} →
Γ ⊢ ξ ⦂ `●ₖ →
x ⦂ ξ , Γ ⊢ β ⦂ `●ₖ →
----
Γ ⊢ `λₚₜ[ x ⦂ ξ ] β ⦂ `λₖₜ[ x ⦂ ξ ] `●ₖ
λₚₚ-elim : ∀ {Γ} {A B} {ξ φ α} →
Γ ⊢ φ ⦂ `λₖₚ[ ξ ⦂ A ] B →
Γ ⊢ α ⦂ A →
----
Γ ⊢ φ `∙ₚₚ α ⦂ B
λₚₜ-elim : ∀ {Γ} {B} {φ α} {a} {x} →
Γ ⊢ φ ⦂ `λₖₜ[ x ⦂ α ] B →
Γ ⊢ a ⦂ α →
----
Γ ⊢ φ `∙ₚₜ a ⦂ B
-- typing
λₜₚ-intro : ∀ {Γ} {X} {α} {a} {ξ} →
Γ ⊢ X ⦂ `□ₛ →
ξ ⦂ X , Γ ⊢ a ⦂ α →
----
Γ ⊢ `λₜₚ[ ξ ⦂ X ] a ⦂ `λₚₚ[ ξ ⦂ X ] α
λₜₜ-intro : ∀ {Γ} {α ξ} {a} {x} →
Γ ⊢ α ⦂ `●ₖ →
x ⦂ ξ , Γ ⊢ a ⦂ α →
----
Γ ⊢ `λₜₜ[ x ⦂ ξ ] a ⦂ `λₚₜ[ x ⦂ ξ ] α
λₜₚ-elim : ∀ {Γ} {A} {α β} {f} {ξ} →
Γ ⊢ f ⦂ `λₚₚ[ ξ ⦂ A ] β →
Γ ⊢ α ⦂ A →
----
Γ ⊢ f `∙ₜₚ α ⦂ β
λₜₜ-elim : ∀ {Γ} {α β} {f a x} →
Γ ⊢ f ⦂ `λₚₜ[ x ⦂ α ] β →
Γ ⊢ a ⦂ α →
----
Γ ⊢ f `∙ₜₜ a ⦂ β
-- "SelfGen"
ι-intro : ∀ {Γ} {α} {a} {x} →
Γ ⊢ a ⦂ ⟦ x ↦ a ⟧ α →
Γ ⊢ `ι[ x ] α ⦂ `●ₖ →
----
Γ ⊢ a ⦂ `ι[ x ] α
-- "SelfInst"
ι-elim : ∀ {Γ} {α} {a} {x} →
Γ ⊢ a ⦂ `ι[ x ] α →
----
Γ ⊢ a ⦂ ⟦ x ↦ a ⟧ α
|
other.7z/NEWS.7z/NEWS/テープリストア/NEWS_05/NEWS_05.tar/home/kimura/kart/risc.lzh/risc/join/Result-j.asm
|
prismotizm/gigaleak
| 0 |
17924
|
Name: Result-j.asm
Type: file
Size: 70020
Last-Modified: '1992-07-14T23:56:58Z'
SHA-1: CD14BEF1261F89702CDFAFBB13B5A7084AFD8F93
Description: null
|
tools/scitools/conf/understand/ada/ada95/i-fortra.ads
|
brucegua/moocos
| 1 |
14842
|
------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- I N T E R F A C E S . F O R T R A N --
-- --
-- S p e c --
-- --
-- $Revision: 2 $ --
-- --
-- This specification is adapted from the Ada Reference Manual for use with --
-- GNAT. In accordance with the copyright of that document, you can freely --
-- copy and modify this specification, provided that if you redistribute a --
-- modified version, any changes that you have made are clearly indicated. --
-- --
------------------------------------------------------------------------------
with Ada.Numerics.Generic_Complex_Types;
pragma Elaborate_All (Ada.Numerics.Generic_Complex_Types);
package Interfaces.Fortran is
pragma Pure (Fortran);
type Fortran_Integer is new Integer;
type Real is new Float;
type Double_Precision is new Long_Float;
type Logical is new Boolean;
package Single_Precision_Complex_Types is
new Ada.Numerics.Generic_Complex_Types (Real);
type Complex is new Single_Precision_Complex_Types.Complex;
type Imaginary is new Single_Precision_Complex_Types.Imaginary;
i : constant Imaginary := Imaginary (Single_Precision_Complex_Types.i);
j : constant Imaginary := Imaginary (Single_Precision_Complex_Types.j);
type Character_Set is new Character;
type Fortran_Character is array (Positive range <>) of Character_Set;
pragma Pack (Fortran_Character);
function To_Fortran (Item : in Character) return Character_Set;
function To_Ada (Item : in Character_Set) return Character;
function To_Fortran (Item : in String) return Fortran_Character;
function To_Ada (Item : in Fortran_Character) return String;
procedure To_Fortran
(Item : in String;
Target : out Fortran_Character;
Last : out Natural);
procedure To_Ada
(Item : in Fortran_Character;
Target : out String;
Last : out Natural);
end Interfaces.Fortran;
|
oeis/245/A245656.asm
|
neoneye/loda-programs
| 11 |
98274
|
; A245656: Characteristic function of arithmetic numbers, cf. A003601.
; Submitted by <NAME>(s4)
; 1,0,1,0,1,1,1,0,0,0,1,0,1,1,1,0,1,0,1,1,1,1,1,0,0,0,1,0,1,1,1,0,1,0,1,0,1,1,1,0,1,1,1,1,1,1,1,0,1,0,1,0,1,1,1,1,1,0,1,1,1,1,0,0,1,1,1,1,1,1,1,0,1,0,0,0,1,1,1,0,0,0,1,0,1,1,1,0,1,0,1,1,1,1,1,1,1,0,1,0
seq $0,54025 ; Sum of divisors of n read modulo (number of divisors of n).
cmp $0,0
|
programs/oeis/190/A190440.asm
|
neoneye/loda
| 22 |
167813
|
; A190440: [(bn+c)r]-b[nr]-[cr], where (r,b,c)=(golden ratio,4,0) and []=floor.
; 2,0,3,1,0,2,1,3,2,0,3,1,0,2,1,3,2,0,2,1,3,2,0,3,1,0,2,1,3,2,0,3,1,0,2,0,3,1,0,2,1,3,2,0,3,1,0,2,1,3,2,0,3,1,3,2,0,3,1,0,2,1,3,2,0,3,1,0,2,1,3,1,0,2,1,3,2,0,3,1,0,2,1,3,2,0,3,1,0,2,0,3,1,0,2,1,3,2,0,3
mul $0,2
add $0,2
mul $0,2
seq $0,60143 ; a(n) = floor(n/tau), where tau = (1 + sqrt(5))/2.
mod $0,4
|
src/lumen-font-txf.ads
|
darkestkhan/lumen
| 8 |
22466
|
-- Lumen.Font.Txf -- Display textual information using texture-mapped fonts
--
-- <NAME>, NiEstu, Phoenix AZ, Summer 2010
-- Credit for the design of the texfont mechanism belongs to <NAME>,
-- who invented it while he was at SGI. His paper on the topic, and his
-- original source code, may be found here:
--
-- http://www.opengl.org/resources/code/samples/mjktips/TexFont/TexFont.html
--
-- Mark's contributions to the field of computer graphics, and to the
-- advancement of OpenGL in particular, cannot be overstated.
-- This code is covered by the ISC License:
--
-- Copyright © 2010, NiEstu
--
-- Permission to use, copy, modify, and/or distribute this software for any
-- purpose with or without fee is hereby granted, provided that the above
-- copyright notice and this permission notice appear in all copies.
--
-- The software is provided "as is" and the author disclaims all warranties
-- with regard to this software including all implied warranties of
-- merchantability and fitness. In no event shall the author be liable for any
-- special, direct, indirect, or consequential damages or any damages
-- whatsoever resulting from loss of use, data or profits, whether in an
-- action of contract, negligence or other tortious action, arising out of or
-- in connection with the use or performance of this software.
-- Environment
with Ada.Finalization;
with Lumen.GL;
package Lumen.Font.Txf is
---------------------------------------------------------------------------
-- Exceptions added by this package
Unknown_Format : exception; -- can't recognize the file's data
Invalid_Format : exception; -- thought we did, but encountered bad values
No_Glyph : exception; -- character has no glyph in the font
---------------------------------------------------------------------------
-- Our font handle, used to refer to fonts within the library and app
type Font_Info_Pointer is private;
type Handle is new Ada.Finalization.Limited_Controlled with record
Info : Font_Info_Pointer;
end record;
overriding procedure Finalize (Font : in out Handle);
---------------------------------------------------------------------------
-- Load a texture font
procedure Load (Font : in out Handle;
Pathname : in String);
-- Unload a texture font
procedure Unload (Font : in out Handle);
-- Set up an OpenGL texture object. If Object is zero, create a new object
-- to use for the font's texture.
function Establish_Texture (Font : in Handle;
Object : in GL.UInt;
Setup_Mipmaps : in Boolean) return GL.UInt;
-- Bind the font's texture to an OpenGL texture object
procedure Bind_Font_Texture (Font : in Handle);
-- Return dimensions of given string, to permit calculations for placing it
-- in a scene
procedure Get_String_Metrics (Font : in Handle;
Str : in String;
Width : out Natural;
Max_Ascent : out Natural;
Max_Descent : out Natural);
-- Render a single character
procedure Render (Font : in Handle;
Char : in Character);
-- Render a string of characters
procedure Render (Font : in Handle;
Str : in String);
-- Will eventually have (Wide_)Wide_String and UTF-8 too
---------------------------------------------------------------------------
private
type Font_Info;
type Font_Info_Pointer is access Font_Info;
---------------------------------------------------------------------------
end Lumen.Font.Txf;
|
case-studies/performance/verification/alloy/ppc/tests/safe069.als
|
uwplse/memsynth
| 19 |
3239
|
module tests/safe069
open program
open model
/**
PPC safe069
"SyncdWR Fre SyncdWW Wse"
Cycle=SyncdWR Fre SyncdWW Wse
Relax=
Safe=Fre Wse SyncdWW SyncdWR
{
0:r2=x; 0:r4=y;
1:r2=y; 1:r4=x;
}
P0 | P1 ;
li r1,1 | li r1,2 ;
stw r1,0(r2) | stw r1,0(r2) ;
sync | sync ;
li r3,1 | lwz r3,0(r4) ;
stw r3,0(r4) | ;
exists
(y=2 /\ 1:r3=0)
**/
one sig x, y extends Location {}
one sig P1, P2 extends Processor {}
one sig op1 extends Write {}
one sig op2 extends Sync {}
one sig op3 extends Write {}
one sig op4 extends Write {}
one sig op5 extends Sync {}
one sig op6 extends Read {}
fact {
P1.write[1, op1, x, 1]
P1.sync[2, op2]
P1.write[3, op3, y, 1]
P2.write[4, op4, y, 2]
P2.sync[5, op5]
P2.read[6, op6, x, 0]
}
fact {
y.final[2]
}
Allowed:
run { Allowed_PPC } for 4 int expect 0
|
examples/str.adb
|
ytomino/drake
| 33 |
4759
|
with Ada.Strings.Functions;
with Ada.Strings.Maps.Constants;
with Ada.Strings.Unbounded_Strings;
with System;
with Ada.Strings.Fixed;
with Ada.Strings.Bounded;
with Ada.Strings.Unbounded;
procedure str is
begin
-- operators
declare
X : String := "11";
begin
pragma Assert (X > "0");
pragma Assert (X < "2");
pragma Assert (X > "10");
pragma Assert (X < "12");
null;
end;
-- search functions
declare
abcabc : String := "abcabc";
Text : String := "the south on south";
function M (Item : Wide_Wide_Character) return Wide_Wide_Character is
begin
case Item is
when 'a' => return 'b';
when others => return Item;
end case;
end M;
begin
pragma Assert (Ada.Strings.Functions.Index_Element ("abc", 'b') = 2);
pragma Assert (Ada.Strings.Functions.Index_Element ("abc", 'd') = 0);
pragma Assert (Ada.Strings.Functions.Index_Element (abcabc (3 .. 6), 'b') = 5);
pragma Assert (Ada.Strings.Fixed.Index ("aaabbb", "bbb") = 4);
pragma Assert (Ada.Strings.Fixed.Index ("aaabbb", "aaa", Going => Ada.Strings.Backward) = 1);
pragma Assert (Ada.Strings.Fixed.Index ("aaabbb", "ab", Going => Ada.Strings.Backward, Mapping => M'Access) = 0);
pragma Assert (Ada.Strings.Fixed.Index ("bcac", "bc", Going => Ada.Strings.Backward, Mapping => M'Access) = 3);
pragma Assert (Ada.Strings.Fixed.Index (Text (10 .. Text'Last), "south") = 14);
pragma Assert (Ada.Strings.Fixed.Index (Text, "south", 10, Mapping => Ada.Strings.Maps.Identity) = 14);
pragma Assert (Ada.Strings.Fixed.Index (Text, "SOUTH", 10, Mapping => Ada.Strings.Maps.Constants.Upper_Case_Map) = 14);
pragma Assert (Ada.Strings.Fixed.Index (Text, "south", 10, Going => Ada.Strings.Backward, Mapping => Ada.Strings.Maps.Identity) = 5);
pragma Assert (Ada.Strings.Fixed.Index (Text, "SOUTH", 10, Going => Ada.Strings.Backward, Mapping => Ada.Strings.Maps.Constants.Upper_Case_Map) = 5);
null;
end;
-- fixed
declare
T : constant String (10 .. 19) := "0123456789";
R : String (1 .. 3);
begin
Ada.Strings.Fixed.Move ("+", R, Justify => Ada.Strings.Center);
pragma Assert (R = " + ");
Ada.Strings.Fixed.Move ("++", R, Justify => Ada.Strings.Center);
pragma Assert (R = "++ ");
Ada.Strings.Fixed.Move ("+++", R, Justify => Ada.Strings.Center);
pragma Assert (R = "+++");
Ada.Strings.Fixed.Move ("+ ", R, Justify => Ada.Strings.Center);
pragma Assert (R = " + ");
Ada.Strings.Fixed.Move ("1234 ", R, Justify => Ada.Strings.Left, Drop => Ada.Strings.Left);
pragma Assert (R = "234");
Ada.Strings.Fixed.Move (" 1234", R, Justify => Ada.Strings.Right, Drop => Ada.Strings.Right);
pragma Assert (R = "123");
R := "_/_";
Ada.Strings.Fixed.Trim (R, Side => Ada.Strings.Both, Blank => '_', Justify => Ada.Strings.Center);
pragma Assert (R = " / ");
R := "/__";
Ada.Strings.Fixed.Trim (R, Side => Ada.Strings.Both, Blank => '_', Justify => Ada.Strings.Center);
pragma Assert (R = " / ");
R := "__/";
Ada.Strings.Fixed.Trim (R, Side => Ada.Strings.Both, Blank => '_', Justify => Ada.Strings.Center);
pragma Assert (R = " / ");
R := "123";
Ada.Strings.Fixed.Replace_Slice (R, 2, 3, "4", Justify => Ada.Strings.Right);
pragma Assert (R = " 14");
Ada.Strings.Fixed.Replace_Slice (R, 3, 2, "23", Drop => Ada.Strings.Left);
pragma Assert (R = "234");
pragma Assert (Ada.Strings.Fixed.Overwrite (T, 13, "DEF") = "012DEF6789");
pragma Assert (Ada.Strings.Fixed.Delete (T, 13, 16) = "012789");
pragma Assert (Ada.Strings.Fixed.Delete (T, T'Last + 1, 0) = T);
pragma Assert (Ada.Strings.Fixed.Delete (T, T'First, T'Last) = "");
pragma Assert (Ada.Strings.Fixed."*" (2, "ABC") = "ABCABC");
pragma Assert (Ada.Strings.Fixed.Head (T, 5) = "01234");
pragma Assert (Ada.Strings.Fixed.Head ("###", 5) = "### ");
pragma Assert (Ada.Strings.Fixed.Tail (T, 5) = "56789");
pragma Assert (Ada.Strings.Fixed.Tail ("###", 5) = " ###");
end;
-- bounded
declare
package BP is new Ada.Strings.Bounded.Generic_Bounded_Length (10);
use type BP.Bounded_String;
T : constant BP.Bounded_String := +"123456789A";
B : BP.Bounded_String := +"123";
begin
BP.Delete (B, 2, 2);
pragma Assert (B = "13");
pragma Assert (BP.Delete (T, 4, 7) = "12389A");
B := T;
BP.Delete (B, 4, 7);
pragma Assert (B = "12389A");
pragma Assert (BP.Replicate (2, "ABCDE", Drop => Ada.Strings.Error) = "ABCDEABCDE");
pragma Assert (BP.Replicate (4, "ABC", Drop => Ada.Strings.Right) = "ABCABCABCA");
pragma Assert (BP.Replicate (4, "ABC", Drop => Ada.Strings.Left) = "CABCABCABC");
B := +"123";
BP.Head (B, 5);
pragma Assert (B = "123 ");
BP.Tail (B, 7);
pragma Assert (B = " 123 ");
BP.Head (B, 3);
pragma Assert (B = " 1");
BP.Tail (B, 1);
pragma Assert (B = "1");
pragma Assert (BP.Head (T, 5) = "12345");
pragma Assert (BP.Head (+"###", 5) = "### ");
pragma Assert (BP.Head (T, 12, Drop => Ada.Strings.Left) = "3456789A ");
pragma Assert (BP.Tail (T, 5) = "6789A");
pragma Assert (BP.Tail (+"###", 5) = " ###");
pragma Assert (BP.Tail (T, 12, Drop => Ada.Strings.Right) = " 12345678");
end;
-- unbounded
declare
use type Ada.Strings.Unbounded.Unbounded_String;
use type System.Address;
U, V : aliased Ada.Strings.Unbounded.Unbounded_String;
A : System.Address;
package CP is new Ada.Strings.Unbounded_Strings.Generic_Constant (new String'("CONSTANT"));
begin
pragma Assert (U = "");
pragma Assert (U.Constant_Reference.Element.all = "");
U := +"B";
Ada.Debug.Put (Integer'Image (U.Capacity));
pragma Assert (U > "A");
pragma Assert (U = "B");
pragma Assert (U < "C");
Ada.Strings.Unbounded.Set_Unbounded_String (U, "1234"); -- reserve 4
Ada.Strings.Unbounded.Append (U, "5"); -- reserve 8 (4 * 2 > 4 + 1)
A := U.Constant_Reference.Element.all'Address;
V := U; -- sharing
Ada.Strings.Unbounded.Append (V, "V"); -- use reserved area
pragma Assert (V.Constant_Reference.Element.all'Address = A); -- same area
Ada.Strings.Unbounded.Append (U, "U"); -- reallocating
pragma Assert (U.Constant_Reference.Element.all'Address /= A); -- other area
pragma Assert (U = "12345U");
pragma Assert (V = "12345V");
pragma Assert (V.Reference.Element.all = "12345V");
A := V.Constant_Reference.Element.all'Address;
Ada.Strings.Unbounded.Delete (V, 2, 3);
pragma Assert (V.Constant_Reference.Element.all'Address = A); -- keep area
pragma Assert (V.Reference.Element.all = "145V");
U := CP.Value;
A := U.Constant_Reference.Element.all'Address;
V := U; -- sharing
pragma Assert (U = "CONSTANT");
Ada.Strings.Unbounded.Append (V, "V"); -- reallocating
pragma Assert (U = "CONSTANT");
pragma Assert (V = "CONSTANTV");
pragma Assert (U.Constant_Reference.Element.all'Address = A);
pragma Assert (V.Constant_Reference.Element.all'Address /= A);
Ada.Strings.Unbounded.Unbounded_Slice (U, U, 3, 6); -- both Source and Target
pragma Assert (U = "NSTA");
U := CP.Value;
Ada.Strings.Unbounded.Replace_Element (U, 1, 'c'); -- unique
pragma Assert (U = "cONSTANT");
pragma Assert (Ada.Strings.Unbounded.Delete (U, 3, 6) = "cONT");
pragma Assert (Ada.Strings.Unbounded."*" (2, U) = "cONSTANTcONSTANT");
pragma Assert (Ada.Strings.Unbounded.Replace_Slice (U, 4, 5, "st") = "cONstANT");
U := +"123";
Ada.Strings.Unbounded.Head (U, 5);
pragma Assert (U = "123 ");
Ada.Strings.Unbounded.Tail (U, 7);
pragma Assert (U = " 123 ");
Ada.Strings.Unbounded.Head (U, 3);
pragma Assert (U = " 1");
Ada.Strings.Unbounded.Tail (U, 1);
pragma Assert (U = "1");
pragma Assert (Ada.Strings.Unbounded.Head (+"###", 5) = "### ");
pragma Assert (Ada.Strings.Unbounded.Tail (+"###", 5) = " ###");
end;
pragma Debug (Ada.Debug.Put ("OK"));
end str;
|
test/utest_getWinningCondition.asm
|
daullmer/tic-tac-toe
| 1 |
171774
|
# adresse an der der speicherstand gespeichert ist
.eqv board 0x10008000
li a0, board
li a1, 1
sw a1, 0(gp)
sw a1, 4(gp)
sw a1, 8(gp)
jal getWinningCondition
mv s2, a0
jal clean_board
li a0, board
li a1, 2
sw a1, 12(gp)
sw a1, 16(gp)
sw a1, 20(gp)
jal getWinningCondition
mv s3, a0
jal clean_board
li a0, board
li a1, 2
sw a1, 24(gp)
sw a1, 28(gp)
sw a1, 32(gp)
jal getWinningCondition
mv s4, a0
jal clean_board
li a0, board
li a1, 2
sw a1, 0(gp)
sw a1, 12(gp)
sw a1, 24(gp)
jal getWinningCondition
mv s5, a0
jal clean_board
li a0, board
li a1, 2
sw a1, 4(gp)
sw a1, 16(gp)
sw a1, 28(gp)
jal getWinningCondition
mv s6, a0
jal clean_board
li a0, board
li a1, 2
sw a1, 8(gp)
sw a1, 20(gp)
sw a1, 32(gp)
jal getWinningCondition
mv s7, a0
jal clean_board
li a0, board
li a1, 2
sw a1, 0(gp)
sw a1, 16(gp)
sw a1, 32(gp)
jal getWinningCondition
mv s8, a0
jal clean_board
li a0, board
li a1, 2
sw a1, 24(gp)
sw a1, 16(gp)
sw a1, 8(gp)
jal getWinningCondition
mv s9, a0
jal clean_board
li a0, board
jal getWinningCondition
mv s10, a0
li a7, 10
ecall
clean_board:
li a1, 0
sw a1, 0(gp)
sw a1, 4(gp)
sw a1, 8(gp)
sw a1, 12(gp)
sw a1, 16(gp)
sw a1, 20(gp)
sw a1, 24(gp)
sw a1, 28(gp)
sw a1, 32(gp)
ret
.include "../src/check_end_game.asm"
|
alloy4fun_models/trashltl/models/19/zEx7NSgJZCMSDFgoZ.als
|
Kaixi26/org.alloytools.alloy
| 0 |
509
|
open main
pred idzEx7NSgJZCMSDFgoZ_prop20 {
always (all f:File | f in Trash since no(f & Protected) )
}
pred __repair { idzEx7NSgJZCMSDFgoZ_prop20 }
check __repair { idzEx7NSgJZCMSDFgoZ_prop20 <=> prop20o }
|
org.alloytools.alloy.extra/extra/models/book/appendixA/tube.als
|
Kaixi26/org.alloytools.alloy
| 527 |
4342
|
<gh_stars>100-1000
module appendixA/tube
abstract sig Station {
jubilee, central, circle: set Station
}
sig Jubilee, Central, Circle in Station {}
one sig
Stanmore, BakerStreet, BondStreet, Westminster, Waterloo,
WestRuislip, EalingBroadway, NorthActon, NottingHillGate,
LiverpoolStreet, Epping
extends Station {}
fact {
// the constraints should go here
}
pred show {}
run show
|
programs/oeis/087/A087113.asm
|
karttu/loda
| 1 |
104596
|
<gh_stars>1-10
; A087113: Essentially a duplicate of A005843.
; 2,4,6,8,10,12,14,16,18,20,22,24,26,28,30,32,34,36,38,40,42,44,46,48
add $0,1
mul $0,2
mov $1,$0
|
programs/oeis/016/A016187.asm
|
neoneye/loda
| 22 |
600
|
<filename>programs/oeis/016/A016187.asm
; A016187: Expansion of 1/((1-8x)(1-11x)).
; 1,19,273,3515,42761,503139,5796673,65860555,741243321,8287894259,92240578673,1023236299995,11324318776681,125117262357379,1380687932442273,15222751628953835,167731742895202841
add $0,1
mov $1,11
pow $1,$0
mov $2,8
pow $2,$0
sub $1,$2
div $1,3
mov $0,$1
|
Transynther/x86/_processed/AVXALIGN/_ht_zr_/i7-7700_9_0xca_notsx.log_144_871.asm
|
ljhsiun2/medusa
| 9 |
2415
|
.global s_prepare_buffers
s_prepare_buffers:
push %r9
push %rbp
push %rbx
push %rcx
push %rdi
push %rdx
push %rsi
lea addresses_A_ht+0x4139, %rbp
nop
nop
nop
and $2047, %r9
mov $0x6162636465666768, %rbx
movq %rbx, %xmm4
movups %xmm4, (%rbp)
nop
inc %rdx
lea addresses_WT_ht+0x119ae, %rsi
lea addresses_D_ht+0x19139, %rdi
nop
nop
nop
nop
sub $8174, %rbx
mov $34, %rcx
rep movsb
nop
nop
nop
nop
nop
sub %rdx, %rdx
lea addresses_normal_ht+0xd139, %rbp
nop
nop
xor %r9, %r9
mov (%rbp), %rcx
nop
nop
nop
add $63526, %rbp
lea addresses_WT_ht+0x17539, %rcx
nop
nop
lfence
movb (%rcx), %bl
nop
nop
nop
nop
and $20222, %rbx
pop %rsi
pop %rdx
pop %rdi
pop %rcx
pop %rbx
pop %rbp
pop %r9
ret
.global s_faulty_load
s_faulty_load:
push %r10
push %r11
push %r12
push %r13
push %r8
push %rax
push %rbp
// Store
lea addresses_PSE+0x1f2b9, %rbp
cmp %r13, %r13
mov $0x5152535455565758, %r10
movq %r10, (%rbp)
mfence
// Store
lea addresses_WC+0x69f9, %r8
cmp %rax, %rax
mov $0x5152535455565758, %r13
movq %r13, (%r8)
nop
nop
nop
nop
cmp %rax, %rax
// Load
lea addresses_US+0x6939, %r12
sub $35874, %rbp
movups (%r12), %xmm4
vpextrq $1, %xmm4, %r8
nop
nop
nop
nop
nop
sub $12476, %rax
// Load
lea addresses_PSE+0x1939, %r11
clflush (%r11)
nop
nop
nop
xor %rax, %rax
vmovups (%r11), %ymm1
vextracti128 $0, %ymm1, %xmm1
vpextrq $0, %xmm1, %r12
xor %r12, %r12
// Faulty Load
lea addresses_PSE+0x1939, %rax
clflush (%rax)
nop
nop
nop
nop
and $60320, %r13
movaps (%rax), %xmm2
vpextrq $1, %xmm2, %r11
lea oracles, %rax
and $0xff, %r11
shlq $12, %r11
mov (%rax,%r11,1), %r11
pop %rbp
pop %rax
pop %r8
pop %r13
pop %r12
pop %r11
pop %r10
ret
/*
<gen_faulty_load>
[REF]
{'src': {'NT': False, 'AVXalign': False, 'size': 4, 'congruent': 0, 'same': False, 'type': 'addresses_PSE'}, 'OP': 'LOAD'}
{'dst': {'NT': False, 'AVXalign': True, 'size': 8, 'congruent': 7, 'same': False, 'type': 'addresses_PSE'}, 'OP': 'STOR'}
{'dst': {'NT': False, 'AVXalign': False, 'size': 8, 'congruent': 5, 'same': False, 'type': 'addresses_WC'}, 'OP': 'STOR'}
{'src': {'NT': False, 'AVXalign': False, 'size': 16, 'congruent': 11, 'same': False, 'type': 'addresses_US'}, 'OP': 'LOAD'}
{'src': {'NT': False, 'AVXalign': False, 'size': 32, 'congruent': 0, 'same': True, 'type': 'addresses_PSE'}, 'OP': 'LOAD'}
[Faulty Load]
{'src': {'NT': False, 'AVXalign': True, 'size': 16, 'congruent': 0, 'same': True, 'type': 'addresses_PSE'}, 'OP': 'LOAD'}
<gen_prepare_buffer>
{'dst': {'NT': False, 'AVXalign': False, 'size': 16, 'congruent': 11, 'same': False, 'type': 'addresses_A_ht'}, 'OP': 'STOR'}
{'src': {'congruent': 0, 'same': False, 'type': 'addresses_WT_ht'}, 'dst': {'congruent': 11, 'same': False, 'type': 'addresses_D_ht'}, 'OP': 'REPM'}
{'src': {'NT': False, 'AVXalign': True, 'size': 8, 'congruent': 11, 'same': False, 'type': 'addresses_normal_ht'}, 'OP': 'LOAD'}
{'src': {'NT': False, 'AVXalign': False, 'size': 1, 'congruent': 10, 'same': False, 'type': 'addresses_WT_ht'}, 'OP': 'LOAD'}
{'00': 4, '49': 140}
49 49 49 49 49 00 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 00 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 00 49 00 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49 49
*/
|
cql/src/main/java/com/huawei/streaming/cql/semanticanalyzer/parser/Expressions.g4
|
chenqixu/StreamCQL
| 8 |
2201
|
/**
* Licensed to the Apache Software Foundation (ASF) under one
* or more contributor license agreements. See the NOTICE file
* distributed with this work for additional information
* regarding copyright ownership. The ASF licenses this file
* to you 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.
*/
/*
表达式语法定义
CQL的各种运算符
算术运算符:+,-,*,/,%,DIV(取余)
关系运算符:>,<,>=,<=,=,!=,<>
逻辑运算符:And,Or,Not
位运算符:按位与(&),按位或(|),按位非(~),按位异或(^)
连接运算符: '+'
CQL运算符优先级从高到低:
cast,case,when,
一元运算符(+,-,^) (正负)
算术运算符(*,/,DIV(取余))
算术运算符(+,-)
连接运算符('||')
位运算符(&,|,~,^)
关系运算符(=, !=, <, >, <=, >=,<>)
IS [NOT] NULL, LIKE, [NOT] BETWEEN,[NOT] IN, EXISTS,
not
and
or
说明:
1、可以使用括号改变优先级顺序,括号内的运算先执行
2、可以看出OR的优先级最低,算术运算符的优先级最高,原子类型的表达式和常量优先计算
3、乘除的优先级高于加减;
4、同一优先级运算符从左向右执行
*/
parser grammar Expressions;
expression
: logicExpressionOr
;
logicExpressionOr
: logicExpressionAnd (KW_OR logicExpressionAnd)*
;
logicExpressionAnd
: logicExpressionNot (KW_AND logicExpressionNot)*
;
logicExpressionNot
: identifierNot? equalRelationExpression
;
equalRelationExpression
: isNullLikeInExpressions
;
isNullLikeInExpressions
: binaryExpression
(KW_IS nullCondition)?
;
subQueryExpression
: LPAREN selectStatement RPAREN
;
binaryExpression
: bitExpression relationExpression*
;
relationExpression
: relationOperator bitExpression
;
relationOperator
: EQUAL
| EQUAL_NS
| NOTEQUAL
| LESSTHANOREQUALTO
| LESSTHAN
| GREATERTHANOREQUALTO
| GREATERTHAN
;
precedenceEqualNegatableOperator
: KW_LIKE
| KW_RLIKE
| KW_REGEXP
;
bitExpression
: arithmeticPlusMinusExpression (bitOperator arithmeticPlusMinusExpression)*
;
bitOperator
: BITWISEOR
| AMPERSAND
| BITWISEXOR
;
arithmeticPlusMinusExpression
: arithmeticStarExpression (arithmeticPlusOperator arithmeticStarExpression)*
;
arithmeticPlusOperator
: PLUS
| MINUS
| CONCATENATION
;
arithmeticStarExpression
: fieldExpression (arithmeticStarOperator fieldExpression)*
;
fieldExpression
: (streamNameOrAlias DOT)? atomExpression
;
arithmeticStarOperator
: STAR
| DIVIDE
| MOD
| DIV
;
atomExpression
: constNull
| constant
| function
| castExpression
| columnName
| expressionWithLaparen
;
expressionWithLaparen
: LPAREN expression RPAREN
;
constant
: unaryOperator?
(
constIntegerValue
| constLongValue
| constFloatValue
| constDoubleValue
| constBigDecimalValue
)
| constStingValue
| booleanValue
;
constStingValue
: StringLiteral
;
constIntegerValue
: IntegerNumber
;
constLongValue
: LongLiteral
;
constFloatValue
: FloatLiteral
;
constDoubleValue
: DoubleLiteral
;
constBigDecimalValue
: DecimalLiteral
;
function
: functionName LPAREN distinct? (selectExpression (COMMA selectExpression)*)? RPAREN
;
castExpression
: KW_CAST LPAREN expression KW_AS primitiveType RPAREN
;
booleanValue
: KW_TRUE
| KW_FALSE
;
expressions
: LPAREN expression (COMMA expression)* RPAREN
;
|
test/fail/IrrelevantFamilyIndex.agda
|
asr/agda-kanso
| 1 |
15817
|
-- Andreas, 2011-04-07
module IrrelevantFamilyIndex where
data Nat : Set where
zero : Nat
suc : Nat -> Nat
-- irrelevant index
data Fin : .Nat -> Set where
zero : .(n : Nat) -> Fin (suc n)
suc : .(n : Nat) -> Fin n -> Fin (suc n)
t : Fin zero
t = zero zero
-- the following is ok, since Fin _ is really just Nat
toNat : Fin zero -> Nat
toNat (zero _) = zero
toNat (suc _ i) = suc (toNat i)
data Pos : Nat -> Set where
pos : (n : Nat) -> Pos (suc n)
f : (n : Nat) -> Fin n -> Pos n
f .(suc n) (zero n) = pos n
f .(suc n) (suc n i) = pos n
-- cannot infer value of dot pattern
{-
f : (n : Nat) -> Fin n -> Pos n
f .(suc _) (zero _) = pos _
f .(suc _) (suc _ _) = pos _
f' : (n : Nat) -> Fin n -> Pos n
f' _ (zero _) = pos _
f' _ (suc _ _) = pos _
-}
|
src/dandanator/nmiroutine.asm
|
fjpena/sword-of-ianna-zx
| 67 |
161293
|
; OUTPUT nmiroutine.bin
ORG 0x0066 ; NMI address
; ----------------------------------------------------------------------------------------
; NMI ROUTINE @ 0x0066 - NMI Subrutine is used for PIC Firmware Upgrade
; ----------------------------------------------------------------------------------------
NMI: POP BC ; Discard Caller Address to avoid Stack overflow
LD A,(NMICNT) ; Load current Counter
LD C,A
LD A,(NMICNT+1)
LD B,A
OR C ; Check for first NMI
JR NZ, NOFIRSTNMI
PUSH BC
CALL CLS ; Clear Screen
XOR A
LD (STROKEFLAG),A ; Texts not Crossed out
OUT ($FE),A ; Border 0
BOXPTR: LD DE,7
LD B,11
LD C, 3
CALL CRtoATTR
LD A,9 ; INK 1 Paper 1 Bright 0 Flash 0
LD B,11 ; Y Steps
ALLLINES: LD C,B
LD B,25 ; X Steps
LINEPTR: LD (HL),A
INC HL
DJNZ LINEPTR
ADD HL,DE
LD B,C
DJNZ ALLLINES
UPGRADEPRT: LD A, 87 ; INK 7 Paper 2 Bright1 Flash 0
LD B,12 ; PRINT AT 6,12 x,y
LD C,4
CALL PREP_PRT ; Update Attribute var &Screen & Attributes pointers
LD IX, UPFWPICTXT1 ; Update Firmware text
CALL PRINTSTR ; Print String
NOTOUCHPRT: LD A, 79 ; INK 7 Paper 1 Bright1 Flash 0
LD B,16 ; PRINT AT 9,16 x,y
LD C,9
CALL PREP_PRT ; Update Attribute var &Screen & Attributes pointers
LD IX, UPFWPICTXT2 ; Update Firmware text
CALL PRINTSTR ; Print String
PROGRESSPRT:LD A, 63 ; INK 7 Paper 7 Bright0 Flash 0
LD B,20 ; PRINT AT 6,16 x,y
LD C,9
CALL PREP_PRT ; Update Attribute var &Screen & Attributes pointers
LD IX, UPFWPICTXT3 ; Update Firmware text
CALL PRINTSTR ; Print String
POP BC
NOFIRSTNMI:
LD HL,PICFWRAMADDR
ADD HL,BC ; HL Points to Data to send
INC BC ; Count Up
LD A,C ; Save count back to RAM
LD (NMICNT),A
LD A,B
LD (NMICNT+1),A
PROGBAR: PUSH HL ; Save Pointer to active Data byte to Send
ADD A,9
LD C,A ; Update upgrade bar every 256 bytes
LD B, 20
CALL CRtoATTR ; Get Attr Coordinates
LD A, 100 ; INK 4, Paper 4, Bright 1, Flash 0
LD (HL),A ; Update Attributes in progress bar
POP HL
PULSEBACK: LD A,(HL) ; Load Data byte to send
OR A
JR Z, NMI_DLOCK ; Do not send anything if 0 (otherwise it will send 256 (which is also ok))
LD B,A
PULSELP: LD (DDNTRADDRCMD),A ; Send Pulse (any Dandanator Memory addr since ZesarUX wont be emulating this part)
PUSH HL ; Not to fast pulses - Delay
POP HL
DJNZ PULSELP ; Loop to complete pulses=Data byte value
NMI_DLOCK: JR NMI_DLOCK ; Will wait here until another NMI Call
RETN ; Return Control to Program (Will never reach this code)
; ----------------------------------------------------------------------------------------
INCLUDE "print_routines.asm"
UPFWPICTXT1:DEFM "PIC uC Firmware Update", 0
UPFWPICTXT2:DEFM "Hands Off! :)", 0
UPFWPICTXT3:DEFM " " , 0
PICFWRAMADDR: DEFM "DNTRMFW-Up" ; Magic String identifying firmware to the bootloader
incbin "pic-fw.bin"
NMICNT EQU 23400 ; NMI Counter for PIC Firmware Upgrade (2 bytes)
DDNTRADDRCONF EQU 0 ; Address for (Command - Data 1 - Data 2) Confirmation to Dandanator Mini (ZesarUX)
DDNTRADDRCMD EQU 1 ; Address for Command to Dandanator Mini (ZesarUX) (Already defined on cartload.asm)
DDNTRADDRDAT1 EQU 2 ; Address for Data 1 to Dandanator Mini (ZesarUX)
DDNTRADDRDAT2 EQU 3 ; Address for Data 2 to Dandanator Mini (ZesarUX)
|
07/MemoryAccess/BasicTest/BasicTest.asm
|
gabrieljablonski/ESC-College-Course-Work
| 0 |
160369
|
// push constant 10
@10
D=A
@SP
A=M
M=D
@SP
M=M+1
// pop LCL 0
@LCL
D=M
@0
D=A+D
@R13
M=D
@SP
M=M-1
A=M
D=M
@R13
A=M
M=D
// push constant 21
@21
D=A
@SP
A=M
M=D
@SP
M=M+1
// push constant 22
@22
D=A
@SP
A=M
M=D
@SP
M=M+1
// pop ARG 2
@ARG
D=M
@2
D=A+D
@R13
M=D
@SP
M=M-1
A=M
D=M
@R13
A=M
M=D
// pop ARG 1
@ARG
D=M
@1
D=A+D
@R13
M=D
@SP
M=M-1
A=M
D=M
@R13
A=M
M=D
// push constant 36
@36
D=A
@SP
A=M
M=D
@SP
M=M+1
// pop THIS 6
@THIS
D=M
@6
D=A+D
@R13
M=D
@SP
M=M-1
A=M
D=M
@R13
A=M
M=D
// push constant 42
@42
D=A
@SP
A=M
M=D
@SP
M=M+1
// push constant 45
@45
D=A
@SP
A=M
M=D
@SP
M=M+1
// pop THAT 5
@THAT
D=M
@5
D=A+D
@R13
M=D
@SP
M=M-1
A=M
D=M
@R13
A=M
M=D
// pop THAT 2
@THAT
D=M
@2
D=A+D
@R13
M=D
@SP
M=M-1
A=M
D=M
@R13
A=M
M=D
// push constant 510
@510
D=A
@SP
A=M
M=D
@SP
M=M+1
// pop temp 6
@5
D=A
@6
D=A+D
@R13
M=D
@SP
M=M-1
A=M
D=M
@R13
A=M
M=D
// push LCL 0
@LCL
D=M
@0
A=A+D
D=M
@SP
A=M
M=D
@SP
M=M+1
// push THAT 5
@THAT
D=M
@5
A=A+D
D=M
@SP
A=M
M=D
@SP
M=M+1
// add
@SP
M=M-1
A=M
D=M
@SP
M=M-1
A=M
D=M+D
@SP
A=M
M=D
@SP
M=M+1
// push ARG 1
@ARG
D=M
@1
A=A+D
D=M
@SP
A=M
M=D
@SP
M=M+1
// sub
@SP
M=M-1
A=M
D=M
@SP
M=M-1
A=M
D=M-D
@SP
A=M
M=D
@SP
M=M+1
// push THIS 6
@THIS
D=M
@6
A=A+D
D=M
@SP
A=M
M=D
@SP
M=M+1
// push THIS 6
@THIS
D=M
@6
A=A+D
D=M
@SP
A=M
M=D
@SP
M=M+1
// add
@SP
M=M-1
A=M
D=M
@SP
M=M-1
A=M
D=M+D
@SP
A=M
M=D
@SP
M=M+1
// sub
@SP
M=M-1
A=M
D=M
@SP
M=M-1
A=M
D=M-D
@SP
A=M
M=D
@SP
M=M+1
// push temp 6
@5
D=A
@6
A=A+D
D=M
@SP
A=M
M=D
@SP
M=M+1
// add
@SP
M=M-1
A=M
D=M
@SP
M=M-1
A=M
D=M+D
@SP
A=M
M=D
@SP
M=M+1
|
pwnlib/shellcraft/templates/mips/mov.asm
|
jdsecurity/binjitsu
| 5 |
175018
|
<%
from pwnlib.util import lists, packing, fiddling, misc
from pwnlib.constants import eval, Constant
from pwnlib.context import context as ctx # Ugly hack, mako will not let it be called context
from pwnlib.log import getLogger
from pwnlib.shellcraft import mips, registers, pretty, okay
log = getLogger('pwnlib.shellcraft.mips.mov')
%>
<%page args="dst, src"/>
<%docstring>
Move src into dst without newlines and null bytes.
Register $t8 and $t9 are not guarenteed to be preserved.
If src is a string that is not a register, then it will locally set
`context.arch` to `'mips'` and use :func:`pwnlib.constants.eval` to evaluate the
string. Note that this means that this shellcode can change behavior depending
on the value of `context.os`.
Args:
dst (str): The destination register.
src (str): Either the input register, or an immediate value.
Example:
>>> print shellcraft.mips.mov('$t0', 0).rstrip()
slti $t0, $zero, 0xFFFF /* $t0 = 0 */
>>> print shellcraft.mips.mov('$t2', 0).rstrip()
xor $t2, $t2, $t2 /* $t2 = 0 */
>>> print shellcraft.mips.mov('$t0', 0xcafebabe).rstrip()
li $t0, 0xcafebabe
>>> print shellcraft.mips.mov('$t2', 0xcafebabe).rstrip()
li $t9, 0xcafebabe
add $t2, $t9, $zero
>>> print shellcraft.mips.mov('$s0', 0xca0000be).rstrip()
li $t9, ~0xca0000be
not $s0, $t9
>>> print shellcraft.mips.mov('$s0', 0xca0000ff).rstrip()
li $t9, 0x1010101 ^ 0xca0000ff
li $s0, 0x1010101
xor $s0, $t9, $s0
>>> print shellcraft.mips.mov('$t9', 0xca0000be).rstrip()
li $t9, ~0xca0000be
not $t9, $t9
>>> print shellcraft.mips.mov('$t2', 0xca0000be).rstrip()
li $t9, ~0xca0000be
not $t9, $t9
add $t2, $t9, $0 /* mov $t2, $t9 */
>>> print shellcraft.mips.mov('$t2', 0xca0000ff).rstrip()
li $t8, 0x1010101 ^ 0xca0000ff
li $t9, 0x1010101
xor $t9, $t8, $t9
add $t2, $t9, $0 /* mov $t2, $t9 */
>>> print shellcraft.mips.mov('$a0', '$t2').rstrip()
add $a0, $t2, $0 /* mov $a0, $t2 */
>>> print shellcraft.mips.mov('$a0', '$t8').rstrip()
sw $t8, -4($sp) /* mov $a0, $t8 */
lw $a0, -4($sp)
</%docstring>
<%
if isinstance(src, str) and src.startswith('$') and src not in registers.mips:
log.error("Unknown register %r" % src)
return
if not dst.startswith('$'):
log.error("Registers must start with $")
return
if isinstance(src, str) and dst.startswith('$') and dst not in registers.mips:
log.error("Unknown register %r" % dst)
return
if isinstance(src, str) and src not in registers.mips:
src = eval(src)
src_reg = registers.mips.get(src, None)
dst_reg = registers.mips.get(dst, None)
tmp_reg = '$t9' if dst_reg != registers.mips['$t9'] else '$t8'
if src_reg == 0:
src = 0
src_reg = None
%>\
% if None not in (src_reg, dst_reg):
% if src_reg == dst_reg:
## Nop.
/* mov ${dst}, ${src} is a noop */
% elif src_reg not in [2, 3, 4, 5, 6, 7, 8, 16, 24]:
## Avoid using a src in the list because it causes NULL byte
add ${dst}, ${src}, $0 /* mov ${dst}, ${src} */
% else:
## Better than two 'li' instructions due to being two instructions
## fewer. 'li' is actually 'lui' and 'ori' in hiding.
sw ${src}, -4($sp) /* mov ${dst}, ${src} */
lw ${dst}, -4($sp)
% endif
% elif dst_reg == 10:
## Register $t2/$10 may encodes a newline for 'lui $t2, XXXX'
## so we have to send everything through $t9.
%if okay(src):
li $t9, ${pretty(src)}
add ${dst}, $t9, $zero
% elif src in (0, '$zero', '$0'):
xor ${dst}, ${dst}, ${dst} /* ${dst} = 0 */
% elif dst == '$t2':
${mips.mov('$t9', src)}
${mips.mov(dst, '$t9')}
%endif
% elif isinstance(src, (int, long)):
## Everything else is the general case for moving into registers.
<%
srcp = packing.pack(src, word_size=32)
srcu = packing.unpack(srcp, word_size=32, sign=False)
%>
% if src in (0, '$zero', '$0'):
## XOR sometimes encodes a zero byte, so use SLTI instead
slti ${dst}, $zero, 0xFFFF /* ${dst} = 0 */
% elif okay(src):
## Nice and easy
li ${dst}, ${pretty(src)}
% elif okay((~srcu) & 0xffffffff):
## Almost nice and easy
li $t9, ~${pretty(src)}
not ${dst}, $t9
% else:
<%
a,b = fiddling.xor_pair(srcp, avoid = '\x00\n')
a = hex(packing.unpack(a, 32))
b = hex(packing.unpack(b, 32))
%>
li ${tmp_reg}, ${a} ^ ${pretty(src)}
li ${dst}, ${a}
xor ${dst}, ${tmp_reg}, ${dst}
% endif
% endif
|
Task/Multiplication-tables/AppleScript/multiplication-tables-2.applescript
|
LaudateCorpus1/RosettaCodeData
| 1 |
3320
|
<filename>Task/Multiplication-tables/AppleScript/multiplication-tables-2.applescript
tableText(multTable(1, 12))
-- multTable :: Int -> [[String]]
on multTable(m, n)
set axis to enumFromTo(m, n)
script column
on |λ|(x)
script row
on |λ|(y)
if y < x then
""
else
(x * y) as string
end if
end |λ|
end script
{x & map(row, axis)}
end |λ|
end script
{{"x"} & axis} & concatMap(column, axis)
end multTable
-- TABLE DISPLAY --------------------------------------------------------------
-- tableText :: [[Int]] -> String
on tableText(lstTable)
script tableLine
on |λ|(lstLine)
script tableCell
on |λ|(int)
(characters -4 thru -1 of (" " & int)) as string
end |λ|
end script
intercalate(" ", map(tableCell, lstLine))
end |λ|
end script
intercalate(linefeed, map(tableLine, lstTable))
end tableText
-- GENERIC FUNCTIONS ----------------------------------------------------------
-- concatMap :: (a -> [b]) -> [a] -> [b]
on concatMap(f, xs)
set lst to {}
set lng to length of xs
tell mReturn(f)
repeat with i from 1 to lng
set lst to (lst & |λ|(item i of xs, i, xs))
end repeat
end tell
return lst
end concatMap
-- enumFromTo :: Int -> Int -> [Int]
on enumFromTo(m, n)
if m > n then
set d to -1
else
set d to 1
end if
set lst to {}
repeat with i from m to n by d
set end of lst to i
end repeat
return lst
end enumFromTo
-- foldl :: (a -> b -> a) -> a -> [b] -> a
on foldl(f, startValue, xs)
tell mReturn(f)
set v to startValue
set lng to length of xs
repeat with i from 1 to lng
set v to |λ|(v, item i of xs, i, xs)
end repeat
return v
end tell
end foldl
-- intercalate :: Text -> [Text] -> Text
on intercalate(strText, lstText)
set {dlm, my text item delimiters} to {my text item delimiters, strText}
set strJoined to lstText as text
set my text item delimiters to dlm
return strJoined
end intercalate
-- justifyRight :: Int -> Char -> Text -> Text
on justifyRight(n, cFiller, strText)
if n > length of strText then
text -n thru -1 of ((replicate(n, cFiller) as text) & strText)
else
strText
end if
end justifyRight
-- map :: (a -> b) -> [a] -> [b]
on map(f, xs)
tell mReturn(f)
set lng to length of xs
set lst to {}
repeat with i from 1 to lng
set end of lst to |λ|(item i of xs, i, xs)
end repeat
return lst
end tell
end map
-- Lift 2nd class handler function into 1st class script wrapper
-- mReturn :: Handler -> Script
on mReturn(f)
if class of f is script then
f
else
script
property |λ| : f
end script
end if
end mReturn
|
test/asset/agda-stdlib-1.0/Codata/Conat/Properties.agda
|
omega12345/agda-mode
| 0 |
14855
|
<gh_stars>0
------------------------------------------------------------------------
-- The Agda standard library
--
-- Properties for Conats
------------------------------------------------------------------------
{-# OPTIONS --without-K --safe --sized-types #-}
module Codata.Conat.Properties where
open import Data.Nat
open import Codata.Thunk
open import Codata.Conat
open import Codata.Conat.Bisimilarity
open import Function
open import Relation.Nullary
open import Relation.Binary
sℕ≤s⁻¹ : ∀ {m n} → suc m ℕ≤ suc n → m ℕ≤ n .force
sℕ≤s⁻¹ (sℕ≤s p) = p
_ℕ≤?_ : Decidable _ℕ≤_
zero ℕ≤? n = yes zℕ≤n
suc m ℕ≤? zero = no (λ ())
suc m ℕ≤? suc n with m ℕ≤? n .force
... | yes p = yes (sℕ≤s p)
... | no ¬p = no (¬p ∘′ sℕ≤s⁻¹)
0ℕ+-identity : ∀ {i n} → i ⊢ 0 ℕ+ n ≈ n
0ℕ+-identity = refl
+ℕ0-identity : ∀ {i n} → i ⊢ n +ℕ 0 ≈ n
+ℕ0-identity {n = zero} = zero
+ℕ0-identity {n = suc n} = suc λ where .force → +ℕ0-identity
|
bool-test.agda
|
rfindler/ial
| 29 |
852
|
module bool-test where
open import bool
open import eq
open import level
~~tt : ~ ~ tt ≡ tt
~~tt = refl
~~ff : ~ ~ ff ≡ ff
~~ff = refl
~~-elim2 : ∀ (b : 𝔹) → ~ ~ b ≡ b
~~-elim2 tt = ~~tt
~~-elim2 ff = ~~ff
~~tt' : ~ ~ tt ≡ tt
~~tt' = refl{lzero}{𝔹}{tt}
~~ff' : ~ ~ ff ≡ ff
~~ff' = refl{lzero}{𝔹}{ff}
test1 : 𝔹
test1 = tt && ff
test2 : 𝔹
test2 = tt && tt
test1-ff : test1 ≡ ff
test1-ff = refl
test2-tt : test2 ≡ tt
test2-tt = refl
|
gcc-gcc-7_3_0-release/gcc/testsuite/gnat.dg/discr33.adb
|
best08618/asylo
| 7 |
27870
|
-- { dg-do run }
procedure Discr33 is
subtype Int is Integer range 1..100;
type T (D : Int := 1) is
record
A : Integer;
B : String (1..D);
C : aliased Integer;
end record;
Var : T := (D => 1, A => 1234, B => "x", C => 4567);
type Int_Ref is access all Integer;
Pointer_To_C : Int_Ref := Var.C'Access;
begin
if Pointer_To_C.all /= 4567 then
raise Program_Error;
end if;
Var := (D => 26, A => 1234, B => "abcdefghijklmnopqrstuvwxyz", C => 2345);
if Pointer_To_C.all /= 2345 then
raise Program_Error;
end if;
end Discr33;
|
source/tabula-users-load.adb
|
ytomino/vampire
| 1 |
20022
|
<gh_stars>1-10
-- The Village of Vampire by YT, このソースコードはNYSLです
with Ada.Exceptions;
with Ada.Streams.Stream_IO;
with Serialization.YAML;
with YAML.Streams;
with Tabula.Users.User_Info_IO;
procedure Tabula.Users.Load (
Name : in String;
Info : in out User_Info)
is
File : Ada.Streams.Stream_IO.File_Type;
begin
Ada.Streams.Stream_IO.Open (File, Ada.Streams.Stream_IO.In_File, Name => Name);
declare
Parser : aliased YAML.Parser :=
YAML.Streams.Create (Ada.Streams.Stream_IO.Stream (File));
begin
User_Info_IO.IO (
Serialization.YAML.Reading (Parser'Access, User_Info_IO.Yaml_Type).Serializer,
Info);
YAML.Finish (Parser);
end;
Ada.Streams.Stream_IO.Close (File);
exception
when E : others =>
declare
Message : constant String :=
Name & ": " & Ada.Exceptions.Exception_Message (E);
begin
Ada.Debug.Put (Message);
Ada.Exceptions.Raise_Exception (
Ada.Exceptions.Exception_Identity (E),
Message);
end;
end Tabula.Users.Load;
|
tests/roms/state_change.asm
|
AndreaOrru/Gilgamesh
| 25 |
96385
|
incsrc lorom.asm
org $8000
reset:
sep #$30 ; $008000
jsr state_change ; $008002
lda #$1234 ; $008005
ldx #$1234 ; $008008
.loop:
jmp .loop ; $00800B
state_change:
rep #$30 ; $00800E
rts ; $008010
|
oslab6/obj/user/forktree.asm
|
jasha64/OperatingSystems-lab
| 0 |
104130
|
obj/user/forktree.debug: 文件格式 elf32-i386
Disassembly of section .text:
00800020 <_start>:
// starts us running when we are initially loaded into a new environment.
.text
.globl _start
_start:
// See if we were started with arguments on the stack
cmpl $USTACKTOP, %esp
800020: 81 fc 00 e0 bf ee cmp $0xeebfe000,%esp
jne args_exist
800026: 75 04 jne 80002c <args_exist>
// If not, push dummy argc/argv arguments.
// This happens when we are loaded by the kernel,
// because the kernel does not know about passing arguments.
pushl $0
800028: 6a 00 push $0x0
pushl $0
80002a: 6a 00 push $0x0
0080002c <args_exist>:
args_exist:
call libmain
80002c: e8 b2 00 00 00 call 8000e3 <libmain>
1: jmp 1b
800031: eb fe jmp 800031 <args_exist+0x5>
00800033 <forktree>:
}
}
void
forktree(const char *cur)
{
800033: 55 push %ebp
800034: 89 e5 mov %esp,%ebp
800036: 53 push %ebx
800037: 83 ec 04 sub $0x4,%esp
80003a: 8b 5d 08 mov 0x8(%ebp),%ebx
cprintf("%04x: I am '%s'\n", sys_getenvid(), cur);
80003d: e8 68 0b 00 00 call 800baa <sys_getenvid>
800042: 83 ec 04 sub $0x4,%esp
800045: 53 push %ebx
800046: 50 push %eax
800047: 68 a0 13 80 00 push $0x8013a0
80004c: e8 7f 01 00 00 call 8001d0 <cprintf>
forkchild(cur, '0');
800051: 83 c4 08 add $0x8,%esp
800054: 6a 30 push $0x30
800056: 53 push %ebx
800057: e8 13 00 00 00 call 80006f <forkchild>
forkchild(cur, '1');
80005c: 83 c4 08 add $0x8,%esp
80005f: 6a 31 push $0x31
800061: 53 push %ebx
800062: e8 08 00 00 00 call 80006f <forkchild>
}
800067: 83 c4 10 add $0x10,%esp
80006a: 8b 5d fc mov -0x4(%ebp),%ebx
80006d: c9 leave
80006e: c3 ret
0080006f <forkchild>:
{
80006f: 55 push %ebp
800070: 89 e5 mov %esp,%ebp
800072: 56 push %esi
800073: 53 push %ebx
800074: 83 ec 1c sub $0x1c,%esp
800077: 8b 5d 08 mov 0x8(%ebp),%ebx
80007a: 8b 75 0c mov 0xc(%ebp),%esi
if (strlen(cur) >= DEPTH)
80007d: 53 push %ebx
80007e: e8 35 07 00 00 call 8007b8 <strlen>
800083: 83 c4 10 add $0x10,%esp
800086: 83 f8 02 cmp $0x2,%eax
800089: 7e 07 jle 800092 <forkchild+0x23>
}
80008b: 8d 65 f8 lea -0x8(%ebp),%esp
80008e: 5b pop %ebx
80008f: 5e pop %esi
800090: 5d pop %ebp
800091: c3 ret
snprintf(nxt, DEPTH+1, "%s%c", cur, branch);
800092: 83 ec 0c sub $0xc,%esp
800095: 89 f0 mov %esi,%eax
800097: 0f be f0 movsbl %al,%esi
80009a: 56 push %esi
80009b: 53 push %ebx
80009c: 68 b1 13 80 00 push $0x8013b1
8000a1: 6a 04 push $0x4
8000a3: 8d 45 f4 lea -0xc(%ebp),%eax
8000a6: 50 push %eax
8000a7: e8 f2 06 00 00 call 80079e <snprintf>
if (fork() == 0) {
8000ac: 83 c4 20 add $0x20,%esp
8000af: e8 f5 0d 00 00 call 800ea9 <fork>
8000b4: 85 c0 test %eax,%eax
8000b6: 75 d3 jne 80008b <forkchild+0x1c>
forktree(nxt);
8000b8: 83 ec 0c sub $0xc,%esp
8000bb: 8d 45 f4 lea -0xc(%ebp),%eax
8000be: 50 push %eax
8000bf: e8 6f ff ff ff call 800033 <forktree>
exit();
8000c4: e8 60 00 00 00 call 800129 <exit>
8000c9: 83 c4 10 add $0x10,%esp
8000cc: eb bd jmp 80008b <forkchild+0x1c>
008000ce <umain>:
void
umain(int argc, char **argv)
{
8000ce: 55 push %ebp
8000cf: 89 e5 mov %esp,%ebp
8000d1: 83 ec 14 sub $0x14,%esp
forktree("");
8000d4: 68 b0 13 80 00 push $0x8013b0
8000d9: e8 55 ff ff ff call 800033 <forktree>
}
8000de: 83 c4 10 add $0x10,%esp
8000e1: c9 leave
8000e2: c3 ret
008000e3 <libmain>:
const volatile struct Env *thisenv;
const char *binaryname = "<unknown>";
void
libmain(int argc, char **argv)
{
8000e3: 55 push %ebp
8000e4: 89 e5 mov %esp,%ebp
8000e6: 56 push %esi
8000e7: 53 push %ebx
8000e8: 8b 5d 08 mov 0x8(%ebp),%ebx
8000eb: 8b 75 0c mov 0xc(%ebp),%esi
// set thisenv to point at our Env structure in envs[].
// LAB 3: Your code here.
envid_t envid = sys_getenvid();
8000ee: e8 b7 0a 00 00 call 800baa <sys_getenvid>
thisenv = envs + ENVX(envid);
8000f3: 25 ff 03 00 00 and $0x3ff,%eax
8000f8: 6b c0 7c imul $0x7c,%eax,%eax
8000fb: 05 00 00 c0 ee add $0xeec00000,%eax
800100: a3 04 20 80 00 mov %eax,0x802004
// save the name of the program so that panic() can use it
if (argc > 0)
800105: 85 db test %ebx,%ebx
800107: 7e 07 jle 800110 <libmain+0x2d>
binaryname = argv[0];
800109: 8b 06 mov (%esi),%eax
80010b: a3 00 20 80 00 mov %eax,0x802000
// call user main routine
umain(argc, argv);
800110: 83 ec 08 sub $0x8,%esp
800113: 56 push %esi
800114: 53 push %ebx
800115: e8 b4 ff ff ff call 8000ce <umain>
// exit gracefully
exit();
80011a: e8 0a 00 00 00 call 800129 <exit>
}
80011f: 83 c4 10 add $0x10,%esp
800122: 8d 65 f8 lea -0x8(%ebp),%esp
800125: 5b pop %ebx
800126: 5e pop %esi
800127: 5d pop %ebp
800128: c3 ret
00800129 <exit>:
#include <inc/lib.h>
void
exit(void)
{
800129: 55 push %ebp
80012a: 89 e5 mov %esp,%ebp
80012c: 83 ec 14 sub $0x14,%esp
// close_all();
sys_env_destroy(0);
80012f: 6a 00 push $0x0
800131: e8 33 0a 00 00 call 800b69 <sys_env_destroy>
}
800136: 83 c4 10 add $0x10,%esp
800139: c9 leave
80013a: c3 ret
0080013b <putch>:
};
static void
putch(int ch, struct printbuf *b)
{
80013b: 55 push %ebp
80013c: 89 e5 mov %esp,%ebp
80013e: 53 push %ebx
80013f: 83 ec 04 sub $0x4,%esp
800142: 8b 5d 0c mov 0xc(%ebp),%ebx
b->buf[b->idx++] = ch;
800145: 8b 13 mov (%ebx),%edx
800147: 8d 42 01 lea 0x1(%edx),%eax
80014a: 89 03 mov %eax,(%ebx)
80014c: 8b 4d 08 mov 0x8(%ebp),%ecx
80014f: 88 4c 13 08 mov %cl,0x8(%ebx,%edx,1)
if (b->idx == 256-1) {
800153: 3d ff 00 00 00 cmp $0xff,%eax
800158: 74 09 je 800163 <putch+0x28>
sys_cputs(b->buf, b->idx);
b->idx = 0;
}
b->cnt++;
80015a: 83 43 04 01 addl $0x1,0x4(%ebx)
}
80015e: 8b 5d fc mov -0x4(%ebp),%ebx
800161: c9 leave
800162: c3 ret
sys_cputs(b->buf, b->idx);
800163: 83 ec 08 sub $0x8,%esp
800166: 68 ff 00 00 00 push $0xff
80016b: 8d 43 08 lea 0x8(%ebx),%eax
80016e: 50 push %eax
80016f: e8 b8 09 00 00 call 800b2c <sys_cputs>
b->idx = 0;
800174: c7 03 00 00 00 00 movl $0x0,(%ebx)
80017a: 83 c4 10 add $0x10,%esp
80017d: eb db jmp 80015a <putch+0x1f>
0080017f <vcprintf>:
int
vcprintf(const char *fmt, va_list ap)
{
80017f: 55 push %ebp
800180: 89 e5 mov %esp,%ebp
800182: 81 ec 18 01 00 00 sub $0x118,%esp
struct printbuf b;
b.idx = 0;
800188: c7 85 f0 fe ff ff 00 movl $0x0,-0x110(%ebp)
80018f: 00 00 00
b.cnt = 0;
800192: c7 85 f4 fe ff ff 00 movl $0x0,-0x10c(%ebp)
800199: 00 00 00
vprintfmt((void*)putch, &b, fmt, ap);
80019c: ff 75 0c pushl 0xc(%ebp)
80019f: ff 75 08 pushl 0x8(%ebp)
8001a2: 8d 85 f0 fe ff ff lea -0x110(%ebp),%eax
8001a8: 50 push %eax
8001a9: 68 3b 01 80 00 push $0x80013b
8001ae: e8 1a 01 00 00 call 8002cd <vprintfmt>
sys_cputs(b.buf, b.idx);
8001b3: 83 c4 08 add $0x8,%esp
8001b6: ff b5 f0 fe ff ff pushl -0x110(%ebp)
8001bc: 8d 85 f8 fe ff ff lea -0x108(%ebp),%eax
8001c2: 50 push %eax
8001c3: e8 64 09 00 00 call 800b2c <sys_cputs>
return b.cnt;
}
8001c8: 8b 85 f4 fe ff ff mov -0x10c(%ebp),%eax
8001ce: c9 leave
8001cf: c3 ret
008001d0 <cprintf>:
int
cprintf(const char *fmt, ...)
{
8001d0: 55 push %ebp
8001d1: 89 e5 mov %esp,%ebp
8001d3: 83 ec 10 sub $0x10,%esp
va_list ap;
int cnt;
va_start(ap, fmt);
8001d6: 8d 45 0c lea 0xc(%ebp),%eax
cnt = vcprintf(fmt, ap);
8001d9: 50 push %eax
8001da: ff 75 08 pushl 0x8(%ebp)
8001dd: e8 9d ff ff ff call 80017f <vcprintf>
va_end(ap);
return cnt;
}
8001e2: c9 leave
8001e3: c3 ret
008001e4 <printnum>:
* using specified putch function and associated pointer putdat.
*/
static void
printnum(void (*putch)(int, void*), void *putdat,
unsigned long long num, unsigned base, int width, int padc)
{
8001e4: 55 push %ebp
8001e5: 89 e5 mov %esp,%ebp
8001e7: 57 push %edi
8001e8: 56 push %esi
8001e9: 53 push %ebx
8001ea: 83 ec 1c sub $0x1c,%esp
8001ed: 89 c7 mov %eax,%edi
8001ef: 89 d6 mov %edx,%esi
8001f1: 8b 45 08 mov 0x8(%ebp),%eax
8001f4: 8b 55 0c mov 0xc(%ebp),%edx
8001f7: 89 45 d8 mov %eax,-0x28(%ebp)
8001fa: 89 55 dc mov %edx,-0x24(%ebp)
// first recursively print all preceding (more significant) digits
if (num >= base) {
8001fd: 8b 4d 10 mov 0x10(%ebp),%ecx
800200: bb 00 00 00 00 mov $0x0,%ebx
800205: 89 4d e0 mov %ecx,-0x20(%ebp)
800208: 89 5d e4 mov %ebx,-0x1c(%ebp)
80020b: 39 d3 cmp %edx,%ebx
80020d: 72 05 jb 800214 <printnum+0x30>
80020f: 39 45 10 cmp %eax,0x10(%ebp)
800212: 77 7a ja 80028e <printnum+0xaa>
printnum(putch, putdat, num / base, base, width - 1, padc);
800214: 83 ec 0c sub $0xc,%esp
800217: ff 75 18 pushl 0x18(%ebp)
80021a: 8b 45 14 mov 0x14(%ebp),%eax
80021d: 8d 58 ff lea -0x1(%eax),%ebx
800220: 53 push %ebx
800221: ff 75 10 pushl 0x10(%ebp)
800224: 83 ec 08 sub $0x8,%esp
800227: ff 75 e4 pushl -0x1c(%ebp)
80022a: ff 75 e0 pushl -0x20(%ebp)
80022d: ff 75 dc pushl -0x24(%ebp)
800230: ff 75 d8 pushl -0x28(%ebp)
800233: e8 28 0f 00 00 call 801160 <__udivdi3>
800238: 83 c4 18 add $0x18,%esp
80023b: 52 push %edx
80023c: 50 push %eax
80023d: 89 f2 mov %esi,%edx
80023f: 89 f8 mov %edi,%eax
800241: e8 9e ff ff ff call 8001e4 <printnum>
800246: 83 c4 20 add $0x20,%esp
800249: eb 13 jmp 80025e <printnum+0x7a>
} else {
// print any needed pad characters before first digit
while (--width > 0)
putch(padc, putdat);
80024b: 83 ec 08 sub $0x8,%esp
80024e: 56 push %esi
80024f: ff 75 18 pushl 0x18(%ebp)
800252: ff d7 call *%edi
800254: 83 c4 10 add $0x10,%esp
while (--width > 0)
800257: 83 eb 01 sub $0x1,%ebx
80025a: 85 db test %ebx,%ebx
80025c: 7f ed jg 80024b <printnum+0x67>
}
// then print this (the least significant) digit
putch("0123456789abcdef"[num % base], putdat);
80025e: 83 ec 08 sub $0x8,%esp
800261: 56 push %esi
800262: 83 ec 04 sub $0x4,%esp
800265: ff 75 e4 pushl -0x1c(%ebp)
800268: ff 75 e0 pushl -0x20(%ebp)
80026b: ff 75 dc pushl -0x24(%ebp)
80026e: ff 75 d8 pushl -0x28(%ebp)
800271: e8 0a 10 00 00 call 801280 <__umoddi3>
800276: 83 c4 14 add $0x14,%esp
800279: 0f be 80 c0 13 80 00 movsbl 0x8013c0(%eax),%eax
800280: 50 push %eax
800281: ff d7 call *%edi
}
800283: 83 c4 10 add $0x10,%esp
800286: 8d 65 f4 lea -0xc(%ebp),%esp
800289: 5b pop %ebx
80028a: 5e pop %esi
80028b: 5f pop %edi
80028c: 5d pop %ebp
80028d: c3 ret
80028e: 8b 5d 14 mov 0x14(%ebp),%ebx
800291: eb c4 jmp 800257 <printnum+0x73>
00800293 <sprintputch>:
int cnt;
};
static void
sprintputch(int ch, struct sprintbuf *b)
{
800293: 55 push %ebp
800294: 89 e5 mov %esp,%ebp
800296: 8b 45 0c mov 0xc(%ebp),%eax
b->cnt++;
800299: 83 40 08 01 addl $0x1,0x8(%eax)
if (b->buf < b->ebuf)
80029d: 8b 10 mov (%eax),%edx
80029f: 3b 50 04 cmp 0x4(%eax),%edx
8002a2: 73 0a jae 8002ae <sprintputch+0x1b>
*b->buf++ = ch;
8002a4: 8d 4a 01 lea 0x1(%edx),%ecx
8002a7: 89 08 mov %ecx,(%eax)
8002a9: 8b 45 08 mov 0x8(%ebp),%eax
8002ac: 88 02 mov %al,(%edx)
}
8002ae: 5d pop %ebp
8002af: c3 ret
008002b0 <printfmt>:
{
8002b0: 55 push %ebp
8002b1: 89 e5 mov %esp,%ebp
8002b3: 83 ec 08 sub $0x8,%esp
va_start(ap, fmt);
8002b6: 8d 45 14 lea 0x14(%ebp),%eax
vprintfmt(putch, putdat, fmt, ap);
8002b9: 50 push %eax
8002ba: ff 75 10 pushl 0x10(%ebp)
8002bd: ff 75 0c pushl 0xc(%ebp)
8002c0: ff 75 08 pushl 0x8(%ebp)
8002c3: e8 05 00 00 00 call 8002cd <vprintfmt>
}
8002c8: 83 c4 10 add $0x10,%esp
8002cb: c9 leave
8002cc: c3 ret
008002cd <vprintfmt>:
{
8002cd: 55 push %ebp
8002ce: 89 e5 mov %esp,%ebp
8002d0: 57 push %edi
8002d1: 56 push %esi
8002d2: 53 push %ebx
8002d3: 83 ec 2c sub $0x2c,%esp
8002d6: 8b 75 08 mov 0x8(%ebp),%esi
8002d9: 8b 5d 0c mov 0xc(%ebp),%ebx
8002dc: 8b 7d 10 mov 0x10(%ebp),%edi
8002df: e9 c1 03 00 00 jmp 8006a5 <vprintfmt+0x3d8>
padc = ' ';
8002e4: c6 45 d4 20 movb $0x20,-0x2c(%ebp)
altflag = 0;
8002e8: c7 45 d8 00 00 00 00 movl $0x0,-0x28(%ebp)
precision = -1;
8002ef: c7 45 d0 ff ff ff ff movl $0xffffffff,-0x30(%ebp)
width = -1;
8002f6: c7 45 e0 ff ff ff ff movl $0xffffffff,-0x20(%ebp)
lflag = 0;
8002fd: b9 00 00 00 00 mov $0x0,%ecx
switch (ch = *(unsigned char *) fmt++) {
800302: 8d 47 01 lea 0x1(%edi),%eax
800305: 89 45 e4 mov %eax,-0x1c(%ebp)
800308: 0f b6 17 movzbl (%edi),%edx
80030b: 8d 42 dd lea -0x23(%edx),%eax
80030e: 3c 55 cmp $0x55,%al
800310: 0f 87 12 04 00 00 ja 800728 <vprintfmt+0x45b>
800316: 0f b6 c0 movzbl %al,%eax
800319: ff 24 85 00 15 80 00 jmp *0x801500(,%eax,4)
800320: 8b 7d e4 mov -0x1c(%ebp),%edi
padc = '-';
800323: c6 45 d4 2d movb $0x2d,-0x2c(%ebp)
800327: eb d9 jmp 800302 <vprintfmt+0x35>
switch (ch = *(unsigned char *) fmt++) {
800329: 8b 7d e4 mov -0x1c(%ebp),%edi
padc = '0';
80032c: c6 45 d4 30 movb $0x30,-0x2c(%ebp)
800330: eb d0 jmp 800302 <vprintfmt+0x35>
switch (ch = *(unsigned char *) fmt++) {
800332: 0f b6 d2 movzbl %dl,%edx
800335: 8b 7d e4 mov -0x1c(%ebp),%edi
for (precision = 0; ; ++fmt) {
800338: b8 00 00 00 00 mov $0x0,%eax
80033d: 89 4d e4 mov %ecx,-0x1c(%ebp)
precision = precision * 10 + ch - '0';
800340: 8d 04 80 lea (%eax,%eax,4),%eax
800343: 8d 44 42 d0 lea -0x30(%edx,%eax,2),%eax
ch = *fmt;
800347: 0f be 17 movsbl (%edi),%edx
if (ch < '0' || ch > '9')
80034a: 8d 4a d0 lea -0x30(%edx),%ecx
80034d: 83 f9 09 cmp $0x9,%ecx
800350: 77 55 ja 8003a7 <vprintfmt+0xda>
for (precision = 0; ; ++fmt) {
800352: 83 c7 01 add $0x1,%edi
precision = precision * 10 + ch - '0';
800355: eb e9 jmp 800340 <vprintfmt+0x73>
precision = va_arg(ap, int);
800357: 8b 45 14 mov 0x14(%ebp),%eax
80035a: 8b 00 mov (%eax),%eax
80035c: 89 45 d0 mov %eax,-0x30(%ebp)
80035f: 8b 45 14 mov 0x14(%ebp),%eax
800362: 8d 40 04 lea 0x4(%eax),%eax
800365: 89 45 14 mov %eax,0x14(%ebp)
switch (ch = *(unsigned char *) fmt++) {
800368: 8b 7d e4 mov -0x1c(%ebp),%edi
if (width < 0)
80036b: 83 7d e0 00 cmpl $0x0,-0x20(%ebp)
80036f: 79 91 jns 800302 <vprintfmt+0x35>
width = precision, precision = -1;
800371: 8b 45 d0 mov -0x30(%ebp),%eax
800374: 89 45 e0 mov %eax,-0x20(%ebp)
800377: c7 45 d0 ff ff ff ff movl $0xffffffff,-0x30(%ebp)
80037e: eb 82 jmp 800302 <vprintfmt+0x35>
800380: 8b 45 e0 mov -0x20(%ebp),%eax
800383: 85 c0 test %eax,%eax
800385: ba 00 00 00 00 mov $0x0,%edx
80038a: 0f 49 d0 cmovns %eax,%edx
80038d: 89 55 e0 mov %edx,-0x20(%ebp)
switch (ch = *(unsigned char *) fmt++) {
800390: 8b 7d e4 mov -0x1c(%ebp),%edi
800393: e9 6a ff ff ff jmp 800302 <vprintfmt+0x35>
800398: 8b 7d e4 mov -0x1c(%ebp),%edi
altflag = 1;
80039b: c7 45 d8 01 00 00 00 movl $0x1,-0x28(%ebp)
goto reswitch;
8003a2: e9 5b ff ff ff jmp 800302 <vprintfmt+0x35>
8003a7: 8b 4d e4 mov -0x1c(%ebp),%ecx
8003aa: 89 45 d0 mov %eax,-0x30(%ebp)
8003ad: eb bc jmp 80036b <vprintfmt+0x9e>
lflag++;
8003af: 83 c1 01 add $0x1,%ecx
switch (ch = *(unsigned char *) fmt++) {
8003b2: 8b 7d e4 mov -0x1c(%ebp),%edi
goto reswitch;
8003b5: e9 48 ff ff ff jmp 800302 <vprintfmt+0x35>
putch(va_arg(ap, int), putdat);
8003ba: 8b 45 14 mov 0x14(%ebp),%eax
8003bd: 8d 78 04 lea 0x4(%eax),%edi
8003c0: 83 ec 08 sub $0x8,%esp
8003c3: 53 push %ebx
8003c4: ff 30 pushl (%eax)
8003c6: ff d6 call *%esi
break;
8003c8: 83 c4 10 add $0x10,%esp
putch(va_arg(ap, int), putdat);
8003cb: 89 7d 14 mov %edi,0x14(%ebp)
break;
8003ce: e9 cf 02 00 00 jmp 8006a2 <vprintfmt+0x3d5>
err = va_arg(ap, int);
8003d3: 8b 45 14 mov 0x14(%ebp),%eax
8003d6: 8d 78 04 lea 0x4(%eax),%edi
8003d9: 8b 00 mov (%eax),%eax
8003db: 99 cltd
8003dc: 31 d0 xor %edx,%eax
8003de: 29 d0 sub %edx,%eax
if (err >= MAXERROR || (p = error_string[err]) == NULL)
8003e0: 83 f8 0f cmp $0xf,%eax
8003e3: 7f 23 jg 800408 <vprintfmt+0x13b>
8003e5: 8b 14 85 60 16 80 00 mov 0x801660(,%eax,4),%edx
8003ec: 85 d2 test %edx,%edx
8003ee: 74 18 je 800408 <vprintfmt+0x13b>
printfmt(putch, putdat, "%s", p);
8003f0: 52 push %edx
8003f1: 68 e1 13 80 00 push $0x8013e1
8003f6: 53 push %ebx
8003f7: 56 push %esi
8003f8: e8 b3 fe ff ff call 8002b0 <printfmt>
8003fd: 83 c4 10 add $0x10,%esp
err = va_arg(ap, int);
800400: 89 7d 14 mov %edi,0x14(%ebp)
800403: e9 9a 02 00 00 jmp 8006a2 <vprintfmt+0x3d5>
printfmt(putch, putdat, "error %d", err);
800408: 50 push %eax
800409: 68 d8 13 80 00 push $0x8013d8
80040e: 53 push %ebx
80040f: 56 push %esi
800410: e8 9b fe ff ff call 8002b0 <printfmt>
800415: 83 c4 10 add $0x10,%esp
err = va_arg(ap, int);
800418: 89 7d 14 mov %edi,0x14(%ebp)
printfmt(putch, putdat, "error %d", err);
80041b: e9 82 02 00 00 jmp 8006a2 <vprintfmt+0x3d5>
if ((p = va_arg(ap, char *)) == NULL)
800420: 8b 45 14 mov 0x14(%ebp),%eax
800423: 83 c0 04 add $0x4,%eax
800426: 89 45 cc mov %eax,-0x34(%ebp)
800429: 8b 45 14 mov 0x14(%ebp),%eax
80042c: 8b 38 mov (%eax),%edi
p = "(null)";
80042e: 85 ff test %edi,%edi
800430: b8 d1 13 80 00 mov $0x8013d1,%eax
800435: 0f 44 f8 cmove %eax,%edi
if (width > 0 && padc != '-')
800438: 83 7d e0 00 cmpl $0x0,-0x20(%ebp)
80043c: 0f 8e bd 00 00 00 jle 8004ff <vprintfmt+0x232>
800442: 80 7d d4 2d cmpb $0x2d,-0x2c(%ebp)
800446: 75 0e jne 800456 <vprintfmt+0x189>
800448: 89 75 08 mov %esi,0x8(%ebp)
80044b: 8b 75 d0 mov -0x30(%ebp),%esi
80044e: 89 5d 0c mov %ebx,0xc(%ebp)
800451: 8b 5d e0 mov -0x20(%ebp),%ebx
800454: eb 6d jmp 8004c3 <vprintfmt+0x1f6>
for (width -= strnlen(p, precision); width > 0; width--)
800456: 83 ec 08 sub $0x8,%esp
800459: ff 75 d0 pushl -0x30(%ebp)
80045c: 57 push %edi
80045d: e8 6e 03 00 00 call 8007d0 <strnlen>
800462: 8b 4d e0 mov -0x20(%ebp),%ecx
800465: 29 c1 sub %eax,%ecx
800467: 89 4d c8 mov %ecx,-0x38(%ebp)
80046a: 83 c4 10 add $0x10,%esp
putch(padc, putdat);
80046d: 0f be 45 d4 movsbl -0x2c(%ebp),%eax
800471: 89 45 e0 mov %eax,-0x20(%ebp)
800474: 89 7d d4 mov %edi,-0x2c(%ebp)
800477: 89 cf mov %ecx,%edi
for (width -= strnlen(p, precision); width > 0; width--)
800479: eb 0f jmp 80048a <vprintfmt+0x1bd>
putch(padc, putdat);
80047b: 83 ec 08 sub $0x8,%esp
80047e: 53 push %ebx
80047f: ff 75 e0 pushl -0x20(%ebp)
800482: ff d6 call *%esi
for (width -= strnlen(p, precision); width > 0; width--)
800484: 83 ef 01 sub $0x1,%edi
800487: 83 c4 10 add $0x10,%esp
80048a: 85 ff test %edi,%edi
80048c: 7f ed jg 80047b <vprintfmt+0x1ae>
80048e: 8b 7d d4 mov -0x2c(%ebp),%edi
800491: 8b 4d c8 mov -0x38(%ebp),%ecx
800494: 85 c9 test %ecx,%ecx
800496: b8 00 00 00 00 mov $0x0,%eax
80049b: 0f 49 c1 cmovns %ecx,%eax
80049e: 29 c1 sub %eax,%ecx
8004a0: 89 75 08 mov %esi,0x8(%ebp)
8004a3: 8b 75 d0 mov -0x30(%ebp),%esi
8004a6: 89 5d 0c mov %ebx,0xc(%ebp)
8004a9: 89 cb mov %ecx,%ebx
8004ab: eb 16 jmp 8004c3 <vprintfmt+0x1f6>
if (altflag && (ch < ' ' || ch > '~'))
8004ad: 83 7d d8 00 cmpl $0x0,-0x28(%ebp)
8004b1: 75 31 jne 8004e4 <vprintfmt+0x217>
putch(ch, putdat);
8004b3: 83 ec 08 sub $0x8,%esp
8004b6: ff 75 0c pushl 0xc(%ebp)
8004b9: 50 push %eax
8004ba: ff 55 08 call *0x8(%ebp)
8004bd: 83 c4 10 add $0x10,%esp
for (; (ch = *p++) != '\0' && (precision < 0 || --precision >= 0); width--)
8004c0: 83 eb 01 sub $0x1,%ebx
8004c3: 83 c7 01 add $0x1,%edi
8004c6: 0f b6 57 ff movzbl -0x1(%edi),%edx
8004ca: 0f be c2 movsbl %dl,%eax
8004cd: 85 c0 test %eax,%eax
8004cf: 74 59 je 80052a <vprintfmt+0x25d>
8004d1: 85 f6 test %esi,%esi
8004d3: 78 d8 js 8004ad <vprintfmt+0x1e0>
8004d5: 83 ee 01 sub $0x1,%esi
8004d8: 79 d3 jns 8004ad <vprintfmt+0x1e0>
8004da: 89 df mov %ebx,%edi
8004dc: 8b 75 08 mov 0x8(%ebp),%esi
8004df: 8b 5d 0c mov 0xc(%ebp),%ebx
8004e2: eb 37 jmp 80051b <vprintfmt+0x24e>
if (altflag && (ch < ' ' || ch > '~'))
8004e4: 0f be d2 movsbl %dl,%edx
8004e7: 83 ea 20 sub $0x20,%edx
8004ea: 83 fa 5e cmp $0x5e,%edx
8004ed: 76 c4 jbe 8004b3 <vprintfmt+0x1e6>
putch('?', putdat);
8004ef: 83 ec 08 sub $0x8,%esp
8004f2: ff 75 0c pushl 0xc(%ebp)
8004f5: 6a 3f push $0x3f
8004f7: ff 55 08 call *0x8(%ebp)
8004fa: 83 c4 10 add $0x10,%esp
8004fd: eb c1 jmp 8004c0 <vprintfmt+0x1f3>
8004ff: 89 75 08 mov %esi,0x8(%ebp)
800502: 8b 75 d0 mov -0x30(%ebp),%esi
800505: 89 5d 0c mov %ebx,0xc(%ebp)
800508: 8b 5d e0 mov -0x20(%ebp),%ebx
80050b: eb b6 jmp 8004c3 <vprintfmt+0x1f6>
putch(' ', putdat);
80050d: 83 ec 08 sub $0x8,%esp
800510: 53 push %ebx
800511: 6a 20 push $0x20
800513: ff d6 call *%esi
for (; width > 0; width--)
800515: 83 ef 01 sub $0x1,%edi
800518: 83 c4 10 add $0x10,%esp
80051b: 85 ff test %edi,%edi
80051d: 7f ee jg 80050d <vprintfmt+0x240>
if ((p = va_arg(ap, char *)) == NULL)
80051f: 8b 45 cc mov -0x34(%ebp),%eax
800522: 89 45 14 mov %eax,0x14(%ebp)
800525: e9 78 01 00 00 jmp 8006a2 <vprintfmt+0x3d5>
80052a: 89 df mov %ebx,%edi
80052c: 8b 75 08 mov 0x8(%ebp),%esi
80052f: 8b 5d 0c mov 0xc(%ebp),%ebx
800532: eb e7 jmp 80051b <vprintfmt+0x24e>
if (lflag >= 2)
800534: 83 f9 01 cmp $0x1,%ecx
800537: 7e 3f jle 800578 <vprintfmt+0x2ab>
return va_arg(*ap, long long);
800539: 8b 45 14 mov 0x14(%ebp),%eax
80053c: 8b 50 04 mov 0x4(%eax),%edx
80053f: 8b 00 mov (%eax),%eax
800541: 89 45 d8 mov %eax,-0x28(%ebp)
800544: 89 55 dc mov %edx,-0x24(%ebp)
800547: 8b 45 14 mov 0x14(%ebp),%eax
80054a: 8d 40 08 lea 0x8(%eax),%eax
80054d: 89 45 14 mov %eax,0x14(%ebp)
if ((long long) num < 0) {
800550: 83 7d dc 00 cmpl $0x0,-0x24(%ebp)
800554: 79 5c jns 8005b2 <vprintfmt+0x2e5>
putch('-', putdat);
800556: 83 ec 08 sub $0x8,%esp
800559: 53 push %ebx
80055a: 6a 2d push $0x2d
80055c: ff d6 call *%esi
num = -(long long) num;
80055e: 8b 55 d8 mov -0x28(%ebp),%edx
800561: 8b 4d dc mov -0x24(%ebp),%ecx
800564: f7 da neg %edx
800566: 83 d1 00 adc $0x0,%ecx
800569: f7 d9 neg %ecx
80056b: 83 c4 10 add $0x10,%esp
base = 10;
80056e: b8 0a 00 00 00 mov $0xa,%eax
800573: e9 10 01 00 00 jmp 800688 <vprintfmt+0x3bb>
else if (lflag)
800578: 85 c9 test %ecx,%ecx
80057a: 75 1b jne 800597 <vprintfmt+0x2ca>
return va_arg(*ap, int);
80057c: 8b 45 14 mov 0x14(%ebp),%eax
80057f: 8b 00 mov (%eax),%eax
800581: 89 45 d8 mov %eax,-0x28(%ebp)
800584: 89 c1 mov %eax,%ecx
800586: c1 f9 1f sar $0x1f,%ecx
800589: 89 4d dc mov %ecx,-0x24(%ebp)
80058c: 8b 45 14 mov 0x14(%ebp),%eax
80058f: 8d 40 04 lea 0x4(%eax),%eax
800592: 89 45 14 mov %eax,0x14(%ebp)
800595: eb b9 jmp 800550 <vprintfmt+0x283>
return va_arg(*ap, long);
800597: 8b 45 14 mov 0x14(%ebp),%eax
80059a: 8b 00 mov (%eax),%eax
80059c: 89 45 d8 mov %eax,-0x28(%ebp)
80059f: 89 c1 mov %eax,%ecx
8005a1: c1 f9 1f sar $0x1f,%ecx
8005a4: 89 4d dc mov %ecx,-0x24(%ebp)
8005a7: 8b 45 14 mov 0x14(%ebp),%eax
8005aa: 8d 40 04 lea 0x4(%eax),%eax
8005ad: 89 45 14 mov %eax,0x14(%ebp)
8005b0: eb 9e jmp 800550 <vprintfmt+0x283>
num = getint(&ap, lflag);
8005b2: 8b 55 d8 mov -0x28(%ebp),%edx
8005b5: 8b 4d dc mov -0x24(%ebp),%ecx
base = 10;
8005b8: b8 0a 00 00 00 mov $0xa,%eax
8005bd: e9 c6 00 00 00 jmp 800688 <vprintfmt+0x3bb>
if (lflag >= 2)
8005c2: 83 f9 01 cmp $0x1,%ecx
8005c5: 7e 18 jle 8005df <vprintfmt+0x312>
return va_arg(*ap, unsigned long long);
8005c7: 8b 45 14 mov 0x14(%ebp),%eax
8005ca: 8b 10 mov (%eax),%edx
8005cc: 8b 48 04 mov 0x4(%eax),%ecx
8005cf: 8d 40 08 lea 0x8(%eax),%eax
8005d2: 89 45 14 mov %eax,0x14(%ebp)
base = 10;
8005d5: b8 0a 00 00 00 mov $0xa,%eax
8005da: e9 a9 00 00 00 jmp 800688 <vprintfmt+0x3bb>
else if (lflag)
8005df: 85 c9 test %ecx,%ecx
8005e1: 75 1a jne 8005fd <vprintfmt+0x330>
return va_arg(*ap, unsigned int);
8005e3: 8b 45 14 mov 0x14(%ebp),%eax
8005e6: 8b 10 mov (%eax),%edx
8005e8: b9 00 00 00 00 mov $0x0,%ecx
8005ed: 8d 40 04 lea 0x4(%eax),%eax
8005f0: 89 45 14 mov %eax,0x14(%ebp)
base = 10;
8005f3: b8 0a 00 00 00 mov $0xa,%eax
8005f8: e9 8b 00 00 00 jmp 800688 <vprintfmt+0x3bb>
return va_arg(*ap, unsigned long);
8005fd: 8b 45 14 mov 0x14(%ebp),%eax
800600: 8b 10 mov (%eax),%edx
800602: b9 00 00 00 00 mov $0x0,%ecx
800607: 8d 40 04 lea 0x4(%eax),%eax
80060a: 89 45 14 mov %eax,0x14(%ebp)
base = 10;
80060d: b8 0a 00 00 00 mov $0xa,%eax
800612: eb 74 jmp 800688 <vprintfmt+0x3bb>
if (lflag >= 2)
800614: 83 f9 01 cmp $0x1,%ecx
800617: 7e 15 jle 80062e <vprintfmt+0x361>
return va_arg(*ap, unsigned long long);
800619: 8b 45 14 mov 0x14(%ebp),%eax
80061c: 8b 10 mov (%eax),%edx
80061e: 8b 48 04 mov 0x4(%eax),%ecx
800621: 8d 40 08 lea 0x8(%eax),%eax
800624: 89 45 14 mov %eax,0x14(%ebp)
base = 8;
800627: b8 08 00 00 00 mov $0x8,%eax
80062c: eb 5a jmp 800688 <vprintfmt+0x3bb>
else if (lflag)
80062e: 85 c9 test %ecx,%ecx
800630: 75 17 jne 800649 <vprintfmt+0x37c>
return va_arg(*ap, unsigned int);
800632: 8b 45 14 mov 0x14(%ebp),%eax
800635: 8b 10 mov (%eax),%edx
800637: b9 00 00 00 00 mov $0x0,%ecx
80063c: 8d 40 04 lea 0x4(%eax),%eax
80063f: 89 45 14 mov %eax,0x14(%ebp)
base = 8;
800642: b8 08 00 00 00 mov $0x8,%eax
800647: eb 3f jmp 800688 <vprintfmt+0x3bb>
return va_arg(*ap, unsigned long);
800649: 8b 45 14 mov 0x14(%ebp),%eax
80064c: 8b 10 mov (%eax),%edx
80064e: b9 00 00 00 00 mov $0x0,%ecx
800653: 8d 40 04 lea 0x4(%eax),%eax
800656: 89 45 14 mov %eax,0x14(%ebp)
base = 8;
800659: b8 08 00 00 00 mov $0x8,%eax
80065e: eb 28 jmp 800688 <vprintfmt+0x3bb>
putch('0', putdat);
800660: 83 ec 08 sub $0x8,%esp
800663: 53 push %ebx
800664: 6a 30 push $0x30
800666: ff d6 call *%esi
putch('x', putdat);
800668: 83 c4 08 add $0x8,%esp
80066b: 53 push %ebx
80066c: 6a 78 push $0x78
80066e: ff d6 call *%esi
num = (unsigned long long)
800670: 8b 45 14 mov 0x14(%ebp),%eax
800673: 8b 10 mov (%eax),%edx
800675: b9 00 00 00 00 mov $0x0,%ecx
goto number;
80067a: 83 c4 10 add $0x10,%esp
(uintptr_t) va_arg(ap, void *);
80067d: 8d 40 04 lea 0x4(%eax),%eax
800680: 89 45 14 mov %eax,0x14(%ebp)
base = 16;
800683: b8 10 00 00 00 mov $0x10,%eax
printnum(putch, putdat, num, base, width, padc);
800688: 83 ec 0c sub $0xc,%esp
80068b: 0f be 7d d4 movsbl -0x2c(%ebp),%edi
80068f: 57 push %edi
800690: ff 75 e0 pushl -0x20(%ebp)
800693: 50 push %eax
800694: 51 push %ecx
800695: 52 push %edx
800696: 89 da mov %ebx,%edx
800698: 89 f0 mov %esi,%eax
80069a: e8 45 fb ff ff call 8001e4 <printnum>
break;
80069f: 83 c4 20 add $0x20,%esp
err = va_arg(ap, int);
8006a2: 8b 7d e4 mov -0x1c(%ebp),%edi
while ((ch = *(unsigned char *) fmt++) != '%') { //先将非格式化字符输出到控制台。
8006a5: 83 c7 01 add $0x1,%edi
8006a8: 0f b6 47 ff movzbl -0x1(%edi),%eax
8006ac: 83 f8 25 cmp $0x25,%eax
8006af: 0f 84 2f fc ff ff je 8002e4 <vprintfmt+0x17>
if (ch == '\0') //如果没有格式化字符直接返回
8006b5: 85 c0 test %eax,%eax
8006b7: 0f 84 8b 00 00 00 je 800748 <vprintfmt+0x47b>
putch(ch, putdat);
8006bd: 83 ec 08 sub $0x8,%esp
8006c0: 53 push %ebx
8006c1: 50 push %eax
8006c2: ff d6 call *%esi
8006c4: 83 c4 10 add $0x10,%esp
8006c7: eb dc jmp 8006a5 <vprintfmt+0x3d8>
if (lflag >= 2)
8006c9: 83 f9 01 cmp $0x1,%ecx
8006cc: 7e 15 jle 8006e3 <vprintfmt+0x416>
return va_arg(*ap, unsigned long long);
8006ce: 8b 45 14 mov 0x14(%ebp),%eax
8006d1: 8b 10 mov (%eax),%edx
8006d3: 8b 48 04 mov 0x4(%eax),%ecx
8006d6: 8d 40 08 lea 0x8(%eax),%eax
8006d9: 89 45 14 mov %eax,0x14(%ebp)
base = 16;
8006dc: b8 10 00 00 00 mov $0x10,%eax
8006e1: eb a5 jmp 800688 <vprintfmt+0x3bb>
else if (lflag)
8006e3: 85 c9 test %ecx,%ecx
8006e5: 75 17 jne 8006fe <vprintfmt+0x431>
return va_arg(*ap, unsigned int);
8006e7: 8b 45 14 mov 0x14(%ebp),%eax
8006ea: 8b 10 mov (%eax),%edx
8006ec: b9 00 00 00 00 mov $0x0,%ecx
8006f1: 8d 40 04 lea 0x4(%eax),%eax
8006f4: 89 45 14 mov %eax,0x14(%ebp)
base = 16;
8006f7: b8 10 00 00 00 mov $0x10,%eax
8006fc: eb 8a jmp 800688 <vprintfmt+0x3bb>
return va_arg(*ap, unsigned long);
8006fe: 8b 45 14 mov 0x14(%ebp),%eax
800701: 8b 10 mov (%eax),%edx
800703: b9 00 00 00 00 mov $0x0,%ecx
800708: 8d 40 04 lea 0x4(%eax),%eax
80070b: 89 45 14 mov %eax,0x14(%ebp)
base = 16;
80070e: b8 10 00 00 00 mov $0x10,%eax
800713: e9 70 ff ff ff jmp 800688 <vprintfmt+0x3bb>
putch(ch, putdat);
800718: 83 ec 08 sub $0x8,%esp
80071b: 53 push %ebx
80071c: 6a 25 push $0x25
80071e: ff d6 call *%esi
break;
800720: 83 c4 10 add $0x10,%esp
800723: e9 7a ff ff ff jmp 8006a2 <vprintfmt+0x3d5>
putch('%', putdat);
800728: 83 ec 08 sub $0x8,%esp
80072b: 53 push %ebx
80072c: 6a 25 push $0x25
80072e: ff d6 call *%esi
for (fmt--; fmt[-1] != '%'; fmt--)
800730: 83 c4 10 add $0x10,%esp
800733: 89 f8 mov %edi,%eax
800735: eb 03 jmp 80073a <vprintfmt+0x46d>
800737: 83 e8 01 sub $0x1,%eax
80073a: 80 78 ff 25 cmpb $0x25,-0x1(%eax)
80073e: 75 f7 jne 800737 <vprintfmt+0x46a>
800740: 89 45 e4 mov %eax,-0x1c(%ebp)
800743: e9 5a ff ff ff jmp 8006a2 <vprintfmt+0x3d5>
}
800748: 8d 65 f4 lea -0xc(%ebp),%esp
80074b: 5b pop %ebx
80074c: 5e pop %esi
80074d: 5f pop %edi
80074e: 5d pop %ebp
80074f: c3 ret
00800750 <vsnprintf>:
int
vsnprintf(char *buf, int n, const char *fmt, va_list ap)
{
800750: 55 push %ebp
800751: 89 e5 mov %esp,%ebp
800753: 83 ec 18 sub $0x18,%esp
800756: 8b 45 08 mov 0x8(%ebp),%eax
800759: 8b 55 0c mov 0xc(%ebp),%edx
struct sprintbuf b = {buf, buf+n-1, 0};
80075c: 89 45 ec mov %eax,-0x14(%ebp)
80075f: 8d 4c 10 ff lea -0x1(%eax,%edx,1),%ecx
800763: 89 4d f0 mov %ecx,-0x10(%ebp)
800766: c7 45 f4 00 00 00 00 movl $0x0,-0xc(%ebp)
if (buf == NULL || n < 1)
80076d: 85 c0 test %eax,%eax
80076f: 74 26 je 800797 <vsnprintf+0x47>
800771: 85 d2 test %edx,%edx
800773: 7e 22 jle 800797 <vsnprintf+0x47>
return -E_INVAL;
// print the string to the buffer
vprintfmt((void*)sprintputch, &b, fmt, ap);
800775: ff 75 14 pushl 0x14(%ebp)
800778: ff 75 10 pushl 0x10(%ebp)
80077b: 8d 45 ec lea -0x14(%ebp),%eax
80077e: 50 push %eax
80077f: 68 93 02 80 00 push $0x800293
800784: e8 44 fb ff ff call 8002cd <vprintfmt>
// null terminate the buffer
*b.buf = '\0';
800789: 8b 45 ec mov -0x14(%ebp),%eax
80078c: c6 00 00 movb $0x0,(%eax)
return b.cnt;
80078f: 8b 45 f4 mov -0xc(%ebp),%eax
800792: 83 c4 10 add $0x10,%esp
}
800795: c9 leave
800796: c3 ret
return -E_INVAL;
800797: b8 fd ff ff ff mov $0xfffffffd,%eax
80079c: eb f7 jmp 800795 <vsnprintf+0x45>
0080079e <snprintf>:
int
snprintf(char *buf, int n, const char *fmt, ...)
{
80079e: 55 push %ebp
80079f: 89 e5 mov %esp,%ebp
8007a1: 83 ec 08 sub $0x8,%esp
va_list ap;
int rc;
va_start(ap, fmt);
8007a4: 8d 45 14 lea 0x14(%ebp),%eax
rc = vsnprintf(buf, n, fmt, ap);
8007a7: 50 push %eax
8007a8: ff 75 10 pushl 0x10(%ebp)
8007ab: ff 75 0c pushl 0xc(%ebp)
8007ae: ff 75 08 pushl 0x8(%ebp)
8007b1: e8 9a ff ff ff call 800750 <vsnprintf>
va_end(ap);
return rc;
}
8007b6: c9 leave
8007b7: c3 ret
008007b8 <strlen>:
// Primespipe runs 3x faster this way.
#define ASM 1
int
strlen(const char *s)
{
8007b8: 55 push %ebp
8007b9: 89 e5 mov %esp,%ebp
8007bb: 8b 55 08 mov 0x8(%ebp),%edx
int n;
for (n = 0; *s != '\0'; s++)
8007be: b8 00 00 00 00 mov $0x0,%eax
8007c3: eb 03 jmp 8007c8 <strlen+0x10>
n++;
8007c5: 83 c0 01 add $0x1,%eax
for (n = 0; *s != '\0'; s++)
8007c8: 80 3c 02 00 cmpb $0x0,(%edx,%eax,1)
8007cc: 75 f7 jne 8007c5 <strlen+0xd>
return n;
}
8007ce: 5d pop %ebp
8007cf: c3 ret
008007d0 <strnlen>:
int
strnlen(const char *s, size_t size)
{
8007d0: 55 push %ebp
8007d1: 89 e5 mov %esp,%ebp
8007d3: 8b 4d 08 mov 0x8(%ebp),%ecx
8007d6: 8b 55 0c mov 0xc(%ebp),%edx
int n;
for (n = 0; size > 0 && *s != '\0'; s++, size--)
8007d9: b8 00 00 00 00 mov $0x0,%eax
8007de: eb 03 jmp 8007e3 <strnlen+0x13>
n++;
8007e0: 83 c0 01 add $0x1,%eax
for (n = 0; size > 0 && *s != '\0'; s++, size--)
8007e3: 39 d0 cmp %edx,%eax
8007e5: 74 06 je 8007ed <strnlen+0x1d>
8007e7: 80 3c 01 00 cmpb $0x0,(%ecx,%eax,1)
8007eb: 75 f3 jne 8007e0 <strnlen+0x10>
return n;
}
8007ed: 5d pop %ebp
8007ee: c3 ret
008007ef <strcpy>:
char *
strcpy(char *dst, const char *src)
{
8007ef: 55 push %ebp
8007f0: 89 e5 mov %esp,%ebp
8007f2: 53 push %ebx
8007f3: 8b 45 08 mov 0x8(%ebp),%eax
8007f6: 8b 4d 0c mov 0xc(%ebp),%ecx
char *ret;
ret = dst;
while ((*dst++ = *src++) != '\0')
8007f9: 89 c2 mov %eax,%edx
8007fb: 83 c1 01 add $0x1,%ecx
8007fe: 83 c2 01 add $0x1,%edx
800801: 0f b6 59 ff movzbl -0x1(%ecx),%ebx
800805: 88 5a ff mov %bl,-0x1(%edx)
800808: 84 db test %bl,%bl
80080a: 75 ef jne 8007fb <strcpy+0xc>
/* do nothing */;
return ret;
}
80080c: 5b pop %ebx
80080d: 5d pop %ebp
80080e: c3 ret
0080080f <strcat>:
char *
strcat(char *dst, const char *src)
{
80080f: 55 push %ebp
800810: 89 e5 mov %esp,%ebp
800812: 53 push %ebx
800813: 8b 5d 08 mov 0x8(%ebp),%ebx
int len = strlen(dst);
800816: 53 push %ebx
800817: e8 9c ff ff ff call 8007b8 <strlen>
80081c: 83 c4 04 add $0x4,%esp
strcpy(dst + len, src);
80081f: ff 75 0c pushl 0xc(%ebp)
800822: 01 d8 add %ebx,%eax
800824: 50 push %eax
800825: e8 c5 ff ff ff call 8007ef <strcpy>
return dst;
}
80082a: 89 d8 mov %ebx,%eax
80082c: 8b 5d fc mov -0x4(%ebp),%ebx
80082f: c9 leave
800830: c3 ret
00800831 <strncpy>:
char *
strncpy(char *dst, const char *src, size_t size) {
800831: 55 push %ebp
800832: 89 e5 mov %esp,%ebp
800834: 56 push %esi
800835: 53 push %ebx
800836: 8b 75 08 mov 0x8(%ebp),%esi
800839: 8b 4d 0c mov 0xc(%ebp),%ecx
80083c: 89 f3 mov %esi,%ebx
80083e: 03 5d 10 add 0x10(%ebp),%ebx
size_t i;
char *ret;
ret = dst;
for (i = 0; i < size; i++) {
800841: 89 f2 mov %esi,%edx
800843: eb 0f jmp 800854 <strncpy+0x23>
*dst++ = *src;
800845: 83 c2 01 add $0x1,%edx
800848: 0f b6 01 movzbl (%ecx),%eax
80084b: 88 42 ff mov %al,-0x1(%edx)
// If strlen(src) < size, null-pad 'dst' out to 'size' chars
if (*src != '\0')
src++;
80084e: 80 39 01 cmpb $0x1,(%ecx)
800851: 83 d9 ff sbb $0xffffffff,%ecx
for (i = 0; i < size; i++) {
800854: 39 da cmp %ebx,%edx
800856: 75 ed jne 800845 <strncpy+0x14>
}
return ret;
}
800858: 89 f0 mov %esi,%eax
80085a: 5b pop %ebx
80085b: 5e pop %esi
80085c: 5d pop %ebp
80085d: c3 ret
0080085e <strlcpy>:
size_t
strlcpy(char *dst, const char *src, size_t size)
{
80085e: 55 push %ebp
80085f: 89 e5 mov %esp,%ebp
800861: 56 push %esi
800862: 53 push %ebx
800863: 8b 75 08 mov 0x8(%ebp),%esi
800866: 8b 55 0c mov 0xc(%ebp),%edx
800869: 8b 4d 10 mov 0x10(%ebp),%ecx
80086c: 89 f0 mov %esi,%eax
80086e: 8d 5c 0e ff lea -0x1(%esi,%ecx,1),%ebx
char *dst_in;
dst_in = dst;
if (size > 0) {
800872: 85 c9 test %ecx,%ecx
800874: 75 0b jne 800881 <strlcpy+0x23>
800876: eb 17 jmp 80088f <strlcpy+0x31>
while (--size > 0 && *src != '\0')
*dst++ = *src++;
800878: 83 c2 01 add $0x1,%edx
80087b: 83 c0 01 add $0x1,%eax
80087e: 88 48 ff mov %cl,-0x1(%eax)
while (--size > 0 && *src != '\0')
800881: 39 d8 cmp %ebx,%eax
800883: 74 07 je 80088c <strlcpy+0x2e>
800885: 0f b6 0a movzbl (%edx),%ecx
800888: 84 c9 test %cl,%cl
80088a: 75 ec jne 800878 <strlcpy+0x1a>
*dst = '\0';
80088c: c6 00 00 movb $0x0,(%eax)
}
return dst - dst_in;
80088f: 29 f0 sub %esi,%eax
}
800891: 5b pop %ebx
800892: 5e pop %esi
800893: 5d pop %ebp
800894: c3 ret
00800895 <strcmp>:
int
strcmp(const char *p, const char *q)
{
800895: 55 push %ebp
800896: 89 e5 mov %esp,%ebp
800898: 8b 4d 08 mov 0x8(%ebp),%ecx
80089b: 8b 55 0c mov 0xc(%ebp),%edx
while (*p && *p == *q)
80089e: eb 06 jmp 8008a6 <strcmp+0x11>
p++, q++;
8008a0: 83 c1 01 add $0x1,%ecx
8008a3: 83 c2 01 add $0x1,%edx
while (*p && *p == *q)
8008a6: 0f b6 01 movzbl (%ecx),%eax
8008a9: 84 c0 test %al,%al
8008ab: 74 04 je 8008b1 <strcmp+0x1c>
8008ad: 3a 02 cmp (%edx),%al
8008af: 74 ef je 8008a0 <strcmp+0xb>
return (int) ((unsigned char) *p - (unsigned char) *q);
8008b1: 0f b6 c0 movzbl %al,%eax
8008b4: 0f b6 12 movzbl (%edx),%edx
8008b7: 29 d0 sub %edx,%eax
}
8008b9: 5d pop %ebp
8008ba: c3 ret
008008bb <strncmp>:
int
strncmp(const char *p, const char *q, size_t n)
{
8008bb: 55 push %ebp
8008bc: 89 e5 mov %esp,%ebp
8008be: 53 push %ebx
8008bf: 8b 45 08 mov 0x8(%ebp),%eax
8008c2: 8b 55 0c mov 0xc(%ebp),%edx
8008c5: 89 c3 mov %eax,%ebx
8008c7: 03 5d 10 add 0x10(%ebp),%ebx
while (n > 0 && *p && *p == *q)
8008ca: eb 06 jmp 8008d2 <strncmp+0x17>
n--, p++, q++;
8008cc: 83 c0 01 add $0x1,%eax
8008cf: 83 c2 01 add $0x1,%edx
while (n > 0 && *p && *p == *q)
8008d2: 39 d8 cmp %ebx,%eax
8008d4: 74 16 je 8008ec <strncmp+0x31>
8008d6: 0f b6 08 movzbl (%eax),%ecx
8008d9: 84 c9 test %cl,%cl
8008db: 74 04 je 8008e1 <strncmp+0x26>
8008dd: 3a 0a cmp (%edx),%cl
8008df: 74 eb je 8008cc <strncmp+0x11>
if (n == 0)
return 0;
else
return (int) ((unsigned char) *p - (unsigned char) *q);
8008e1: 0f b6 00 movzbl (%eax),%eax
8008e4: 0f b6 12 movzbl (%edx),%edx
8008e7: 29 d0 sub %edx,%eax
}
8008e9: 5b pop %ebx
8008ea: 5d pop %ebp
8008eb: c3 ret
return 0;
8008ec: b8 00 00 00 00 mov $0x0,%eax
8008f1: eb f6 jmp 8008e9 <strncmp+0x2e>
008008f3 <strchr>:
// Return a pointer to the first occurrence of 'c' in 's',
// or a null pointer if the string has no 'c'.
char *
strchr(const char *s, char c)
{
8008f3: 55 push %ebp
8008f4: 89 e5 mov %esp,%ebp
8008f6: 8b 45 08 mov 0x8(%ebp),%eax
8008f9: 0f b6 4d 0c movzbl 0xc(%ebp),%ecx
for (; *s; s++)
8008fd: 0f b6 10 movzbl (%eax),%edx
800900: 84 d2 test %dl,%dl
800902: 74 09 je 80090d <strchr+0x1a>
if (*s == c)
800904: 38 ca cmp %cl,%dl
800906: 74 0a je 800912 <strchr+0x1f>
for (; *s; s++)
800908: 83 c0 01 add $0x1,%eax
80090b: eb f0 jmp 8008fd <strchr+0xa>
return (char *) s;
return 0;
80090d: b8 00 00 00 00 mov $0x0,%eax
}
800912: 5d pop %ebp
800913: c3 ret
00800914 <strfind>:
// Return a pointer to the first occurrence of 'c' in 's',
// or a pointer to the string-ending null character if the string has no 'c'.
char *
strfind(const char *s, char c)
{
800914: 55 push %ebp
800915: 89 e5 mov %esp,%ebp
800917: 8b 45 08 mov 0x8(%ebp),%eax
80091a: 0f b6 4d 0c movzbl 0xc(%ebp),%ecx
for (; *s; s++)
80091e: eb 03 jmp 800923 <strfind+0xf>
800920: 83 c0 01 add $0x1,%eax
800923: 0f b6 10 movzbl (%eax),%edx
if (*s == c)
800926: 38 ca cmp %cl,%dl
800928: 74 04 je 80092e <strfind+0x1a>
80092a: 84 d2 test %dl,%dl
80092c: 75 f2 jne 800920 <strfind+0xc>
break;
return (char *) s;
}
80092e: 5d pop %ebp
80092f: c3 ret
00800930 <memset>:
#if ASM
void *
memset(void *v, int c, size_t n)
{
800930: 55 push %ebp
800931: 89 e5 mov %esp,%ebp
800933: 57 push %edi
800934: 56 push %esi
800935: 53 push %ebx
800936: 8b 7d 08 mov 0x8(%ebp),%edi
800939: 8b 4d 10 mov 0x10(%ebp),%ecx
char *p;
if (n == 0)
80093c: 85 c9 test %ecx,%ecx
80093e: 74 13 je 800953 <memset+0x23>
return v;
if ((int)v%4 == 0 && n%4 == 0) {
800940: f7 c7 03 00 00 00 test $0x3,%edi
800946: 75 05 jne 80094d <memset+0x1d>
800948: f6 c1 03 test $0x3,%cl
80094b: 74 0d je 80095a <memset+0x2a>
c = (c<<24)|(c<<16)|(c<<8)|c;
asm volatile("cld; rep stosl\n"
:: "D" (v), "a" (c), "c" (n/4)
: "cc", "memory");
} else
asm volatile("cld; rep stosb\n"
80094d: 8b 45 0c mov 0xc(%ebp),%eax
800950: fc cld
800951: f3 aa rep stos %al,%es:(%edi)
:: "D" (v), "a" (c), "c" (n)
: "cc", "memory");
return v;
}
800953: 89 f8 mov %edi,%eax
800955: 5b pop %ebx
800956: 5e pop %esi
800957: 5f pop %edi
800958: 5d pop %ebp
800959: c3 ret
c &= 0xFF;
80095a: 0f b6 55 0c movzbl 0xc(%ebp),%edx
c = (c<<24)|(c<<16)|(c<<8)|c;
80095e: 89 d3 mov %edx,%ebx
800960: c1 e3 08 shl $0x8,%ebx
800963: 89 d0 mov %edx,%eax
800965: c1 e0 18 shl $0x18,%eax
800968: 89 d6 mov %edx,%esi
80096a: c1 e6 10 shl $0x10,%esi
80096d: 09 f0 or %esi,%eax
80096f: 09 c2 or %eax,%edx
800971: 09 da or %ebx,%edx
:: "D" (v), "a" (c), "c" (n/4)
800973: c1 e9 02 shr $0x2,%ecx
asm volatile("cld; rep stosl\n"
800976: 89 d0 mov %edx,%eax
800978: fc cld
800979: f3 ab rep stos %eax,%es:(%edi)
80097b: eb d6 jmp 800953 <memset+0x23>
0080097d <memmove>:
void *
memmove(void *dst, const void *src, size_t n)
{
80097d: 55 push %ebp
80097e: 89 e5 mov %esp,%ebp
800980: 57 push %edi
800981: 56 push %esi
800982: 8b 45 08 mov 0x8(%ebp),%eax
800985: 8b 75 0c mov 0xc(%ebp),%esi
800988: 8b 4d 10 mov 0x10(%ebp),%ecx
const char *s;
char *d;
s = src;
d = dst;
if (s < d && s + n > d) {
80098b: 39 c6 cmp %eax,%esi
80098d: 73 35 jae 8009c4 <memmove+0x47>
80098f: 8d 14 0e lea (%esi,%ecx,1),%edx
800992: 39 c2 cmp %eax,%edx
800994: 76 2e jbe 8009c4 <memmove+0x47>
s += n;
d += n;
800996: 8d 3c 08 lea (%eax,%ecx,1),%edi
if ((int)s%4 == 0 && (int)d%4 == 0 && n%4 == 0)
800999: 89 d6 mov %edx,%esi
80099b: 09 fe or %edi,%esi
80099d: f7 c6 03 00 00 00 test $0x3,%esi
8009a3: 74 0c je 8009b1 <memmove+0x34>
asm volatile("std; rep movsl\n"
:: "D" (d-4), "S" (s-4), "c" (n/4) : "cc", "memory");
else
asm volatile("std; rep movsb\n"
:: "D" (d-1), "S" (s-1), "c" (n) : "cc", "memory");
8009a5: 83 ef 01 sub $0x1,%edi
8009a8: 8d 72 ff lea -0x1(%edx),%esi
asm volatile("std; rep movsb\n"
8009ab: fd std
8009ac: f3 a4 rep movsb %ds:(%esi),%es:(%edi)
// Some versions of GCC rely on DF being clear
asm volatile("cld" ::: "cc");
8009ae: fc cld
8009af: eb 21 jmp 8009d2 <memmove+0x55>
if ((int)s%4 == 0 && (int)d%4 == 0 && n%4 == 0)
8009b1: f6 c1 03 test $0x3,%cl
8009b4: 75 ef jne 8009a5 <memmove+0x28>
:: "D" (d-4), "S" (s-4), "c" (n/4) : "cc", "memory");
8009b6: 83 ef 04 sub $0x4,%edi
8009b9: 8d 72 fc lea -0x4(%edx),%esi
8009bc: c1 e9 02 shr $0x2,%ecx
asm volatile("std; rep movsl\n"
8009bf: fd std
8009c0: f3 a5 rep movsl %ds:(%esi),%es:(%edi)
8009c2: eb ea jmp 8009ae <memmove+0x31>
} else {
if ((int)s%4 == 0 && (int)d%4 == 0 && n%4 == 0)
8009c4: 89 f2 mov %esi,%edx
8009c6: 09 c2 or %eax,%edx
8009c8: f6 c2 03 test $0x3,%dl
8009cb: 74 09 je 8009d6 <memmove+0x59>
asm volatile("cld; rep movsl\n"
:: "D" (d), "S" (s), "c" (n/4) : "cc", "memory");
else
asm volatile("cld; rep movsb\n"
8009cd: 89 c7 mov %eax,%edi
8009cf: fc cld
8009d0: f3 a4 rep movsb %ds:(%esi),%es:(%edi)
:: "D" (d), "S" (s), "c" (n) : "cc", "memory");
}
return dst;
}
8009d2: 5e pop %esi
8009d3: 5f pop %edi
8009d4: 5d pop %ebp
8009d5: c3 ret
if ((int)s%4 == 0 && (int)d%4 == 0 && n%4 == 0)
8009d6: f6 c1 03 test $0x3,%cl
8009d9: 75 f2 jne 8009cd <memmove+0x50>
:: "D" (d), "S" (s), "c" (n/4) : "cc", "memory");
8009db: c1 e9 02 shr $0x2,%ecx
asm volatile("cld; rep movsl\n"
8009de: 89 c7 mov %eax,%edi
8009e0: fc cld
8009e1: f3 a5 rep movsl %ds:(%esi),%es:(%edi)
8009e3: eb ed jmp 8009d2 <memmove+0x55>
008009e5 <memcpy>:
}
#endif
void *
memcpy(void *dst, const void *src, size_t n)
{
8009e5: 55 push %ebp
8009e6: 89 e5 mov %esp,%ebp
return memmove(dst, src, n);
8009e8: ff 75 10 pushl 0x10(%ebp)
8009eb: ff 75 0c pushl 0xc(%ebp)
8009ee: ff 75 08 pushl 0x8(%ebp)
8009f1: e8 87 ff ff ff call 80097d <memmove>
}
8009f6: c9 leave
8009f7: c3 ret
008009f8 <memcmp>:
int
memcmp(const void *v1, const void *v2, size_t n)
{
8009f8: 55 push %ebp
8009f9: 89 e5 mov %esp,%ebp
8009fb: 56 push %esi
8009fc: 53 push %ebx
8009fd: 8b 45 08 mov 0x8(%ebp),%eax
800a00: 8b 55 0c mov 0xc(%ebp),%edx
800a03: 89 c6 mov %eax,%esi
800a05: 03 75 10 add 0x10(%ebp),%esi
const uint8_t *s1 = (const uint8_t *) v1;
const uint8_t *s2 = (const uint8_t *) v2;
while (n-- > 0) {
800a08: 39 f0 cmp %esi,%eax
800a0a: 74 1c je 800a28 <memcmp+0x30>
if (*s1 != *s2)
800a0c: 0f b6 08 movzbl (%eax),%ecx
800a0f: 0f b6 1a movzbl (%edx),%ebx
800a12: 38 d9 cmp %bl,%cl
800a14: 75 08 jne 800a1e <memcmp+0x26>
return (int) *s1 - (int) *s2;
s1++, s2++;
800a16: 83 c0 01 add $0x1,%eax
800a19: 83 c2 01 add $0x1,%edx
800a1c: eb ea jmp 800a08 <memcmp+0x10>
return (int) *s1 - (int) *s2;
800a1e: 0f b6 c1 movzbl %cl,%eax
800a21: 0f b6 db movzbl %bl,%ebx
800a24: 29 d8 sub %ebx,%eax
800a26: eb 05 jmp 800a2d <memcmp+0x35>
}
return 0;
800a28: b8 00 00 00 00 mov $0x0,%eax
}
800a2d: 5b pop %ebx
800a2e: 5e pop %esi
800a2f: 5d pop %ebp
800a30: c3 ret
00800a31 <memfind>:
void *
memfind(const void *s, int c, size_t n)
{
800a31: 55 push %ebp
800a32: 89 e5 mov %esp,%ebp
800a34: 8b 45 08 mov 0x8(%ebp),%eax
800a37: 8b 4d 0c mov 0xc(%ebp),%ecx
const void *ends = (const char *) s + n;
800a3a: 89 c2 mov %eax,%edx
800a3c: 03 55 10 add 0x10(%ebp),%edx
for (; s < ends; s++)
800a3f: 39 d0 cmp %edx,%eax
800a41: 73 09 jae 800a4c <memfind+0x1b>
if (*(const unsigned char *) s == (unsigned char) c)
800a43: 38 08 cmp %cl,(%eax)
800a45: 74 05 je 800a4c <memfind+0x1b>
for (; s < ends; s++)
800a47: 83 c0 01 add $0x1,%eax
800a4a: eb f3 jmp 800a3f <memfind+0xe>
break;
return (void *) s;
}
800a4c: 5d pop %ebp
800a4d: c3 ret
00800a4e <strtol>:
long
strtol(const char *s, char **endptr, int base)
{
800a4e: 55 push %ebp
800a4f: 89 e5 mov %esp,%ebp
800a51: 57 push %edi
800a52: 56 push %esi
800a53: 53 push %ebx
800a54: 8b 4d 08 mov 0x8(%ebp),%ecx
800a57: 8b 5d 10 mov 0x10(%ebp),%ebx
int neg = 0;
long val = 0;
// gobble initial whitespace
while (*s == ' ' || *s == '\t')
800a5a: eb 03 jmp 800a5f <strtol+0x11>
s++;
800a5c: 83 c1 01 add $0x1,%ecx
while (*s == ' ' || *s == '\t')
800a5f: 0f b6 01 movzbl (%ecx),%eax
800a62: 3c 20 cmp $0x20,%al
800a64: 74 f6 je 800a5c <strtol+0xe>
800a66: 3c 09 cmp $0x9,%al
800a68: 74 f2 je 800a5c <strtol+0xe>
// plus/minus sign
if (*s == '+')
800a6a: 3c 2b cmp $0x2b,%al
800a6c: 74 2e je 800a9c <strtol+0x4e>
int neg = 0;
800a6e: bf 00 00 00 00 mov $0x0,%edi
s++;
else if (*s == '-')
800a73: 3c 2d cmp $0x2d,%al
800a75: 74 2f je 800aa6 <strtol+0x58>
s++, neg = 1;
// hex or octal base prefix
if ((base == 0 || base == 16) && (s[0] == '0' && s[1] == 'x'))
800a77: f7 c3 ef ff ff ff test $0xffffffef,%ebx
800a7d: 75 05 jne 800a84 <strtol+0x36>
800a7f: 80 39 30 cmpb $0x30,(%ecx)
800a82: 74 2c je 800ab0 <strtol+0x62>
s += 2, base = 16;
else if (base == 0 && s[0] == '0')
800a84: 85 db test %ebx,%ebx
800a86: 75 0a jne 800a92 <strtol+0x44>
s++, base = 8;
else if (base == 0)
base = 10;
800a88: bb 0a 00 00 00 mov $0xa,%ebx
else if (base == 0 && s[0] == '0')
800a8d: 80 39 30 cmpb $0x30,(%ecx)
800a90: 74 28 je 800aba <strtol+0x6c>
base = 10;
800a92: b8 00 00 00 00 mov $0x0,%eax
800a97: 89 5d 10 mov %ebx,0x10(%ebp)
800a9a: eb 50 jmp 800aec <strtol+0x9e>
s++;
800a9c: 83 c1 01 add $0x1,%ecx
int neg = 0;
800a9f: bf 00 00 00 00 mov $0x0,%edi
800aa4: eb d1 jmp 800a77 <strtol+0x29>
s++, neg = 1;
800aa6: 83 c1 01 add $0x1,%ecx
800aa9: bf 01 00 00 00 mov $0x1,%edi
800aae: eb c7 jmp 800a77 <strtol+0x29>
if ((base == 0 || base == 16) && (s[0] == '0' && s[1] == 'x'))
800ab0: 80 79 01 78 cmpb $0x78,0x1(%ecx)
800ab4: 74 0e je 800ac4 <strtol+0x76>
else if (base == 0 && s[0] == '0')
800ab6: 85 db test %ebx,%ebx
800ab8: 75 d8 jne 800a92 <strtol+0x44>
s++, base = 8;
800aba: 83 c1 01 add $0x1,%ecx
800abd: bb 08 00 00 00 mov $0x8,%ebx
800ac2: eb ce jmp 800a92 <strtol+0x44>
s += 2, base = 16;
800ac4: 83 c1 02 add $0x2,%ecx
800ac7: bb 10 00 00 00 mov $0x10,%ebx
800acc: eb c4 jmp 800a92 <strtol+0x44>
while (1) {
int dig;
if (*s >= '0' && *s <= '9')
dig = *s - '0';
else if (*s >= 'a' && *s <= 'z')
800ace: 8d 72 9f lea -0x61(%edx),%esi
800ad1: 89 f3 mov %esi,%ebx
800ad3: 80 fb 19 cmp $0x19,%bl
800ad6: 77 29 ja 800b01 <strtol+0xb3>
dig = *s - 'a' + 10;
800ad8: 0f be d2 movsbl %dl,%edx
800adb: 83 ea 57 sub $0x57,%edx
else if (*s >= 'A' && *s <= 'Z')
dig = *s - 'A' + 10;
else
break;
if (dig >= base)
800ade: 3b 55 10 cmp 0x10(%ebp),%edx
800ae1: 7d 30 jge 800b13 <strtol+0xc5>
break;
s++, val = (val * base) + dig;
800ae3: 83 c1 01 add $0x1,%ecx
800ae6: 0f af 45 10 imul 0x10(%ebp),%eax
800aea: 01 d0 add %edx,%eax
if (*s >= '0' && *s <= '9')
800aec: 0f b6 11 movzbl (%ecx),%edx
800aef: 8d 72 d0 lea -0x30(%edx),%esi
800af2: 89 f3 mov %esi,%ebx
800af4: 80 fb 09 cmp $0x9,%bl
800af7: 77 d5 ja 800ace <strtol+0x80>
dig = *s - '0';
800af9: 0f be d2 movsbl %dl,%edx
800afc: 83 ea 30 sub $0x30,%edx
800aff: eb dd jmp 800ade <strtol+0x90>
else if (*s >= 'A' && *s <= 'Z')
800b01: 8d 72 bf lea -0x41(%edx),%esi
800b04: 89 f3 mov %esi,%ebx
800b06: 80 fb 19 cmp $0x19,%bl
800b09: 77 08 ja 800b13 <strtol+0xc5>
dig = *s - 'A' + 10;
800b0b: 0f be d2 movsbl %dl,%edx
800b0e: 83 ea 37 sub $0x37,%edx
800b11: eb cb jmp 800ade <strtol+0x90>
// we don't properly detect overflow!
}
if (endptr)
800b13: 83 7d 0c 00 cmpl $0x0,0xc(%ebp)
800b17: 74 05 je 800b1e <strtol+0xd0>
*endptr = (char *) s;
800b19: 8b 75 0c mov 0xc(%ebp),%esi
800b1c: 89 0e mov %ecx,(%esi)
return (neg ? -val : val);
800b1e: 89 c2 mov %eax,%edx
800b20: f7 da neg %edx
800b22: 85 ff test %edi,%edi
800b24: 0f 45 c2 cmovne %edx,%eax
}
800b27: 5b pop %ebx
800b28: 5e pop %esi
800b29: 5f pop %edi
800b2a: 5d pop %ebp
800b2b: c3 ret
00800b2c <sys_cputs>:
return ret;
}
void
sys_cputs(const char *s, size_t len)
{
800b2c: 55 push %ebp
800b2d: 89 e5 mov %esp,%ebp
800b2f: 57 push %edi
800b30: 56 push %esi
800b31: 53 push %ebx
asm volatile("int %1\n" //执行int T_SYSCALL指令
800b32: b8 00 00 00 00 mov $0x0,%eax
800b37: 8b 55 08 mov 0x8(%ebp),%edx
800b3a: 8b 4d 0c mov 0xc(%ebp),%ecx
800b3d: 89 c3 mov %eax,%ebx
800b3f: 89 c7 mov %eax,%edi
800b41: 89 c6 mov %eax,%esi
800b43: cd 30 int $0x30
syscall(SYS_cputs, 0, (uint32_t)s, len, 0, 0, 0);
}
800b45: 5b pop %ebx
800b46: 5e pop %esi
800b47: 5f pop %edi
800b48: 5d pop %ebp
800b49: c3 ret
00800b4a <sys_cgetc>:
int
sys_cgetc(void)
{
800b4a: 55 push %ebp
800b4b: 89 e5 mov %esp,%ebp
800b4d: 57 push %edi
800b4e: 56 push %esi
800b4f: 53 push %ebx
asm volatile("int %1\n" //执行int T_SYSCALL指令
800b50: ba 00 00 00 00 mov $0x0,%edx
800b55: b8 01 00 00 00 mov $0x1,%eax
800b5a: 89 d1 mov %edx,%ecx
800b5c: 89 d3 mov %edx,%ebx
800b5e: 89 d7 mov %edx,%edi
800b60: 89 d6 mov %edx,%esi
800b62: cd 30 int $0x30
return syscall(SYS_cgetc, 0, 0, 0, 0, 0, 0);
}
800b64: 5b pop %ebx
800b65: 5e pop %esi
800b66: 5f pop %edi
800b67: 5d pop %ebp
800b68: c3 ret
00800b69 <sys_env_destroy>:
int
sys_env_destroy(envid_t envid)
{
800b69: 55 push %ebp
800b6a: 89 e5 mov %esp,%ebp
800b6c: 57 push %edi
800b6d: 56 push %esi
800b6e: 53 push %ebx
800b6f: 83 ec 0c sub $0xc,%esp
asm volatile("int %1\n" //执行int T_SYSCALL指令
800b72: b9 00 00 00 00 mov $0x0,%ecx
800b77: 8b 55 08 mov 0x8(%ebp),%edx
800b7a: b8 03 00 00 00 mov $0x3,%eax
800b7f: 89 cb mov %ecx,%ebx
800b81: 89 cf mov %ecx,%edi
800b83: 89 ce mov %ecx,%esi
800b85: cd 30 int $0x30
if(check && ret > 0)
800b87: 85 c0 test %eax,%eax
800b89: 7f 08 jg 800b93 <sys_env_destroy+0x2a>
return syscall(SYS_env_destroy, 1, envid, 0, 0, 0, 0);
}
800b8b: 8d 65 f4 lea -0xc(%ebp),%esp
800b8e: 5b pop %ebx
800b8f: 5e pop %esi
800b90: 5f pop %edi
800b91: 5d pop %ebp
800b92: c3 ret
panic("syscall %d returned %d (> 0)", num, ret);
800b93: 83 ec 0c sub $0xc,%esp
800b96: 50 push %eax
800b97: 6a 03 push $0x3
800b99: 68 bf 16 80 00 push $0x8016bf
800b9e: 6a 23 push $0x23
800ba0: 68 dc 16 80 00 push $0x8016dc
800ba5: e8 eb 04 00 00 call 801095 <_panic>
00800baa <sys_getenvid>:
envid_t
sys_getenvid(void)
{
800baa: 55 push %ebp
800bab: 89 e5 mov %esp,%ebp
800bad: 57 push %edi
800bae: 56 push %esi
800baf: 53 push %ebx
asm volatile("int %1\n" //执行int T_SYSCALL指令
800bb0: ba 00 00 00 00 mov $0x0,%edx
800bb5: b8 02 00 00 00 mov $0x2,%eax
800bba: 89 d1 mov %edx,%ecx
800bbc: 89 d3 mov %edx,%ebx
800bbe: 89 d7 mov %edx,%edi
800bc0: 89 d6 mov %edx,%esi
800bc2: cd 30 int $0x30
return syscall(SYS_getenvid, 0, 0, 0, 0, 0, 0);
}
800bc4: 5b pop %ebx
800bc5: 5e pop %esi
800bc6: 5f pop %edi
800bc7: 5d pop %ebp
800bc8: c3 ret
00800bc9 <sys_yield>:
void
sys_yield(void)
{
800bc9: 55 push %ebp
800bca: 89 e5 mov %esp,%ebp
800bcc: 57 push %edi
800bcd: 56 push %esi
800bce: 53 push %ebx
asm volatile("int %1\n" //执行int T_SYSCALL指令
800bcf: ba 00 00 00 00 mov $0x0,%edx
800bd4: b8 0b 00 00 00 mov $0xb,%eax
800bd9: 89 d1 mov %edx,%ecx
800bdb: 89 d3 mov %edx,%ebx
800bdd: 89 d7 mov %edx,%edi
800bdf: 89 d6 mov %edx,%esi
800be1: cd 30 int $0x30
syscall(SYS_yield, 0, 0, 0, 0, 0, 0);
}
800be3: 5b pop %ebx
800be4: 5e pop %esi
800be5: 5f pop %edi
800be6: 5d pop %ebp
800be7: c3 ret
00800be8 <sys_page_alloc>:
int
sys_page_alloc(envid_t envid, void *va, int perm)
{
800be8: 55 push %ebp
800be9: 89 e5 mov %esp,%ebp
800beb: 57 push %edi
800bec: 56 push %esi
800bed: 53 push %ebx
800bee: 83 ec 0c sub $0xc,%esp
asm volatile("int %1\n" //执行int T_SYSCALL指令
800bf1: be 00 00 00 00 mov $0x0,%esi
800bf6: 8b 55 08 mov 0x8(%ebp),%edx
800bf9: 8b 4d 0c mov 0xc(%ebp),%ecx
800bfc: b8 04 00 00 00 mov $0x4,%eax
800c01: 8b 5d 10 mov 0x10(%ebp),%ebx
800c04: 89 f7 mov %esi,%edi
800c06: cd 30 int $0x30
if(check && ret > 0)
800c08: 85 c0 test %eax,%eax
800c0a: 7f 08 jg 800c14 <sys_page_alloc+0x2c>
return syscall(SYS_page_alloc, 1, envid, (uint32_t) va, perm, 0, 0);
}
800c0c: 8d 65 f4 lea -0xc(%ebp),%esp
800c0f: 5b pop %ebx
800c10: 5e pop %esi
800c11: 5f pop %edi
800c12: 5d pop %ebp
800c13: c3 ret
panic("syscall %d returned %d (> 0)", num, ret);
800c14: 83 ec 0c sub $0xc,%esp
800c17: 50 push %eax
800c18: 6a 04 push $0x4
800c1a: 68 bf 16 80 00 push $0x8016bf
800c1f: 6a 23 push $0x23
800c21: 68 dc 16 80 00 push $0x8016dc
800c26: e8 6a 04 00 00 call 801095 <_panic>
00800c2b <sys_page_map>:
int
sys_page_map(envid_t srcenv, void *srcva, envid_t dstenv, void *dstva, int perm)
{
800c2b: 55 push %ebp
800c2c: 89 e5 mov %esp,%ebp
800c2e: 57 push %edi
800c2f: 56 push %esi
800c30: 53 push %ebx
800c31: 83 ec 0c sub $0xc,%esp
asm volatile("int %1\n" //执行int T_SYSCALL指令
800c34: 8b 55 08 mov 0x8(%ebp),%edx
800c37: 8b 4d 0c mov 0xc(%ebp),%ecx
800c3a: b8 05 00 00 00 mov $0x5,%eax
800c3f: 8b 5d 10 mov 0x10(%ebp),%ebx
800c42: 8b 7d 14 mov 0x14(%ebp),%edi
800c45: 8b 75 18 mov 0x18(%ebp),%esi
800c48: cd 30 int $0x30
if(check && ret > 0)
800c4a: 85 c0 test %eax,%eax
800c4c: 7f 08 jg 800c56 <sys_page_map+0x2b>
return syscall(SYS_page_map, 1, srcenv, (uint32_t) srcva, dstenv, (uint32_t) dstva, perm);
}
800c4e: 8d 65 f4 lea -0xc(%ebp),%esp
800c51: 5b pop %ebx
800c52: 5e pop %esi
800c53: 5f pop %edi
800c54: 5d pop %ebp
800c55: c3 ret
panic("syscall %d returned %d (> 0)", num, ret);
800c56: 83 ec 0c sub $0xc,%esp
800c59: 50 push %eax
800c5a: 6a 05 push $0x5
800c5c: 68 bf 16 80 00 push $0x8016bf
800c61: 6a 23 push $0x23
800c63: 68 dc 16 80 00 push $0x8016dc
800c68: e8 28 04 00 00 call 801095 <_panic>
00800c6d <sys_page_unmap>:
int
sys_page_unmap(envid_t envid, void *va)
{
800c6d: 55 push %ebp
800c6e: 89 e5 mov %esp,%ebp
800c70: 57 push %edi
800c71: 56 push %esi
800c72: 53 push %ebx
800c73: 83 ec 0c sub $0xc,%esp
asm volatile("int %1\n" //执行int T_SYSCALL指令
800c76: bb 00 00 00 00 mov $0x0,%ebx
800c7b: 8b 55 08 mov 0x8(%ebp),%edx
800c7e: 8b 4d 0c mov 0xc(%ebp),%ecx
800c81: b8 06 00 00 00 mov $0x6,%eax
800c86: 89 df mov %ebx,%edi
800c88: 89 de mov %ebx,%esi
800c8a: cd 30 int $0x30
if(check && ret > 0)
800c8c: 85 c0 test %eax,%eax
800c8e: 7f 08 jg 800c98 <sys_page_unmap+0x2b>
return syscall(SYS_page_unmap, 1, envid, (uint32_t) va, 0, 0, 0);
}
800c90: 8d 65 f4 lea -0xc(%ebp),%esp
800c93: 5b pop %ebx
800c94: 5e pop %esi
800c95: 5f pop %edi
800c96: 5d pop %ebp
800c97: c3 ret
panic("syscall %d returned %d (> 0)", num, ret);
800c98: 83 ec 0c sub $0xc,%esp
800c9b: 50 push %eax
800c9c: 6a 06 push $0x6
800c9e: 68 bf 16 80 00 push $0x8016bf
800ca3: 6a 23 push $0x23
800ca5: 68 dc 16 80 00 push $0x8016dc
800caa: e8 e6 03 00 00 call 801095 <_panic>
00800caf <sys_env_set_status>:
// sys_exofork is inlined in lib.h
int
sys_env_set_status(envid_t envid, int status)
{
800caf: 55 push %ebp
800cb0: 89 e5 mov %esp,%ebp
800cb2: 57 push %edi
800cb3: 56 push %esi
800cb4: 53 push %ebx
800cb5: 83 ec 0c sub $0xc,%esp
asm volatile("int %1\n" //执行int T_SYSCALL指令
800cb8: bb 00 00 00 00 mov $0x0,%ebx
800cbd: 8b 55 08 mov 0x8(%ebp),%edx
800cc0: 8b 4d 0c mov 0xc(%ebp),%ecx
800cc3: b8 08 00 00 00 mov $0x8,%eax
800cc8: 89 df mov %ebx,%edi
800cca: 89 de mov %ebx,%esi
800ccc: cd 30 int $0x30
if(check && ret > 0)
800cce: 85 c0 test %eax,%eax
800cd0: 7f 08 jg 800cda <sys_env_set_status+0x2b>
return syscall(SYS_env_set_status, 1, envid, status, 0, 0, 0);
}
800cd2: 8d 65 f4 lea -0xc(%ebp),%esp
800cd5: 5b pop %ebx
800cd6: 5e pop %esi
800cd7: 5f pop %edi
800cd8: 5d pop %ebp
800cd9: c3 ret
panic("syscall %d returned %d (> 0)", num, ret);
800cda: 83 ec 0c sub $0xc,%esp
800cdd: 50 push %eax
800cde: 6a 08 push $0x8
800ce0: 68 bf 16 80 00 push $0x8016bf
800ce5: 6a 23 push $0x23
800ce7: 68 dc 16 80 00 push $0x8016dc
800cec: e8 a4 03 00 00 call 801095 <_panic>
00800cf1 <sys_env_set_trapframe>:
int
sys_env_set_trapframe(envid_t envid, struct Trapframe *tf)
{
800cf1: 55 push %ebp
800cf2: 89 e5 mov %esp,%ebp
800cf4: 57 push %edi
800cf5: 56 push %esi
800cf6: 53 push %ebx
800cf7: 83 ec 0c sub $0xc,%esp
asm volatile("int %1\n" //执行int T_SYSCALL指令
800cfa: bb 00 00 00 00 mov $0x0,%ebx
800cff: 8b 55 08 mov 0x8(%ebp),%edx
800d02: 8b 4d 0c mov 0xc(%ebp),%ecx
800d05: b8 09 00 00 00 mov $0x9,%eax
800d0a: 89 df mov %ebx,%edi
800d0c: 89 de mov %ebx,%esi
800d0e: cd 30 int $0x30
if(check && ret > 0)
800d10: 85 c0 test %eax,%eax
800d12: 7f 08 jg 800d1c <sys_env_set_trapframe+0x2b>
return syscall(SYS_env_set_trapframe, 1, envid, (uint32_t) tf, 0, 0, 0);
}
800d14: 8d 65 f4 lea -0xc(%ebp),%esp
800d17: 5b pop %ebx
800d18: 5e pop %esi
800d19: 5f pop %edi
800d1a: 5d pop %ebp
800d1b: c3 ret
panic("syscall %d returned %d (> 0)", num, ret);
800d1c: 83 ec 0c sub $0xc,%esp
800d1f: 50 push %eax
800d20: 6a 09 push $0x9
800d22: 68 bf 16 80 00 push $0x8016bf
800d27: 6a 23 push $0x23
800d29: 68 dc 16 80 00 push $0x8016dc
800d2e: e8 62 03 00 00 call 801095 <_panic>
00800d33 <sys_env_set_pgfault_upcall>:
int
sys_env_set_pgfault_upcall(envid_t envid, void *upcall)
{
800d33: 55 push %ebp
800d34: 89 e5 mov %esp,%ebp
800d36: 57 push %edi
800d37: 56 push %esi
800d38: 53 push %ebx
800d39: 83 ec 0c sub $0xc,%esp
asm volatile("int %1\n" //执行int T_SYSCALL指令
800d3c: bb 00 00 00 00 mov $0x0,%ebx
800d41: 8b 55 08 mov 0x8(%ebp),%edx
800d44: 8b 4d 0c mov 0xc(%ebp),%ecx
800d47: b8 0a 00 00 00 mov $0xa,%eax
800d4c: 89 df mov %ebx,%edi
800d4e: 89 de mov %ebx,%esi
800d50: cd 30 int $0x30
if(check && ret > 0)
800d52: 85 c0 test %eax,%eax
800d54: 7f 08 jg 800d5e <sys_env_set_pgfault_upcall+0x2b>
return syscall(SYS_env_set_pgfault_upcall, 1, envid, (uint32_t) upcall, 0, 0, 0);
}
800d56: 8d 65 f4 lea -0xc(%ebp),%esp
800d59: 5b pop %ebx
800d5a: 5e pop %esi
800d5b: 5f pop %edi
800d5c: 5d pop %ebp
800d5d: c3 ret
panic("syscall %d returned %d (> 0)", num, ret);
800d5e: 83 ec 0c sub $0xc,%esp
800d61: 50 push %eax
800d62: 6a 0a push $0xa
800d64: 68 bf 16 80 00 push $0x8016bf
800d69: 6a 23 push $0x23
800d6b: 68 dc 16 80 00 push $0x8016dc
800d70: e8 20 03 00 00 call 801095 <_panic>
00800d75 <sys_ipc_try_send>:
int
sys_ipc_try_send(envid_t envid, uint32_t value, void *srcva, int perm)
{
800d75: 55 push %ebp
800d76: 89 e5 mov %esp,%ebp
800d78: 57 push %edi
800d79: 56 push %esi
800d7a: 53 push %ebx
asm volatile("int %1\n" //执行int T_SYSCALL指令
800d7b: 8b 55 08 mov 0x8(%ebp),%edx
800d7e: 8b 4d 0c mov 0xc(%ebp),%ecx
800d81: b8 0c 00 00 00 mov $0xc,%eax
800d86: be 00 00 00 00 mov $0x0,%esi
800d8b: 8b 5d 10 mov 0x10(%ebp),%ebx
800d8e: 8b 7d 14 mov 0x14(%ebp),%edi
800d91: cd 30 int $0x30
return syscall(SYS_ipc_try_send, 0, envid, value, (uint32_t) srcva, perm, 0);
}
800d93: 5b pop %ebx
800d94: 5e pop %esi
800d95: 5f pop %edi
800d96: 5d pop %ebp
800d97: c3 ret
00800d98 <sys_ipc_recv>:
int
sys_ipc_recv(void *dstva)
{
800d98: 55 push %ebp
800d99: 89 e5 mov %esp,%ebp
800d9b: 57 push %edi
800d9c: 56 push %esi
800d9d: 53 push %ebx
800d9e: 83 ec 0c sub $0xc,%esp
asm volatile("int %1\n" //执行int T_SYSCALL指令
800da1: b9 00 00 00 00 mov $0x0,%ecx
800da6: 8b 55 08 mov 0x8(%ebp),%edx
800da9: b8 0d 00 00 00 mov $0xd,%eax
800dae: 89 cb mov %ecx,%ebx
800db0: 89 cf mov %ecx,%edi
800db2: 89 ce mov %ecx,%esi
800db4: cd 30 int $0x30
if(check && ret > 0)
800db6: 85 c0 test %eax,%eax
800db8: 7f 08 jg 800dc2 <sys_ipc_recv+0x2a>
return syscall(SYS_ipc_recv, 1, (uint32_t)dstva, 0, 0, 0, 0);
}
800dba: 8d 65 f4 lea -0xc(%ebp),%esp
800dbd: 5b pop %ebx
800dbe: 5e pop %esi
800dbf: 5f pop %edi
800dc0: 5d pop %ebp
800dc1: c3 ret
panic("syscall %d returned %d (> 0)", num, ret);
800dc2: 83 ec 0c sub $0xc,%esp
800dc5: 50 push %eax
800dc6: 6a 0d push $0xd
800dc8: 68 bf 16 80 00 push $0x8016bf
800dcd: 6a 23 push $0x23
800dcf: 68 dc 16 80 00 push $0x8016dc
800dd4: e8 bc 02 00 00 call 801095 <_panic>
00800dd9 <pgfault>:
// Custom page fault handler - if faulting page is copy-on-write,
// map in our own private writable copy.
//
static void
pgfault(struct UTrapframe *utf)
{
800dd9: 55 push %ebp
800dda: 89 e5 mov %esp,%ebp
800ddc: 53 push %ebx
800ddd: 83 ec 04 sub $0x4,%esp
800de0: 8b 45 08 mov 0x8(%ebp),%eax
void *addr = (void *) utf->utf_fault_va;
800de3: 8b 18 mov (%eax),%ebx
// Hint:
// Use the read-only page table mappings at uvpt
// (see <inc/memlayout.h>).
// LAB 4: Your code here.
if (!((err & FEC_WR) && (uvpt[PGNUM(addr)] & PTE_COW))) { //只有因为写操作写时拷贝的地址这中情况,才可以抢救。否则一律panic
800de5: f6 40 04 02 testb $0x2,0x4(%eax)
800de9: 74 74 je 800e5f <pgfault+0x86>
800deb: 89 d8 mov %ebx,%eax
800ded: c1 e8 0c shr $0xc,%eax
800df0: 8b 04 85 00 00 40 ef mov -0x10c00000(,%eax,4),%eax
800df7: f6 c4 08 test $0x8,%ah
800dfa: 74 63 je 800e5f <pgfault+0x86>
// page to the old page's address.
// Hint:
// You should make three system calls.
// LAB 4: Your code here.
addr = ROUNDDOWN(addr, PGSIZE);
800dfc: 81 e3 00 f0 ff ff and $0xfffff000,%ebx
if ((r = sys_page_map(0, addr, 0, PFTEMP, PTE_U|PTE_P)) < 0) //将当前进程PFTEMP也映射到当前进程addr指向的物理页
800e02: 83 ec 0c sub $0xc,%esp
800e05: 6a 05 push $0x5
800e07: 68 00 f0 7f 00 push $0x7ff000
800e0c: 6a 00 push $0x0
800e0e: 53 push %ebx
800e0f: 6a 00 push $0x0
800e11: e8 15 fe ff ff call 800c2b <sys_page_map>
800e16: 83 c4 20 add $0x20,%esp
800e19: 85 c0 test %eax,%eax
800e1b: 78 56 js 800e73 <pgfault+0x9a>
panic("sys_page_map: %e", r);
if ((r = sys_page_alloc(0, addr, PTE_P|PTE_U|PTE_W)) < 0) //令当前进程addr指向新分配的物理页
800e1d: 83 ec 04 sub $0x4,%esp
800e20: 6a 07 push $0x7
800e22: 53 push %ebx
800e23: 6a 00 push $0x0
800e25: e8 be fd ff ff call 800be8 <sys_page_alloc>
800e2a: 83 c4 10 add $0x10,%esp
800e2d: 85 c0 test %eax,%eax
800e2f: 78 54 js 800e85 <pgfault+0xac>
panic("sys_page_alloc: %e", r);
memmove(addr, PFTEMP, PGSIZE); //将PFTEMP指向的物理页拷贝到addr指向的物理页
800e31: 83 ec 04 sub $0x4,%esp
800e34: 68 00 10 00 00 push $0x1000
800e39: 68 00 f0 7f 00 push $0x7ff000
800e3e: 53 push %ebx
800e3f: e8 39 fb ff ff call 80097d <memmove>
if ((r = sys_page_unmap(0, PFTEMP)) < 0) //解除当前进程PFTEMP映射
800e44: 83 c4 08 add $0x8,%esp
800e47: 68 00 f0 7f 00 push $0x7ff000
800e4c: 6a 00 push $0x0
800e4e: e8 1a fe ff ff call 800c6d <sys_page_unmap>
800e53: 83 c4 10 add $0x10,%esp
800e56: 85 c0 test %eax,%eax
800e58: 78 3d js 800e97 <pgfault+0xbe>
panic("sys_page_unmap: %e", r);
}
800e5a: 8b 5d fc mov -0x4(%ebp),%ebx
800e5d: c9 leave
800e5e: c3 ret
panic("pgfault():not cow");
800e5f: 83 ec 04 sub $0x4,%esp
800e62: 68 ea 16 80 00 push $0x8016ea
800e67: 6a 1d push $0x1d
800e69: 68 fc 16 80 00 push $0x8016fc
800e6e: e8 22 02 00 00 call 801095 <_panic>
panic("sys_page_map: %e", r);
800e73: 50 push %eax
800e74: 68 07 17 80 00 push $0x801707
800e79: 6a 2a push $0x2a
800e7b: 68 fc 16 80 00 push $0x8016fc
800e80: e8 10 02 00 00 call 801095 <_panic>
panic("sys_page_alloc: %e", r);
800e85: 50 push %eax
800e86: 68 18 17 80 00 push $0x801718
800e8b: 6a 2c push $0x2c
800e8d: 68 fc 16 80 00 push $0x8016fc
800e92: e8 fe 01 00 00 call 801095 <_panic>
panic("sys_page_unmap: %e", r);
800e97: 50 push %eax
800e98: 68 2b 17 80 00 push $0x80172b
800e9d: 6a 2f push $0x2f
800e9f: 68 fc 16 80 00 push $0x8016fc
800ea4: e8 ec 01 00 00 call 801095 <_panic>
00800ea9 <fork>:
// Neither user exception stack should ever be marked copy-on-write,
// so you must allocate a new page for the child's user exception stack.
//
envid_t
fork(void)
{
800ea9: 55 push %ebp
800eaa: 89 e5 mov %esp,%ebp
800eac: 57 push %edi
800ead: 56 push %esi
800eae: 53 push %ebx
800eaf: 83 ec 28 sub $0x28,%esp
// LAB 4: Your code here.
extern void _pgfault_upcall(void);
set_pgfault_handler(pgfault); //设置缺页处理函数
800eb2: 68 d9 0d 80 00 push $0x800dd9
800eb7: e8 1f 02 00 00 call 8010db <set_pgfault_handler>
// This must be inlined. Exercise for reader: why?
static inline envid_t __attribute__((always_inline))
sys_exofork(void)
{
envid_t ret;
asm volatile("int %2"
800ebc: b8 07 00 00 00 mov $0x7,%eax
800ec1: cd 30 int $0x30
800ec3: 89 45 e4 mov %eax,-0x1c(%ebp)
envid_t envid = sys_exofork(); //系统调用,只是简单创建一个Env结构,复制当前用户环境寄存器状态,UTOP以下的页目录还没有建立
if (envid == 0) { //子进程将走这个逻辑
800ec6: 83 c4 10 add $0x10,%esp
800ec9: 85 c0 test %eax,%eax
800ecb: 74 12 je 800edf <fork+0x36>
800ecd: 89 c7 mov %eax,%edi
thisenv = &envs[ENVX(sys_getenvid())];
return 0;
}
if (envid < 0) {
800ecf: 83 7d e4 00 cmpl $0x0,-0x1c(%ebp)
800ed3: 78 26 js 800efb <fork+0x52>
panic("sys_exofork: %e", envid);
}
uint32_t addr;
for (addr = 0; addr < USTACKTOP; addr += PGSIZE) {
800ed5: bb 00 00 00 00 mov $0x0,%ebx
800eda: e9 94 00 00 00 jmp 800f73 <fork+0xca>
thisenv = &envs[ENVX(sys_getenvid())];
800edf: e8 c6 fc ff ff call 800baa <sys_getenvid>
800ee4: 25 ff 03 00 00 and $0x3ff,%eax
800ee9: 6b c0 7c imul $0x7c,%eax,%eax
800eec: 05 00 00 c0 ee add $0xeec00000,%eax
800ef1: a3 04 20 80 00 mov %eax,0x802004
return 0;
800ef6: e9 51 01 00 00 jmp 80104c <fork+0x1a3>
panic("sys_exofork: %e", envid);
800efb: ff 75 e4 pushl -0x1c(%ebp)
800efe: 68 3e 17 80 00 push $0x80173e
800f03: 6a 6d push $0x6d
800f05: 68 fc 16 80 00 push $0x8016fc
800f0a: e8 86 01 00 00 call 801095 <_panic>
sys_page_map(0, addr, envid, addr, PTE_SYSCALL); //对于表示为PTE_SHARE的页,拷贝映射关系,并且两个进程都有读写权限
800f0f: 83 ec 0c sub $0xc,%esp
800f12: 68 07 0e 00 00 push $0xe07
800f17: 56 push %esi
800f18: 57 push %edi
800f19: 56 push %esi
800f1a: 6a 00 push $0x0
800f1c: e8 0a fd ff ff call 800c2b <sys_page_map>
800f21: 83 c4 20 add $0x20,%esp
800f24: eb 3b jmp 800f61 <fork+0xb8>
if ((r = sys_page_map(0, addr, envid, addr, PTE_COW|PTE_U|PTE_P)) < 0)
800f26: 83 ec 0c sub $0xc,%esp
800f29: 68 05 08 00 00 push $0x805
800f2e: 56 push %esi
800f2f: 57 push %edi
800f30: 56 push %esi
800f31: 6a 00 push $0x0
800f33: e8 f3 fc ff ff call 800c2b <sys_page_map>
800f38: 83 c4 20 add $0x20,%esp
800f3b: 85 c0 test %eax,%eax
800f3d: 0f 88 a9 00 00 00 js 800fec <fork+0x143>
if ((r = sys_page_map(0, addr, 0, addr, PTE_COW|PTE_U|PTE_P)) < 0)
800f43: 83 ec 0c sub $0xc,%esp
800f46: 68 05 08 00 00 push $0x805
800f4b: 56 push %esi
800f4c: 6a 00 push $0x0
800f4e: 56 push %esi
800f4f: 6a 00 push $0x0
800f51: e8 d5 fc ff ff call 800c2b <sys_page_map>
800f56: 83 c4 20 add $0x20,%esp
800f59: 85 c0 test %eax,%eax
800f5b: 0f 88 9d 00 00 00 js 800ffe <fork+0x155>
for (addr = 0; addr < USTACKTOP; addr += PGSIZE) {
800f61: 81 c3 00 10 00 00 add $0x1000,%ebx
800f67: 81 fb 00 e0 bf ee cmp $0xeebfe000,%ebx
800f6d: 0f 84 9d 00 00 00 je 801010 <fork+0x167>
if ((uvpd[PDX(addr)] & PTE_P) && (uvpt[PGNUM(addr)] & PTE_P) //为什么uvpt[pagenumber]能访问到第pagenumber项页表条目:https://pdos.csail.mit.edu/6.828/2018/labs/lab4/uvpt.html
800f73: 89 d8 mov %ebx,%eax
800f75: c1 e8 16 shr $0x16,%eax
800f78: 8b 04 85 00 d0 7b ef mov -0x10843000(,%eax,4),%eax
800f7f: a8 01 test $0x1,%al
800f81: 74 de je 800f61 <fork+0xb8>
800f83: 89 d8 mov %ebx,%eax
800f85: c1 e8 0c shr $0xc,%eax
800f88: 8b 14 85 00 00 40 ef mov -0x10c00000(,%eax,4),%edx
800f8f: f6 c2 01 test $0x1,%dl
800f92: 74 cd je 800f61 <fork+0xb8>
&& (uvpt[PGNUM(addr)] & PTE_U)) {
800f94: 8b 14 85 00 00 40 ef mov -0x10c00000(,%eax,4),%edx
800f9b: f6 c2 04 test $0x4,%dl
800f9e: 74 c1 je 800f61 <fork+0xb8>
void *addr = (void*) (pn * PGSIZE);
800fa0: 89 c6 mov %eax,%esi
800fa2: c1 e6 0c shl $0xc,%esi
if (uvpt[pn] & PTE_SHARE) {
800fa5: 8b 14 85 00 00 40 ef mov -0x10c00000(,%eax,4),%edx
800fac: f6 c6 04 test $0x4,%dh
800faf: 0f 85 5a ff ff ff jne 800f0f <fork+0x66>
} else if ((uvpt[pn] & PTE_W) || (uvpt[pn] & PTE_COW)) { //对于UTOP以下的可写的或者写时拷贝的页,拷贝映射关系的同时,需要同时标记当前进程和子进程的页表项为PTE_COW
800fb5: 8b 14 85 00 00 40 ef mov -0x10c00000(,%eax,4),%edx
800fbc: f6 c2 02 test $0x2,%dl
800fbf: 0f 85 61 ff ff ff jne 800f26 <fork+0x7d>
800fc5: 8b 04 85 00 00 40 ef mov -0x10c00000(,%eax,4),%eax
800fcc: f6 c4 08 test $0x8,%ah
800fcf: 0f 85 51 ff ff ff jne 800f26 <fork+0x7d>
sys_page_map(0, addr, envid, addr, PTE_U|PTE_P); //对于只读的页,只需要拷贝映射关系即可
800fd5: 83 ec 0c sub $0xc,%esp
800fd8: 6a 05 push $0x5
800fda: 56 push %esi
800fdb: 57 push %edi
800fdc: 56 push %esi
800fdd: 6a 00 push $0x0
800fdf: e8 47 fc ff ff call 800c2b <sys_page_map>
800fe4: 83 c4 20 add $0x20,%esp
800fe7: e9 75 ff ff ff jmp 800f61 <fork+0xb8>
panic("sys_page_map:%e", r);
800fec: 50 push %eax
800fed: 68 4e 17 80 00 push $0x80174e
800ff2: 6a 48 push $0x48
800ff4: 68 fc 16 80 00 push $0x8016fc
800ff9: e8 97 00 00 00 call 801095 <_panic>
panic("sys_page_map:%e", r);
800ffe: 50 push %eax
800fff: 68 4e 17 80 00 push $0x80174e
801004: 6a 4a push $0x4a
801006: 68 fc 16 80 00 push $0x8016fc
80100b: e8 85 00 00 00 call 801095 <_panic>
duppage(envid, PGNUM(addr)); //拷贝当前进程映射关系到子进程
}
}
int r;
if ((r = sys_page_alloc(envid, (void *)(UXSTACKTOP-PGSIZE), PTE_P | PTE_W | PTE_U)) < 0) //为子进程分配异常栈
801010: 83 ec 04 sub $0x4,%esp
801013: 6a 07 push $0x7
801015: 68 00 f0 bf ee push $0xeebff000
80101a: ff 75 e4 pushl -0x1c(%ebp)
80101d: e8 c6 fb ff ff call 800be8 <sys_page_alloc>
801022: 83 c4 10 add $0x10,%esp
801025: 85 c0 test %eax,%eax
801027: 78 2e js 801057 <fork+0x1ae>
panic("sys_page_alloc: %e", r);
sys_env_set_pgfault_upcall(envid, _pgfault_upcall); //为子进程设置_pgfault_upcall
801029: 83 ec 08 sub $0x8,%esp
80102c: 68 34 11 80 00 push $0x801134
801031: 8b 7d e4 mov -0x1c(%ebp),%edi
801034: 57 push %edi
801035: e8 f9 fc ff ff call 800d33 <sys_env_set_pgfault_upcall>
if ((r = sys_env_set_status(envid, ENV_RUNNABLE)) < 0) //设置子进程为ENV_RUNNABLE状态
80103a: 83 c4 08 add $0x8,%esp
80103d: 6a 02 push $0x2
80103f: 57 push %edi
801040: e8 6a fc ff ff call 800caf <sys_env_set_status>
801045: 83 c4 10 add $0x10,%esp
801048: 85 c0 test %eax,%eax
80104a: 78 1d js 801069 <fork+0x1c0>
panic("sys_env_set_status: %e", r);
return envid;
}
80104c: 8b 45 e4 mov -0x1c(%ebp),%eax
80104f: 8d 65 f4 lea -0xc(%ebp),%esp
801052: 5b pop %ebx
801053: 5e pop %esi
801054: 5f pop %edi
801055: 5d pop %ebp
801056: c3 ret
panic("sys_page_alloc: %e", r);
801057: 50 push %eax
801058: 68 18 17 80 00 push $0x801718
80105d: 6a 79 push $0x79
80105f: 68 fc 16 80 00 push $0x8016fc
801064: e8 2c 00 00 00 call 801095 <_panic>
panic("sys_env_set_status: %e", r);
801069: 50 push %eax
80106a: 68 60 17 80 00 push $0x801760
80106f: 6a 7d push $0x7d
801071: 68 fc 16 80 00 push $0x8016fc
801076: e8 1a 00 00 00 call 801095 <_panic>
0080107b <sfork>:
// Challenge!
int
sfork(void)
{
80107b: 55 push %ebp
80107c: 89 e5 mov %esp,%ebp
80107e: 83 ec 0c sub $0xc,%esp
panic("sfork not implemented");
801081: 68 77 17 80 00 push $0x801777
801086: 68 85 00 00 00 push $0x85
80108b: 68 fc 16 80 00 push $0x8016fc
801090: e8 00 00 00 00 call 801095 <_panic>
00801095 <_panic>:
* It prints "panic: <message>", then causes a breakpoint exception,
* which causes JOS to enter the JOS kernel monitor.
*/
void
_panic(const char *file, int line, const char *fmt, ...)
{
801095: 55 push %ebp
801096: 89 e5 mov %esp,%ebp
801098: 56 push %esi
801099: 53 push %ebx
va_list ap;
va_start(ap, fmt);
80109a: 8d 5d 14 lea 0x14(%ebp),%ebx
// Print the panic message
cprintf("[%08x] user panic in %s at %s:%d: ",
80109d: 8b 35 00 20 80 00 mov 0x802000,%esi
8010a3: e8 02 fb ff ff call 800baa <sys_getenvid>
8010a8: 83 ec 0c sub $0xc,%esp
8010ab: ff 75 0c pushl 0xc(%ebp)
8010ae: ff 75 08 pushl 0x8(%ebp)
8010b1: 56 push %esi
8010b2: 50 push %eax
8010b3: 68 90 17 80 00 push $0x801790
8010b8: e8 13 f1 ff ff call 8001d0 <cprintf>
sys_getenvid(), binaryname, file, line);
vcprintf(fmt, ap);
8010bd: 83 c4 18 add $0x18,%esp
8010c0: 53 push %ebx
8010c1: ff 75 10 pushl 0x10(%ebp)
8010c4: e8 b6 f0 ff ff call 80017f <vcprintf>
cprintf("\n");
8010c9: c7 04 24 af 13 80 00 movl $0x8013af,(%esp)
8010d0: e8 fb f0 ff ff call 8001d0 <cprintf>
8010d5: 83 c4 10 add $0x10,%esp
// Cause a breakpoint exception
while (1)
asm volatile("int3");
8010d8: cc int3
8010d9: eb fd jmp 8010d8 <_panic+0x43>
008010db <set_pgfault_handler>:
// at UXSTACKTOP), and tell the kernel to call the assembly-language
// _pgfault_upcall routine when a page fault occurs.
//
void
set_pgfault_handler(void (*handler)(struct UTrapframe *utf))
{
8010db: 55 push %ebp
8010dc: 89 e5 mov %esp,%ebp
8010de: 83 ec 08 sub $0x8,%esp
int r;
if (_pgfault_handler == 0) {
8010e1: 83 3d 08 20 80 00 00 cmpl $0x0,0x802008
8010e8: 74 0a je 8010f4 <set_pgfault_handler+0x19>
}
sys_env_set_pgfault_upcall(0, _pgfault_upcall); //系统调用,设置进程的env_pgfault_upcall属性
}
// Save handler pointer for assembly to call.
_pgfault_handler = handler;
8010ea: 8b 45 08 mov 0x8(%ebp),%eax
8010ed: a3 08 20 80 00 mov %eax,0x802008
}
8010f2: c9 leave
8010f3: c3 ret
int r = sys_page_alloc(0, (void *)(UXSTACKTOP-PGSIZE), PTE_W | PTE_U | PTE_P); //为当前进程分配异常栈
8010f4: 83 ec 04 sub $0x4,%esp
8010f7: 6a 07 push $0x7
8010f9: 68 00 f0 bf ee push $0xeebff000
8010fe: 6a 00 push $0x0
801100: e8 e3 fa ff ff call 800be8 <sys_page_alloc>
if (r < 0) {
801105: 83 c4 10 add $0x10,%esp
801108: 85 c0 test %eax,%eax
80110a: 78 14 js 801120 <set_pgfault_handler+0x45>
sys_env_set_pgfault_upcall(0, _pgfault_upcall); //系统调用,设置进程的env_pgfault_upcall属性
80110c: 83 ec 08 sub $0x8,%esp
80110f: 68 34 11 80 00 push $0x801134
801114: 6a 00 push $0x0
801116: e8 18 fc ff ff call 800d33 <sys_env_set_pgfault_upcall>
80111b: 83 c4 10 add $0x10,%esp
80111e: eb ca jmp 8010ea <set_pgfault_handler+0xf>
panic("set_pgfault_handler:sys_page_alloc failed");;
801120: 83 ec 04 sub $0x4,%esp
801123: 68 b4 17 80 00 push $0x8017b4
801128: 6a 22 push $0x22
80112a: 68 e0 17 80 00 push $0x8017e0
80112f: e8 61 ff ff ff call 801095 <_panic>
00801134 <_pgfault_upcall>:
.text
.globl _pgfault_upcall
_pgfault_upcall:
// Call the C page fault handler.
pushl %esp // function argument: pointer to UTF
801134: 54 push %esp
movl _pgfault_handler, %eax
801135: a1 08 20 80 00 mov 0x802008,%eax
call *%eax //调用页处理函数
80113a: ff d0 call *%eax
addl $4, %esp // pop function argument
80113c: 83 c4 04 add $0x4,%esp
// LAB 4: Your code here.
// Restore the trap-time registers. After you do this, you
// can no longer modify any general-purpose registers.
// LAB 4: Your code here.
addl $8, %esp //跳过utf_fault_va和utf_err
80113f: 83 c4 08 add $0x8,%esp
movl 40(%esp), %eax //保存中断发生时的esp到eax
801142: 8b 44 24 28 mov 0x28(%esp),%eax
movl 32(%esp), %ecx //保存终端发生时的eip到ecx
801146: 8b 4c 24 20 mov 0x20(%esp),%ecx
movl %ecx, -4(%eax) //将中断发生时的esp值亚入到到原来的栈中
80114a: 89 48 fc mov %ecx,-0x4(%eax)
popal
80114d: 61 popa
addl $4, %esp //跳过eip
80114e: 83 c4 04 add $0x4,%esp
// Restore eflags from the stack. After you do this, you can
// no longer use arithmetic operations or anything else that
// modifies eflags.
// LAB 4: Your code here.
popfl
801151: 9d popf
// Switch back to the adjusted trap-time stack.
// LAB 4: Your code here.
popl %esp
801152: 5c pop %esp
// Return to re-execute the instruction that faulted.
// LAB 4: Your code here.
lea -4(%esp), %esp //因为之前压入了eip的值但是没有减esp的值,所以现在需要将esp寄存器中的值减4
801153: 8d 64 24 fc lea -0x4(%esp),%esp
801157: c3 ret
801158: 66 90 xchg %ax,%ax
80115a: 66 90 xchg %ax,%ax
80115c: 66 90 xchg %ax,%ax
80115e: 66 90 xchg %ax,%ax
00801160 <__udivdi3>:
801160: 55 push %ebp
801161: 57 push %edi
801162: 56 push %esi
801163: 53 push %ebx
801164: 83 ec 1c sub $0x1c,%esp
801167: 8b 54 24 3c mov 0x3c(%esp),%edx
80116b: 8b 6c 24 30 mov 0x30(%esp),%ebp
80116f: 8b 74 24 34 mov 0x34(%esp),%esi
801173: 8b 5c 24 38 mov 0x38(%esp),%ebx
801177: 85 d2 test %edx,%edx
801179: 75 35 jne 8011b0 <__udivdi3+0x50>
80117b: 39 f3 cmp %esi,%ebx
80117d: 0f 87 bd 00 00 00 ja 801240 <__udivdi3+0xe0>
801183: 85 db test %ebx,%ebx
801185: 89 d9 mov %ebx,%ecx
801187: 75 0b jne 801194 <__udivdi3+0x34>
801189: b8 01 00 00 00 mov $0x1,%eax
80118e: 31 d2 xor %edx,%edx
801190: f7 f3 div %ebx
801192: 89 c1 mov %eax,%ecx
801194: 31 d2 xor %edx,%edx
801196: 89 f0 mov %esi,%eax
801198: f7 f1 div %ecx
80119a: 89 c6 mov %eax,%esi
80119c: 89 e8 mov %ebp,%eax
80119e: 89 f7 mov %esi,%edi
8011a0: f7 f1 div %ecx
8011a2: 89 fa mov %edi,%edx
8011a4: 83 c4 1c add $0x1c,%esp
8011a7: 5b pop %ebx
8011a8: 5e pop %esi
8011a9: 5f pop %edi
8011aa: 5d pop %ebp
8011ab: c3 ret
8011ac: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi
8011b0: 39 f2 cmp %esi,%edx
8011b2: 77 7c ja 801230 <__udivdi3+0xd0>
8011b4: 0f bd fa bsr %edx,%edi
8011b7: 83 f7 1f xor $0x1f,%edi
8011ba: 0f 84 98 00 00 00 je 801258 <__udivdi3+0xf8>
8011c0: 89 f9 mov %edi,%ecx
8011c2: b8 20 00 00 00 mov $0x20,%eax
8011c7: 29 f8 sub %edi,%eax
8011c9: d3 e2 shl %cl,%edx
8011cb: 89 54 24 08 mov %edx,0x8(%esp)
8011cf: 89 c1 mov %eax,%ecx
8011d1: 89 da mov %ebx,%edx
8011d3: d3 ea shr %cl,%edx
8011d5: 8b 4c 24 08 mov 0x8(%esp),%ecx
8011d9: 09 d1 or %edx,%ecx
8011db: 89 f2 mov %esi,%edx
8011dd: 89 4c 24 08 mov %ecx,0x8(%esp)
8011e1: 89 f9 mov %edi,%ecx
8011e3: d3 e3 shl %cl,%ebx
8011e5: 89 c1 mov %eax,%ecx
8011e7: d3 ea shr %cl,%edx
8011e9: 89 f9 mov %edi,%ecx
8011eb: 89 5c 24 0c mov %ebx,0xc(%esp)
8011ef: d3 e6 shl %cl,%esi
8011f1: 89 eb mov %ebp,%ebx
8011f3: 89 c1 mov %eax,%ecx
8011f5: d3 eb shr %cl,%ebx
8011f7: 09 de or %ebx,%esi
8011f9: 89 f0 mov %esi,%eax
8011fb: f7 74 24 08 divl 0x8(%esp)
8011ff: 89 d6 mov %edx,%esi
801201: 89 c3 mov %eax,%ebx
801203: f7 64 24 0c mull 0xc(%esp)
801207: 39 d6 cmp %edx,%esi
801209: 72 0c jb 801217 <__udivdi3+0xb7>
80120b: 89 f9 mov %edi,%ecx
80120d: d3 e5 shl %cl,%ebp
80120f: 39 c5 cmp %eax,%ebp
801211: 73 5d jae 801270 <__udivdi3+0x110>
801213: 39 d6 cmp %edx,%esi
801215: 75 59 jne 801270 <__udivdi3+0x110>
801217: 8d 43 ff lea -0x1(%ebx),%eax
80121a: 31 ff xor %edi,%edi
80121c: 89 fa mov %edi,%edx
80121e: 83 c4 1c add $0x1c,%esp
801221: 5b pop %ebx
801222: 5e pop %esi
801223: 5f pop %edi
801224: 5d pop %ebp
801225: c3 ret
801226: 8d 76 00 lea 0x0(%esi),%esi
801229: 8d bc 27 00 00 00 00 lea 0x0(%edi,%eiz,1),%edi
801230: 31 ff xor %edi,%edi
801232: 31 c0 xor %eax,%eax
801234: 89 fa mov %edi,%edx
801236: 83 c4 1c add $0x1c,%esp
801239: 5b pop %ebx
80123a: 5e pop %esi
80123b: 5f pop %edi
80123c: 5d pop %ebp
80123d: c3 ret
80123e: 66 90 xchg %ax,%ax
801240: 31 ff xor %edi,%edi
801242: 89 e8 mov %ebp,%eax
801244: 89 f2 mov %esi,%edx
801246: f7 f3 div %ebx
801248: 89 fa mov %edi,%edx
80124a: 83 c4 1c add $0x1c,%esp
80124d: 5b pop %ebx
80124e: 5e pop %esi
80124f: 5f pop %edi
801250: 5d pop %ebp
801251: c3 ret
801252: 8d b6 00 00 00 00 lea 0x0(%esi),%esi
801258: 39 f2 cmp %esi,%edx
80125a: 72 06 jb 801262 <__udivdi3+0x102>
80125c: 31 c0 xor %eax,%eax
80125e: 39 eb cmp %ebp,%ebx
801260: 77 d2 ja 801234 <__udivdi3+0xd4>
801262: b8 01 00 00 00 mov $0x1,%eax
801267: eb cb jmp 801234 <__udivdi3+0xd4>
801269: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi
801270: 89 d8 mov %ebx,%eax
801272: 31 ff xor %edi,%edi
801274: eb be jmp 801234 <__udivdi3+0xd4>
801276: 66 90 xchg %ax,%ax
801278: 66 90 xchg %ax,%ax
80127a: 66 90 xchg %ax,%ax
80127c: 66 90 xchg %ax,%ax
80127e: 66 90 xchg %ax,%ax
00801280 <__umoddi3>:
801280: 55 push %ebp
801281: 57 push %edi
801282: 56 push %esi
801283: 53 push %ebx
801284: 83 ec 1c sub $0x1c,%esp
801287: 8b 6c 24 3c mov 0x3c(%esp),%ebp
80128b: 8b 74 24 30 mov 0x30(%esp),%esi
80128f: 8b 5c 24 34 mov 0x34(%esp),%ebx
801293: 8b 7c 24 38 mov 0x38(%esp),%edi
801297: 85 ed test %ebp,%ebp
801299: 89 f0 mov %esi,%eax
80129b: 89 da mov %ebx,%edx
80129d: 75 19 jne 8012b8 <__umoddi3+0x38>
80129f: 39 df cmp %ebx,%edi
8012a1: 0f 86 b1 00 00 00 jbe 801358 <__umoddi3+0xd8>
8012a7: f7 f7 div %edi
8012a9: 89 d0 mov %edx,%eax
8012ab: 31 d2 xor %edx,%edx
8012ad: 83 c4 1c add $0x1c,%esp
8012b0: 5b pop %ebx
8012b1: 5e pop %esi
8012b2: 5f pop %edi
8012b3: 5d pop %ebp
8012b4: c3 ret
8012b5: 8d 76 00 lea 0x0(%esi),%esi
8012b8: 39 dd cmp %ebx,%ebp
8012ba: 77 f1 ja 8012ad <__umoddi3+0x2d>
8012bc: 0f bd cd bsr %ebp,%ecx
8012bf: 83 f1 1f xor $0x1f,%ecx
8012c2: 89 4c 24 04 mov %ecx,0x4(%esp)
8012c6: 0f 84 b4 00 00 00 je 801380 <__umoddi3+0x100>
8012cc: b8 20 00 00 00 mov $0x20,%eax
8012d1: 89 c2 mov %eax,%edx
8012d3: 8b 44 24 04 mov 0x4(%esp),%eax
8012d7: 29 c2 sub %eax,%edx
8012d9: 89 c1 mov %eax,%ecx
8012db: 89 f8 mov %edi,%eax
8012dd: d3 e5 shl %cl,%ebp
8012df: 89 d1 mov %edx,%ecx
8012e1: 89 54 24 0c mov %edx,0xc(%esp)
8012e5: d3 e8 shr %cl,%eax
8012e7: 09 c5 or %eax,%ebp
8012e9: 8b 44 24 04 mov 0x4(%esp),%eax
8012ed: 89 c1 mov %eax,%ecx
8012ef: d3 e7 shl %cl,%edi
8012f1: 89 d1 mov %edx,%ecx
8012f3: 89 7c 24 08 mov %edi,0x8(%esp)
8012f7: 89 df mov %ebx,%edi
8012f9: d3 ef shr %cl,%edi
8012fb: 89 c1 mov %eax,%ecx
8012fd: 89 f0 mov %esi,%eax
8012ff: d3 e3 shl %cl,%ebx
801301: 89 d1 mov %edx,%ecx
801303: 89 fa mov %edi,%edx
801305: d3 e8 shr %cl,%eax
801307: 0f b6 4c 24 04 movzbl 0x4(%esp),%ecx
80130c: 09 d8 or %ebx,%eax
80130e: f7 f5 div %ebp
801310: d3 e6 shl %cl,%esi
801312: 89 d1 mov %edx,%ecx
801314: f7 64 24 08 mull 0x8(%esp)
801318: 39 d1 cmp %edx,%ecx
80131a: 89 c3 mov %eax,%ebx
80131c: 89 d7 mov %edx,%edi
80131e: 72 06 jb 801326 <__umoddi3+0xa6>
801320: 75 0e jne 801330 <__umoddi3+0xb0>
801322: 39 c6 cmp %eax,%esi
801324: 73 0a jae 801330 <__umoddi3+0xb0>
801326: 2b 44 24 08 sub 0x8(%esp),%eax
80132a: 19 ea sbb %ebp,%edx
80132c: 89 d7 mov %edx,%edi
80132e: 89 c3 mov %eax,%ebx
801330: 89 ca mov %ecx,%edx
801332: 0f b6 4c 24 0c movzbl 0xc(%esp),%ecx
801337: 29 de sub %ebx,%esi
801339: 19 fa sbb %edi,%edx
80133b: 8b 5c 24 04 mov 0x4(%esp),%ebx
80133f: 89 d0 mov %edx,%eax
801341: d3 e0 shl %cl,%eax
801343: 89 d9 mov %ebx,%ecx
801345: d3 ee shr %cl,%esi
801347: d3 ea shr %cl,%edx
801349: 09 f0 or %esi,%eax
80134b: 83 c4 1c add $0x1c,%esp
80134e: 5b pop %ebx
80134f: 5e pop %esi
801350: 5f pop %edi
801351: 5d pop %ebp
801352: c3 ret
801353: 90 nop
801354: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi
801358: 85 ff test %edi,%edi
80135a: 89 f9 mov %edi,%ecx
80135c: 75 0b jne 801369 <__umoddi3+0xe9>
80135e: b8 01 00 00 00 mov $0x1,%eax
801363: 31 d2 xor %edx,%edx
801365: f7 f7 div %edi
801367: 89 c1 mov %eax,%ecx
801369: 89 d8 mov %ebx,%eax
80136b: 31 d2 xor %edx,%edx
80136d: f7 f1 div %ecx
80136f: 89 f0 mov %esi,%eax
801371: f7 f1 div %ecx
801373: e9 31 ff ff ff jmp 8012a9 <__umoddi3+0x29>
801378: 90 nop
801379: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi
801380: 39 dd cmp %ebx,%ebp
801382: 72 08 jb 80138c <__umoddi3+0x10c>
801384: 39 f7 cmp %esi,%edi
801386: 0f 87 21 ff ff ff ja 8012ad <__umoddi3+0x2d>
80138c: 89 da mov %ebx,%edx
80138e: 89 f0 mov %esi,%eax
801390: 29 f8 sub %edi,%eax
801392: 19 ea sbb %ebp,%edx
801394: e9 14 ff ff ff jmp 8012ad <__umoddi3+0x2d>
|
oeis/001/A001946.asm
|
neoneye/loda-programs
| 11 |
92099
|
; A001946: a(n) = 11*a(n-1) + a(n-2).
; Submitted by <NAME>
; 2,11,123,1364,15127,167761,1860498,20633239,228826127,2537720636,28143753123,312119004989,3461452808002,38388099893011,425730551631123,4721424167835364,52361396397820127,580696784543856761,6440026026380244498,71420983074726546239,792070839848372253127,8784200221406821330636,97418273275323406890123,1080385206249964297121989,11981655542024930675232002,132878596168524201724674011,1473646213395791149646646123,16342986943522226847837781364,181246502592140286475862241127
mul $0,5
seq $0,211 ; a(n) = a(n-1) + a(n-2) - 2, a(0) = 4, a(1) = 3.
sub $0,2
|
other.7z/NEWS.7z/NEWS/テープリストア/NEWS_05/NEWS_05.tar/home/kimura/polygon.lzh/polygon/pcr/Mcamera.asm
|
prismotizm/gigaleak
| 0 |
3874
|
<gh_stars>0
Name: Mcamera.asm
Type: file
Size: 6663
Last-Modified: '1992-10-05T05:04:14Z'
SHA-1: 5EB2AF39D1A68111CAF94DFD473FD620F58A70A1
Description: null
|
src/FsmLexer.g4
|
bvandepo/FSMProcess
| 0 |
3197
|
//Copyright (c) 2016, <NAME>, LAAS/CNRS
//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 University of California, Berkeley 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 REGENTS 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 REGENTS AND 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.
lexer grammar FsmLexer;
tokens { WHITESPACE_CHANNEL, COMMENTS_CHANNEL,PRAGMAS_CHANNEL}
// -----------------------Default mode rules -----------------------
SEMICOLON : ';' ;
COLON : ':' ;
SLASH : '/' ;
ANTISLASH : '\\' ;
SHARP : '#' ;
CONDITION : '?' ;
COMMA : ',' ;
EQUAL : '=' ;
PERCENT : '%' ;
ARROW : '->' ;
DOUBLEARROW : '=>' ;
STAR : '*' ;
COLONEQUAL : ':=' ;
DOT : '.' ;
DOUBLEEQUAL : '==' ;
NOTEQUAL : '!=' ;
PLUS : '+' ;
MINUS : '-' ;
UNDERSCORE : '_' ;
LEFT_CURLY_BRACE : '{' ;
RIGHT_CURLY_BRACE : '}' ;
PARENTHESISOPEN : '(' ;
PARENTHESISCLOSE : ')' ;
POWER : '^' ;
// case insensitive chars
A:('a'|'A');
B:('b'|'B');
C:('c'|'C');
D:('d'|'D');
E:('e'|'E');
F:('f'|'F');
G:('g'|'G');
H:('h'|'H');
I:('i'|'I');
J:('j'|'J');
K:('k'|'K');
L:('l'|'L');
M:('m'|'M');
N:('n'|'N');
O:('o'|'O');
P:('p'|'P');
Q:('q'|'Q');
R:('r'|'R');
S:('s'|'S');
T:('t'|'T');
U:('u'|'U');
V:('v'|'V');
W:('w'|'W');
X:('x'|'X');
Y:('y'|'Y');
Z:('z'|'Z');
//Added space to avoid tokenizing when these appears inside names
//Added + to detect the keyword even if they are separated by many spaces
AND : WS A N D WS;
NAND : WS N A N D WS;
OR : WS O R WS;
NOR : WS N O R WS;
XOR : WS X O R WS;
XNOR : WS X N O R WS;
NOT : N O T WS;
//TEXT : ~'<'+ ; // clump all text together
TO: WS T O WS;
DOWNTO: WS D O W N T O WS;
/** "any double-quoted string ("...") possibly containing escaped quotes" */
STRING : '"' ( '\\"' | . )*? '"' ;
/** "Any string of alphabetic ([a-zA-Z\200-\377]) characters, underscores
* ('_') or digits ([0-9]), not beginning with a digit"
*/
//ID : LETTER ( LETTER | DIGIT )* ;
//obligé de faire le token à ce niveau la, sinon ACTION_NON_MEMORISEE est vu comme
//ACTION_NON_MEM OR ISEE
//ID : (LETTER | DIGIT) ( LETTER | DIGIT | UNDERSCORE)* ;
// ID : (LETTER | DIGIT) ( LETTER | DIGIT | UNDERSCORE)* ;
// ID : (LETTER ) ( LETTER | DIGIT | UNDERSCORE)* ;
//ID : DIGIT ;
//doivent être décrit après ID !!!
DIGIT : [0-9] ;
// LETTER : [a-zA-Z\u0080-\u00FF_] ;
/** "HTML strings, angle brackets must occur in matched pairs, and
* unescaped newlines are allowed."
*/ HTML_STRING
: '<' ( TAG | ~ [<>] )* '>'
;
fragment TAG : '<' .*? '>' ;
PRAGMA_VHDL_PRE_ENTITY_DIRECTIVE : '#pragma_vhdl_pre_entity' ;
PRAGMA_VHDL_ENTITY_DIRECTIVE : '#pragma_vhdl_entity{' ;
PRAGMA_VHDL_ARCHITECTURE_PRE_BEGIN_DIRECTIVE : '#pragma_vhdl_architecture_pre_begin' ;
PRAGMA_VHDL_ARCHITECTURE_POST_BEGIN_DIRECTIVE : '#pragma_vhdl_architecture_post_begin' ;
PRAGMA_VHDL_PROMOTE_TO_BUFFER_DIRECTIVE : '#pragma_vhdl_promote_to_buffer{' ;
PRAGMA_VHDL_DEMOTE_TO_SIGNAL_DIRECTIVE : '#pragma_vhdl_demote_to_signal{' ;
PRAGMA_VHDL_ALLOW_AUTOMATIC_BUFFERING_DIRECTIVE: '#pragma_vhdl_allow_automatic_buffering' ;
PRAGMA_VHDL_SET_BIT_SIZE_FOR_OUTPUT_STATE_NUMBER: '#pragma_vhdl_set_bit_size_for_output_state_number{' ;
PRAGMA_VHDL_INIT_TESTBENCH_BEGIN_DIRECTIVE : '#pragma_vhdl_init_testbench' ;
PRAGMA_VHDL_TESTBENCH_BEGIN_DIRECTIVE : '#pragma_vhdl_testbench' ;
PRAGMA_VHDL_TESTBENCH_PRE_BEGIN_DIRECTIVE : '#pragma_vhdl_testbench_pre_begin' ;
PRAGMA_VHDL_GENERIC_DIRECTIVE : '#pragma_vhdl_generic_directive{' ;
PRAGMA_WITH_BEGINING_AND_ENDING: '{' SOMECARS '}#pragma' ;
//PRAGMA_WITH_BEGINING_AND_ENDING: '{' '}#pragma' ;
PRAGMA_DOT_GLOBAL_DIRECTIVE : '#pragma_dot_global_directive' ;
PRAGMA_ENDING: '}#pragma' ;
//the same rule, but displays pragma mode when matched
//PRAGMA: '#pragma{' SOMECARS '#pragma}' {System.out.println(" pragma mode");} ;
Whitespace : [ \t]+ -> channel(WHITESPACE_CHANNEL) ;
WS :[ \t\n\r]+ -> channel(WHITESPACE_CHANNEL) ;
COMMENT : '/*' .*? '*/' -> channel(COMMENTS_CHANNEL) ;
LINE_COMMENT : '//' .*? '\r'? '\n' -> channel(COMMENTS_CHANNEL) ;
/*
EXPONENT
: ('E'|'e') ( '+' | '-' )? INTEGER
;
HEXDIGIT
: ('A'..'F'|'a'..'f')
;
INTEGER
: DIGIT ( '_' | DIGIT )*
;
BASED_INTEGER
: EXTENDED_DIGIT ('_' | EXTENDED_DIGIT)*
;
EXTENDED_DIGIT
: (DIGIT | LETTER)
;
APOSTROPHE
: '\''
;
*/
// -----------------------Pragma mode rules -----------------------
//mode PRAGMA_MODE;
//END_PRAGMA : '{' SOMECARS '#pragma}' {System.out.println("exit pragma mode");} ->popMode ;
SOMECARS: ANYCAR -> channel(PRAGMAS_CHANNEL) ;
//SOMECARS is a token that contains all the pragma
//Impossible to attach action to a fragment
fragment ANYCAR : (.)+? ;
//fragment ANYCAR : ('a'..'z' | '\n' | 'r' | ' ' | '0'..'9')* ;
//I need a fragment in order to avoid error "non-fragment lexer rule 'ANYCHARS' can match the empty string"
//A fragment will not produce any token
|
libsrc/_DEVELOPMENT/math/float/math16/lm16/c/sdcc/inv.asm
|
ahjelm/z88dk
| 640 |
100006
|
<filename>libsrc/_DEVELOPMENT/math/float/math16/lm16/c/sdcc/inv.asm<gh_stars>100-1000
SECTION code_fp_math16
PUBLIC _invf16
EXTERN cm16_sdcc_inv
defc _invf16 = cm16_sdcc_inv
|
dev/display/ega2/cpi-head.asm
|
minblock/msdos
| 0 |
91128
|
;/*
; * Microsoft Confidential
; * Copyright (C) Microsoft Corporation 1991
; * All Rights Reserved.
; */
CODE SEGMENT BYTE PUBLIC 'CODE'
ASSUME CS:CODE,DS:CODE
BEGIN: ORG 0
FNTHEAD:DB 0FFH,"FONT " ;FILE TAG
DB 8 DUP(0) ;RESERVED
DW 1 ;CNT OF POINTERS IN HEADER
DB 1 ;TYPE FOR INFO POINTER
DW OFFSET INFO,0 ;POINTER TO INFO IN FILE
INFO: DW 6 ;COUNT OF ENTRIES
CODE ENDS
END
|
llvm/test/tools/llvm-ml/parse_only.asm
|
mkinsner/llvm
| 2,338 |
3734
|
; RUN: llvm-ml %s /Zs /Fo - | FileCheck %s
.code
t1 PROC
ECHO Testing!
ret
t1 ENDP
; check for the .text symbol (appears in both object files & .s output)
; CHECK-NOT: .text
; CHECK: Testing!
; check for the .text symbol (appears in both object files & .s output)
; CHECK-NOT: .text
end
|
test/Succeed/Issue1214.agda
|
KDr2/agda
| 0 |
2192
|
<reponame>KDr2/agda
{-# OPTIONS --cubical-compatible #-}
data ℕ : Set where
zero : ℕ
suc : ℕ → ℕ
Test : Set
Test = ℕ
test : Test → ℕ
test zero = zero
test (suc n) = test n
|
alloy4fun_models/trashltl/models/11/dpyRbAo3Yjcjb9MQs.als
|
Kaixi26/org.alloytools.alloy
| 0 |
3456
|
open main
pred iddpyRbAo3Yjcjb9MQs_prop12 {
always (some f:File | (eventually f in Trash) implies (always f in Trash))
}
pred __repair { iddpyRbAo3Yjcjb9MQs_prop12 }
check __repair { iddpyRbAo3Yjcjb9MQs_prop12 <=> prop12o }
|
SVD2ada/svd/stm32_svd-axi.ads
|
JCGobbi/Nucleo-STM32H743ZI
| 0 |
23789
|
<gh_stars>0
pragma Style_Checks (Off);
-- This spec has been automatically generated from STM32H743x.svd
pragma Restrictions (No_Elaboration_Code);
with HAL;
with System;
package STM32_SVD.AXI is
pragma Preelaborate;
---------------
-- Registers --
---------------
subtype AXI_PERIPH_ID_4_JEP106CON_Field is HAL.UInt4;
subtype AXI_PERIPH_ID_4_KCOUNT4_Field is HAL.UInt4;
-- AXI interconnect - peripheral ID4 register
type AXI_PERIPH_ID_4_Register is record
-- Read-only. JEP106 continuation code
JEP106CON : AXI_PERIPH_ID_4_JEP106CON_Field;
-- Read-only. Register file size
KCOUNT4 : AXI_PERIPH_ID_4_KCOUNT4_Field;
-- unspecified
Reserved_8_31 : HAL.UInt24;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_PERIPH_ID_4_Register use record
JEP106CON at 0 range 0 .. 3;
KCOUNT4 at 0 range 4 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype AXI_PERIPH_ID_0_PARTNUM_Field is HAL.UInt8;
-- AXI interconnect - peripheral ID0 register
type AXI_PERIPH_ID_0_Register is record
-- Read-only. Peripheral part number bits 0 to 7
PARTNUM : AXI_PERIPH_ID_0_PARTNUM_Field;
-- unspecified
Reserved_8_31 : HAL.UInt24;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_PERIPH_ID_0_Register use record
PARTNUM at 0 range 0 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype AXI_PERIPH_ID_1_PARTNUM_Field is HAL.UInt4;
subtype AXI_PERIPH_ID_1_JEP106I_Field is HAL.UInt4;
-- AXI interconnect - peripheral ID1 register
type AXI_PERIPH_ID_1_Register is record
-- Read-only. Peripheral part number bits 8 to 11
PARTNUM : AXI_PERIPH_ID_1_PARTNUM_Field;
-- Read-only. JEP106 identity bits 0 to 3
JEP106I : AXI_PERIPH_ID_1_JEP106I_Field;
-- unspecified
Reserved_8_31 : HAL.UInt24;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_PERIPH_ID_1_Register use record
PARTNUM at 0 range 0 .. 3;
JEP106I at 0 range 4 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype AXI_PERIPH_ID_2_JEP106ID_Field is HAL.UInt3;
subtype AXI_PERIPH_ID_2_REVISION_Field is HAL.UInt4;
-- AXI interconnect - peripheral ID2 register
type AXI_PERIPH_ID_2_Register is record
-- Read-only. JEP106 Identity bits 4 to 6
JEP106ID : AXI_PERIPH_ID_2_JEP106ID_Field;
-- Read-only. JEP106 code flag
JEDEC : Boolean;
-- Read-only. Peripheral revision number
REVISION : AXI_PERIPH_ID_2_REVISION_Field;
-- unspecified
Reserved_8_31 : HAL.UInt24;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_PERIPH_ID_2_Register use record
JEP106ID at 0 range 0 .. 2;
JEDEC at 0 range 3 .. 3;
REVISION at 0 range 4 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype AXI_PERIPH_ID_3_CUST_MOD_NUM_Field is HAL.UInt4;
subtype AXI_PERIPH_ID_3_REV_AND_Field is HAL.UInt4;
-- AXI interconnect - peripheral ID3 register
type AXI_PERIPH_ID_3_Register is record
-- Read-only. Customer modification
CUST_MOD_NUM : AXI_PERIPH_ID_3_CUST_MOD_NUM_Field;
-- Read-only. Customer version
REV_AND : AXI_PERIPH_ID_3_REV_AND_Field;
-- unspecified
Reserved_8_31 : HAL.UInt24;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_PERIPH_ID_3_Register use record
CUST_MOD_NUM at 0 range 0 .. 3;
REV_AND at 0 range 4 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype AXI_COMP_ID_0_PREAMBLE_Field is HAL.UInt8;
-- AXI interconnect - component ID0 register
type AXI_COMP_ID_0_Register is record
-- Read-only. Preamble bits 0 to 7
PREAMBLE : AXI_COMP_ID_0_PREAMBLE_Field;
-- unspecified
Reserved_8_31 : HAL.UInt24;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_COMP_ID_0_Register use record
PREAMBLE at 0 range 0 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype AXI_COMP_ID_1_PREAMBLE_Field is HAL.UInt4;
subtype AXI_COMP_ID_1_CLASS_Field is HAL.UInt4;
-- AXI interconnect - component ID1 register
type AXI_COMP_ID_1_Register is record
-- Read-only. Preamble bits 8 to 11
PREAMBLE : AXI_COMP_ID_1_PREAMBLE_Field;
-- Read-only. Component class
CLASS : AXI_COMP_ID_1_CLASS_Field;
-- unspecified
Reserved_8_31 : HAL.UInt24;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_COMP_ID_1_Register use record
PREAMBLE at 0 range 0 .. 3;
CLASS at 0 range 4 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype AXI_COMP_ID_2_PREAMBLE_Field is HAL.UInt8;
-- AXI interconnect - component ID2 register
type AXI_COMP_ID_2_Register is record
-- Read-only. Preamble bits 12 to 19
PREAMBLE : AXI_COMP_ID_2_PREAMBLE_Field;
-- unspecified
Reserved_8_31 : HAL.UInt24;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_COMP_ID_2_Register use record
PREAMBLE at 0 range 0 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype AXI_COMP_ID_3_PREAMBLE_Field is HAL.UInt8;
-- AXI interconnect - component ID3 register
type AXI_COMP_ID_3_Register is record
-- Read-only. Preamble bits 20 to 27
PREAMBLE : AXI_COMP_ID_3_PREAMBLE_Field;
-- unspecified
Reserved_8_31 : HAL.UInt24;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_COMP_ID_3_Register use record
PREAMBLE at 0 range 0 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
-- AXI interconnect - TARG x bus matrix issuing functionality register
type AXI_TARG1_FN_MOD_ISS_BM_Register is record
-- READ_ISS_OVERRIDE
READ_ISS_OVERRIDE : Boolean := False;
-- Switch matrix write issuing override for target
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG1_FN_MOD_ISS_BM_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- AXI interconnect - TARG x bus matrix functionality 2 register
type AXI_TARG1_FN_MOD2_Register is record
-- Disable packing of beats to match the output data width
BYPASS_MERGE : Boolean := False;
-- unspecified
Reserved_1_31 : HAL.UInt31 := 16#2#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG1_FN_MOD2_Register use record
BYPASS_MERGE at 0 range 0 .. 0;
Reserved_1_31 at 0 range 1 .. 31;
end record;
-- AXI interconnect - TARG x long burst functionality modification
type AXI_TARG1_FN_MOD_LB_Register is record
-- Controls burst breaking of long bursts
FN_MOD_LB : Boolean := False;
-- unspecified
Reserved_1_31 : HAL.UInt31 := 16#2#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG1_FN_MOD_LB_Register use record
FN_MOD_LB at 0 range 0 .. 0;
Reserved_1_31 at 0 range 1 .. 31;
end record;
-- AXI interconnect - TARG x long burst functionality modification
type AXI_TARG1_FN_MOD_Register is record
-- Override AMIB read issuing capability
READ_ISS_OVERRIDE : Boolean := False;
-- Override AMIB write issuing capability
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG1_FN_MOD_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- AXI interconnect - TARG x bus matrix issuing functionality register
type AXI_TARG2_FN_MOD_ISS_BM_Register is record
-- READ_ISS_OVERRIDE
READ_ISS_OVERRIDE : Boolean := False;
-- Switch matrix write issuing override for target
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG2_FN_MOD_ISS_BM_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- AXI interconnect - TARG x bus matrix functionality 2 register
type AXI_TARG2_FN_MOD2_Register is record
-- Disable packing of beats to match the output data width
BYPASS_MERGE : Boolean := False;
-- unspecified
Reserved_1_31 : HAL.UInt31 := 16#2#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG2_FN_MOD2_Register use record
BYPASS_MERGE at 0 range 0 .. 0;
Reserved_1_31 at 0 range 1 .. 31;
end record;
-- AXI interconnect - TARG x long burst functionality modification
type AXI_TARG2_FN_MOD_LB_Register is record
-- Controls burst breaking of long bursts
FN_MOD_LB : Boolean := False;
-- unspecified
Reserved_1_31 : HAL.UInt31 := 16#2#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG2_FN_MOD_LB_Register use record
FN_MOD_LB at 0 range 0 .. 0;
Reserved_1_31 at 0 range 1 .. 31;
end record;
-- AXI interconnect - TARG x long burst functionality modification
type AXI_TARG2_FN_MOD_Register is record
-- Override AMIB read issuing capability
READ_ISS_OVERRIDE : Boolean := False;
-- Override AMIB write issuing capability
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG2_FN_MOD_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- AXI interconnect - TARG x bus matrix issuing functionality register
type AXI_TARG3_FN_MOD_ISS_BM_Register is record
-- READ_ISS_OVERRIDE
READ_ISS_OVERRIDE : Boolean := False;
-- Switch matrix write issuing override for target
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG3_FN_MOD_ISS_BM_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- AXI interconnect - TARG x bus matrix issuing functionality register
type AXI_TARG4_FN_MOD_ISS_BM_Register is record
-- READ_ISS_OVERRIDE
READ_ISS_OVERRIDE : Boolean := False;
-- Switch matrix write issuing override for target
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG4_FN_MOD_ISS_BM_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- AXI interconnect - TARG x bus matrix issuing functionality register
type AXI_TARG5_FN_MOD_ISS_BM_Register is record
-- READ_ISS_OVERRIDE
READ_ISS_OVERRIDE : Boolean := False;
-- Switch matrix write issuing override for target
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG5_FN_MOD_ISS_BM_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- AXI interconnect - TARG x bus matrix issuing functionality register
type AXI_TARG6_FN_MOD_ISS_BM_Register is record
-- READ_ISS_OVERRIDE
READ_ISS_OVERRIDE : Boolean := False;
-- Switch matrix write issuing override for target
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG6_FN_MOD_ISS_BM_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- AXI interconnect - TARG x bus matrix issuing functionality register
type AXI_TARG7_FN_MOD_ISS_BM_Register is record
-- READ_ISS_OVERRIDE
READ_ISS_OVERRIDE : Boolean := False;
-- Switch matrix write issuing override for target
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG7_FN_MOD_ISS_BM_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- AXI interconnect - TARG x bus matrix functionality 2 register
type AXI_TARG7_FN_MOD2_Register is record
-- Disable packing of beats to match the output data width
BYPASS_MERGE : Boolean := False;
-- unspecified
Reserved_1_31 : HAL.UInt31 := 16#2#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG7_FN_MOD2_Register use record
BYPASS_MERGE at 0 range 0 .. 0;
Reserved_1_31 at 0 range 1 .. 31;
end record;
-- AXI interconnect - TARG x long burst functionality modification
type AXI_TARG7_FN_MOD_Register is record
-- Override AMIB read issuing capability
READ_ISS_OVERRIDE : Boolean := False;
-- Override AMIB write issuing capability
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_TARG7_FN_MOD_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- AXI interconnect - INI x functionality modification 2 register
type AXI_INI1_FN_MOD2_Register is record
-- Disables alteration of transactions by the up-sizer unless required
-- by the protocol
BYPASS_MERGE : Boolean := False;
-- unspecified
Reserved_1_31 : HAL.UInt31 := 16#2#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI1_FN_MOD2_Register use record
BYPASS_MERGE at 0 range 0 .. 0;
Reserved_1_31 at 0 range 1 .. 31;
end record;
-- AXI interconnect - INI x AHB functionality modification register
type AXI_INI1_FN_MOD_AHB_Register is record
-- Converts all AHB-Lite write transactions to a series of single beat
-- AXI
RD_INC_OVERRIDE : Boolean := False;
-- Converts all AHB-Lite read transactions to a series of single beat
-- AXI
WR_INC_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI1_FN_MOD_AHB_Register use record
RD_INC_OVERRIDE at 0 range 0 .. 0;
WR_INC_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
subtype AXI_INI1_READ_QOS_AR_QOS_Field is HAL.UInt4;
-- AXI interconnect - INI x read QoS register
type AXI_INI1_READ_QOS_Register is record
-- Read channel QoS setting
AR_QOS : AXI_INI1_READ_QOS_AR_QOS_Field := 16#4#;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI1_READ_QOS_Register use record
AR_QOS at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
subtype AXI_INI1_WRITE_QOS_AW_QOS_Field is HAL.UInt4;
-- AXI interconnect - INI x write QoS register
type AXI_INI1_WRITE_QOS_Register is record
-- Write channel QoS setting
AW_QOS : AXI_INI1_WRITE_QOS_AW_QOS_Field := 16#4#;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI1_WRITE_QOS_Register use record
AW_QOS at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-- AXI interconnect - INI x issuing functionality modification register
type AXI_INI1_FN_MOD_Register is record
-- Override ASIB read issuing capability
READ_ISS_OVERRIDE : Boolean := False;
-- Override ASIB write issuing capability
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI1_FN_MOD_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
subtype AXI_INI2_READ_QOS_AR_QOS_Field is HAL.UInt4;
-- AXI interconnect - INI x read QoS register
type AXI_INI2_READ_QOS_Register is record
-- Read channel QoS setting
AR_QOS : AXI_INI2_READ_QOS_AR_QOS_Field := 16#4#;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI2_READ_QOS_Register use record
AR_QOS at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
subtype AXI_INI2_WRITE_QOS_AW_QOS_Field is HAL.UInt4;
-- AXI interconnect - INI x write QoS register
type AXI_INI2_WRITE_QOS_Register is record
-- Write channel QoS setting
AW_QOS : AXI_INI2_WRITE_QOS_AW_QOS_Field := 16#4#;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI2_WRITE_QOS_Register use record
AW_QOS at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-- AXI interconnect - INI x issuing functionality modification register
type AXI_INI2_FN_MOD_Register is record
-- Override ASIB read issuing capability
READ_ISS_OVERRIDE : Boolean := False;
-- Override ASIB write issuing capability
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI2_FN_MOD_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- AXI interconnect - INI x functionality modification 2 register
type AXI_INI3_FN_MOD2_Register is record
-- Disables alteration of transactions by the up-sizer unless required
-- by the protocol
BYPASS_MERGE : Boolean := False;
-- unspecified
Reserved_1_31 : HAL.UInt31 := 16#2#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI3_FN_MOD2_Register use record
BYPASS_MERGE at 0 range 0 .. 0;
Reserved_1_31 at 0 range 1 .. 31;
end record;
-- AXI interconnect - INI x AHB functionality modification register
type AXI_INI3_FN_MOD_AHB_Register is record
-- Converts all AHB-Lite write transactions to a series of single beat
-- AXI
RD_INC_OVERRIDE : Boolean := False;
-- Converts all AHB-Lite read transactions to a series of single beat
-- AXI
WR_INC_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI3_FN_MOD_AHB_Register use record
RD_INC_OVERRIDE at 0 range 0 .. 0;
WR_INC_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
subtype AXI_INI3_READ_QOS_AR_QOS_Field is HAL.UInt4;
-- AXI interconnect - INI x read QoS register
type AXI_INI3_READ_QOS_Register is record
-- Read channel QoS setting
AR_QOS : AXI_INI3_READ_QOS_AR_QOS_Field := 16#4#;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI3_READ_QOS_Register use record
AR_QOS at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
subtype AXI_INI3_WRITE_QOS_AW_QOS_Field is HAL.UInt4;
-- AXI interconnect - INI x write QoS register
type AXI_INI3_WRITE_QOS_Register is record
-- Write channel QoS setting
AW_QOS : AXI_INI3_WRITE_QOS_AW_QOS_Field := 16#4#;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI3_WRITE_QOS_Register use record
AW_QOS at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-- AXI interconnect - INI x issuing functionality modification register
type AXI_INI3_FN_MOD_Register is record
-- Override ASIB read issuing capability
READ_ISS_OVERRIDE : Boolean := False;
-- Override ASIB write issuing capability
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI3_FN_MOD_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
subtype AXI_INI4_READ_QOS_AR_QOS_Field is HAL.UInt4;
-- AXI interconnect - INI x read QoS register
type AXI_INI4_READ_QOS_Register is record
-- Read channel QoS setting
AR_QOS : AXI_INI4_READ_QOS_AR_QOS_Field := 16#4#;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI4_READ_QOS_Register use record
AR_QOS at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
subtype AXI_INI4_WRITE_QOS_AW_QOS_Field is HAL.UInt4;
-- AXI interconnect - INI x write QoS register
type AXI_INI4_WRITE_QOS_Register is record
-- Write channel QoS setting
AW_QOS : AXI_INI4_WRITE_QOS_AW_QOS_Field := 16#4#;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI4_WRITE_QOS_Register use record
AW_QOS at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-- AXI interconnect - INI x issuing functionality modification register
type AXI_INI4_FN_MOD_Register is record
-- Override ASIB read issuing capability
READ_ISS_OVERRIDE : Boolean := False;
-- Override ASIB write issuing capability
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI4_FN_MOD_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
subtype AXI_INI5_READ_QOS_AR_QOS_Field is HAL.UInt4;
-- AXI interconnect - INI x read QoS register
type AXI_INI5_READ_QOS_Register is record
-- Read channel QoS setting
AR_QOS : AXI_INI5_READ_QOS_AR_QOS_Field := 16#4#;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI5_READ_QOS_Register use record
AR_QOS at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
subtype AXI_INI5_WRITE_QOS_AW_QOS_Field is HAL.UInt4;
-- AXI interconnect - INI x write QoS register
type AXI_INI5_WRITE_QOS_Register is record
-- Write channel QoS setting
AW_QOS : AXI_INI5_WRITE_QOS_AW_QOS_Field := 16#4#;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI5_WRITE_QOS_Register use record
AW_QOS at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-- AXI interconnect - INI x issuing functionality modification register
type AXI_INI5_FN_MOD_Register is record
-- Override ASIB read issuing capability
READ_ISS_OVERRIDE : Boolean := False;
-- Override ASIB write issuing capability
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI5_FN_MOD_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
subtype AXI_INI6_READ_QOS_AR_QOS_Field is HAL.UInt4;
-- AXI interconnect - INI x read QoS register
type AXI_INI6_READ_QOS_Register is record
-- Read channel QoS setting
AR_QOS : AXI_INI6_READ_QOS_AR_QOS_Field := 16#4#;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI6_READ_QOS_Register use record
AR_QOS at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
subtype AXI_INI6_WRITE_QOS_AW_QOS_Field is HAL.UInt4;
-- AXI interconnect - INI x write QoS register
type AXI_INI6_WRITE_QOS_Register is record
-- Write channel QoS setting
AW_QOS : AXI_INI6_WRITE_QOS_AW_QOS_Field := 16#4#;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI6_WRITE_QOS_Register use record
AW_QOS at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-- AXI interconnect - INI x issuing functionality modification register
type AXI_INI6_FN_MOD_Register is record
-- Override ASIB read issuing capability
READ_ISS_OVERRIDE : Boolean := False;
-- Override ASIB write issuing capability
WRITE_ISS_OVERRIDE : Boolean := False;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#1#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for AXI_INI6_FN_MOD_Register use record
READ_ISS_OVERRIDE at 0 range 0 .. 0;
WRITE_ISS_OVERRIDE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- AXI interconnect registers
type AXI_Peripheral is record
-- AXI interconnect - peripheral ID4 register
AXI_PERIPH_ID_4 : aliased AXI_PERIPH_ID_4_Register;
-- AXI interconnect - peripheral ID0 register
AXI_PERIPH_ID_0 : aliased AXI_PERIPH_ID_0_Register;
-- AXI interconnect - peripheral ID1 register
AXI_PERIPH_ID_1 : aliased AXI_PERIPH_ID_1_Register;
-- AXI interconnect - peripheral ID2 register
AXI_PERIPH_ID_2 : aliased AXI_PERIPH_ID_2_Register;
-- AXI interconnect - peripheral ID3 register
AXI_PERIPH_ID_3 : aliased AXI_PERIPH_ID_3_Register;
-- AXI interconnect - component ID0 register
AXI_COMP_ID_0 : aliased AXI_COMP_ID_0_Register;
-- AXI interconnect - component ID1 register
AXI_COMP_ID_1 : aliased AXI_COMP_ID_1_Register;
-- AXI interconnect - component ID2 register
AXI_COMP_ID_2 : aliased AXI_COMP_ID_2_Register;
-- AXI interconnect - component ID3 register
AXI_COMP_ID_3 : aliased AXI_COMP_ID_3_Register;
-- AXI interconnect - TARG x bus matrix issuing functionality register
AXI_TARG1_FN_MOD_ISS_BM : aliased AXI_TARG1_FN_MOD_ISS_BM_Register;
-- AXI interconnect - TARG x bus matrix functionality 2 register
AXI_TARG1_FN_MOD2 : aliased AXI_TARG1_FN_MOD2_Register;
-- AXI interconnect - TARG x long burst functionality modification
AXI_TARG1_FN_MOD_LB : aliased AXI_TARG1_FN_MOD_LB_Register;
-- AXI interconnect - TARG x long burst functionality modification
AXI_TARG1_FN_MOD : aliased AXI_TARG1_FN_MOD_Register;
-- AXI interconnect - TARG x bus matrix issuing functionality register
AXI_TARG2_FN_MOD_ISS_BM : aliased AXI_TARG2_FN_MOD_ISS_BM_Register;
-- AXI interconnect - TARG x bus matrix functionality 2 register
AXI_TARG2_FN_MOD2 : aliased AXI_TARG2_FN_MOD2_Register;
-- AXI interconnect - TARG x long burst functionality modification
AXI_TARG2_FN_MOD_LB : aliased AXI_TARG2_FN_MOD_LB_Register;
-- AXI interconnect - TARG x long burst functionality modification
AXI_TARG2_FN_MOD : aliased AXI_TARG2_FN_MOD_Register;
-- AXI interconnect - TARG x bus matrix issuing functionality register
AXI_TARG3_FN_MOD_ISS_BM : aliased AXI_TARG3_FN_MOD_ISS_BM_Register;
-- AXI interconnect - TARG x bus matrix issuing functionality register
AXI_TARG4_FN_MOD_ISS_BM : aliased AXI_TARG4_FN_MOD_ISS_BM_Register;
-- AXI interconnect - TARG x bus matrix issuing functionality register
AXI_TARG5_FN_MOD_ISS_BM : aliased AXI_TARG5_FN_MOD_ISS_BM_Register;
-- AXI interconnect - TARG x bus matrix issuing functionality register
AXI_TARG6_FN_MOD_ISS_BM : aliased AXI_TARG6_FN_MOD_ISS_BM_Register;
-- AXI interconnect - TARG x bus matrix issuing functionality register
AXI_TARG7_FN_MOD_ISS_BM : aliased AXI_TARG7_FN_MOD_ISS_BM_Register;
-- AXI interconnect - TARG x bus matrix functionality 2 register
AXI_TARG7_FN_MOD2 : aliased AXI_TARG7_FN_MOD2_Register;
-- AXI interconnect - TARG x long burst functionality modification
AXI_TARG7_FN_MOD : aliased AXI_TARG7_FN_MOD_Register;
-- AXI interconnect - INI x functionality modification 2 register
AXI_INI1_FN_MOD2 : aliased AXI_INI1_FN_MOD2_Register;
-- AXI interconnect - INI x AHB functionality modification register
AXI_INI1_FN_MOD_AHB : aliased AXI_INI1_FN_MOD_AHB_Register;
-- AXI interconnect - INI x read QoS register
AXI_INI1_READ_QOS : aliased AXI_INI1_READ_QOS_Register;
-- AXI interconnect - INI x write QoS register
AXI_INI1_WRITE_QOS : aliased AXI_INI1_WRITE_QOS_Register;
-- AXI interconnect - INI x issuing functionality modification register
AXI_INI1_FN_MOD : aliased AXI_INI1_FN_MOD_Register;
-- AXI interconnect - INI x read QoS register
AXI_INI2_READ_QOS : aliased AXI_INI2_READ_QOS_Register;
-- AXI interconnect - INI x write QoS register
AXI_INI2_WRITE_QOS : aliased AXI_INI2_WRITE_QOS_Register;
-- AXI interconnect - INI x issuing functionality modification register
AXI_INI2_FN_MOD : aliased AXI_INI2_FN_MOD_Register;
-- AXI interconnect - INI x functionality modification 2 register
AXI_INI3_FN_MOD2 : aliased AXI_INI3_FN_MOD2_Register;
-- AXI interconnect - INI x AHB functionality modification register
AXI_INI3_FN_MOD_AHB : aliased AXI_INI3_FN_MOD_AHB_Register;
-- AXI interconnect - INI x read QoS register
AXI_INI3_READ_QOS : aliased AXI_INI3_READ_QOS_Register;
-- AXI interconnect - INI x write QoS register
AXI_INI3_WRITE_QOS : aliased AXI_INI3_WRITE_QOS_Register;
-- AXI interconnect - INI x issuing functionality modification register
AXI_INI3_FN_MOD : aliased AXI_INI3_FN_MOD_Register;
-- AXI interconnect - INI x read QoS register
AXI_INI4_READ_QOS : aliased AXI_INI4_READ_QOS_Register;
-- AXI interconnect - INI x write QoS register
AXI_INI4_WRITE_QOS : aliased AXI_INI4_WRITE_QOS_Register;
-- AXI interconnect - INI x issuing functionality modification register
AXI_INI4_FN_MOD : aliased AXI_INI4_FN_MOD_Register;
-- AXI interconnect - INI x read QoS register
AXI_INI5_READ_QOS : aliased AXI_INI5_READ_QOS_Register;
-- AXI interconnect - INI x write QoS register
AXI_INI5_WRITE_QOS : aliased AXI_INI5_WRITE_QOS_Register;
-- AXI interconnect - INI x issuing functionality modification register
AXI_INI5_FN_MOD : aliased AXI_INI5_FN_MOD_Register;
-- AXI interconnect - INI x read QoS register
AXI_INI6_READ_QOS : aliased AXI_INI6_READ_QOS_Register;
-- AXI interconnect - INI x write QoS register
AXI_INI6_WRITE_QOS : aliased AXI_INI6_WRITE_QOS_Register;
-- AXI interconnect - INI x issuing functionality modification register
AXI_INI6_FN_MOD : aliased AXI_INI6_FN_MOD_Register;
end record
with Volatile;
for AXI_Peripheral use record
AXI_PERIPH_ID_4 at 16#1FD0# range 0 .. 31;
AXI_PERIPH_ID_0 at 16#1FE0# range 0 .. 31;
AXI_PERIPH_ID_1 at 16#1FE4# range 0 .. 31;
AXI_PERIPH_ID_2 at 16#1FE8# range 0 .. 31;
AXI_PERIPH_ID_3 at 16#1FEC# range 0 .. 31;
AXI_COMP_ID_0 at 16#1FF0# range 0 .. 31;
AXI_COMP_ID_1 at 16#1FF4# range 0 .. 31;
AXI_COMP_ID_2 at 16#1FF8# range 0 .. 31;
AXI_COMP_ID_3 at 16#1FFC# range 0 .. 31;
AXI_TARG1_FN_MOD_ISS_BM at 16#2008# range 0 .. 31;
AXI_TARG1_FN_MOD2 at 16#2024# range 0 .. 31;
AXI_TARG1_FN_MOD_LB at 16#202C# range 0 .. 31;
AXI_TARG1_FN_MOD at 16#2108# range 0 .. 31;
AXI_TARG2_FN_MOD_ISS_BM at 16#3008# range 0 .. 31;
AXI_TARG2_FN_MOD2 at 16#3024# range 0 .. 31;
AXI_TARG2_FN_MOD_LB at 16#302C# range 0 .. 31;
AXI_TARG2_FN_MOD at 16#3108# range 0 .. 31;
AXI_TARG3_FN_MOD_ISS_BM at 16#4008# range 0 .. 31;
AXI_TARG4_FN_MOD_ISS_BM at 16#5008# range 0 .. 31;
AXI_TARG5_FN_MOD_ISS_BM at 16#6008# range 0 .. 31;
AXI_TARG6_FN_MOD_ISS_BM at 16#7008# range 0 .. 31;
AXI_TARG7_FN_MOD_ISS_BM at 16#800C# range 0 .. 31;
AXI_TARG7_FN_MOD2 at 16#8024# range 0 .. 31;
AXI_TARG7_FN_MOD at 16#8108# range 0 .. 31;
AXI_INI1_FN_MOD2 at 16#42024# range 0 .. 31;
AXI_INI1_FN_MOD_AHB at 16#42028# range 0 .. 31;
AXI_INI1_READ_QOS at 16#42100# range 0 .. 31;
AXI_INI1_WRITE_QOS at 16#42104# range 0 .. 31;
AXI_INI1_FN_MOD at 16#42108# range 0 .. 31;
AXI_INI2_READ_QOS at 16#43100# range 0 .. 31;
AXI_INI2_WRITE_QOS at 16#43104# range 0 .. 31;
AXI_INI2_FN_MOD at 16#43108# range 0 .. 31;
AXI_INI3_FN_MOD2 at 16#44024# range 0 .. 31;
AXI_INI3_FN_MOD_AHB at 16#44028# range 0 .. 31;
AXI_INI3_READ_QOS at 16#44100# range 0 .. 31;
AXI_INI3_WRITE_QOS at 16#44104# range 0 .. 31;
AXI_INI3_FN_MOD at 16#44108# range 0 .. 31;
AXI_INI4_READ_QOS at 16#45100# range 0 .. 31;
AXI_INI4_WRITE_QOS at 16#45104# range 0 .. 31;
AXI_INI4_FN_MOD at 16#45108# range 0 .. 31;
AXI_INI5_READ_QOS at 16#46100# range 0 .. 31;
AXI_INI5_WRITE_QOS at 16#46104# range 0 .. 31;
AXI_INI5_FN_MOD at 16#46108# range 0 .. 31;
AXI_INI6_READ_QOS at 16#47100# range 0 .. 31;
AXI_INI6_WRITE_QOS at 16#47104# range 0 .. 31;
AXI_INI6_FN_MOD at 16#47108# range 0 .. 31;
end record;
-- AXI interconnect registers
AXI_Periph : aliased AXI_Peripheral
with Import, Address => AXI_Base;
end STM32_SVD.AXI;
|
src/sets/nat.agda
|
pcapriotti/agda-base
| 20 |
2081
|
{-# OPTIONS --without-K #-}
module sets.nat where
open import sets.nat.core public
open import sets.nat.properties public
open import sets.nat.ordering public
open import sets.nat.solver public
open import sets.nat.struct public
|
src/kernel/arch/x86_64/interrupt.asm
|
shadow-paw/bluemoon
| 3 |
87408
|
<gh_stars>1-10
cpu x86-64
bits 64
%include "kernel.inc"
global idt_init, idt_set
extern INT_00, INT_01, INT_02, INT_03, INT_04, INT_05, INT_06, INT_07
extern INT_08, INT_0A, INT_0B, INT_0C, INT_0D, INT_0E, INT_0F
extern INT_10, INT_11, INT_12, INT_13
section .bss
; ----------------------------------------------
align 4096
idt resq 256 ; 256 interrupts
section .data
; ----------------------------------------------
align 16
idtr dw 256*16-1
dq idt
dw 0
section .text
; ----------------------------------------------
idt_init:
call idt_set, 0x00, qword _INT_00, 1000111000000000b ; P DPL=0 TYPE=1110 IST=0
call idt_set, 0x01, qword _INT_01, 1000111000000000b ; P DPL=0 TYPE=1110 IST=0
call idt_set, 0x02, qword _INT_02, 1000111000000000b ; P DPL=0 TYPE=1110 IST=0
call idt_set, 0x03, qword _INT_03, 1000111000000000b ; P DPL=0 TYPE=1110 IST=0
call idt_set, 0x04, qword _INT_04, 1000111000000000b ; P DPL=0 TYPE=1110 IST=0
call idt_set, 0x05, qword _INT_05, 1000111000000000b ; P DPL=0 TYPE=1110 IST=0
call idt_set, 0x06, qword _INT_06, 1000111000000000b ; P DPL=0 TYPE=1110 IST=0
call idt_set, 0x07, qword _INT_07, 1000111000000001b ; P DPL=0 TYPE=1110 IST=1
call idt_set, 0x08, qword _INT_08, 1000111000000001b ; P DPL=0 TYPE=1110 IST=1
call idt_set, 0x0A, qword _INT_0A, 1000111000000001b ; P DPL=0 TYPE=1110 IST=1
call idt_set, 0x0B, qword _INT_0B, 1000111000000001b ; P DPL=0 TYPE=1110 IST=1
call idt_set, 0x0C, qword _INT_0C, 1000111000000001b ; P DPL=0 TYPE=1110 IST=1
call idt_set, 0x0D, qword _INT_0D, 1000111000000001b ; P DPL=0 TYPE=1110 IST=1
call idt_set, 0x0E, qword _INT_0E, 1000111000000000b ; P DPL=0 TYPE=1110 IST=0
call idt_set, 0x10, qword _INT_10, 1000111000000000b ; P DPL=0 TYPE=1110 IST=0
call idt_set, 0x11, qword _INT_11, 1000111000000000b ; P DPL=0 TYPE=1110 IST=0
call idt_set, 0x12, qword _INT_12, 1000111000000010b ; P DPL=0 TYPE=1110 IST=2
call idt_set, 0x13, qword _INT_13, 1000111000000000b ; P DPL=0 TYPE=1110 IST=0
mov rdi, qword idtr
lidt [rdi]
ret
; ----------------------------------------------
; idt_set(num, function, access (P:1 DPL:2 0:1 TYPE:4 0:5 IST:3)
idt_set:
mov r11, qword idt
mov eax, esi
and eax, 0xFFFF
or eax, SEG_CODE64_0 << 16
shr rsi, 16
shl rsi, 16
or rsi, rdx
shl rdi, 4
mov dword [r11 + rdi], eax
mov qword [r11 + rdi +4], rsi
mov dword [r11 + rdi +12], 0
ret
; INT00
; ----------------------------------------------
align 16
_INT_00:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
call INT_00
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
iretq
; INT01
; ----------------------------------------------
align 16
_INT_01:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
call INT_01
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
iretq
; INT02
; ----------------------------------------------
align 16
_INT_02:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
call INT_02
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
iretq
; INT03
; ----------------------------------------------
align 16
_INT_03:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
call INT_03
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
iretq
; INT04
; ----------------------------------------------
align 16
_INT_04:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
call INT_04
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
iretq
; INT05
; ----------------------------------------------
align 16
_INT_05:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
call INT_05
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
iretq
; INT06
; ----------------------------------------------
align 16
_INT_06:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
call INT_06
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
iretq
; INT07
; ----------------------------------------------
align 16
_INT_07:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
call INT_07
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
iretq
; INT08
; ----------------------------------------------
align 16
_INT_08:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
call INT_08
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
iretq
; INT0A
; ----------------------------------------------
align 16
_INT_0A:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
mov rdi, [rsp+9*8]
call INT_0A
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
add rsp, 8
iretq
; INT0B
; ----------------------------------------------
align 16
_INT_0B:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
mov rdi, [rsp+9*8]
call INT_0B
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
add rsp, 8
iretq
; INT0C
; ----------------------------------------------
align 16
_INT_0C:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
mov rdi, [rsp+9*8]
call INT_0C
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
add rsp, 8
iretq
; INT0D
; ----------------------------------------------
align 16
_INT_0D:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
mov rdi, [rsp+9*8]
mov rsi, [rsp+10*8]
call INT_0D
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
add rsp, 8
iretq
; INT0E
; ----------------------------------------------
align 16
_INT_0E:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
mov rdi, [rsp+9*8]
mov rsi, cr2
mov rdx, [rsp+9*8+8]
call INT_0E
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
add rsp, 8
iretq
; INT10
; ----------------------------------------------
align 16
_INT_10:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
call INT_10
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
iretq
; INT11
; ----------------------------------------------
align 16
_INT_11:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
mov rdi, [rsp+9*8]
call INT_11
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
add rsp, 8
iretq
; INT12
; ----------------------------------------------
align 16
_INT_12:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
call INT_12
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
iretq
; INT13
; ----------------------------------------------
align 16
_INT_13:
push rax
push rcx
push rdx
push rsi
push rdi
push r8
push r9
push r10
push r11
call INT_13
pop r11
pop r10
pop r9
pop r8
pop rdi
pop rsi
pop rdx
pop rcx
pop rax
iretq
; ----------------------------------------------
|
src/annotation_processor/implementation/yaml-transformator-annotation-inject.adb
|
robdaemon/AdaYaml
| 32 |
13016
|
<filename>src/annotation_processor/implementation/yaml-transformator-annotation-inject.adb<gh_stars>10-100
-- part of AdaYaml, (c) 2017 <NAME>
-- released under the terms of the MIT license, see the file "copying.txt"
package body Yaml.Transformator.Annotation.Inject is
procedure Put (Object : in out Instance; E : Event) is
begin
Object.State.all (Object, E);
end Put;
function Has_Next (Object : Instance) return Boolean is
(Object.Current_Exists);
overriding function Next (Object : in out Instance) return Event is
begin
return Ret : constant Event := Object.Current do
if Object.State = Injecting_Aliased'Access then
Object.Injecting (Object.Current_Aliased.Value.Next);
else
Object.Current_Exists := False;
end if;
end return;
end Next;
function New_Inject (Pool : Text.Pool.Reference;
Node_Context : Node_Context_Type;
Processor_Context : Events.Context.Reference;
Swallows_Previous : out Boolean)
return not null Pointer is
pragma Unreferenced (Pool);
begin
case Node_Context is
when Document_Root =>
raise Annotation_Error with "@@inject: cannot inject at root node";
when Mapping_Key =>
raise Annotation_Error with
"@@inject: cannot inject at mapping key; use empty key and inject at value instead";
when Mapping_Value =>
Swallows_Previous := True;
return new Instance'(Ada.Finalization.Limited_Controlled with
Context => Processor_Context, Depth => <>,
Injecting_Mapping => True,
Current_Exists => False,
State => Initial'Access,
Current_Aliased => <>, Current => <>);
when Sequence_Item | Parameter_Item =>
Swallows_Previous := False;
return new Instance'(Ada.Finalization.Limited_Controlled with
Context => Processor_Context, Depth => <>,
Injecting_Mapping => False,
Current_Exists => False,
State => Initial'Access,
Current_Aliased => <>, Current => <>);
end case;
end New_Inject;
procedure Initial (Object : in out Instance; E : Event) is
begin
if E.Kind /= Annotation_Start then
raise Stream_Error with
"unexpected token (expected annotation start): " & E.Kind'Img;
end if;
Object.State := After_Annotation_Start'Access;
end Initial;
procedure After_Annotation_Start (Object : in out Instance; E : Event) is
begin
if E.Kind /= Annotation_End then
raise Annotation_Error with
"@@inject does not take any parameters";
end if;
Object.State := After_Annotation_End'Access;
end After_Annotation_Start;
procedure After_Annotation_End (Object : in out Instance; E : Event) is
begin
Object.Depth := 1;
case E.Kind is
when Sequence_Start =>
if Object.Injecting_Mapping then
raise Annotation_Error with
"trying to inject a sequence into a mapping";
end if;
when Mapping_Start =>
if not Object.Injecting_Mapping then
raise Annotation_Error with
"trying to inject a mapping into a sequence";
end if;
when Alias =>
declare
use type Events.Context.Cursor;
use type Text.Reference;
Position : constant Events.Context.Cursor :=
Events.Context.Position (Object.Context, E.Target);
begin
if Position = Events.Context.No_Element then
raise Annotation_Error with "Unresolvable alias: *" &
E.Target;
end if;
declare
Stream : constant Events.Store.Stream_Reference :=
Events.Context.Retrieve (Position);
Referred : constant Event := Stream.Value.Next;
begin
case Referred.Kind is
when Sequence_Start =>
if Object.Injecting_Mapping then
raise Annotation_Error with
"trying to inject a sequence into a mapping";
end if;
when Mapping_Start =>
if not Object.Injecting_Mapping then
raise Annotation_Error with
"trying to inject a mapping into a sequence";
end if;
when others =>
raise Annotation_Error with
"@@inject does not support this node type";
end case;
Object.Current_Aliased := Stream.Optional;
Object.State := Injecting_Aliased'Access;
Object.Injecting (Stream.Value.Next);
return;
end;
end;
when others =>
raise Annotation_Error with
"@@inject does not support this node type";
end case;
Object.State := Injecting'Access;
end After_Annotation_End;
procedure Injecting (Object : in out Instance; E : Event) is
begin
Object.Current := E;
case E.Kind is
when Sequence_Start | Mapping_Start | Annotation_Start =>
Object.Depth := Object.Depth + 1;
return;
when Annotation_End =>
Object.Depth := Object.Depth - 1;
return;
when Sequence_End | Mapping_End =>
Object.Depth := Object.Depth - 1;
when others => null;
end case;
if Object.Depth = 0 then
Object.State := After_Inject_End'Access;
Object.Current_Exists := False;
else
Object.Current_Exists := True;
end if;
end Injecting;
procedure Injecting_Aliased (Object : in out Instance; E : Event) is
pragma Unreferenced (Object);
begin
raise Annotation_Error with
"unexpected input to @@inject while injecting aliased node: " &
E.Kind'Img;
end Injecting_Aliased;
procedure After_Inject_End (Object : in out Instance; E : Event) is
pragma Unreferenced (Object);
begin
raise Annotation_Error with
"unexpected input to @@inject (already finished): " & E.Kind'Img;
end After_Inject_End;
begin
Annotation.Map.Include ("inject", New_Inject'Access);
end Yaml.Transformator.Annotation.Inject;
|
src/c_resources/smart_c_resources.adb
|
jhumphry/auto_counters
| 5 |
21749
|
-- smart_c_resources.adb
-- A reference counting package to wrap a C type that requires initialization
-- and finalization.
-- Copyright (c) 2016, <NAME>
--
-- Permission to use, copy, modify, and/or distribute this software for any
-- purpose with or without fee is hereby granted, provided that the above
-- copyright notice and this permission notice appear in all copies.
--
-- THE SOFTWARE IS PROVIDED "AS IS" AND THE AUTHOR DISCLAIMS ALL WARRANTIES WITH
-- REGARD TO THIS SOFTWARE INCLUDING ALL IMPLIED WARRANTIES OF MERCHANTABILITY
-- AND FITNESS. IN NO EVENT SHALL THE AUTHOR BE LIABLE FOR ANY SPECIAL, DIRECT,
-- INDIRECT, OR CONSEQUENTIAL DAMAGES OR ANY DAMAGES WHATSOEVER RESULTING FROM
-- LOSS OF USE, DATA OR PROFITS, WHETHER IN AN ACTION OF CONTRACT, NEGLIGENCE
-- OR OTHER TORTIOUS ACTION, ARISING OUT OF OR IN CONNECTION WITH THE USE OR
-- PERFORMANCE OF THIS SOFTWARE.
package body Smart_C_Resources is
-------------
-- Smart_T --
-------------
function Make_Smart_T (X : in T) return Smart_T is
(Ada.Finalization.Controlled
with Element => X,
Counter => Make_New_Counter);
function Element (S : Smart_T) return T is
(S.Element);
function Use_Count (S : in Smart_T) return Natural is
(Use_Count(S.Counter.all));
overriding procedure Initialize (Object : in out Smart_T) is
begin
Object.Element := Initialize;
Object.Counter := Make_New_Counter;
end Initialize;
overriding procedure Adjust (Object : in out Smart_T) is
begin
pragma Assert (Check => Object.Counter /= null,
Message => "Corruption during Smart_T assignment.");
Check_Increment_Use_Count(Object.Counter.all);
end Adjust;
overriding procedure Finalize (Object : in out Smart_T) is
begin
if Object.Counter /= null then
-- Finalize is required to be idempotent to cope with rare
-- situations when it may be called multiple times. By setting
-- Object.Counter to null, I ensure that there can be no
-- double-decrementing of counters or double-deallocations.
Decrement_Use_Count(Object.Counter.all);
if Use_Count(Object.Counter.all) = 0 then
Finalize(Object.Element);
Deallocate_If_Unused(Object.Counter);
end if;
Object.Counter := null;
end if;
end Finalize;
end Smart_C_Resources;
|
libsrc/oz/ozgfx/ozsavescreen.asm
|
andydansby/z88dk-mk2
| 1 |
24121
|
<reponame>andydansby/z88dk-mk2<gh_stars>1-10
;
; Sharp OZ family functions
;
; ported from the OZ-7xx SDK by by <NAME>
; by <NAME> - Oct. 2003
;
;
;
;
; ------
; $Id: ozsavescreen.asm,v 1.1 2003/10/21 17:15:20 stefano Exp $
;
XLIB ozsavescreen
;LIB ozrestorescreen
XDEF ozsccopy
XREF ozactivepage
LIB ozcopy
ozsavescreen:
ld de,0
push de
ld hl,968h
push hl
ld hl,(ozactivepage)
ld d,4 ;; e=0 still
ozsccopy:
ld bc,2400
call ozcopy
pop hl
pop hl
ret
|
include/spacelib2/lib/bank.asm
|
backwardspy/spacelib2
| 0 |
101574
|
<filename>include/spacelib2/lib/bank.asm
.filenamespace sl
.namespace bank {
/*
* swaps out kernal & basic ROMs by zeroing port register HIRAM bit
*/
.macro @sl_bank_disable_kernal() {
ensure_data_direction()
// disable irq handling since kernal may disappear halfway through
sei
// disable CIA-1 and CIA-2 timer interrupts
lda #%01111111
sta irq_control_status
sta nmi_control_status
// ack CIA-1 and CIA-2 interrupts
lda irq_control_status
lda nmi_control_status
// zero HIRAM bit
lda cpu_port_register
and #%11111101
sta cpu_port_register
// re-enable irq handling
cli
// disable nmi handling to ignore run/stop + restore
sl_interrupts_disable_nmi()
}
.macro ensure_data_direction() {
lda cpu_data_direction
ora #%00000111
sta cpu_data_direction
}
}
|
programs/oeis/033/A033438.asm
|
karttu/loda
| 1 |
82428
|
<reponame>karttu/loda<filename>programs/oeis/033/A033438.asm
; A033438: Number of edges in 6-partite Turán graph of order n.
; 0,0,1,3,6,10,15,20,26,33,41,50,60,70,81,93,106,120,135,150,166,183,201,220,240,260,281,303,326,350,375,400,426,453,481,510,540,570,601,633,666,700,735,770,806,843,881
pow $0,2
mul $0,5
mov $1,$0
div $1,12
|
boot.asm
|
LambdaSix/Kerni
| 0 |
13460
|
[BITS 32]
[global start]
[extern _k_main]
%include 'grub.inc'
start:
call _k_main ; Invoke the c method
cli ; Kill interrupts
hlt ; Halt the cpu
EXTERN code, bss, end
;; Setup for GRUB to load us
ALIGN 4
mboot:
dd MULTIBOOT_HEADER_MAGIC
dd MULTIBOOT_HEADER_FLAGS
dd MULTIBOOT_CHECKSUM
; aout kludge. These must be PHYSICAL addresses
dd mboot
dd code
dd bss
dd end
dd start
|
reuse/ada/errors.ads
|
cocolab8/cocktail
| 0 |
24476
|
-- $Id: Errors.md,v 1.1 1994/08/15 22:13:23 grosch rel $
-- $Log: Errors.md,v $
-- Ich, <NAME>, Informatiker, Aug. 1994
with System, Text_Io, Position;
use System, Text_Io, Position;
package Errors is
NoText : constant Integer := 0 ;
SyntaxError : constant Integer := 1 ; -- error codes
ExpectedTokens : constant Integer := 2 ;
RestartPoint : constant Integer := 3 ;
TokenInserted : constant Integer := 4 ;
WrongParseTable : constant Integer := 5 ;
OpenParseTable : constant Integer := 6 ;
ReadParseTable : constant Integer := 7 ;
TooManyErrors : constant Integer := 8 ;
TokenFound : constant Integer := 9 ;
FoundExpected : constant Integer := 10;
NoClass : constant Integer := 0 ;
Fatal : constant Integer := 1 ; -- error classes
Restriction : constant Integer := 2 ;
Error : constant Integer := 3 ;
Warning : constant Integer := 4 ;
Repair : constant Integer := 5 ;
Note : constant Integer := 6 ;
Information : constant Integer := 7 ;
cNone : constant Integer := 0 ;
cInteger : constant Integer := 1 ; -- info classes
cShort : constant Integer := 2 ;
cLong : constant Integer := 3 ;
cFloat : constant Integer := 4 ;
cBoolean : constant Integer := 5 ;
cCharacter : constant Integer := 6 ;
cString : constant Integer := 7 ;
cSet : constant Integer := 9 ;
cIdent : constant Integer := 10;
cPosition : constant Integer := 11;
BRIEF : Boolean := True;
FIRST : Boolean := True;
TRUNCATE : Boolean := True;
procedure StoreMessages (Store: Boolean);
-- Messages are stored if 'Store' = True
-- for printing with the routine 'WriteMessages'
-- otherwise they are printed immediately.
-- If 'Store'=True the message store is cleared.
procedure ErrorMessage (ErrorCode, ErrorClass: Integer; Position: tPosition);
-- Report a message represented by an integer
-- 'ErrorCode' and classified by 'ErrorClass'.
procedure ErrorMessageI (ErrorCode, ErrorClass: Integer; Position: tPosition;
InfoClass: Integer; Info: Address);
-- Like the previous routine with additional
-- information of type 'InfoClass' at the
-- address 'Info'.
procedure Message (ErrorText: String; ErrorClass: Integer; Position: tPosition);
-- Report a message represented by a string
-- 'ErrorText' and classified by 'ErrorClass'.
procedure MessageI (ErrorText: String; ErrorClass: Integer; Position: tPosition;
InfoClass: Integer; Info: Address);
-- Like the previous routine with additional
-- information of type 'InfoClass' at the
-- address 'Info'.
procedure WriteMessages (File: File_Type);
-- The stored messages are sorted by their
-- source position and printed on 'File'.
end Errors;
|
data/pokemon/dex_entries/tauros.asm
|
AtmaBuster/pokeplat-gen2
| 6 |
7328
|
<reponame>AtmaBuster/pokeplat-gen2
db "<NAME>@" ; species name
db "These violent"
next "#MON fight"
next "with other mem-"
page "bers of their herd"
next "in order to prove"
next "their strength.@"
|
oeis/143/A143333.asm
|
neoneye/loda-programs
| 11 |
241910
|
<gh_stars>10-100
; A143333: Pascal's triangle binomial(n,m) read by rows, all even elements replaced by zero.
; Submitted by <NAME>
; 1,1,1,1,0,1,1,3,3,1,1,0,0,0,1,1,5,0,0,5,1,1,0,15,0,15,0,1,1,7,21,35,35,21,7,1,1,0,0,0,0,0,0,0,1,1,9,0,0,0,0,0,0,9,1,1,0,45,0,0,0,0,0,45,0,1,1,11,55,165,0,0,0,0,165,55,11,1,1,0,0,0,495,0,0,0,495,0,0,0,1,1,13,0,0,715,1287,0,0,1287
lpb $0
add $1,1
sub $0,$1
lpe
bin $1,$0
mov $0,$1
mod $0,2
mul $1,$0
mov $0,$1
|
PMOO/ADA/LAB2/PARTE_2/listas_enteros.ads
|
usainzg/EHU
| 0 |
26526
|
<reponame>usainzg/EHU
with Listas;
package Listas_Enteros is new Listas(Elemento => Integer);
|
examples/simple-lib/Lib/IO.agda
|
redfish64/autonomic-agda
| 1 |
14688
|
module Lib.IO where
open import Lib.List
open import Lib.Prelude
{-# IMPORT System.Environment #-}
FilePath = String
postulate
IO : Set -> Set
getLine : IO String
putStrLn : String -> IO Unit
putStr : String -> IO Unit
bindIO : {A B : Set} -> IO A -> (A -> IO B) -> IO B
returnIO : {A : Set} -> A -> IO A
getArgs : IO (List String)
readFile : FilePath -> IO String
writeFile : FilePath -> String -> IO Unit
{-# BUILTIN IO IO #-}
{-# COMPILED_TYPE IO IO #-}
{-# COMPILED putStr putStr #-}
{-# COMPILED putStrLn putStrLn #-}
{-# COMPILED bindIO (\_ _ -> (>>=) :: IO a -> (a -> IO b) -> IO b) #-}
{-# COMPILED returnIO (\_ -> return :: a -> IO a) #-}
-- we need to throw away the type argument to return and bind
-- and resolve the overloading explicitly (since Alonzo
-- output is sprinkled with unsafeCoerce#).
{-# COMPILED getLine getLine #-}
{-# COMPILED getArgs System.Environment.getArgs #-}
{-# COMPILED readFile readFile #-}
{-# COMPILED writeFile writeFile #-}
mapM : {A B : Set} -> (A -> IO B) -> List A -> IO (List B)
mapM f [] = returnIO []
mapM f (x :: xs) = bindIO (f x) \y -> bindIO (mapM f xs) \ys -> returnIO (y :: ys)
mapM₋ : {A : Set} -> (A -> IO Unit) -> List A -> IO Unit
mapM₋ f xs = bindIO (mapM f xs) \_ -> returnIO unit
|
src/fot/PA/Inductive2Mendelson.agda
|
asr/fotc
| 11 |
7683
|
------------------------------------------------------------------------------
-- From inductive PA to Mendelson's axioms
------------------------------------------------------------------------------
{-# OPTIONS --exact-split #-}
{-# OPTIONS --no-sized-types #-}
{-# OPTIONS --no-universe-polymorphism #-}
{-# OPTIONS --without-K #-}
-- From the definition of PA using Agda data types and primitive
-- recursive functions for addition and multiplication, we can prove the
-- Mendelson's axioms [1].
-- N.B. We make the recursion in the first argument for _+_ and _*_.
-- S₁. m = n → m = o → n = o
-- S₂. m = n → succ m = succ n
-- S₃. 0 ≠ succ n
-- S₄. succ m = succ n → m = n
-- S₅. 0 + n = n
-- S₆. succ m + n = succ (m + n)
-- S₇. 0 * n = 0
-- S₈. succ m * n = (m * n) + m
-- S₉. P(0) → (∀n.P(n) → P(succ n)) → ∀n.P(n), for any wf P(n) of PA.
-- [1]. <NAME>. Introduction to mathematical
-- logic. Chapman& Hall, 4th edition, 1997, p. 155.
module PA.Inductive2Mendelson where
open import PA.Inductive.Base
------------------------------------------------------------------------------
S₁ : ∀ {m n o} → m ≡ n → m ≡ o → n ≡ o
S₁ refl refl = refl
S₂ : ∀ {m n} → m ≡ n → succ m ≡ succ n
S₂ refl = refl
S₃ : ∀ {n} → zero ≢ succ n
S₃ ()
S₄ : ∀ {m n} → succ m ≡ succ n → m ≡ n
S₄ refl = refl
S₅ : ∀ n → zero + n ≡ n
S₅ n = refl
S₆ : ∀ m n → succ m + n ≡ succ (m + n)
S₆ m n = refl
S₇ : ∀ n → zero * n ≡ zero
S₇ n = refl
S₈ : ∀ m n → succ m * n ≡ n + m * n
S₈ m n = refl
S₉ : (A : ℕ → Set) → A zero → (∀ n → A n → A (succ n)) → ∀ n → A n
S₉ = ℕ-ind
|
gcc-gcc-7_3_0-release/gcc/testsuite/gnat.dg/array16.ads
|
best08618/asylo
| 7 |
23673
|
with Array16_Pkg;
package Array16 is
type T1 (D : Integer) is record
case D is
when 1 => I : Integer;
when others => null;
end case;
end record;
type Arr is array (Integer range <>) of Integer;
type My_T1 is new T1 (Array16_Pkg.N);
type My_T2 is new Arr (1 .. Integer'Min (2, Array16_Pkg.N));
function F1 (A : access My_T1) return My_T1;
pragma Inline (F1);
function F2 (A : access My_T2) return My_T2;
pragma Inline (F2);
procedure Proc (A : access My_T1; B : access My_T2);
end Array16;
|
Driver/Printer/PrintCom/Job/jobPaperPathASFControl.asm
|
steakknife/pcgeos
| 504 |
168741
|
COMMENT @%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
Copyright (c) GeoWorks 1990 -- All Rights Reserved
PROJECT: PC GEOS
MODULE: Printer Drivers
FILE: jobPaperPathASFControl.asm
AUTHOR: <NAME>, 8 Sept 1991
ROUTINES:
Name Description
---- -----------
REVISION HISTORY:
Name Date Description
---- ---- -----------
Dave 3/92 Initial revision from epson24Setup.asm
Dave 5/92 Parsed from printcomEpsonSetup.asm
DESCRIPTION:
$Id: jobPaperPathASFControl.asm,v 1.1 97/04/18 11:51:00 newdeal Exp $
%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%@
COMMENT }%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
PrintSetPaperPath
%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
SYNOPSIS: Initialize the printer's paper path.
set margins in PState
CALLED BY: GLOBAL
PASS: bp - PSTATE segment address.
al - PaperInputOptions record
ah - PaperOutputOptions record
RETURN: carry set if some transmission error.
DESTROYED: nothing
PSEUDO CODE/STRATEGY:
This routine takes the record for the Paper input and output options
and loads the Pstate and sets the printer up accordingly. The LQs do
not have any output options, so that record is ignored, and the PState
is loaded with the only condition possible.
KNOWN BUGS/SIDE EFFECTS/IDEAS:
nothing
REVISION HISTORY:
Name Date Description
---- ---- -----------
Dave 2/92 Initial version
%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%}
PrintSetPaperPath proc far
uses ax,bx,cx,dx,si,di,es,ds
.enter
mov es,bp ;es --> PState
mov es:[PS_paperInput],al
mov es:[PS_paperOutput],PS_REVERSE shl offset POO_SORTED
test al,mask PIO_TRACTOR ;check for tractor feed paths first.
jnz handleTractor
test al,mask PIO_ASF ;check for ASF next.
jnz handleASF
handleTractor:
mov si,offset pr_codes_DisableASF
call SendCodeOut
jc exit
mov si, offset PI_marginTractor ;set tractor source for margins
jmp copyMarginInfo
handleASF:
mov si,offset pr_codes_EnableASF
call SendCodeOut
jc exit ;pass out errors.
mov si,offset pr_codes_ASFControl
call SendCodeOut
jc exit ;pass out errors.
mov si, offset PI_marginASF ;set ASF path.. source for margins
mov cl,1 ;initialize for bin 1
and al,mask PIO_ASF ;clean off non ASF bits.
cmp al,ASF_TRAY1 shl offset PIO_ASF ;see if the bin is #1...
je sendArgument ;OK, send argument for bin #1
inc cl ;all other options go to bin #2
sendArgument:
call PrintStreamWriteByte
jc exit
copyMarginInfo:
;source offset should already be loaded.
mov bx,es:[PS_deviceInfo]
call MemLock
mov ds,ax ;ds:si = source (Info resource).
mov di,offset PS_currentMargins ;set dest offset for margins
;es:di = dest (PState).
mov cx,(size PrinterMargins) shr 1 ;size of the structure to copy.
rep movsw
call MemUnlock
clc
exit:
.leave
ret
PrintSetPaperPath endp
|
libsrc/_DEVELOPMENT/l/sdcc/__divuschar.asm
|
jpoikela/z88dk
| 640 |
170392
|
<reponame>jpoikela/z88dk<gh_stars>100-1000
SECTION code_clib
SECTION code_l_sdcc
PUBLIC __divuschar
PUBLIC __divuschar_0
EXTERN l_divs_16_16x16
__divuschar:
; mixed 8-bit division
;
; enter : stack = divisor (unsigned byte), dividend (signed byte), ret
;
; exit : hl = quotient
; de = remainder
; note: the fast integer math library has a fast 8x8 divide but it
; is unknown at this time whether sdcc expects 16-bit results
ld hl,3
__divuschar_0:
ld d,h ; d = 0
add hl,sp
ld e,(hl) ; de = signed divisor (+ve)
dec hl
ld l,(hl) ; l = signed dividend
; must promote to 16-bits
ld a,l
add a,a
sbc a,a
ld h,a ; hl = signed dividend
jp l_divs_16_16x16
|
old/HLevel.agda
|
timjb/HoTT-Agda
| 294 |
4090
|
<filename>old/HLevel.agda
{-# OPTIONS --without-K #-}
open import Types
open import Paths
{- Stuff about truncation levels (aka h-levers) that do not require the notion
of equivalence or function extensionality -}
module HLevel {i} where
-- Definition of truncation levels
is-contr : Set i → Set i
is-contr A = Σ A (λ x → ((y : A) → y ≡ x))
is-truncated : ℕ₋₂ → (Set i → Set i)
is-truncated ⟨-2⟩ A = is-contr A
is-truncated (S n) A = (x y : A) → is-truncated n (x ≡ y)
is-prop = is-truncated ⟨-1⟩
is-set = is-truncated ⟨0⟩
is-gpd = is-truncated ⟨1⟩
-- The original notion of h-level can be defined in the following way.
-- We won’t use this definition though.
is-hlevel : ℕ → (Set i → Set i)
is-hlevel n A = is-truncated (n -2) A where
_-2 : ℕ → ℕ₋₂
O -2 = ⟨-2⟩
(S n) -2 = S (n -2)
-- The following property is equivalent to being a proposition
has-all-paths : Set i → Set i
has-all-paths A = (x y : A) → x ≡ y
-- Having decidable equality is stronger that being a set
has-dec-eq : Set i → Set i
has-dec-eq A = (x y : A) → (x ≡ y) ⊔ (x ≢ y)
abstract
all-paths-is-prop : {A : Set i} → (has-all-paths A → is-prop A)
all-paths-is-prop {A} c x y = (c x y , canon-path) where
lemma : {x y : A} (p : x ≡ y) → c x y ≡ p ∘ c y y
lemma refl = refl
canon-path : {x y : A} (p : x ≡ y) → p ≡ c x y
canon-path {.y} {y} refl = anti-whisker-right (c y y) (lemma (c y y))
-- Truncation levels are cumulative
truncated-is-truncated-S : {A : Set i} (n : ℕ₋₂)
→ (is-truncated n A → is-truncated (S n) A)
truncated-is-truncated-S ⟨-2⟩ q =
all-paths-is-prop (λ x y → π₂ q x ∘ ! (π₂ q y))
truncated-is-truncated-S (S n) q =
λ x y → truncated-is-truncated-S n (q x y)
-- A type with a decidable equality is a set
dec-eq-is-set : {A : Set i} → (has-dec-eq A → is-set A)
dec-eq-is-set dec x y with dec x y
dec-eq-is-set dec x y | inr p⊥ = λ p → abort-nondep (p⊥ p)
dec-eq-is-set {A} dec x y | inl q = paths-A-is-prop q where
-- The fact that equality is decidable on A gives a canonical path parallel
-- to every path [p], depending only on the endpoints
get-path : {u v : A} (r : u ≡ v) → u ≡ v
get-path {u} {v} r with dec u v
get-path r | inl q = q
get-path r | inr r⊥ = abort-nondep (r⊥ r)
get-path-eq : {u : A} (r : u ≡ u) → get-path r ≡ get-path refl
get-path-eq {u} r with dec u u
get-path-eq r | inl q = refl
get-path-eq r | inr r⊥ = abort-nondep (r⊥ refl)
lemma : {u v : A} (r : u ≡ v) → r ∘ get-path refl ≡ get-path r
lemma refl = refl
paths-A-is-prop : {u v : A} (q : u ≡ v) → is-prop (u ≡ v)
paths-A-is-prop {u} {.u} refl =
truncated-is-truncated-S ⟨-2⟩
(refl , λ r → anti-whisker-right (get-path refl)
(lemma r ∘ get-path-eq r))
module _ {A : Set i} where
abstract
contr-has-all-paths : is-contr A → has-all-paths A
contr-has-all-paths c x y = π₂ c x ∘ ! (π₂ c y)
prop-has-all-paths : is-prop A → has-all-paths A
prop-has-all-paths c x y = π₁ (c x y)
inhab-prop-is-contr : A → is-prop A → is-contr A
inhab-prop-is-contr x₀ p = (x₀ , λ y → π₁ (p y x₀))
contr-is-truncated : (n : ℕ₋₂) → (is-contr A → is-truncated n A)
contr-is-truncated ⟨-2⟩ p = p
contr-is-truncated (S n) p =
truncated-is-truncated-S n (contr-is-truncated n p)
prop-is-truncated-S : (n : ℕ₋₂) → (is-prop A → is-truncated (S n) A)
prop-is-truncated-S ⟨-2⟩ p = p
prop-is-truncated-S (S n) p =
truncated-is-truncated-S (S n) (prop-is-truncated-S n p)
set-is-truncated-SS : (n : ℕ₋₂) → (is-set A → is-truncated (S (S n)) A)
set-is-truncated-SS ⟨-2⟩ p = p
set-is-truncated-SS (S n) p = truncated-is-truncated-S (S (S n))
(set-is-truncated-SS n p)
contr-is-prop : is-contr A → is-prop A
contr-is-prop = contr-is-truncated ⟨-1⟩
contr-is-set : is-contr A → is-set A
contr-is-set = contr-is-truncated ⟨0⟩
contr-is-gpd : is-contr A → is-gpd A
contr-is-gpd = contr-is-truncated ⟨1⟩
prop-is-set : is-prop A → is-set A
prop-is-set = prop-is-truncated-S ⟨-1⟩
prop-is-gpd : is-prop A → is-gpd A
prop-is-gpd = prop-is-truncated-S ⟨0⟩
set-is-gpd : is-set A → is-gpd A
set-is-gpd = set-is-truncated-SS ⟨-1⟩
-- If [A] is n-truncated, then so does [x ≡ y] for [x y : A]
≡-is-truncated : (n : ℕ₋₂) {x y : A}
→ (is-truncated n A → is-truncated n (x ≡ y))
≡-is-truncated ⟨-2⟩ p = (contr-has-all-paths p _ _ , unique-path) where
unique-path : {u v : A} (q : u ≡ v)
→ q ≡ contr-has-all-paths p u v
unique-path refl = ! (opposite-right-inverse (π₂ p _))
≡-is-truncated (S n) {x} {y} p = truncated-is-truncated-S n (p x y)
-- The type of paths to a fixed point is contractible
pathto-is-contr : (x : A) → is-contr (Σ A (λ t → t ≡ x))
pathto-is-contr x = ((x , refl) , pathto-unique-path) where
pathto-unique-path : {u : A} (pp : Σ A (λ t → t ≡ u)) → pp ≡ (u , refl)
pathto-unique-path (u , refl) = refl
-- Specilization
module _ where
≡-is-set : {x y : A} → (is-set A → is-set (x ≡ y))
≡-is-set = ≡-is-truncated ⟨0⟩
≡-is-prop : {x y : A} → (is-prop A → is-prop (x ≡ y))
≡-is-prop = ≡-is-truncated ⟨-1⟩
abstract
-- Unit is contractible
-- I do not need to specify the universe level because in this file [is-contr]
-- is not yet universe polymorphic ([i] is a global argument)
unit-is-contr : is-contr unit
unit-is-contr = (tt , λ y → refl)
unit-is-truncated : (n : ℕ₋₂) → is-truncated n unit
unit-is-truncated n = contr-is-truncated n unit-is-contr
-- [unit-is-truncated#instance] produces unsolved metas
unit-is-truncated-S#instance : {n : ℕ₋₂} → is-truncated (S n) unit
unit-is-truncated-S#instance = contr-is-truncated _ unit-is-contr
unit-is-prop : is-prop unit
unit-is-prop = unit-is-truncated ⟨-1⟩
unit-is-set : is-set unit
unit-is-set = unit-is-truncated ⟨0⟩
contr-has-section : ∀ {j} {A : Set i} {P : A → Set j}
→ (is-contr A → (x : A) → (u : P x) → Π A P)
contr-has-section (x , p) x₀ y₀ t = transport _ (p x₀ ∘ ! (p t)) y₀
private
bool-true≢false-type : bool {i} → Set
bool-true≢false-type true = ⊤
bool-true≢false-type false = ⊥
abstract
bool-true≢false : true {i} ≢ false
bool-true≢false p = transport bool-true≢false-type p tt
bool-false≢true : false {i} ≢ true
bool-false≢true p = transport bool-true≢false-type (! p) tt
bool-has-dec-eq : has-dec-eq bool
bool-has-dec-eq true true = inl refl
bool-has-dec-eq true false = inr bool-true≢false
bool-has-dec-eq false true = inr bool-false≢true
bool-has-dec-eq false false = inl refl
bool-is-set : is-set bool
bool-is-set = dec-eq-is-set bool-has-dec-eq
⊥-is-prop : is-prop ⊥
⊥-is-prop ()
|
src/lumen-events.adb
|
darkestkhan/lumen
| 8 |
9279
|
<filename>src/lumen-events.adb
-- <NAME>, NiEstu, Phoenix AZ, Spring 2010
-- Lumen would not be possible without the support and contributions of a cast
-- of thousands, including and primarily Rod Kay.
-- This code is covered by the ISC License:
--
-- Copyright © 2010, NiEstu
--
-- Permission to use, copy, modify, and/or distribute this software for any
-- purpose with or without fee is hereby granted, provided that the above
-- copyright notice and this permission notice appear in all copies.
--
-- The software is provided "as is" and the author disclaims all warranties
-- with regard to this software including all implied warranties of
-- merchantability and fitness. In no event shall the author be liable for any
-- special, direct, indirect, or consequential damages or any damages
-- whatsoever resulting from loss of use, data or profits, whether in an
-- action of contract, negligence or other tortious action, arising out of or
-- in connection with the use or performance of this software.
package body Lumen.Events is
---------------------------------------------------------------------------
function To_Character (Symbol : in Key_Symbol) return Character is
begin -- To_Character
if Symbol not in Key_Symbol (Character'Pos (Character'First)) ..
Key_Symbol (Character'Pos (Character'Last))
then
raise Not_Character;
end if;
return Character'Val (Natural (Symbol));
end To_Character;
---------------------------------------------------------------------------
function To_UTF_8 (Symbol : in Key_Symbol) return String is
Result : String (1 .. 2); -- as big as we can encode
begin -- To_UTF_8
if Symbol not in Key_Symbol (Character'Pos (Character'First)) ..
Key_Symbol (Character'Pos (Character'Last))
then
raise Not_Character;
end if;
if Symbol < 16#7F# then
-- 7-bit characters just pass through unchanged
Result (1) := Character'Val (Symbol);
return Result (1 .. 1);
else
-- 8-bit characters are encoded in two bytes
Result (1) := Character'Val (16#C0# + (Symbol / 2 ** 6));
Result (2) := Character'Val (16#80# + (Symbol rem 2 ** 6));
return Result;
end if;
end To_UTF_8;
---------------------------------------------------------------------------
-- Convert a normal Latin-1 character to a Key_Symbol
function To_Symbol (Char : in Character) return Key_Symbol is
begin -- To_Symbol
return Key_Symbol (Character'Pos (Char));
end To_Symbol;
---------------------------------------------------------------------------
end Lumen.Events;
|
oeis/307/A307096.asm
|
neoneye/loda-programs
| 11 |
247360
|
<gh_stars>10-100
; A307096: Positive integers m such that for any positive integer k the last k bits of the binary expansion of m is not a multiple of 3.
; Submitted by <NAME>(w4)
; 1,5,13,17,29,37,49,61,65,77,101,113,125,133,145,157,193,205,229,241,253,257,269,293,305,317,389,401,413,449,461,485,497,509,517,529,541,577,589,613,625,637,769,781,805,817,829,901,913,925,961,973,997,1009
seq $0,60142 ; Ordered set S defined by these rules: 0 is in S and if x is in S then 2x+1 and 4x are in S.
mul $0,4
add $0,1
|
chips/chips_code.asm
|
StraDaMa/mmbn6-pikachu-boss-battle
| 7 |
86178
|
<reponame>StraDaMa/mmbn6-pikachu-boss-battle<gh_stars>1-10
.include "pikachu_chip_object.asm"
;eof
|
ls/ls.asm
|
NudelErde/Kernel
| 0 |
246305
|
../ls/ls.elf: file format elf64-x86-64
Disassembly of section .text:
0000000060000000 <exit(unsigned long)>:
60000000: 55 push %rbp
60000001: 48 89 e5 mov %rsp,%rbp
60000004: 48 83 ec 10 sub $0x10,%rsp
60000008: 48 89 7d f8 mov %rdi,-0x8(%rbp)
6000000c: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000010: b9 00 00 00 00 mov $0x0,%ecx
60000015: 48 89 c2 mov %rax,%rdx
60000018: be 01 00 00 00 mov $0x1,%esi
6000001d: bf 01 00 00 00 mov $0x1,%edi
60000022: e8 6f 0b 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
60000027: 90 nop
60000028: c9 leaveq
60000029: c3 retq
000000006000002a <getpid()>:
6000002a: 55 push %rbp
6000002b: 48 89 e5 mov %rsp,%rbp
6000002e: 48 83 ec 10 sub $0x10,%rsp
60000032: 48 8d 45 f8 lea -0x8(%rbp),%rax
60000036: b9 00 00 00 00 mov $0x0,%ecx
6000003b: 48 89 c2 mov %rax,%rdx
6000003e: be 02 00 00 00 mov $0x2,%esi
60000043: bf 01 00 00 00 mov $0x1,%edi
60000048: e8 49 0b 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
6000004d: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000051: c9 leaveq
60000052: c3 retq
0000000060000053 <createProcess(unsigned long, char const*, char const*, bool)>:
60000053: 55 push %rbp
60000054: 48 89 e5 mov %rsp,%rbp
60000057: 48 83 ec 50 sub $0x50,%rsp
6000005b: 48 89 7d c8 mov %rdi,-0x38(%rbp)
6000005f: 48 89 75 c0 mov %rsi,-0x40(%rbp)
60000063: 48 89 55 b8 mov %rdx,-0x48(%rbp)
60000067: 89 c8 mov %ecx,%eax
60000069: 88 45 b4 mov %al,-0x4c(%rbp)
6000006c: 48 8b 45 c8 mov -0x38(%rbp),%rax
60000070: 48 89 45 d8 mov %rax,-0x28(%rbp)
60000074: 48 8b 45 c0 mov -0x40(%rbp),%rax
60000078: 48 89 45 e0 mov %rax,-0x20(%rbp)
6000007c: 48 8b 45 b8 mov -0x48(%rbp),%rax
60000080: 48 89 45 e8 mov %rax,-0x18(%rbp)
60000084: 0f b6 45 b4 movzbl -0x4c(%rbp),%eax
60000088: 88 45 f8 mov %al,-0x8(%rbp)
6000008b: 48 8d 45 d8 lea -0x28(%rbp),%rax
6000008f: b9 00 00 00 00 mov $0x0,%ecx
60000094: 48 89 c2 mov %rax,%rdx
60000097: be 03 00 00 00 mov $0x3,%esi
6000009c: bf 01 00 00 00 mov $0x1,%edi
600000a1: e8 f0 0a 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600000a6: 48 8b 45 f0 mov -0x10(%rbp),%rax
600000aa: c9 leaveq
600000ab: c3 retq
00000000600000ac <sleep(unsigned long)>:
600000ac: 55 push %rbp
600000ad: 48 89 e5 mov %rsp,%rbp
600000b0: 48 83 ec 10 sub $0x10,%rsp
600000b4: 48 89 7d f8 mov %rdi,-0x8(%rbp)
600000b8: 48 8b 45 f8 mov -0x8(%rbp),%rax
600000bc: b9 00 00 00 00 mov $0x0,%ecx
600000c1: 48 89 c2 mov %rax,%rdx
600000c4: be 04 00 00 00 mov $0x4,%esi
600000c9: bf 01 00 00 00 mov $0x1,%edi
600000ce: e8 c3 0a 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600000d3: 90 nop
600000d4: c9 leaveq
600000d5: c3 retq
00000000600000d6 <malloc(unsigned long)>:
600000d6: 55 push %rbp
600000d7: 48 89 e5 mov %rsp,%rbp
600000da: 48 83 ec 20 sub $0x20,%rsp
600000de: 48 89 7d e8 mov %rdi,-0x18(%rbp)
600000e2: 48 8d 55 f8 lea -0x8(%rbp),%rdx
600000e6: 48 8b 45 e8 mov -0x18(%rbp),%rax
600000ea: 48 89 d1 mov %rdx,%rcx
600000ed: 48 89 c2 mov %rax,%rdx
600000f0: be 05 00 00 00 mov $0x5,%esi
600000f5: bf 01 00 00 00 mov $0x1,%edi
600000fa: e8 97 0a 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600000ff: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000103: c9 leaveq
60000104: c3 retq
0000000060000105 <free(void*)>:
60000105: 55 push %rbp
60000106: 48 89 e5 mov %rsp,%rbp
60000109: 48 83 ec 10 sub $0x10,%rsp
6000010d: 48 89 7d f8 mov %rdi,-0x8(%rbp)
60000111: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000115: b9 00 00 00 00 mov $0x0,%ecx
6000011a: 48 89 c2 mov %rax,%rdx
6000011d: be 06 00 00 00 mov $0x6,%esi
60000122: bf 01 00 00 00 mov $0x1,%edi
60000127: e8 6a 0a 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
6000012c: 90 nop
6000012d: c9 leaveq
6000012e: c3 retq
000000006000012f <createSharedPage()>:
6000012f: 55 push %rbp
60000130: 48 89 e5 mov %rsp,%rbp
60000133: 48 83 ec 10 sub $0x10,%rsp
60000137: 48 8d 45 f8 lea -0x8(%rbp),%rax
6000013b: b9 00 00 00 00 mov $0x0,%ecx
60000140: 48 89 c2 mov %rax,%rdx
60000143: be 07 00 00 00 mov $0x7,%esi
60000148: bf 01 00 00 00 mov $0x1,%edi
6000014d: e8 44 0a 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
60000152: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000156: c9 leaveq
60000157: c3 retq
0000000060000158 <inviteProcessToSharedPage(unsigned long, unsigned long)>:
60000158: 55 push %rbp
60000159: 48 89 e5 mov %rsp,%rbp
6000015c: 48 83 ec 10 sub $0x10,%rsp
60000160: 48 89 7d f8 mov %rdi,-0x8(%rbp)
60000164: 48 89 75 f0 mov %rsi,-0x10(%rbp)
60000168: 48 8b 55 f0 mov -0x10(%rbp),%rdx
6000016c: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000170: 48 89 d1 mov %rdx,%rcx
60000173: 48 89 c2 mov %rax,%rdx
60000176: be 08 00 00 00 mov $0x8,%esi
6000017b: bf 01 00 00 00 mov $0x1,%edi
60000180: e8 11 0a 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
60000185: 90 nop
60000186: c9 leaveq
60000187: c3 retq
0000000060000188 <getPointerToSharedPage(unsigned long)>:
60000188: 55 push %rbp
60000189: 48 89 e5 mov %rsp,%rbp
6000018c: 48 83 ec 20 sub $0x20,%rsp
60000190: 48 89 7d e8 mov %rdi,-0x18(%rbp)
60000194: 48 8d 55 f8 lea -0x8(%rbp),%rdx
60000198: 48 8b 45 e8 mov -0x18(%rbp),%rax
6000019c: 48 89 d1 mov %rdx,%rcx
6000019f: 48 89 c2 mov %rax,%rdx
600001a2: be 09 00 00 00 mov $0x9,%esi
600001a7: bf 01 00 00 00 mov $0x1,%edi
600001ac: e8 e5 09 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600001b1: 48 8b 45 f8 mov -0x8(%rbp),%rax
600001b5: c9 leaveq
600001b6: c3 retq
00000000600001b7 <freeSharedMemoryPage(unsigned long)>:
600001b7: 55 push %rbp
600001b8: 48 89 e5 mov %rsp,%rbp
600001bb: 48 83 ec 10 sub $0x10,%rsp
600001bf: 48 89 7d f8 mov %rdi,-0x8(%rbp)
600001c3: 48 8b 45 f8 mov -0x8(%rbp),%rax
600001c7: b9 00 00 00 00 mov $0x0,%ecx
600001cc: 48 89 c2 mov %rax,%rdx
600001cf: be 0a 00 00 00 mov $0xa,%esi
600001d4: bf 01 00 00 00 mov $0x1,%edi
600001d9: e8 b8 09 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600001de: 90 nop
600001df: c9 leaveq
600001e0: c3 retq
00000000600001e1 <waitForProcess(unsigned long)>:
600001e1: 55 push %rbp
600001e2: 48 89 e5 mov %rsp,%rbp
600001e5: 48 83 ec 20 sub $0x20,%rsp
600001e9: 48 89 7d e8 mov %rdi,-0x18(%rbp)
600001ed: 48 8d 55 f8 lea -0x8(%rbp),%rdx
600001f1: 48 8b 45 e8 mov -0x18(%rbp),%rax
600001f5: 48 89 d1 mov %rdx,%rcx
600001f8: 48 89 c2 mov %rax,%rdx
600001fb: be 0b 00 00 00 mov $0xb,%esi
60000200: bf 01 00 00 00 mov $0x1,%edi
60000205: e8 8c 09 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
6000020a: 48 8b 45 f8 mov -0x8(%rbp),%rax
6000020e: c9 leaveq
6000020f: c3 retq
0000000060000210 <getArguments()>:
60000210: 55 push %rbp
60000211: 48 89 e5 mov %rsp,%rbp
60000214: 48 83 ec 10 sub $0x10,%rsp
60000218: 48 8d 45 f8 lea -0x8(%rbp),%rax
6000021c: b9 00 00 00 00 mov $0x0,%ecx
60000221: 48 89 c2 mov %rax,%rdx
60000224: be 0c 00 00 00 mov $0xc,%esi
60000229: bf 01 00 00 00 mov $0x1,%edi
6000022e: e8 63 09 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
60000233: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000237: c9 leaveq
60000238: c3 retq
0000000060000239 <getParentPid()>:
60000239: 55 push %rbp
6000023a: 48 89 e5 mov %rsp,%rbp
6000023d: 48 83 ec 10 sub $0x10,%rsp
60000241: 48 8d 45 f8 lea -0x8(%rbp),%rax
60000245: b9 00 00 00 00 mov $0x0,%ecx
6000024a: 48 89 c2 mov %rax,%rdx
6000024d: be 0d 00 00 00 mov $0xd,%esi
60000252: bf 01 00 00 00 mov $0x1,%edi
60000257: e8 3a 09 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
6000025c: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000260: c9 leaveq
60000261: c3 retq
0000000060000262 <getInterProcessMethodInfo(unsigned long, unsigned char)>:
60000262: 55 push %rbp
60000263: 48 89 e5 mov %rsp,%rbp
60000266: 48 83 ec 30 sub $0x30,%rsp
6000026a: 48 89 7d d8 mov %rdi,-0x28(%rbp)
6000026e: 89 f0 mov %esi,%eax
60000270: 88 45 d4 mov %al,-0x2c(%rbp)
60000273: 48 8b 45 d8 mov -0x28(%rbp),%rax
60000277: 48 89 45 f0 mov %rax,-0x10(%rbp)
6000027b: 0f b6 45 d4 movzbl -0x2c(%rbp),%eax
6000027f: 88 45 f8 mov %al,-0x8(%rbp)
60000282: 48 8d 45 f0 lea -0x10(%rbp),%rax
60000286: b9 00 00 00 00 mov $0x0,%ecx
6000028b: 48 89 c2 mov %rax,%rdx
6000028e: be 10 00 00 00 mov $0x10,%esi
60000293: bf 01 00 00 00 mov $0x1,%edi
60000298: e8 f9 08 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
6000029d: 0f b6 45 f9 movzbl -0x7(%rbp),%eax
600002a1: 88 45 ee mov %al,-0x12(%rbp)
600002a4: 0f b6 45 fa movzbl -0x6(%rbp),%eax
600002a8: 88 45 ef mov %al,-0x11(%rbp)
600002ab: 0f b7 45 ee movzwl -0x12(%rbp),%eax
600002af: c9 leaveq
600002b0: c3 retq
00000000600002b1 <callInterProcessMethod(unsigned long, unsigned char, unsigned long*)>:
600002b1: 55 push %rbp
600002b2: 48 89 e5 mov %rsp,%rbp
600002b5: 48 83 ec 40 sub $0x40,%rsp
600002b9: 48 89 7d d8 mov %rdi,-0x28(%rbp)
600002bd: 89 f0 mov %esi,%eax
600002bf: 48 89 55 c8 mov %rdx,-0x38(%rbp)
600002c3: 88 45 d4 mov %al,-0x2c(%rbp)
600002c6: 48 8b 45 d8 mov -0x28(%rbp),%rax
600002ca: 48 89 45 e0 mov %rax,-0x20(%rbp)
600002ce: 0f b6 45 d4 movzbl -0x2c(%rbp),%eax
600002d2: 88 45 f0 mov %al,-0x10(%rbp)
600002d5: 48 8b 45 c8 mov -0x38(%rbp),%rax
600002d9: 48 89 45 e8 mov %rax,-0x18(%rbp)
600002dd: 48 8d 45 e0 lea -0x20(%rbp),%rax
600002e1: b9 00 00 00 00 mov $0x0,%ecx
600002e6: 48 89 c2 mov %rax,%rdx
600002e9: be 11 00 00 00 mov $0x11,%esi
600002ee: bf 01 00 00 00 mov $0x1,%edi
600002f3: e8 9e 08 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600002f8: 48 8b 45 f8 mov -0x8(%rbp),%rax
600002fc: c9 leaveq
600002fd: c3 retq
00000000600002fe <registerInterProcessMethod(unsigned char, unsigned char, unsigned long, bool)>:
600002fe: 55 push %rbp
600002ff: 48 89 e5 mov %rsp,%rbp
60000302: 48 83 ec 40 sub $0x40,%rsp
60000306: 89 f8 mov %edi,%eax
60000308: 48 89 55 d0 mov %rdx,-0x30(%rbp)
6000030c: 89 ca mov %ecx,%edx
6000030e: 88 45 dc mov %al,-0x24(%rbp)
60000311: 89 f0 mov %esi,%eax
60000313: 88 45 d8 mov %al,-0x28(%rbp)
60000316: 89 d0 mov %edx,%eax
60000318: 88 45 cc mov %al,-0x34(%rbp)
6000031b: 0f b6 45 dc movzbl -0x24(%rbp),%eax
6000031f: 88 45 e8 mov %al,-0x18(%rbp)
60000322: 0f b6 45 d8 movzbl -0x28(%rbp),%eax
60000326: 88 45 e9 mov %al,-0x17(%rbp)
60000329: 48 8b 45 d0 mov -0x30(%rbp),%rax
6000032d: 48 89 45 f0 mov %rax,-0x10(%rbp)
60000331: 0f b6 45 cc movzbl -0x34(%rbp),%eax
60000335: 88 45 f8 mov %al,-0x8(%rbp)
60000338: 48 8d 45 e8 lea -0x18(%rbp),%rax
6000033c: b9 00 00 00 00 mov $0x0,%ecx
60000341: 48 89 c2 mov %rax,%rdx
60000344: be 12 00 00 00 mov $0x12,%esi
60000349: bf 01 00 00 00 mov $0x1,%edi
6000034e: e8 43 08 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
60000353: 90 nop
60000354: c9 leaveq
60000355: c3 retq
0000000060000356 <removeInterProcessMethod(unsigned char)>:
60000356: 55 push %rbp
60000357: 48 89 e5 mov %rsp,%rbp
6000035a: 48 83 ec 10 sub $0x10,%rsp
6000035e: 89 f8 mov %edi,%eax
60000360: 88 45 fc mov %al,-0x4(%rbp)
60000363: 0f b6 45 fc movzbl -0x4(%rbp),%eax
60000367: b9 00 00 00 00 mov $0x0,%ecx
6000036c: 48 89 c2 mov %rax,%rdx
6000036f: be 13 00 00 00 mov $0x13,%esi
60000374: bf 01 00 00 00 mov $0x1,%edi
60000379: e8 18 08 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
6000037e: 90 nop
6000037f: c9 leaveq
60000380: c3 retq
0000000060000381 <getDeviceCount()>:
60000381: 55 push %rbp
60000382: 48 89 e5 mov %rsp,%rbp
60000385: 48 83 ec 10 sub $0x10,%rsp
60000389: 48 8d 45 f8 lea -0x8(%rbp),%rax
6000038d: b9 00 00 00 00 mov $0x0,%ecx
60000392: 48 89 c2 mov %rax,%rdx
60000395: be 01 00 00 00 mov $0x1,%esi
6000039a: bf 02 00 00 00 mov $0x2,%edi
6000039f: e8 f2 07 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600003a4: 48 8b 45 f8 mov -0x8(%rbp),%rax
600003a8: c9 leaveq
600003a9: c3 retq
00000000600003aa <getSystemDevice()>:
600003aa: 55 push %rbp
600003ab: 48 89 e5 mov %rsp,%rbp
600003ae: 48 83 ec 10 sub $0x10,%rsp
600003b2: 48 8d 45 f8 lea -0x8(%rbp),%rax
600003b6: b9 00 00 00 00 mov $0x0,%ecx
600003bb: 48 89 c2 mov %rax,%rdx
600003be: be 02 00 00 00 mov $0x2,%esi
600003c3: bf 02 00 00 00 mov $0x2,%edi
600003c8: e8 c9 07 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600003cd: 48 8b 45 f8 mov -0x8(%rbp),%rax
600003d1: c9 leaveq
600003d2: c3 retq
00000000600003d3 <write(unsigned char)>:
600003d3: 55 push %rbp
600003d4: 48 89 e5 mov %rsp,%rbp
600003d7: 48 83 ec 10 sub $0x10,%rsp
600003db: 89 f8 mov %edi,%eax
600003dd: 88 45 fc mov %al,-0x4(%rbp)
600003e0: 0f b6 45 fc movzbl -0x4(%rbp),%eax
600003e4: b9 00 00 00 00 mov $0x0,%ecx
600003e9: 48 89 c2 mov %rax,%rdx
600003ec: be 01 00 00 00 mov $0x1,%esi
600003f1: bf 03 00 00 00 mov $0x3,%edi
600003f6: e8 9b 07 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600003fb: 90 nop
600003fc: c9 leaveq
600003fd: c3 retq
00000000600003fe <read()>:
600003fe: 55 push %rbp
600003ff: 48 89 e5 mov %rsp,%rbp
60000402: 48 83 ec 10 sub $0x10,%rsp
60000406: 48 8d 45 ff lea -0x1(%rbp),%rax
6000040a: b9 00 00 00 00 mov $0x0,%ecx
6000040f: 48 89 c2 mov %rax,%rdx
60000412: be 02 00 00 00 mov $0x2,%esi
60000417: bf 03 00 00 00 mov $0x3,%edi
6000041c: e8 75 07 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
60000421: 0f b6 45 ff movzbl -0x1(%rbp),%eax
60000425: c9 leaveq
60000426: c3 retq
0000000060000427 <getINodeOfPath(unsigned long, char const*)>:
60000427: 55 push %rbp
60000428: 48 89 e5 mov %rsp,%rbp
6000042b: 48 83 ec 20 sub $0x20,%rsp
6000042f: 48 89 7d e8 mov %rdi,-0x18(%rbp)
60000433: 48 89 75 e0 mov %rsi,-0x20(%rbp)
60000437: 48 8b 45 e0 mov -0x20(%rbp),%rax
6000043b: 48 89 45 f0 mov %rax,-0x10(%rbp)
6000043f: 48 8d 55 f0 lea -0x10(%rbp),%rdx
60000443: 48 8b 45 e8 mov -0x18(%rbp),%rax
60000447: 48 89 d1 mov %rdx,%rcx
6000044a: 48 89 c2 mov %rax,%rdx
6000044d: be 01 00 00 00 mov $0x1,%esi
60000452: bf 04 00 00 00 mov $0x4,%edi
60000457: e8 3a 07 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
6000045c: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000460: c9 leaveq
60000461: c3 retq
0000000060000462 <getSectorOfINode(unsigned long, unsigned long, unsigned long, unsigned char*)>:
60000462: 55 push %rbp
60000463: 48 89 e5 mov %rsp,%rbp
60000466: 48 83 ec 40 sub $0x40,%rsp
6000046a: 48 89 7d d8 mov %rdi,-0x28(%rbp)
6000046e: 48 89 75 d0 mov %rsi,-0x30(%rbp)
60000472: 48 89 55 c8 mov %rdx,-0x38(%rbp)
60000476: 48 89 4d c0 mov %rcx,-0x40(%rbp)
6000047a: 48 8b 45 d0 mov -0x30(%rbp),%rax
6000047e: 48 89 45 e0 mov %rax,-0x20(%rbp)
60000482: 48 8b 45 c8 mov -0x38(%rbp),%rax
60000486: 48 89 45 e8 mov %rax,-0x18(%rbp)
6000048a: 48 8b 45 c0 mov -0x40(%rbp),%rax
6000048e: 48 89 45 f0 mov %rax,-0x10(%rbp)
60000492: 48 8d 55 e0 lea -0x20(%rbp),%rdx
60000496: 48 8b 45 d8 mov -0x28(%rbp),%rax
6000049a: 48 89 d1 mov %rdx,%rcx
6000049d: 48 89 c2 mov %rax,%rdx
600004a0: be 02 00 00 00 mov $0x2,%esi
600004a5: bf 04 00 00 00 mov $0x4,%edi
600004aa: e8 e7 06 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600004af: 0f b6 45 f8 movzbl -0x8(%rbp),%eax
600004b3: c9 leaveq
600004b4: c3 retq
00000000600004b5 <getFlagsOfINode(unsigned long, unsigned long)>:
600004b5: 55 push %rbp
600004b6: 48 89 e5 mov %rsp,%rbp
600004b9: 48 83 ec 20 sub $0x20,%rsp
600004bd: 48 89 7d e8 mov %rdi,-0x18(%rbp)
600004c1: 48 89 75 e0 mov %rsi,-0x20(%rbp)
600004c5: 48 8b 45 e0 mov -0x20(%rbp),%rax
600004c9: 48 89 45 f0 mov %rax,-0x10(%rbp)
600004cd: 48 8d 55 f0 lea -0x10(%rbp),%rdx
600004d1: 48 8b 45 e8 mov -0x18(%rbp),%rax
600004d5: 48 89 d1 mov %rdx,%rcx
600004d8: 48 89 c2 mov %rax,%rdx
600004db: be 03 00 00 00 mov $0x3,%esi
600004e0: bf 04 00 00 00 mov $0x4,%edi
600004e5: e8 ac 06 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600004ea: 48 8b 45 f8 mov -0x8(%rbp),%rax
600004ee: c9 leaveq
600004ef: c3 retq
00000000600004f0 <getDirectoryEntriesOfINode(unsigned long, unsigned long, unsigned long, DirectoryEntry*)>:
600004f0: 55 push %rbp
600004f1: 48 89 e5 mov %rsp,%rbp
600004f4: 48 83 ec 40 sub $0x40,%rsp
600004f8: 48 89 7d d8 mov %rdi,-0x28(%rbp)
600004fc: 48 89 75 d0 mov %rsi,-0x30(%rbp)
60000500: 48 89 55 c8 mov %rdx,-0x38(%rbp)
60000504: 48 89 4d c0 mov %rcx,-0x40(%rbp)
60000508: 48 8b 45 d0 mov -0x30(%rbp),%rax
6000050c: 48 89 45 e0 mov %rax,-0x20(%rbp)
60000510: 48 8b 45 c8 mov -0x38(%rbp),%rax
60000514: 48 89 45 e8 mov %rax,-0x18(%rbp)
60000518: 48 8b 45 c0 mov -0x40(%rbp),%rax
6000051c: 48 89 45 f0 mov %rax,-0x10(%rbp)
60000520: 48 8d 55 e0 lea -0x20(%rbp),%rdx
60000524: 48 8b 45 d8 mov -0x28(%rbp),%rax
60000528: 48 89 d1 mov %rdx,%rcx
6000052b: 48 89 c2 mov %rax,%rdx
6000052e: be 04 00 00 00 mov $0x4,%esi
60000533: bf 04 00 00 00 mov $0x4,%edi
60000538: e8 59 06 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
6000053d: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000541: c9 leaveq
60000542: c3 retq
0000000060000543 <getFileSize(unsigned long, unsigned long)>:
60000543: 55 push %rbp
60000544: 48 89 e5 mov %rsp,%rbp
60000547: 48 83 ec 20 sub $0x20,%rsp
6000054b: 48 89 7d e8 mov %rdi,-0x18(%rbp)
6000054f: 48 89 75 e0 mov %rsi,-0x20(%rbp)
60000553: 48 8b 45 e0 mov -0x20(%rbp),%rax
60000557: 48 89 45 f0 mov %rax,-0x10(%rbp)
6000055b: 48 c7 45 f8 00 00 00 movq $0x0,-0x8(%rbp)
60000562: 00
60000563: 48 8d 55 f0 lea -0x10(%rbp),%rdx
60000567: 48 8b 45 e8 mov -0x18(%rbp),%rax
6000056b: 48 89 d1 mov %rdx,%rcx
6000056e: 48 89 c2 mov %rax,%rdx
60000571: be 05 00 00 00 mov $0x5,%esi
60000576: bf 04 00 00 00 mov $0x4,%edi
6000057b: e8 16 06 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
60000580: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000584: c9 leaveq
60000585: c3 retq
0000000060000586 <getPciDeviceCount()>:
60000586: 55 push %rbp
60000587: 48 89 e5 mov %rsp,%rbp
6000058a: 48 83 ec 10 sub $0x10,%rsp
6000058e: 48 c7 45 f8 00 00 00 movq $0x0,-0x8(%rbp)
60000595: 00
60000596: 48 8d 45 f8 lea -0x8(%rbp),%rax
6000059a: 48 89 c1 mov %rax,%rcx
6000059d: ba 00 00 00 00 mov $0x0,%edx
600005a2: be 02 00 00 00 mov $0x2,%esi
600005a7: bf 05 00 00 00 mov $0x5,%edi
600005ac: e8 e5 05 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600005b1: 48 8b 45 f8 mov -0x8(%rbp),%rax
600005b5: c9 leaveq
600005b6: c3 retq
00000000600005b7 <getPciDeviceList(unsigned long*, unsigned long)>:
600005b7: 55 push %rbp
600005b8: 48 89 e5 mov %rsp,%rbp
600005bb: 48 83 ec 10 sub $0x10,%rsp
600005bf: 48 89 7d f8 mov %rdi,-0x8(%rbp)
600005c3: 48 89 75 f0 mov %rsi,-0x10(%rbp)
600005c7: 48 8b 55 f8 mov -0x8(%rbp),%rdx
600005cb: 48 8b 45 f0 mov -0x10(%rbp),%rax
600005cf: 48 89 d1 mov %rdx,%rcx
600005d2: 48 89 c2 mov %rax,%rdx
600005d5: be 02 00 00 00 mov $0x2,%esi
600005da: bf 05 00 00 00 mov $0x5,%edi
600005df: e8 b2 05 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600005e4: 90 nop
600005e5: c9 leaveq
600005e6: c3 retq
00000000600005e7 <getPciDeviceHeader(unsigned long, unsigned char*)>:
600005e7: 55 push %rbp
600005e8: 48 89 e5 mov %rsp,%rbp
600005eb: 48 83 ec 10 sub $0x10,%rsp
600005ef: 48 89 7d f8 mov %rdi,-0x8(%rbp)
600005f3: 48 89 75 f0 mov %rsi,-0x10(%rbp)
600005f7: 48 8b 55 f0 mov -0x10(%rbp),%rdx
600005fb: 48 8b 45 f8 mov -0x8(%rbp),%rax
600005ff: 48 89 d1 mov %rdx,%rcx
60000602: 48 89 c2 mov %rax,%rdx
60000605: be 03 00 00 00 mov $0x3,%esi
6000060a: bf 05 00 00 00 mov $0x5,%edi
6000060f: e8 82 05 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
60000614: 90 nop
60000615: c9 leaveq
60000616: c3 retq
0000000060000617 <allocateMemoryPage(unsigned long)>:
60000617: 55 push %rbp
60000618: 48 89 e5 mov %rsp,%rbp
6000061b: 48 83 ec 10 sub $0x10,%rsp
6000061f: 48 89 7d f8 mov %rdi,-0x8(%rbp)
60000623: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000627: b9 00 00 00 00 mov $0x0,%ecx
6000062c: 48 89 c2 mov %rax,%rdx
6000062f: be 04 00 00 00 mov $0x4,%esi
60000634: bf 05 00 00 00 mov $0x5,%edi
60000639: e8 58 05 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
6000063e: 90 nop
6000063f: c9 leaveq
60000640: c3 retq
0000000060000641 <freeMemoryPage(unsigned long)>:
60000641: 55 push %rbp
60000642: 48 89 e5 mov %rsp,%rbp
60000645: 48 83 ec 10 sub $0x10,%rsp
60000649: 48 89 7d f8 mov %rdi,-0x8(%rbp)
6000064d: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000651: b9 00 00 00 00 mov $0x0,%ecx
60000656: 48 89 c2 mov %rax,%rdx
60000659: be 05 00 00 00 mov $0x5,%esi
6000065e: bf 05 00 00 00 mov $0x5,%edi
60000663: e8 2e 05 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
60000668: 90 nop
60000669: c9 leaveq
6000066a: c3 retq
000000006000066b <virtualToPhysicalAddress(unsigned long)>:
6000066b: 55 push %rbp
6000066c: 48 89 e5 mov %rsp,%rbp
6000066f: 48 83 ec 20 sub $0x20,%rsp
60000673: 48 89 7d e8 mov %rdi,-0x18(%rbp)
60000677: 48 c7 45 f8 00 00 00 movq $0x0,-0x8(%rbp)
6000067e: 00
6000067f: 48 8d 55 f8 lea -0x8(%rbp),%rdx
60000683: 48 8b 45 e8 mov -0x18(%rbp),%rax
60000687: 48 89 d1 mov %rdx,%rcx
6000068a: 48 89 c2 mov %rax,%rdx
6000068d: be 06 00 00 00 mov $0x6,%esi
60000692: bf 05 00 00 00 mov $0x5,%edi
60000697: e8 fa 04 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
6000069c: 48 8b 45 f8 mov -0x8(%rbp),%rax
600006a0: c9 leaveq
600006a1: c3 retq
00000000600006a2 <mapVirtualToPhysicalAddress(unsigned long, unsigned long)>:
600006a2: 55 push %rbp
600006a3: 48 89 e5 mov %rsp,%rbp
600006a6: 48 83 ec 10 sub $0x10,%rsp
600006aa: 48 89 7d f8 mov %rdi,-0x8(%rbp)
600006ae: 48 89 75 f0 mov %rsi,-0x10(%rbp)
600006b2: 48 8b 55 f0 mov -0x10(%rbp),%rdx
600006b6: 48 8b 45 f8 mov -0x8(%rbp),%rax
600006ba: 48 89 d1 mov %rdx,%rcx
600006bd: 48 89 c2 mov %rax,%rdx
600006c0: be 07 00 00 00 mov $0x7,%esi
600006c5: bf 05 00 00 00 mov $0x5,%edi
600006ca: e8 c7 04 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
600006cf: 90 nop
600006d0: c9 leaveq
600006d1: c3 retq
00000000600006d2 <getDriverStatus(unsigned long)>:
600006d2: 55 push %rbp
600006d3: 48 89 e5 mov %rsp,%rbp
600006d6: 48 83 ec 20 sub $0x20,%rsp
600006da: 48 89 7d e8 mov %rdi,-0x18(%rbp)
600006de: 48 c7 45 f8 00 00 00 movq $0x0,-0x8(%rbp)
600006e5: 00
600006e6: 48 8d 55 f8 lea -0x8(%rbp),%rdx
600006ea: 48 8b 45 e8 mov -0x18(%rbp),%rax
600006ee: 48 89 d1 mov %rdx,%rcx
600006f1: 48 89 c2 mov %rax,%rdx
600006f4: be 10 00 00 00 mov $0x10,%esi
600006f9: bf 05 00 00 00 mov $0x5,%edi
600006fe: e8 93 04 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
60000703: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000707: c9 leaveq
60000708: c3 retq
0000000060000709 <driverCall(unsigned long, unsigned char, void*)>:
60000709: 55 push %rbp
6000070a: 48 89 e5 mov %rsp,%rbp
6000070d: 48 83 ec 20 sub $0x20,%rsp
60000711: 48 89 7d f8 mov %rdi,-0x8(%rbp)
60000715: 89 f0 mov %esi,%eax
60000717: 48 89 55 e8 mov %rdx,-0x18(%rbp)
6000071b: 88 45 f4 mov %al,-0xc(%rbp)
6000071e: 80 7d f4 00 cmpb $0x0,-0xc(%rbp)
60000722: 74 26 je 6000074a <driverCall(unsigned long, unsigned char, void*)+0x41>
60000724: 80 7d f4 0f cmpb $0xf,-0xc(%rbp)
60000728: 77 20 ja 6000074a <driverCall(unsigned long, unsigned char, void*)+0x41>
6000072a: 48 8b 4d e8 mov -0x18(%rbp),%rcx
6000072e: 0f b6 45 f4 movzbl -0xc(%rbp),%eax
60000732: 83 c0 10 add $0x10,%eax
60000735: 48 98 cltq
60000737: 48 8b 55 f8 mov -0x8(%rbp),%rdx
6000073b: 48 89 c6 mov %rax,%rsi
6000073e: bf 05 00 00 00 mov $0x5,%edi
60000743: e8 4e 04 00 00 callq 60000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>
60000748: eb 01 jmp 6000074b <driverCall(unsigned long, unsigned char, void*)+0x42>
6000074a: 90 nop
6000074b: c9 leaveq
6000074c: c3 retq
000000006000074d <countArgc(char const*)>:
6000074d: 55 push %rbp
6000074e: 48 89 e5 mov %rsp,%rbp
60000751: 48 83 ec 18 sub $0x18,%rsp
60000755: 48 89 7d e8 mov %rdi,-0x18(%rbp)
60000759: c7 45 fc 00 00 00 00 movl $0x0,-0x4(%rbp)
60000760: 48 83 7d e8 00 cmpq $0x0,-0x18(%rbp)
60000765: 74 0b je 60000772 <countArgc(char const*)+0x25>
60000767: 48 8b 45 e8 mov -0x18(%rbp),%rax
6000076b: 0f b6 00 movzbl (%rax),%eax
6000076e: 84 c0 test %al,%al
60000770: 75 09 jne 6000077b <countArgc(char const*)+0x2e>
60000772: c7 45 fc 00 00 00 00 movl $0x0,-0x4(%rbp)
60000779: eb 31 jmp 600007ac <countArgc(char const*)+0x5f>
6000077b: 48 8b 45 e8 mov -0x18(%rbp),%rax
6000077f: 0f b6 00 movzbl (%rax),%eax
60000782: 84 c0 test %al,%al
60000784: 75 04 jne 6000078a <countArgc(char const*)+0x3d>
60000786: 83 45 fc 01 addl $0x1,-0x4(%rbp)
6000078a: 48 8b 45 e8 mov -0x18(%rbp),%rax
6000078e: 0f b6 00 movzbl (%rax),%eax
60000791: 84 c0 test %al,%al
60000793: 75 0f jne 600007a4 <countArgc(char const*)+0x57>
60000795: 48 8b 45 e8 mov -0x18(%rbp),%rax
60000799: 48 83 c0 01 add $0x1,%rax
6000079d: 0f b6 00 movzbl (%rax),%eax
600007a0: 84 c0 test %al,%al
600007a2: 74 07 je 600007ab <countArgc(char const*)+0x5e>
600007a4: 48 83 45 e8 01 addq $0x1,-0x18(%rbp)
600007a9: eb d0 jmp 6000077b <countArgc(char const*)+0x2e>
600007ab: 90 nop
600007ac: 8b 45 fc mov -0x4(%rbp),%eax
600007af: c9 leaveq
600007b0: c3 retq
00000000600007b1 <buildArgv(int, char const*)>:
600007b1: 55 push %rbp
600007b2: 48 89 e5 mov %rsp,%rbp
600007b5: 48 83 ec 20 sub $0x20,%rsp
600007b9: 89 7d ec mov %edi,-0x14(%rbp)
600007bc: 48 89 75 e0 mov %rsi,-0x20(%rbp)
600007c0: 8b 45 ec mov -0x14(%rbp),%eax
600007c3: 83 c0 01 add $0x1,%eax
600007c6: 48 98 cltq
600007c8: 48 c1 e0 03 shl $0x3,%rax
600007cc: 48 89 c7 mov %rax,%rdi
600007cf: e8 02 f9 ff ff callq 600000d6 <malloc(unsigned long)>
600007d4: 48 89 45 f0 mov %rax,-0x10(%rbp)
600007d8: 8b 45 ec mov -0x14(%rbp),%eax
600007db: 48 98 cltq
600007dd: 48 8d 14 c5 00 00 00 lea 0x0(,%rax,8),%rdx
600007e4: 00
600007e5: 48 8b 45 f0 mov -0x10(%rbp),%rax
600007e9: 48 01 d0 add %rdx,%rax
600007ec: 48 c7 00 00 00 00 00 movq $0x0,(%rax)
600007f3: 83 7d ec 00 cmpl $0x0,-0x14(%rbp)
600007f7: 7e 4b jle 60000844 <buildArgv(int, char const*)+0x93>
600007f9: 48 c7 45 f8 00 00 00 movq $0x0,-0x8(%rbp)
60000800: 00
60000801: 48 8b 45 f8 mov -0x8(%rbp),%rax
60000805: 48 8d 14 c5 00 00 00 lea 0x0(,%rax,8),%rdx
6000080c: 00
6000080d: 48 8b 45 f0 mov -0x10(%rbp),%rax
60000811: 48 01 c2 add %rax,%rdx
60000814: 48 8b 45 e0 mov -0x20(%rbp),%rax
60000818: 48 89 02 mov %rax,(%rdx)
6000081b: 48 83 45 f8 01 addq $0x1,-0x8(%rbp)
60000820: 48 8b 45 e0 mov -0x20(%rbp),%rax
60000824: 0f b6 00 movzbl (%rax),%eax
60000827: 84 c0 test %al,%al
60000829: 74 07 je 60000832 <buildArgv(int, char const*)+0x81>
6000082b: 48 83 45 e0 01 addq $0x1,-0x20(%rbp)
60000830: eb ee jmp 60000820 <buildArgv(int, char const*)+0x6f>
60000832: 48 83 45 e0 01 addq $0x1,-0x20(%rbp)
60000837: 48 8b 45 e0 mov -0x20(%rbp),%rax
6000083b: 0f b6 00 movzbl (%rax),%eax
6000083e: 84 c0 test %al,%al
60000840: 74 02 je 60000844 <buildArgv(int, char const*)+0x93>
60000842: eb bd jmp 60000801 <buildArgv(int, char const*)+0x50>
60000844: 48 8b 45 f0 mov -0x10(%rbp),%rax
60000848: c9 leaveq
60000849: c3 retq
000000006000084a <__start1>:
6000084a: 55 push %rbp
6000084b: 48 89 e5 mov %rsp,%rbp
6000084e: 48 83 ec 20 sub $0x20,%rsp
60000852: e8 d3 f7 ff ff callq 6000002a <getpid()>
60000857: 48 89 05 a2 07 00 00 mov %rax,0x7a2(%rip) # 60001000 <myPid>
6000085e: e8 ad f9 ff ff callq 60000210 <getArguments()>
60000863: 48 89 45 f8 mov %rax,-0x8(%rbp)
60000867: 48 8b 45 f8 mov -0x8(%rbp),%rax
6000086b: 48 89 c7 mov %rax,%rdi
6000086e: e8 da fe ff ff callq 6000074d <countArgc(char const*)>
60000873: 89 45 f4 mov %eax,-0xc(%rbp)
60000876: 48 8b 55 f8 mov -0x8(%rbp),%rdx
6000087a: 8b 45 f4 mov -0xc(%rbp),%eax
6000087d: 48 89 d6 mov %rdx,%rsi
60000880: 89 c7 mov %eax,%edi
60000882: e8 2a ff ff ff callq 600007b1 <buildArgv(int, char const*)>
60000887: 48 89 45 e8 mov %rax,-0x18(%rbp)
6000088b: 48 8b 55 e8 mov -0x18(%rbp),%rdx
6000088f: 8b 45 f4 mov -0xc(%rbp),%eax
60000892: 48 89 d6 mov %rdx,%rsi
60000895: 89 c7 mov %eax,%edi
60000897: e8 2a 01 00 00 callq 600009c6 <main>
6000089c: 89 45 e4 mov %eax,-0x1c(%rbp)
6000089f: 8b 45 e4 mov -0x1c(%rbp),%eax
600008a2: 48 98 cltq
600008a4: 48 89 c7 mov %rax,%rdi
600008a7: e8 54 f7 ff ff callq 60000000 <exit(unsigned long)>
600008ac: 90 nop
600008ad: c9 leaveq
600008ae: c3 retq
00000000600008af <__start>:
600008af: 48 89 e5 mov %rsp,%rbp
600008b2: e8 93 ff ff ff callq 6000084a <__start1>
600008b7: cc int3
00000000600008b8 <print(char const*)>:
600008b8: 55 push %rbp
600008b9: 48 89 e5 mov %rsp,%rbp
600008bc: 48 83 ec 20 sub $0x20,%rsp
600008c0: 48 89 7d e8 mov %rdi,-0x18(%rbp)
600008c4: 48 8b 45 e8 mov -0x18(%rbp),%rax
600008c8: 48 89 45 f8 mov %rax,-0x8(%rbp)
600008cc: 48 8b 45 f8 mov -0x8(%rbp),%rax
600008d0: 0f b6 00 movzbl (%rax),%eax
600008d3: 84 c0 test %al,%al
600008d5: 74 18 je 600008ef <print(char const*)+0x37>
600008d7: 48 8b 45 f8 mov -0x8(%rbp),%rax
600008db: 0f b6 00 movzbl (%rax),%eax
600008de: 0f b6 c0 movzbl %al,%eax
600008e1: 89 c7 mov %eax,%edi
600008e3: e8 eb fa ff ff callq 600003d3 <write(unsigned char)>
600008e8: 48 83 45 f8 01 addq $0x1,-0x8(%rbp)
600008ed: eb dd jmp 600008cc <print(char const*)+0x14>
600008ef: 90 nop
600008f0: c9 leaveq
600008f1: c3 retq
00000000600008f2 <printBase(unsigned long, unsigned long, int)>:
600008f2: 55 push %rbp
600008f3: 48 89 e5 mov %rsp,%rbp
600008f6: 48 83 c4 80 add $0xffffffffffffff80,%rsp
600008fa: 48 89 7d 98 mov %rdi,-0x68(%rbp)
600008fe: 48 89 75 90 mov %rsi,-0x70(%rbp)
60000902: 89 55 8c mov %edx,-0x74(%rbp)
60000905: 48 c7 45 e8 00 20 00 movq $0x60002000,-0x18(%rbp)
6000090c: 60
6000090d: 48 8d 55 a8 lea -0x58(%rbp),%rdx
60000911: b8 00 00 00 00 mov $0x0,%eax
60000916: b9 08 00 00 00 mov $0x8,%ecx
6000091b: 48 89 d7 mov %rdx,%rdi
6000091e: f3 48 ab rep stos %rax,%es:(%rdi)
60000921: c7 45 fc 01 00 00 00 movl $0x1,-0x4(%rbp)
60000928: 48 83 7d 98 00 cmpq $0x0,-0x68(%rbp)
6000092d: 74 37 je 60000966 <printBase(unsigned long, unsigned long, int)+0x74>
6000092f: 48 8b 45 98 mov -0x68(%rbp),%rax
60000933: ba 00 00 00 00 mov $0x0,%edx
60000938: 48 f7 75 90 divq -0x70(%rbp)
6000093c: 48 8b 45 e8 mov -0x18(%rbp),%rax
60000940: 48 01 d0 add %rdx,%rax
60000943: 0f b6 10 movzbl (%rax),%edx
60000946: 8b 45 fc mov -0x4(%rbp),%eax
60000949: 48 98 cltq
6000094b: 88 54 05 a8 mov %dl,-0x58(%rbp,%rax,1)
6000094f: 48 8b 45 98 mov -0x68(%rbp),%rax
60000953: ba 00 00 00 00 mov $0x0,%edx
60000958: 48 f7 75 90 divq -0x70(%rbp)
6000095c: 48 89 45 98 mov %rax,-0x68(%rbp)
60000960: 83 45 fc 01 addl $0x1,-0x4(%rbp)
60000964: eb c2 jmp 60000928 <printBase(unsigned long, unsigned long, int)+0x36>
60000966: c7 45 f8 00 00 00 00 movl $0x0,-0x8(%rbp)
6000096d: 8b 45 8c mov -0x74(%rbp),%eax
60000970: 2b 45 fc sub -0x4(%rbp),%eax
60000973: 39 45 f8 cmp %eax,-0x8(%rbp)
60000976: 7f 10 jg 60000988 <printBase(unsigned long, unsigned long, int)+0x96>
60000978: bf 30 00 00 00 mov $0x30,%edi
6000097d: e8 51 fa ff ff callq 600003d3 <write(unsigned char)>
60000982: 83 45 f8 01 addl $0x1,-0x8(%rbp)
60000986: eb e5 jmp 6000096d <printBase(unsigned long, unsigned long, int)+0x7b>
60000988: c6 45 e7 00 movb $0x0,-0x19(%rbp)
6000098c: 8b 45 fc mov -0x4(%rbp),%eax
6000098f: 48 98 cltq
60000991: 48 8d 50 ff lea -0x1(%rax),%rdx
60000995: 48 8d 45 a8 lea -0x58(%rbp),%rax
60000999: 48 01 d0 add %rdx,%rax
6000099c: 48 89 45 f0 mov %rax,-0x10(%rbp)
600009a0: 48 8b 45 f0 mov -0x10(%rbp),%rax
600009a4: 0f b6 00 movzbl (%rax),%eax
600009a7: 84 c0 test %al,%al
600009a9: 74 18 je 600009c3 <printBase(unsigned long, unsigned long, int)+0xd1>
600009ab: 48 8b 45 f0 mov -0x10(%rbp),%rax
600009af: 0f b6 00 movzbl (%rax),%eax
600009b2: 0f b6 c0 movzbl %al,%eax
600009b5: 89 c7 mov %eax,%edi
600009b7: e8 17 fa ff ff callq 600003d3 <write(unsigned char)>
600009bc: 48 83 6d f0 01 subq $0x1,-0x10(%rbp)
600009c1: eb dd jmp 600009a0 <printBase(unsigned long, unsigned long, int)+0xae>
600009c3: 90 nop
600009c4: c9 leaveq
600009c5: c3 retq
00000000600009c6 <main>:
600009c6: 55 push %rbp
600009c7: 48 89 e5 mov %rsp,%rbp
600009ca: 48 81 ec 10 01 00 00 sub $0x110,%rsp
600009d1: 89 bd fc fe ff ff mov %edi,-0x104(%rbp)
600009d7: 48 89 b5 f0 fe ff ff mov %rsi,-0x110(%rbp)
600009de: e8 c7 f9 ff ff callq 600003aa <getSystemDevice()>
600009e3: 48 89 45 e0 mov %rax,-0x20(%rbp)
600009e7: 48 c7 45 f8 11 20 00 movq $0x60002011,-0x8(%rbp)
600009ee: 60
600009ef: 83 bd fc fe ff ff 01 cmpl $0x1,-0x104(%rbp)
600009f6: 7e 0f jle 60000a07 <main+0x41>
600009f8: 48 8b 85 f0 fe ff ff mov -0x110(%rbp),%rax
600009ff: 48 8b 40 08 mov 0x8(%rax),%rax
60000a03: 48 89 45 f8 mov %rax,-0x8(%rbp)
60000a07: 48 8b 55 f8 mov -0x8(%rbp),%rdx
60000a0b: 48 8b 45 e0 mov -0x20(%rbp),%rax
60000a0f: 48 89 d6 mov %rdx,%rsi
60000a12: 48 89 c7 mov %rax,%rdi
60000a15: e8 0d fa ff ff callq 60000427 <getINodeOfPath(unsigned long, char const*)>
60000a1a: 48 89 45 d8 mov %rax,-0x28(%rbp)
60000a1e: 48 83 7d d8 00 cmpq $0x0,-0x28(%rbp)
60000a23: 74 1a je 60000a3f <main+0x79>
60000a25: 48 8b 55 d8 mov -0x28(%rbp),%rdx
60000a29: 48 8b 45 e0 mov -0x20(%rbp),%rax
60000a2d: 48 89 d6 mov %rdx,%rsi
60000a30: 48 89 c7 mov %rax,%rdi
60000a33: e8 7d fa ff ff callq 600004b5 <getFlagsOfINode(unsigned long, unsigned long)>
60000a38: b8 00 00 00 00 mov $0x0,%eax
60000a3d: eb 05 jmp 60000a44 <main+0x7e>
60000a3f: b8 01 00 00 00 mov $0x1,%eax
60000a44: 84 c0 test %al,%al
60000a46: 74 14 je 60000a5c <main+0x96>
60000a48: bf 13 20 00 60 mov $0x60002013,%edi
60000a4d: e8 66 fe ff ff callq 600008b8 <print(char const*)>
60000a52: b8 01 00 00 00 mov $0x1,%eax
60000a57: e9 38 01 00 00 jmpq 60000b94 <main+0x1ce>
60000a5c: 48 8d 95 00 ff ff ff lea -0x100(%rbp),%rdx
60000a63: 48 8b 75 d8 mov -0x28(%rbp),%rsi
60000a67: 48 8b 45 e0 mov -0x20(%rbp),%rax
60000a6b: 48 89 d1 mov %rdx,%rcx
60000a6e: ba 08 00 00 00 mov $0x8,%edx
60000a73: 48 89 c7 mov %rax,%rdi
60000a76: e8 75 fa ff ff callq 600004f0 <getDirectoryEntriesOfINode(unsigned long, unsigned long, unsigned long, DirectoryEntry*)>
60000a7b: 48 89 45 d0 mov %rax,-0x30(%rbp)
60000a7f: b8 08 00 00 00 mov $0x8,%eax
60000a84: 48 83 7d d0 08 cmpq $0x8,-0x30(%rbp)
60000a89: 48 0f 46 45 d0 cmovbe -0x30(%rbp),%rax
60000a8e: 48 89 45 c8 mov %rax,-0x38(%rbp)
60000a92: 48 c7 45 f0 00 00 00 movq $0x0,-0x10(%rbp)
60000a99: 00
60000a9a: 48 8b 45 f0 mov -0x10(%rbp),%rax
60000a9e: 48 3b 45 c8 cmp -0x38(%rbp),%rax
60000aa2: 73 36 jae 60000ada <main+0x114>
60000aa4: 48 8b 55 f0 mov -0x10(%rbp),%rdx
60000aa8: 48 89 d0 mov %rdx,%rax
60000aab: 48 01 c0 add %rax,%rax
60000aae: 48 01 d0 add %rdx,%rax
60000ab1: 48 c1 e0 03 shl $0x3,%rax
60000ab5: 48 01 e8 add %rbp,%rax
60000ab8: 48 2d f0 00 00 00 sub $0xf0,%rax
60000abe: 48 8b 00 mov (%rax),%rax
60000ac1: 48 89 c7 mov %rax,%rdi
60000ac4: e8 ef fd ff ff callq 600008b8 <print(char const*)>
60000ac9: bf 09 00 00 00 mov $0x9,%edi
60000ace: e8 00 f9 ff ff callq 600003d3 <write(unsigned char)>
60000ad3: 48 83 45 f0 01 addq $0x1,-0x10(%rbp)
60000ad8: eb c0 jmp 60000a9a <main+0xd4>
60000ada: 48 83 7d d0 08 cmpq $0x8,-0x30(%rbp)
60000adf: 0f 86 a0 00 00 00 jbe 60000b85 <main+0x1bf>
60000ae5: 48 8b 55 d0 mov -0x30(%rbp),%rdx
60000ae9: 48 89 d0 mov %rdx,%rax
60000aec: 48 01 c0 add %rax,%rax
60000aef: 48 01 d0 add %rdx,%rax
60000af2: 48 c1 e0 03 shl $0x3,%rax
60000af6: 48 89 c7 mov %rax,%rdi
60000af9: e8 d8 f5 ff ff callq 600000d6 <malloc(unsigned long)>
60000afe: 48 89 45 c0 mov %rax,-0x40(%rbp)
60000b02: 48 8b 4d c0 mov -0x40(%rbp),%rcx
60000b06: 48 8b 55 d0 mov -0x30(%rbp),%rdx
60000b0a: 48 8b 75 d8 mov -0x28(%rbp),%rsi
60000b0e: 48 8b 45 e0 mov -0x20(%rbp),%rax
60000b12: 48 89 c7 mov %rax,%rdi
60000b15: e8 d6 f9 ff ff callq 600004f0 <getDirectoryEntriesOfINode(unsigned long, unsigned long, unsigned long, DirectoryEntry*)>
60000b1a: 48 89 45 d0 mov %rax,-0x30(%rbp)
60000b1e: 48 c7 45 e8 00 00 00 movq $0x0,-0x18(%rbp)
60000b25: 00
60000b26: 48 8b 45 e8 mov -0x18(%rbp),%rax
60000b2a: 48 3b 45 d0 cmp -0x30(%rbp),%rax
60000b2e: 73 55 jae 60000b85 <main+0x1bf>
60000b30: 48 83 7d e8 07 cmpq $0x7,-0x18(%rbp)
60000b35: 76 47 jbe 60000b7e <main+0x1b8>
60000b37: 48 8b 45 e8 mov -0x18(%rbp),%rax
60000b3b: 83 e0 07 and $0x7,%eax
60000b3e: 48 85 c0 test %rax,%rax
60000b41: 75 0a jne 60000b4d <main+0x187>
60000b43: bf 0a 00 00 00 mov $0xa,%edi
60000b48: e8 86 f8 ff ff callq 600003d3 <write(unsigned char)>
60000b4d: 48 8b 55 e8 mov -0x18(%rbp),%rdx
60000b51: 48 89 d0 mov %rdx,%rax
60000b54: 48 01 c0 add %rax,%rax
60000b57: 48 01 d0 add %rdx,%rax
60000b5a: 48 c1 e0 03 shl $0x3,%rax
60000b5e: 48 89 c2 mov %rax,%rdx
60000b61: 48 8b 45 c0 mov -0x40(%rbp),%rax
60000b65: 48 01 d0 add %rdx,%rax
60000b68: 48 8b 40 10 mov 0x10(%rax),%rax
60000b6c: 48 89 c7 mov %rax,%rdi
60000b6f: e8 44 fd ff ff callq 600008b8 <print(char const*)>
60000b74: bf 09 00 00 00 mov $0x9,%edi
60000b79: e8 55 f8 ff ff callq 600003d3 <write(unsigned char)>
60000b7e: 48 83 45 e8 01 addq $0x1,-0x18(%rbp)
60000b83: eb a1 jmp 60000b26 <main+0x160>
60000b85: bf 0a 00 00 00 mov $0xa,%edi
60000b8a: e8 44 f8 ff ff callq 600003d3 <write(unsigned char)>
60000b8f: b8 00 00 00 00 mov $0x0,%eax
60000b94: c9 leaveq
60000b95: c3 retq
Disassembly of section .text._Z7syscallmmmm:
0000000060000b96 <syscall(unsigned long, unsigned long, unsigned long, unsigned long)>:
60000b96: 55 push %rbp
60000b97: 48 89 e5 mov %rsp,%rbp
60000b9a: 53 push %rbx
60000b9b: 48 83 ec 20 sub $0x20,%rsp
60000b9f: 48 89 7d f0 mov %rdi,-0x10(%rbp)
60000ba3: 48 89 75 e8 mov %rsi,-0x18(%rbp)
60000ba7: 48 89 55 e0 mov %rdx,-0x20(%rbp)
60000bab: 48 89 4d d8 mov %rcx,-0x28(%rbp)
60000baf: 48 8b 45 f0 mov -0x10(%rbp),%rax
60000bb3: 48 8b 5d e8 mov -0x18(%rbp),%rbx
60000bb7: 48 8b 4d e0 mov -0x20(%rbp),%rcx
60000bbb: 48 8b 55 d8 mov -0x28(%rbp),%rdx
60000bbf: cd 80 int $0x80
60000bc1: 90 nop
60000bc2: 48 83 c4 20 add $0x20,%rsp
60000bc6: 5b pop %rbx
60000bc7: 5d pop %rbp
60000bc8: c3 retq
|
Microsoft Word for Windows Version 1.1a/Word 1.1a CHM Distribution/Opus/asm/nattrans.asm
|
lborgav/Historical-Source-Codes
| 7 |
12664
|
<reponame>lborgav/Historical-Source-Codes<filename>Microsoft Word for Windows Version 1.1a/Word 1.1a CHM Distribution/Opus/asm/nattrans.asm
include w2.inc
include noxport.inc
include consts.inc
include windows.inc
errNull equ 0
errDiv0 equ (errNull+7)
errVal equ (errDiv0+8)
errRef equ (errVal+8)
errName equ (errRef+6)
errNum equ (errName+7)
errNa equ (errNum+6)
errMax equ (errNa+5)
errNil equ errMax
createSeg trans,trans,byte,public,CODE
externFP <DADD,DMUL,DSUB,DDIV,DNEG,DINT,SFLOAT,FIX,DDIV2>
externFP <SetSbCur, ReloadSb>
OverErr EQU 0001H ;Overflow error indicator
UnderErr EQU 0002H ;Underflow error indicator
DivBy0 EQU 0004H ;Divide by 0 indicator
TransErr EQU 0008H ;Transcendental error indicator
POLY1 EQU 8000h ; flag for leading 1 in poly
EXPMASK EQU 07FF0h
EXPBIAS EQU 03FF0h
EXPSHFT EQU 4
MANBITS EQU 53
OF_EXP EQU 6
OF_SGN EQU 7
sBegin data
externW mpsbps
externW pdAcc
externW fError
externW AC_HI
externW AC_LO
externB round_flag
externW round_exp
externW f8087
ArgTran DQ ?
TempTran1 DQ ?
TempTran2 DQ ?
TempTran3 DQ ?
SgnTrig DB ? ; sign/cosine flag
ILNinterval DQ 03FF71547652B82FER ; 1/ln(2)
ISQRbase DQ 03FE6A09E667F3BCDR ; 1/sqr(2)
LNXMAX DQ 040862E42FEFA39EER ; 1024*ln(2)-2eps
LNXMIN DQ 0C086232BDD7ABCD1R ; -1022*ln(2)+2eps
ExpC1 DQ 03FE6300000000000R ; ln(2)
ExpC2 DQ 0BF2BD0105C610CA8R
LogATab DW 2
DQ 0BFE94415B356BD29R ;-0.78956112887491257267E+00
DQ 04030624A2016AFEDR ;+0.16383943563021534222E+02
DQ 0C05007FF12B3B59AR ;-0.64124943423745581147E+02
LogBTab DW 3
numOne DQ 03FF0000000000000R ;+0.10000000000000000000E+01
DQ 0C041D5804B67CE0FR ;-0.35667977739034646171E+02
DQ 040738083FA15267ER ;+0.31203222091924532844E+03
DQ 0C0880BFE9C0D9077R ;-0.76949932108494879777E+03
ExpPTab DW 2
DQ 03EF152A46F58DC1CR ;+0.165203300268279130E-04
DQ 03F7C70E46FB3F6E0R ;+0.694360001511792852E-02
DQ 03FD0000000000000R ;+0.249999999999999993E+00
ExpQTab DW 2
DQ 03F403F996FDE3809R ;+0.495862884905441294E-03
DQ 03FAC718E714251B3R ;+0.555538666969001188E-01
numHalf DQ 03FE0000000000000R ;+0.500000000000000000E+00
sEnd data
sBegin trans
assumes cs,trans
assumes ds,dgroup
assumes ss,dgroup
; %%Function:LOGNAT %%Owner:bryanl
cProc LOGNAT,<PUBLIC,NEAR>
LocalQ LOG_LO
LocalQ LOG_HI
cBegin
call ResetSbTrans
mov ax,[si+of_exp] ; save copy of sign:exp:himan
mov bx,ax
AND BX,8000h+expmask ;Taking log of zero?
jg LnPos
mov [ferror],TransErr
jmp LnExit
LnPos:
call LogCore
mov ax,dataOffset AC_HI
cCall DADD,<ax>
lea ax,LOG_HI
cCall DADD,<ax> ; AC = log(x) (normal precision)
LnExit:
cEnd
LogCore:
AND AX,not expmask
OR AX,expbias-(1 shl expshft)
mov [si+of_exp],ax ; Convert DAC to range [.5,1)
XCHG AX,BX
SUB AX,expbias-(1 shl expshft) ; Convert exponent to 16-bit integer
mov cl,expshft
sar ax,cl ; shift to integer
PUSH AX
mov di,dataOffset ArgTran
call dstdi
; At this point AC = Y
mov ax,dataOffset ISQRbase
cCall DSUB,<ax> ;AC < 1/SQR(base)
mov si,[si+of_exp]
call dlddi
or si,si
pop si ; get exponent
mov cl,00010000b ; assume in range AC < 1.0
jg dlog1 ; No - in range
dec si ; and adjust exponent down 1
add word ptr [pdAcc+of_exp],1 shl expshft ; * 2
mov cl,00001000b ; Y >= 1.0 divide adjustment
dlog1:
push cx ; save divide adjustment
call dstdi
cCall SFLOAT,<si> ; AC = XN
mov si,dataOffset TempTran1
mov bx,si
call dst
mov ax,dataOffset ExpC2
cCall DMUL,<ax>
lea bx,LOG_LO
call dst ; LOG_LO = XN*C2
mov bx,si
call dld
mov ax,dataOffset ExpC1
cCall DMUL,<ax>
lea bx,LOG_HI
call dst
mov ax,word ptr [pdAcc+of_exp] ; get exponent
and ax,expmask
shl ax,1 ; shift into highest bits
mov [ROUND_EXP],ax ; set round threshold
call dlddi
mov ax,dataOffset numOne
cCall DSUB,<ax> ; AC = Y-1
pop ax
mov [ROUND_FLAG],al ; set special round flag for divide
cCall DDIV2,<di> ; AC = 2*(Y-1)/(Y+1) (trick divide)
mov bx,dataOffset LogATab
mov cx,dataOffset LogBTab
call z3p_q ; z^3*A(z*z)/B(z*z)
mov ax,dataOffset AC_LO
cCall DADD,<ax>
lea si,LOG_LO
cCall DADD,<si> ; LOG_LO = XN*C2+lo(S)+S*r(S^2)
ret
; %%Function:LN %%Owner:bryanl
cProc LN,<PUBLIC,FAR>,<si,di>
cBegin
cCall LOGNAT
cEnd
;*** EXP - exponential function
; %%Function:ETOX %%Owner:bryanl
cProc ETOX,<PUBLIC,NEAR>
cBegin
call ResetSbTrans
mov di,dataOffset ArgTran ; save X in argtran
call dstdi
call EXPrange ; check for proper range
MOV AX,word ptr [SI+of_exp] ; get exponent
AND AX,expmask ; mask off sign, hi mantissa
CMP AX,expbias-((manbits+1) shl expshft) ; less than 2^(-54)
jae exp1
;
; Return ONE
;
mov bx,dataOffset numOne
call dld
jmp short ExpRet
;
; Return Zero
;
retzero:
mov di,dataOffset pdAcc
push ss
pop es
xor ax,ax
stosw
stosw
stosw
stosw
jmp short ExpRet
;
; Overflow
;
ovrflw2:
pop ax ; toss one more level off stack
ovrflw:
mov [fError],OverErr
jmp short ExpRet
;
; No errors, proceed
;
exp1:
CALL EXPM1
EXPadjust: ; finish up EXP
PUSH AX ; save integer part
mov ax,dataOffset numHalf
cCall DADD,<ax> ; AC = 0.5+g*P(z)/(Q(z)-g*P(z))
POP AX ; restore n
inc ax
mov cl,expshft
sal ax,cl
add word ptr [si+of_exp],ax ; adjust exponent
expRet:
cEnd
EXPM1:
mov di,dataOffset ILNinterval
cCall DMUL,<di> ; x/ln(interval)
mov al,[si+of_sgn] ; get sign
mov [SgnTrig],al
and byte ptr [si+of_sgn],01111111b ; make it positive
mov ax,dataOffset numHalf
cCall DADD,<ax> ; round to nearest int
cCall FIX ; get the int
test [SgnTrig],10000000b ; test the sign
jz expos
neg ax
expos:
call LNreduce ; reduce ARG by ax*LN(2)
EXPM1reduced: ; compute (EXP(X)-1)/2
push ax ; save n
mov bx,dataOffset ExpPTab
mov cx,dataOffset ExpQTab
call p_q
mov si,dataOffset TempTran3 ; point to z
cCall DMUL,<si> ; ac = z*P(z*z)
mov bx,si
call dst ; Temp3 = z*P(z*z)
cCall DNEG ; ac = -z*P(z*z)
mov di,dataOffset TempTran1 ; point to Q(z*z)
cCall DADD,<di> ; ac = Q(z*z)-z*P(z*z)
call dstdi ; Temp1 = ac
mov bx,si
call dld ; ac = z*P(z*z)
cCall DDIV,<di> ; AC = z*P(z*z)/(Q(z*z)-z*P(z*z))
mov si,dataOffset pdAcc ; si = ac
pop ax ; get integer part
ret
LNreduce: ; reduce ARG by LN(2)
push ax ; save n
cCall SFLOAT,<ax> ; XN
mov bx,dataOffset ExpC1
mov cx,dataOffset ExpC2
call REDUCE
pop ax ; get integer part
ret
overflowrange:
mov ax,transOffset ovrflw2 ; overflow on upper limit
jmp short range
EXPrange:
mov bx,transOffset retzero ; standard returns for EXP
mov ax,transOffset ovrflw ; overflow on upper limit
range:
push ax
push bx
mov ax,dataOffset LNXMAX
cCall DSUB,<ax>
cmp byte ptr [si+of_sgn],0
jg rangeax ; overflow on upper limit
mov di,dataOffset ArgTran
call dlddi
mov ax,dataOffset LNXMIN
cCall DSUB,<ax>
cmp byte ptr [si+of_sgn],0 ; check lower limit
jl rangebx
call dlddi
add sp,4 ; clean ax,bx off stack
ret
rangeax:
pop bx
pop ax
pop bx ; toss return address
jmp ax ; return for x > LNXMAX
rangebx:
pop bx
pop ax
pop ax ; toss return address
jmp bx ; return for x < LNXMIN
; %%Function:EXP %%Owner:bryanl
cProc EXP,<PUBLIC,FAR>,<si,di>
cBegin
cCall ETOX
cEnd
;*** SQR - Double precision square root
;
; This routine takes the square root of the number in the accumulator,
; and leaves the result in the accumulator.
;
; Algorithm: x is initially adjusted so that the exponent is even
; (when the exponent is odd the exponent is incremented and the
; mantissa is shifted right one bit). The exponent is then divided
; by two and resaved. A single word estimate of y (the root of
; x) accurate to 5 bits is produced using a wordlength implementation
; of a linear polynomial approximation of sqrt x. Three or four
; Newton-Raphson iterations are then computed as follows:
;
; 1) qa*ya+r1a=xa:0h,ya=(ya+qa)/2
; 2) qa*ya+r1a=xa:xb,ya=(ya+qa)/2
; 3) qa*ya+r1a=xa:xb,qb*ya+r2a=r1a:xc,ya:yb=(ya:yb+qa:qb)/2
; *** iteration 4 implemented with standard divide ***
; 4) qa*ya+r1a=xa:xb,p1a:p1b=qa*yb,
; if p1a<r1a continue
; if p1a=r1a
; if p1b=xc continue else r1a=r1a+ya,qa=qa-1 endif,
; else r1a=r1a+ya,qa=qa-1,p1a:p1b=p1a:p1b-yb endif,
; r1a:r1b=r1a:xc-p1a:p1b,
; qb:ya+r2a=r1a:r1b,p2a:p2b=qb*yb,
; if p2a<r2a continue
; if p2a=r2a
; if p2b=xd continue else r2a=r2a+ya,qb=qb-1 endif,
; else r2a=r2a+ya,qb=qb-1,p2a:p2b=p2a:p2b-yb endif,
; r2a:r2b=r2a:xd-p2a:p2b,
; qc*ya+r3a=r2a:r2b,p3a:p3b=qc*yb,
; if p3a>=r3a then r3a=r3a+ya,qc=qc-1 endif,
; r3a=r3a-p3a,qd*ya+r4a=r3a:0h,
; ya:yb:yc:yd=(ya:yb:0h:0h+qa:qb:qc:qd)/2
; %%Function:SQRT %%Owner:bryanl
cProc SQRT,<PUBLIC,NEAR,ATOMIC>
cBegin
push bp
call ResetSbTrans
mov di,dataOffset TempTran1
MOV AX,[SI+6]
MOV BH,AL ; Save hi mantissa
TEST AX,07FF0h ; Test exponent
jz sqrxv ; Zero - return 0
AND AX,0FFF0h ; Mask off hi mantissa
jns sqr1 ; Negative - error
mov [fError],TransErr ; set transcendental error
sqrxv: jmp sqrx
sqr1:
SUB AX,03FE0h ; Remove excess from exponent
MOV BL,[SI+5]
MOV CX,[SI+3]
MOV DX,[SI+1] ;get first three mantissa words of x
SHL DX,1
RCL CX,1
RCL BX,1
SHL DX,1
RCL CX,1
RCL BX,1
SHL DX,1
RCL CX,1
RCL BX,1
OR BH,080h ;implied leading 1 now explicit
TEST AL,16 ;if exponent is even
JZ EXPEVEN ; bypass adjust
ADD AX,16 ;increment exponent
SHR BX,1
RCR CX,1
RCR DX,1 ;divide mantissa by 2
EXPEVEN:
SAR AX,1 ;divide exponent by 2
ADD AX,03FE0h ; Bias the exponent
MOV [DI+6],AX ; Store exponent of y
CMP BX,0FFFEH ;if mantissa < 0.FFFEh
JB NOTNEARONE1 ; perform main root routine
STC ;otherwise x to become (1+x)/2
JMP SHORT SINGLEDONE ;single precision complete
NOTNEARONE1:
PUSH DX ;save third mantissa word
MOV AX,0AFB1H ;AX=.AFB1h
MUL BX ;DX=.AFB1h*x
MOV BP,057D8H ;BP=.57D8h
ADD BP,DX ;BP=.AFB1h*x+.57D8h
JNC NORMEST ;if y is more than one
MOV BP,0FFFFH ; replace y with .FFFFh
NORMEST:
MOV DX,BX
XOR AX,AX ;load divide regs with xa:0h
DIV BP ;qa*ya+r1a=xa:0h
ADD BP,AX ;ya=ya+qa
RCR BP,1 ;ya=ya/2
MOV DX,BX
MOV AX,CX ;load divide regs with xa:xb
DIV BP ;qa*ya+r1a=xa:xb
STC ;add one to qa for better rounding
ADC BP,AX ;ya=ya+qa
RCR BP,1 ;ya=ya/2
MOV DX,BX
MOV AX,CX ;load divide regs with xa:xb
DIV BP ;qa*ya+r1a=xa:xb
MOV SI,AX ;save qa
POP AX ;load divide regs with r1a:xc
DIV BP ;qb*ya+r2a=r1a:xc
MOV BX,BP
MOV CX,AX ;move qa:qb
;no need to round with floating point operations following
; ADD CX,1 ;add one to qa:qb for better rounding
; ADC BX,SI ;ya:yb=ya:0h+qa:qb
ADD BX,SI ;ya:yb=ya:0h+qa:qb
SINGLEDONE:
;We now have BX:CX = (ya:yb)*2=ya:0h+qa:qb
XOR AX,AX
SHL CX,1
RCL BX,1
RCL AX,1
SHL CX,1
RCL BX,1
RCL AX,1
SHL CX,1
RCL BX,1
RCL AX,1
SHL CX,1
RCL BX,1
RCL AX,1 ;back to IEEE format
OR [DI+6],AL
MOV [DI+4],BX
MOV [DI+2],CX
MOV WORD PTR [DI],0 ;save ya:yb:0h:0h
cCall DDIV,<di> ;accumulator (x)=x/y
cCall DADD,<di> ;accumulator (x)=y+x/y
SUB WORD PTR [pdAcc+of_exp],16 ;accumulator (x)=(y+x/y)/2
sqrx:
pop bp
cEnd
; %%Function:SQR %%Owner:bryanl
cProc SQR,<PUBLIC,FAR>,<si,di>
cBegin
cCall SQRT
cEnd
;*** special common subexpression subroutine for transcendentals
ResetSbTrans:
mov ax,sbDds
cCall SetSbCur,<ax>
mov si,dataOffset pdAcc
ret
;*** reduce - perform high precision reduction
;
; Function:
; compute ac = (x - xn*c1) - xn*c2
;
; Inputs:
; ARG = x
; AC = xn
; BX = c1
; CX = c2
REDUCE:
push bx
push cx
mov si,dataOffset TempTran1
mov bx,si
call dst ; xnT = xn (TempTran1)
cCall DMUL ;,<cx> ; ac = xn*c2
mov bx,dataOffset TempTran2
call dst
mov bx,si
call dld ; ac = xn
cCall DMUL ;,<bx> ; ac = xn*c1
cCall DNEG ; ac = -xn*c1
mov ax,dataOffset ArgTran
cCall DADD,<ax> ; ac = arg-xn*c1
mov ax,dataOffset TempTran2
cCall DSUB,<ax> ; ac = arg-xn*c1-xn*c2
ret
; EVEN:
mov ax,[si+of_exp] ; get exponent and sign
mov ch,al ; save hign mantissa byte
and ax,expmask ; test for 0
jz evenxit ; yes - return even
sub ax,expbias-((7-expshft) shl expshft)
cmp ax,(manbits-1+7-expshft) shl expshft
ja evenxit ; too big - assume even
mov cl,expshft
shr ax,cl
mov cl,al
and cl,7 ; get bit within byte
inc cx ; bump shift count by 1
shr al,1
shr al,1
shr al,1
cbw
mov bx,ax
neg bx ; bx = byte offset
or ch,1 shl expshft ; set implied mantissa bit
xchg [si+of_exp],ch ; swap with memory
mov al,[si+bx+of_exp]
shl al,cl ; bit in 'C', to tell us even or odd
mov [si+of_exp],ch ; restore high mantissa byte
evenxit:
ret
; z2p_q
;
; Function:
; compute z*z*P(z*z)/Q(z*z)
z2p_q:
push cx
call p_q
pop cx
jcxz nodiv
mov ax,dataOffset TempTran1
cCall DDIV,<ax> ; P(z*z)/Q(z*z)
nodiv:
mov di,dataOffset TempTran2
cCall DMUL,<di>
ret
; z3p_q
;
; Function:
; compute z*z*z*P(z*z)/Q(z*z)
z3p_q:
call z2p_q
mov di,dataOffset TempTran3
cCall DMUL,<di> ; ac = z^3*P(z*z)/Q(z*z)
ret
; p_q
;
; Function:
; computes
; z = ac
; zz = z*z
; if Q
; pzz = p(zz)
; ac = q(zz)
; else
; ac = p(zz)
;
; Inputs:
; BX = address of P table
; CX = address of Q table
p_q:
push bx
push cx
mov di,dataOffset TempTran3 ; temp3=z
call dstdi
cCall DMUL,<di>
mov di,dataOffset TempTran2
call dstdi ; temp2 = z*z
pop bx ; get Q table
or bx,bx
jz noq
call poly
mov bx,dataOffset TempTran1
call dst ; TempTran1 = Q(z*z)
mov bx,dataOffset TempTran2
call dld
noq: pop bx
; call poly ; ac = P(z*z)
; ret
;*** POLY - Evaluate DP polynomial
;
; Inputs:
; BX = Address of list of coefficients. First byte in list is number of
; coefficients, followed by the constants ordered from highest
; power to lowest.
; AC = argument.
; Function:
; Evaluate polynomial by Horner's method
; Outputs:
; Result in AC.
; Registers:
; ALL destroyed.
POLY:
push ss
pop es
mov si,dataOffset pdAcc
mov di,dataOffset ArgTran
movsw
movsw
movsw
movsw
mov si,bx ; Point to coefficient table
lodsw ; Number of coefficients
xchg ax,cx ; Count in CX
or cx,cx ; check for implied 1.0 as 1st
jns polymove ; no - normal poly
xor ch,ch ; clear flag so we can count down
push cx ; save count
jmp short polyone ; jump into middle of poly loop
polymove:
mov di,dataOffset pdAcc ; Move first coefficient into AC
movsw
movsw
movsw
movsw
jcxz polyxit
polyloop:
push cx
mov ax,dataOffset ArgTran
cCall DMUL,<ax> ; Multiply by argument
polyone: ; alternate entry for implied 1.0
cCall DADD,<si> ; Add coefficient
pop cx
add si,8 ; Bump to next coefficient
loop polyloop
polyxit:
ret
;
; Load num pointed by AX into pdacc
;
dlddi:
mov bx,di
dld:
mov ax,[bx ]
mov [pdAcc ],ax
mov ax,[bx+2]
mov [pdAcc+2],ax
mov ax,[bx+4]
mov [pdAcc+4],ax
mov ax,[bx+6]
mov [pdAcc+6],ax
ret
;
; Load pdacc into num pointed to by AX
;
dstdi:
mov bx,di
dst:
mov ax,[pdAcc ]
mov [bx ],ax
mov ax,[pdAcc+2]
mov [bx+2],ax
mov ax,[pdAcc+4]
mov [bx+4],ax
mov ax,[pdAcc+6]
mov [bx+6],ax
ret
rgnumKonst DQ 03ff0000000000000R ; 1
DQ 04000000000000000R ; 2
DQ 0bff0000000000000R ; -1
DQ 04024000000000000R ; 10
DQ 04059000000000000R ; 100
DQ 040026bb1bbb55516R ; Ln(10)
DQ 03fe0000000000000R ; 1/2
DQ 0cca8e45e1df3b078R ; large negative for sort (-2*10**60)
; %%Function:DLdC %%Owner:bryanl
cProc DLdC,<PUBLIC,FAR>,<si,di,ds>
ParmW ic
cBegin
mov si, ic
mov cl, 3
shl si, cl
add si, offset rgnumKonst
mov di, dataOffset pdAcc
push ds
pop es
push cs
pop ds
movsw
movsw
movsw
movsw
cEnd
ifdef NOTUSED
; The next two routines are no longer required by the mathpack.
; %%Function:DldHp %%Owner:NOTUSED
cProc DldHp,<PUBLIC,FAR>
; ParmD hp
cBegin nogen
mov bx,sp
push si
mov si,[bx+4] ; get offset of huge pointer
mov bx,[bx+6]
call GetPSfromSB
cld
lods word ptr es:[si]
mov word ptr [pdAcc ],ax
lods word ptr es:[si]
mov word ptr [pdAcc +2],ax
lods word ptr es:[si]
mov word ptr [pdAcc +4],ax
lods word ptr es:[si]
mov word ptr [pdAcc +6],ax
pop si
ret 4
cEnd nogen
; %%Function:DstHp %%Owner:NOTUSED
cProc DstHp,<PUBLIC,FAR>
; ParmD hp
cBegin nogen
mov bx,sp
push si
push di
mov di,[bx+4] ; get offset of huge pointer
mov bx,[bx+6]
call GetPSfromSB
mov si,dataOffset pdAcc
cld
movsw
movsw
movsw
movsw
pop di
pop si
ret 4
cEnd nogen
endif ;NOTUSED
GetPSfromSB:
shl bx,1
mov ax,[mpsbps+bx]
mov es,ax
shr ax,1
jc mrs
MyReloadSB:
push dx
push bx
push cx
cCall ReloadSb,<>
pop cx
pop bx
pop dx
mrs: ret
sEnd trans
end
|
dino/lcs/enemy/82.asm
|
zengfr/arcade_game_romhacking_sourcecode_top_secret_data
| 6 |
93454
|
copyright zengfr site:http://github.com/zengfr/romhack
00042A move.l D1, (A0)+
00042C dbra D0, $42a
004C5C move.b #$4, ($82,A0)
004C62 lea ($e0,A0), A0 [enemy+82]
004D38 move.l D0, (A4)+
004D3A move.l D0, (A4)+
009B30 tst.b ($82,A6)
009B34 bne $9b46 [123p+ 82, enemy+82]
009C46 tst.b ($82,A6)
009C4A bne $9c5c [123p+ 82, enemy+82]
009D16 tst.b ($82,A6)
009D1A bne $9d34 [enemy+82]
012CD6 cmpi.b #$c, ($82,A6)
012CDC beq $12cf6 [123p+ 82, enemy+82, item+82]
016B1C tst.b ($82,A0) [123p+ 68]
016B20 bne $16b34 [123p+ 82, enemy+82]
01D7A0 tst.b ($82,A6)
01D7A4 bne $1d7aa [enemy+82]
01D836 tst.b ($82,A6)
01D83A bne $1d840 [enemy+82]
056ACE move.w ($744,A5), ($82,A6) [enemy+8A, enemy+8C]
056AD4 move.w ($7e4,A5), ($84,A6) [enemy+82]
056BB0 move.w ($82,A6), D0
056BB4 move.w ($744,A5), D1 [enemy+82]
056BC6 move.w ($744,A5), ($82,A6) [enemy+ 8]
056BCC moveq #$0, D0 [enemy+82]
056BF2 move.w ($82,A6), D0
056BF6 move.w ($744,A5), D1 [enemy+82]
056C08 move.w ($744,A5), ($82,A6) [enemy+ 8]
056C0E moveq #$0, D0 [enemy+82]
092FFA tst.b ($82,A0)
092FFE beq $9300c [123p+ 82, enemy+82]
0944AC tst.b ($82,A0)
0944B0 bne $944ca [123p+ 82, enemy+82]
0AAACA move.l (A0), D2
0AAACC move.w D0, (A0) [123p+11A, 123p+11C, 123p+11E, 123p+120, 123p+122, 123p+124, 123p+126, 123p+128, 123p+12A, enemy+BC, enemy+C0, enemy+C2, enemy+C4, enemy+CC, enemy+CE, enemy+D0, enemy+D2, enemy+D4, enemy+D6, enemy+D8, enemy+DA, enemy+DE, item+86, item+88, item+8A, item+98, item+9A, item+9C, item+9E, item+A0, item+A2, item+A4, item+A6, scr1]
0AAACE move.w D0, ($2,A0)
0AAAD2 cmp.l (A0), D0
0AAAD4 bne $aaafc
0AAAD8 move.l D2, (A0)+
0AAADA cmpa.l A0, A1 [123p+11A, 123p+11C, 123p+11E, 123p+120, 123p+122, 123p+124, 123p+126, 123p+128, 123p+12A, enemy+BC, enemy+C0, enemy+C2, enemy+C4, enemy+CC, enemy+CE, enemy+D0, enemy+D2, enemy+D4, enemy+D6, enemy+D8, enemy+DA, enemy+DE, item+86, item+88, item+8A, item+98, item+9A, item+9C, item+9E, item+A0, item+A2, item+A4, item+A6, scr1]
0AAAE6 move.l (A0), D2
0AAAE8 move.w D0, (A0) [123p+11A, 123p+11C, 123p+11E, 123p+120, 123p+122, 123p+124, 123p+126, 123p+128, 123p+12A, enemy+BC, enemy+C0, enemy+C2, enemy+C4, enemy+CC, enemy+CE, enemy+D0, enemy+D2, enemy+D4, enemy+D6, enemy+D8, enemy+DA, enemy+DE, item+86, item+88, item+8A, item+98, item+9A, item+9C, item+9E, item+A0, item+A2, item+A4, item+A6, scr1]
0AAAF4 move.l D2, (A0)+
0AAAF6 cmpa.l A0, A1 [123p+11A, 123p+11C, 123p+11E, 123p+120, 123p+122, 123p+124, 123p+126, 123p+128, 123p+12A, enemy+BC, enemy+C0, enemy+C2, enemy+C4, enemy+CC, enemy+CE, enemy+D0, enemy+D2, enemy+D4, enemy+D6, enemy+D8, enemy+DA, enemy+DE, item+86, item+88, item+8A, item+98, item+9A, item+9C, item+9E, item+A0, item+A2, item+A4, item+A6, scr1]
copyright zengfr site:http://github.com/zengfr/romhack
|
Transynther/x86/_processed/NONE/_xt_/i7-7700_9_0x48.log_21829_1585.asm
|
ljhsiun2/medusa
| 9 |
28313
|
<filename>Transynther/x86/_processed/NONE/_xt_/i7-7700_9_0x48.log_21829_1585.asm
.global s_prepare_buffers
s_prepare_buffers:
push %r10
push %r13
push %r14
push %r8
push %rbp
push %rcx
push %rdi
push %rsi
lea addresses_UC_ht+0xbd13, %r10
nop
nop
nop
dec %rcx
mov (%r10), %r14d
nop
nop
nop
cmp $28803, %r13
lea addresses_A_ht+0x192d3, %r8
and $37856, %rbp
mov $0x6162636465666768, %r13
movq %r13, (%r8)
nop
nop
nop
nop
add $33501, %r8
lea addresses_WT_ht+0x6513, %rsi
lea addresses_D_ht+0x9513, %rdi
nop
nop
nop
add %r8, %r8
mov $57, %rcx
rep movsq
nop
nop
nop
and $351, %r10
lea addresses_WC_ht+0x3513, %rbp
nop
nop
nop
add %r14, %r14
mov (%rbp), %r8
nop
nop
nop
nop
cmp %rsi, %rsi
lea addresses_normal_ht+0x774e, %r14
nop
cmp %rsi, %rsi
mov $0x6162636465666768, %r10
movq %r10, %xmm4
vmovups %ymm4, (%r14)
nop
nop
add $36, %rsi
lea addresses_UC_ht+0x15f11, %rsi
lea addresses_WT_ht+0x1c773, %rdi
cmp %rbp, %rbp
mov $4, %rcx
rep movsw
nop
nop
nop
dec %r13
lea addresses_D_ht+0x6d63, %rsi
lea addresses_D_ht+0xad13, %rdi
nop
sub $39346, %r14
mov $101, %rcx
rep movsl
nop
nop
nop
nop
inc %r10
lea addresses_D_ht+0xb993, %rsi
nop
nop
xor %r13, %r13
movb (%rsi), %cl
nop
nop
xor %r14, %r14
lea addresses_WC_ht+0x727f, %rcx
nop
nop
nop
nop
sub $28071, %r14
mov $0x6162636465666768, %rbp
movq %rbp, (%rcx)
nop
nop
nop
nop
nop
xor $47424, %rsi
lea addresses_normal_ht+0x179f3, %r14
clflush (%r14)
nop
nop
nop
nop
nop
inc %rcx
mov $0x6162636465666768, %r8
movq %r8, %xmm3
vmovups %ymm3, (%r14)
nop
nop
nop
nop
nop
sub $54432, %rsi
lea addresses_normal_ht+0x1b31f, %r8
nop
nop
and $64626, %r10
movb $0x61, (%r8)
nop
nop
nop
nop
nop
add %r14, %r14
lea addresses_A_ht+0xaa6d, %r14
nop
inc %rsi
mov (%r14), %r13
nop
nop
xor %rcx, %rcx
pop %rsi
pop %rdi
pop %rcx
pop %rbp
pop %r8
pop %r14
pop %r13
pop %r10
ret
.global s_faulty_load
s_faulty_load:
push %r10
push %r12
push %r8
push %r9
push %rbp
push %rcx
push %rdx
// Load
lea addresses_PSE+0x5513, %r12
nop
nop
nop
nop
nop
xor %rdx, %rdx
movaps (%r12), %xmm1
vpextrq $1, %xmm1, %r9
nop
nop
nop
nop
nop
and %rdx, %rdx
// Store
lea addresses_WC+0x3d13, %r8
nop
nop
nop
nop
xor %r12, %r12
movb $0x51, (%r8)
nop
xor $5843, %r9
// Store
lea addresses_D+0xb653, %r9
nop
nop
nop
xor $50437, %rcx
movl $0x51525354, (%r9)
nop
nop
nop
nop
inc %rcx
// Store
lea addresses_D+0x1b253, %r9
clflush (%r9)
nop
inc %r10
movb $0x51, (%r9)
nop
nop
nop
add $56100, %r8
// Store
lea addresses_RW+0x17307, %r9
nop
nop
nop
and $19175, %r12
movl $0x51525354, (%r9)
nop
nop
nop
inc %r10
// Faulty Load
lea addresses_PSE+0x5513, %r8
nop
nop
nop
add %r10, %r10
movb (%r8), %r12b
lea oracles, %rbp
and $0xff, %r12
shlq $12, %r12
mov (%rbp,%r12,1), %r12
pop %rdx
pop %rcx
pop %rbp
pop %r9
pop %r8
pop %r12
pop %r10
ret
/*
<gen_faulty_load>
[REF]
{'OP': 'LOAD', 'src': {'type': 'addresses_PSE', 'AVXalign': False, 'congruent': 0, 'size': 32, 'same': False, 'NT': False}}
{'OP': 'LOAD', 'src': {'type': 'addresses_PSE', 'AVXalign': True, 'congruent': 0, 'size': 16, 'same': True, 'NT': False}}
{'OP': 'STOR', 'dst': {'type': 'addresses_WC', 'AVXalign': False, 'congruent': 11, 'size': 1, 'same': False, 'NT': False}}
{'OP': 'STOR', 'dst': {'type': 'addresses_D', 'AVXalign': False, 'congruent': 5, 'size': 4, 'same': False, 'NT': False}}
{'OP': 'STOR', 'dst': {'type': 'addresses_D', 'AVXalign': False, 'congruent': 3, 'size': 1, 'same': False, 'NT': False}}
{'OP': 'STOR', 'dst': {'type': 'addresses_RW', 'AVXalign': False, 'congruent': 2, 'size': 4, 'same': False, 'NT': False}}
[Faulty Load]
{'OP': 'LOAD', 'src': {'type': 'addresses_PSE', 'AVXalign': False, 'congruent': 0, 'size': 1, 'same': True, 'NT': False}}
<gen_prepare_buffer>
{'OP': 'LOAD', 'src': {'type': 'addresses_UC_ht', 'AVXalign': False, 'congruent': 8, 'size': 4, 'same': False, 'NT': False}}
{'OP': 'STOR', 'dst': {'type': 'addresses_A_ht', 'AVXalign': False, 'congruent': 4, 'size': 8, 'same': False, 'NT': False}}
{'OP': 'REPM', 'src': {'type': 'addresses_WT_ht', 'congruent': 11, 'same': False}, 'dst': {'type': 'addresses_D_ht', 'congruent': 11, 'same': False}}
{'OP': 'LOAD', 'src': {'type': 'addresses_WC_ht', 'AVXalign': False, 'congruent': 11, 'size': 8, 'same': False, 'NT': False}}
{'OP': 'STOR', 'dst': {'type': 'addresses_normal_ht', 'AVXalign': False, 'congruent': 0, 'size': 32, 'same': False, 'NT': False}}
{'OP': 'REPM', 'src': {'type': 'addresses_UC_ht', 'congruent': 1, 'same': False}, 'dst': {'type': 'addresses_WT_ht', 'congruent': 2, 'same': True}}
{'OP': 'REPM', 'src': {'type': 'addresses_D_ht', 'congruent': 4, 'same': True}, 'dst': {'type': 'addresses_D_ht', 'congruent': 10, 'same': False}}
{'OP': 'LOAD', 'src': {'type': 'addresses_D_ht', 'AVXalign': False, 'congruent': 5, 'size': 1, 'same': False, 'NT': True}}
{'OP': 'STOR', 'dst': {'type': 'addresses_WC_ht', 'AVXalign': False, 'congruent': 2, 'size': 8, 'same': False, 'NT': False}}
{'OP': 'STOR', 'dst': {'type': 'addresses_normal_ht', 'AVXalign': False, 'congruent': 2, 'size': 32, 'same': False, 'NT': False}}
{'OP': 'STOR', 'dst': {'type': 'addresses_normal_ht', 'AVXalign': True, 'congruent': 2, 'size': 1, 'same': False, 'NT': False}}
{'OP': 'LOAD', 'src': {'type': 'addresses_A_ht', 'AVXalign': False, 'congruent': 1, 'size': 8, 'same': False, 'NT': False}}
{'33': 21829}
33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33 33
*/
|
ExampleScript.applescript
|
fruitsamples/SimpleCarbonAppleScript
| 0 |
4011
|
<filename>ExampleScript.applescript<gh_stars>0
(*
File: ExampleScript.applescript
Abstract: an example script for exercising the scripting
commands implemented in the Astronaut application.
Version: 1.0
(c) Copyright 2007 Apple Computer, Inc. All rights reserved.
IMPORTANT: This Apple software is supplied to
you by Apple Computer, Inc. ("Apple") in
consideration of your agreement to the following
terms, and your use, installation, modification
or redistribution of this Apple software
constitutes acceptance of these terms. If you do
not agree with these terms, please do not use,
install, modify or redistribute this Apple
software.
In consideration of your agreement to abide by
the following terms, and subject to these terms,
Apple grants you a personal, non-exclusive
license, under Apple's copyrights in this
original Apple software (the "Apple Software"),
to use, reproduce, modify and redistribute the
Apple Software, with or without modifications, in
source and/or binary forms; provided that if you
redistribute the Apple Software in its entirety
and without modifications, you must retain this
notice and the following text and disclaimers in
all such redistributions of the Apple Software.
Neither the name, trademarks, service marks or
logos of Apple Computer, Inc. may be used to
endorse or promote products derived from the
Apple Software without specific prior written
permission from Apple. Except as expressly
stated in this notice, no other rights or
licenses, express or implied, are granted by
Apple herein, including but not limited to any
patent rights that may be infringed by your
derivative works or by other works in which the
Apple Software may be incorporated.
The Apple Software is provided by Apple on an "AS
IS" basis. APPLE MAKES NO WARRANTIES, EXPRESS OR
IMPLIED, INCLUDING WITHOUT LIMITATION THE IMPLIED
WARRANTIES OF NON-INFRINGEMENT, MERCHANTABILITY
AND FITNESS FOR A PARTICULAR PURPOSE, REGARDING
THE APPLE SOFTWARE OR ITS USE AND OPERATION ALONE
OR IN COMBINATION WITH YOUR PRODUCTS.
IN NO EVENT SHALL APPLE BE LIABLE FOR ANY
SPECIAL, INDIRECT, INCIDENTAL OR CONSEQUENTIAL
DAMAGES (INCLUDING, BUT NOT LIMITED TO,
PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS
OF USE, DATA, OR PROFITS; OR BUSINESS
INTERRUPTION) ARISING IN ANY WAY OUT OF THE USE,
REPRODUCTION, MODIFICATION AND/OR DISTRIBUTION OF
THE APPLE SOFTWARE, HOWEVER CAUSED AND WHETHER
UNDER THEORY OF CONTRACT, TORT (INCLUDING
NEGLIGENCE), STRICT LIABILITY OR OTHERWISE, EVEN
IF APPLE HAS BEEN ADVISED OF THE POSSIBILITY OF
SUCH DAMAGE.
*)
tell application "Astronaut"
-- the following are expression you can evaluate
-- to exercise the properties of the Astronaut app
-- retrieve all the properties
properties
-- set the title
set title to "Ron"
-- set the helmet size
set helmet to 8
-- set the beverage
set beverage to "Tea"
-- set preferred hand
set preferred hand to Right Hand
-- set the boots
set boots to true
-- run the simple command
do simple command
-- run a command that receives a direct parameter
do direct parameter command "the parameter"
-- run a command that receives a direct parameter
do command with args "the parameter" preferred hand Left Hand ivalue 7 prose "a quick brown fox jumps over the lazy dog" rvalue 12 without blinking
end tell
|
oeis/190/A190965.asm
|
neoneye/loda-programs
| 11 |
178386
|
<reponame>neoneye/loda-programs
; A190965: a(n) = 4*a(n-1) - 6*a(n-2), with a(0)=0, a(1)=1.
; Submitted by <NAME>
; 0,1,4,10,16,4,-80,-344,-896,-1520,-704,6304,29440,79936,143104,92800,-487424,-2506496,-7101440,-13366784,-10858496,36766720,212217856,628271104,1239777280,1189482496,-2680733696,-17859829760,-55354916864,-114260688896,-124913254400,185911115776,1493123989504,4857029263360,10469373116416,12735316885504,-11874971156480,-123911785938944,-424397316816896,-954118551633920,-1270090305634304,644350087266304,10197942182871040,36925668207886336,86515019734319104,124506069689958400,-21065839646081024
mov $1,1
mov $2,$0
lpb $2
sub $2,1
mul $3,3
sub $1,$3
mul $3,2
add $3,$1
lpe
mov $0,$3
|
boards/OpenMV2/src/openmv.adb
|
morbos/Ada_Drivers_Library
| 2 |
15265
|
<gh_stars>1-10
------------------------------------------------------------------------------
-- --
-- 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 HAL.SPI;
package body OpenMV is
---------------------
-- Initialize_LEDs --
---------------------
procedure Initialize_LEDs is
Conf : GPIO_Port_Configuration;
begin
Enable_Clock (All_LEDs);
Conf.Mode := Mode_Out;
Conf.Output_Type := Push_Pull;
Conf.Speed := Speed_100MHz;
Conf.Resistors := Floating;
Configure_IO (All_LEDs, Conf);
end Initialize_LEDs;
-----------------
-- Set_RGB_LED --
-----------------
procedure Set_RGB_LED (C : LED_Color) is
begin
-- Clear to turn on LED
-- Set to turn off
case C is
when White | Red | Yellow | Magenta =>
Clear (Red_LED);
when others =>
Set (Red_LED);
end case;
case C is
when White | Green | Yellow | Cyan =>
Clear (Green_LED);
when others =>
Set (Green_LED);
end case;
case C is
when White | Cyan | Blue | Magenta =>
Clear (Blue_LED);
when others =>
Set (Blue_LED);
end case;
end Set_RGB_LED;
----------------
-- Turn_On_IR --
----------------
procedure Turn_On_IR is
begin
Set (IR_LED);
end Turn_On_IR;
-----------------
-- Turn_Off_IR --
-----------------
procedure Turn_Off_IR is
begin
Clear (IR_LED);
end Turn_Off_IR;
---------------------------
-- Initialize_Shield_SPI --
---------------------------
procedure Initialize_Shield_SPI is
SPI_Conf : STM32.SPI.SPI_Configuration;
GPIO_Conf : STM32.GPIO.GPIO_Port_Configuration;
begin
STM32.Device.Enable_Clock (Shield_SPI_Points);
GPIO_Conf.Speed := STM32.GPIO.Speed_100MHz;
GPIO_Conf.Mode := STM32.GPIO.Mode_AF;
GPIO_Conf.Output_Type := STM32.GPIO.Push_Pull;
GPIO_Conf.Resistors := STM32.GPIO.Pull_Down; -- SPI low polarity
STM32.GPIO.Configure_IO (Shield_SPI_Points, GPIO_Conf);
STM32.GPIO.Configure_Alternate_Function
(Shield_SPI_Points,
GPIO_AF_SPI2_5);
STM32.Device.Enable_Clock (Shield_SPI);
STM32.SPI.Disable (Shield_SPI);
SPI_Conf.Direction := STM32.SPI.D2Lines_FullDuplex;
SPI_Conf.Mode := STM32.SPI.Master;
SPI_Conf.Data_Size := HAL.SPI.Data_Size_8b;
SPI_Conf.Clock_Polarity := STM32.SPI.Low;
SPI_Conf.Clock_Phase := STM32.SPI.P1Edge;
SPI_Conf.Slave_Management := STM32.SPI.Software_Managed;
SPI_Conf.Baud_Rate_Prescaler := STM32.SPI.BRP_2;
SPI_Conf.First_Bit := STM32.SPI.MSB;
SPI_Conf.CRC_Poly := 7;
STM32.SPI.Configure (Shield_SPI, SPI_Conf);
STM32.SPI.Enable (Shield_SPI);
end Initialize_Shield_SPI;
-----------------------------
-- Initialize_Shield_USART --
-----------------------------
procedure Initialize_Shield_USART (Baud : STM32.USARTs.Baud_Rates) is
Configuration : GPIO_Port_Configuration;
begin
Enable_Clock (Shield_USART);
Enable_Clock (Shield_USART_Points);
Configuration.Mode := Mode_AF;
Configuration.Speed := Speed_50MHz;
Configuration.Output_Type := Push_Pull;
Configuration.Resistors := Pull_Up;
Configure_IO (Shield_USART_Points, Configuration);
Configure_Alternate_Function (Shield_USART_Points, Shield_USART_AF);
Disable (Shield_USART);
Set_Baud_Rate (Shield_USART, Baud);
Set_Mode (Shield_USART, Tx_Rx_Mode);
Set_Stop_Bits (Shield_USART, Stopbits_1);
Set_Word_Length (Shield_USART, Word_Length_8);
Set_Parity (Shield_USART, No_Parity);
Set_Flow_Control (Shield_USART, No_Flow_Control);
Enable (Shield_USART);
end Initialize_Shield_USART;
----------------------
-- Get_Shield_USART --
----------------------
function Get_Shield_USART return not null HAL.UART.Any_UART_Port is
(USART_3'Access);
end OpenMV;
|
lib/common.asm
|
c64lib/common
| 7 |
241105
|
<filename>lib/common.asm
#importonce
.filenamespace c64lib
/*
* Why Kickassembler does not support bitwise negation on numerical values?
*
* Params:
* value: byte to be negated
*/
.function neg(value) {
.return value ^ $FF
}
.assert "neg($00) gives $FF", neg($00), $FF
.assert "neg($FF) gives $00", neg($FF), $00
.assert "neg(%10101010) gives %01010101", neg(%10101010), %01010101
/*
* Increases argument by one preserving its type (addressing mode). To be used in pseudocommands.
*
* Params:
* arg: mnemonic argument
*/
.function incArgument(arg) {
.return CmdArgument(arg.getType(), arg.getValue() + 1)
}
/*
* "Far" bne branch. Depending on the jump length it either does bne or beq/jmp trick.
*/
.macro fbne(label) {
here: // we have to add 2 to "here", because relative jump is counted right after bne xx, and this instruction takes 2 bytes
.if (here > label) {
// jump back
.if (here + 2 - label <= 128) {
bne label
} else {
beq skip
jmp label
skip:
}
} else {
// jump forward
.if (label - here - 2 <= 127) {
bne label
} else {
beq skip
jmp label
skip:
}
}
}
/*
* "Far" bmi branch. Depending on the jump length it either does bne or beq/jmp trick.
*/
.macro fbmi(label) {
here: // we have to add 2 to "here", because relative jump is counted right after bne xx, and this instruction takes 2 bytes
.if (here > label) {
// jump back
.if (here + 2 - label <= 128) {
bmi label
} else {
bpl skip
beq skip
jmp label
skip:
}
} else {
// jump forward
.if (label - here - 2 <= 127) {
bmi label
} else {
bpl skip
beq skip
jmp label
skip:
}
}
}
/*
* Convert kbytes to bytes.
*/
.function toBytes(value) {
.return value * 1024
}
.function convertHires(data) {
.var result = ""
.for(var i = 0; i < data.size(); i++) {
.var ch = data.charAt(i)
.if (ch == '.') {
.eval result = result + '0'
} else {
.eval result = result + '1'
}
}
.return result.asNumber(2)
}
.assert @"convertHires(\"........\") = 0", convertHires("........"), 0
.assert @"convertHires(\".......#\") = 1", convertHires(".......#"), 1
.assert @"convertHires(\"########\") = 255", convertHires("########"), 255
.function convertMultic(data) {
.var result = ""
.for(var i = 0; i < data.size(); i++) {
.var ch = data.charAt(i)
.if (ch == '.') .eval result = result + "00"
.if (ch == '#') .eval result = result + "11"
.if (ch == '+') .eval result = result + "01"
.if (ch == 'o') .eval result = result + "10"
}
.return result.asNumber(2)
}
.assert @"convertMultic(\"....\") = 0", convertMultic("...."), 0
.assert @"convertMultic(\"...#\") = 3", convertMultic("...#"), 3
.assert @"convertMultic(\"####\") = 255", convertMultic("####"), 255
.macro ch(data) {
.byte convertHires(data.substring(0, 8))
}
.macro cm(data) {
.byte convertMultic(data.substring(0, 4))
}
|
oeis/010/A010161.asm
|
neoneye/loda-programs
| 11 |
171128
|
<gh_stars>10-100
; A010161: Continued fraction for sqrt(89).
; Submitted by <NAME>(s2)
; 9,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2,18,2,3,3,2
mul $0,2
seq $0,10158 ; Continued fraction for sqrt(85).
mov $2,1
sub $2,$0
div $2,2
pow $2,$2
add $0,$2
|
src/VMTranslator/fixtures/ProgramFlow/FibonacciSeries/FibonacciSeries.asm
|
tuzmusic/HackManager
| 1 |
2274
|
<reponame>tuzmusic/HackManager
// COMMAND #1: push argument 1
@ARG // move to argument
D=M // store the "argument" base address
@1 // move to address representing offset
A=D+A // new addr = base addr + offset
D=M // store current memory value in D
@SP // >>> push memory value to top of stack
A=M // move to top of stack
M=D // write value of D to current location
// COMMAND #2: pop pointer 1
@SP // >> pop stack to THAT << (SP decremented above)
A=M // move to top of stack
D=M // store the top stack value into D
@THAT
M=D // write value of D to current location
// COMMAND #3: push constant 0
@0
D=A // store the current address as a value
@SP // >> push constant value (0) onto stack <<
A=M // move to top of stack
M=D // write value of D to current location
@SP // increment stack pointer
M=M+1
// COMMAND #4: pop that 0
@THAT // move to "that" pointer
D=M // store the "that" base address
@OFFSET // write value of D to "OFFSET"
M=D // write value of D to current location
@SP // >> pop stack to *OFFSET <<
M=M-1
A=M // move to top of stack
D=M // store the top stack value into D
@OFFSET
A=M // move to "OFFSET"
M=D // write value of D to current location
// COMMAND #5: push constant 1
@1
D=A // store the current address as a value
@SP // >> push constant value (1) onto stack <<
A=M // move to top of stack
M=D // write value of D to current location
@SP // increment stack pointer
M=M+1
// COMMAND #6: pop that 1
@THAT // move to "that" pointer
D=M // store the "that" base address
@1 // move to address representing offset
D=D+A // D = base addr + offset
@OFFSET // write value of D to "OFFSET"
M=D // write value of D to current location
@SP // >> pop stack to *OFFSET <<
M=M-1
A=M // move to top of stack
D=M // store the top stack value into D
@OFFSET
A=M // move to "OFFSET"
M=D // write value of D to current location
// COMMAND #7: push argument 0
@ARG // move to argument
D=M // store the "argument" base address
@0 // move to address representing offset
A=D+A // new addr = base addr + offset
D=M // store current memory value in D
@SP // >>> push memory value to top of stack
A=M // move to top of stack
M=D // write value of D to current location
@SP // increment stack pointer
M=M+1
// COMMAND #8: push constant 2
@2
D=A // store the current address as a value
@SP // >> push constant value (2) onto stack <<
A=M // move to top of stack
M=D // write value of D to current location
// COMMAND #9: sub
@SP // PREPARE Y (pop Y into D) (SP decremented above)
A=M // move to top of stack
D=M // store the top stack value into D
@SP // "pop" X
M=M-1
A=M // PREPARE X (prep X "into" M)
M=M-D // perform binary operation: sub
@SP // increment stack pointer
M=M+1
// COMMAND #10: pop argument 0
@ARG // move to "argument" pointer
D=M // store the "argument" base address
@OFFSET // write value of D to "OFFSET"
M=D // write value of D to current location
@SP // >> pop stack to *OFFSET <<
M=M-1
A=M // move to top of stack
D=M // store the top stack value into D
@OFFSET
A=M // move to "OFFSET"
M=D // write value of D to current location
(MAIN_LOOP_START.VM) // COMMAND #11: label MAIN_LOOP_START
// COMMAND #12: push argument 0
@ARG // move to argument
D=M // store the "argument" base address
@0 // move to address representing offset
A=D+A // new addr = base addr + offset
D=M // store current memory value in D
@SP // >>> push memory value to top of stack
A=M // move to top of stack
M=D // write value of D to current location
// COMMAND #13: if-goto COMPUTE_ELEMENT
@SP // save top stack value in D (SP decremented above)
A=M // move to top of stack
D=M // store the top stack value into D
@COMPUTE_ELEMENT.VM
D;JNE
// COMMAND #14: goto END_PROGRAM
@END_PROGRAM.VM
0;JMP
(COMPUTE_ELEMENT.VM) // COMMAND #15: label COMPUTE_ELEMENT
// COMMAND #16: push that 0
@THAT // move to that
D=M // store the "that" base address
@0 // move to address representing offset
A=D+A // new addr = base addr + offset
D=M // store current memory value in D
@SP // >>> push memory value to top of stack
A=M // move to top of stack
M=D // write value of D to current location
@SP // increment stack pointer
M=M+1
// COMMAND #17: push that 1
@THAT // move to that
D=M // store the "that" base address
@1 // move to address representing offset
A=D+A // new addr = base addr + offset
D=M // store current memory value in D
@SP // >>> push memory value to top of stack
A=M // move to top of stack
M=D // write value of D to current location
// COMMAND #18: add
@SP // PREPARE Y (pop Y into D) (SP decremented above)
A=M // move to top of stack
D=M // store the top stack value into D
@SP // "pop" X
M=M-1
A=M // PREPARE X (prep X "into" M)
M=M+D // perform binary operation: add
@SP // increment stack pointer
M=M+1
// COMMAND #19: pop that 2
@THAT // move to "that" pointer
D=M // store the "that" base address
@2 // move to address representing offset
D=D+A // D = base addr + offset
@OFFSET // write value of D to "OFFSET"
M=D // write value of D to current location
@SP // >> pop stack to *OFFSET <<
M=M-1
A=M // move to top of stack
D=M // store the top stack value into D
@OFFSET
A=M // move to "OFFSET"
M=D // write value of D to current location
// COMMAND #20: push pointer 1
@THAT
D=M // store current memory value in D
@SP // >>> push memory value to top of stack
A=M // move to top of stack
M=D // write value of D to current location
@SP // increment stack pointer
M=M+1
// COMMAND #21: push constant 1
@1
D=A // store the current address as a value
@SP // >> push constant value (1) onto stack <<
A=M // move to top of stack
M=D // write value of D to current location
// COMMAND #22: add
@SP // PREPARE Y (pop Y into D) (SP decremented above)
A=M // move to top of stack
D=M // store the top stack value into D
@SP // "pop" X
M=M-1
A=M // PREPARE X (prep X "into" M)
M=M+D // perform binary operation: add
// COMMAND #23: pop pointer 1
@SP // >> pop stack to THAT << (SP decremented above)
A=M // move to top of stack
D=M // store the top stack value into D
@THAT
M=D // write value of D to current location
// COMMAND #24: push argument 0
@ARG // move to argument
D=M // store the "argument" base address
@0 // move to address representing offset
A=D+A // new addr = base addr + offset
D=M // store current memory value in D
@SP // >>> push memory value to top of stack
A=M // move to top of stack
M=D // write value of D to current location
@SP // increment stack pointer
M=M+1
// COMMAND #25: push constant 1
@1
D=A // store the current address as a value
@SP // >> push constant value (1) onto stack <<
A=M // move to top of stack
M=D // write value of D to current location
// COMMAND #26: sub
@SP // PREPARE Y (pop Y into D) (SP decremented above)
A=M // move to top of stack
D=M // store the top stack value into D
@SP // "pop" X
M=M-1
A=M // PREPARE X (prep X "into" M)
M=M-D // perform binary operation: sub
@SP // increment stack pointer
M=M+1
// COMMAND #27: pop argument 0
@ARG // move to "argument" pointer
D=M // store the "argument" base address
@OFFSET // write value of D to "OFFSET"
M=D // write value of D to current location
@SP // >> pop stack to *OFFSET <<
M=M-1
A=M // move to top of stack
D=M // store the top stack value into D
@OFFSET
A=M // move to "OFFSET"
M=D // write value of D to current location
// COMMAND #28: goto MAIN_LOOP_START
@MAIN_LOOP_START.VM
0;JMP
(END_PROGRAM.VM) // COMMAND #29: label END_PROGRAM
|
ZX-Spectrum/library/random_simple.asm
|
peroff/8-Bit-Tea-Party
| 13 |
85835
|
;Simple random function for register A.
;Authours: Alexander
;
;Function returns random 8-bit value,
;in register A, using simple arthmetic
;and bit operators.
;Distribution not so good but fast.
;Needs global name 'RANDOM_INIT' to
;initialization - EQU #NN DEFB, ALASM.
;
;Parameters:
;-
;
;Returns:
;A random value [0..255].
;
;Function does not restored flags, and
;if RANDOM_INIT is zero, then no random.
;Platforms: SPECTRUM,PENTAGON 48K,128K.
;Assemble: ALASM v5.09.
;Code size: 28 bytes.
;Static data size: 2 bytes.
;Performance:
;
;Функция простой генерации примерно
;случайного числа для регистра А.
;Автор: Александр
;
;Функция возвращает случайное значение в
;регистре А, используя минимальную
;арифметику и операции с битами.
;Распределение далеко от идеального,
;но вроде бы работает быстро.
;Используется глобальное имя, константа
;"RANDOM_INIT EQU #NN", размер байт, для
;инициализации последовательности.
;
;Параметры:
;-
;
;Возврат(регистры или память):
;А случайное значение [0..255].
;
;Функция не сохраняет состояние флагов
;и если значение RANDOM_INIT равно нулю,
;то и последовательность будет вся 0.
;
;Платформы: Спектрум, Пентагон 48К, 128К.
;Ассемблер: АЛАЗМ 5.09.
;Размер кода: 28 байт.
;Размер статичных данных: 2 байта.
;Производительность: быстро! :)
RANDOM_INIT EQU #10
RANDOM_DATA: DB RANDOM_INIT
DB #00
RANDOM_SIMPLE:
PUSH BC
LD A,(RANDOM_DATA) ;INIT
AND %00001111 ;MASK
JR Z,RND_1
LD B,A ;15 ROTATIONS
LD A,(RANDOM_DATA)
RND_2: RLA ;ROTATE
DJNZ RND_2
RND_1: LD BC,(RANDOM_DATA)
XOR C ;BITS MANIPUL
ADD A,B
LD B,C
LD C,A
LD (RANDOM_DATA),BC
POP BC
RET ;RETURN A
|
alloy4fun_models/trainstlt/models/8/aDdZuuLH6SEsXp5gp.als
|
Kaixi26/org.alloytools.alloy
| 0 |
1708
|
<reponame>Kaixi26/org.alloytools.alloy
open main
pred idaDdZuuLH6SEsXp5gp_prop9 {
always ( all t:Train | (no t.pos) triggered (t.pos' in Entry) )
}
pred __repair { idaDdZuuLH6SEsXp5gp_prop9 }
check __repair { idaDdZuuLH6SEsXp5gp_prop9 <=> prop9o }
|
programs/oeis/031/A031940.asm
|
karttu/loda
| 1 |
176075
|
; A031940: Length of longest legal domino snake using full set of dominoes up to [n:n].
; 1,3,6,9,15,19,28,33,45,51,66,73,91,99,120,129,153,163,190,201,231,243,276,289,325,339,378,393,435,451,496,513,561,579,630,649,703,723,780,801,861,883,946,969,1035,1059,1128,1153,1225,1251,1326,1353,1431,1459,1540,1569,1653,1683,1770,1801,1891,1923,2016,2049,2145,2179,2278,2313,2415,2451,2556,2593,2701,2739,2850,2889,3003,3043,3160,3201,3321,3363,3486,3529,3655,3699,3828,3873,4005,4051,4186,4233,4371,4419,4560,4609,4753,4803,4950,5001,5151,5203,5356,5409,5565,5619,5778,5833,5995,6051,6216,6273,6441,6499,6670,6729,6903,6963,7140,7201,7381,7443,7626,7689,7875,7939,8128,8193,8385,8451,8646,8713,8911,8979,9180,9249,9453,9523,9730,9801,10011,10083,10296,10369,10585,10659,10878,10953,11175,11251,11476,11553,11781,11859,12090,12169,12403,12483,12720,12801,13041,13123,13366,13449,13695,13779,14028,14113,14365,14451,14706,14793,15051,15139,15400,15489,15753,15843,16110,16201,16471,16563,16836,16929,17205,17299,17578,17673,17955,18051,18336,18433,18721,18819,19110,19209,19503,19603,19900,20001,20301,20403,20706,20809,21115,21219,21528,21633,21945,22051,22366,22473,22791,22899,23220,23329,23653,23763,24090,24201,24531,24643,24976,25089,25425,25539,25878,25993,26335,26451,26796,26913,27261,27379,27730,27849,28203,28323,28680,28801,29161,29283,29646,29769,30135,30259,30628,30753,31125,31251
mov $2,$0
mul $2,2
mov $3,$0
div $3,2
mul $0,$3
sub $0,$3
add $0,$2
mov $1,$0
add $1,1
|
Debug/list.asm
|
polamagdygeo/uWave
| 0 |
241912
|
<gh_stars>0
;******************************************************************************
;* TI ARM C/C++ Codegen Unix v18.1.1.LTS *
;* Date/Time created: Fri Jul 3 20:08:22 2020 *
;******************************************************************************
.compiler_opts --abi=eabi --arm_vmrs_si_workaround=off --code_state=16 --diag_wrap=off --embedded_constants=on --endian=little --float_support=FPv4SPD16 --hll_source=on --object_format=elf --silicon_version=7M4 --symdebug:dwarf --symdebug:dwarf_version=3 --unaligned_access=on
.thumb
$C$DW$CU .dwtag DW_TAG_compile_unit
.dwattr $C$DW$CU, DW_AT_name("../OS/list.c")
.dwattr $C$DW$CU, DW_AT_producer("TI TI ARM C/C++ Codegen Unix v18.1.1.LTS Copyright (c) 1996-2017 Texas Instruments Incorporated")
.dwattr $C$DW$CU, DW_AT_TI_version(0x01)
.dwattr $C$DW$CU, DW_AT_comp_dir("/home/pola/workspace_v8/Microwave/Debug")
; /home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/bin/armacpia -@/tmp/TI3Mf5o4vHk
.sect ".text"
.clink
.thumbfunc vListInitialise
.thumb
.global vListInitialise
$C$DW$1 .dwtag DW_TAG_subprogram
.dwattr $C$DW$1, DW_AT_name("vListInitialise")
.dwattr $C$DW$1, DW_AT_low_pc(vListInitialise)
.dwattr $C$DW$1, DW_AT_high_pc(0x00)
.dwattr $C$DW$1, DW_AT_TI_symbol_name("vListInitialise")
.dwattr $C$DW$1, DW_AT_external
.dwattr $C$DW$1, DW_AT_TI_begin_file("../OS/list.c")
.dwattr $C$DW$1, DW_AT_TI_begin_line(0x25)
.dwattr $C$DW$1, DW_AT_TI_begin_column(0x06)
.dwattr $C$DW$1, DW_AT_decl_file("../OS/list.c")
.dwattr $C$DW$1, DW_AT_decl_line(0x25)
.dwattr $C$DW$1, DW_AT_decl_column(0x06)
.dwattr $C$DW$1, DW_AT_TI_max_frame_size(0x08)
.dwpsn file "../OS/list.c",line 38,column 1,is_stmt,address vListInitialise,isa 1
.dwfde $C$DW$CIE, vListInitialise
$C$DW$2 .dwtag DW_TAG_formal_parameter
.dwattr $C$DW$2, DW_AT_name("pxList")
.dwattr $C$DW$2, DW_AT_TI_symbol_name("pxList")
.dwattr $C$DW$2, DW_AT_type(*$C$DW$T$76)
.dwattr $C$DW$2, DW_AT_location[DW_OP_reg0]
;----------------------------------------------------------------------
; 37 | void vListInitialise( List_t * const pxList )
;----------------------------------------------------------------------
;*****************************************************************************
;* FUNCTION NAME: vListInitialise *
;* *
;* Regs Modified : A1,A2,SP,SR *
;* Regs Used : A1,A2,SP,LR,SR *
;* Local Frame Size : 0 Args + 4 Auto + 0 Save = 4 byte *
;*****************************************************************************
vListInitialise:
;* --------------------------------------------------------------------------*
.dwcfi cfa_offset, 0
SUB SP, SP, #8 ; [DPU_V7M3_PIPE]
.dwcfi cfa_offset, 8
$C$DW$3 .dwtag DW_TAG_variable
.dwattr $C$DW$3, DW_AT_name("pxList")
.dwattr $C$DW$3, DW_AT_TI_symbol_name("pxList")
.dwattr $C$DW$3, DW_AT_type(*$C$DW$T$76)
.dwattr $C$DW$3, DW_AT_location[DW_OP_breg13 0]
STR A1, [SP, #0] ; [DPU_V7M3_PIPE] |38|
.dwpsn file "../OS/list.c",line 42,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 42 | pxList->pxIndex = ( ListItem_t * ) &( pxList->xListEnd );
; | /*lint !e826 !e740 !e9087 The mini list structure is used as t
; | he list end to save RAM. This is checked and valid. */
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |42|
LDR A2, [SP, #0] ; [DPU_V7M3_PIPE] |42|
ADDS A1, A1, #8 ; [DPU_V7M3_PIPE] |42|
STR A1, [A2, #4] ; [DPU_V7M3_PIPE] |42|
.dwpsn file "../OS/list.c",line 46,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 46 | pxList->xListEnd.xItemValue = portMAX_DELAY;
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |46|
MOV A2, #-1 ; [DPU_V7M3_PIPE] |46|
STR A2, [A1, #8] ; [DPU_V7M3_PIPE] |46|
.dwpsn file "../OS/list.c",line 50,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 50 | pxList->xListEnd.pxNext = ( ListItem_t * ) &( pxList->xListEnd );
; | /*lint !e826 !e740 !e9087 The mini list structure is used as the list
; | end to save RAM. This is checked and valid. */
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |50|
LDR A2, [SP, #0] ; [DPU_V7M3_PIPE] |50|
ADDS A1, A1, #8 ; [DPU_V7M3_PIPE] |50|
STR A1, [A2, #12] ; [DPU_V7M3_PIPE] |50|
.dwpsn file "../OS/list.c",line 51,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 51 | pxList->xListEnd.pxPrevious = ( ListItem_t * ) &( pxList->xListEnd );/*
; | lint !e826 !e740 !e9087 The mini list structure is used as the list end
; | to save RAM. This is checked and valid. */
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |51|
LDR A2, [SP, #0] ; [DPU_V7M3_PIPE] |51|
ADDS A1, A1, #8 ; [DPU_V7M3_PIPE] |51|
STR A1, [A2, #16] ; [DPU_V7M3_PIPE] |51|
.dwpsn file "../OS/list.c",line 53,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 53 | pxList->uxNumberOfItems = ( UBaseType_t ) 0U;
; 57 | listSET_LIST_INTEGRITY_CHECK_1_VALUE( pxList );
; 58 | listSET_LIST_INTEGRITY_CHECK_2_VALUE( pxList );
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |53|
MOVS A2, #0 ; [DPU_V7M3_PIPE] |53|
STR A2, [A1, #0] ; [DPU_V7M3_PIPE] |53|
.dwpsn file "../OS/list.c",line 59,column 1,is_stmt,isa 1
ADD SP, SP, #8 ; [DPU_V7M3_PIPE]
.dwcfi cfa_offset, 0
$C$DW$4 .dwtag DW_TAG_TI_branch
.dwattr $C$DW$4, DW_AT_low_pc(0x00)
.dwattr $C$DW$4, DW_AT_TI_return
BX LR ; [DPU_V7M3_PIPE]
; BRANCH OCCURS ; []
.dwattr $C$DW$1, DW_AT_TI_end_file("../OS/list.c")
.dwattr $C$DW$1, DW_AT_TI_end_line(0x3b)
.dwattr $C$DW$1, DW_AT_TI_end_column(0x01)
.dwendentry
.dwendtag $C$DW$1
.sect ".text"
.clink
.thumbfunc vListInitialiseItem
.thumb
.global vListInitialiseItem
$C$DW$5 .dwtag DW_TAG_subprogram
.dwattr $C$DW$5, DW_AT_name("vListInitialiseItem")
.dwattr $C$DW$5, DW_AT_low_pc(vListInitialiseItem)
.dwattr $C$DW$5, DW_AT_high_pc(0x00)
.dwattr $C$DW$5, DW_AT_TI_symbol_name("vListInitialiseItem")
.dwattr $C$DW$5, DW_AT_external
.dwattr $C$DW$5, DW_AT_TI_begin_file("../OS/list.c")
.dwattr $C$DW$5, DW_AT_TI_begin_line(0x3e)
.dwattr $C$DW$5, DW_AT_TI_begin_column(0x06)
.dwattr $C$DW$5, DW_AT_decl_file("../OS/list.c")
.dwattr $C$DW$5, DW_AT_decl_line(0x3e)
.dwattr $C$DW$5, DW_AT_decl_column(0x06)
.dwattr $C$DW$5, DW_AT_TI_max_frame_size(0x08)
.dwpsn file "../OS/list.c",line 63,column 1,is_stmt,address vListInitialiseItem,isa 1
.dwfde $C$DW$CIE, vListInitialiseItem
$C$DW$6 .dwtag DW_TAG_formal_parameter
.dwattr $C$DW$6, DW_AT_name("pxItem")
.dwattr $C$DW$6, DW_AT_TI_symbol_name("pxItem")
.dwattr $C$DW$6, DW_AT_type(*$C$DW$T$78)
.dwattr $C$DW$6, DW_AT_location[DW_OP_reg0]
;----------------------------------------------------------------------
; 62 | void vListInitialiseItem( ListItem_t * const pxItem )
;----------------------------------------------------------------------
;*****************************************************************************
;* FUNCTION NAME: vListInitialiseItem *
;* *
;* Regs Modified : A1,A2,SP,SR *
;* Regs Used : A1,A2,SP,LR,SR *
;* Local Frame Size : 0 Args + 4 Auto + 0 Save = 4 byte *
;*****************************************************************************
vListInitialiseItem:
;* --------------------------------------------------------------------------*
.dwcfi cfa_offset, 0
SUB SP, SP, #8 ; [DPU_V7M3_PIPE]
.dwcfi cfa_offset, 8
$C$DW$7 .dwtag DW_TAG_variable
.dwattr $C$DW$7, DW_AT_name("pxItem")
.dwattr $C$DW$7, DW_AT_TI_symbol_name("pxItem")
.dwattr $C$DW$7, DW_AT_type(*$C$DW$T$78)
.dwattr $C$DW$7, DW_AT_location[DW_OP_breg13 0]
STR A1, [SP, #0] ; [DPU_V7M3_PIPE] |63|
.dwpsn file "../OS/list.c",line 65,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 65 | pxItem->pxContainer = NULL;
; 69 | listSET_FIRST_LIST_ITEM_INTEGRITY_CHECK_VALUE( pxItem );
; 70 | listSET_SECOND_LIST_ITEM_INTEGRITY_CHECK_VALUE( pxItem );
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |65|
MOVS A2, #0 ; [DPU_V7M3_PIPE] |65|
STR A2, [A1, #16] ; [DPU_V7M3_PIPE] |65|
.dwpsn file "../OS/list.c",line 71,column 1,is_stmt,isa 1
ADD SP, SP, #8 ; [DPU_V7M3_PIPE]
.dwcfi cfa_offset, 0
$C$DW$8 .dwtag DW_TAG_TI_branch
.dwattr $C$DW$8, DW_AT_low_pc(0x00)
.dwattr $C$DW$8, DW_AT_TI_return
BX LR ; [DPU_V7M3_PIPE]
; BRANCH OCCURS ; []
.dwattr $C$DW$5, DW_AT_TI_end_file("../OS/list.c")
.dwattr $C$DW$5, DW_AT_TI_end_line(0x47)
.dwattr $C$DW$5, DW_AT_TI_end_column(0x01)
.dwendentry
.dwendtag $C$DW$5
.sect ".text"
.clink
.thumbfunc vListInsertEnd
.thumb
.global vListInsertEnd
$C$DW$9 .dwtag DW_TAG_subprogram
.dwattr $C$DW$9, DW_AT_name("vListInsertEnd")
.dwattr $C$DW$9, DW_AT_low_pc(vListInsertEnd)
.dwattr $C$DW$9, DW_AT_high_pc(0x00)
.dwattr $C$DW$9, DW_AT_TI_symbol_name("vListInsertEnd")
.dwattr $C$DW$9, DW_AT_external
.dwattr $C$DW$9, DW_AT_TI_begin_file("../OS/list.c")
.dwattr $C$DW$9, DW_AT_TI_begin_line(0x4a)
.dwattr $C$DW$9, DW_AT_TI_begin_column(0x06)
.dwattr $C$DW$9, DW_AT_decl_file("../OS/list.c")
.dwattr $C$DW$9, DW_AT_decl_line(0x4a)
.dwattr $C$DW$9, DW_AT_decl_column(0x06)
.dwattr $C$DW$9, DW_AT_TI_max_frame_size(0x10)
.dwpsn file "../OS/list.c",line 75,column 1,is_stmt,address vListInsertEnd,isa 1
.dwfde $C$DW$CIE, vListInsertEnd
$C$DW$10 .dwtag DW_TAG_formal_parameter
.dwattr $C$DW$10, DW_AT_name("pxList")
.dwattr $C$DW$10, DW_AT_TI_symbol_name("pxList")
.dwattr $C$DW$10, DW_AT_type(*$C$DW$T$76)
.dwattr $C$DW$10, DW_AT_location[DW_OP_reg0]
$C$DW$11 .dwtag DW_TAG_formal_parameter
.dwattr $C$DW$11, DW_AT_name("pxNewListItem")
.dwattr $C$DW$11, DW_AT_TI_symbol_name("pxNewListItem")
.dwattr $C$DW$11, DW_AT_type(*$C$DW$T$78)
.dwattr $C$DW$11, DW_AT_location[DW_OP_reg1]
;----------------------------------------------------------------------
; 74 | void vListInsertEnd( List_t * const pxList, ListItem_t * const pxNewLis
; | tItem )
;----------------------------------------------------------------------
;*****************************************************************************
;* FUNCTION NAME: vListInsertEnd *
;* *
;* Regs Modified : A1,A2,SP,SR *
;* Regs Used : A1,A2,SP,LR,SR *
;* Local Frame Size : 0 Args + 12 Auto + 0 Save = 12 byte *
;*****************************************************************************
vListInsertEnd:
;* --------------------------------------------------------------------------*
.dwcfi cfa_offset, 0
SUB SP, SP, #16 ; [DPU_V7M3_PIPE]
.dwcfi cfa_offset, 16
$C$DW$12 .dwtag DW_TAG_variable
.dwattr $C$DW$12, DW_AT_name("pxList")
.dwattr $C$DW$12, DW_AT_TI_symbol_name("pxList")
.dwattr $C$DW$12, DW_AT_type(*$C$DW$T$76)
.dwattr $C$DW$12, DW_AT_location[DW_OP_breg13 0]
$C$DW$13 .dwtag DW_TAG_variable
.dwattr $C$DW$13, DW_AT_name("pxNewListItem")
.dwattr $C$DW$13, DW_AT_TI_symbol_name("pxNewListItem")
.dwattr $C$DW$13, DW_AT_type(*$C$DW$T$78)
.dwattr $C$DW$13, DW_AT_location[DW_OP_breg13 4]
$C$DW$14 .dwtag DW_TAG_variable
.dwattr $C$DW$14, DW_AT_name("pxIndex")
.dwattr $C$DW$14, DW_AT_TI_symbol_name("pxIndex")
.dwattr $C$DW$14, DW_AT_type(*$C$DW$T$78)
.dwattr $C$DW$14, DW_AT_location[DW_OP_breg13 8]
STR A2, [SP, #4] ; [DPU_V7M3_PIPE] |75|
STR A1, [SP, #0] ; [DPU_V7M3_PIPE] |75|
.dwpsn file "../OS/list.c",line 76,column 28,is_stmt,isa 1
;----------------------------------------------------------------------
; 76 | ListItem_t * const pxIndex = pxList->pxIndex;
; 81 | listTEST_LIST_INTEGRITY( pxList );
; 82 | listTEST_LIST_ITEM_INTEGRITY( pxNewListItem );
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |76|
LDR A1, [A1, #4] ; [DPU_V7M3_PIPE] |76|
STR A1, [SP, #8] ; [DPU_V7M3_PIPE] |76|
.dwpsn file "../OS/list.c",line 87,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 87 | pxNewListItem->pxNext = pxIndex;
;----------------------------------------------------------------------
LDR A2, [SP, #4] ; [DPU_V7M3_PIPE] |87|
LDR A1, [SP, #8] ; [DPU_V7M3_PIPE] |87|
STR A1, [A2, #4] ; [DPU_V7M3_PIPE] |87|
.dwpsn file "../OS/list.c",line 88,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 88 | pxNewListItem->pxPrevious = pxIndex->pxPrevious;
; 91 | mtCOVERAGE_TEST_DELAY();
;----------------------------------------------------------------------
LDR A1, [SP, #8] ; [DPU_V7M3_PIPE] |88|
LDR A2, [SP, #4] ; [DPU_V7M3_PIPE] |88|
LDR A1, [A1, #8] ; [DPU_V7M3_PIPE] |88|
STR A1, [A2, #8] ; [DPU_V7M3_PIPE] |88|
.dwpsn file "../OS/list.c",line 93,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 93 | pxIndex->pxPrevious->pxNext = pxNewListItem;
;----------------------------------------------------------------------
LDR A2, [SP, #8] ; [DPU_V7M3_PIPE] |93|
LDR A1, [SP, #4] ; [DPU_V7M3_PIPE] |93|
LDR A2, [A2, #8] ; [DPU_V7M3_PIPE] |93|
STR A1, [A2, #4] ; [DPU_V7M3_PIPE] |93|
.dwpsn file "../OS/list.c",line 94,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 94 | pxIndex->pxPrevious = pxNewListItem;
;----------------------------------------------------------------------
LDR A1, [SP, #4] ; [DPU_V7M3_PIPE] |94|
LDR A2, [SP, #8] ; [DPU_V7M3_PIPE] |94|
STR A1, [A2, #8] ; [DPU_V7M3_PIPE] |94|
.dwpsn file "../OS/list.c",line 97,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 97 | pxNewListItem->pxContainer = pxList;
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |97|
LDR A2, [SP, #4] ; [DPU_V7M3_PIPE] |97|
STR A1, [A2, #16] ; [DPU_V7M3_PIPE] |97|
.dwpsn file "../OS/list.c",line 99,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 99 | ( pxList->uxNumberOfItems )++;
;----------------------------------------------------------------------
LDR A2, [SP, #0] ; [DPU_V7M3_PIPE] |99|
LDR A1, [A2, #0] ; [DPU_V7M3_PIPE] |99|
ADDS A1, A1, #1 ; [DPU_V7M3_PIPE] |99|
STR A1, [A2, #0] ; [DPU_V7M3_PIPE] |99|
.dwpsn file "../OS/list.c",line 100,column 1,is_stmt,isa 1
ADD SP, SP, #16 ; [DPU_V7M3_PIPE]
.dwcfi cfa_offset, 0
$C$DW$15 .dwtag DW_TAG_TI_branch
.dwattr $C$DW$15, DW_AT_low_pc(0x00)
.dwattr $C$DW$15, DW_AT_TI_return
BX LR ; [DPU_V7M3_PIPE]
; BRANCH OCCURS ; []
.dwattr $C$DW$9, DW_AT_TI_end_file("../OS/list.c")
.dwattr $C$DW$9, DW_AT_TI_end_line(0x64)
.dwattr $C$DW$9, DW_AT_TI_end_column(0x01)
.dwendentry
.dwendtag $C$DW$9
.sect ".text"
.clink
.thumbfunc vListInsert
.thumb
.global vListInsert
$C$DW$16 .dwtag DW_TAG_subprogram
.dwattr $C$DW$16, DW_AT_name("vListInsert")
.dwattr $C$DW$16, DW_AT_low_pc(vListInsert)
.dwattr $C$DW$16, DW_AT_high_pc(0x00)
.dwattr $C$DW$16, DW_AT_TI_symbol_name("vListInsert")
.dwattr $C$DW$16, DW_AT_external
.dwattr $C$DW$16, DW_AT_TI_begin_file("../OS/list.c")
.dwattr $C$DW$16, DW_AT_TI_begin_line(0x67)
.dwattr $C$DW$16, DW_AT_TI_begin_column(0x06)
.dwattr $C$DW$16, DW_AT_decl_file("../OS/list.c")
.dwattr $C$DW$16, DW_AT_decl_line(0x67)
.dwattr $C$DW$16, DW_AT_decl_column(0x06)
.dwattr $C$DW$16, DW_AT_TI_max_frame_size(0x10)
.dwpsn file "../OS/list.c",line 104,column 1,is_stmt,address vListInsert,isa 1
.dwfde $C$DW$CIE, vListInsert
$C$DW$17 .dwtag DW_TAG_formal_parameter
.dwattr $C$DW$17, DW_AT_name("pxList")
.dwattr $C$DW$17, DW_AT_TI_symbol_name("pxList")
.dwattr $C$DW$17, DW_AT_type(*$C$DW$T$76)
.dwattr $C$DW$17, DW_AT_location[DW_OP_reg0]
$C$DW$18 .dwtag DW_TAG_formal_parameter
.dwattr $C$DW$18, DW_AT_name("pxNewListItem")
.dwattr $C$DW$18, DW_AT_TI_symbol_name("pxNewListItem")
.dwattr $C$DW$18, DW_AT_type(*$C$DW$T$78)
.dwattr $C$DW$18, DW_AT_location[DW_OP_reg1]
;----------------------------------------------------------------------
; 103 | void vListInsert( List_t * const pxList, ListItem_t * const pxNewListIt
; | em )
;----------------------------------------------------------------------
;*****************************************************************************
;* FUNCTION NAME: vListInsert *
;* *
;* Regs Modified : A1,A2,SP,SR *
;* Regs Used : A1,A2,SP,LR,SR *
;* Local Frame Size : 0 Args + 16 Auto + 0 Save = 16 byte *
;*****************************************************************************
vListInsert:
;* --------------------------------------------------------------------------*
.dwcfi cfa_offset, 0
SUB SP, SP, #16 ; [DPU_V7M3_PIPE]
.dwcfi cfa_offset, 16
$C$DW$19 .dwtag DW_TAG_variable
.dwattr $C$DW$19, DW_AT_name("pxList")
.dwattr $C$DW$19, DW_AT_TI_symbol_name("pxList")
.dwattr $C$DW$19, DW_AT_type(*$C$DW$T$76)
.dwattr $C$DW$19, DW_AT_location[DW_OP_breg13 0]
$C$DW$20 .dwtag DW_TAG_variable
.dwattr $C$DW$20, DW_AT_name("pxNewListItem")
.dwattr $C$DW$20, DW_AT_TI_symbol_name("pxNewListItem")
.dwattr $C$DW$20, DW_AT_type(*$C$DW$T$78)
.dwattr $C$DW$20, DW_AT_location[DW_OP_breg13 4]
$C$DW$21 .dwtag DW_TAG_variable
.dwattr $C$DW$21, DW_AT_name("pxIterator")
.dwattr $C$DW$21, DW_AT_TI_symbol_name("pxIterator")
.dwattr $C$DW$21, DW_AT_type(*$C$DW$T$35)
.dwattr $C$DW$21, DW_AT_location[DW_OP_breg13 8]
$C$DW$22 .dwtag DW_TAG_variable
.dwattr $C$DW$22, DW_AT_name("xValueOfInsertion")
.dwattr $C$DW$22, DW_AT_TI_symbol_name("xValueOfInsertion")
.dwattr $C$DW$22, DW_AT_type(*$C$DW$T$166)
.dwattr $C$DW$22, DW_AT_location[DW_OP_breg13 12]
;----------------------------------------------------------------------
; 105 | ListItem_t *pxIterator;
;----------------------------------------------------------------------
STR A2, [SP, #4] ; [DPU_V7M3_PIPE] |104|
STR A1, [SP, #0] ; [DPU_V7M3_PIPE] |104|
.dwpsn file "../OS/list.c",line 106,column 36,is_stmt,isa 1
;----------------------------------------------------------------------
; 106 | const TickType_t xValueOfInsertion = pxNewListItem->xItemValue;
; 111 | listTEST_LIST_INTEGRITY( pxList );
; 112 | listTEST_LIST_ITEM_INTEGRITY( pxNewListItem );
;----------------------------------------------------------------------
LDR A1, [SP, #4] ; [DPU_V7M3_PIPE] |106|
LDR A1, [A1, #0] ; [DPU_V7M3_PIPE] |106|
STR A1, [SP, #12] ; [DPU_V7M3_PIPE] |106|
.dwpsn file "../OS/list.c",line 122,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 122 | if( xValueOfInsertion == portMAX_DELAY )
;----------------------------------------------------------------------
LDR A1, [SP, #12] ; [DPU_V7M3_PIPE] |122|
CMP A1, #-1 ; [DPU_V7M3_PIPE] |122|
BNE ||$C$L1|| ; [DPU_V7M3_PIPE] |122|
; BRANCHCC OCCURS {||$C$L1||} ; [] |122|
;* --------------------------------------------------------------------------*
.dwpsn file "../OS/list.c",line 124,column 3,is_stmt,isa 1
;----------------------------------------------------------------------
; 124 | pxIterator = pxList->xListEnd.pxPrevious;
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |124|
LDR A1, [A1, #16] ; [DPU_V7M3_PIPE] |124|
STR A1, [SP, #8] ; [DPU_V7M3_PIPE] |124|
.dwpsn file "../OS/list.c",line 125,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 126 | else
;----------------------------------------------------------------------
B ||$C$L4|| ; [DPU_V7M3_PIPE] |125|
; BRANCH OCCURS {||$C$L4||} ; [] |125|
;* --------------------------------------------------------------------------*
||$C$L1||:
.dwpsn file "../OS/list.c",line 150,column 8,is_stmt,isa 1
;----------------------------------------------------------------------
; 150 | for( pxIterator = ( ListItem_t * ) &( pxList->xListEnd ); pxIterator->p
; | xNext->xItemValue <= xValueOfInsertion; pxIterator = pxIterator->pxNext
; | ) /*lint !e826 !e740 !e9087 The mini list structure is used as the lis
; | t end to save RAM. This is checked and valid. *//*lint !e440 The itera
; | tor moves to a different value, not xValueOfInsertion. */
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |150|
ADDS A1, A1, #8 ; [DPU_V7M3_PIPE] |150|
STR A1, [SP, #8] ; [DPU_V7M3_PIPE] |150|
B ||$C$L3|| ; [DPU_V7M3_PIPE] |150|
; BRANCH OCCURS {||$C$L3||} ; [] |150|
;* --------------------------------------------------------------------------*
||$C$L2||:
.dwpsn file "../OS/list.c",line 150,column 114,is_stmt,isa 1
LDR A1, [SP, #8] ; [DPU_V7M3_PIPE] |150|
LDR A1, [A1, #4] ; [DPU_V7M3_PIPE] |150|
STR A1, [SP, #8] ; [DPU_V7M3_PIPE] |150|
;* --------------------------------------------------------------------------*
;* BEGIN LOOP ||$C$L3||
;* --------------------------------------------------------------------------*
||$C$L3||:
.dwpsn file "../OS/list.c",line 150,column 61,is_stmt,isa 1
LDR A1, [SP, #8] ; [DPU_V7M3_PIPE] |150|
LDR A2, [A1, #4] ; [DPU_V7M3_PIPE] |150|
LDR A1, [SP, #12] ; [DPU_V7M3_PIPE] |150|
LDR A2, [A2, #0] ; [DPU_V7M3_PIPE] |150|
CMP A1, A2 ; [DPU_V7M3_PIPE] |150|
BCS ||$C$L2|| ; [DPU_V7M3_PIPE] |150|
; BRANCHCC OCCURS {||$C$L2||} ; [] |150|
;* --------------------------------------------------------------------------*
||$C$L4||:
.dwpsn file "../OS/list.c",line 157,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 157 | pxNewListItem->pxNext = pxIterator->pxNext;
;----------------------------------------------------------------------
LDR A1, [SP, #8] ; [DPU_V7M3_PIPE] |157|
LDR A2, [SP, #4] ; [DPU_V7M3_PIPE] |157|
LDR A1, [A1, #4] ; [DPU_V7M3_PIPE] |157|
STR A1, [A2, #4] ; [DPU_V7M3_PIPE] |157|
.dwpsn file "../OS/list.c",line 158,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 158 | pxNewListItem->pxNext->pxPrevious = pxNewListItem;
;----------------------------------------------------------------------
LDR A2, [SP, #4] ; [DPU_V7M3_PIPE] |158|
LDR A1, [SP, #4] ; [DPU_V7M3_PIPE] |158|
LDR A2, [A2, #4] ; [DPU_V7M3_PIPE] |158|
STR A1, [A2, #8] ; [DPU_V7M3_PIPE] |158|
.dwpsn file "../OS/list.c",line 159,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 159 | pxNewListItem->pxPrevious = pxIterator;
;----------------------------------------------------------------------
LDR A1, [SP, #8] ; [DPU_V7M3_PIPE] |159|
LDR A2, [SP, #4] ; [DPU_V7M3_PIPE] |159|
STR A1, [A2, #8] ; [DPU_V7M3_PIPE] |159|
.dwpsn file "../OS/list.c",line 160,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 160 | pxIterator->pxNext = pxNewListItem;
;----------------------------------------------------------------------
LDR A1, [SP, #4] ; [DPU_V7M3_PIPE] |160|
LDR A2, [SP, #8] ; [DPU_V7M3_PIPE] |160|
STR A1, [A2, #4] ; [DPU_V7M3_PIPE] |160|
.dwpsn file "../OS/list.c",line 164,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 164 | pxNewListItem->pxContainer = pxList;
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |164|
LDR A2, [SP, #4] ; [DPU_V7M3_PIPE] |164|
STR A1, [A2, #16] ; [DPU_V7M3_PIPE] |164|
.dwpsn file "../OS/list.c",line 166,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 166 | ( pxList->uxNumberOfItems )++;
;----------------------------------------------------------------------
LDR A2, [SP, #0] ; [DPU_V7M3_PIPE] |166|
LDR A1, [A2, #0] ; [DPU_V7M3_PIPE] |166|
ADDS A1, A1, #1 ; [DPU_V7M3_PIPE] |166|
STR A1, [A2, #0] ; [DPU_V7M3_PIPE] |166|
.dwpsn file "../OS/list.c",line 167,column 1,is_stmt,isa 1
ADD SP, SP, #16 ; [DPU_V7M3_PIPE]
.dwcfi cfa_offset, 0
$C$DW$23 .dwtag DW_TAG_TI_branch
.dwattr $C$DW$23, DW_AT_low_pc(0x00)
.dwattr $C$DW$23, DW_AT_TI_return
BX LR ; [DPU_V7M3_PIPE]
; BRANCH OCCURS ; []
.dwattr $C$DW$16, DW_AT_TI_end_file("../OS/list.c")
.dwattr $C$DW$16, DW_AT_TI_end_line(0xa7)
.dwattr $C$DW$16, DW_AT_TI_end_column(0x01)
.dwendentry
.dwendtag $C$DW$16
.sect ".text"
.clink
.thumbfunc uxListRemove
.thumb
.global uxListRemove
$C$DW$24 .dwtag DW_TAG_subprogram
.dwattr $C$DW$24, DW_AT_name("uxListRemove")
.dwattr $C$DW$24, DW_AT_low_pc(uxListRemove)
.dwattr $C$DW$24, DW_AT_high_pc(0x00)
.dwattr $C$DW$24, DW_AT_TI_symbol_name("uxListRemove")
.dwattr $C$DW$24, DW_AT_external
.dwattr $C$DW$24, DW_AT_type(*$C$DW$T$25)
.dwattr $C$DW$24, DW_AT_TI_begin_file("../OS/list.c")
.dwattr $C$DW$24, DW_AT_TI_begin_line(0xaa)
.dwattr $C$DW$24, DW_AT_TI_begin_column(0x0d)
.dwattr $C$DW$24, DW_AT_decl_file("../OS/list.c")
.dwattr $C$DW$24, DW_AT_decl_line(0xaa)
.dwattr $C$DW$24, DW_AT_decl_column(0x0d)
.dwattr $C$DW$24, DW_AT_TI_max_frame_size(0x08)
.dwpsn file "../OS/list.c",line 171,column 1,is_stmt,address uxListRemove,isa 1
.dwfde $C$DW$CIE, uxListRemove
$C$DW$25 .dwtag DW_TAG_formal_parameter
.dwattr $C$DW$25, DW_AT_name("pxItemToRemove")
.dwattr $C$DW$25, DW_AT_TI_symbol_name("pxItemToRemove")
.dwattr $C$DW$25, DW_AT_type(*$C$DW$T$78)
.dwattr $C$DW$25, DW_AT_location[DW_OP_reg0]
;----------------------------------------------------------------------
; 170 | UBaseType_t uxListRemove( ListItem_t * const pxItemToRemove )
;----------------------------------------------------------------------
;*****************************************************************************
;* FUNCTION NAME: uxListRemove *
;* *
;* Regs Modified : A1,A2,SP,SR *
;* Regs Used : A1,A2,SP,LR,SR *
;* Local Frame Size : 0 Args + 8 Auto + 0 Save = 8 byte *
;*****************************************************************************
uxListRemove:
;* --------------------------------------------------------------------------*
.dwcfi cfa_offset, 0
SUB SP, SP, #8 ; [DPU_V7M3_PIPE]
.dwcfi cfa_offset, 8
$C$DW$26 .dwtag DW_TAG_variable
.dwattr $C$DW$26, DW_AT_name("pxItemToRemove")
.dwattr $C$DW$26, DW_AT_TI_symbol_name("pxItemToRemove")
.dwattr $C$DW$26, DW_AT_type(*$C$DW$T$78)
.dwattr $C$DW$26, DW_AT_location[DW_OP_breg13 0]
$C$DW$27 .dwtag DW_TAG_variable
.dwattr $C$DW$27, DW_AT_name("pxList")
.dwattr $C$DW$27, DW_AT_TI_symbol_name("pxList")
.dwattr $C$DW$27, DW_AT_type(*$C$DW$T$76)
.dwattr $C$DW$27, DW_AT_location[DW_OP_breg13 4]
STR A1, [SP, #0] ; [DPU_V7M3_PIPE] |171|
.dwpsn file "../OS/list.c",line 174,column 23,is_stmt,isa 1
;----------------------------------------------------------------------
; 174 | List_t * const pxList = pxItemToRemove->pxContainer;
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |174|
LDR A1, [A1, #16] ; [DPU_V7M3_PIPE] |174|
STR A1, [SP, #4] ; [DPU_V7M3_PIPE] |174|
.dwpsn file "../OS/list.c",line 176,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 176 | pxItemToRemove->pxNext->pxPrevious = pxItemToRemove->pxPrevious;
;----------------------------------------------------------------------
LDR A2, [SP, #0] ; [DPU_V7M3_PIPE] |176|
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |176|
LDR A2, [A2, #4] ; [DPU_V7M3_PIPE] |176|
LDR A1, [A1, #8] ; [DPU_V7M3_PIPE] |176|
STR A1, [A2, #8] ; [DPU_V7M3_PIPE] |176|
.dwpsn file "../OS/list.c",line 177,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 177 | pxItemToRemove->pxPrevious->pxNext = pxItemToRemove->pxNext;
; 180 | mtCOVERAGE_TEST_DELAY();
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |177|
LDR A2, [SP, #0] ; [DPU_V7M3_PIPE] |177|
LDR A1, [A1, #4] ; [DPU_V7M3_PIPE] |177|
LDR A2, [A2, #8] ; [DPU_V7M3_PIPE] |177|
STR A1, [A2, #4] ; [DPU_V7M3_PIPE] |177|
.dwpsn file "../OS/list.c",line 183,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 183 | if( pxList->pxIndex == pxItemToRemove )
;----------------------------------------------------------------------
LDR A2, [SP, #4] ; [DPU_V7M3_PIPE] |183|
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |183|
LDR A2, [A2, #4] ; [DPU_V7M3_PIPE] |183|
CMP A1, A2 ; [DPU_V7M3_PIPE] |183|
BNE ||$C$L5|| ; [DPU_V7M3_PIPE] |183|
; BRANCHCC OCCURS {||$C$L5||} ; [] |183|
;* --------------------------------------------------------------------------*
.dwpsn file "../OS/list.c",line 185,column 3,is_stmt,isa 1
;----------------------------------------------------------------------
; 185 | pxList->pxIndex = pxItemToRemove->pxPrevious;
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |185|
LDR A2, [SP, #4] ; [DPU_V7M3_PIPE] |185|
LDR A1, [A1, #8] ; [DPU_V7M3_PIPE] |185|
STR A1, [A2, #4] ; [DPU_V7M3_PIPE] |185|
.dwpsn file "../OS/list.c",line 186,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 187 | else
; 189 | mtCOVERAGE_TEST_MARKER();
;----------------------------------------------------------------------
;* --------------------------------------------------------------------------*
||$C$L5||:
.dwpsn file "../OS/list.c",line 192,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 192 | pxItemToRemove->pxContainer = NULL;
;----------------------------------------------------------------------
LDR A1, [SP, #0] ; [DPU_V7M3_PIPE] |192|
MOVS A2, #0 ; [DPU_V7M3_PIPE] |192|
STR A2, [A1, #16] ; [DPU_V7M3_PIPE] |192|
.dwpsn file "../OS/list.c",line 193,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 193 | ( pxList->uxNumberOfItems )--;
;----------------------------------------------------------------------
LDR A2, [SP, #4] ; [DPU_V7M3_PIPE] |193|
LDR A1, [A2, #0] ; [DPU_V7M3_PIPE] |193|
SUBS A1, A1, #1 ; [DPU_V7M3_PIPE] |193|
STR A1, [A2, #0] ; [DPU_V7M3_PIPE] |193|
.dwpsn file "../OS/list.c",line 195,column 2,is_stmt,isa 1
;----------------------------------------------------------------------
; 195 | return pxList->uxNumberOfItems;
;----------------------------------------------------------------------
LDR A1, [SP, #4] ; [DPU_V7M3_PIPE] |195|
LDR A1, [A1, #0] ; [DPU_V7M3_PIPE] |195|
.dwpsn file "../OS/list.c",line 196,column 1,is_stmt,isa 1
ADD SP, SP, #8 ; [DPU_V7M3_PIPE]
.dwcfi cfa_offset, 0
$C$DW$28 .dwtag DW_TAG_TI_branch
.dwattr $C$DW$28, DW_AT_low_pc(0x00)
.dwattr $C$DW$28, DW_AT_TI_return
BX LR ; [DPU_V7M3_PIPE]
; BRANCH OCCURS ; []
.dwattr $C$DW$24, DW_AT_TI_end_file("../OS/list.c")
.dwattr $C$DW$24, DW_AT_TI_end_line(0xc4)
.dwattr $C$DW$24, DW_AT_TI_end_column(0x01)
.dwendentry
.dwendtag $C$DW$24
;******************************************************************************
;* BUILD ATTRIBUTES *
;******************************************************************************
.battr "aeabi", Tag_File, 1, Tag_ABI_PCS_wchar_t(2)
.battr "aeabi", Tag_File, 1, Tag_ABI_FP_rounding(0)
.battr "aeabi", Tag_File, 1, Tag_ABI_FP_denormal(0)
.battr "aeabi", Tag_File, 1, Tag_ABI_FP_exceptions(0)
.battr "aeabi", Tag_File, 1, Tag_ABI_FP_number_model(1)
.battr "aeabi", Tag_File, 1, Tag_ABI_enum_size(0)
.battr "aeabi", Tag_File, 1, Tag_ABI_optimization_goals(5)
.battr "aeabi", Tag_File, 1, Tag_ABI_FP_optimization_goals(0)
.battr "TI", Tag_File, 1, Tag_Bitfield_layout(2)
.battr "aeabi", Tag_File, 1, Tag_ABI_VFP_args(3)
.battr "TI", Tag_File, 1, Tag_FP_interface(1)
;******************************************************************************
;* TYPE INFORMATION *
;******************************************************************************
$C$DW$T$21 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$21, DW_AT_byte_size(0x08)
$C$DW$29 .dwtag DW_TAG_member
.dwattr $C$DW$29, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$29, DW_AT_name("quot")
.dwattr $C$DW$29, DW_AT_TI_symbol_name("quot")
.dwattr $C$DW$29, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$29, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$29, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$29, DW_AT_decl_line(0x49)
.dwattr $C$DW$29, DW_AT_decl_column(0x16)
$C$DW$30 .dwtag DW_TAG_member
.dwattr $C$DW$30, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$30, DW_AT_name("rem")
.dwattr $C$DW$30, DW_AT_TI_symbol_name("rem")
.dwattr $C$DW$30, DW_AT_data_member_location[DW_OP_plus_uconst 0x4]
.dwattr $C$DW$30, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$30, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$30, DW_AT_decl_line(0x49)
.dwattr $C$DW$30, DW_AT_decl_column(0x1c)
.dwattr $C$DW$T$21, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$T$21, DW_AT_decl_line(0x49)
.dwattr $C$DW$T$21, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$21
$C$DW$T$69 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$69, DW_AT_name("div_t")
.dwattr $C$DW$T$69, DW_AT_type(*$C$DW$T$21)
.dwattr $C$DW$T$69, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$69, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$T$69, DW_AT_decl_line(0x49)
.dwattr $C$DW$T$69, DW_AT_decl_column(0x23)
$C$DW$T$22 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$22, DW_AT_byte_size(0x08)
$C$DW$31 .dwtag DW_TAG_member
.dwattr $C$DW$31, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$31, DW_AT_name("quot")
.dwattr $C$DW$31, DW_AT_TI_symbol_name("quot")
.dwattr $C$DW$31, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$31, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$31, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$31, DW_AT_decl_line(0x4e)
.dwattr $C$DW$31, DW_AT_decl_column(0x16)
$C$DW$32 .dwtag DW_TAG_member
.dwattr $C$DW$32, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$32, DW_AT_name("rem")
.dwattr $C$DW$32, DW_AT_TI_symbol_name("rem")
.dwattr $C$DW$32, DW_AT_data_member_location[DW_OP_plus_uconst 0x4]
.dwattr $C$DW$32, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$32, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$32, DW_AT_decl_line(0x4e)
.dwattr $C$DW$32, DW_AT_decl_column(0x1c)
.dwattr $C$DW$T$22, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$T$22, DW_AT_decl_line(0x4e)
.dwattr $C$DW$T$22, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$22
$C$DW$T$70 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$70, DW_AT_name("ldiv_t")
.dwattr $C$DW$T$70, DW_AT_type(*$C$DW$T$22)
.dwattr $C$DW$T$70, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$70, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$T$70, DW_AT_decl_line(0x4e)
.dwattr $C$DW$T$70, DW_AT_decl_column(0x23)
$C$DW$T$23 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$23, DW_AT_byte_size(0x10)
$C$DW$33 .dwtag DW_TAG_member
.dwattr $C$DW$33, DW_AT_type(*$C$DW$T$14)
.dwattr $C$DW$33, DW_AT_name("quot")
.dwattr $C$DW$33, DW_AT_TI_symbol_name("quot")
.dwattr $C$DW$33, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$33, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$33, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$33, DW_AT_decl_line(0x56)
.dwattr $C$DW$33, DW_AT_decl_column(0x1c)
$C$DW$34 .dwtag DW_TAG_member
.dwattr $C$DW$34, DW_AT_type(*$C$DW$T$14)
.dwattr $C$DW$34, DW_AT_name("rem")
.dwattr $C$DW$34, DW_AT_TI_symbol_name("rem")
.dwattr $C$DW$34, DW_AT_data_member_location[DW_OP_plus_uconst 0x8]
.dwattr $C$DW$34, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$34, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$34, DW_AT_decl_line(0x56)
.dwattr $C$DW$34, DW_AT_decl_column(0x22)
.dwattr $C$DW$T$23, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$T$23, DW_AT_decl_line(0x56)
.dwattr $C$DW$T$23, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$23
$C$DW$T$71 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$71, DW_AT_name("lldiv_t")
.dwattr $C$DW$T$71, DW_AT_type(*$C$DW$T$23)
.dwattr $C$DW$T$71, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$71, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$T$71, DW_AT_decl_line(0x56)
.dwattr $C$DW$T$71, DW_AT_decl_column(0x29)
$C$DW$T$24 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$24, DW_AT_byte_size(0x10)
$C$DW$35 .dwtag DW_TAG_member
.dwattr $C$DW$35, DW_AT_type(*$C$DW$T$14)
.dwattr $C$DW$35, DW_AT_name("__max_align1")
.dwattr $C$DW$35, DW_AT_TI_symbol_name("__max_align1")
.dwattr $C$DW$35, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$35, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$35, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$35, DW_AT_decl_line(0x70)
.dwattr $C$DW$35, DW_AT_decl_column(0x0c)
$C$DW$36 .dwtag DW_TAG_member
.dwattr $C$DW$36, DW_AT_type(*$C$DW$T$18)
.dwattr $C$DW$36, DW_AT_name("__max_align2")
.dwattr $C$DW$36, DW_AT_TI_symbol_name("__max_align2")
.dwattr $C$DW$36, DW_AT_data_member_location[DW_OP_plus_uconst 0x8]
.dwattr $C$DW$36, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$36, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$36, DW_AT_decl_line(0x71)
.dwattr $C$DW$36, DW_AT_decl_column(0x0e)
.dwattr $C$DW$T$24, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$24, DW_AT_decl_line(0x6f)
.dwattr $C$DW$T$24, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$24
$C$DW$T$72 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$72, DW_AT_name("__max_align_t")
.dwattr $C$DW$T$72, DW_AT_type(*$C$DW$T$24)
.dwattr $C$DW$T$72, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$72, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$72, DW_AT_decl_line(0x72)
.dwattr $C$DW$T$72, DW_AT_decl_column(0x03)
$C$DW$T$26 .dwtag DW_TAG_union_type
.dwattr $C$DW$T$26, DW_AT_byte_size(0x04)
$C$DW$37 .dwtag DW_TAG_member
.dwattr $C$DW$37, DW_AT_type(*$C$DW$T$3)
.dwattr $C$DW$37, DW_AT_name("pvDummy2")
.dwattr $C$DW$37, DW_AT_TI_symbol_name("pvDummy2")
.dwattr $C$DW$37, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$37, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$37, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$37, DW_AT_decl_line(0x42d)
.dwattr $C$DW$37, DW_AT_decl_column(0x09)
$C$DW$38 .dwtag DW_TAG_member
.dwattr $C$DW$38, DW_AT_type(*$C$DW$T$25)
.dwattr $C$DW$38, DW_AT_name("uxDummy2")
.dwattr $C$DW$38, DW_AT_TI_symbol_name("uxDummy2")
.dwattr $C$DW$38, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$38, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$38, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$38, DW_AT_decl_line(0x42e)
.dwattr $C$DW$38, DW_AT_decl_column(0x0f)
.dwattr $C$DW$T$26, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$26, DW_AT_decl_line(0x42c)
.dwattr $C$DW$T$26, DW_AT_decl_column(0x02)
.dwendtag $C$DW$T$26
$C$DW$T$31 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$31, DW_AT_name("HeapRegion")
.dwattr $C$DW$T$31, DW_AT_byte_size(0x08)
$C$DW$39 .dwtag DW_TAG_member
.dwattr $C$DW$39, DW_AT_type(*$C$DW$T$29)
.dwattr $C$DW$39, DW_AT_name("pucStartAddress")
.dwattr $C$DW$39, DW_AT_TI_symbol_name("pucStartAddress")
.dwattr $C$DW$39, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$39, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$39, DW_AT_decl_file("../OS/portable.h")
.dwattr $C$DW$39, DW_AT_decl_line(0x6e)
.dwattr $C$DW$39, DW_AT_decl_column(0x0b)
$C$DW$40 .dwtag DW_TAG_member
.dwattr $C$DW$40, DW_AT_type(*$C$DW$T$30)
.dwattr $C$DW$40, DW_AT_name("xSizeInBytes")
.dwattr $C$DW$40, DW_AT_TI_symbol_name("xSizeInBytes")
.dwattr $C$DW$40, DW_AT_data_member_location[DW_OP_plus_uconst 0x4]
.dwattr $C$DW$40, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$40, DW_AT_decl_file("../OS/portable.h")
.dwattr $C$DW$40, DW_AT_decl_line(0x6f)
.dwattr $C$DW$40, DW_AT_decl_column(0x09)
.dwattr $C$DW$T$31, DW_AT_decl_file("../OS/portable.h")
.dwattr $C$DW$T$31, DW_AT_decl_line(0x6c)
.dwattr $C$DW$T$31, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$31
$C$DW$T$73 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$73, DW_AT_name("HeapRegion_t")
.dwattr $C$DW$T$73, DW_AT_type(*$C$DW$T$31)
.dwattr $C$DW$T$73, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$73, DW_AT_decl_file("../OS/portable.h")
.dwattr $C$DW$T$73, DW_AT_decl_line(0x70)
.dwattr $C$DW$T$73, DW_AT_decl_column(0x03)
$C$DW$T$2 .dwtag DW_TAG_unspecified_type
.dwattr $C$DW$T$2, DW_AT_name("void")
$C$DW$T$3 .dwtag DW_TAG_pointer_type
.dwattr $C$DW$T$3, DW_AT_type(*$C$DW$T$2)
.dwattr $C$DW$T$3, DW_AT_address_class(0x20)
$C$DW$T$49 .dwtag DW_TAG_array_type
.dwattr $C$DW$T$49, DW_AT_type(*$C$DW$T$3)
.dwattr $C$DW$T$49, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$49, DW_AT_byte_size(0x10)
$C$DW$41 .dwtag DW_TAG_subrange_type
.dwattr $C$DW$41, DW_AT_upper_bound(0x03)
.dwendtag $C$DW$T$49
$C$DW$T$51 .dwtag DW_TAG_array_type
.dwattr $C$DW$T$51, DW_AT_type(*$C$DW$T$3)
.dwattr $C$DW$T$51, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$51, DW_AT_byte_size(0x08)
$C$DW$42 .dwtag DW_TAG_subrange_type
.dwattr $C$DW$42, DW_AT_upper_bound(0x01)
.dwendtag $C$DW$T$51
$C$DW$T$53 .dwtag DW_TAG_array_type
.dwattr $C$DW$T$53, DW_AT_type(*$C$DW$T$3)
.dwattr $C$DW$T$53, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$53, DW_AT_byte_size(0x0c)
$C$DW$43 .dwtag DW_TAG_subrange_type
.dwattr $C$DW$43, DW_AT_upper_bound(0x02)
.dwendtag $C$DW$T$53
$C$DW$T$65 .dwtag DW_TAG_subroutine_type
.dwattr $C$DW$T$65, DW_AT_language(DW_LANG_C)
$C$DW$44 .dwtag DW_TAG_formal_parameter
.dwattr $C$DW$44, DW_AT_type(*$C$DW$T$3)
.dwendtag $C$DW$T$65
$C$DW$T$66 .dwtag DW_TAG_pointer_type
.dwattr $C$DW$T$66, DW_AT_type(*$C$DW$T$65)
.dwattr $C$DW$T$66, DW_AT_address_class(0x20)
$C$DW$T$67 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$67, DW_AT_name("TaskFunction_t")
.dwattr $C$DW$T$67, DW_AT_type(*$C$DW$T$66)
.dwattr $C$DW$T$67, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$67, DW_AT_decl_file("../OS/projdefs.h")
.dwattr $C$DW$T$67, DW_AT_decl_line(0x23)
.dwattr $C$DW$T$67, DW_AT_decl_column(0x10)
$C$DW$T$81 .dwtag DW_TAG_subroutine_type
.dwattr $C$DW$T$81, DW_AT_language(DW_LANG_C)
.dwendtag $C$DW$T$81
$C$DW$T$82 .dwtag DW_TAG_pointer_type
.dwattr $C$DW$T$82, DW_AT_type(*$C$DW$T$81)
.dwattr $C$DW$T$82, DW_AT_address_class(0x20)
$C$DW$T$83 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$83, DW_AT_name("__TI_atexit_fn")
.dwattr $C$DW$T$83, DW_AT_type(*$C$DW$T$82)
.dwattr $C$DW$T$83, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$83, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$T$83, DW_AT_decl_line(0xb2)
.dwattr $C$DW$T$83, DW_AT_decl_column(0x14)
$C$DW$T$84 .dwtag DW_TAG_const_type
.dwattr $C$DW$T$84, DW_AT_type(*$C$DW$T$2)
$C$DW$T$85 .dwtag DW_TAG_pointer_type
.dwattr $C$DW$T$85, DW_AT_type(*$C$DW$T$84)
.dwattr $C$DW$T$85, DW_AT_address_class(0x20)
$C$DW$T$4 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$4, DW_AT_encoding(DW_ATE_boolean)
.dwattr $C$DW$T$4, DW_AT_name("bool")
.dwattr $C$DW$T$4, DW_AT_byte_size(0x01)
$C$DW$T$5 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$5, DW_AT_encoding(DW_ATE_signed_char)
.dwattr $C$DW$T$5, DW_AT_name("signed char")
.dwattr $C$DW$T$5, DW_AT_byte_size(0x01)
$C$DW$T$86 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$86, DW_AT_name("__int8_t")
.dwattr $C$DW$T$86, DW_AT_type(*$C$DW$T$5)
.dwattr $C$DW$T$86, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$86, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$86, DW_AT_decl_line(0x39)
.dwattr $C$DW$T$86, DW_AT_decl_column(0x16)
$C$DW$T$87 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$87, DW_AT_name("__int_least8_t")
.dwattr $C$DW$T$87, DW_AT_type(*$C$DW$T$86)
.dwattr $C$DW$T$87, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$87, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$87, DW_AT_decl_line(0x58)
.dwattr $C$DW$T$87, DW_AT_decl_column(0x12)
$C$DW$T$88 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$88, DW_AT_name("int_least8_t")
.dwattr $C$DW$T$88, DW_AT_type(*$C$DW$T$87)
.dwattr $C$DW$T$88, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$88, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$88, DW_AT_decl_line(0x28)
.dwattr $C$DW$T$88, DW_AT_decl_column(0x19)
$C$DW$T$89 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$89, DW_AT_name("int8_t")
.dwattr $C$DW$T$89, DW_AT_type(*$C$DW$T$86)
.dwattr $C$DW$T$89, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$89, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_stdint.h")
.dwattr $C$DW$T$89, DW_AT_decl_line(0x24)
.dwattr $C$DW$T$89, DW_AT_decl_column(0x13)
$C$DW$T$6 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$6, DW_AT_encoding(DW_ATE_unsigned_char)
.dwattr $C$DW$T$6, DW_AT_name("unsigned char")
.dwattr $C$DW$T$6, DW_AT_byte_size(0x01)
$C$DW$T$27 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$27, DW_AT_name("__uint8_t")
.dwattr $C$DW$T$27, DW_AT_type(*$C$DW$T$6)
.dwattr $C$DW$T$27, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$27, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$27, DW_AT_decl_line(0x3a)
.dwattr $C$DW$T$27, DW_AT_decl_column(0x18)
$C$DW$T$90 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$90, DW_AT_name("__sa_family_t")
.dwattr $C$DW$T$90, DW_AT_type(*$C$DW$T$27)
.dwattr $C$DW$T$90, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$90, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$90, DW_AT_decl_line(0x43)
.dwattr $C$DW$T$90, DW_AT_decl_column(0x13)
$C$DW$T$91 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$91, DW_AT_name("__uint_least8_t")
.dwattr $C$DW$T$91, DW_AT_type(*$C$DW$T$27)
.dwattr $C$DW$T$91, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$91, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$91, DW_AT_decl_line(0x6d)
.dwattr $C$DW$T$91, DW_AT_decl_column(0x13)
$C$DW$T$92 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$92, DW_AT_name("uint_least8_t")
.dwattr $C$DW$T$92, DW_AT_type(*$C$DW$T$91)
.dwattr $C$DW$T$92, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$92, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$92, DW_AT_decl_line(0x2d)
.dwattr $C$DW$T$92, DW_AT_decl_column(0x1a)
$C$DW$T$28 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$28, DW_AT_name("uint8_t")
.dwattr $C$DW$T$28, DW_AT_type(*$C$DW$T$27)
.dwattr $C$DW$T$28, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$28, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_stdint.h")
.dwattr $C$DW$T$28, DW_AT_decl_line(0x38)
.dwattr $C$DW$T$28, DW_AT_decl_column(0x14)
$C$DW$T$29 .dwtag DW_TAG_pointer_type
.dwattr $C$DW$T$29, DW_AT_type(*$C$DW$T$28)
.dwattr $C$DW$T$29, DW_AT_address_class(0x20)
$C$DW$T$56 .dwtag DW_TAG_array_type
.dwattr $C$DW$T$56, DW_AT_type(*$C$DW$T$28)
.dwattr $C$DW$T$56, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$56, DW_AT_byte_size(0x02)
$C$DW$45 .dwtag DW_TAG_subrange_type
.dwattr $C$DW$45, DW_AT_upper_bound(0x01)
.dwendtag $C$DW$T$56
$C$DW$T$62 .dwtag DW_TAG_array_type
.dwattr $C$DW$T$62, DW_AT_type(*$C$DW$T$28)
.dwattr $C$DW$T$62, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$62, DW_AT_byte_size(0x0c)
$C$DW$46 .dwtag DW_TAG_subrange_type
.dwattr $C$DW$46, DW_AT_upper_bound(0x0b)
.dwendtag $C$DW$T$62
$C$DW$T$7 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$7, DW_AT_encoding(DW_ATE_signed_char)
.dwattr $C$DW$T$7, DW_AT_name("wchar_t")
.dwattr $C$DW$T$7, DW_AT_byte_size(0x02)
$C$DW$T$8 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$8, DW_AT_encoding(DW_ATE_signed)
.dwattr $C$DW$T$8, DW_AT_name("short")
.dwattr $C$DW$T$8, DW_AT_byte_size(0x02)
$C$DW$T$93 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$93, DW_AT_name("__int16_t")
.dwattr $C$DW$T$93, DW_AT_type(*$C$DW$T$8)
.dwattr $C$DW$T$93, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$93, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$93, DW_AT_decl_line(0x3b)
.dwattr $C$DW$T$93, DW_AT_decl_column(0x11)
$C$DW$T$94 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$94, DW_AT_name("__int_least16_t")
.dwattr $C$DW$T$94, DW_AT_type(*$C$DW$T$93)
.dwattr $C$DW$T$94, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$94, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$94, DW_AT_decl_line(0x59)
.dwattr $C$DW$T$94, DW_AT_decl_column(0x13)
$C$DW$T$95 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$95, DW_AT_name("int_least16_t")
.dwattr $C$DW$T$95, DW_AT_type(*$C$DW$T$94)
.dwattr $C$DW$T$95, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$95, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$95, DW_AT_decl_line(0x29)
.dwattr $C$DW$T$95, DW_AT_decl_column(0x1a)
$C$DW$T$96 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$96, DW_AT_name("int16_t")
.dwattr $C$DW$T$96, DW_AT_type(*$C$DW$T$93)
.dwattr $C$DW$T$96, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$96, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_stdint.h")
.dwattr $C$DW$T$96, DW_AT_decl_line(0x29)
.dwattr $C$DW$T$96, DW_AT_decl_column(0x14)
$C$DW$T$9 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$9, DW_AT_encoding(DW_ATE_unsigned)
.dwattr $C$DW$T$9, DW_AT_name("unsigned short")
.dwattr $C$DW$T$9, DW_AT_byte_size(0x02)
$C$DW$T$97 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$97, DW_AT_name("___wchar_t")
.dwattr $C$DW$T$97, DW_AT_type(*$C$DW$T$9)
.dwattr $C$DW$T$97, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$97, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$97, DW_AT_decl_line(0x76)
.dwattr $C$DW$T$97, DW_AT_decl_column(0x1a)
$C$DW$T$98 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$98, DW_AT_name("__uint16_t")
.dwattr $C$DW$T$98, DW_AT_type(*$C$DW$T$9)
.dwattr $C$DW$T$98, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$98, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$98, DW_AT_decl_line(0x3c)
.dwattr $C$DW$T$98, DW_AT_decl_column(0x19)
$C$DW$T$99 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$99, DW_AT_name("__mode_t")
.dwattr $C$DW$T$99, DW_AT_type(*$C$DW$T$98)
.dwattr $C$DW$T$99, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$99, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$99, DW_AT_decl_line(0x39)
.dwattr $C$DW$T$99, DW_AT_decl_column(0x14)
$C$DW$T$100 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$100, DW_AT_name("__uint_least16_t")
.dwattr $C$DW$T$100, DW_AT_type(*$C$DW$T$98)
.dwattr $C$DW$T$100, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$100, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$100, DW_AT_decl_line(0x6e)
.dwattr $C$DW$T$100, DW_AT_decl_column(0x14)
$C$DW$T$101 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$101, DW_AT_name("__char16_t")
.dwattr $C$DW$T$101, DW_AT_type(*$C$DW$T$100)
.dwattr $C$DW$T$101, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$101, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$101, DW_AT_decl_line(0x66)
.dwattr $C$DW$T$101, DW_AT_decl_column(0x1a)
$C$DW$T$102 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$102, DW_AT_name("uint_least16_t")
.dwattr $C$DW$T$102, DW_AT_type(*$C$DW$T$100)
.dwattr $C$DW$T$102, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$102, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$102, DW_AT_decl_line(0x2e)
.dwattr $C$DW$T$102, DW_AT_decl_column(0x1a)
$C$DW$T$103 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$103, DW_AT_name("uint16_t")
.dwattr $C$DW$T$103, DW_AT_type(*$C$DW$T$98)
.dwattr $C$DW$T$103, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$103, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_stdint.h")
.dwattr $C$DW$T$103, DW_AT_decl_line(0x3d)
.dwattr $C$DW$T$103, DW_AT_decl_column(0x15)
$C$DW$T$104 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$104, DW_AT_name("wchar_t")
.dwattr $C$DW$T$104, DW_AT_type(*$C$DW$T$9)
.dwattr $C$DW$T$104, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$104, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$T$104, DW_AT_decl_line(0x6e)
.dwattr $C$DW$T$104, DW_AT_decl_column(0x1a)
$C$DW$T$10 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$10, DW_AT_encoding(DW_ATE_signed)
.dwattr $C$DW$T$10, DW_AT_name("int")
.dwattr $C$DW$T$10, DW_AT_byte_size(0x04)
$C$DW$T$105 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$105, DW_AT_name("_Mbstatet")
.dwattr $C$DW$T$105, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$T$105, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$105, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$105, DW_AT_decl_line(0x84)
.dwattr $C$DW$T$105, DW_AT_decl_column(0x0d)
$C$DW$T$106 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$106, DW_AT_name("__mbstate_t")
.dwattr $C$DW$T$106, DW_AT_type(*$C$DW$T$105)
.dwattr $C$DW$T$106, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$106, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$106, DW_AT_decl_line(0x87)
.dwattr $C$DW$T$106, DW_AT_decl_column(0x13)
$C$DW$T$107 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$107, DW_AT_name("__accmode_t")
.dwattr $C$DW$T$107, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$T$107, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$107, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$107, DW_AT_decl_line(0x3a)
.dwattr $C$DW$T$107, DW_AT_decl_column(0x0e)
$C$DW$T$108 .dwtag DW_TAG_subroutine_type
.dwattr $C$DW$T$108, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$T$108, DW_AT_language(DW_LANG_C)
$C$DW$47 .dwtag DW_TAG_formal_parameter
.dwattr $C$DW$47, DW_AT_type(*$C$DW$T$85)
$C$DW$48 .dwtag DW_TAG_formal_parameter
.dwattr $C$DW$48, DW_AT_type(*$C$DW$T$85)
.dwendtag $C$DW$T$108
$C$DW$T$109 .dwtag DW_TAG_pointer_type
.dwattr $C$DW$T$109, DW_AT_type(*$C$DW$T$108)
.dwattr $C$DW$T$109, DW_AT_address_class(0x20)
$C$DW$T$110 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$110, DW_AT_name("__TI_compar_fn")
.dwattr $C$DW$T$110, DW_AT_type(*$C$DW$T$109)
.dwattr $C$DW$T$110, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$110, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$T$110, DW_AT_decl_line(0xb5)
.dwattr $C$DW$T$110, DW_AT_decl_column(0x13)
$C$DW$T$111 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$111, DW_AT_name("__cpulevel_t")
.dwattr $C$DW$T$111, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$T$111, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$111, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$111, DW_AT_decl_line(0x4b)
.dwattr $C$DW$T$111, DW_AT_decl_column(0x0e)
$C$DW$T$112 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$112, DW_AT_name("__cpusetid_t")
.dwattr $C$DW$T$112, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$T$112, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$112, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$112, DW_AT_decl_line(0x4c)
.dwattr $C$DW$T$112, DW_AT_decl_column(0x0e)
$C$DW$T$113 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$113, DW_AT_name("__cpuwhich_t")
.dwattr $C$DW$T$113, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$T$113, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$113, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$113, DW_AT_decl_line(0x4a)
.dwattr $C$DW$T$113, DW_AT_decl_column(0x0e)
$C$DW$T$114 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$114, DW_AT_name("__ct_rune_t")
.dwattr $C$DW$T$114, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$T$114, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$114, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$114, DW_AT_decl_line(0x60)
.dwattr $C$DW$T$114, DW_AT_decl_column(0x0e)
$C$DW$T$115 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$115, DW_AT_name("__rune_t")
.dwattr $C$DW$T$115, DW_AT_type(*$C$DW$T$114)
.dwattr $C$DW$T$115, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$115, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$115, DW_AT_decl_line(0x61)
.dwattr $C$DW$T$115, DW_AT_decl_column(0x15)
$C$DW$T$116 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$116, DW_AT_name("__wint_t")
.dwattr $C$DW$T$116, DW_AT_type(*$C$DW$T$114)
.dwattr $C$DW$T$116, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$116, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$116, DW_AT_decl_line(0x62)
.dwattr $C$DW$T$116, DW_AT_decl_column(0x15)
$C$DW$T$117 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$117, DW_AT_name("__int32_t")
.dwattr $C$DW$T$117, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$T$117, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$117, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$117, DW_AT_decl_line(0x3d)
.dwattr $C$DW$T$117, DW_AT_decl_column(0x0f)
$C$DW$T$118 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$118, DW_AT_name("__blksize_t")
.dwattr $C$DW$T$118, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$118, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$118, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$118, DW_AT_decl_line(0x2e)
.dwattr $C$DW$T$118, DW_AT_decl_column(0x13)
$C$DW$T$119 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$119, DW_AT_name("__clockid_t")
.dwattr $C$DW$T$119, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$119, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$119, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$119, DW_AT_decl_line(0x30)
.dwattr $C$DW$T$119, DW_AT_decl_column(0x13)
$C$DW$T$120 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$120, DW_AT_name("__critical_t")
.dwattr $C$DW$T$120, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$120, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$120, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$120, DW_AT_decl_line(0x4e)
.dwattr $C$DW$T$120, DW_AT_decl_column(0x13)
$C$DW$T$121 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$121, DW_AT_name("__int_fast16_t")
.dwattr $C$DW$T$121, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$121, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$121, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$121, DW_AT_decl_line(0x55)
.dwattr $C$DW$T$121, DW_AT_decl_column(0x13)
$C$DW$T$122 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$122, DW_AT_name("int_fast16_t")
.dwattr $C$DW$T$122, DW_AT_type(*$C$DW$T$121)
.dwattr $C$DW$T$122, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$122, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$122, DW_AT_decl_line(0x33)
.dwattr $C$DW$T$122, DW_AT_decl_column(0x19)
$C$DW$T$123 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$123, DW_AT_name("__int_fast32_t")
.dwattr $C$DW$T$123, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$123, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$123, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$123, DW_AT_decl_line(0x56)
.dwattr $C$DW$T$123, DW_AT_decl_column(0x13)
$C$DW$T$124 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$124, DW_AT_name("int_fast32_t")
.dwattr $C$DW$T$124, DW_AT_type(*$C$DW$T$123)
.dwattr $C$DW$T$124, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$124, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$124, DW_AT_decl_line(0x34)
.dwattr $C$DW$T$124, DW_AT_decl_column(0x19)
$C$DW$T$125 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$125, DW_AT_name("__int_fast8_t")
.dwattr $C$DW$T$125, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$125, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$125, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$125, DW_AT_decl_line(0x54)
.dwattr $C$DW$T$125, DW_AT_decl_column(0x13)
$C$DW$T$126 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$126, DW_AT_name("int_fast8_t")
.dwattr $C$DW$T$126, DW_AT_type(*$C$DW$T$125)
.dwattr $C$DW$T$126, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$126, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$126, DW_AT_decl_line(0x32)
.dwattr $C$DW$T$126, DW_AT_decl_column(0x18)
$C$DW$T$127 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$127, DW_AT_name("__int_least32_t")
.dwattr $C$DW$T$127, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$127, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$127, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$127, DW_AT_decl_line(0x5a)
.dwattr $C$DW$T$127, DW_AT_decl_column(0x13)
$C$DW$T$128 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$128, DW_AT_name("int_least32_t")
.dwattr $C$DW$T$128, DW_AT_type(*$C$DW$T$127)
.dwattr $C$DW$T$128, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$128, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$128, DW_AT_decl_line(0x2a)
.dwattr $C$DW$T$128, DW_AT_decl_column(0x1a)
$C$DW$T$129 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$129, DW_AT_name("__intfptr_t")
.dwattr $C$DW$T$129, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$129, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$129, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$129, DW_AT_decl_line(0x51)
.dwattr $C$DW$T$129, DW_AT_decl_column(0x13)
$C$DW$T$130 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$130, DW_AT_name("__intptr_t")
.dwattr $C$DW$T$130, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$130, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$130, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$130, DW_AT_decl_line(0x53)
.dwattr $C$DW$T$130, DW_AT_decl_column(0x13)
$C$DW$T$131 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$131, DW_AT_name("intptr_t")
.dwattr $C$DW$T$131, DW_AT_type(*$C$DW$T$130)
.dwattr $C$DW$T$131, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$131, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_stdint.h")
.dwattr $C$DW$T$131, DW_AT_decl_line(0x4c)
.dwattr $C$DW$T$131, DW_AT_decl_column(0x15)
$C$DW$T$132 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$132, DW_AT_name("__lwpid_t")
.dwattr $C$DW$T$132, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$132, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$132, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$132, DW_AT_decl_line(0x38)
.dwattr $C$DW$T$132, DW_AT_decl_column(0x13)
$C$DW$T$133 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$133, DW_AT_name("__pid_t")
.dwattr $C$DW$T$133, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$133, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$133, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$133, DW_AT_decl_line(0x3f)
.dwattr $C$DW$T$133, DW_AT_decl_column(0x13)
$C$DW$T$134 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$134, DW_AT_name("__ptrdiff_t")
.dwattr $C$DW$T$134, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$134, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$134, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$134, DW_AT_decl_line(0x5c)
.dwattr $C$DW$T$134, DW_AT_decl_column(0x13)
$C$DW$T$135 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$135, DW_AT_name("__register_t")
.dwattr $C$DW$T$135, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$135, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$135, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$135, DW_AT_decl_line(0x5d)
.dwattr $C$DW$T$135, DW_AT_decl_column(0x13)
$C$DW$T$136 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$136, DW_AT_name("__segsz_t")
.dwattr $C$DW$T$136, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$136, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$136, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$136, DW_AT_decl_line(0x5e)
.dwattr $C$DW$T$136, DW_AT_decl_column(0x13)
$C$DW$T$137 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$137, DW_AT_name("__ssize_t")
.dwattr $C$DW$T$137, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$137, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$137, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$137, DW_AT_decl_line(0x60)
.dwattr $C$DW$T$137, DW_AT_decl_column(0x13)
$C$DW$T$138 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$138, DW_AT_name("int32_t")
.dwattr $C$DW$T$138, DW_AT_type(*$C$DW$T$117)
.dwattr $C$DW$T$138, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$138, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_stdint.h")
.dwattr $C$DW$T$138, DW_AT_decl_line(0x2e)
.dwattr $C$DW$T$138, DW_AT_decl_column(0x14)
$C$DW$T$139 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$139, DW_AT_name("__nl_item")
.dwattr $C$DW$T$139, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$T$139, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$139, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$139, DW_AT_decl_line(0x3b)
.dwattr $C$DW$T$139, DW_AT_decl_column(0x0e)
$C$DW$T$140 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$140, DW_AT_name("ptrdiff_t")
.dwattr $C$DW$T$140, DW_AT_type(*$C$DW$T$10)
.dwattr $C$DW$T$140, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$140, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stddef.h")
.dwattr $C$DW$T$140, DW_AT_decl_line(0x36)
.dwattr $C$DW$T$140, DW_AT_decl_column(0x1c)
$C$DW$T$11 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$11, DW_AT_encoding(DW_ATE_unsigned)
.dwattr $C$DW$T$11, DW_AT_name("unsigned int")
.dwattr $C$DW$T$11, DW_AT_byte_size(0x04)
$C$DW$T$38 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$38, DW_AT_name("__uint32_t")
.dwattr $C$DW$T$38, DW_AT_type(*$C$DW$T$11)
.dwattr $C$DW$T$38, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$38, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$38, DW_AT_decl_line(0x3e)
.dwattr $C$DW$T$38, DW_AT_decl_column(0x17)
$C$DW$T$141 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$141, DW_AT_name("__clock_t")
.dwattr $C$DW$T$141, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$141, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$141, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$141, DW_AT_decl_line(0x4d)
.dwattr $C$DW$T$141, DW_AT_decl_column(0x14)
$C$DW$T$142 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$142, DW_AT_name("__fflags_t")
.dwattr $C$DW$T$142, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$142, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$142, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$142, DW_AT_decl_line(0x31)
.dwattr $C$DW$T$142, DW_AT_decl_column(0x14)
$C$DW$T$143 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$143, DW_AT_name("__fixpt_t")
.dwattr $C$DW$T$143, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$143, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$143, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$143, DW_AT_decl_line(0x76)
.dwattr $C$DW$T$143, DW_AT_decl_column(0x14)
$C$DW$T$144 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$144, DW_AT_name("__gid_t")
.dwattr $C$DW$T$144, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$144, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$144, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$144, DW_AT_decl_line(0x34)
.dwattr $C$DW$T$144, DW_AT_decl_column(0x14)
$C$DW$T$145 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$145, DW_AT_name("__size_t")
.dwattr $C$DW$T$145, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$145, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$145, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$145, DW_AT_decl_line(0x5f)
.dwattr $C$DW$T$145, DW_AT_decl_column(0x14)
$C$DW$T$146 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$146, DW_AT_name("__socklen_t")
.dwattr $C$DW$T$146, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$146, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$146, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$146, DW_AT_decl_line(0x44)
.dwattr $C$DW$T$146, DW_AT_decl_column(0x14)
$C$DW$T$147 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$147, DW_AT_name("__time_t")
.dwattr $C$DW$T$147, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$147, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$147, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$147, DW_AT_decl_line(0x64)
.dwattr $C$DW$T$147, DW_AT_decl_column(0x19)
$C$DW$T$148 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$148, DW_AT_name("__u_register_t")
.dwattr $C$DW$T$148, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$148, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$148, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$148, DW_AT_decl_line(0x71)
.dwattr $C$DW$T$148, DW_AT_decl_column(0x14)
$C$DW$T$149 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$149, DW_AT_name("__uid_t")
.dwattr $C$DW$T$149, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$149, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$149, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$149, DW_AT_decl_line(0x48)
.dwattr $C$DW$T$149, DW_AT_decl_column(0x14)
$C$DW$T$150 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$150, DW_AT_name("__uint_fast16_t")
.dwattr $C$DW$T$150, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$150, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$150, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$150, DW_AT_decl_line(0x6a)
.dwattr $C$DW$T$150, DW_AT_decl_column(0x14)
$C$DW$T$151 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$151, DW_AT_name("uint_fast16_t")
.dwattr $C$DW$T$151, DW_AT_type(*$C$DW$T$150)
.dwattr $C$DW$T$151, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$151, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$151, DW_AT_decl_line(0x38)
.dwattr $C$DW$T$151, DW_AT_decl_column(0x1a)
$C$DW$T$152 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$152, DW_AT_name("__uint_fast32_t")
.dwattr $C$DW$T$152, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$152, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$152, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$152, DW_AT_decl_line(0x6b)
.dwattr $C$DW$T$152, DW_AT_decl_column(0x14)
$C$DW$T$153 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$153, DW_AT_name("uint_fast32_t")
.dwattr $C$DW$T$153, DW_AT_type(*$C$DW$T$152)
.dwattr $C$DW$T$153, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$153, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$153, DW_AT_decl_line(0x39)
.dwattr $C$DW$T$153, DW_AT_decl_column(0x1a)
$C$DW$T$154 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$154, DW_AT_name("__uint_fast8_t")
.dwattr $C$DW$T$154, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$154, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$154, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$154, DW_AT_decl_line(0x69)
.dwattr $C$DW$T$154, DW_AT_decl_column(0x14)
$C$DW$T$155 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$155, DW_AT_name("uint_fast8_t")
.dwattr $C$DW$T$155, DW_AT_type(*$C$DW$T$154)
.dwattr $C$DW$T$155, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$155, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$155, DW_AT_decl_line(0x37)
.dwattr $C$DW$T$155, DW_AT_decl_column(0x19)
$C$DW$T$156 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$156, DW_AT_name("__uint_least32_t")
.dwattr $C$DW$T$156, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$156, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$156, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$156, DW_AT_decl_line(0x6f)
.dwattr $C$DW$T$156, DW_AT_decl_column(0x14)
$C$DW$T$157 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$157, DW_AT_name("__char32_t")
.dwattr $C$DW$T$157, DW_AT_type(*$C$DW$T$156)
.dwattr $C$DW$T$157, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$157, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$157, DW_AT_decl_line(0x67)
.dwattr $C$DW$T$157, DW_AT_decl_column(0x1a)
$C$DW$T$158 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$158, DW_AT_name("uint_least32_t")
.dwattr $C$DW$T$158, DW_AT_type(*$C$DW$T$156)
.dwattr $C$DW$T$158, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$158, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$158, DW_AT_decl_line(0x2f)
.dwattr $C$DW$T$158, DW_AT_decl_column(0x1a)
$C$DW$T$159 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$159, DW_AT_name("__uintfptr_t")
.dwattr $C$DW$T$159, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$159, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$159, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$159, DW_AT_decl_line(0x66)
.dwattr $C$DW$T$159, DW_AT_decl_column(0x14)
$C$DW$T$160 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$160, DW_AT_name("__uintptr_t")
.dwattr $C$DW$T$160, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$160, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$160, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$160, DW_AT_decl_line(0x68)
.dwattr $C$DW$T$160, DW_AT_decl_column(0x14)
$C$DW$T$161 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$161, DW_AT_name("uintptr_t")
.dwattr $C$DW$T$161, DW_AT_type(*$C$DW$T$160)
.dwattr $C$DW$T$161, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$161, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_stdint.h")
.dwattr $C$DW$T$161, DW_AT_decl_line(0x50)
.dwattr $C$DW$T$161, DW_AT_decl_column(0x16)
$C$DW$T$162 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$162, DW_AT_name("__vm_offset_t")
.dwattr $C$DW$T$162, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$162, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$162, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$162, DW_AT_decl_line(0x72)
.dwattr $C$DW$T$162, DW_AT_decl_column(0x14)
$C$DW$T$163 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$163, DW_AT_name("__vm_paddr_t")
.dwattr $C$DW$T$163, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$163, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$163, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$163, DW_AT_decl_line(0x73)
.dwattr $C$DW$T$163, DW_AT_decl_column(0x14)
$C$DW$T$164 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$164, DW_AT_name("__vm_size_t")
.dwattr $C$DW$T$164, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$164, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$164, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$164, DW_AT_decl_line(0x74)
.dwattr $C$DW$T$164, DW_AT_decl_column(0x14)
$C$DW$T$39 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$39, DW_AT_name("uint32_t")
.dwattr $C$DW$T$39, DW_AT_type(*$C$DW$T$38)
.dwattr $C$DW$T$39, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$39, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_stdint.h")
.dwattr $C$DW$T$39, DW_AT_decl_line(0x42)
.dwattr $C$DW$T$39, DW_AT_decl_column(0x15)
$C$DW$T$165 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$165, DW_AT_name("StackType_t")
.dwattr $C$DW$T$165, DW_AT_type(*$C$DW$T$39)
.dwattr $C$DW$T$165, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$165, DW_AT_decl_file("../OS/portmacro.h")
.dwattr $C$DW$T$165, DW_AT_decl_line(0x37)
.dwattr $C$DW$T$165, DW_AT_decl_column(0x18)
$C$DW$T$40 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$40, DW_AT_name("TickType_t")
.dwattr $C$DW$T$40, DW_AT_type(*$C$DW$T$39)
.dwattr $C$DW$T$40, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$40, DW_AT_decl_file("../OS/portmacro.h")
.dwattr $C$DW$T$40, DW_AT_decl_line(0x3f)
.dwattr $C$DW$T$40, DW_AT_decl_column(0x13)
$C$DW$T$166 .dwtag DW_TAG_const_type
.dwattr $C$DW$T$166, DW_AT_type(*$C$DW$T$40)
$C$DW$T$167 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$167, DW_AT_name("__useconds_t")
.dwattr $C$DW$T$167, DW_AT_type(*$C$DW$T$11)
.dwattr $C$DW$T$167, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$167, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$167, DW_AT_decl_line(0x49)
.dwattr $C$DW$T$167, DW_AT_decl_column(0x16)
$C$DW$T$30 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$30, DW_AT_name("size_t")
.dwattr $C$DW$T$30, DW_AT_type(*$C$DW$T$11)
.dwattr $C$DW$T$30, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$30, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stdlib.h")
.dwattr $C$DW$T$30, DW_AT_decl_line(0x68)
.dwattr $C$DW$T$30, DW_AT_decl_column(0x19)
$C$DW$T$58 .dwtag DW_TAG_array_type
.dwattr $C$DW$T$58, DW_AT_type(*$C$DW$T$30)
.dwattr $C$DW$T$58, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$58, DW_AT_byte_size(0x10)
$C$DW$49 .dwtag DW_TAG_subrange_type
.dwattr $C$DW$49, DW_AT_upper_bound(0x03)
.dwendtag $C$DW$T$58
$C$DW$T$12 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$12, DW_AT_encoding(DW_ATE_signed)
.dwattr $C$DW$T$12, DW_AT_name("long")
.dwattr $C$DW$T$12, DW_AT_byte_size(0x04)
$C$DW$T$168 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$168, DW_AT_name("BaseType_t")
.dwattr $C$DW$T$168, DW_AT_type(*$C$DW$T$12)
.dwattr $C$DW$T$168, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$168, DW_AT_decl_file("../OS/portmacro.h")
.dwattr $C$DW$T$168, DW_AT_decl_line(0x38)
.dwattr $C$DW$T$168, DW_AT_decl_column(0x0e)
$C$DW$T$169 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$169, DW_AT_name("__key_t")
.dwattr $C$DW$T$169, DW_AT_type(*$C$DW$T$12)
.dwattr $C$DW$T$169, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$169, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$169, DW_AT_decl_line(0x37)
.dwattr $C$DW$T$169, DW_AT_decl_column(0x0f)
$C$DW$T$170 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$170, DW_AT_name("__suseconds_t")
.dwattr $C$DW$T$170, DW_AT_type(*$C$DW$T$12)
.dwattr $C$DW$T$170, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$170, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$170, DW_AT_decl_line(0x45)
.dwattr $C$DW$T$170, DW_AT_decl_column(0x0f)
$C$DW$T$13 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$13, DW_AT_encoding(DW_ATE_unsigned)
.dwattr $C$DW$T$13, DW_AT_name("unsigned long")
.dwattr $C$DW$T$13, DW_AT_byte_size(0x04)
$C$DW$T$25 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$25, DW_AT_name("UBaseType_t")
.dwattr $C$DW$T$25, DW_AT_type(*$C$DW$T$13)
.dwattr $C$DW$T$25, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$25, DW_AT_decl_file("../OS/portmacro.h")
.dwattr $C$DW$T$25, DW_AT_decl_line(0x39)
.dwattr $C$DW$T$25, DW_AT_decl_column(0x17)
$C$DW$T$33 .dwtag DW_TAG_volatile_type
.dwattr $C$DW$T$33, DW_AT_type(*$C$DW$T$25)
$C$DW$T$55 .dwtag DW_TAG_array_type
.dwattr $C$DW$T$55, DW_AT_type(*$C$DW$T$25)
.dwattr $C$DW$T$55, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$55, DW_AT_byte_size(0x0c)
$C$DW$50 .dwtag DW_TAG_subrange_type
.dwattr $C$DW$50, DW_AT_upper_bound(0x02)
.dwendtag $C$DW$T$55
$C$DW$T$63 .dwtag DW_TAG_array_type
.dwattr $C$DW$T$63, DW_AT_type(*$C$DW$T$25)
.dwattr $C$DW$T$63, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$63, DW_AT_byte_size(0x08)
$C$DW$51 .dwtag DW_TAG_subrange_type
.dwattr $C$DW$51, DW_AT_upper_bound(0x01)
.dwendtag $C$DW$T$63
$C$DW$T$14 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$14, DW_AT_encoding(DW_ATE_signed)
.dwattr $C$DW$T$14, DW_AT_name("long long")
.dwattr $C$DW$T$14, DW_AT_byte_size(0x08)
$C$DW$T$172 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$172, DW_AT_name("__int64_t")
.dwattr $C$DW$T$172, DW_AT_type(*$C$DW$T$14)
.dwattr $C$DW$T$172, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$172, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$172, DW_AT_decl_line(0x43)
.dwattr $C$DW$T$172, DW_AT_decl_column(0x14)
$C$DW$T$173 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$173, DW_AT_name("__blkcnt_t")
.dwattr $C$DW$T$173, DW_AT_type(*$C$DW$T$172)
.dwattr $C$DW$T$173, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$173, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$173, DW_AT_decl_line(0x2f)
.dwattr $C$DW$T$173, DW_AT_decl_column(0x13)
$C$DW$T$174 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$174, DW_AT_name("__id_t")
.dwattr $C$DW$T$174, DW_AT_type(*$C$DW$T$172)
.dwattr $C$DW$T$174, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$174, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$174, DW_AT_decl_line(0x35)
.dwattr $C$DW$T$174, DW_AT_decl_column(0x13)
$C$DW$T$175 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$175, DW_AT_name("__int_fast64_t")
.dwattr $C$DW$T$175, DW_AT_type(*$C$DW$T$172)
.dwattr $C$DW$T$175, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$175, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$175, DW_AT_decl_line(0x57)
.dwattr $C$DW$T$175, DW_AT_decl_column(0x13)
$C$DW$T$176 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$176, DW_AT_name("int_fast64_t")
.dwattr $C$DW$T$176, DW_AT_type(*$C$DW$T$175)
.dwattr $C$DW$T$176, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$176, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$176, DW_AT_decl_line(0x35)
.dwattr $C$DW$T$176, DW_AT_decl_column(0x19)
$C$DW$T$177 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$177, DW_AT_name("__int_least64_t")
.dwattr $C$DW$T$177, DW_AT_type(*$C$DW$T$172)
.dwattr $C$DW$T$177, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$177, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$177, DW_AT_decl_line(0x5b)
.dwattr $C$DW$T$177, DW_AT_decl_column(0x13)
$C$DW$T$178 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$178, DW_AT_name("int_least64_t")
.dwattr $C$DW$T$178, DW_AT_type(*$C$DW$T$177)
.dwattr $C$DW$T$178, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$178, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$178, DW_AT_decl_line(0x2b)
.dwattr $C$DW$T$178, DW_AT_decl_column(0x1a)
$C$DW$T$179 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$179, DW_AT_name("__intmax_t")
.dwattr $C$DW$T$179, DW_AT_type(*$C$DW$T$172)
.dwattr $C$DW$T$179, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$179, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$179, DW_AT_decl_line(0x52)
.dwattr $C$DW$T$179, DW_AT_decl_column(0x13)
$C$DW$T$180 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$180, DW_AT_name("intmax_t")
.dwattr $C$DW$T$180, DW_AT_type(*$C$DW$T$179)
.dwattr $C$DW$T$180, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$180, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_stdint.h")
.dwattr $C$DW$T$180, DW_AT_decl_line(0x54)
.dwattr $C$DW$T$180, DW_AT_decl_column(0x15)
$C$DW$T$181 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$181, DW_AT_name("__off64_t")
.dwattr $C$DW$T$181, DW_AT_type(*$C$DW$T$172)
.dwattr $C$DW$T$181, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$181, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$181, DW_AT_decl_line(0x3e)
.dwattr $C$DW$T$181, DW_AT_decl_column(0x13)
$C$DW$T$182 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$182, DW_AT_name("__off_t")
.dwattr $C$DW$T$182, DW_AT_type(*$C$DW$T$172)
.dwattr $C$DW$T$182, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$182, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$182, DW_AT_decl_line(0x3d)
.dwattr $C$DW$T$182, DW_AT_decl_column(0x13)
$C$DW$T$183 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$183, DW_AT_name("__rlim_t")
.dwattr $C$DW$T$183, DW_AT_type(*$C$DW$T$172)
.dwattr $C$DW$T$183, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$183, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$183, DW_AT_decl_line(0x40)
.dwattr $C$DW$T$183, DW_AT_decl_column(0x13)
$C$DW$T$184 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$184, DW_AT_name("int64_t")
.dwattr $C$DW$T$184, DW_AT_type(*$C$DW$T$172)
.dwattr $C$DW$T$184, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$184, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_stdint.h")
.dwattr $C$DW$T$184, DW_AT_decl_line(0x33)
.dwattr $C$DW$T$184, DW_AT_decl_column(0x14)
$C$DW$T$15 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$15, DW_AT_encoding(DW_ATE_unsigned)
.dwattr $C$DW$T$15, DW_AT_name("unsigned long long")
.dwattr $C$DW$T$15, DW_AT_byte_size(0x08)
$C$DW$T$185 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$185, DW_AT_name("__uint64_t")
.dwattr $C$DW$T$185, DW_AT_type(*$C$DW$T$15)
.dwattr $C$DW$T$185, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$185, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$185, DW_AT_decl_line(0x48)
.dwattr $C$DW$T$185, DW_AT_decl_column(0x1c)
$C$DW$T$186 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$186, DW_AT_name("__dev_t")
.dwattr $C$DW$T$186, DW_AT_type(*$C$DW$T$185)
.dwattr $C$DW$T$186, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$186, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$186, DW_AT_decl_line(0x74)
.dwattr $C$DW$T$186, DW_AT_decl_column(0x14)
$C$DW$T$187 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$187, DW_AT_name("__fsblkcnt_t")
.dwattr $C$DW$T$187, DW_AT_type(*$C$DW$T$185)
.dwattr $C$DW$T$187, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$187, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$187, DW_AT_decl_line(0x32)
.dwattr $C$DW$T$187, DW_AT_decl_column(0x14)
$C$DW$T$188 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$188, DW_AT_name("__fsfilcnt_t")
.dwattr $C$DW$T$188, DW_AT_type(*$C$DW$T$185)
.dwattr $C$DW$T$188, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$188, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$188, DW_AT_decl_line(0x33)
.dwattr $C$DW$T$188, DW_AT_decl_column(0x14)
$C$DW$T$189 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$189, DW_AT_name("__ino_t")
.dwattr $C$DW$T$189, DW_AT_type(*$C$DW$T$185)
.dwattr $C$DW$T$189, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$189, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$189, DW_AT_decl_line(0x36)
.dwattr $C$DW$T$189, DW_AT_decl_column(0x14)
$C$DW$T$190 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$190, DW_AT_name("__nlink_t")
.dwattr $C$DW$T$190, DW_AT_type(*$C$DW$T$185)
.dwattr $C$DW$T$190, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$190, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$190, DW_AT_decl_line(0x3c)
.dwattr $C$DW$T$190, DW_AT_decl_column(0x14)
$C$DW$T$191 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$191, DW_AT_name("__uint_fast64_t")
.dwattr $C$DW$T$191, DW_AT_type(*$C$DW$T$185)
.dwattr $C$DW$T$191, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$191, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$191, DW_AT_decl_line(0x6c)
.dwattr $C$DW$T$191, DW_AT_decl_column(0x14)
$C$DW$T$192 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$192, DW_AT_name("uint_fast64_t")
.dwattr $C$DW$T$192, DW_AT_type(*$C$DW$T$191)
.dwattr $C$DW$T$192, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$192, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$192, DW_AT_decl_line(0x3a)
.dwattr $C$DW$T$192, DW_AT_decl_column(0x1a)
$C$DW$T$193 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$193, DW_AT_name("__uint_least64_t")
.dwattr $C$DW$T$193, DW_AT_type(*$C$DW$T$185)
.dwattr $C$DW$T$193, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$193, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$193, DW_AT_decl_line(0x70)
.dwattr $C$DW$T$193, DW_AT_decl_column(0x14)
$C$DW$T$194 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$194, DW_AT_name("uint_least64_t")
.dwattr $C$DW$T$194, DW_AT_type(*$C$DW$T$193)
.dwattr $C$DW$T$194, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$194, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/stdint.h")
.dwattr $C$DW$T$194, DW_AT_decl_line(0x30)
.dwattr $C$DW$T$194, DW_AT_decl_column(0x1a)
$C$DW$T$195 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$195, DW_AT_name("__uintmax_t")
.dwattr $C$DW$T$195, DW_AT_type(*$C$DW$T$185)
.dwattr $C$DW$T$195, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$195, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$195, DW_AT_decl_line(0x67)
.dwattr $C$DW$T$195, DW_AT_decl_column(0x14)
$C$DW$T$196 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$196, DW_AT_name("__rman_res_t")
.dwattr $C$DW$T$196, DW_AT_type(*$C$DW$T$195)
.dwattr $C$DW$T$196, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$196, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$196, DW_AT_decl_line(0x8f)
.dwattr $C$DW$T$196, DW_AT_decl_column(0x19)
$C$DW$T$197 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$197, DW_AT_name("uintmax_t")
.dwattr $C$DW$T$197, DW_AT_type(*$C$DW$T$195)
.dwattr $C$DW$T$197, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$197, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_stdint.h")
.dwattr $C$DW$T$197, DW_AT_decl_line(0x58)
.dwattr $C$DW$T$197, DW_AT_decl_column(0x16)
$C$DW$T$198 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$198, DW_AT_name("uint64_t")
.dwattr $C$DW$T$198, DW_AT_type(*$C$DW$T$185)
.dwattr $C$DW$T$198, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$198, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_stdint.h")
.dwattr $C$DW$T$198, DW_AT_decl_line(0x47)
.dwattr $C$DW$T$198, DW_AT_decl_column(0x15)
$C$DW$T$16 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$16, DW_AT_encoding(DW_ATE_float)
.dwattr $C$DW$T$16, DW_AT_name("float")
.dwattr $C$DW$T$16, DW_AT_byte_size(0x04)
$C$DW$T$199 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$199, DW_AT_name("__float_t")
.dwattr $C$DW$T$199, DW_AT_type(*$C$DW$T$16)
.dwattr $C$DW$T$199, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$199, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$199, DW_AT_decl_line(0x50)
.dwattr $C$DW$T$199, DW_AT_decl_column(0x10)
$C$DW$T$17 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$17, DW_AT_encoding(DW_ATE_float)
.dwattr $C$DW$T$17, DW_AT_name("double")
.dwattr $C$DW$T$17, DW_AT_byte_size(0x08)
$C$DW$T$200 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$200, DW_AT_name("__double_t")
.dwattr $C$DW$T$200, DW_AT_type(*$C$DW$T$17)
.dwattr $C$DW$T$200, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$200, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$200, DW_AT_decl_line(0x4f)
.dwattr $C$DW$T$200, DW_AT_decl_column(0x11)
$C$DW$T$18 .dwtag DW_TAG_base_type
.dwattr $C$DW$T$18, DW_AT_encoding(DW_ATE_float)
.dwattr $C$DW$T$18, DW_AT_name("long double")
.dwattr $C$DW$T$18, DW_AT_byte_size(0x08)
$C$DW$T$201 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$201, DW_AT_name("max_align_t")
.dwattr $C$DW$T$201, DW_AT_type(*$C$DW$T$18)
.dwattr $C$DW$T$201, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$201, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/stddef.h")
.dwattr $C$DW$T$201, DW_AT_decl_line(0x4f)
.dwattr $C$DW$T$201, DW_AT_decl_column(0x15)
$C$DW$T$19 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$19, DW_AT_name("__mq")
.dwattr $C$DW$T$19, DW_AT_declaration
.dwattr $C$DW$T$19, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$19, DW_AT_decl_line(0x47)
.dwattr $C$DW$T$19, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$19
$C$DW$T$202 .dwtag DW_TAG_pointer_type
.dwattr $C$DW$T$202, DW_AT_type(*$C$DW$T$19)
.dwattr $C$DW$T$202, DW_AT_address_class(0x20)
$C$DW$T$203 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$203, DW_AT_name("__mqd_t")
.dwattr $C$DW$T$203, DW_AT_type(*$C$DW$T$202)
.dwattr $C$DW$T$203, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$203, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$203, DW_AT_decl_line(0x47)
.dwattr $C$DW$T$203, DW_AT_decl_column(0x16)
$C$DW$T$20 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$20, DW_AT_name("__timer")
.dwattr $C$DW$T$20, DW_AT_declaration
.dwattr $C$DW$T$20, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$20, DW_AT_decl_line(0x46)
.dwattr $C$DW$T$20, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$20
$C$DW$T$204 .dwtag DW_TAG_pointer_type
.dwattr $C$DW$T$204, DW_AT_type(*$C$DW$T$20)
.dwattr $C$DW$T$204, DW_AT_address_class(0x20)
$C$DW$T$205 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$205, DW_AT_name("__timer_t")
.dwattr $C$DW$T$205, DW_AT_type(*$C$DW$T$204)
.dwattr $C$DW$T$205, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$205, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/sys/_types.h")
.dwattr $C$DW$T$205, DW_AT_decl_line(0x46)
.dwattr $C$DW$T$205, DW_AT_decl_column(0x19)
$C$DW$T$32 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$32, DW_AT_name("__va_list_t")
.dwattr $C$DW$T$32, DW_AT_byte_size(0x04)
$C$DW$52 .dwtag DW_TAG_member
.dwattr $C$DW$52, DW_AT_type(*$C$DW$T$3)
.dwattr $C$DW$52, DW_AT_name("__ap")
.dwattr $C$DW$52, DW_AT_TI_symbol_name("__ap")
.dwattr $C$DW$52, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$52, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$52, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$52, DW_AT_decl_line(0x88)
.dwattr $C$DW$52, DW_AT_decl_column(0x0c)
.dwattr $C$DW$T$32, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$32, DW_AT_decl_line(0x87)
.dwattr $C$DW$T$32, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$32
$C$DW$T$206 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$206, DW_AT_name("__va_list")
.dwattr $C$DW$T$206, DW_AT_type(*$C$DW$T$32)
.dwattr $C$DW$T$206, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$206, DW_AT_decl_file("/home/pola/ti/ccsv8/tools/compiler/ti-cgt-arm_18.1.1.LTS/include/machine/_types.h")
.dwattr $C$DW$T$206, DW_AT_decl_line(0x89)
.dwattr $C$DW$T$206, DW_AT_decl_column(0x03)
$C$DW$T$37 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$37, DW_AT_name("xLIST")
.dwattr $C$DW$T$37, DW_AT_byte_size(0x14)
$C$DW$53 .dwtag DW_TAG_member
.dwattr $C$DW$53, DW_AT_type(*$C$DW$T$33)
.dwattr $C$DW$53, DW_AT_name("uxNumberOfItems")
.dwattr $C$DW$53, DW_AT_TI_symbol_name("uxNumberOfItems")
.dwattr $C$DW$53, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$53, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$53, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$53, DW_AT_decl_line(0xa7)
.dwattr $C$DW$53, DW_AT_decl_column(0x17)
$C$DW$54 .dwtag DW_TAG_member
.dwattr $C$DW$54, DW_AT_type(*$C$DW$T$35)
.dwattr $C$DW$54, DW_AT_name("pxIndex")
.dwattr $C$DW$54, DW_AT_TI_symbol_name("pxIndex")
.dwattr $C$DW$54, DW_AT_data_member_location[DW_OP_plus_uconst 0x4]
.dwattr $C$DW$54, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$54, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$54, DW_AT_decl_line(0xa8)
.dwattr $C$DW$54, DW_AT_decl_column(0x23)
$C$DW$55 .dwtag DW_TAG_member
.dwattr $C$DW$55, DW_AT_type(*$C$DW$T$36)
.dwattr $C$DW$55, DW_AT_name("xListEnd")
.dwattr $C$DW$55, DW_AT_TI_symbol_name("xListEnd")
.dwattr $C$DW$55, DW_AT_data_member_location[DW_OP_plus_uconst 0x8]
.dwattr $C$DW$55, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$55, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$55, DW_AT_decl_line(0xa9)
.dwattr $C$DW$55, DW_AT_decl_column(0x11)
.dwattr $C$DW$T$37, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$T$37, DW_AT_decl_line(0xa4)
.dwattr $C$DW$T$37, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$37
$C$DW$T$74 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$74, DW_AT_name("List_t")
.dwattr $C$DW$T$74, DW_AT_type(*$C$DW$T$37)
.dwattr $C$DW$T$74, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$74, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$T$74, DW_AT_decl_line(0xab)
.dwattr $C$DW$T$74, DW_AT_decl_column(0x03)
$C$DW$T$75 .dwtag DW_TAG_pointer_type
.dwattr $C$DW$T$75, DW_AT_type(*$C$DW$T$74)
.dwattr $C$DW$T$75, DW_AT_address_class(0x20)
$C$DW$T$76 .dwtag DW_TAG_const_type
.dwattr $C$DW$T$76, DW_AT_type(*$C$DW$T$75)
$C$DW$T$42 .dwtag DW_TAG_pointer_type
.dwattr $C$DW$T$42, DW_AT_type(*$C$DW$T$37)
.dwattr $C$DW$T$42, DW_AT_address_class(0x20)
$C$DW$T$43 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$43, DW_AT_name("xLIST_ITEM")
.dwattr $C$DW$T$43, DW_AT_byte_size(0x14)
$C$DW$56 .dwtag DW_TAG_member
.dwattr $C$DW$56, DW_AT_type(*$C$DW$T$40)
.dwattr $C$DW$56, DW_AT_name("xItemValue")
.dwattr $C$DW$56, DW_AT_TI_symbol_name("xItemValue")
.dwattr $C$DW$56, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$56, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$56, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$56, DW_AT_decl_line(0x8f)
.dwattr $C$DW$56, DW_AT_decl_column(0x21)
$C$DW$57 .dwtag DW_TAG_member
.dwattr $C$DW$57, DW_AT_type(*$C$DW$T$41)
.dwattr $C$DW$57, DW_AT_name("pxNext")
.dwattr $C$DW$57, DW_AT_TI_symbol_name("pxNext")
.dwattr $C$DW$57, DW_AT_data_member_location[DW_OP_plus_uconst 0x4]
.dwattr $C$DW$57, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$57, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$57, DW_AT_decl_line(0x90)
.dwattr $C$DW$57, DW_AT_decl_column(0x2a)
$C$DW$58 .dwtag DW_TAG_member
.dwattr $C$DW$58, DW_AT_type(*$C$DW$T$41)
.dwattr $C$DW$58, DW_AT_name("pxPrevious")
.dwattr $C$DW$58, DW_AT_TI_symbol_name("pxPrevious")
.dwattr $C$DW$58, DW_AT_data_member_location[DW_OP_plus_uconst 0x8]
.dwattr $C$DW$58, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$58, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$58, DW_AT_decl_line(0x91)
.dwattr $C$DW$58, DW_AT_decl_column(0x2a)
$C$DW$59 .dwtag DW_TAG_member
.dwattr $C$DW$59, DW_AT_type(*$C$DW$T$3)
.dwattr $C$DW$59, DW_AT_name("pvOwner")
.dwattr $C$DW$59, DW_AT_TI_symbol_name("pvOwner")
.dwattr $C$DW$59, DW_AT_data_member_location[DW_OP_plus_uconst 0xc]
.dwattr $C$DW$59, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$59, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$59, DW_AT_decl_line(0x92)
.dwattr $C$DW$59, DW_AT_decl_column(0x09)
$C$DW$60 .dwtag DW_TAG_member
.dwattr $C$DW$60, DW_AT_type(*$C$DW$T$42)
.dwattr $C$DW$60, DW_AT_name("pvContainer")
.dwattr $C$DW$60, DW_AT_TI_symbol_name("pvContainer")
.dwattr $C$DW$60, DW_AT_data_member_location[DW_OP_plus_uconst 0x10]
.dwattr $C$DW$60, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$60, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$60, DW_AT_decl_line(0x93)
.dwattr $C$DW$60, DW_AT_decl_column(0x25)
.dwattr $C$DW$T$43, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$T$43, DW_AT_decl_line(0x8c)
.dwattr $C$DW$T$43, DW_AT_decl_column(0x08)
.dwendtag $C$DW$T$43
$C$DW$T$34 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$34, DW_AT_name("ListItem_t")
.dwattr $C$DW$T$34, DW_AT_type(*$C$DW$T$43)
.dwattr $C$DW$T$34, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$34, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$T$34, DW_AT_decl_line(0x96)
.dwattr $C$DW$T$34, DW_AT_decl_column(0x1b)
$C$DW$T$35 .dwtag DW_TAG_pointer_type
.dwattr $C$DW$T$35, DW_AT_type(*$C$DW$T$34)
.dwattr $C$DW$T$35, DW_AT_address_class(0x20)
$C$DW$T$78 .dwtag DW_TAG_const_type
.dwattr $C$DW$T$78, DW_AT_type(*$C$DW$T$35)
$C$DW$T$41 .dwtag DW_TAG_pointer_type
.dwattr $C$DW$T$41, DW_AT_type(*$C$DW$T$43)
.dwattr $C$DW$T$41, DW_AT_address_class(0x20)
$C$DW$T$44 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$44, DW_AT_name("xMINI_LIST_ITEM")
.dwattr $C$DW$T$44, DW_AT_byte_size(0x0c)
$C$DW$61 .dwtag DW_TAG_member
.dwattr $C$DW$61, DW_AT_type(*$C$DW$T$40)
.dwattr $C$DW$61, DW_AT_name("xItemValue")
.dwattr $C$DW$61, DW_AT_TI_symbol_name("xItemValue")
.dwattr $C$DW$61, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$61, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$61, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$61, DW_AT_decl_line(0x9b)
.dwattr $C$DW$61, DW_AT_decl_column(0x21)
$C$DW$62 .dwtag DW_TAG_member
.dwattr $C$DW$62, DW_AT_type(*$C$DW$T$41)
.dwattr $C$DW$62, DW_AT_name("pxNext")
.dwattr $C$DW$62, DW_AT_TI_symbol_name("pxNext")
.dwattr $C$DW$62, DW_AT_data_member_location[DW_OP_plus_uconst 0x4]
.dwattr $C$DW$62, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$62, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$62, DW_AT_decl_line(0x9c)
.dwattr $C$DW$62, DW_AT_decl_column(0x2a)
$C$DW$63 .dwtag DW_TAG_member
.dwattr $C$DW$63, DW_AT_type(*$C$DW$T$41)
.dwattr $C$DW$63, DW_AT_name("pxPrevious")
.dwattr $C$DW$63, DW_AT_TI_symbol_name("pxPrevious")
.dwattr $C$DW$63, DW_AT_data_member_location[DW_OP_plus_uconst 0x8]
.dwattr $C$DW$63, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$63, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$63, DW_AT_decl_line(0x9d)
.dwattr $C$DW$63, DW_AT_decl_column(0x2a)
.dwattr $C$DW$T$44, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$T$44, DW_AT_decl_line(0x98)
.dwattr $C$DW$T$44, DW_AT_decl_column(0x08)
.dwendtag $C$DW$T$44
$C$DW$T$36 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$36, DW_AT_name("MiniListItem_t")
.dwattr $C$DW$T$36, DW_AT_type(*$C$DW$T$44)
.dwattr $C$DW$T$36, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$36, DW_AT_decl_file("../OS/list.h")
.dwattr $C$DW$T$36, DW_AT_decl_line(0x9f)
.dwattr $C$DW$T$36, DW_AT_decl_column(0x20)
$C$DW$T$46 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$46, DW_AT_name("xSTATIC_EVENT_GROUP")
.dwattr $C$DW$T$46, DW_AT_byte_size(0x1c)
$C$DW$64 .dwtag DW_TAG_member
.dwattr $C$DW$64, DW_AT_type(*$C$DW$T$40)
.dwattr $C$DW$64, DW_AT_name("xDummy1")
.dwattr $C$DW$64, DW_AT_TI_symbol_name("xDummy1")
.dwattr $C$DW$64, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$64, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$64, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$64, DW_AT_decl_line(0x455)
.dwattr $C$DW$64, DW_AT_decl_column(0x0d)
$C$DW$65 .dwtag DW_TAG_member
.dwattr $C$DW$65, DW_AT_type(*$C$DW$T$45)
.dwattr $C$DW$65, DW_AT_name("xDummy2")
.dwattr $C$DW$65, DW_AT_TI_symbol_name("xDummy2")
.dwattr $C$DW$65, DW_AT_data_member_location[DW_OP_plus_uconst 0x4]
.dwattr $C$DW$65, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$65, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$65, DW_AT_decl_line(0x456)
.dwattr $C$DW$65, DW_AT_decl_column(0x0f)
$C$DW$66 .dwtag DW_TAG_member
.dwattr $C$DW$66, DW_AT_type(*$C$DW$T$25)
.dwattr $C$DW$66, DW_AT_name("uxDummy3")
.dwattr $C$DW$66, DW_AT_TI_symbol_name("uxDummy3")
.dwattr $C$DW$66, DW_AT_data_member_location[DW_OP_plus_uconst 0x18]
.dwattr $C$DW$66, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$66, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$66, DW_AT_decl_line(0x459)
.dwattr $C$DW$66, DW_AT_decl_column(0x0f)
.dwattr $C$DW$T$46, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$46, DW_AT_decl_line(0x453)
.dwattr $C$DW$T$46, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$46
$C$DW$T$208 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$208, DW_AT_name("StaticEventGroup_t")
.dwattr $C$DW$T$208, DW_AT_type(*$C$DW$T$46)
.dwattr $C$DW$T$208, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$208, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$208, DW_AT_decl_line(0x460)
.dwattr $C$DW$T$208, DW_AT_decl_column(0x03)
$C$DW$T$48 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$48, DW_AT_name("xSTATIC_LIST")
.dwattr $C$DW$T$48, DW_AT_byte_size(0x14)
$C$DW$67 .dwtag DW_TAG_member
.dwattr $C$DW$67, DW_AT_type(*$C$DW$T$25)
.dwattr $C$DW$67, DW_AT_name("uxDummy1")
.dwattr $C$DW$67, DW_AT_TI_symbol_name("uxDummy1")
.dwattr $C$DW$67, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$67, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$67, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$67, DW_AT_decl_line(0x3d5)
.dwattr $C$DW$67, DW_AT_decl_column(0x0e)
$C$DW$68 .dwtag DW_TAG_member
.dwattr $C$DW$68, DW_AT_type(*$C$DW$T$3)
.dwattr $C$DW$68, DW_AT_name("pvDummy2")
.dwattr $C$DW$68, DW_AT_TI_symbol_name("pvDummy2")
.dwattr $C$DW$68, DW_AT_data_member_location[DW_OP_plus_uconst 0x4]
.dwattr $C$DW$68, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$68, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$68, DW_AT_decl_line(0x3d6)
.dwattr $C$DW$68, DW_AT_decl_column(0x08)
$C$DW$69 .dwtag DW_TAG_member
.dwattr $C$DW$69, DW_AT_type(*$C$DW$T$47)
.dwattr $C$DW$69, DW_AT_name("xDummy3")
.dwattr $C$DW$69, DW_AT_TI_symbol_name("xDummy3")
.dwattr $C$DW$69, DW_AT_data_member_location[DW_OP_plus_uconst 0x8]
.dwattr $C$DW$69, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$69, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$69, DW_AT_decl_line(0x3d7)
.dwattr $C$DW$69, DW_AT_decl_column(0x17)
.dwattr $C$DW$T$48, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$48, DW_AT_decl_line(0x3d3)
.dwattr $C$DW$T$48, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$48
$C$DW$T$45 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$45, DW_AT_name("StaticList_t")
.dwattr $C$DW$T$45, DW_AT_type(*$C$DW$T$48)
.dwattr $C$DW$T$45, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$45, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$45, DW_AT_decl_line(0x3d8)
.dwattr $C$DW$T$45, DW_AT_decl_column(0x03)
$C$DW$T$54 .dwtag DW_TAG_array_type
.dwattr $C$DW$T$54, DW_AT_type(*$C$DW$T$45)
.dwattr $C$DW$T$54, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$54, DW_AT_byte_size(0x28)
$C$DW$70 .dwtag DW_TAG_subrange_type
.dwattr $C$DW$70, DW_AT_upper_bound(0x01)
.dwendtag $C$DW$T$54
$C$DW$T$50 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$50, DW_AT_name("xSTATIC_LIST_ITEM")
.dwattr $C$DW$T$50, DW_AT_byte_size(0x14)
$C$DW$71 .dwtag DW_TAG_member
.dwattr $C$DW$71, DW_AT_type(*$C$DW$T$40)
.dwattr $C$DW$71, DW_AT_name("xDummy1")
.dwattr $C$DW$71, DW_AT_TI_symbol_name("xDummy1")
.dwattr $C$DW$71, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$71, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$71, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$71, DW_AT_decl_line(0x3c5)
.dwattr $C$DW$71, DW_AT_decl_column(0x0d)
$C$DW$72 .dwtag DW_TAG_member
.dwattr $C$DW$72, DW_AT_type(*$C$DW$T$49)
.dwattr $C$DW$72, DW_AT_name("pvDummy2")
.dwattr $C$DW$72, DW_AT_TI_symbol_name("pvDummy2")
.dwattr $C$DW$72, DW_AT_data_member_location[DW_OP_plus_uconst 0x4]
.dwattr $C$DW$72, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$72, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$72, DW_AT_decl_line(0x3c6)
.dwattr $C$DW$72, DW_AT_decl_column(0x08)
.dwattr $C$DW$T$50, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$50, DW_AT_decl_line(0x3c3)
.dwattr $C$DW$T$50, DW_AT_decl_column(0x08)
.dwendtag $C$DW$T$50
$C$DW$T$60 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$60, DW_AT_name("StaticListItem_t")
.dwattr $C$DW$T$60, DW_AT_type(*$C$DW$T$50)
.dwattr $C$DW$T$60, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$60, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$60, DW_AT_decl_line(0x3c8)
.dwattr $C$DW$T$60, DW_AT_decl_column(0x22)
$C$DW$T$61 .dwtag DW_TAG_array_type
.dwattr $C$DW$T$61, DW_AT_type(*$C$DW$T$60)
.dwattr $C$DW$T$61, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$61, DW_AT_byte_size(0x28)
$C$DW$73 .dwtag DW_TAG_subrange_type
.dwattr $C$DW$73, DW_AT_upper_bound(0x01)
.dwendtag $C$DW$T$61
$C$DW$T$52 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$52, DW_AT_name("xSTATIC_MINI_LIST_ITEM")
.dwattr $C$DW$T$52, DW_AT_byte_size(0x0c)
$C$DW$74 .dwtag DW_TAG_member
.dwattr $C$DW$74, DW_AT_type(*$C$DW$T$40)
.dwattr $C$DW$74, DW_AT_name("xDummy1")
.dwattr $C$DW$74, DW_AT_TI_symbol_name("xDummy1")
.dwattr $C$DW$74, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$74, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$74, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$74, DW_AT_decl_line(0x3cd)
.dwattr $C$DW$74, DW_AT_decl_column(0x0d)
$C$DW$75 .dwtag DW_TAG_member
.dwattr $C$DW$75, DW_AT_type(*$C$DW$T$51)
.dwattr $C$DW$75, DW_AT_name("pvDummy2")
.dwattr $C$DW$75, DW_AT_TI_symbol_name("pvDummy2")
.dwattr $C$DW$75, DW_AT_data_member_location[DW_OP_plus_uconst 0x4]
.dwattr $C$DW$75, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$75, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$75, DW_AT_decl_line(0x3ce)
.dwattr $C$DW$75, DW_AT_decl_column(0x08)
.dwattr $C$DW$T$52, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$52, DW_AT_decl_line(0x3cb)
.dwattr $C$DW$T$52, DW_AT_decl_column(0x08)
.dwendtag $C$DW$T$52
$C$DW$T$47 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$47, DW_AT_name("StaticMiniListItem_t")
.dwattr $C$DW$T$47, DW_AT_type(*$C$DW$T$52)
.dwattr $C$DW$T$47, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$47, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$47, DW_AT_decl_line(0x3d0)
.dwattr $C$DW$T$47, DW_AT_decl_column(0x27)
$C$DW$T$57 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$57, DW_AT_name("xSTATIC_QUEUE")
.dwattr $C$DW$T$57, DW_AT_byte_size(0x50)
$C$DW$76 .dwtag DW_TAG_member
.dwattr $C$DW$76, DW_AT_type(*$C$DW$T$53)
.dwattr $C$DW$76, DW_AT_name("pvDummy1")
.dwattr $C$DW$76, DW_AT_TI_symbol_name("pvDummy1")
.dwattr $C$DW$76, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$76, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$76, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$76, DW_AT_decl_line(0x429)
.dwattr $C$DW$76, DW_AT_decl_column(0x08)
$C$DW$77 .dwtag DW_TAG_member
.dwattr $C$DW$77, DW_AT_type(*$C$DW$T$26)
.dwattr $C$DW$77, DW_AT_name("u")
.dwattr $C$DW$77, DW_AT_TI_symbol_name("u")
.dwattr $C$DW$77, DW_AT_data_member_location[DW_OP_plus_uconst 0xc]
.dwattr $C$DW$77, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$77, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$77, DW_AT_decl_line(0x42f)
.dwattr $C$DW$77, DW_AT_decl_column(0x04)
$C$DW$78 .dwtag DW_TAG_member
.dwattr $C$DW$78, DW_AT_type(*$C$DW$T$54)
.dwattr $C$DW$78, DW_AT_name("xDummy3")
.dwattr $C$DW$78, DW_AT_TI_symbol_name("xDummy3")
.dwattr $C$DW$78, DW_AT_data_member_location[DW_OP_plus_uconst 0x10]
.dwattr $C$DW$78, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$78, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$78, DW_AT_decl_line(0x431)
.dwattr $C$DW$78, DW_AT_decl_column(0x0f)
$C$DW$79 .dwtag DW_TAG_member
.dwattr $C$DW$79, DW_AT_type(*$C$DW$T$55)
.dwattr $C$DW$79, DW_AT_name("uxDummy4")
.dwattr $C$DW$79, DW_AT_TI_symbol_name("uxDummy4")
.dwattr $C$DW$79, DW_AT_data_member_location[DW_OP_plus_uconst 0x38]
.dwattr $C$DW$79, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$79, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$79, DW_AT_decl_line(0x432)
.dwattr $C$DW$79, DW_AT_decl_column(0x0e)
$C$DW$80 .dwtag DW_TAG_member
.dwattr $C$DW$80, DW_AT_type(*$C$DW$T$56)
.dwattr $C$DW$80, DW_AT_name("ucDummy5")
.dwattr $C$DW$80, DW_AT_TI_symbol_name("ucDummy5")
.dwattr $C$DW$80, DW_AT_data_member_location[DW_OP_plus_uconst 0x44]
.dwattr $C$DW$80, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$80, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$80, DW_AT_decl_line(0x433)
.dwattr $C$DW$80, DW_AT_decl_column(0x0a)
$C$DW$81 .dwtag DW_TAG_member
.dwattr $C$DW$81, DW_AT_type(*$C$DW$T$25)
.dwattr $C$DW$81, DW_AT_name("uxDummy8")
.dwattr $C$DW$81, DW_AT_TI_symbol_name("uxDummy8")
.dwattr $C$DW$81, DW_AT_data_member_location[DW_OP_plus_uconst 0x48]
.dwattr $C$DW$81, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$81, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$81, DW_AT_decl_line(0x43e)
.dwattr $C$DW$81, DW_AT_decl_column(0x0f)
$C$DW$82 .dwtag DW_TAG_member
.dwattr $C$DW$82, DW_AT_type(*$C$DW$T$28)
.dwattr $C$DW$82, DW_AT_name("ucDummy9")
.dwattr $C$DW$82, DW_AT_TI_symbol_name("ucDummy9")
.dwattr $C$DW$82, DW_AT_data_member_location[DW_OP_plus_uconst 0x4c]
.dwattr $C$DW$82, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$82, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$82, DW_AT_decl_line(0x43f)
.dwattr $C$DW$82, DW_AT_decl_column(0x0b)
.dwattr $C$DW$T$57, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$57, DW_AT_decl_line(0x427)
.dwattr $C$DW$T$57, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$57
$C$DW$T$209 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$209, DW_AT_name("StaticQueue_t")
.dwattr $C$DW$T$209, DW_AT_type(*$C$DW$T$57)
.dwattr $C$DW$T$209, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$209, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$209, DW_AT_decl_line(0x442)
.dwattr $C$DW$T$209, DW_AT_decl_column(0x03)
$C$DW$T$210 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$210, DW_AT_name("StaticSemaphore_t")
.dwattr $C$DW$T$210, DW_AT_type(*$C$DW$T$209)
.dwattr $C$DW$T$210, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$210, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$210, DW_AT_decl_line(0x443)
.dwattr $C$DW$T$210, DW_AT_decl_column(0x17)
$C$DW$T$59 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$59, DW_AT_name("xSTATIC_STREAM_BUFFER")
.dwattr $C$DW$T$59, DW_AT_byte_size(0x24)
$C$DW$83 .dwtag DW_TAG_member
.dwattr $C$DW$83, DW_AT_type(*$C$DW$T$58)
.dwattr $C$DW$83, DW_AT_name("uxDummy1")
.dwattr $C$DW$83, DW_AT_TI_symbol_name("uxDummy1")
.dwattr $C$DW$83, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$83, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$83, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$83, DW_AT_decl_line(0x492)
.dwattr $C$DW$83, DW_AT_decl_column(0x09)
$C$DW$84 .dwtag DW_TAG_member
.dwattr $C$DW$84, DW_AT_type(*$C$DW$T$53)
.dwattr $C$DW$84, DW_AT_name("pvDummy2")
.dwattr $C$DW$84, DW_AT_TI_symbol_name("pvDummy2")
.dwattr $C$DW$84, DW_AT_data_member_location[DW_OP_plus_uconst 0x10]
.dwattr $C$DW$84, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$84, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$84, DW_AT_decl_line(0x493)
.dwattr $C$DW$84, DW_AT_decl_column(0x09)
$C$DW$85 .dwtag DW_TAG_member
.dwattr $C$DW$85, DW_AT_type(*$C$DW$T$28)
.dwattr $C$DW$85, DW_AT_name("ucDummy3")
.dwattr $C$DW$85, DW_AT_TI_symbol_name("ucDummy3")
.dwattr $C$DW$85, DW_AT_data_member_location[DW_OP_plus_uconst 0x1c]
.dwattr $C$DW$85, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$85, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$85, DW_AT_decl_line(0x494)
.dwattr $C$DW$85, DW_AT_decl_column(0x0a)
$C$DW$86 .dwtag DW_TAG_member
.dwattr $C$DW$86, DW_AT_type(*$C$DW$T$25)
.dwattr $C$DW$86, DW_AT_name("uxDummy4")
.dwattr $C$DW$86, DW_AT_TI_symbol_name("uxDummy4")
.dwattr $C$DW$86, DW_AT_data_member_location[DW_OP_plus_uconst 0x20]
.dwattr $C$DW$86, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$86, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$86, DW_AT_decl_line(0x496)
.dwattr $C$DW$86, DW_AT_decl_column(0x0f)
.dwattr $C$DW$T$59, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$59, DW_AT_decl_line(0x490)
.dwattr $C$DW$T$59, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$59
$C$DW$T$211 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$211, DW_AT_name("StaticStreamBuffer_t")
.dwattr $C$DW$T$211, DW_AT_type(*$C$DW$T$59)
.dwattr $C$DW$T$211, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$211, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$211, DW_AT_decl_line(0x498)
.dwattr $C$DW$T$211, DW_AT_decl_column(0x03)
$C$DW$T$212 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$212, DW_AT_name("StaticMessageBuffer_t")
.dwattr $C$DW$T$212, DW_AT_type(*$C$DW$T$211)
.dwattr $C$DW$T$212, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$212, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$212, DW_AT_decl_line(0x49b)
.dwattr $C$DW$T$212, DW_AT_decl_column(0x1e)
$C$DW$T$64 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$64, DW_AT_name("xSTATIC_TCB")
.dwattr $C$DW$T$64, DW_AT_byte_size(0x58)
$C$DW$87 .dwtag DW_TAG_member
.dwattr $C$DW$87, DW_AT_type(*$C$DW$T$3)
.dwattr $C$DW$87, DW_AT_name("pxDummy1")
.dwattr $C$DW$87, DW_AT_TI_symbol_name("pxDummy1")
.dwattr $C$DW$87, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$87, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$87, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$87, DW_AT_decl_line(0x3e9)
.dwattr $C$DW$87, DW_AT_decl_column(0x0b)
$C$DW$88 .dwtag DW_TAG_member
.dwattr $C$DW$88, DW_AT_type(*$C$DW$T$61)
.dwattr $C$DW$88, DW_AT_name("xDummy3")
.dwattr $C$DW$88, DW_AT_TI_symbol_name("xDummy3")
.dwattr $C$DW$88, DW_AT_data_member_location[DW_OP_plus_uconst 0x4]
.dwattr $C$DW$88, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$88, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$88, DW_AT_decl_line(0x3ed)
.dwattr $C$DW$88, DW_AT_decl_column(0x13)
$C$DW$89 .dwtag DW_TAG_member
.dwattr $C$DW$89, DW_AT_type(*$C$DW$T$25)
.dwattr $C$DW$89, DW_AT_name("uxDummy5")
.dwattr $C$DW$89, DW_AT_TI_symbol_name("uxDummy5")
.dwattr $C$DW$89, DW_AT_data_member_location[DW_OP_plus_uconst 0x2c]
.dwattr $C$DW$89, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$89, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$89, DW_AT_decl_line(0x3ee)
.dwattr $C$DW$89, DW_AT_decl_column(0x10)
$C$DW$90 .dwtag DW_TAG_member
.dwattr $C$DW$90, DW_AT_type(*$C$DW$T$3)
.dwattr $C$DW$90, DW_AT_name("pxDummy6")
.dwattr $C$DW$90, DW_AT_TI_symbol_name("pxDummy6")
.dwattr $C$DW$90, DW_AT_data_member_location[DW_OP_plus_uconst 0x30]
.dwattr $C$DW$90, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$90, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$90, DW_AT_decl_line(0x3ef)
.dwattr $C$DW$90, DW_AT_decl_column(0x0b)
$C$DW$91 .dwtag DW_TAG_member
.dwattr $C$DW$91, DW_AT_type(*$C$DW$T$62)
.dwattr $C$DW$91, DW_AT_name("ucDummy7")
.dwattr $C$DW$91, DW_AT_TI_symbol_name("ucDummy7")
.dwattr $C$DW$91, DW_AT_data_member_location[DW_OP_plus_uconst 0x34]
.dwattr $C$DW$91, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$91, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$91, DW_AT_decl_line(0x3f0)
.dwattr $C$DW$91, DW_AT_decl_column(0x0d)
$C$DW$92 .dwtag DW_TAG_member
.dwattr $C$DW$92, DW_AT_type(*$C$DW$T$63)
.dwattr $C$DW$92, DW_AT_name("uxDummy10")
.dwattr $C$DW$92, DW_AT_TI_symbol_name("uxDummy10")
.dwattr $C$DW$92, DW_AT_data_member_location[DW_OP_plus_uconst 0x40]
.dwattr $C$DW$92, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$92, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$92, DW_AT_decl_line(0x3f8)
.dwattr $C$DW$92, DW_AT_decl_column(0x10)
$C$DW$93 .dwtag DW_TAG_member
.dwattr $C$DW$93, DW_AT_type(*$C$DW$T$63)
.dwattr $C$DW$93, DW_AT_name("uxDummy12")
.dwattr $C$DW$93, DW_AT_TI_symbol_name("uxDummy12")
.dwattr $C$DW$93, DW_AT_data_member_location[DW_OP_plus_uconst 0x48]
.dwattr $C$DW$93, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$93, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$93, DW_AT_decl_line(0x3fb)
.dwattr $C$DW$93, DW_AT_decl_column(0x10)
$C$DW$94 .dwtag DW_TAG_member
.dwattr $C$DW$94, DW_AT_type(*$C$DW$T$39)
.dwattr $C$DW$94, DW_AT_name("ulDummy18")
.dwattr $C$DW$94, DW_AT_TI_symbol_name("ulDummy18")
.dwattr $C$DW$94, DW_AT_data_member_location[DW_OP_plus_uconst 0x50]
.dwattr $C$DW$94, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$94, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$94, DW_AT_decl_line(0x40a)
.dwattr $C$DW$94, DW_AT_decl_column(0x0e)
$C$DW$95 .dwtag DW_TAG_member
.dwattr $C$DW$95, DW_AT_type(*$C$DW$T$28)
.dwattr $C$DW$95, DW_AT_name("ucDummy19")
.dwattr $C$DW$95, DW_AT_TI_symbol_name("ucDummy19")
.dwattr $C$DW$95, DW_AT_data_member_location[DW_OP_plus_uconst 0x54]
.dwattr $C$DW$95, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$95, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$95, DW_AT_decl_line(0x40b)
.dwattr $C$DW$95, DW_AT_decl_column(0x0d)
.dwattr $C$DW$T$64, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$64, DW_AT_decl_line(0x3e7)
.dwattr $C$DW$T$64, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$64
$C$DW$T$213 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$213, DW_AT_name("StaticTask_t")
.dwattr $C$DW$T$213, DW_AT_type(*$C$DW$T$64)
.dwattr $C$DW$T$213, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$213, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$213, DW_AT_decl_line(0x417)
.dwattr $C$DW$T$213, DW_AT_decl_column(0x03)
$C$DW$T$68 .dwtag DW_TAG_structure_type
.dwattr $C$DW$T$68, DW_AT_name("xSTATIC_TIMER")
.dwattr $C$DW$T$68, DW_AT_byte_size(0x2c)
$C$DW$96 .dwtag DW_TAG_member
.dwattr $C$DW$96, DW_AT_type(*$C$DW$T$3)
.dwattr $C$DW$96, DW_AT_name("pvDummy1")
.dwattr $C$DW$96, DW_AT_TI_symbol_name("pvDummy1")
.dwattr $C$DW$96, DW_AT_data_member_location[DW_OP_plus_uconst 0x0]
.dwattr $C$DW$96, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$96, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$96, DW_AT_decl_line(0x472)
.dwattr $C$DW$96, DW_AT_decl_column(0x0b)
$C$DW$97 .dwtag DW_TAG_member
.dwattr $C$DW$97, DW_AT_type(*$C$DW$T$60)
.dwattr $C$DW$97, DW_AT_name("xDummy2")
.dwattr $C$DW$97, DW_AT_TI_symbol_name("xDummy2")
.dwattr $C$DW$97, DW_AT_data_member_location[DW_OP_plus_uconst 0x4]
.dwattr $C$DW$97, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$97, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$97, DW_AT_decl_line(0x473)
.dwattr $C$DW$97, DW_AT_decl_column(0x13)
$C$DW$98 .dwtag DW_TAG_member
.dwattr $C$DW$98, DW_AT_type(*$C$DW$T$40)
.dwattr $C$DW$98, DW_AT_name("xDummy3")
.dwattr $C$DW$98, DW_AT_TI_symbol_name("xDummy3")
.dwattr $C$DW$98, DW_AT_data_member_location[DW_OP_plus_uconst 0x18]
.dwattr $C$DW$98, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$98, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$98, DW_AT_decl_line(0x474)
.dwattr $C$DW$98, DW_AT_decl_column(0x0f)
$C$DW$99 .dwtag DW_TAG_member
.dwattr $C$DW$99, DW_AT_type(*$C$DW$T$25)
.dwattr $C$DW$99, DW_AT_name("uxDummy4")
.dwattr $C$DW$99, DW_AT_TI_symbol_name("uxDummy4")
.dwattr $C$DW$99, DW_AT_data_member_location[DW_OP_plus_uconst 0x1c]
.dwattr $C$DW$99, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$99, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$99, DW_AT_decl_line(0x475)
.dwattr $C$DW$99, DW_AT_decl_column(0x10)
$C$DW$100 .dwtag DW_TAG_member
.dwattr $C$DW$100, DW_AT_type(*$C$DW$T$3)
.dwattr $C$DW$100, DW_AT_name("pvDummy5")
.dwattr $C$DW$100, DW_AT_TI_symbol_name("pvDummy5")
.dwattr $C$DW$100, DW_AT_data_member_location[DW_OP_plus_uconst 0x20]
.dwattr $C$DW$100, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$100, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$100, DW_AT_decl_line(0x476)
.dwattr $C$DW$100, DW_AT_decl_column(0x0c)
$C$DW$101 .dwtag DW_TAG_member
.dwattr $C$DW$101, DW_AT_type(*$C$DW$T$67)
.dwattr $C$DW$101, DW_AT_name("pvDummy6")
.dwattr $C$DW$101, DW_AT_TI_symbol_name("pvDummy6")
.dwattr $C$DW$101, DW_AT_data_member_location[DW_OP_plus_uconst 0x24]
.dwattr $C$DW$101, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$101, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$101, DW_AT_decl_line(0x477)
.dwattr $C$DW$101, DW_AT_decl_column(0x12)
$C$DW$102 .dwtag DW_TAG_member
.dwattr $C$DW$102, DW_AT_type(*$C$DW$T$25)
.dwattr $C$DW$102, DW_AT_name("uxDummy7")
.dwattr $C$DW$102, DW_AT_TI_symbol_name("uxDummy7")
.dwattr $C$DW$102, DW_AT_data_member_location[DW_OP_plus_uconst 0x28]
.dwattr $C$DW$102, DW_AT_accessibility(DW_ACCESS_public)
.dwattr $C$DW$102, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$102, DW_AT_decl_line(0x479)
.dwattr $C$DW$102, DW_AT_decl_column(0x10)
.dwattr $C$DW$T$68, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$68, DW_AT_decl_line(0x470)
.dwattr $C$DW$T$68, DW_AT_decl_column(0x10)
.dwendtag $C$DW$T$68
$C$DW$T$214 .dwtag DW_TAG_typedef
.dwattr $C$DW$T$214, DW_AT_name("StaticTimer_t")
.dwattr $C$DW$T$214, DW_AT_type(*$C$DW$T$68)
.dwattr $C$DW$T$214, DW_AT_language(DW_LANG_C)
.dwattr $C$DW$T$214, DW_AT_decl_file("../OS/FreeRTOS.h")
.dwattr $C$DW$T$214, DW_AT_decl_line(0x480)
.dwattr $C$DW$T$214, DW_AT_decl_column(0x03)
.dwattr $C$DW$CU, DW_AT_language(DW_LANG_C)
;***************************************************************
;* DWARF CIE ENTRIES *
;***************************************************************
$C$DW$CIE .dwcie 14
.dwcfi cfa_register, 13
.dwcfi cfa_offset, 0
.dwcfi same_value, 4
.dwcfi same_value, 5
.dwcfi same_value, 6
.dwcfi same_value, 7
.dwcfi same_value, 8
.dwcfi same_value, 9
.dwcfi same_value, 10
.dwcfi same_value, 11
.dwcfi same_value, 80
.dwcfi same_value, 81
.dwcfi same_value, 82
.dwcfi same_value, 83
.dwcfi same_value, 84
.dwcfi same_value, 85
.dwcfi same_value, 86
.dwcfi same_value, 87
.dwcfi same_value, 88
.dwcfi same_value, 89
.dwcfi same_value, 90
.dwcfi same_value, 91
.dwcfi same_value, 92
.dwcfi same_value, 93
.dwcfi same_value, 94
.dwcfi same_value, 95
.dwendentry
;***************************************************************
;* DWARF REGISTER MAP *
;***************************************************************
$C$DW$103 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$103, DW_AT_name("A1")
.dwattr $C$DW$103, DW_AT_location[DW_OP_reg0]
$C$DW$104 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$104, DW_AT_name("A2")
.dwattr $C$DW$104, DW_AT_location[DW_OP_reg1]
$C$DW$105 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$105, DW_AT_name("A3")
.dwattr $C$DW$105, DW_AT_location[DW_OP_reg2]
$C$DW$106 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$106, DW_AT_name("A4")
.dwattr $C$DW$106, DW_AT_location[DW_OP_reg3]
$C$DW$107 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$107, DW_AT_name("V1")
.dwattr $C$DW$107, DW_AT_location[DW_OP_reg4]
$C$DW$108 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$108, DW_AT_name("V2")
.dwattr $C$DW$108, DW_AT_location[DW_OP_reg5]
$C$DW$109 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$109, DW_AT_name("V3")
.dwattr $C$DW$109, DW_AT_location[DW_OP_reg6]
$C$DW$110 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$110, DW_AT_name("V4")
.dwattr $C$DW$110, DW_AT_location[DW_OP_reg7]
$C$DW$111 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$111, DW_AT_name("V5")
.dwattr $C$DW$111, DW_AT_location[DW_OP_reg8]
$C$DW$112 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$112, DW_AT_name("V6")
.dwattr $C$DW$112, DW_AT_location[DW_OP_reg9]
$C$DW$113 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$113, DW_AT_name("V7")
.dwattr $C$DW$113, DW_AT_location[DW_OP_reg10]
$C$DW$114 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$114, DW_AT_name("V8")
.dwattr $C$DW$114, DW_AT_location[DW_OP_reg11]
$C$DW$115 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$115, DW_AT_name("V9")
.dwattr $C$DW$115, DW_AT_location[DW_OP_reg12]
$C$DW$116 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$116, DW_AT_name("SP")
.dwattr $C$DW$116, DW_AT_location[DW_OP_reg13]
$C$DW$117 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$117, DW_AT_name("LR")
.dwattr $C$DW$117, DW_AT_location[DW_OP_reg14]
$C$DW$118 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$118, DW_AT_name("PC")
.dwattr $C$DW$118, DW_AT_location[DW_OP_reg15]
$C$DW$119 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$119, DW_AT_name("SR")
.dwattr $C$DW$119, DW_AT_location[DW_OP_reg17]
$C$DW$120 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$120, DW_AT_name("AP")
.dwattr $C$DW$120, DW_AT_location[DW_OP_reg7]
$C$DW$121 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$121, DW_AT_name("D0")
.dwattr $C$DW$121, DW_AT_location[DW_OP_regx 0x40]
$C$DW$122 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$122, DW_AT_name("D0_hi")
.dwattr $C$DW$122, DW_AT_location[DW_OP_regx 0x41]
$C$DW$123 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$123, DW_AT_name("D1")
.dwattr $C$DW$123, DW_AT_location[DW_OP_regx 0x42]
$C$DW$124 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$124, DW_AT_name("D1_hi")
.dwattr $C$DW$124, DW_AT_location[DW_OP_regx 0x43]
$C$DW$125 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$125, DW_AT_name("D2")
.dwattr $C$DW$125, DW_AT_location[DW_OP_regx 0x44]
$C$DW$126 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$126, DW_AT_name("D2_hi")
.dwattr $C$DW$126, DW_AT_location[DW_OP_regx 0x45]
$C$DW$127 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$127, DW_AT_name("D3")
.dwattr $C$DW$127, DW_AT_location[DW_OP_regx 0x46]
$C$DW$128 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$128, DW_AT_name("D3_hi")
.dwattr $C$DW$128, DW_AT_location[DW_OP_regx 0x47]
$C$DW$129 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$129, DW_AT_name("D4")
.dwattr $C$DW$129, DW_AT_location[DW_OP_regx 0x48]
$C$DW$130 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$130, DW_AT_name("D4_hi")
.dwattr $C$DW$130, DW_AT_location[DW_OP_regx 0x49]
$C$DW$131 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$131, DW_AT_name("D5")
.dwattr $C$DW$131, DW_AT_location[DW_OP_regx 0x4a]
$C$DW$132 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$132, DW_AT_name("D5_hi")
.dwattr $C$DW$132, DW_AT_location[DW_OP_regx 0x4b]
$C$DW$133 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$133, DW_AT_name("D6")
.dwattr $C$DW$133, DW_AT_location[DW_OP_regx 0x4c]
$C$DW$134 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$134, DW_AT_name("D6_hi")
.dwattr $C$DW$134, DW_AT_location[DW_OP_regx 0x4d]
$C$DW$135 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$135, DW_AT_name("D7")
.dwattr $C$DW$135, DW_AT_location[DW_OP_regx 0x4e]
$C$DW$136 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$136, DW_AT_name("D7_hi")
.dwattr $C$DW$136, DW_AT_location[DW_OP_regx 0x4f]
$C$DW$137 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$137, DW_AT_name("D8")
.dwattr $C$DW$137, DW_AT_location[DW_OP_regx 0x50]
$C$DW$138 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$138, DW_AT_name("D8_hi")
.dwattr $C$DW$138, DW_AT_location[DW_OP_regx 0x51]
$C$DW$139 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$139, DW_AT_name("D9")
.dwattr $C$DW$139, DW_AT_location[DW_OP_regx 0x52]
$C$DW$140 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$140, DW_AT_name("D9_hi")
.dwattr $C$DW$140, DW_AT_location[DW_OP_regx 0x53]
$C$DW$141 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$141, DW_AT_name("D10")
.dwattr $C$DW$141, DW_AT_location[DW_OP_regx 0x54]
$C$DW$142 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$142, DW_AT_name("D10_hi")
.dwattr $C$DW$142, DW_AT_location[DW_OP_regx 0x55]
$C$DW$143 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$143, DW_AT_name("D11")
.dwattr $C$DW$143, DW_AT_location[DW_OP_regx 0x56]
$C$DW$144 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$144, DW_AT_name("D11_hi")
.dwattr $C$DW$144, DW_AT_location[DW_OP_regx 0x57]
$C$DW$145 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$145, DW_AT_name("D12")
.dwattr $C$DW$145, DW_AT_location[DW_OP_regx 0x58]
$C$DW$146 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$146, DW_AT_name("D12_hi")
.dwattr $C$DW$146, DW_AT_location[DW_OP_regx 0x59]
$C$DW$147 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$147, DW_AT_name("D13")
.dwattr $C$DW$147, DW_AT_location[DW_OP_regx 0x5a]
$C$DW$148 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$148, DW_AT_name("D13_hi")
.dwattr $C$DW$148, DW_AT_location[DW_OP_regx 0x5b]
$C$DW$149 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$149, DW_AT_name("D14")
.dwattr $C$DW$149, DW_AT_location[DW_OP_regx 0x5c]
$C$DW$150 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$150, DW_AT_name("D14_hi")
.dwattr $C$DW$150, DW_AT_location[DW_OP_regx 0x5d]
$C$DW$151 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$151, DW_AT_name("D15")
.dwattr $C$DW$151, DW_AT_location[DW_OP_regx 0x5e]
$C$DW$152 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$152, DW_AT_name("D15_hi")
.dwattr $C$DW$152, DW_AT_location[DW_OP_regx 0x5f]
$C$DW$153 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$153, DW_AT_name("FPEXC")
.dwattr $C$DW$153, DW_AT_location[DW_OP_reg18]
$C$DW$154 .dwtag DW_TAG_TI_assign_register
.dwattr $C$DW$154, DW_AT_name("FPSCR")
.dwattr $C$DW$154, DW_AT_location[DW_OP_reg19]
.dwendtag $C$DW$CU
|
src/asf-security-filters.ads
|
Letractively/ada-asf
| 0 |
28502
|
-----------------------------------------------------------------------
-- security-filters -- Security filter
-- Copyright (C) 2011, 2012 <NAME>
-- Written by <NAME> (<EMAIL>)
--
-- 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 ASF.Filters;
with ASF.Requests;
with ASF.Responses;
with ASF.Servlets;
with ASF.Sessions;
with ASF.Principals;
with Security.Policies; use Security;
-- The <b>Security.Filters</b> package defines a servlet filter that can be activated
-- on requests to authenticate users and verify they have the permission to view
-- a page.
package ASF.Security.Filters is
SID_COOKIE : constant String := "SID";
AID_COOKIE : constant String := "AID";
type Auth_Filter is new ASF.Filters.Filter with private;
-- Called by the servlet container to indicate to a servlet that the servlet
-- is being placed into service.
overriding
procedure Initialize (Server : in out Auth_Filter;
Context : in ASF.Servlets.Servlet_Registry'Class);
-- Set the permission manager that must be used to verify the permission.
procedure Set_Permission_Manager (Filter : in out Auth_Filter;
Manager : in Policies.Policy_Manager_Access);
-- Filter the request to make sure the user is authenticated.
-- Invokes the <b>Do_Login</b> procedure if there is no user.
-- If a permission manager is defined, check that the user has the permission
-- to view the page. Invokes the <b>Do_Deny</b> procedure if the permission
-- is denied.
procedure Do_Filter (F : in Auth_Filter;
Request : in out ASF.Requests.Request'Class;
Response : in out ASF.Responses.Response'Class;
Chain : in out ASF.Servlets.Filter_Chain);
-- Display or redirects the user to the login page. This procedure is called when
-- the user is not authenticated.
procedure Do_Login (F : in Auth_Filter;
Request : in out ASF.Requests.Request'Class;
Response : in out ASF.Responses.Response'Class);
-- Display the forbidden access page. This procedure is called when the user is not
-- authorized to see the page. The default implementation returns the SC_FORBIDDEN error.
procedure Do_Deny (F : in Auth_Filter;
Request : in out ASF.Requests.Request'Class;
Response : in out ASF.Responses.Response'Class);
-- Authenticate a user by using the auto-login cookie. This procedure is called if the
-- current session does not have any principal. Based on the request and the optional
-- auto-login cookie passed in <b>Auth_Id</b>, it should identify the user and return
-- a principal object. The principal object will be freed when the session is closed.
-- If the user cannot be authenticated, the returned principal should be null.
--
-- The default implementation returns a null principal.
procedure Authenticate (F : in Auth_Filter;
Request : in out ASF.Requests.Request'Class;
Response : in out ASF.Responses.Response'Class;
Session : in ASF.Sessions.Session;
Auth_Id : in String;
Principal : out ASF.Principals.Principal_Access);
private
type Auth_Filter is new ASF.Filters.Filter with record
Manager : Policies.Policy_Manager_Access := null;
end record;
end ASF.Security.Filters;
|
src/Generic/Lib/Data/Product.agda
|
turion/Generic
| 0 |
17208
|
module Generic.Lib.Data.Product where
open import Data.Product renaming (map to pmap; zip to pzip) hiding (map₁; map₂) public
open import Generic.Lib.Intro
open import Generic.Lib.Category
infixl 4 _,ᵢ_
first : ∀ {α β γ} {A : Set α} {B : Set β} {C : A -> Set γ}
-> (∀ x -> C x) -> (p : A × B) -> C (proj₁ p) × B
first f (x , y) = f x , y
second : ∀ {α β γ} {A : Set α} {B : A -> Set β} {C : A -> Set γ}
-> (∀ {x} -> B x -> C x) -> Σ A B -> Σ A C
second g (x , y) = x , g y
-- `B` and `C` are in the same universe.
firstF : ∀ {α β} {A : Set α} {B : Set β} {C : A -> Set β}
{F : Set β -> Set β} {{fFunctor : RawFunctor F}}
-> (∀ x -> F (C x)) -> (p : A × B) -> F (C (proj₁ p) × B)
firstF f (x , y) = flip _,_ y <$> f x
-- `A` and `C` are in the same universe.
secondF : ∀ {α β} {A : Set α} {B : A -> Set β} {C : A -> Set α}
{F : Set α -> Set α} {{fFunctor : RawFunctor F}}
-> (∀ {x} -> B x -> F (C x)) -> Σ A B -> F (Σ A C)
secondF g (x , y) = _,_ x <$> g y
record Σᵢ {α β} (A : Set α) (B : .A -> Set β) : Set (α ⊔ β) where
constructor _,ᵢ_
field
.iproj₁ : A
iproj₂ : B iproj₁
open Σᵢ public
∃ᵢ : ∀ {α β} {A : Set α} -> (.A -> Set β) -> Set (α ⊔ β)
∃ᵢ = Σᵢ _
instance
,-inst : ∀ {α β} {A : Set α} {B : A -> Set β} {{x : A}} {{y : B x}} -> Σ A B
,-inst {{x}} {{y}} = x , y
,ᵢ-inst : ∀ {α β} {A : Set α} {B : .A -> Set β} {{x : A}} {{y : B x}} -> Σᵢ A B
,ᵢ-inst {{x}} {{y}} = x ,ᵢ y
|
programs/oeis/080/A080333.asm
|
neoneye/loda
| 22 |
103229
|
<filename>programs/oeis/080/A080333.asm
; A080333: Partial sums of A080278.
; 1,2,6,7,8,12,13,14,27,28,29,33,34,35,39,40,41,54,55,56,60,61,62,66,67,68,108,109,110,114,115,116,120,121,122,135,136,137,141,142,143,147,148,149,162,163,164,168,169,170,174,175,176,216,217,218,222,223,224,228,229
mov $2,$0
add $2,1
mov $4,$0
lpb $2
mov $0,$4
sub $2,1
sub $0,$2
add $0,1
mul $0,3
mov $3,81
gcd $3,$0
div $3,2
add $1,$3
lpe
mov $0,$1
|
day09/src/day.ads
|
jwarwick/aoc_2020
| 3 |
18808
|
<filename>day09/src/day.ads
-- AOC 2020, Day 9
with Ada.Containers.Vectors;
package Day is
package XMAS_Vector is new Ada.Containers.Vectors
(Index_Type => Natural,
Element_Type => Long_Integer);
use XMAS_Vector;
function load_file(filename : in String) return XMAS_Vector.Vector;
function first_invalid(v : in XMAS_Vector.Vector; preamble : in Positive) return Long_Integer;
function find_sum(v : in XMAS_Vector.Vector; target : in Long_Integer) return Long_Integer;
end Day;
|
internal/parser2/NitroLexer.g4
|
dcaiafa/nitro
| 0 |
6504
|
lexer grammar NitroLexer;
import Strings;
M_INFO: '!info';
M_PARAM: '!param';
M_FLAG: '!flag';
AND: 'and';
BREAK: 'break';
CATCH: 'catch';
CONTINUE: 'continue';
DEFER: 'defer';
ELSE: 'else';
FALSE: 'false';
FOR: 'for';
FUNC: 'func';
IF: 'if';
IMPORT: 'import';
NIL: 'nil';
NOT: 'not';
OR: 'or';
RETURN: 'return';
THROW: 'throw';
TRUE: 'true';
TRY: 'try';
VAR: 'var';
WHILE: 'while';
YIELD: 'yield';
ASSIGN: '=';
EQ: '==';
NE: '!=';
LT: '<';
LE: '<=';
GT: '>';
GE: '>=';
ADD: '+';
SUB: '-';
MUL: '*';
DIV: '/';
MOD: '%';
QUESTION_MARK: '?';
SEMICOLON: ';';
COMMA: ',';
COLON: ':';
PERIOD: '.';
OPAREN: '(';
CPAREN: ')';
OBRACKET: '[';
CBRACKET: ']';
OCURLY: '{';
CCURLY: '}';
ARROW: '->';
LAMBDA: '&';
PIPE: '|';
EXPAND: '...';
NUMBER: [0-9]+ ('.' [0-9]+)?;
ID: [a-zA-Z_] [a-zA-Z0-9_]*;
REGEX: 'r`' ~[`]* '`';
NEWLINE: '\r'? '\n';
CHAR: '\'' (('\\' [nrt'\\]) | ~['\r\n\\]+) '\'';
fragment HEX_DIGIT: [a-fA-F0-9];
COMMENT: '#' ~[\n]* -> skip;
WS: [ \t]+ -> skip;
|
source/symbols.ads
|
jquorning/CELLE
| 0 |
27126
|
<filename>source/symbols.ads<gh_stars>0
--
-- The author disclaims copyright to this source code. In place of
-- a legal notice, here is a blessing:
--
-- May you do good and not evil.
-- May you find forgiveness for yourself and forgive others.
-- May you share freely, not taking more than you give.
--
with Ada.Containers;
with Ada.Strings.Unbounded;
with Ada.Containers.Vectors;
with Types;
with Symbol_Sets;
limited with Rules;
package Symbols is
type Symbol_Kind is
(Terminal,
Non_Terminal,
Multi_Terminal);
type Association_Type is
(Left_Association,
Right_Association,
No_Association,
Unknown_Association);
type Symbol_Record;
type Symbol_Access is access all Symbol_Record;
subtype Line_Number is Types.Line_Number;
package Symbol_Vectors is
new Ada.Containers.Vectors (Index_Type => Natural,
Element_Type => Symbol_Access);
use Symbol_Vectors;
use Ada.Strings.Unbounded;
package Alias_Vectors is
new Ada.Containers.Vectors (Index_Type => Natural,
Element_Type => Unbounded_String);
subtype Symbol_Index is Types.Symbol_Index;
type Symbol_Record is
record
Name : Unbounded_String := Null_Unbounded_String;
Index : Symbol_Index := 0;
-- Index number for this symbol
Kind : Symbol_Kind := Terminal;
-- Symbols are all either TERMINALS or NTs
Rule : access Rules.Rule_Record := null;
-- Linked list of rules of this (if an NT)
Fallback : access Symbol_Record := null;
-- fallback token in case this token doesn't parse
Precedence : Integer := 0;
-- Precedence if defined (-1 otherwise)
Association : Association_Type := Left_Association;
-- Associativity if precedence is defined
-- First_Set : Sets.Set_Type := Sets.Null_Set;
First_Set : Symbol_Sets.Set_Type := Symbol_Sets.Null_Set;
-- First-set for all rules of this symbol
Lambda : Boolean := False;
-- True if NT and can generate an empty string
Use_Count : Natural := 0;
-- Number of times used
Destructor : aliased Unbounded_String := Null_Unbounded_String;
-- Code which executes whenever this symbol is
-- popped from the stack during error processing
Dest_Lineno : aliased Line_Number := 0;
-- Line number for start of destructor. Set to
-- -1 for duplicate destructors.
Data_Type : aliased Unbounded_String := Null_Unbounded_String;
-- The data type of information held by this
-- object. Only used if type==NONTERMINAL
DT_Num : Integer := 0;
-- The data type number. In the parser, the value
-- stack is a union. The .yy%d element of this
-- union is the correct data type for this object
Content : Boolean := False;
-- True if this symbol ever carries content - if
-- it is ever more than just syntax
--
-- The following fields are used by MULTITERMINALs only
--
Sub_Symbol : Vector := Empty_Vector;
-- Array of constituent symbols
end record;
--
-- Routines for handling symbols of the grammar
--
function Name_Of (Symbol : in Symbol_Access) return String
is (To_String (Symbol.Name));
procedure Count_Symbols_And_Terminals (Symbol_Count : out Natural;
Terminal_Count : out Natural);
-- Count the number of symbols and terminals.
procedure Symbol_Init;
-- Allocate a new associative array.
function Create (Name : in String) return Symbol_Access;
-- Return a pointer to the (terminal or nonterminal) symbol "Name".
-- Create a new symbol if this is the first time "Name" has been seen.
function Find (Name : in String) return Symbol_Access;
-- Return a pointer to data assigned to the given key. Return NULL
-- if no such key.
procedure Symbol_Allocate (Count : in Ada.Containers.Count_Type);
-- Return an array of pointers to all data in the table.
-- The array is obtained from malloc. Return NULL if memory allocation
-- problems, or if the array is empty.
function "<" (Left, Right : in Symbol_Record)
return Boolean;
-- Compare two symbols for sorting purposes. Return negative,
-- zero, or positive if a is less then, equal to, or greater
-- than b.
--
-- Symbols that begin with upper case letters (terminals or tokens)
-- must sort before symbols that begin with lower case letters
-- (non-terminals). And MULTITERMINAL symbols (created using the
-- %token_class directive) must sort at the very end. Other than
-- that, the order does not matter.
--
-- We find experimentally that leaving the symbols in their original
-- order (the order they appeared in the grammar file) gives the
-- smallest parser tables in SQLite.
function Last_Index return Symbol_Index;
-- Get symbol last index.
function Element_At (Index : in Symbol_Index)
return Symbol_Access;
-- Get symbol at Index position.
procedure Sort;
-- Sort the symbol table
procedure Set_Lambda_False_And_Set_Firstset (First : in Natural;
Last : in Natural);
-- Helper procedure split out of Builds.Find_First_Sets.
-- Set all symbol lambda to False.
-- New_Set to symbol in range First to Last.
end Symbols;
|
programs/oeis/087/A087278.asm
|
neoneye/loda
| 22 |
97806
|
<reponame>neoneye/loda<gh_stars>10-100
; A087278: Distance to nearest square is not greater than 1.
; 0,1,2,3,4,5,8,9,10,15,16,17,24,25,26,35,36,37,48,49,50,63,64,65,80,81,82,99,100,101,120,121,122,143,144,145,168,169,170,195,196,197,224,225,226,255,256,257,288,289,290,323,324,325,360,361,362,399,400,401
mov $2,$0
div $0,3
mov $1,$0
pow $0,2
sub $0,$1
add $0,$2
|
Math/NumberTheory/Product/Generic.agda
|
rei1024/agda-misc
| 3 |
11242
|
<filename>Math/NumberTheory/Product/Generic.agda
{-# OPTIONS --without-K --safe #-}
module Math.NumberTheory.Product.Generic where
-- agda-stdlib
open import Algebra
-- agda-misc
open import Math.NumberTheory.Summation.Generic
-- TODO add syntax
module MonoidProduct {c e} (M : Monoid c e) =
MonoidSummation M
renaming
( Σ< to Π<
; Σ≤ to Π≤
; Σ<range to Π<range
; Σ≤range to Π≤range
)
using ()
|
Transynther/x86/_processed/NONE/_xt_/i9-9900K_12_0xa0.log_21829_898.asm
|
ljhsiun2/medusa
| 9 |
18338
|
.global s_prepare_buffers
s_prepare_buffers:
push %r11
push %r9
push %rax
push %rbp
push %rcx
push %rdi
push %rdx
push %rsi
lea addresses_WC_ht+0x106da, %rsi
lea addresses_A_ht+0x1e42a, %rdi
nop
add %rbp, %rbp
mov $25, %rcx
rep movsw
nop
nop
nop
cmp $1989, %r9
lea addresses_normal_ht+0x156da, %r11
nop
nop
sub $48894, %rdx
movw $0x6162, (%r11)
nop
nop
nop
and $25843, %r9
lea addresses_D_ht+0x1ebc8, %rcx
clflush (%rcx)
nop
nop
nop
nop
mfence
movups (%rcx), %xmm0
vpextrq $0, %xmm0, %rdi
nop
nop
nop
nop
sub $41725, %rcx
lea addresses_normal_ht+0x19fda, %rdx
nop
nop
nop
nop
nop
add $58407, %r9
mov (%rdx), %rbp
nop
nop
nop
nop
nop
and $42726, %r11
lea addresses_WC_ht+0x13eda, %rdi
add %r9, %r9
vmovups (%rdi), %ymm4
vextracti128 $1, %ymm4, %xmm4
vpextrq $0, %xmm4, %rsi
nop
and %rdx, %rdx
lea addresses_A_ht+0xa4da, %rsi
lea addresses_WC_ht+0x486a, %rdi
nop
nop
nop
nop
nop
dec %r11
mov $9, %rcx
rep movsl
nop
nop
nop
nop
inc %r9
lea addresses_WC_ht+0x3eda, %rsi
lea addresses_A_ht+0x10ada, %rdi
nop
nop
nop
nop
nop
sub $6604, %rax
mov $1, %rcx
rep movsl
nop
nop
nop
cmp %rcx, %rcx
lea addresses_UC_ht+0x4da, %rcx
nop
add $42220, %rdi
mov $0x6162636465666768, %rdx
movq %rdx, %xmm6
movups %xmm6, (%rcx)
nop
nop
and %r9, %r9
lea addresses_A_ht+0x23da, %rax
nop
nop
nop
nop
add %rdx, %rdx
mov $0x6162636465666768, %rdi
movq %rdi, %xmm6
vmovups %ymm6, (%rax)
nop
nop
nop
nop
nop
cmp $39838, %rsi
lea addresses_WC_ht+0x14eda, %rax
clflush (%rax)
and $38662, %rsi
mov $0x6162636465666768, %rcx
movq %rcx, (%rax)
nop
add $2545, %r9
lea addresses_WT_ht+0xaeda, %rcx
nop
nop
dec %rdx
mov (%rcx), %r11
nop
nop
nop
nop
nop
cmp %rbp, %rbp
lea addresses_UC_ht+0x17cc2, %rsi
clflush (%rsi)
nop
sub $41239, %rdx
mov (%rsi), %r11
nop
nop
nop
xor %r11, %r11
lea addresses_normal_ht+0x160da, %rdi
nop
nop
cmp $669, %r9
mov $0x6162636465666768, %r11
movq %r11, %xmm5
movups %xmm5, (%rdi)
nop
dec %r9
lea addresses_UC_ht+0x10612, %rbp
sub %r11, %r11
movw $0x6162, (%rbp)
nop
and $45660, %rbp
pop %rsi
pop %rdx
pop %rdi
pop %rcx
pop %rbp
pop %rax
pop %r9
pop %r11
ret
.global s_faulty_load
s_faulty_load:
push %r10
push %r13
push %r14
push %rbx
push %rcx
push %rdx
push %rsi
// Store
lea addresses_PSE+0x118da, %rbx
nop
cmp $6419, %r10
mov $0x5152535455565758, %r14
movq %r14, (%rbx)
nop
nop
nop
and %r10, %r10
// Store
mov $0x3da, %r14
clflush (%r14)
nop
nop
nop
sub %rsi, %rsi
movb $0x51, (%r14)
nop
nop
nop
nop
nop
sub %r10, %r10
// Faulty Load
lea addresses_D+0x76da, %r13
nop
nop
nop
nop
nop
and %r14, %r14
vmovups (%r13), %ymm6
vextracti128 $0, %ymm6, %xmm6
vpextrq $1, %xmm6, %rbx
lea oracles, %rcx
and $0xff, %rbx
shlq $12, %rbx
mov (%rcx,%rbx,1), %rbx
pop %rsi
pop %rdx
pop %rcx
pop %rbx
pop %r14
pop %r13
pop %r10
ret
/*
<gen_faulty_load>
[REF]
{'src': {'NT': False, 'same': False, 'congruent': 0, 'type': 'addresses_D', 'AVXalign': False, 'size': 1}, 'OP': 'LOAD'}
{'OP': 'STOR', 'dst': {'NT': False, 'same': False, 'congruent': 9, 'type': 'addresses_PSE', 'AVXalign': False, 'size': 8}}
{'OP': 'STOR', 'dst': {'NT': False, 'same': False, 'congruent': 6, 'type': 'addresses_P', 'AVXalign': False, 'size': 1}}
[Faulty Load]
{'src': {'NT': False, 'same': True, 'congruent': 0, 'type': 'addresses_D', 'AVXalign': False, 'size': 32}, 'OP': 'LOAD'}
<gen_prepare_buffer>
{'src': {'same': False, 'congruent': 11, 'type': 'addresses_WC_ht'}, 'OP': 'REPM', 'dst': {'same': False, 'congruent': 3, 'type': 'addresses_A_ht'}}
{'OP': 'STOR', 'dst': {'NT': True, 'same': False, 'congruent': 11, 'type': 'addresses_normal_ht', 'AVXalign': False, 'size': 2}}
{'src': {'NT': False, 'same': False, 'congruent': 1, 'type': 'addresses_D_ht', 'AVXalign': False, 'size': 16}, 'OP': 'LOAD'}
{'src': {'NT': False, 'same': False, 'congruent': 4, 'type': 'addresses_normal_ht', 'AVXalign': False, 'size': 8}, 'OP': 'LOAD'}
{'src': {'NT': False, 'same': False, 'congruent': 10, 'type': 'addresses_WC_ht', 'AVXalign': False, 'size': 32}, 'OP': 'LOAD'}
{'src': {'same': False, 'congruent': 3, 'type': 'addresses_A_ht'}, 'OP': 'REPM', 'dst': {'same': False, 'congruent': 4, 'type': 'addresses_WC_ht'}}
{'src': {'same': False, 'congruent': 8, 'type': 'addresses_WC_ht'}, 'OP': 'REPM', 'dst': {'same': False, 'congruent': 9, 'type': 'addresses_A_ht'}}
{'OP': 'STOR', 'dst': {'NT': False, 'same': False, 'congruent': 7, 'type': 'addresses_UC_ht', 'AVXalign': False, 'size': 16}}
{'OP': 'STOR', 'dst': {'NT': False, 'same': False, 'congruent': 6, 'type': 'addresses_A_ht', 'AVXalign': False, 'size': 32}}
{'OP': 'STOR', 'dst': {'NT': False, 'same': False, 'congruent': 11, 'type': 'addresses_WC_ht', 'AVXalign': True, 'size': 8}}
{'src': {'NT': False, 'same': False, 'congruent': 11, 'type': 'addresses_WT_ht', 'AVXalign': True, 'size': 8}, 'OP': 'LOAD'}
{'src': {'NT': False, 'same': False, 'congruent': 3, 'type': 'addresses_UC_ht', 'AVXalign': False, 'size': 8}, 'OP': 'LOAD'}
{'OP': 'STOR', 'dst': {'NT': False, 'same': False, 'congruent': 8, 'type': 'addresses_normal_ht', 'AVXalign': False, 'size': 16}}
{'OP': 'STOR', 'dst': {'NT': False, 'same': False, 'congruent': 3, 'type': 'addresses_UC_ht', 'AVXalign': False, 'size': 2}}
{'36': 21829}
36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36
*/
|
programs/oeis/196/A196787.asm
|
neoneye/loda
| 22 |
81599
|
; A196787: a(n) = 3*a(n-1) - 2*a(n-2) - a(n-4) + a(n-5) with initial terms 1, 1, 1, 3, 6.
; 1,1,1,3,6,12,24,46,87,163,303,561,1036,1910,3518,6476,11917,21925,40333,74191,136466,251008,461684,849178,1561891,2872775,5283867,9718557,17875224,32877674,60471482,111224408,204573593,376269513,692067545
lpb $0
mov $2,$0
sub $0,1
seq $2,141523 ; Expansion of (3-2*x-3*x^2)/(1-x-x^2-x^3).
add $1,$2
sub $1,1
lpe
div $1,2
add $1,1
mov $0,$1
|
Pasteboard/PasteFromThings.grandtotalplugin/script.applescript
|
mediaatelier/GrandTotal-Plugins
| 5 |
3630
|
<reponame>mediaatelier/GrandTotal-Plugins
tell application id "com.culturedcode.ThingsMac"
set theList to selected to dos
set theResult to "["
set theMax to number of items in theList
set theCount to 0
repeat with theItem in theList
set theCount to theCount + 1
set theResult to theResult & "{"
set theResult to theResult & quote & "name" & quote & ":"
set theResult to theResult & quote & my escapeString(name of theItem) & quote
set theResult to theResult & ","
set theResult to theResult & quote & "notes" & quote & ":"
set theResult to theResult & quote & my escapeString(notes of theItem) & quote
set theResult to theResult & ","
set theResult to theResult & quote & "completiondate" & quote & ":"
if (completion date of theItem = missing value) then
set theResult to theResult & quote & quote
else
set theResult to theResult & quote & completion date of theItem & quote
end if
set theResult to theResult & "}"
if (theCount = theMax) then
else
set theResult to theResult & ","
end if
end repeat
set theResult to theResult & "]"
return theResult
end tell
on escapeString(thestring)
return my replace_chars(thestring, "\n", "\\n")
end escapeString
on replace_chars(this_text, search_string, replacement_string)
set AppleScript's text item delimiters to the search_string
set the item_list to every text item of this_text
set AppleScript's text item delimiters to the replacement_string
set this_text to the item_list as string
set AppleScript's text item delimiters to ""
return this_text
end replace_chars
|
test/Succeed/Issue3731.agda
|
shlevy/agda
| 1,989 |
10816
|
<reponame>shlevy/agda
-- Andreas, 2019-04-30, issue #3731
-- Compiler backend: Do not look for a main function if not the main module.
open import Agda.Builtin.Nat
module Issue3731 where
module M where
module main where
record R : Set where
field
main : Nat
data Main : Set where
main : Main
module N where
data main : Set where
module O where
record main : Set where
module P where
postulate
main : Nat
module Q where
abstract
main : Nat
main = 1
main : Nat
main = 0
|
oeis/300/A300077.asm
|
neoneye/loda-programs
| 11 |
92235
|
; A300077: Decimal expansion of Pi/2 truncated to n places.
; Submitted by <NAME>
; 1,15,157,1570,15707,157079,1570796,15707963,157079632,1570796326,15707963267,157079632679,1570796326794,15707963267948,157079632679489,1570796326794896,15707963267948966,157079632679489661,1570796326794896619,15707963267948966192
mov $1,1
mov $2,1
mov $3,$0
mul $3,5
lpb $3
mul $1,$3
mov $5,$3
mul $5,2
add $5,1
mul $2,$5
add $1,$2
cmp $4,0
mov $5,$0
add $5,$4
div $1,$5
div $2,$5
sub $3,1
lpe
mov $6,10
pow $6,$0
div $2,$6
div $1,$2
mov $0,$1
|
Cubical/HITs/Ints/QuoInt/Properties.agda
|
dan-iel-lee/cubical
| 0 |
11941
|
{-# OPTIONS --cubical --no-import-sorts --safe #-}
module Cubical.HITs.Ints.QuoInt.Properties where
open import Cubical.Core.Everything
open import Cubical.Foundations.Prelude
open import Cubical.Foundations.Function
open import Cubical.Foundations.HLevels
open import Cubical.Foundations.Equiv
open import Cubical.Relation.Nullary
open import Cubical.Data.Nat as ℕ using (ℕ; zero; suc)
open import Cubical.Data.Bool as Bool using (Bool; not; notnot)
open import Cubical.Data.Empty
open import Cubical.Data.Unit renaming (Unit to ⊤)
open import Cubical.HITs.Ints.QuoInt.Base
·S-comm : ∀ x y → x ·S y ≡ y ·S x
·S-comm = Bool.⊕-comm
·S-assoc : ∀ x y z → x ·S (y ·S z) ≡ (x ·S y) ·S z
·S-assoc = Bool.⊕-assoc
not-·Sˡ : ∀ x y → not (x ·S y) ≡ not x ·S y
not-·Sˡ = Bool.not-⊕ˡ
snotz : ∀ s n s' → ¬ (signed s (suc n) ≡ signed s' zero)
snotz s n s' eq = subst (λ { (signed s (suc n)) → ⊤
; _ → ⊥ }) eq tt
+-zeroʳ : ∀ s m → m + signed s zero ≡ m
+-zeroʳ s (signed s' zero) = signed-zero s s'
+-zeroʳ s (pos (suc n)) = cong sucℤ (+-zeroʳ s (pos n))
+-zeroʳ s (neg (suc n)) = cong predℤ (+-zeroʳ s (neg n))
+-zeroʳ spos (posneg i) j = posneg (i ∧ j)
+-zeroʳ sneg (posneg i) j = posneg (i ∨ ~ j)
+-identityʳ : ∀ m → m + pos zero ≡ m
+-identityʳ = +-zeroʳ spos
sucℤ-+ʳ : ∀ m n → sucℤ (m + n) ≡ m + sucℤ n
sucℤ-+ʳ (signed _ zero) _ = refl
sucℤ-+ʳ (posneg _) _ = refl
sucℤ-+ʳ (pos (suc m)) n = cong sucℤ (sucℤ-+ʳ (pos m) n)
sucℤ-+ʳ (neg (suc m)) n =
sucPredℤ (neg m + n) ∙∙
sym (predSucℤ (neg m + n)) ∙∙
cong predℤ (sucℤ-+ʳ (neg m) n)
-- I wonder if we could somehow use negEq to get this for free from the above...
predℤ-+ʳ : ∀ m n → predℤ (m + n) ≡ m + predℤ n
predℤ-+ʳ (signed _ zero) _ = refl
predℤ-+ʳ (posneg _) _ = refl
predℤ-+ʳ (neg (suc m)) n = cong predℤ (predℤ-+ʳ (neg m) n)
predℤ-+ʳ (pos (suc m)) n =
predSucℤ (pos m + n) ∙∙
sym (sucPredℤ (pos m + n)) ∙∙
cong sucℤ (predℤ-+ʳ (pos m) n)
+-comm : ∀ m n → m + n ≡ n + m
+-comm (signed s zero) n = sym (+-zeroʳ s n)
+-comm (pos (suc m)) n = cong sucℤ (+-comm (pos m) n) ∙ sucℤ-+ʳ n (pos m)
+-comm (neg (suc m)) n = cong predℤ (+-comm (neg m) n) ∙ predℤ-+ʳ n (neg m)
+-comm (posneg i) n = lemma n i
where
-- get some help from:
-- https://www.codewars.com/kata/reviews/5c878e3ef1abb10001e32eb1/groups/5cca3f9e840f4b0001d8ac98
lemma : ∀ n → (λ i → (posneg i + n) ≡ (n + posneg i))
[ sym (+-zeroʳ spos n) ≡ sym (+-zeroʳ sneg n) ]
lemma (pos zero) i j = posneg (i ∧ j)
lemma (pos (suc n)) i = cong sucℤ (lemma (pos n) i)
lemma (neg zero) i j = posneg (i ∨ ~ j)
lemma (neg (suc n)) i = cong predℤ (lemma (neg n) i)
lemma (posneg i) j k = posneg ((i ∧ ~ k) ∨ (i ∧ j) ∨ (j ∧ k))
sucℤ-+ˡ : ∀ m n → sucℤ (m + n) ≡ sucℤ m + n
sucℤ-+ˡ (pos _) n = refl
sucℤ-+ˡ (neg zero) n = refl
sucℤ-+ˡ (neg (suc m)) n = sucPredℤ _
sucℤ-+ˡ (posneg _) n = refl
-- I wonder if we could somehow use negEq to get this for free from the above...
predℤ-+ˡ : ∀ m n → predℤ (m + n) ≡ predℤ m + n
predℤ-+ˡ (pos zero) n = refl
predℤ-+ˡ (pos (suc m)) n = predSucℤ _
predℤ-+ˡ (neg _) n = refl
predℤ-+ˡ (posneg _) n = refl
+-assoc : ∀ m n o → m + (n + o) ≡ m + n + o
+-assoc (signed s zero) n o = refl
+-assoc (posneg i) n o = refl
+-assoc (pos (suc m)) n o = cong sucℤ (+-assoc (pos m) n o) ∙ sucℤ-+ˡ (pos m + n) o
+-assoc (neg (suc m)) n o = cong predℤ (+-assoc (neg m) n o) ∙ predℤ-+ˡ (neg m + n) o
sucℤ-inj : ∀ m n → sucℤ m ≡ sucℤ n → m ≡ n
sucℤ-inj m n p = sym (predSucℤ m) ∙ cong predℤ p ∙ predSucℤ n
predℤ-inj : ∀ m n → predℤ m ≡ predℤ n → m ≡ n
predℤ-inj m n p = sym (sucPredℤ m) ∙ cong sucℤ p ∙ sucPredℤ n
+-injˡ : ∀ o m n → o + m ≡ o + n → m ≡ n
+-injˡ (signed _ zero) _ _ p = p
+-injˡ (posneg _) _ _ p = p
+-injˡ (pos (suc o)) m n p = +-injˡ (pos o) m n (sucℤ-inj _ _ p)
+-injˡ (neg (suc o)) m n p = +-injˡ (neg o) m n (predℤ-inj _ _ p)
+-injʳ : ∀ m n o → m + o ≡ n + o → m ≡ n
+-injʳ m n o p = +-injˡ o m n (+-comm o m ∙ p ∙ +-comm n o)
·-comm : ∀ m n → m · n ≡ n · m
·-comm m n i = signed (·S-comm (sign m) (sign n) i) (ℕ.·-comm (abs m) (abs n) i)
·-identityˡ : ∀ n → pos 1 · n ≡ n
·-identityˡ n = cong (signed (sign n)) (ℕ.+-zero (abs n)) ∙ signed-inv n
·-identityʳ : ∀ n → n · pos 1 ≡ n
·-identityʳ n = ·-comm n (pos 1) ∙ ·-identityˡ n
·-zeroˡ : ∀ {s} n → signed s zero · n ≡ signed s zero
·-zeroˡ _ = signed-zero _ _
·-zeroʳ : ∀ {s} n → n · signed s zero ≡ signed s zero
·-zeroʳ n = cong (signed _) (sym (ℕ.0≡m·0 (abs n))) ∙ signed-zero _ _
·-signed-pos : ∀ {s} m n → signed s m · pos n ≡ signed s (m ℕ.· n)
·-signed-pos {s} zero n = ·-zeroˡ {s} (pos n)
·-signed-pos {s} (suc m) n i = signed (·S-comm s (sign-pos n i) i) (suc m ℕ.· n)
-- this proof is why we defined ℤ using `signed` instead of `pos` and `neg`
-- based on that in: https://github.com/danr/Agda-Numerics
·-assoc : ∀ m n o → m · (n · o) ≡ m · n · o
·-assoc (signed s zero) n o =
·-zeroˡ (n · o)
·-assoc m@(signed _ (suc _)) (signed s zero) o =
·-zeroʳ {sign o} m ∙ signed-zero _ _ ∙ cong (_· o) (sym (·-zeroʳ {s} m))
·-assoc m@(signed _ (suc _)) n@(signed _ (suc _)) (signed s zero) =
cong (m ·_) (·-zeroʳ {s} n) ∙ ·-zeroʳ {s} m ∙ sym (·-zeroʳ {s} (m · n))
·-assoc (signed sm (suc m)) (signed sn (suc n)) (signed so (suc o)) i =
signed (·S-assoc sm sn so i) (ℕ.·-assoc (suc m) (suc n) (suc o) i)
·-assoc (posneg i) n o j =
isSet→isSet' isSetℤ (·-assoc (pos zero) n o) (·-assoc (neg zero) n o)
(λ i → posneg i · (n · o)) (λ i → posneg i · n · o) i j
·-assoc m@(signed _ (suc _)) (posneg i) o j =
isSet→isSet' isSetℤ (·-assoc m (pos zero) o) (·-assoc m (neg zero) o)
(λ i → m · (posneg i · o)) (λ i → m · posneg i · o) i j
·-assoc m@(signed _ (suc _)) n@(signed _ (suc _)) (posneg i) j =
isSet→isSet' isSetℤ (·-assoc m n (pos zero)) (·-assoc m n (neg zero))
(λ i → m · (n · posneg i)) (λ i → m · n · posneg i) i j
negateSuc : ∀ n → - sucℤ n ≡ predℤ (- n)
negateSuc n i = - sucℤ (negate-invol n (~ i))
negatePred : ∀ n → - predℤ n ≡ sucℤ (- n)
negatePred n i = negate-invol (sucℤ (- n)) i
negate-+ : ∀ m n → - (m + n) ≡ (- m) + (- n)
negate-+ (signed _ zero) n = refl
negate-+ (posneg _) n = refl
negate-+ (pos (suc m)) n = negateSuc (pos m + n) ∙ cong predℤ (negate-+ (pos m) n)
negate-+ (neg (suc m)) n = negatePred (neg m + n) ∙ cong sucℤ (negate-+ (neg m) n)
negate-·ˡ : ∀ m n → - (m · n) ≡ (- m) · n
negate-·ˡ (signed _ zero) n = signed-zero (not (sign n)) (sign n)
negate-·ˡ (signed ss (suc m)) n i = signed (not-·Sˡ ss (sign n) i) (suc m ℕ.· abs n)
negate-·ˡ (posneg i) n j =
isSet→isSet' isSetℤ (signed-zero (not (sign n)) _) (signed-zero _ _)
refl (λ i → posneg (~ i) · n) i j
signed-distrib : ∀ s m n → signed s (m ℕ.+ n) ≡ signed s m + signed s n
signed-distrib s zero n = refl
signed-distrib spos (suc m) n = cong sucℤ (signed-distrib spos m n)
signed-distrib sneg (suc m) n = cong predℤ (signed-distrib sneg m n)
·-pos-suc : ∀ m n → pos (suc m) · n ≡ n + pos m · n
·-pos-suc m n = signed-distrib (sign n) (abs n) (m ℕ.· abs n)
∙ (λ i → signed-inv n i + signed (sign-pos m (~ i) ·S sign n) (m ℕ.· abs n))
-- the below is based on that in: https://github.com/danr/Agda-Numerics
·-distribˡ-pos : ∀ o m n → (pos o · m) + (pos o · n) ≡ pos o · (m + n)
·-distribˡ-pos zero m n = signed-zero (sign n) (sign (m + n))
·-distribˡ-pos (suc o) m n =
pos (suc o) · m + pos (suc o) · n ≡[ i ]⟨ ·-pos-suc o m i + ·-pos-suc o n i ⟩
m + pos o · m + (n + pos o · n) ≡⟨ +-assoc (m + pos o · m) n (pos o · n) ⟩
m + pos o · m + n + pos o · n ≡[ i ]⟨ +-assoc m (pos o · m) n (~ i) + pos o · n ⟩
m + (pos o · m + n) + pos o · n ≡[ i ]⟨ m + +-comm (pos o · m) n i + pos o · n ⟩
m + (n + pos o · m) + pos o · n ≡[ i ]⟨ +-assoc m n (pos o · m) i + pos o · n ⟩
m + n + pos o · m + pos o · n ≡⟨ sym (+-assoc (m + n) (pos o · m) (pos o · n)) ⟩
m + n + (pos o · m + pos o · n) ≡⟨ cong ((m + n) +_) (·-distribˡ-pos o m n) ⟩
m + n + pos o · (m + n) ≡⟨ sym (·-pos-suc o (m + n)) ⟩
pos (suc o) · (m + n) ∎
·-distribˡ-neg : ∀ o m n → (neg o · m) + (neg o · n) ≡ neg o · (m + n)
·-distribˡ-neg o m n =
neg o · m + neg o · n ≡[ i ]⟨ negate-·ˡ (pos o) m (~ i) + negate-·ˡ (pos o) n (~ i) ⟩
- (pos o · m) + - (pos o · n) ≡⟨ sym (negate-+ (pos o · m) (pos o · n)) ⟩
- (pos o · m + pos o · n) ≡⟨ cong -_ (·-distribˡ-pos o m n) ⟩
- (pos o · (m + n)) ≡⟨ negate-·ˡ (pos o) (m + n) ⟩
neg o · (m + n) ∎
·-distribˡ : ∀ o m n → (o · m) + (o · n) ≡ o · (m + n)
·-distribˡ (pos o) m n = ·-distribˡ-pos o m n
·-distribˡ (neg o) m n = ·-distribˡ-neg o m n
·-distribˡ (posneg i) m n j =
isSet→isSet' isSetℤ (·-distribˡ-pos zero m n) (·-distribˡ-neg zero m n)
(λ i → posneg i · n) (λ i → posneg i · (m + n)) i j
·-distribʳ : ∀ m n o → (m · o) + (n · o) ≡ (m + n) · o
·-distribʳ m n o = (λ i → ·-comm m o i + ·-comm n o i) ∙ ·-distribˡ o m n ∙ ·-comm o (m + n)
sign-pos-suc-· : ∀ m n → sign (pos (suc m) · n) ≡ sign n
sign-pos-suc-· m (signed s zero) = sign-pos (suc m ℕ.· zero)
sign-pos-suc-· m (posneg i) = sign-pos (suc m ℕ.· zero)
sign-pos-suc-· m (signed s (suc n)) = refl
·-injˡ : ∀ o m n → pos (suc o) · m ≡ pos (suc o) · n → m ≡ n
·-injˡ o m n p = sym (signed-inv m) ∙ (λ i → signed (sign-eq i) (abs-eq i)) ∙ signed-inv n
where sign-eq = sym (sign-pos-suc-· o m) ∙ cong sign p ∙ sign-pos-suc-· o n
abs-eq = ℕ.inj-sm· {o} (cong abs p)
·-injʳ : ∀ m n o → m · pos (suc o) ≡ n · pos (suc o) → m ≡ n
·-injʳ m n o p = ·-injˡ o m n (·-comm (pos (suc o)) m ∙ p ∙ ·-comm n (pos (suc o)))
|
src/hott/loop/sum.agda
|
pcapriotti/agda-base
| 20 |
16997
|
<reponame>pcapriotti/agda-base<filename>src/hott/loop/sum.agda
{-# OPTIONS --without-K #-}
module hott.loop.sum where
open import sum
open import equality
open import function.core
open import function.extensionality
open import function.isomorphism
open import function.overloading
open import sets.nat
open import pointed
open import hott.equivalence
open import hott.level.core
open import hott.loop.core
open import hott.loop.properties
private
abstract
loop-sum' : ∀ {i}{j}{A : Set i}{B : A → Set j}(n : ℕ)
→ (hB : (a : A) → h n (B a))
→ {a₀ : A}{b₀ : B a₀}
→ Ω n {Σ A B} (a₀ , b₀) ≅ Ω n a₀
loop-sum' 0 hB {a₀}{b₀} = Σ-ap-iso refl≅ (λ a → contr-⊤-iso (hB a)) ·≅ ×-right-unit
loop-sum' {A = A}{B = B} (suc n) hB {a₀}{b₀} = Ω-iso n (sym≅ Σ-split-iso) refl
·≅ loop-sum' n λ p → hB _ _ _
loop-sum-β : ∀ {i}{j}{A : Set i}{B : A → Set j}(n : ℕ)
→ (hB : (a : A) → h n (B a))
→ {a₀ : A}{b₀ : B a₀}
→ (p : Ω n {Σ A B} (a₀ , b₀))
→ apply≅ (loop-sum' n hB) p ≡ mapΩ n proj₁ p
loop-sum-β zero hB p = refl
loop-sum-β (suc n) hB p
= loop-sum-β n _ (mapΩ n apΣ p)
· mapΩ-hom n apΣ proj₁ p
· funext-inv (ap proj₁ (ap (mapΩP n) lem)) p
where
lem : ∀ {i}{j}{A : Set i}{B : A → Set j}{a₀ : A}{b₀ : B a₀}
→ _≡_ {A = PMap (_≡_ {A = Σ A B} (a₀ , b₀) (a₀ , b₀) , refl) ((a₀ ≡ a₀) , refl)}
(proj₁ ∘ apΣ , refl)
(ap proj₁ , refl)
lem = apply≅ pmap-eq ((λ _ → refl) , refl)
loop-sum : ∀ {i}{j}{A : Set i}{B : A → Set j}(n : ℕ)
→ (hB : (a : A) → h n (B a))
→ {a₀ : A}{b₀ : B a₀}
→ Ω n {Σ A B} (a₀ , b₀) ≅ Ω n a₀
loop-sum n hB {a₀}{b₀} = ≈⇒≅ (mapΩ n proj₁ , subst weak-equiv eq we)
where
abstract
we : weak-equiv (apply (loop-sum' n hB {a₀}{b₀}))
we = proj₂ (≅⇒≈ (loop-sum' n hB))
eq : apply (loop-sum' n hB {a₀}{b₀}) ≡ mapΩ n proj₁
eq = funext (loop-sum-β n hB)
|
oeis/092/A092387.asm
|
neoneye/loda-programs
| 11 |
172549
|
<gh_stars>10-100
; A092387: a(n) = Fibonacci(2*n+1) + Fibonacci(2*n-1) + 2.
; 5,9,20,49,125,324,845,2209,5780,15129,39605,103684,271445,710649,1860500,4870849,12752045,33385284,87403805,228826129,599074580,1568397609,4106118245,10749957124,28143753125,73681302249,192900153620,505019158609,1322157322205,3461452808004,9062201101805,23725150497409,62113250390420,162614600673849,425730551631125,1114577054219524,2918000611027445,7639424778862809,20000273725560980,52361396397820129,137083915467899405,358890350005878084,939587134549734845,2459871053643326449,6440026026380244500
mov $1,6
mov $2,2
lpb $0
sub $0,1
add $2,$1
add $1,$2
lpe
div $1,2
add $1,2
mov $0,$1
|
src/Prelude/Size.agda
|
nad/equality
| 3 |
9470
|
<gh_stars>1-10
------------------------------------------------------------------------
-- Support for sized types
------------------------------------------------------------------------
{-# OPTIONS --without-K --sized-types #-}
module Prelude.Size where
open import Prelude
-- Size primitives.
open import Agda.Builtin.Size public
using (Size; ∞)
renaming (Size<_ to Size<; SizeUniv to Size-universe; ↑_ to ssuc)
-- If S is a type in the size universe, then S in-type is a type in
-- Type.
record _in-type (S : Size-universe) : Type where
field
size : S
open _in-type public
|
src/Bisimilarity/CCS/Examples/Natural-numbers.agda
|
nad/up-to
| 0 |
6476
|
------------------------------------------------------------------------
-- An example that uses natural numbers as names, implemented using
-- the coinductive definition of bisimilarity
------------------------------------------------------------------------
{-# OPTIONS --sized-types #-}
module Bisimilarity.CCS.Examples.Natural-numbers where
open import Equality.Propositional
open import Logical-equivalence using (_⇔_)
open import Prelude
open import Prelude.Size
open import Bijection equality-with-J using (_↔_)
open import Equality.Decision-procedures equality-with-J
open import Fin equality-with-J
open import Function-universe equality-with-J as F
hiding (id; _∘_; Distinct↔≢)
open import Nat equality-with-J hiding (Distinct)
open import Bisimilarity.CCS
import Bisimilarity.Equational-reasoning-instances
open import Bisimilarity.CCS.Examples
open import Equational-reasoning
open import Labelled-transition-system.CCS ℕ
open import Bisimilarity CCS
module _ (μ : Action) where
-- Two processes that are strongly bisimilar.
P : ∀ {i} → ℕ → Proc i
P n = Restricted n ∣ (μ · λ { .force → P (1 + n) })
Q : ∀ {i} → Proc i
Q = μ · λ { .force → Q }
P∼Q : ∀ {i n} → [ i ] P n ∼ Q
P∼Q {n = n} =
P n ∼⟨ Restricted∼∅ ∣-cong (refl ·-cong λ { .force → P∼Q }) ⟩
∅ ∣ Q ∼⟨ ∣-left-identity ⟩■
Q
-- Q is not finite.
Q-infinite : ¬ Finite Q
Q-infinite (action f) = Q-infinite f
-- However, Q is regular.
Q-regular : Regular Q
Q-regular = 1 , (λ _ → Q) , (fzero ,_) ∘ lemma
where
lemma : ∀ {P} → Subprocess P Q → Equal ∞ P Q
lemma (refl eq) = eq
lemma (action sub) = lemma sub
-- The processes in the family P are not finite.
P-infinite : ∀ {n} → ¬ Finite (P n)
P-infinite (_ ∣ action f) = P-infinite f
-- Furthermore they are irregular.
P-irregular : ∀ {n} → ¬ Regular (P n)
P-irregular (k , Qs , hyp) = irregular′ k hyp
where
Regular′ : ℕ → ∀ k → (Fin k → Proc ∞) → Type
Regular′ n k Qs =
∀ {Q} → Subprocess Q (P n) →
∃ λ (i : Fin k) → Equal ∞ Q (Qs i)
irregular′ : ∀ {n} k {Qs} → ¬ Regular′ n k Qs
irregular′ {n} zero {Qs} =
Regular′ n zero Qs ↝⟨ _$ refl (Proc-refl _) ⟩
(∃ λ (i : Fin zero) → _) ↝⟨ proj₁ ⟩□
⊥ □
irregular′ {n} (suc k) {Qs} =
Regular′ n (suc k) Qs ↝⟨ lemma₂ ⟩
(∃ λ Qs′ → Regular′ (suc n) k Qs′) ↝⟨ irregular′ k ∘ proj₂ ⟩□
⊥ □
where
lemma₁ :
∀ {Q} m {n} → Subprocess Q (P (1 + m + n)) → ¬ Equal ∞ Q (P n)
lemma₁ m (par-right (action sub)) eq = lemma₁ (suc m) sub eq
lemma₁ m {n} (refl (⟨ν refl ⟩ _ ∣ _)) (⟨ν suc[m+n]≡n ⟩ _ ∣ _) =
≢1+ _ (n ≡⟨ sym suc[m+n]≡n ⟩
suc (m + n) ≡⟨ cong suc (+-comm m) ⟩∎
suc (n + m) ∎)
lemma₁ _ (par-left (refl ())) (_ ∣ _)
lemma₁ _ (par-left (restriction (refl ()))) (_ ∣ _)
lemma₁ _ (par-left (restriction (action (refl ())))) (_ ∣ _)
lemma₁ _ (par-right (refl p)) q
with Proc-trans (Proc-sym p) q
... | ()
lemma₂ : ∀ {n k Qs} →
Regular′ n (suc k) Qs →
∃ λ Qs′ → Regular′ (suc n) k Qs′
lemma₂ {n} {k} {Qs} reg =
let i , Pn≡Qsi = reg (refl (Proc-refl _))
Fin↔ = Fin↔Fin+≢ i
Qs′ =
Fin k ↔⟨ Fin↔ ⟩
(∃ λ (j : Fin (suc k)) → Distinct j i) ↝⟨ Qs ∘ proj₁ ⟩□
Proc ∞ □
in
Qs′ , λ {Q} →
Subprocess Q (P (1 + n)) ↝⟨ (λ sub → reg (par-right (action sub)) , lemma₁ 0 sub) ⟩
(∃ λ (j : Fin (suc k)) → Equal ∞ Q (Qs j)) ×
¬ Equal ∞ Q (P n) ↝⟨ (λ { ((j , Q≡Qsj) , Q≢Pn) →
( j
, (case j Fin.≟ i of λ where
(inj₁ refl) → ⊥-elim $
Q≢Pn (Proc-trans Q≡Qsj (Proc-sym Pn≡Qsi))
(inj₂ j≢i) → _⇔_.from (Distinct↔≢ _) j≢i)
)
, Q≡Qsj }) ⟩
(∃ λ (j : ∃ λ (j : Fin (suc k)) → Distinct j i) →
Equal ∞ Q (Qs (proj₁ j))) ↝⟨ ∃-cong (λ _ → ≡⇒↝ _ $ cong (λ j → Equal ∞ Q (Qs (proj₁ j))) $ sym $
_↔_.right-inverse-of Fin↔ _) ⟩
(∃ λ (j : ∃ λ (j : Fin (suc k)) → Distinct j i) →
Equal ∞ Q (Qs (proj₁ (_↔_.to Fin↔ (_↔_.from Fin↔ j))))) ↔⟨⟩
(∃ λ (j : ∃ λ (j : Fin (suc k)) → Distinct j i) →
Equal ∞ Q (Qs′ (_↔_.from Fin↔ j))) ↝⟨ Σ-cong (inverse Fin↔) (λ _ → F.id) ⟩□
(∃ λ (j : Fin k) → Equal ∞ Q (Qs′ j)) □
|
oeis/001/A001120.asm
|
neoneye/loda-programs
| 11 |
26405
|
<reponame>neoneye/loda-programs<gh_stars>10-100
; A001120: a(0) = a(1) = 1; for n > 1, a(n) = n*a(n-1) + (-1)^n.
; Submitted by <NAME>(m4)
; 1,1,3,8,33,164,985,6894,55153,496376,4963761,54601370,655216441,8517813732,119249392249,1788740883734,28619854139745,486537520375664,8757675366761953,166395831968477106,3327916639369542121,69886249426760384540,1537497487388728459881,35362442209940754577262,848698613038578109854289,21217465325964452746357224,551654098475075771405287825,14894660658827045827942771274,417050498447157283182397595673,12094464454967561212289530274516,362833933649026836368685908235481
mov $3,2
mov $6,$0
lpb $3
mov $0,$6
sub $0,1
mov $1,3
mov $2,1
sub $3,1
mov $5,1
lpb $0
sub $0,1
mov $4,$1
add $1,$5
add $2,1
mul $1,$2
mov $5,$4
lpe
lpe
mov $0,$5
|
programs/oeis/000/A000069.asm
|
jmorken/loda
| 1 |
243900
|
; A000069: Odious numbers: numbers with an odd number of 1's in their binary expansion.
; 1,2,4,7,8,11,13,14,16,19,21,22,25,26,28,31,32,35,37,38,41,42,44,47,49,50,52,55,56,59,61,62,64,67,69,70,73,74,76,79,81,82,84,87,88,91,93,94,97,98,100,103,104,107,109,110,112,115,117,118,121,122,124,127,128,131,133,134,137,138,140,143,145,146,148,151,152,155,157,158,161,162,164,167,168,171,173,174,176,179,181,182,185,186,188,191,193,194,196,199,200,203,205,206,208,211,213,214,217,218,220,223,224,227,229,230,233,234,236,239,241,242,244,247,248,251,253,254,256,259,261,262,265,266,268,271,273,274,276,279,280,283,285,286,289,290,292,295,296,299,301,302,304,307,309,310,313,314,316,319,321,322,324,327,328,331,333,334,336,339,341,342,345,346,348,351,352,355,357,358,361,362,364,367,369,370,372,375,376,379,381,382,385,386,388,391,392,395,397,398,400,403,405,406,409,410,412,415,416,419,421,422,425,426,428,431,433,434,436,439,440,443,445,446,448,451,453,454,457,458,460,463,465,466,468,471,472,475,477,478,481,482,484,487,488,491,493,494,496,499
mov $4,$0
mov $5,$0
lpb $0
sub $0,1
add $2,$4
div $4,2
lpe
add $2,3
mov $1,$2
mod $1,2
mov $3,$5
mul $3,2
add $1,$3
|
data/mapHeaders/UndergroundPathRoute5.asm
|
AmateurPanda92/pokemon-rby-dx
| 9 |
2429
|
UndergroundPathRoute5_h:
db GATE ; tileset
db UNDERGROUND_PATH_ROUTE_5_HEIGHT, UNDERGROUND_PATH_ROUTE_5_WIDTH ; dimensions (y, x)
dw UndergroundPathRoute5_Blocks ; blocks
dw UndergroundPathRoute5_TextPointers ; texts
dw UndergroundPathRoute5_Script ; scripts
db 0 ; connections
dw UndergroundPathRoute5_Object ; objects
|
src/main/antlr/KafkaMigrations.g4
|
purbon/kafka-migration-tool
| 6 |
1607
|
grammar KafkaMigrations;
migration : OP_LITERAL apply_function revert_function;
apply_function : 'def' 'up' code_block SEMICOLON ;
revert_function : 'def' 'down' code_block SEMICOLON ;
code_block
: FUNCTION_OPEN_CODE_BLOCK (method | variable)+ FUNCTION_CLOSE_CODE_BLOCK
;
variable: 'var' ID '=' '"' ID '"' SEMICOLON;
method: ID '(' params_with_comma last_param ')' SEMICOLON ;
params_with_comma: (param ',' )* ;
last_param: param?;
param: '"' ID '"' | ID;
WS: [ \t\n\r]+ -> skip ;
ID : [a-zA-Z0-9]+ ;
ASSIGN: '=' ;
SEMICOLON: ';' ;
SCHEMA_MIGRATION_LITERAL: 'SchemaMigration';
TOPIC_MIGRATION_LITERAL: 'TopicMigration';
ACCESS_MIGRATION_LITERAL: 'AccessMigration';
OP_LITERAL : ( SCHEMA_MIGRATION_LITERAL | TOPIC_MIGRATION_LITERAL | ACCESS_MIGRATION_LITERAL ) SEMICOLON;
FUNCTION_OPEN_CODE_BLOCK: '{';
FUNCTION_CLOSE_CODE_BLOCK: '}';
|
programs/oeis/006/A006513.asm
|
neoneye/loda
| 22 |
177433
|
<reponame>neoneye/loda<gh_stars>10-100
; A006513: Limit of the image of n after 2k iterates of `(3x+1)/2' map as k grows.
; 1,2,2,1,1,1,2,2,2,2,1,2,2,1,1,1,2,1,1,1,1,2,2,1,1,1,1,2,2,2,2,2,1,1,1,2,2,2,2,2,2,2,1,1,1,1,1,2,2,2,2,2,2,2,2,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,1,2,1,2,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,1,2,1,1,1
add $0,1
mov $3,10051
lpb $3
mov $2,-2
bin $2,$0
div $2,2
sub $0,$2
trn $3,3
lpe
mod $0,2
add $0,1
|
support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/g-except.ads
|
orb-zhuchen/Orb
| 0 |
21637
|
------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- G N A T . E X C E P T I O N S --
-- --
-- S p e c --
-- --
-- Copyright (C) 2000-2019, AdaCore --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package provides an interface for raising predefined exceptions
-- with an exception message. It can be used from Pure units.
-- There is no prohibition in Ada that prevents exceptions being raised
-- from within pure units. The raise statement is perfectly acceptable.
-- However, it is not normally possible to raise an exception with a
-- message because the routine Ada.Exceptions.Raise_Exception is not in
-- a Pure unit. This is an annoying and unnecessary restriction and this
-- package allows for raising the standard predefined exceptions at least.
package GNAT.Exceptions is
pragma Pure;
type Exception_Type is limited null record;
-- Type used to specify which exception to raise
-- Really Exception_Type is Exception_Id, but Exception_Id can't be
-- used directly since it is declared in the non-pure unit Ada.Exceptions,
-- Exception_Id is in fact simply a pointer to the type Exception_Data
-- declared in System.Standard_Library (which is also non-pure). So what
-- we do is to define it here as a by reference type (any by reference
-- type would do), and then Import the definitions from Standard_Library.
-- Since this is a by reference type, these will be passed by reference,
-- which has the same effect as passing a pointer.
-- This type is not private because keeping it by reference would require
-- defining it in a way (e.g. using a tagged type) that would drag in other
-- run-time files, which is unwanted in the case of e.g. Ravenscar where we
-- want to minimize the number of run-time files needed by default.
CE : constant Exception_Type; -- Constraint_Error
PE : constant Exception_Type; -- Program_Error
SE : constant Exception_Type; -- Storage_Error
TE : constant Exception_Type; -- Tasking_Error
-- One of these constants is used in the call to specify the exception
procedure Raise_Exception (E : Exception_Type; Message : String);
pragma Import (Ada, Raise_Exception, "__gnat_raise_exception");
pragma No_Return (Raise_Exception);
-- Raise specified exception with specified message
private
pragma Import (C, CE, "constraint_error");
pragma Import (C, PE, "program_error");
pragma Import (C, SE, "storage_error");
pragma Import (C, TE, "tasking_error");
-- References to the exception structures in the standard library
end GNAT.Exceptions;
|
source/asis/spec/ada-strings-wide_wide_unbounded.ads
|
faelys/gela-asis
| 4 |
9244
|
<gh_stars>1-10
------------------------------------------------------------------------------
-- A d a r u n - t i m e s p e c i f i c a t i o n --
-- ASIS implementation for Gela project, a portable Ada compiler --
-- http://gela.ada-ru.org --
-- - - - - - - - - - - - - - - - --
-- Read copyright and license at the end of ada.ads file --
------------------------------------------------------------------------------
-- $Revision: 209 $ $Date: 2013-11-30 21:03:24 +0200 (Сб., 30 нояб. 2013) $
with Ada.Strings.Wide_Wide_Maps;
package Ada.Strings.Wide_Wide_Unbounded is
pragma Preelaborate (Wide_Wide_Unbounded);
type Unbounded_Wide_Wide_String is private;
pragma Preelaborable_Initialization (Unbounded_Wide_Wide_String);
Null_Unbounded_Wide_Wide_String : constant Unbounded_Wide_Wide_String;
function Length (Source : in Unbounded_Wide_Wide_String) return Natural;
type Wide_Wide_String_Access is access all Wide_Wide_String;
procedure Free (X : in out Wide_Wide_String_Access);
-- Conversion, Concatenation, and Selection functions
function To_Unbounded_Wide_Wide_String (Source : in Wide_Wide_String)
return Unbounded_Wide_Wide_String;
function To_Unbounded_Wide_Wide_String (Length : in Natural)
return Unbounded_Wide_Wide_String;
function To_Wide_Wide_String (Source : in Unbounded_Wide_Wide_String)
return Wide_Wide_String;
procedure Set_Unbounded_Wide_Wide_String
(Target : out Unbounded_Wide_Wide_String;
Source : in Wide_Wide_String);
procedure Append (Source : in out Unbounded_Wide_Wide_String;
New_Item : in Unbounded_Wide_Wide_String);
procedure Append (Source : in out Unbounded_Wide_Wide_String;
New_Item : in Wide_Wide_String);
procedure Append (Source : in out Unbounded_Wide_Wide_String;
New_Item : in Wide_Wide_Character);
function "&" (Left, Right : in Unbounded_Wide_Wide_String)
return Unbounded_Wide_Wide_String;
function "&" (Left : in Unbounded_Wide_Wide_String;
Right : in Wide_Wide_String)
return Unbounded_Wide_Wide_String;
function "&" (Left : in Wide_Wide_String;
Right : in Unbounded_Wide_Wide_String)
return Unbounded_Wide_Wide_String;
function "&" (Left : in Unbounded_Wide_Wide_String;
Right : in Wide_Wide_Character)
return Unbounded_Wide_Wide_String;
function "&" (Left : in Wide_Wide_Character;
Right : in Unbounded_Wide_Wide_String)
return Unbounded_Wide_Wide_String;
function Element (Source : in Unbounded_Wide_Wide_String;
Index : in Positive)
return Wide_Wide_Character;
procedure Replace_Element (Source : in out Unbounded_Wide_Wide_String;
Index : in Positive;
By : in Wide_Wide_Character);
function Slice (Source : in Unbounded_Wide_Wide_String;
Low : in Positive;
High : in Natural)
return Wide_Wide_String;
function Unbounded_Slice
(Source : in Unbounded_Wide_Wide_String;
Low : in Positive;
High : in Natural)
return Unbounded_Wide_Wide_String;
procedure Unbounded_Slice
(Source : in Unbounded_Wide_Wide_String;
Target : out Unbounded_Wide_Wide_String;
Low : in Positive;
High : in Natural);
function "=" (Left, Right : in Unbounded_Wide_Wide_String) return Boolean;
function "=" (Left : in Unbounded_Wide_Wide_String;
Right : in Wide_Wide_String)
return Boolean;
function "=" (Left : in Wide_Wide_String;
Right : in Unbounded_Wide_Wide_String)
return Boolean;
function "<" (Left, Right : in Unbounded_Wide_Wide_String) return Boolean;
function "<" (Left : in Unbounded_Wide_Wide_String;
Right : in Wide_Wide_String)
return Boolean;
function "<" (Left : in Wide_Wide_String;
Right : in Unbounded_Wide_Wide_String)
return Boolean;
function "<=" (Left, Right : in Unbounded_Wide_Wide_String) return Boolean;
function "<=" (Left : in Unbounded_Wide_Wide_String;
Right : in Wide_Wide_String)
return Boolean;
function "<=" (Left : in Wide_Wide_String;
Right : in Unbounded_Wide_Wide_String)
return Boolean;
function ">" (Left, Right : in Unbounded_Wide_Wide_String) return Boolean;
function ">" (Left : in Unbounded_Wide_Wide_String;
Right : in Wide_Wide_String)
return Boolean;
function ">" (Left : in Wide_Wide_String;
Right : in Unbounded_Wide_Wide_String)
return Boolean;
function ">=" (Left, Right : in Unbounded_Wide_Wide_String) return Boolean;
function ">=" (Left : in Unbounded_Wide_Wide_String;
Right : in Wide_Wide_String)
return Boolean;
function ">=" (Left : in Wide_Wide_String;
Right : in Unbounded_Wide_Wide_String)
return Boolean;
-- Search subprograms
function Index (Source : in Unbounded_Wide_Wide_String;
Pattern : in Wide_Wide_String;
From : in Positive;
Going : in Direction := Forward;
Mapping : in Wide_Wide_Maps.Wide_Wide_Character_Mapping
:= Wide_Wide_Maps.Identity)
return Natural;
function Index
(Source : in Unbounded_Wide_Wide_String;
Pattern : in Wide_Wide_String;
From : in Positive;
Going : in Direction := Forward;
Mapping : in Wide_Wide_Maps.Wide_Wide_Character_Mapping_Function)
return Natural;
function Index (Source : in Unbounded_Wide_Wide_String;
Pattern : in Wide_Wide_String;
Going : in Direction := Forward;
Mapping : in Wide_Wide_Maps.Wide_Wide_Character_Mapping
:= Wide_Wide_Maps.Identity)
return Natural;
function Index
(Source : in Unbounded_Wide_Wide_String;
Pattern : in Wide_Wide_String;
Going : in Direction := Forward;
Mapping : in Wide_Wide_Maps.Wide_Wide_Character_Mapping_Function)
return Natural;
function Index (Source : in Unbounded_Wide_Wide_String;
Set : in Wide_Wide_Maps.Wide_Wide_Character_Set;
From : in Positive;
Test : in Membership := Inside;
Going : in Direction := Forward)
return Natural;
function Index (Source : in Unbounded_Wide_Wide_String;
Set : in Wide_Wide_Maps.Wide_Wide_Character_Set;
Test : in Membership := Inside;
Going : in Direction := Forward) return Natural;
function Index_Non_Blank (Source : in Unbounded_Wide_Wide_String;
From : in Positive;
Going : in Direction := Forward)
return Natural;
function Index_Non_Blank (Source : in Unbounded_Wide_Wide_String;
Going : in Direction := Forward)
return Natural;
function Count (Source : in Unbounded_Wide_Wide_String;
Pattern : in Wide_Wide_String;
Mapping : in Wide_Wide_Maps.Wide_Wide_Character_Mapping
:= Wide_Wide_Maps.Identity)
return Natural;
function Count
(Source : in Unbounded_Wide_Wide_String;
Pattern : in Wide_Wide_String;
Mapping : in Wide_Wide_Maps.Wide_Wide_Character_Mapping_Function)
return Natural;
function Count (Source : in Unbounded_Wide_Wide_String;
Set : in Wide_Wide_Maps.Wide_Wide_Character_Set)
return Natural;
procedure Find_Token (Source : in Unbounded_Wide_Wide_String;
Set : in Wide_Wide_Maps.Wide_Wide_Character_Set;
Test : in Membership;
First : out Positive;
Last : out Natural);
-- Wide_Wide_String translation subprograms
function Translate
(Source : in Unbounded_Wide_Wide_String;
Mapping : in Wide_Wide_Maps.Wide_Wide_Character_Mapping)
return Unbounded_Wide_Wide_String;
procedure Translate
(Source : in out Unbounded_Wide_Wide_String;
Mapping : in Wide_Wide_Maps.Wide_Wide_Character_Mapping);
function Translate
(Source : in Unbounded_Wide_Wide_String;
Mapping : in Wide_Wide_Maps.Wide_Wide_Character_Mapping_Function)
return Unbounded_Wide_Wide_String;
procedure Translate
(Source : in out Unbounded_Wide_Wide_String;
Mapping : in Wide_Wide_Maps.Wide_Wide_Character_Mapping_Function);
-- Wide_Wide_String transformation subprograms
function Replace_Slice (Source : in Unbounded_Wide_Wide_String;
Low : in Positive;
High : in Natural;
By : in Wide_Wide_String)
return Unbounded_Wide_Wide_String;
procedure Replace_Slice (Source : in out Unbounded_Wide_Wide_String;
Low : in Positive;
High : in Natural;
By : in Wide_Wide_String);
function Insert (Source : in Unbounded_Wide_Wide_String;
Before : in Positive;
New_Item : in Wide_Wide_String)
return Unbounded_Wide_Wide_String;
procedure Insert (Source : in out Unbounded_Wide_Wide_String;
Before : in Positive;
New_Item : in Wide_Wide_String);
function Overwrite (Source : in Unbounded_Wide_Wide_String;
Position : in Positive;
New_Item : in Wide_Wide_String)
return Unbounded_Wide_Wide_String;
procedure Overwrite (Source : in out Unbounded_Wide_Wide_String;
Position : in Positive;
New_Item : in Wide_Wide_String);
function Delete (Source : in Unbounded_Wide_Wide_String;
From : in Positive;
Through : in Natural)
return Unbounded_Wide_Wide_String;
procedure Delete (Source : in out Unbounded_Wide_Wide_String;
From : in Positive;
Through : in Natural);
function Trim (Source : in Unbounded_Wide_Wide_String;
Side : in Trim_End)
return Unbounded_Wide_Wide_String;
procedure Trim (Source : in out Unbounded_Wide_Wide_String;
Side : in Trim_End);
function Trim (Source : in Unbounded_Wide_Wide_String;
Left : in Wide_Wide_Maps.Wide_Wide_Character_Set;
Right : in Wide_Wide_Maps.Wide_Wide_Character_Set)
return Unbounded_Wide_Wide_String;
procedure Trim (Source : in out Unbounded_Wide_Wide_String;
Left : in Wide_Wide_Maps.Wide_Wide_Character_Set;
Right : in Wide_Wide_Maps.Wide_Wide_Character_Set);
function Head (Source : in Unbounded_Wide_Wide_String;
Count : in Natural;
Pad : in Wide_Wide_Character := Wide_Wide_Space)
return Unbounded_Wide_Wide_String;
procedure Head (Source : in out Unbounded_Wide_Wide_String;
Count : in Natural;
Pad : in Wide_Wide_Character := Wide_Wide_Space);
function Tail (Source : in Unbounded_Wide_Wide_String;
Count : in Natural;
Pad : in Wide_Wide_Character := Wide_Wide_Space)
return Unbounded_Wide_Wide_String;
procedure Tail (Source : in out Unbounded_Wide_Wide_String;
Count : in Natural;
Pad : in Wide_Wide_Character := Wide_Wide_Space);
function "*" (Left : in Natural;
Right : in Wide_Wide_Character)
return Unbounded_Wide_Wide_String;
function "*" (Left : in Natural;
Right : in Wide_Wide_String)
return Unbounded_Wide_Wide_String;
function "*" (Left : in Natural;
Right : in Unbounded_Wide_Wide_String)
return Unbounded_Wide_Wide_String;
private
pragma Import (Ada, Unbounded_Wide_Wide_String);
pragma Import (Ada, Null_Unbounded_Wide_Wide_String);
end Ada.Strings.Wide_Wide_Unbounded;
|
dino/lcs/base/6C4.asm
|
zengfr/arcade_game_romhacking_sourcecode_top_secret_data
| 6 |
167837
|
copyright zengfr site:http://github.com/zengfr/romhack
00042A move.l D1, (A0)+
00042C dbra D0, $42a
000AE0 clr.w ($6c4,A5)
000AE4 clr.w ($6c8,A5) [base+6C4]
004D22 move.l D0, (A4)+
004D24 move.l D0, (A4)+
00C5E2 addi.w #$c, ($6c4,A5)
00C5E8 cmpi.w #$130, ($6c4,A5) [base+6C4]
00C5EE bcs $c5f4 [base+6C4]
00C69A addi.w #$c, ($6c4,A5)
00C6A0 cmpi.w #$130, ($6c4,A5) [base+6C4]
00C6A6 bcs $c6d0 [base+6C4]
00CA66 move.w ($6c4,A5), D0
00CA6A move.w D0, D1 [base+6C4]
00CA94 addi.w #$c, ($6c4,A5)
00CA9A move.b #$1, ($4d5,A5) [base+6C4]
00CBC2 move.w ($6c4,A5), D1
00CBC6 addq.w #8, D0 [base+6C4]
00CBF0 addi.w #$c, ($6c4,A5)
00CBF6 cmpi.w #$260, ($6c4,A5) [base+6C4]
00CBFC bcs $cc56 [base+6C4]
00CBFE addi.w #$c, ($6c4,A5)
00CC04 move.l #$90a000, ($a,A6) [base+6C4]
00CC0C move.w ($6c4,A5), D0
00CC10 addi.w #$180, D0 [base+6C4]
00CC58 clr.w ($6c4,A5)
00CC5C clr.w ($6c8,A5) [base+6C4]
00CC6A move.w ($6,A6), ($6c4,A5)
00CC70 move.w #$100, ($6c8,A5) [base+6C4]
00CCCC addi.w #$c, ($6c4,A5)
00CCD2 tst.b ($4d9,A5) [base+6C4]
00CCE2 cmp.w ($6c4,A5), D0
00CCE6 bcc $ccf4 [base+6C4]
00CCE8 clr.w ($6c4,A5)
00CCEC clr.w ($6c8,A5) [base+6C4]
097C38 clr.w ($6c4,A5)
097C3C clr.w ($744,A5)
0AAACA move.l (A0), D2
0AAACC move.w D0, (A0) [123p+11A, 123p+11C, 123p+11E, 123p+120, 123p+122, 123p+124, 123p+126, 123p+128, 123p+12A, base+6FFE, enemy+BC, enemy+C0, enemy+C2, enemy+C4, enemy+CC, enemy+CE, enemy+D0, enemy+D2, enemy+D4, enemy+D6, enemy+D8, enemy+DA, item+86, item+88, item+8A, item+98, item+9A, item+9C, item+9E, item+A0, item+A2, item+A4, item+A6, scr1]
0AAACE move.w D0, ($2,A0)
0AAAD2 cmp.l (A0), D0
0AAAD4 bne $aaafc
0AAAD8 move.l D2, (A0)+
0AAADA cmpa.l A0, A1 [123p+11A, 123p+11C, 123p+11E, 123p+120, 123p+122, 123p+124, 123p+126, 123p+128, 123p+12A, base+6FFE, enemy+BC, enemy+C0, enemy+C2, enemy+C4, enemy+CC, enemy+CE, enemy+D0, enemy+D2, enemy+D4, enemy+D6, enemy+D8, enemy+DA, item+86, item+88, item+8A, item+98, item+9A, item+9C, item+9E, item+A0, item+A2, item+A4, item+A6, scr1]
0AAAE6 move.l (A0), D2
0AAAE8 move.w D0, (A0) [123p+11A, 123p+11C, 123p+11E, 123p+120, 123p+122, 123p+124, 123p+126, 123p+128, 123p+12A, base+6FFE, enemy+BC, enemy+C0, enemy+C2, enemy+C4, enemy+CC, enemy+CE, enemy+D0, enemy+D2, enemy+D4, enemy+D6, enemy+D8, enemy+DA, item+86, item+88, item+8A, item+98, item+9A, item+9C, item+9E, item+A0, item+A2, item+A4, item+A6, scr1]
0AAAF4 move.l D2, (A0)+
0AAAF6 cmpa.l A0, A1 [123p+11A, 123p+11C, 123p+11E, 123p+120, 123p+122, 123p+124, 123p+126, 123p+128, 123p+12A, base+6FFE, enemy+BC, enemy+C0, enemy+C2, enemy+C4, enemy+CC, enemy+CE, enemy+D0, enemy+D2, enemy+D4, enemy+D6, enemy+D8, enemy+DA, item+86, item+88, item+8A, item+98, item+9A, item+9C, item+9E, item+A0, item+A2, item+A4, item+A6, scr1]
copyright zengfr site:http://github.com/zengfr/romhack
|
Subsets and Splits
No community queries yet
The top public SQL queries from the community will appear here once available.