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
|
---|---|---|---|---|
testcase/jump/jtest.asm | dhy2000/CO_Judger | 0 | 15637 | <reponame>dhy2000/CO_Judger
L0: j JB
L1: ori $t0 $0 50
L2: addiu $t1 $t0 100
L3: andi $t2 $t1 200
L4: ori $t3 $t2 300
L5: xori $t4 $t3 400
j END
JB:
j L1
END:
nop
|
programs/oeis/109/A109857.asm | neoneye/loda | 22 | 179710 | <filename>programs/oeis/109/A109857.asm
; A109857: Next 2n-1 odd numbers in decreasing order followed by next 2n even numbers in decreasing order.
; 1,4,2,7,5,3,12,10,8,6,17,15,13,11,9,24,22,20,18,16,14,31,29,27,25,23,21,19,40,38,36,34,32,30,28,26,49,47,45,43,41,39,37,35,33,60,58,56,54,52,50,48,46,44,42,71,69,67,65,63,61,59,57,55,53,51,84,82,80,78,76,74
mov $3,$0
seq $3,2024 ; n appears n times; a(n) = floor(sqrt(2n) + 1/2).
mov $1,$3
mul $1,$3
mul $3,2
mov $2,$3
lpb $0
sub $0,1
trn $2,2
sub $2,2
add $1,$2
lpe
mov $0,$1
|
Third_Year/Compilers/testing/tests-xpl-daily-201701121739/B-23-29-N-ok.asm | danielcorreia96/LEIC_Projects | 0 | 86075 | <reponame>danielcorreia96/LEIC_Projects<filename>Third_Year/Compilers/testing/tests-xpl-daily-201701121739/B-23-29-N-ok.asm
segment .text
align 4
global _main:function
_main:
align 4
xpl:
push ebp
mov ebp, esp
sub esp, 4
push dword 0
lea eax, [ebp+-4]
push eax
pop ecx
pop eax
mov [ecx], eax
push dword 2
pop eax
cmp eax, byte 0
je near _L1
segment .rodata
align 4
_L3:
db "KO", 0
segment .text
push dword $_L3
call prints
add esp, 4
jmp dword _L2
align 4
_L1:
segment .rodata
align 4
_L4:
db "OK", 0
segment .text
push dword $_L4
call prints
add esp, 4
align 4
_L2:
lea eax, [ebp+-4]
push eax
pop eax
push dword [eax]
pop eax
leave
ret
extern argc
extern argv
extern envp
extern readi
extern readd
extern printi
extern prints
extern printd
extern println
|
programs/oeis/175/A175833.asm | karttu/loda | 1 | 12611 | ; A175833: Periodic sequence: repeat 4,7,11.
; 4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11,4,7,11
mod $0,3
mov $1,$0
mul $1,4
trn $1,1
add $1,4
|
source/opm/matreshka-generic_persistence_manager.adb | svn2github/matreshka | 24 | 13446 | <reponame>svn2github/matreshka<gh_stars>10-100
------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Orthogonal Persistence Manager --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright Β© 2009, <NAME> <<EMAIL>> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.Internals.Persistence_Manager;
package body Matreshka.Generic_Persistence_Manager is
------------
-- Create --
------------
function Create (Class_Name : String) return Entity'Class is
Descriptor : Matreshka.Internals.Persistence_Manager.Descriptor_Access
:= Matreshka.Internals.Persistence_Manager.Constructors.Create
(Class_Name);
begin
return Entity'Class (Descriptor.Proxy);
end Create;
------------
-- Delete --
------------
procedure Delete (Object : Entity'Class) is
begin
null;
end Delete;
----------------
-- Identifier --
----------------
function Identifier (Object : Entity'Class) return Positive is
begin
return
Matreshka.Internals.Persistence_Manager.Abstract_Proxy'Class
(Object).Descriptor.Identifier;
end Identifier;
----------
-- Load --
----------
function Load (Identifier : Positive) return Entity'Class is
Descriptor : Matreshka.Internals.Persistence_Manager.Descriptor_Access
:= Matreshka.Internals.Persistence_Manager.Load (Identifier);
begin
return Entity'Class (Descriptor.Proxy);
end Load;
end Matreshka.Generic_Persistence_Manager;
|
programs/oeis/178/A178226.asm | karttu/loda | 0 | 247618 | ; A178226: Characteristic function of A154809 (numbers that are not binary palindromes)
; 0,0,1,0,1,0,1,0,1,0,1,1,1,1,1,0,1,0,1,1,1,0,1,1,1,1,1,0,1,1,1,0,1,0,1,1,1,1,1,1,1,1,1,1,1,0,1,1,1,1,1,0,1,1,1,1,1,1,1,1,1,1,1,0,1,0,1,1,1,1,1,1,1,0,1,1,1,1,1,1,1,1,1,1,1,0,1,1,1,1,1,1,1,0,1,1,1,1,1,0,1,1,1,1,1,1,1,0,1,1,1,1,1,1,1,1,1,1,1,0,1,1,1,1,1,1,1,0,1,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,0,1,1,1,1,1,1,1,1,1,1,1,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,0,1,1,1,1,1,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,0,1,1,1,1,1,1,1,1,1,1,1,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
cal $0,55945 ; n - reversal of base 2 digits of n (and then the result is written in base 10).
mov $1,1
lpb $1,1
mov $1,$0
lpe
|
data/mapObjects/Route1.asm | AmateurPanda92/pokemon-rby-dx | 9 | 160028 | <reponame>AmateurPanda92/pokemon-rby-dx<gh_stars>1-10
Route1_Object:
db $b ; border block
db 0 ; warps
db 1 ; signs
sign 9, 27, 3 ; Route1Text3
db 2 ; objects
object SPRITE_BUG_CATCHER, 5, 24, WALK, 1, 1 ; person
object SPRITE_BUG_CATCHER, 15, 13, WALK, 2, 2 ; person
; warp-to (unused)
warp_to 2, 7, 4
|
Lab2/Lab2 Solution/supporting_files/Solution Programs/fibonacci.asm | Smile040501/Processor_Simulator_for_ToyRISC_ISA | 1 | 8720 | .data
n:
10
.text
main:
load %x0, $n, %x3
addi %x0, 65535, %x4
add %x0, %x0, %x5
add %x0, %x0, %x6
beq %x5, %x3, success
store %x6, 0, %x4
subi %x4, 1, %x4
addi %x5, 1, %x5
addi %x0, 1, %x7
beq %x5, %x3, success
store %x7, 0, %x4
loop:
subi %x4, 1, %x4
addi %x5, 1, %x5
beq %x5, %x3, success
add %x6, %x7, %x8
store %x8, 0, %x4
add %x0, %x7, %x6
add %x0, %x8, %x7
jmp loop
success:
end |
support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/a-tasatt.ads | orb-zhuchen/Orb | 0 | 29075 | <filename>support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/a-tasatt.ads
------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- A D A . T A S K _ A T T R I B U T E S --
-- --
-- S p e c --
-- --
-- Copyright (C) 2014-2019, Free Software Foundation, Inc. --
-- --
-- This specification is derived from the Ada Reference Manual for use with --
-- GNAT. The copyright notice above, and the license provisions that follow --
-- apply solely to the contents of the part following the private keyword. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Ada.Task_Identification;
generic
type Attribute is private;
Initial_Value : Attribute;
package Ada.Task_Attributes is
-- Note that this package will use an efficient implementation with no
-- locks and no extra dynamic memory allocation if Attribute is the size
-- of either Integer or System.Address, and Initial_Value is 0 (null for
-- an access type).
-- Other types and initial values are supported, but will require
-- the use of locking and a level of indirection (meaning extra dynamic
-- memory allocation).
-- The maximum number of task attributes supported by this implementation
-- is determined by the constant System.Parameters.Max_Attribute_Count.
-- If you exceed this number, Storage_Error will be raised during the
-- elaboration of the instantiation of this package.
type Attribute_Handle is access all Attribute;
function Value
(T : Ada.Task_Identification.Task_Id :=
Ada.Task_Identification.Current_Task) return Attribute;
-- Return the value of the corresponding attribute of T. Tasking_Error
-- is raised if T is terminated and Program_Error will be raised if T
-- is Null_Task_Id.
function Reference
(T : Ada.Task_Identification.Task_Id :=
Ada.Task_Identification.Current_Task) return Attribute_Handle;
-- Return an access value that designates the corresponding attribute of
-- T. Tasking_Error is raised if T is terminated and Program_Error will be
-- raised if T is Null_Task_Id.
procedure Set_Value
(Val : Attribute;
T : Ada.Task_Identification.Task_Id :=
Ada.Task_Identification.Current_Task);
-- Finalize the old value of the attribute of T and assign Val to that
-- attribute. Tasking_Error is raised if T is terminated and Program_Error
-- will be raised if T is Null_Task_Id.
procedure Reinitialize
(T : Ada.Task_Identification.Task_Id :=
Ada.Task_Identification.Current_Task);
-- Same as Set_Value (Initial_Value, T). Tasking_Error is raised if T is
-- terminated and Program_Error will be raised if T is Null_Task_Id.
private
pragma Inline (Value);
pragma Inline (Reference);
pragma Inline (Set_Value);
pragma Inline (Reinitialize);
end Ada.Task_Attributes;
|
src/antlr/GroovyParser.g4 | jest/groovy | 0 | 6654 | <reponame>jest/groovy<filename>src/antlr/GroovyParser.g4<gh_stars>0
/*
* This file is adapted from the Antlr4 Java grammar which has the following license
*
* Copyright (c) 2013 <NAME>, <NAME>
* All rights reserved.
* [The "BSD licence"]
*
* http://www.opensource.org/licenses/bsd-license.php
*
* Subsequent modifications by the Groovy community have been done under the Apache License v2:
*
* 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.
*/
/**
* The Groovy grammar is based on the official grammar for Java:
* https://github.com/antlr/grammars-v4/blob/master/java/Java.g4
*/
parser grammar GroovyParser;
options {
tokenVocab = GroovyLexer;
contextSuperClass = GroovyParserRuleContext;
superClass = AbstractParser;
}
@header {
import java.util.Map;
import org.codehaus.groovy.ast.NodeMetaDataHandler;
import org.apache.groovy.parser.antlr4.SemanticPredicates;
}
@members {
public static class GroovyParserRuleContext extends ParserRuleContext implements NodeMetaDataHandler {
private Map metaDataMap = null;
public GroovyParserRuleContext() {}
public GroovyParserRuleContext(ParserRuleContext parent, int invokingStateNumber) {
super(parent, invokingStateNumber);
}
@Override
public Map<?, ?> getMetaDataMap() {
return this.metaDataMap;
}
@Override
public void setMetaDataMap(Map<?, ?> metaDataMap) {
this.metaDataMap = metaDataMap;
}
}
@Override
public int getSyntaxErrorSource() {
return GroovySyntaxError.PARSER;
}
@Override
public int getErrorLine() {
Token token = _input.LT(-1);
if (null == token) {
return -1;
}
return token.getLine();
}
@Override
public int getErrorColumn() {
Token token = _input.LT(-1);
if (null == token) {
return -1;
}
return token.getCharPositionInLine() + 1 + token.getText().length();
}
}
// starting point for parsing a groovy file
compilationUnit
: nls
packageDeclaration? sep? statements? EOF
;
statements
: statement (sep statement)* sep?
;
packageDeclaration
: annotationsOpt PACKAGE qualifiedName
;
importDeclaration
: annotationsOpt IMPORT STATIC? qualifiedName (DOT MUL | AS alias=identifier)?
;
typeDeclaration
: classOrInterfaceModifiersOpt classDeclaration
;
modifier
: classOrInterfaceModifier
| m=( NATIVE
| SYNCHRONIZED
| TRANSIENT
| VOLATILE
| DEF
| VAR
)
;
modifiersOpt
: modifiers?
;
modifiers
: (modifier nls)+
;
classOrInterfaceModifiersOpt
: classOrInterfaceModifiers?
;
classOrInterfaceModifiers
: (classOrInterfaceModifier nls)+
;
classOrInterfaceModifier
: annotation // class or interface
| m=( PUBLIC // class or interface
| PROTECTED // class or interface
| PRIVATE // class or interface
| STATIC // class or interface
| ABSTRACT // class or interface
| FINAL // class only -- does not apply to interfaces
| STRICTFP // class or interface
| DEFAULT // interface only -- does not apply to classes
)
;
variableModifier
: annotation
| m=( FINAL
| DEF
| VAR
// Groovy supports declaring local variables as instance/class fields,
// e.g. import groovy.transform.*; @Field static List awe = [1, 2, 3]
// e.g. import groovy.transform.*; def a = { @Field public List awe = [1, 2, 3] }
// Notice: Groovy 2.4.7 just allows to declare local variables with the following modifiers when using annotations(e.g. @Field)
// TODO check whether the following modifiers accompany annotations or not. Because the legacy codes(e.g. benchmark/bench/heapsort.groovy) allow to declare the special instance/class fields without annotations, we leave it as it is for the time being
| PUBLIC
| PROTECTED
| PRIVATE
| STATIC
| ABSTRACT
| STRICTFP
)
;
variableModifiersOpt
: variableModifiers?
;
variableModifiers
: (variableModifier nls)+
;
typeParameters
: LT nls typeParameter (COMMA nls typeParameter)* nls GT
;
typeParameter
: className (EXTENDS nls typeBound)?
;
typeBound
: type (BITAND nls type)*
;
typeList
: type (COMMA nls type)*
;
/**
* t 0: class; 1: interface; 2: enum; 3: annotation; 4: trait
*/
classDeclaration
locals[ int t ]
: ( CLASS { $t = 0; }
| INTERFACE { $t = 1; }
| ENUM { $t = 2; }
| AT INTERFACE { $t = 3; }
| TRAIT { $t = 4; }
)
identifier nls
(
{ 3 != $t }?
typeParameters? nls
(
{ 2 != $t }?
(EXTENDS nls
(
// Only interface can extend more than one super class
{1 == $t}? scs=typeList
|
sc=type
)
nls)?
|
/* enum should not have type parameters and extends */
)
(
{1 != $t}?
(IMPLEMENTS nls is=typeList nls)?
|
/* interface should not implement other interfaces */
)
|
/* annotation should not have implements and extends*/
)
classBody[$t]
;
// t see the comment of classDeclaration
classBody[int t]
: LBRACE nls
(
/* Only enum can have enum constants */
{ 2 == $t }?
enumConstants? sep?
|
)
classBodyDeclaration[$t]? (sep classBodyDeclaration[$t])* sep? RBRACE
;
enumConstants
: enumConstant (nls COMMA nls enumConstant)* (nls COMMA)?
;
enumConstant
: annotationsOpt identifier arguments? anonymousInnerClassDeclaration[1]?
;
classBodyDeclaration[int t]
: SEMI
| (STATIC nls)? block
| memberDeclaration[$t]
;
memberDeclaration[int t]
: methodDeclaration[0, $t]
| fieldDeclaration
| modifiersOpt classDeclaration
;
/**
* t 0: *class member* all kinds of method declaration AND constructor declaration,
* 1: normal method declaration, 2: abstract method declaration
* 3: normal method declaration OR abstract method declaration
* ct 9: script, other see the comment of classDeclaration
*/
methodDeclaration[int t, int ct]
: { 3 == $ct }?
returnType[$ct] methodName LPAREN rparen (DEFAULT nls elementValue)?
|
modifiersOpt typeParameters? returnType[$ct]?
methodName formalParameters (nls THROWS nls qualifiedClassNameList)?
nls methodBody?
;
methodName
: identifier
| stringLiteral
;
returnType[int ct]
:
standardType
|
// annotation method can not have void return type
{ 3 != $ct }? VOID
;
fieldDeclaration
: variableDeclaration[1]
;
variableDeclarators
: variableDeclarator (COMMA nls variableDeclarator)*
;
variableDeclarator
: variableDeclaratorId (nls ASSIGN nls variableInitializer)?
;
variableDeclaratorId
: identifier
;
variableInitializer
: enhancedStatementExpression
;
variableInitializers
: variableInitializer nls (COMMA nls variableInitializer nls)* nls COMMA?
;
dims
: (annotationsOpt LBRACK RBRACK)+
;
dimsOpt
: dims?
;
standardType
options { baseContext = type; }
: annotationsOpt
(
primitiveType
|
standardClassOrInterfaceType
)
dimsOpt
;
type
: annotationsOpt
(
(
primitiveType
|
// !!! Error Alternative !!!
VOID
)
|
generalClassOrInterfaceType
)
dimsOpt
;
classOrInterfaceType
: ( qualifiedClassName
| qualifiedStandardClassName
) typeArguments?
;
generalClassOrInterfaceType
options { baseContext = classOrInterfaceType; }
: qualifiedClassName typeArguments?
;
standardClassOrInterfaceType
options { baseContext = classOrInterfaceType; }
: qualifiedStandardClassName typeArguments?
;
primitiveType
: BuiltInPrimitiveType
;
typeArguments
: LT nls typeArgument (COMMA nls typeArgument)* nls GT
;
typeArgument
: type
| annotationsOpt QUESTION ((EXTENDS | SUPER) nls type)?
;
annotatedQualifiedClassName
: annotationsOpt qualifiedClassName
;
qualifiedClassNameList
: annotatedQualifiedClassName (COMMA nls annotatedQualifiedClassName)*
;
formalParameters
: LPAREN formalParameterList? rparen
;
formalParameterList
: (formalParameter | thisFormalParameter) (COMMA nls formalParameter)*
;
thisFormalParameter
: type THIS
;
formalParameter
: variableModifiersOpt type? ELLIPSIS? variableDeclaratorId (nls ASSIGN nls expression)?
;
methodBody
: block
;
qualifiedName
: qualifiedNameElement (DOT qualifiedNameElement)*
;
/**
* Java doesn't have the keywords 'as', 'in', 'def', 'trait' so we make some allowances
* for them in package names for better integration with existing Java packages
*/
qualifiedNameElement
: identifier
| DEF
| IN
| AS
| TRAIT
;
qualifiedNameElements
: (qualifiedNameElement DOT)*
;
qualifiedClassName
: qualifiedNameElements identifier
;
qualifiedStandardClassName
: qualifiedNameElements className (DOT className)*
;
literal
: IntegerLiteral #integerLiteralAlt
| FloatingPointLiteral #floatingPointLiteralAlt
| stringLiteral #stringLiteralAlt
| BooleanLiteral #booleanLiteralAlt
| NullLiteral #nullLiteralAlt
;
// GSTRING
gstring
: GStringBegin gstringValue (GStringPart gstringValue)* GStringEnd
;
gstringValue
: gstringPath
| LBRACE statementExpression? RBRACE
| closure
;
gstringPath
: identifier GStringPathPart*
;
// LAMBDA EXPRESSION
lambdaExpression
options { baseContext = standardLambdaExpression; }
: lambdaParameters nls ARROW nls lambdaBody
;
standardLambdaExpression
: standardLambdaParameters nls ARROW nls lambdaBody
;
lambdaParameters
options { baseContext = standardLambdaParameters; }
: formalParameters
// { a -> a * 2 } can be parsed as a lambda expression in a block, but we expect a closure.
// So it is better to put parameters in the parentheses and the following single parameter without parentheses is limited
// | variableDeclaratorId
;
standardLambdaParameters
: formalParameters
| variableDeclaratorId
;
lambdaBody
: block
| statementExpression
;
// CLOSURE
closure
: LBRACE nls (formalParameterList? nls ARROW nls)? blockStatementsOpt RBRACE
;
blockStatementsOpt
: blockStatements?
;
blockStatements
: blockStatement (sep blockStatement)* sep?
;
// ANNOTATIONS
annotationsOpt
: (annotation nls)*
;
annotation
: AT annotationName ( LPAREN elementValues? rparen )?
;
elementValues
: elementValuePairs
| elementValue
;
annotationName : qualifiedClassName ;
elementValuePairs
: elementValuePair (COMMA elementValuePair)*
;
elementValuePair
: elementValuePairName nls ASSIGN nls elementValue
;
elementValuePairName
: identifier
| keywords
;
// TODO verify the potential performance issue because rule expression contains sub-rule assignments(https://github.com/antlr/grammars-v4/issues/215)
elementValue
: elementValueArrayInitializer
| annotation
| expression
;
elementValueArrayInitializer
: LBRACK (elementValue (COMMA elementValue)*)? (COMMA)? RBRACK
;
// STATEMENTS / BLOCKS
block
: LBRACE (nls | sep*) blockStatementsOpt RBRACE
;
blockStatement
: localVariableDeclaration
| statement
;
localVariableDeclaration
: { !SemanticPredicates.isInvalidLocalVariableDeclaration(_input) }?
variableDeclaration[0]
;
classifiedModifiers[int t]
: { 0 == $t }? variableModifiers
| { 1 == $t }? modifiers
;
/**
* t 0: local variable declaration; 1: field declaration
*/
variableDeclaration[int t]
@leftfactor { classifiedModifiers }
: classifiedModifiers[$t]
( type? variableDeclarators
| typeNamePairs nls ASSIGN nls variableInitializer
)
|
classifiedModifiers[$t]?
type variableDeclarators
;
typeNamePairs
: LPAREN typeNamePair (COMMA typeNamePair)* rparen
;
typeNamePair
: type? variableDeclaratorId
;
variableNames
: LPAREN variableDeclaratorId (COMMA variableDeclaratorId)+ rparen
;
conditionalStatement
: ifElseStatement
| switchStatement
;
ifElseStatement
: IF expressionInPar nls tb=statement ((nls | sep) ELSE nls fb=statement)?
;
switchStatement
: SWITCH expressionInPar nls LBRACE nls switchBlockStatementGroup* nls RBRACE
;
loopStatement
: FOR LPAREN forControl rparen nls statement #forStmtAlt
| WHILE expressionInPar nls statement #whileStmtAlt
| DO nls statement nls WHILE expressionInPar #doWhileStmtAlt
;
continueStatement
: CONTINUE
identifier?
;
breakStatement
: BREAK
identifier?
;
tryCatchStatement
: TRY resources? nls block
(nls catchClause)*
(nls finallyBlock)?
;
assertStatement
: ASSERT ce=expression (nls (COLON | COMMA) nls me=expression)?
;
statement
: block #blockStmtAlt
| conditionalStatement #conditionalStmtAlt
| loopStatement #loopStmtAlt
| tryCatchStatement #tryCatchStmtAlt
| SYNCHRONIZED expressionInPar nls block #synchronizedStmtAlt
| RETURN expression? #returnStmtAlt
| THROW expression #throwStmtAlt
| breakStatement #breakStmtAlt
| continueStatement #continueStmtAlt
| identifier COLON nls statement #labeledStmtAlt
// Import statement. Can be used in any scope. Has "import x as y" also.
| importDeclaration #importStmtAlt
| assertStatement #assertStmtAlt
| typeDeclaration #typeDeclarationStmtAlt
| localVariableDeclaration #localVariableDeclarationStmtAlt
// validate the method in the AstBuilder#visitMethodDeclaration, e.g. method without method body is not allowed
| { !SemanticPredicates.isInvalidMethodDeclaration(_input) }?
methodDeclaration[3, 9] #methodDeclarationStmtAlt
| statementExpression #expressionStmtAlt
| SEMI #emptyStmtAlt
;
catchClause
: CATCH LPAREN variableModifiersOpt catchType? identifier rparen nls block
;
catchType
: qualifiedClassName (BITOR qualifiedClassName)*
;
finallyBlock
: FINALLY nls block
;
resources
: LPAREN nls resourceList sep? rparen
;
resourceList
: resource (sep resource)*
;
resource
: localVariableDeclaration
| expression
;
/** Matches cases then statements, both of which are mandatory.
* To handle empty cases at the end, we add switchLabel* to statement.
*/
switchBlockStatementGroup
: (switchLabel nls)+ blockStatements
;
switchLabel
: CASE expression COLON
| DEFAULT COLON
;
forControl
: enhancedForControl
| classicalForControl
;
enhancedForControl
: variableModifiersOpt type? variableDeclaratorId (COLON | IN) expression
;
classicalForControl
: forInit? SEMI expression? SEMI forUpdate?
;
forInit
: localVariableDeclaration
| expressionList[false]
;
forUpdate
: expressionList[false]
;
// EXPRESSIONS
castParExpression
: LPAREN type rparen
;
parExpression
: expressionInPar
;
expressionInPar
: LPAREN enhancedStatementExpression rparen
;
expressionList[boolean canSpread]
: expressionListElement[$canSpread] (COMMA expressionListElement[$canSpread])*
;
expressionListElement[boolean canSpread]
: ( MUL { require($canSpread, "spread operator is not allowed here", -1); }
|
) expression
;
enhancedStatementExpression
: statementExpression
| standardLambdaExpression
;
/**
* In order to resolve the syntactic ambiguities, e.g. (String)'abc' can be parsed as a cast expression or a parentheses-less method call(method name: (String), arguments: 'abc')
* try to match expression first.
* If it is not a normal expression, then try to match the command expression
*/
statementExpression
: expression #normalExprAlt
| commandExpression #commandExprAlt
;
postfixExpression
: pathExpression op=(INC | DEC)?
;
expression
// qualified names, array expressions, method invocation, post inc/dec, type casting (level 1)
// The cast expression must be put before pathExpression to resovle the ambiguities between type casting and call on parentheses expression, e.g. (int)(1 / 2)
: castParExpression expression #castExprAlt
| postfixExpression #postfixExprAlt
// ~(BNOT)/!(LNOT) (level 1)
| (BITNOT | NOT) nls expression #unaryNotExprAlt
// math power operator (**) (level 2)
| left=expression op=POWER nls right=expression #powerExprAlt
// ++(prefix)/--(prefix)/+(unary)/-(unary) (level 3)
| op=(INC | DEC | ADD | SUB) expression #unaryAddExprAlt
// multiplication/division/modulo (level 4)
| left=expression nls op=(MUL | DIV | MOD) nls right=expression #multiplicativeExprAlt
// binary addition/subtraction (level 5)
| left=expression op=(ADD | SUB) nls right=expression #additiveExprAlt
// bit shift expressions (level 6)
| left=expression nls
( ( dlOp=LT LT
| tgOp=GT GT GT
| dgOp=GT GT
)
| rangeOp=( RANGE_INCLUSIVE
| RANGE_EXCLUSIVE
)
) nls
right=expression #shiftExprAlt
// boolean relational expressions (level 7)
| left=expression nls op=(AS | INSTANCEOF | NOT_INSTANCEOF) nls type #relationalExprAlt
| left=expression nls op=(LE | GE | GT | LT | IN | NOT_IN) nls right=expression #relationalExprAlt
// equality/inequality (==/!=) (level 8)
| left=expression nls
op=( IDENTICAL
| NOT_IDENTICAL
| EQUAL
| NOTEQUAL
| SPACESHIP
) nls
right=expression #equalityExprAlt
// regex find and match (=~ and ==~) (level 8.5)
// jez: moved =~ closer to precedence of == etc, as...
// 'if (foo =~ "a.c")' is very close in intent to 'if (foo == "abc")'
| left=expression nls op=(REGEX_FIND | REGEX_MATCH) nls right=expression #regexExprAlt
// bitwise or non-short-circuiting and (&) (level 9)
| left=expression nls op=BITAND nls right=expression #andExprAlt
// exclusive or (^) (level 10)
| left=expression nls op=XOR nls right=expression #exclusiveOrExprAlt
// bitwise or non-short-circuiting or (|) (level 11)
| left=expression nls op=BITOR nls right=expression #inclusiveOrExprAlt
// logical and (&&) (level 12)
| left=expression nls op=AND nls right=expression #logicalAndExprAlt
// logical or (||) (level 13)
| left=expression nls op=OR nls right=expression #logicalOrExprAlt
// conditional test (level 14)
| <assoc=right> con=expression nls
( QUESTION nls tb=expression nls COLON nls
| ELVIS nls
)
fb=expression #conditionalExprAlt
// assignment expression (level 15)
// "(a) = [1]" is a special case of multipleAssignmentExprAlt, it will be handle by assignmentExprAlt
| <assoc=right> left=variableNames nls op=ASSIGN nls right=statementExpression #multipleAssignmentExprAlt
| <assoc=right> left=expression nls
op=( ASSIGN
| ADD_ASSIGN
| SUB_ASSIGN
| MUL_ASSIGN
| DIV_ASSIGN
| AND_ASSIGN
| OR_ASSIGN
| XOR_ASSIGN
| RSHIFT_ASSIGN
| URSHIFT_ASSIGN
| LSHIFT_ASSIGN
| MOD_ASSIGN
| POWER_ASSIGN
| ELVIS_ASSIGN
) nls
enhancedStatementExpression #assignmentExprAlt
;
/*
enhancedExpression
: expression
| standardLambdaExpression
;
*/
commandExpression
: pathExpression
(
{ SemanticPredicates.isFollowingMethodName($pathExpression.t) }?
argumentList
|
/* if pathExpression is a method call, no need to have any more arguments */
)
commandArgument*
;
commandArgument
: primary
// what follows is either a normal argument, parens,
// an appended block, an index operation, or nothing
// parens (a b already processed):
// a b c() d e -> a(b).c().d(e)
// a b c()() d e -> a(b).c().call().d(e)
// index (a b already processed):
// a b c[x] d e -> a(b).c[x].d(e)
// a b c[x][y] d e -> a(b).c[x][y].d(e)
// block (a b already processed):
// a b c {x} d e -> a(b).c({x}).d(e)
//
// parens/block completes method call
// index makes method call to property get with index
//
( pathElement+
| argumentList
)?
;
/**
* A "path expression" is a name or other primary, possibly qualified by various
* forms of dot, and/or followed by various kinds of brackets.
* It can be used for value or assigned to, or else further qualified, indexed, or called.
* It is called a "path" because it looks like a linear path through a data structure.
* Examples: x.y, x?.y, x*.y, x.@y; x[], x[y], x[y,z]; x(), x(y), x(y,z); x{s}; a.b[n].c(x).d{s}
* (Compare to a C lvalue, or LeftHandSide in the JLS section 15.26.)
* General expressions are built up from path expressions, using operators like '+' and '='.
*
* t 0: primary, 1: namePart, 2: arguments, 3: closure, 4: indexPropertyArgs, 5: namedPropertyArgs, 6: non-static inner class creator
*/
pathExpression returns [int t]
: primary (pathElement { $t = $pathElement.t; })*
;
pathElement returns [int t]
: nls
// AT: foo.@bar selects the field (or attribute), not property
(
( DOT // The all-powerful dot.
| SPREAD_DOT // Spread operator: x*.y === x?.collect{it.y}
| SAFE_DOT // Optional-null operator: x?.y === (x==null)?null:x.y
| SAFE_CHAIN_DOT // Optional-null chain operator: x??.y.z === x?.y?.z
) nls (AT | nonWildcardTypeArguments)?
|
METHOD_POINTER nls // Method pointer operator: foo.&y == foo.metaClass.getMethodPointer(foo, "y")
|
METHOD_REFERENCE nls // Method reference: System.out::println
)
namePart
{ $t = 1; }
|
nls DOT nls NEW creator[1]
{ $t = 6; }
| arguments
{ $t = 2; }
// Can always append a block, as foo{bar}
| nls closure
{ $t = 3; }
// Element selection is always an option, too.
// In Groovy, the stuff between brackets is a general argument list,
// since the bracket operator is transformed into a method call.
| indexPropertyArgs
{ $t = 4; }
| namedPropertyArgs
{ $t = 5; }
;
/**
* This is the grammar for what can follow a dot: x.a, x.@a, x.&a, x.'a', etc.
*/
namePart
:
( identifier
// foo.'bar' is in all ways same as foo.bar, except that bar can have an arbitrary spelling
| stringLiteral
| dynamicMemberName
/* just a PROPOSAL, which has not been implemented yet!
// PROPOSAL, DECIDE: Is this inline form of the 'with' statement useful?
// Definition: a.{foo} === {with(a) {foo}}
// May cover some path expression use-cases previously handled by dynamic scoping (closure delegates).
| block
*/
// let's allow common keywords as property names
| keywords
)
;
/**
* If a dot is followed by a parenthesized or quoted expression, the member is computed dynamically,
* and the member selection is done only at runtime. This forces a statically unchecked member access.
*/
dynamicMemberName
: parExpression
| gstring
;
/** An expression may be followed by [...].
* Unlike Java, these brackets may contain a general argument list,
* which is passed to the array element operator, which can make of it what it wants.
* The brackets may also be empty, as in T[]. This is how Groovy names array types.
*/
indexPropertyArgs
: QUESTION? LBRACK expressionList[true]? RBRACK
;
namedPropertyArgs
: LBRACK (mapEntryList | COLON) RBRACK
;
primary
:
// Append `typeArguments?` to `identifier` to support constructor reference with generics, e.g. HashMap<String, Integer>::new
// Though this is not a graceful solution, it is much faster than replacing `builtInType` with `type`
identifier typeArguments? #identifierPrmrAlt
| literal #literalPrmrAlt
| gstring #gstringPrmrAlt
| NEW nls creator[0] #newPrmrAlt
| THIS #thisPrmrAlt
| SUPER #superPrmrAlt
| parExpression #parenPrmrAlt
| closure #closurePrmrAlt
| lambdaExpression #lambdaPrmrAlt
| list #listPrmrAlt
| map #mapPrmrAlt
| builtInType #builtInTypePrmrAlt
;
list
: LBRACK expressionList[true]? COMMA? RBRACK
;
map
: LBRACK
( mapEntryList COMMA?
| COLON
)
RBRACK
;
mapEntryList
: mapEntry (COMMA mapEntry)*
;
mapEntry
: mapEntryLabel COLON nls expression
| MUL COLON nls expression
;
mapEntryLabel
: keywords
| primary
;
/**
* t 0: general creation; 1: non-static inner class creation
*/
creator[int t]
: createdName
( {0 == $t || 1 == $t}? nls arguments anonymousInnerClassDeclaration[0]?
| {0 == $t}? (annotationsOpt LBRACK expression RBRACK)+ dimsOpt
| {0 == $t}? dims nls arrayInitializer
)
;
arrayInitializer
: LBRACE nls variableInitializers? nls RBRACE
;
/**
* t 0: anonymous inner class; 1: anonymous enum
*/
anonymousInnerClassDeclaration[int t]
: classBody[0]
;
createdName
: annotationsOpt
( primitiveType
| qualifiedClassName typeArgumentsOrDiamond?
)
;
nonWildcardTypeArguments
: LT nls typeList nls GT
;
typeArgumentsOrDiamond
: LT GT
| typeArguments
;
arguments
: LPAREN enhancedArgumentList? COMMA? rparen
;
argumentList
options { baseContext = enhancedArgumentList; }
: argumentListElement
( COMMA nls
argumentListElement
)*
;
enhancedArgumentList
: enhancedArgumentListElement
( COMMA nls
enhancedArgumentListElement
)*
;
argumentListElement
options { baseContext = enhancedArgumentListElement; }
: expressionListElement[true]
| mapEntry
;
enhancedArgumentListElement
: expressionListElement[true]
| standardLambdaExpression
| mapEntry
;
stringLiteral
: StringLiteral
;
className
: CapitalizedIdentifier
;
identifier
: Identifier
| CapitalizedIdentifier
| VAR
|
// if 'static' followed by DOT, we can treat them as identifiers, e.g. static.unused = { -> }
{ DOT == _input.LT(2).getType() }?
STATIC
| IN
// | DEF
| TRAIT
| AS
;
builtInType
: BuiltInPrimitiveType
| VOID
;
keywords
: ABSTRACT
| AS
| ASSERT
| BREAK
| CASE
| CATCH
| CLASS
| CONST
| CONTINUE
| DEF
| DEFAULT
| DO
| ELSE
| ENUM
| EXTENDS
| FINAL
| FINALLY
| FOR
| GOTO
| IF
| IMPLEMENTS
| IMPORT
| IN
| INSTANCEOF
| INTERFACE
| NATIVE
| NEW
| PACKAGE
| RETURN
| STATIC
| STRICTFP
| SUPER
| SWITCH
| SYNCHRONIZED
| THIS
| THROW
| THROWS
| TRANSIENT
| TRAIT
| THREADSAFE
| TRY
| VAR
| VOLATILE
| WHILE
| NullLiteral
| BooleanLiteral
| BuiltInPrimitiveType
| VOID
| PUBLIC
| PROTECTED
| PRIVATE
;
rparen
: RPAREN
|
// !!!Error Alternative, impact the performance of parsing
{ require(false, "Missing ')'"); }
;
nls
: NL*
;
sep : (NL | SEMI)+
;
|
thrift-translator/src/main/resources/Thrift.g4 | rolandhe/thrift-enhancer | 18 | 2428 | grammar Thrift;
document: header* definition*;
header:
include
| cppinclude
| namespace
;
include: 'include' LITERAL ;
cppinclude: 'cpp_include' LITERAL ;
namespace: 'namespace' namespacescope ID
| 'smalltalk.category' SID
| 'smalltalk.prefix' ID
| 'php_namespace' LITERAL
| 'xsd_namespace' LITERAL
;
namespacescope: '*'
| 'cpp'
| 'java'
| 'py'
| 'perl'
| 'rb'
| 'cocoa'
| 'csharp'
;
definition: constdef
| typedef
| tenum
| senum
| struct
| union
| exception
| service
;
constdef: 'const' fieldtype ID '=' constvalue listseparator? ;
typedef: 'typedef' definitiontype ID ;
tenum: 'enum' ID '{' tenumfield* '}' ;
tenumfield: ID ('=' intconst)? listseparator? ;
senum: 'senum' ID '{' senumfield* '}' ;
senumfield: LITERAL listseparator? ;
struct: 'struct' ID 'xsd_all'? '{' field* '}' ;
union: 'union' ID 'xsd_all'? '{' field* '}' ;
exception: 'exception' ID '{' field* '}' ;
service: 'service' ID serviceparent '{' function* '}' ;
serviceparent: ('extends' ID)? ;
field: fieldid fieldreq? fieldtype ID ('=' constvalue)? xsdfieldoptions listseparator? ;
fieldid: intconst ':' ;
fieldreq: 'required'
| 'optional'
;
xsdfieldoptions: 'xsd_optional'? 'xsd_nillable'? xsdattrs? ;
xsdattrs: 'xsd_attrs' '{' field* '}' ;
function: 'oneway'? functiontype ID '(' field* ')' throwstat? listseparator? ;
functiontype: fieldtype | 'void' ;
throwstat: 'throws' '(' field* ')' ;
fieldtype:
basetype
| containertype
| ID
;
definitiontype: basetype
| containertype
;
basetype: 'bool'
| 'byte'
| 'i8'
| 'i16'
| 'i32'
| 'i64'
| 'double'
| 'string'
| 'binary'
| 'slist'
;
containertype: maptype
| settype
| listtype
;
maptype: 'map' cpptype? '<' fieldtype ',' fieldtype '>' ;
settype: 'set' cpptype? '<' fieldtype '>' ;
listtype: 'list' '<' fieldtype '>' cpptype? ;
cpptype: 'cpp_type' LITERAL ;
constvalue: oneconst
| constlist
;
intconst: ('+'|'-')? DIGIT+ ;
doubleconst: ('+'|'-')? DIGIT* ('.' DIGIT+)? (ES intconst)? ;
constlist:
'[' oneconst (listseparator oneconst)* ']'
|'[' constlist (listseparator constlist)* ']'
;
constmap: '{' (constvalue ':' constvalue listseparator?)* '}' ;
oneconst: intconst
|doubleconst
|LITERAL
|ID
|constmap
;
ID: (LETTER|'_') (LETTER|DIGIT|'.'|'_')* ;
SID: (LETTER|'_') (LETTER |LETTER|'.'|'_'|'-')* ;
listseparator: ',' | ';' ;
DIGIT: [0-9] ;
LETTER: [A-Za-z] ;
ES: [eE] ;
LITERAL: '"' ~["']* '"' ;
WS: [ \t\r\n]+->skip ;
LINE_COMMENT: ('//'|'#') .*? '\n' -> skip ;
COMMENT: '/*' .*? '*/' -> skip ;
|
oeis/141/A141035.asm | neoneye/loda-programs | 11 | 102155 | ; A141035: Period 10: repeat 0, 0, 4, 2, -2, 4, 2, -4, -4, -2.
; Submitted by <NAME>
; 0,0,4,2,-2,4,2,-4,-4,-2,0,0,4,2,-2,4,2,-4,-4,-2,0,0,4,2,-2,4,2,-4,-4,-2,0,0,4,2,-2,4,2,-4,-4,-2,0,0,4,2,-2,4,2,-4,-4,-2,0,0,4,2,-2,4,2,-4,-4,-2,0,0,4,2,-2,4,2,-4,-4,-2,0,0,4,2,-2,4,2,-4,-4,-2,0,0,4,2,-2,4,2,-4,-4,-2,0,0,4,2,-2,4,2
add $0,1
dif $0,2
add $0,1
mod $0,5
sub $0,2
mul $0,2
|
src/ctxt-types.agda | CarlOlson/cedille | 0 | 11760 | module ctxt-types where
open import lib
open import cedille-types
open import general-util
open import syntax-util
location : Set
location = string Γ posinfo -- file path and starting position in the file
-- file path and starting / ending position in file
span-location = string Γ posinfo Γ posinfo
-- missing locations
missing-location : location
missing-location = ("missing" , "missing")
missing-span-location : span-location
missing-span-location = ("missing" , "missing" , "missing")
{- we will generally keep classifiers of variables in hnf in the ctxt, although
we will not necessarily unfold recursive type definitions. -}
defScope : Set
defScope = πΉ
pattern localScope = tt
pattern globalScope = ff
pattern concrete-datatype = globalScope
pattern abstract-datatype = localScope
defParams : Set
defParams = maybe params
data ctxt-info : Set where
-- for defining a datatype
-- datatype-def : defParams β (ind reg : kind) β ctrs β ctxt-info
-- for defining a datatype constructor
ctr-def : params β type β (ctrs-length ctr-index ctr-unerased-arrows : β) β ctxt-info
-- for declaring the type that proves a type is a datatype (X/Mu)
-- mu-def : defParams β var β kind β ctxt-info
-- for declaring a variable to have a given type (with no definition)
term-decl : type β ctxt-info
-- for defining a variable to equal a term with a given type
-- maybe term, because datatype X/Mu and X/mu have params, etc... but no def
term-def : defParams β opacity β maybe term β type β ctxt-info
-- for untyped term definitions
term-udef : defParams β opacity β term β ctxt-info
-- for declaring a variable to have a given kind (with no definition)
type-decl : kind β ctxt-info
-- for defining a variable to equal a type with a given kind
type-def : defParams β opacity β maybe type β kind β ctxt-info
-- for defining a variable to equal a kind
kind-def : params β kind β ctxt-info
-- to rename a variable at any level to another
rename-def : var β ctxt-info
-- representing a declaration of a variable with no other information about it
var-decl : ctxt-info
sym-info : Set
sym-info = ctxt-info Γ location
-- module filename, name, parameters, and qualifying substitution
mod-info : Set
mod-info = string Γ string Γ params Γ qualif
is-term-level : ctxt-info β πΉ
is-term-level (term-decl _) = tt
is-term-level (term-def _ _ _ _) = tt
is-term-level (term-udef _ _ _) = tt
is-term-level (ctr-def _ _ _ _ _ ) = tt
is-term-level _ = ff
data ctxt : Set where
mk-ctxt : (mod : mod-info) β -- current module
(syms : trie (string Γ π string) Γ trie string Γ trie params Γ trie β Γ Ξ£ β (π string)) β -- map each filename to its module name and the symbols declared in that file, map each module name to its filename and params, and file ID's for use in to-string.agda
(i : trie sym-info) β -- map symbols (from Cedille files) to their ctxt-info and location
(sym-occurrences : trie (π (var Γ posinfo Γ string))) β -- map symbols to a list of definitions they occur in (and relevant file info)
(Ξ : trie (params Γ kind Γ kind Γ ctrs) Γ trie (var Γ var Γ args) Γ trie var) β -- datatype info: (concrete/global datatypes Γ abstract/local datatypes Γ datatype/Mu map)
ctxt
ctxt-binds-var : ctxt β var β πΉ
ctxt-binds-var (mk-ctxt (_ , _ , _ , q) _ i _ _) x = trie-contains q x || trie-contains i x
ctxt-var-decl : var β ctxt β ctxt
ctxt-var-decl v (mk-ctxt (fn , mn , ps , q) syms i symb-occs Ξ) =
mk-ctxt (fn , mn , ps , (trie-insert q v (v , []))) syms (trie-insert i v (var-decl , "missing" , "missing")) symb-occs Ξ
ctxt-var-decl-loc : posinfo β var β ctxt β ctxt
ctxt-var-decl-loc pi v (mk-ctxt (fn , mn , ps , q) syms i symb-occs Ξ) =
mk-ctxt (fn , mn , ps , (trie-insert q v (v , []))) syms (trie-insert i v (var-decl , fn , pi)) symb-occs Ξ
qualif-var : ctxt β var β var
qualif-var (mk-ctxt (_ , _ , _ , q) _ _ _ _) v with trie-lookup q v
...| just (v' , _) = v'
...| nothing = v
start-modname : start β string
start-modname (File _ _ _ mn _ _ _) = mn
ctxt-get-current-filename : ctxt β string
ctxt-get-current-filename (mk-ctxt (fn , _) _ _ _ _) = fn
ctxt-get-current-mod : ctxt β mod-info
ctxt-get-current-mod (mk-ctxt m _ _ _ _) = m
ctxt-get-current-modname : ctxt β string
ctxt-get-current-modname (mk-ctxt (_ , mn , _ , _) _ _ _ _) = mn
ctxt-get-current-params : ctxt β params
ctxt-get-current-params (mk-ctxt (_ , _ , ps , _) _ _ _ _) = ps
ctxt-get-symbol-occurrences : ctxt β trie (π (var Γ posinfo Γ string))
ctxt-get-symbol-occurrences (mk-ctxt _ _ _ symb-occs _) = symb-occs
ctxt-set-symbol-occurrences : ctxt β trie (π (var Γ posinfo Γ string)) β ctxt
ctxt-set-symbol-occurrences (mk-ctxt fn syms i symb-occs Ξ) new-symb-occs = mk-ctxt fn syms i new-symb-occs Ξ
|
Transynther/x86/_processed/NONE/_xt_/i9-9900K_12_0xca_notsx.log_21829_1162.asm | ljhsiun2/medusa | 9 | 19877 | <filename>Transynther/x86/_processed/NONE/_xt_/i9-9900K_12_0xca_notsx.log_21829_1162.asm
.global s_prepare_buffers
s_prepare_buffers:
push %r10
push %r13
push %r14
push %rbx
push %rcx
push %rdi
push %rdx
push %rsi
lea addresses_normal_ht+0x14aad, %r14
nop
sub $44837, %rbx
movw $0x6162, (%r14)
nop
nop
nop
cmp $36478, %rdx
lea addresses_UC_ht+0x4ffd, %rcx
nop
nop
xor %r14, %r14
vmovups (%rcx), %ymm4
vextracti128 $0, %ymm4, %xmm4
vpextrq $1, %xmm4, %rsi
nop
nop
sub %rcx, %rcx
lea addresses_A_ht+0x154fd, %rsi
lea addresses_normal_ht+0x1db77, %rdi
inc %r13
mov $26, %rcx
rep movsq
dec %rdx
lea addresses_normal_ht+0x30fd, %r13
nop
nop
nop
xor %rcx, %rcx
mov (%r13), %rbx
nop
nop
dec %rdx
lea addresses_WC_ht+0x1ccbd, %rdx
nop
nop
nop
and %rbx, %rbx
movups (%rdx), %xmm5
vpextrq $1, %xmm5, %r10
nop
nop
nop
add $16401, %r10
lea addresses_UC_ht+0x89fd, %r14
nop
nop
sub $25248, %r13
mov (%r14), %ecx
nop
nop
nop
nop
nop
inc %rsi
pop %rsi
pop %rdx
pop %rdi
pop %rcx
pop %rbx
pop %r14
pop %r13
pop %r10
ret
.global s_faulty_load
s_faulty_load:
push %r10
push %r11
push %r13
push %r14
push %r9
push %rcx
push %rdi
push %rsi
// Store
lea addresses_UC+0xd495, %r13
nop
nop
nop
cmp %r10, %r10
mov $0x5152535455565758, %r14
movq %r14, %xmm7
movups %xmm7, (%r13)
cmp %r14, %r14
// REPMOV
lea addresses_normal+0x50fd, %rsi
lea addresses_A+0x1aafd, %rdi
nop
nop
nop
nop
nop
dec %r13
mov $58, %rcx
rep movsw
nop
nop
nop
nop
nop
and %r11, %r11
// Store
lea addresses_WT+0x14ccd, %r10
nop
nop
nop
nop
xor $47634, %r11
movl $0x51525354, (%r10)
nop
nop
add %r11, %r11
// Load
lea addresses_WT+0x17bd, %r11
xor $57147, %r13
movups (%r11), %xmm5
vpextrq $0, %xmm5, %rcx
nop
nop
nop
nop
add $58377, %r9
// Store
lea addresses_UC+0x89fd, %r14
nop
nop
and $49838, %rdi
movl $0x51525354, (%r14)
nop
inc %r9
// Store
lea addresses_UC+0x3b5, %rdi
nop
nop
nop
and %rsi, %rsi
movb $0x51, (%rdi)
nop
nop
nop
nop
nop
inc %r11
// Faulty Load
lea addresses_PSE+0x129fd, %r14
nop
nop
nop
nop
inc %r9
vmovups (%r14), %ymm4
vextracti128 $1, %ymm4, %xmm4
vpextrq $0, %xmm4, %r10
lea oracles, %rdi
and $0xff, %r10
shlq $12, %r10
mov (%rdi,%r10,1), %r10
pop %rsi
pop %rdi
pop %rcx
pop %r9
pop %r14
pop %r13
pop %r11
pop %r10
ret
/*
<gen_faulty_load>
[REF]
{'OP': 'LOAD', 'src': {'same': False, 'type': 'addresses_PSE', 'NT': False, 'AVXalign': False, 'size': 4, 'congruent': 0}}
{'OP': 'STOR', 'dst': {'same': False, 'type': 'addresses_UC', 'NT': False, 'AVXalign': False, 'size': 16, 'congruent': 1}}
{'OP': 'REPM', 'src': {'same': False, 'congruent': 8, 'type': 'addresses_normal'}, 'dst': {'same': False, 'congruent': 8, 'type': 'addresses_A'}}
{'OP': 'STOR', 'dst': {'same': False, 'type': 'addresses_WT', 'NT': False, 'AVXalign': False, 'size': 4, 'congruent': 4}}
{'OP': 'LOAD', 'src': {'same': False, 'type': 'addresses_WT', 'NT': False, 'AVXalign': False, 'size': 16, 'congruent': 6}}
{'OP': 'STOR', 'dst': {'same': False, 'type': 'addresses_UC', 'NT': False, 'AVXalign': False, 'size': 4, 'congruent': 11}}
{'OP': 'STOR', 'dst': {'same': False, 'type': 'addresses_UC', 'NT': False, 'AVXalign': False, 'size': 1, 'congruent': 3}}
[Faulty Load]
{'OP': 'LOAD', 'src': {'same': True, 'type': 'addresses_PSE', 'NT': False, 'AVXalign': False, 'size': 32, 'congruent': 0}}
<gen_prepare_buffer>
{'OP': 'STOR', 'dst': {'same': False, 'type': 'addresses_normal_ht', 'NT': True, 'AVXalign': False, 'size': 2, 'congruent': 3}}
{'OP': 'LOAD', 'src': {'same': False, 'type': 'addresses_UC_ht', 'NT': False, 'AVXalign': False, 'size': 32, 'congruent': 8}}
{'OP': 'REPM', 'src': {'same': False, 'congruent': 8, 'type': 'addresses_A_ht'}, 'dst': {'same': False, 'congruent': 1, 'type': 'addresses_normal_ht'}}
{'OP': 'LOAD', 'src': {'same': False, 'type': 'addresses_normal_ht', 'NT': False, 'AVXalign': False, 'size': 8, 'congruent': 5}}
{'OP': 'LOAD', 'src': {'same': False, 'type': 'addresses_WC_ht', 'NT': False, 'AVXalign': False, 'size': 16, 'congruent': 6}}
{'OP': 'LOAD', 'src': {'same': False, 'type': 'addresses_UC_ht', 'NT': False, 'AVXalign': False, 'size': 4, 'congruent': 9}}
{'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
*/
|
mips1.asm | RustyRipper/AssemblerMips32 | 0 | 245378 | .data
idx_dodawanie: .word 0
idx_odejmowanie: .word 1
idx_mnozenie: .word 2
idx_dzielenie: .word 3
napis1: .asciiz "Podaj pierwsza liczbe\n"
napis2: .asciiz "Podaj operacje\n 0.Dodawanie \n 1.Odejmowanie \n 2.Mnozenie \n 3.Dzielenie\n"
napis3: .asciiz "Podaj druga liczbe\n"
napis4: .asciiz "Wynik to: \n"
napis5: .asciiz "\nJesli chcesz powtorzyc wprowadz 1, jesli nie to cos innego np 0\n"
napis6: .asciiz "\nZly kod operacji\n"
napis7: .asciiz "\nReszta: \n"
.text
main:
lw $t4, idx_dodawanie
lw $t5, idx_odejmowanie
lw $t6, idx_mnozenie
lw $t7, idx_dzielenie
algorytm:
li $v0,4
la $a0, napis1
syscall
li $v0, 5
syscall
move $t0, $v0
operacja:
li $v0,4
la $a0, napis2
syscall
li $v0, 5
syscall
move $t1, $v0
bgt $t1, $t7, komunikat
blt $t1, $t4, komunikat
drugaliczba:
li $v0,4
la $a0, napis3
syscall
li $v0, 5
syscall
move $t2, $v0
beq $t1, $t4, dodawanie
beq $t1, $t5, odejmowanie
beq $t1, $t6, mnozenie
beq $t1, $t7, dzielenie
komunikat:
li $v0,4
la $a0, napis6
syscall
j operacja
dodawanie:
add $t3, $t0, $t2
j skip
odejmowanie:
sub $t3, $t0, $t2
j skip
mnozenie:
mul $t3, $t0, $t2
j skip
dzielenie:
beq $t2, $zero, drugaliczba
div $t3, $t0, $t2
j skip
skip:
li $v0,4
la $a0, napis4
syscall
li $v0, 1
add $a0, $zero, $t3
syscall
bne $t1, $t7,wynik
li $v0,4
la $a0, napis7
syscall
li $v0, 1
mfhi $t3
add $a0, $zero, $t3
syscall
wynik:
li $v0,4
la $a0, napis5
syscall
li $v0, 5
syscall
move $t0, $v0
beq $t5, $t0, algorytm
li $v0, 10
syscall
|
alloy4fun_models/trashltl/models/6/PoAqndbJuN9Quqt3z.als | Kaixi26/org.alloytools.alloy | 0 | 4745 | <filename>alloy4fun_models/trashltl/models/6/PoAqndbJuN9Quqt3z.als
open main
pred idPoAqndbJuN9Quqt3z_prop7 {
always some Protected
}
pred __repair { idPoAqndbJuN9Quqt3z_prop7 }
check __repair { idPoAqndbJuN9Quqt3z_prop7 <=> prop7o } |
src/asis/a4g-a_osint.ads | My-Colaborations/dynamo | 15 | 28197 | ------------------------------------------------------------------------------
-- --
-- ASIS-for-GNAT IMPLEMENTATION COMPONENTS --
-- --
-- A 4 G . A _ O S I N T --
-- --
-- S p e c --
-- --
-- Copyright (c) 1995-1999, Free Software Foundation, Inc. --
-- --
-- ASIS-for-GNAT is free software; you can redistribute it and/or modify it --
-- under terms of the GNU General Public License as published by the Free --
-- Software Foundation; either version 2, or (at your option) any later --
-- version. ASIS-for-GNAT is distributed in the hope that it will be use- --
-- ful, but WITHOUT ANY WARRANTY; without even the implied warranty of MER- --
-- CHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General --
-- Public License for more details. You should have received a copy of the --
-- GNU General Public License distributed with ASIS-for-GNAT; see file --
-- COPYING. If not, write to the Free Software Foundation, 59 Temple Place --
-- - Suite 330, Boston, MA 02111-1307, USA. --
-- --
-- --
-- --
-- --
-- --
-- --
-- --
-- --
-- ASIS-for-GNAT was originally developed by the ASIS-for-GNAT team at the --
-- Software Engineering Laboratory of the Swiss Federal Institute of --
-- Technology (LGL-EPFL) in Lausanne, Switzerland, in cooperation with the --
-- Scientific Research Computer Center of Moscow State University (SRCC --
-- MSU), Russia, with funding partially provided by grants from the Swiss --
-- National Science Foundation and the Swiss Academy of Engineering --
-- Sciences. ASIS-for-GNAT is now maintained by Ada Core Technologies Inc --
-- (http://www.gnat.com). --
-- --
------------------------------------------------------------------------------
-- The original idea of this package was to be an ASIS analog of the GNAT
-- Osint package and to contain the low-level routines needed by different
-- components of the ASIS implementation. But its current version contains a
-- very few routines, so probably we should merge this package with some
-- other ASIS implementation utility package.
with GNAT.OS_Lib; use GNAT.OS_Lib;
with Types; use Types;
package A4G.A_Osint is
function Normalize_Directory_Name
(Directory : String)
return String;
-- Verify and normalize a directory name. If directory name is invalid,
-- this will return an empty string (not implemented for now - all the
-- checks should be made by a caller). Otherwise it will insure a
-- trailing directory separator and make other normalizations.
function Get_Max_File_Name_Length return Int;
-- yields the maximum file name length for system. Returns Int'Last,
-- if the system does not limit the maximum file name length.
procedure Free_Argument_List (List : in out Argument_List_Access);
-- if List is not null, frees the memory occupied by its content
end A4G.A_Osint;
|
src/random.asm | matanui159/gb_shmup | 1 | 28764 | include "reg.inc"
section "random", rom0
; ```
; random_init()
; ```
random_init::
ld a, "G"
ld [random_seed+0], a
ld a, "b"
ld [random_seed+1], a
ret
; ```
; random()
; return(value: A)
; destroy(BC, DE)
; ```
random::
; seed ^= seed << 7
; seed ^= seed >> 9
; seed ^= seed << 8
ld a, [random_seed]
ld b, a
ld d, a
ld a, [random_seed+1]
ld c, a
ld e, 0
srl d
rr a
rr e
xor a, b
ld b, a
ld d, a
ld a, c
xor a, e
srl d
xor a, d
ld c, a
xor a, b
ld [random_seed], a
ld a, c
ld [random_seed+1], a
ret
section "random_ram", wram0
random_seed: ds 2
|
src/gnat/prj-proc.ads | Letractively/ada-gen | 0 | 18484 | <filename>src/gnat/prj-proc.ads
------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- P R J . P R O C --
-- --
-- S p e c --
-- --
-- Copyright (C) 2001-2009, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License --
-- for more details. You should have received a copy of the GNU General --
-- Public License distributed with GNAT; see file COPYING3. If not, go to --
-- http://www.gnu.org/licenses for a complete copy of the license. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package is used to convert a project file tree (see prj-tree.ads) to
-- project file data structures (see prj.ads), taking into account the
-- environment (external references).
with Prj.Tree; use Prj.Tree;
package Prj.Proc is
procedure Process_Project_Tree_Phase_1
(In_Tree : Project_Tree_Ref;
Project : out Project_Id;
Success : out Boolean;
From_Project_Node : Project_Node_Id;
From_Project_Node_Tree : Project_Node_Tree_Ref;
Flags : Prj.Processing_Flags;
Reset_Tree : Boolean := True);
-- Process a project tree (ie the direct resulting of parsing a .gpr file)
-- based on the current external references.
--
-- The result of this phase_1 is a partial project tree (Project) where
-- only a few fields have been initialized (in particular the list of
-- languages). These are the fields that are necessary to run gprconfig if
-- needed to automatically generate a configuration file. This first phase
-- of the processing does not require a configuration file.
--
-- When Reset_Tree is True, all the project data are removed from the
-- project table before processing.
procedure Process_Project_Tree_Phase_2
(In_Tree : Project_Tree_Ref;
Project : Project_Id;
Success : out Boolean;
From_Project_Node : Project_Node_Id;
From_Project_Node_Tree : Project_Node_Tree_Ref;
Flags : Processing_Flags);
-- Perform the second phase of the processing, filling the rest of the
-- project with the information extracted from the project tree. This phase
-- requires that the configuration file has already been parsed (in fact
-- we currently assume that the contents of the configuration file has
-- been included in Project through Confgpr.Apply_Config_File). The
-- parameters are the same as for phase_1, with the addition of:
procedure Process
(In_Tree : Project_Tree_Ref;
Project : out Project_Id;
Success : out Boolean;
From_Project_Node : Project_Node_Id;
From_Project_Node_Tree : Project_Node_Tree_Ref;
Flags : Processing_Flags;
Reset_Tree : Boolean := True);
-- Performs the two phases of the processing
end Prj.Proc;
|
hello.asm | daveaseeman/PyHack | 5 | 24902 | <reponame>daveaseeman/PyHack
hello.o: file format elf32-i386
Disassembly of section .text:
00000000 <main>:
#include <stdio.h>
int main()
{
0: 55 push %ebp
1: 89 e5 mov %esp,%ebp
3: 83 e4 f0 and $0xfffffff0,%esp
6: 83 ec 20 sub $0x20,%esp
int a = 99;
9: c7 44 24 1c 63 00 00 movl $0x63,0x1c(%esp)
10: 00
char c;
printf("\nHello World. a = %d\n", a);
11: 8b 44 24 1c mov 0x1c(%esp),%eax
15: 89 44 24 04 mov %eax,0x4(%esp)
19: c7 04 24 00 00 00 00 movl $0x0,(%esp)
20: e8 fc ff ff ff call 21 <main+0x21>
return 0;
25: b8 00 00 00 00 mov $0x0,%eax
2a: c9 leave
2b: c3 ret
|
base/ntos/ex/i386/intrlfst.asm | yang235/wrk-v1.2 | 209 | 160431 | <filename>base/ntos/ex/i386/intrlfst.asm
title "Interlocked Support"
;++
;
; Copyright (c) Microsoft Corporation. All rights reserved.
;
; You may only use this code if you agree to the terms of the Windows Research Kernel Source Code License agreement (see License.txt).
; If you do not agree to the terms, do not use the code.
;
;
; Module Name:
;
; intrlfst.asm
;
; Abstract:
;
; This module implements functions to support interlocked operations.
; Interlocked operations can only operate on nonpaged data.
;
; This module implements the fast call version of the interlocked
; functions.
;
;--
.386p
.xlist
include ks386.inc
include callconv.inc ; calling convention macros
include mac386.inc
.list
_TEXT$00 SEGMENT DWORD PUBLIC 'CODE'
ASSUME DS:FLAT, ES:FLAT, SS:NOTHING, FS:NOTHING, GS:NOTHING
;++
;
; General Notes on Interlocked Procedures:
;
; These procedures assume that neither their code, nor any of
; the data they touch, will cause a page fault.
;
; They use spinlocks to achieve MP atomicity, iff it's an MP machine.
; (The spinlock macros generate zilch if NT_UP = 1, and
; we if out some aux code here as well.)
;
; They turn off interrupts so that they can be used for synchronization
; between ISRs and driver code. Flags are preserved so they can
; be called in special code (Like IPC interrupt handlers) that
; may have interrupts off.
;
;--
;; align 512
page ,132
subttl "ExInterlockedAddLargeStatistic"
;++
;
; VOID
; FASTCALL
; ExInterlockedAddLargeStatistic (
; IN PLARGE_INTEGER Addend,
; IN ULONG Increment
; )
;
; Routine Description:
;
; This function performs an interlocked add of an increment value to an
; addend variable of type unsigned large integer.
;
; Arguments:
;
; (ecx) Addend - Supplies a pointer to the variable whose value is
; adjusted by the increment value.
;
; (edx) Increment - Supplies the increment value that is added to the
; addend variable.
;
; Return Value:
;
; None.
;
;--
cPublicFastCall ExInterlockedAddLargeStatistic, 2
cPublicFpo 0,0
ifdef NT_UP
add dword ptr [ecx], edx ; add low part of large statistic
adc dword ptr [ecx+4], 0 ; add carry to high part
else
lock add dword ptr [ecx], edx ; add low part of large statistic
jc short Eils10 ; if c, add generated a carry
fstRET ExInterlockedAddLargeStatistic ; return
Eils10: lock adc dword ptr [ecx+4], 0 ; add carry to high part
endif
fstRET ExInterlockedAddLargeStatistic ; return
fstENDP ExInterlockedAddLargeStatistic
page , 132
subttl "Interlocked Add Unsigned Long"
;++
;
; ULONG
; FASTCALL
; ExfInterlockedAddUlong (
; IN PULONG Addend,
; IN ULONG Increment,
; IN PKSPIN_LOCK Lock
; )
;
; Routine Description:
;
; This function performs an interlocked add of an increment value to an
; addend variable of type unsigned long. The initial value of the addend
; variable is returned as the function value.
;
; It is NOT possible to mix ExInterlockedDecrementLong and
; ExInterlockedIncrementong with ExInterlockedAddUlong.
;
;
; Arguments:
;
; (ecx) Addend - Supplies a pointer to a variable whose value is to be
; adjusted by the increment value.
;
; (edx) Increment - Supplies the increment value to be added to the
; addend variable.
;
; (esp+4) Lock - Supplies a pointer to a spin lock to be used to synchronize
; access to the addend variable.
;
; Return Value:
;
; The initial value of the addend variable.
;
;--
cPublicFastCall ExfInterlockedAddUlong, 3
cPublicFpo 1, 1
ifdef NT_UP
;
; UP version of ExInterlockedAddUlong
;
pushfd
cli ; disable interrupts
mov eax, [ecx] ; (eax)= initial addend value
add [ecx], edx ; [ecx]=adjusted value
popfd ; restore flags including ints
fstRET ExfInterlockedAddUlong
else
;
; MP version of ExInterlockedAddUlong
;
pushfd
mov eax, [esp+8] ; (eax) = SpinLock
Eial10: cli ; disable interrupts
ACQUIRE_SPINLOCK eax, <short Eial20>
mov eax, [ecx] ; (eax)=initial addend value
add [ecx], edx ; [ecx]=adjusted value
mov edx, [esp+8] ; (edx) = SpinLock
RELEASE_SPINLOCK edx
popfd
fstRET ExfInterlockedAddUlong
Eial20: popfd
pushfd
SPIN_ON_SPINLOCK eax, <short Eial10>
endif
fstENDP ExfInterlockedAddUlong
page , 132
subttl "Interlocked Insert Head List"
;++
;
; PLIST_ENTRY
; ExfInterlockedInsertHeadList (
; IN PLIST_ENTRY ListHead,
; IN PLIST_ENTRY ListEntry,
; IN PKSPIN_LOCK Lock
; )
;
; Routine Description:
;
; This function inserts an entry at the head of a doubly linked list
; so that access to the list is synchronized in a multiprocessor system.
;
; N.B. The pages of data which this routine operates on MUST be
; present. No page fault is allowed in this routine.
;
; Arguments:
;
; (ecx) = ListHead - Supplies a pointer to the head of the doubly linked
; list into which an entry is to be inserted.
;
; (edx) = ListEntry - Supplies a pointer to the entry to be inserted at the
; head of the list.
;
; (esp+4) Lock - Supplies a pointer to a spin lock to be used to synchronize
; access to the list.
;
; Return Value:
;
; Pointer to entry that was at the head of the list or NULL if the list
; was empty.
;
;--
cPublicFastCall ExfInterlockedInsertHeadList , 3
cPublicFpo 1, 1
ifndef NT_UP
cPublicFpo 1, 2
push esi
mov esi, [esp+8] ; Address of spinlock
endif
pushfd
Eiih10: cli
ACQUIRE_SPINLOCK esi,<short Eiih20>
mov eax, LsFlink[ecx] ; (eax)->next entry in the list
mov [edx]+LsFlink, eax ; store next link in entry
mov [edx]+LsBlink, ecx ; store previous link in entry
mov [ecx]+LsFlink, edx ; store next link in head
mov [eax]+LsBlink, edx ; store previous link in next
RELEASE_SPINLOCK esi
popfd
ifndef NT_UP
pop esi
endif
xor eax, ecx ; return null if list was empty
jz short Eiih15
xor eax, ecx
Eiih15: fstRET ExfInterlockedInsertHeadList
ifndef NT_UP
Eiih20: popfd
pushfd
SPIN_ON_SPINLOCK esi, <short Eiih10>
endif
fstENDP ExfInterlockedInsertHeadList
page , 132
subttl "Interlocked Insert Tail List"
;++
;
; PLIST_ENTRY
; FASTCALL
; ExfInterlockedInsertTailList (
; IN PLIST_ENTRY ListHead,
; IN PLIST_ENTRY ListEntry,
; IN PKSPIN_LOCK Lock
; )
;
; Routine Description:
;
; This function inserts an entry at the tail of a doubly linked list
; so that access to the list is synchronized in a multiprocessor system.
;
; N.B. The pages of data which this routine operates on MUST be
; present. No page fault is allowed in this routine.
;
; Arguments:
;
; (ecx) = ListHead - Supplies a pointer to the head of the doubly linked
; list into which an entry is to be inserted.
;
; (edx) = ListEntry - Supplies a pointer to the entry to be inserted at the
; tail of the list.
;
; (esp+4) Lock - Supplies a pointer to a spin lock to be used to synchronize
; access to the list.
;
; Return Value:
;
; Pointer to entry that was at the tail of the list or NULL if the list
; was empty.
;
;--
cPublicFastCall ExfInterlockedInsertTailList, 3
cPublicFpo 1, 1
ifndef NT_UP
cPublicFpo 1, 2
push esi
mov esi, [esp+8] ; Address of spinlock
endif
pushfd
Eiit10: cli
ACQUIRE_SPINLOCK esi,<short Eiit20>
mov eax, LsBlink[ecx] ; (eax)->prev entry in the list
mov [edx]+LsFlink, ecx ; store next link in entry
mov [edx]+LsBlink, eax ; store previous link in entry
mov [ecx]+LsBlink, edx ; store next link in head
mov [eax]+LsFlink, edx ; store previous link in next
RELEASE_SPINLOCK esi
popfd
ifndef NT_UP
pop esi
endif
xor eax, ecx ; return null if list was empty
jz short Eiit15
xor eax, ecx
Eiit15: fstRET ExfInterlockedInsertTailList
ifndef NT_UP
Eiit20: popfd
pushfd
SPIN_ON_SPINLOCK esi, <short Eiit10>
endif
fstENDP ExfInterlockedInsertTailList
page , 132
subttl "Interlocked Remove Head List"
;++
;
; PLIST_ENTRY
; FASTCALL
; ExfInterlockedRemoveHeadList (
; IN PLIST_ENTRY ListHead,
; IN PKSPIN_LOCK Lock
; )
;
; Routine Description:
;
; This function removes an entry from the head of a doubly linked list
; so that access to the list is synchronized in a multiprocessor system.
; If there are no entries in the list, then a value of NULL is returned.
; Otherwise, the address of the entry that is removed is returned as the
; function value.
;
; N.B. The pages of data which this routine operates on MUST be
; present. No page fault is allowed in this routine.
;
; Arguments:
;
; (ecx) ListHead - Supplies a pointer to the head of the doubly linked
; list from which an entry is to be removed.
;
; (edx) Lock - Supplies a pointer to a spin lock to be used to synchronize
; access to the list.
;
; Return Value:
;
; The address of the entry removed from the list, or NULL if the list is
; empty.
;
;--
cPublicFastCall ExfInterlockedRemoveHeadList , 2
cPublicFpo 0, 1
ifdef NT_UP
;
; UP version
;
pushfd
cli
mov eax, [ecx]+LsFlink ; (eax)-> next entry
cmp eax, ecx ; Is list empty?
je short Eirh20 ; if e, list is empty, go Eirh20
mov edx, [eax]+LsFlink ; (ecx)-> next entry(after deletion)
mov [ecx]+LsFlink, edx ; store address of next in head
mov [edx]+LsBlink, ecx ; store address of previous in next
if DBG
mov [eax]+LsFlink, 0baddd0ffh
mov [eax]+LsBlink, 0baddd0ffh
endif
popfd ; restore flags including interrupts
fstRET ExfInterlockedRemoveHeadList
Eirh20: popfd
xor eax,eax ; (eax) = null for empty list
fstRET ExfInterlockedRemoveHeadList
else
;
; MP version
;
Eirh40: pushfd
cli
ACQUIRE_SPINLOCK edx, <short Eirh60>
mov eax, [ecx]+LsFlink ; (eax)-> next entry
cmp eax, ecx ; Is list empty?
je short Eirh50 ; if e, list is empty, go Eirh50
cPublicFpo 0,2
push ebx
mov ebx, [eax]+LsFlink ; (ecx)-> next entry(after deletion)
mov [ecx]+LsFlink, ebx ; store address of next in head
mov [ebx]+LsBlink, ecx ; store address of previous in next
if DBG
mov ebx, 0badd0ffh
mov [eax]+LsFlink, ebx
mov [eax]+LsBlink, ebx
endif
RELEASE_SPINLOCK edx
cPublicFpo 0, 0
pop ebx
popfd ; restore flags including interrupts
fstRET ExfInterlockedRemoveHeadList
Eirh50: RELEASE_SPINLOCK edx
popfd
xor eax,eax ; (eax) = null for empty list
fstRET ExfInterlockedRemoveHeadList
cPublicFpo 0, 0
Eirh60: popfd
SPIN_ON_SPINLOCK edx, <Eirh40>
fstRET ExfInterlockedRemoveHeadList
endif ; nt_up
fstENDP ExfInterlockedRemoveHeadList
page , 132
subttl "Interlocked Pop Entry List"
;++
;
; PSINGLE_LIST_ENTRY
; FASTCALL
; ExfInterlockedPopEntryList (
; IN PSINGLE_LIST_ENTRY ListHead,
; IN PKSPIN_LOCK Lock
; )
;
; Routine Description:
;
; This function removes an entry from the front of a singly linked list
; so that access to the list is synchronized in a multiprocessor system.
; If there are no entries in the list, then a value of NULL is returned.
; Otherwise, the address of the entry that is removed is returned as the
; function value.
;
; Arguments:
;
; (ecx) = ListHead - Supplies a pointer to the head of the singly linked
; list from which an entry is to be removed.
;
; (edx) = Lock - Supplies a pointer to a spin lock to be used to synchronize
; access to the list.
;
; Return Value:
;
; The address of the entry removed from the list, or NULL if the list is
; empty.
;
;--
cPublicFastCall ExfInterlockedPopEntryList , 2
ifdef NT_UP
;
; UP version
;
cPublicFpo 0,1
pushfd
cli ; disable interrupts
mov eax, [ecx] ; (eax)-> next entry
or eax, eax ; Is it empty?
je short Eipe05 ; if e, empty list, go Eipe05
mov edx, [eax] ; (edx)->next entry (after deletion)
mov [ecx], edx ; store address of next in head
if DBG
mov [eax], 0baddd0ffh
endif
cPublicFpo 0,0
popfd ; restore flags including interrupts
fstRET ExfInterlockedPopEntryList ; cReturn (eax)->removed entry
Eipe05: popfd
xor eax,eax
fstRET ExfInterlockedPopEntryList ; cReturn (eax)=NULL
else ; nt_up
;
; MP Version
;
cPublicFpo 0,1
Eipe10: pushfd
cli ; disable interrupts
ACQUIRE_SPINLOCK edx, <short Eipe30>
mov eax, [ecx] ; (eax)-> next entry
or eax, eax ; Is it empty?
je short Eipe20 ; if e, empty list, go Eipe20
cPublicFpo 0,2
push edx ; Save SpinLock address
mov edx, [eax] ; (edx)->next entry (after deletion)
mov [ecx], edx ; store address of next in head
pop edx ; Restore SpinLock address
if DBG
mov [eax], 0baddd0ffh
endif
RELEASE_SPINLOCK edx
cPublicFpo 0,0
popfd ; restore flags including interrupts
fstRET ExfInterlockedPopEntryList
Eipe20: RELEASE_SPINLOCK edx
popfd
xor eax,eax
fstRET ExfInterlockedPopEntryList
Eipe30: popfd
SPIN_ON_SPINLOCK edx, Eipe10
endif ; nt_up
fstENDP ExfInterlockedPopEntryList
page , 132
subttl "Interlocked Push Entry List"
;++
;
; PSINGLE_LIST_ENTRY
; FASTCALL
; ExInterlockedPushEntryList (
; IN PSINGLE_LIST_ENTRY ListHead,
; IN PSINGLE_LIST_ENTRY ListEntry,
; IN PKSPIN_LOCK Lock
; )
;
; Routine Description:
;
; This function inserts an entry at the head of a singly linked list
; so that access to the list is synchronized in a multiprocessor system.
;
; Arguments:
;
; (ecx) ListHead - Supplies a pointer to the head of the singly linked
; list into which an entry is to be inserted.
;
; (edx) ListEntry - Supplies a pointer to the entry to be inserted at the
; head of the list.
;
; (esp+4) Lock - Supplies a pointer to a spin lock to be used to synchronize
; access to the list.
;
; Return Value:
;
; Previous contents of ListHead. NULL implies list went from empty
; to not empty.
;
;--
cPublicFastCall ExfInterlockedPushEntryList , 3
ifdef NT_UP
;
; UP Version
;
cPublicFpo 0,1
pushfd
cli
mov eax, [ecx] ; (eax)-> next entry (return value also)
mov [edx], eax ; store address of next in new entry
mov [ecx], edx ; set address of next in head
cPublicFpo 0,0
popfd ; restore flags including interrupts
fstRET ExfInterlockedPushEntryList
else
;
; MP Version
;
cPublicFpo 1,1
pushfd
push edx
mov edx, [esp+12] ; (edx) = SpinLock
Eipl10: cli
ACQUIRE_SPINLOCK edx, <short Eipl20>
pop edx ; (edx)-> Entry to be pushed
mov eax, [ecx] ; (eax)-> next entry (return value also)
mov [edx], eax ; store address of next in new entry
mov [ecx], edx ; set address of next in head
mov edx, [esp+8] ; (edx) = SpinLock
RELEASE_SPINLOCK edx
cPublicFpo 0,0
popfd ; restore flags including interrupts
fstRET ExfInterlockedPushEntryList
cPublicFpo 1,2
Eipl20: pop edx
popfd ; Restore interrupt state
pushfd
push edx
mov edx, [esp+12]
SPIN_ON_SPINLOCK edx, <short Eipl10>
endif
fstENDP ExfInterlockedPushEntryList
page , 132
subttl "Interlocked i386 Increment Long"
;++
;
; INTERLOCKED_RESULT
; FASTCALL
; Exfi386InterlockedIncrementLong (
; IN PLONG Addend
; )
;
; Routine Description:
;
; This function atomically increments Addend, returning an ennumerated
; type which indicates what interesting transitions in the value of
; Addend occurred due the operation.
;
; See ExInterlockedIncrementLong. This function is the i386
; architectural specific version of ExInterlockedIncrementLong.
; No source directly calls this function, instead
; ExInterlockedIncrementLong is called and when built on x86 these
; calls are macro-ed to the i386 optimized version.
;
; Arguments:
;
; (ecx) Addend - Pointer to variable to increment.
;
; Return Value:
;
; An ennumerated type:
;
; ResultNegative if Addend is < 0 after increment.
; ResultZero if Addend is = 0 after increment.
; ResultPositive if Addend is > 0 after increment.
;
;--
cPublicFastCall Exfi386InterlockedIncrementLong, 1
cPublicFpo 0, 0
ifdef NT_UP
add dword ptr [ecx],1
else
lock add dword ptr [ecx],1
endif
lahf ; (ah) = flags
and eax,EFLAG_SELECT ; clear all but sign and zero flags
fstRET Exfi386InterlockedIncrementLong
fstENDP Exfi386InterlockedIncrementLong
page , 132
subttl "Interlocked i386 Decrement Long"
;++
;
; INTERLOCKED_RESULT
; FASTCALL
; Exfi386InterlockedDecrementLong (
; IN PLONG Addend,
; IN PKSPIN_LOCK Lock
; )
;
; Routine Description:
;
; This function atomically decrements Addend, returning an ennumerated
; type which indicates what interesting transitions in the value of
; Addend occurred due the operation.
;
; See Exi386InterlockedDecrementLong. This function is the i386
; architectural specific version of ExInterlockedDecrementLong.
; No source directly calls this function, instead
; ExInterlockedDecrementLong is called and when built on x86 these
; calls are macro-ed to the i386 optimized version.
;
; Arguments:
;
; Addend (esp+4) - Pointer to variable to decrement.
;
; Lock (esp+8) - Spinlock used to implement atomicity.
; (not actually used on x86)
;
; Return Value:
;
; An ennumerated type:
;
; ResultNegative if Addend is < 0 after decrement.
; ResultZero if Addend is = 0 after decrement.
; ResultPositive if Addend is > 0 after decrement.
;
;--
cPublicFastCall Exfi386InterlockedDecrementLong , 1
cPublicFpo 0, 0
ifdef NT_UP
sub dword ptr [ecx], 1
else
lock sub dword ptr [ecx], 1
endif
lahf ; (ah) = flags
and eax, EFLAG_SELECT ; clear all but sign and zero flags
fstRET Exfi386InterlockedDecrementLong
fstENDP Exfi386InterlockedDecrementLong
page , 132
subttl "Interlocked i386 Exchange Ulong"
;++
;
; ULONG
; FASTCALL
; Exfi386InterlockedExchangeUlong (
; IN PULONG Target,
; IN ULONG Value
; )
;
; Routine Description:
;
; This function atomically exchanges the Target and Value, returning
; the prior contents of Target
;
; See Exi386InterlockedExchangeUlong. This function is the i386
; architectural specific version of ExInterlockedDecrementLong.
; No source directly calls this function, instead
; ExInterlockedDecrementLong is called and when built on x86 these
; calls are macro-ed to the i386 optimized version.
;
; Arguments:
;
; (ecx) = Source - Address of ULONG to exchange
; (edx) = Value - New value of ULONG
;
; Return Value:
;
; The prior value of Source
;--
cPublicFastCall Exfi386InterlockedExchangeUlong, 2
cPublicFpo 0,0
.486
ifndef NT_UP
xchg [ecx], edx ; make the exchange
mov eax, edx
else
mov eax, [ecx] ; get comperand value
Ixchg: cmpxchg [ecx], edx ; compare and swap
jnz Ixchg ; if nz, exchange failed
endif
.386
fstRET Exfi386InterlockedExchangeUlong
fstENDP Exfi386InterlockedExchangeUlong
;++
;
; LONG
; InterlockedIncrement(
; IN PLONG Addend
; )
;
; Routine Description:
;
; This function performs an interlocked add of one to the addend variable.
;
; No checking is done for overflow.
;
; Arguments:
;
; Addend (ecx) - Supplies a pointer to a variable whose value is to be
; incremented by one.
;
; Return Value:
;
; (eax) - The incremented value.
;
;--
cPublicFastCall __InterlockedIncrement,1
cPublicFpo 0,0
mov eax, 1 ; set increment value
.486
ifndef NT_UP
lock xadd [ecx], eax ; interlocked increment
else
xadd [ecx], eax ; interlocked increment
endif
.386p
inc eax ; adjust return value
fstRET __InterlockedIncrement
fstENDP __InterlockedIncrement
page , 132
subttl "InterlockedDecrment"
;++
;
; LONG
; InterlockedDecrement(
; IN PLONG Addend
; )
;
; Routine Description:
;
; This function performs an interlocked add of -1 to the addend variable.
;
; No checking is done for overflow
;
; Arguments:
;
; Addend (ecx) - Supplies a pointer to a variable whose value is to be
; decremented by one.
;
; Return Value:
;
; (eax) - The decremented value.
;
;--
cPublicFastCall __InterlockedDecrement,1
cPublicFpo 0,0
mov eax, -1 ; set decrment value
.486
ifndef NT_UP
lock xadd [ecx], eax ; interlocked decrement
else
xadd [ecx], eax ; interlocked decrement
endif
.386
dec eax ; adjust return value
fstRET __InterlockedDecrement
fstENDP __InterlockedDecrement
page , 132
subttl "Interlocked Compare Exchange"
;++
;
; PVOID
; FASTCALL
; InterlockedCompareExchange (
; IN OUT PVOID *Destination,
; IN PVOID Exchange,
; IN PVOID Comperand
; )
;
; Routine Description:
;
; This function performs an interlocked compare of the destination
; value with the comperand value. If the destination value is equal
; to the comperand value, then the exchange value is stored in the
; destination. Otherwise, no operation is performed.
;
; Arguments:
;
; (ecx) Destination - Supplies a pointer to destination value.
;
; (edx) Exchange - Supplies the exchange value.
;
; [esp + 4] Comperand - Supplies the comperand value.
;
; Return Value:
;
; The initial destination value is returned as the function value.
;
;--
cPublicFastCall __InterlockedCompareExchange, 3
cPublicFpo 0,0
mov eax, [esp + 4] ; set comperand value
.486
ifndef NT_UP
lock cmpxchg [ecx], edx ; compare and exchange
else
cmpxchg [ecx], edx ; compare and exchange
endif
.386
fstRET __InterlockedCompareExchange
fstENDP __InterlockedCompareExchange
subttl "Interlocked Compare Exchange 64-bit - without lock"
;++
;
; LONGLONG
; FASTCALL
; ExfInterlockedCompareExchange64 (
; IN OUT PLONGLONG Destination,
; IN PLONGLONG Exchange,
; IN PLONGLONG Comperand
; )
;
; Routine Description:
;
; This function performs a compare and exchange of 64-bits.
;
; Arguments:
;
; (ecx) Destination - Supplies a pointer to the destination variable.
;
; (edx) Exchange - Supplies a pointer to the exchange value.
;
; (esp+4) Comperand - Supplies a pointer to the comperand value.
;
; Return Value:
;
; The current destination value is returned as the function value.
;
;--
cPublicFastCall ExfInterlockedCompareExchange64, 3
cPublicFpo 0,2
;
; Save nonvolatile registers and read the exchange and comperand values.
;
push ebx ; save nonvolatile registers
push ebp ;
mov ebp, ecx ; set destination address
mov ebx, [edx] ; get exchange value
mov ecx, [edx] + 4 ;
mov edx, [esp] + 12 ; get comperand address
mov eax, [edx] ; get comperand value
mov edx, [edx] + 4 ;
.586
ifndef NT_UP
lock cmpxchg8b qword ptr [ebp] ; compare and exchange
else
cmpxchg8b qword ptr[ebp] ; compare and exchange
endif
.386
;
; Restore nonvolatile registers and return result in edx:eax.
;
cPublicFpo 0,0
pop ebp ; restore nonvolatile registers
pop ebx ;
fstRET ExfInterlockedCompareExchange64
fstENDP ExfInterlockedCompareExchange64
page , 132
subttl "Interlocked Compare Exchange 64-bits - with lock"
;++
;
; LONGLONG
; FASTCALL
; ExInterlockedCompareExchange64 (
; IN PLONGLONG Destination,
; IN PLONGLONG Exchange,
; IN PLONGLONG Comperand,
; IN PKSPIN_LOCK Lock
; )
;
; Routine Description:
;
; This function performs a compare and exchange of 64-bits.
;
; N.B. This routine is provided for backward compatibility only. The
; lock address is not used.
;
; Arguments:
;
; (ecx) Destination - Supplies a pointer to the destination variable.
;
; (edx) Exchange - Supplies a pointer to the exchange value.
;
; (esp+4) Comperand - Supplies a pointer to the comperand value.
;
; (esp+4) Lock - Supplies a pointer to a spin lock to use if the cmpxchg8b
; instruction is not available on the host system.
;
; Return Value:
;
; The current destination value is returned as the function value.
;
;--
cPublicFastCall ExInterlockedCompareExchange64, 4
cPublicFpo 0,2
;
; Save nonvolatile registers and read the exchange and comperand values.
;
push ebx ; save nonvolatile registers
push ebp ;
mov ebp, ecx ; set destination address
mov ebx, [edx] ; get exchange value
mov ecx, [edx] + 4 ;
mov edx, [esp] + 12 ; get comperand address
mov eax, [edx] ; get comperand value
mov edx, [edx] + 4 ;
.586
ifndef NT_UP
lock cmpxchg8b qword ptr [ebp] ; compare and exchange
else
cmpxchg8b qword ptr[ebp] ; compare and exchange
endif
.386
;
; Restore nonvolatile registers and return result in edx:eax.
;
cPublicFpo 0,0
pop ebp ; restore nonvolatile registers
pop ebx ;
fstRET ExInterlockedCompareExchange64
fstENDP ExInterlockedCompareExchange64
subttl "Interlocked Exchange Add"
;++
;
; LONG
; FASTCALL
; InterlockedExchangeAdd (
; IN OUT PLONG Addend,
; IN LONG Increment
; )
;
; Routine Description:
;
; This function performs an interlocked add of an increment value to an
; addend variable of type unsigned long. The initial value of the addend
; variable is returned as the function value.
;
; It is NOT possible to mix ExInterlockedDecrementLong and
; ExInterlockedIncrementong with ExInterlockedAddUlong.
;
;
; Arguments:
;
; (ecx) Addend - Supplies a pointer to a variable whose value is to be
; adjusted by the increment value.
;
; (edx) Increment - Supplies the increment value to be added to the
; addend variable.
;
; Return Value:
;
; The initial value of the addend variable.
;
;--
cPublicFastCall __InterlockedExchangeAdd, 2
cPublicFpo 0,0
.486
ifndef NT_UP
lock xadd [ecx], edx ; exchange add
else
xadd [ecx], edx ; exchange add
endif
.386
mov eax, edx ; set initial value
fstRET __InterlockedExchangeAdd
fstENDP __InterlockedExchangeAdd
_TEXT$00 ends
end
|
src/report_form.adb | SSOCsoft/Log_Reporter | 0 | 14386 | <reponame>SSOCsoft/Log_Reporter<gh_stars>0
With
Ada.Tags,
Ada.Strings.Fixed,
Ada.Calendar.Formatting,
INI.Parameters,
INI.Section_to_Vector,
NSO.Types,
NSO.Helpers,
Gnoga.Types.Colors,
Gnoga.Gui.Element.Common,
Gnoga.Gui.Element.Table;
WITH
Ada.Text_IO;
with System.RPC;
with Gnoga.Gui.Element.Form;
Package Body Report_Form is
use NSO.Types, NSO.Helpers, INI.Parameters;
DEBUGGING : Constant Boolean := False;
-- For when multiple reports will be used.
Type Drop_Action is (Weather, Observation);
-- Handles the Start_Drag event.
Procedure Start_Drag (Object : in out Gnoga.Gui.Base.Base_Type'Class) is
Begin
if DEBUGGING then
Ada.Text_IO.Put_Line( "----START_DRAG----" );
end if;
End Start_Drag;
-- Handler; meant for dragging.
-- Currently unused.
procedure Do_It (Object : in out Gnoga.Gui.Base.Base_Type'Class) is
Begin
Null; -- Ada.Text_IO.Put_Line( "----DRAGGING----" );
End Do_It;
-- Handles the Drop event.
procedure Do_Drop(
Object : in out Gnoga.Gui.Base.Base_Type'Class;
X, Y : in Integer;
Drag_Text : in String
) is
Tag : String renames Ada.Tags.Expanded_Name( Object'Tag );
Begin
if DEBUGGING then
Ada.Text_IO.Put_Line( "DRAG-TEXT: " & Drag_Text );
end if;
HANDLE_ACTION:
Declare
Action : Drop_Action renames Drop_Action'Value( Drag_Text );
Begin
if DEBUGGING then
Ada.Text_IO.Put_Line( "----DROPPED "& Tag &"!!----" );
end if;
case Action is
when Weather =>
Declare
Use Gnoga.Gui.Element.Form, Gnoga.Gui.View;
Form : Form_Type'Class renames Form_Type'Class(Object);
View : My_Widget_Type'Class renames My_Widget_Type'Class(Form.Parent.all);
Begin
View.Weather_Div.Add_To_Form(Form);
End;
when Observation =>
Declare
Use Gnoga.Gui.Element.Form, Gnoga.Gui.View;
Form : Form_Type'Class renames Form_Type'Class(Object);
View : My_Widget_Type'Class renames My_Widget_Type'Class(Form.Parent.all);
Begin
View.Observation_Div.Add_To_Form(Form);
End;
end case;
End HANDLE_ACTION;
exception
when Constraint_Error => -- Undefined action / not in enumeration.
if DEBUGGING then
Ada.Text_IO.Put_Line( "Invalid action:'"&Drag_Text&"'." );
end if;
End Do_Drop;
Procedure Weather_Div(Object : in out Gnoga.Gui.Element.Common.DIV_Type;
View : in out My_Widget_Type ) is
Date : Gnoga.Gui.Element.Form.Date_Type;
Time : Gnoga.Gui.Element.Form.Time_Type;
Wind_Speed, Temperature, Seeing : Gnoga.Gui.Element.Form.Number_Type;
Conditions, Wind_Direction : Gnoga.Gui.Element.Form.Selection_Type;
Labels : Array(1..7) of Gnoga.Gui.Element.Form.Label_Type;
Procedure Add_Directions is new Add_Discrete( NSO.Types.Direction );
Procedure Add_Conditions is new Add_Discrete( NSO.Types.Sky );
Procedure Add_Label(
Label : in out Gnoga.Gui.Element.Form.Label_Type'Class;
Form : in out Gnoga.Gui.Element.Form.Form_Type'Class;
Item : in out Gnoga.Gui.Element.Element_Type'Class;
Text : String
) is
Begin
Label.Create(Form, Item, Text, Auto_Place => False);
Item.Place_Inside_Bottom_Of(Label);
End Add_Label;
Use Ada.Calendar.Formatting;
Function Time_String return String is
Use Ada.Strings.Fixed, Ada.Strings;
Time_Image : String renames Image( Ada.Calendar.Clock );
Space : Natural renames Index(Time_Image, " ", Time_Image'First);
Colon : Natural renames Index(Time_Image, ":", Time_Image'Last, Going => Backward);
Begin
Return Result : Constant String :=
Time_Image( Positive'Succ(Space)..Positive'Pred(Colon) );
End;
Function Date_String return String is
Use Ada.Strings.Fixed, Ada.Strings;
Time_Image : String renames Image( Ada.Calendar.Clock );
Space : Natural renames Index(Time_Image, " ", Time_Image'First);
Begin
Return Result : Constant String :=
Time_Image( Time_Image'First..Positive'Pred(Space) );
End;
Begin
Object.Create(View.Widget_Form, ID => "Weather");
Object.Draggable( True );
Object.On_Drag_Handler( Handler => Do_It'Access );
Object.On_Drag_Start_Handler( Drag_Text => Drop_Action'Image(Weather), Handler => Start_Drag'Access );
Object.Cursor( "grab" );
Object.Minimum_Width (Unit => "ex", Value => 40);
Object.Minimum_Height(Unit => "ex", Value => 06);
Object.Style(Name => "display", Value => "INLINE-BLOCK");
-----------------------
-- CREATE COMPONENTS --
-----------------------
Date.Create(Form => View.Widget_Form, ID => "Weather.Date", Value => Date_String);
Time.Create(Form => View.Widget_Form, ID => "Weather.Time", Value => Time_String);
Conditions.Create( View.Widget_Form, ID => "Weather.Condition" );
Wind_Direction.Create (View.Widget_Form, ID => "Weather.Wind_Direction");
Wind_Speed.Create( View.Widget_Form, ID => "Weather.Wind_Speed", Value => "0");
Wind_Speed.Maximum( 100 ); Wind_Speed.Minimum( 0 ); Wind_Speed.Step( 1 );
Temperature.Create( View.Widget_Form, ID => "Weather.Temperature", Value => "70");
Temperature.Maximum(120); Temperature.Minimum(-40); Temperature.Step(1);
Seeing.Create( View.Widget_Form, ID => "Weather.Seeing", Value => "5");
Seeing.Maximum(8); Seeing.Minimum(1); Seeing.Step(1);
-----------------
-- ADD OPTIONS --
-----------------
Add_Directions(View.Widget_Form, Wind_Direction);
Add_Conditions(View.Widget_Form, Conditions);
-------------------
-- PLACE OBJECTS --
-------------------
-- Date.Place_Inside_Top_Of( Object );
-- Time.Place_After(Date);
-- Conditions.Place_After(Time);
-- Wind_Direction.Place_After(Conditions);
-- Wind_Speed.Place_After(Wind_Direction);
-- Temperature.Place_After(Wind_Speed);
-- Seeing.Place_After(Temperature);
--------------------
-- CREATE LABELS --
--------------------
Add_Label( Labels(1), View.Widget_Form, Date, "Date:");
Add_Label( Labels(2), View.Widget_Form, Time, "Time:");
Add_Label( Labels(3), View.Widget_Form, Conditions, "Conditions:");
Add_Label( Labels(4), View.Widget_Form, Wind_Direction, "Wind Direction:");
Add_Label( Labels(5), View.Widget_Form, Wind_Speed, "Wind Speed:");
Add_Label( Labels(6), View.Widget_Form, Temperature, "Temperature:");
Add_Label( Labels(7), View.Widget_Form, Seeing, "Seeing:");
Labels(1).Place_Inside_Top_Of( Object );
For X in Positive'Succ(Labels'First)..Labels'Last loop
Labels(X).Place_After( Labels( Positive'Pred(X) ) );
end loop;
Object.Place_Inside_Bottom_Of( View.Widget_Form );
End Weather_Div;
-- Used to create our custom view
overriding
procedure Create (View : in out My_Widget_Type;
Parent : in out Gnoga.Gui.Base.Base_Type'Class;
ID : in String := "")
is
Multipart : Constant Boolean := True;
PlainText : Constant Boolean := False;
Function Encoding return Gnoga.Gui.Element.Form.Encoding_Type is
(if MultiPart then Gnoga.Gui.Element.Form.Multi_Part
elsif PlainText then Gnoga.Gui.Element.Form.Text
else Gnoga.Gui.Element.Form.URL_Encode
) with Inline, Pure_Function;
Function Drag_Here_SVG return String is
SVG_Head : Constant String :=
"<svg xmlns=""http://www.w3.org/2000/svg"" " &
"version=""1.1"" height=""3.5ex"" width=""20em"">";
Text_Head : Constant String :=
"<text x=""50%"" y=""50%"" fill=""dimgray"" font-size=""20"" " &
"dominant-baseline=""middle"" text-anchor=""middle"">";
Text_Tail : Constant String := "</text>";
SVG_Tail : Constant String := "</svg>";
Function Text( Item : String ) return String is
(Text_Head & Item & Text_Tail) with Inline;
Begin
Return SVG_Head & Text("Drag Reports Here") & SVG_Tail;
End Drag_Here_SVG;
use Gnoga.Gui.Element.Table;
Layout_Table : constant Table_Access := new Table_Type;
begin
Gnoga.Gui.View.View_Type (View).Create (Parent, ID);
View.Widget_Form.Create (View);
View.Widget_Form.On_Drop_Handler(Handler => Do_Drop'Access);
View.Widget_Form.Background_Color(if DEBUGGING then "RED" else "lightgray");
View.Widget_Form.Background_Image(
"data:image/svg+xml;utf8, " & Drag_Here_SVG
);
View.Widget_Form.Method (Value => Gnoga.Gui.Element.Form.Post);
View.Widget_Form.Encoding(Value => Encoding);
-- data:image/svg+xml;utf8, <svg xmlns='http://www.w3.org/2000/svg'><text x='50%' y='50%' fill='red'>TEST!!</text></svg>
--Drag_Here_SVG);
Layout_Table.Dynamic;
-- Marking an element Dynamic before creation tells Gnoga to garbage
-- collect, i.e. deallocate the element when it is parent is finalized.
Layout_Table.Create (View);
Layout_Table.Border("medium", Gnoga.Gui.Element.Double, Gnoga.Types.Colors.Dark_Red);
declare
Type Observation_Conditions is (Excellent, Good, Fair, Poor);
Procedure Add_Selections is new Add_Discrete(Observation_Conditions);
row : constant Table_Row_Access := new Table_Row_Type;
col1 : constant Table_Column_Access := new Table_Column_Type;
col2 : constant Table_Column_Access := new Table_Column_Type;
Operators : NSO.Types.String_Vector.Vector :=
INI.Section_to_Vector(Parameters,"Observers");
Type Categories is (fe_Name, fe_Observer, fe_Item);
Labels : Array(Categories) of Gnoga.Gui.Element.Form.Label_Type;
Division_X : Gnoga.Gui.Element.Common.DIV_Type renames
Gnoga.Gui.Element.Common.DIV_Type(View.Weather_Div);
begin
row.Dynamic;
col1.Dynamic;
col2.Dynamic;
row.Create (Layout_Table.all);
col1.Create (row.all); -- was "NAME"
col2.Create (row.all);
-- View.Name_Input.Create (Form => View.Widget_Form,
-- Size => 40,
-- Name => "Name");
-- -- The Name of the element is its variable name when submitted.
--
-- View.Name_Input.Required;
-- -- By marking Name_Input required, if the submit button is pushed
-- -- it will not allow submission and notify user unless element
-- -- if filled out.
--
-- View.Name_Input.Place_Holder ("(Only letters and spaces permitted)");
-- View.Name_Input.Pattern ("[a-zA-Z\ ]+");
-- -- Allow only a-z, A-Z and space characters
--
-- View.Name_Input.Place_Inside_Top_Of (col2.all);
-- -- Since forms are auto placed inside the Form, we need to move the
-- -- element where we would like it to display.
--
-- Labels(fe_Name).Create(View.Widget_Form, View.Name_Input, "Name:", False);
-- Labels(fe_Name).Place_Inside_Top_Of( col1.all );
---------------------------------
-- View.Stat_Input.Create(
-- -- ID =>,
-- Form => View.Widget_Form,
-- Multiple_Select => False,
-- Visible_Lines => 1,
-- Name => "Conditions"
-- );
-- Add_Selections( View.Widget_Form, View.Stat_Input );
View.Oper_Input.Create(
-- ID =>,
Form => View.Widget_Form,
Multiple_Select => False,
Visible_Lines => 1,
Name => "Observer"
);
if DEBUGGING then
Operators.Append("---DEBUG---");
end if;
Add_Vector( View.Widget_Form, View.Oper_Input,
Operators);
Labels(fe_Observer).Create(View.Widget_Form, View.Oper_Input, "Observer:", True);
view.Weather_Div.Create( view );
view.Observation_Div.Create( View );
--Division_X.Create(Parent, ID => "Weather");
--Weather_Div( Division_X, View );
end;
declare
row : constant Table_Row_Access := new Table_Row_Type;
col1 : constant Table_Column_Access := new Table_Column_Type;
col2 : constant Table_Column_Access := new Table_Column_Type;
begin
row.Dynamic;
col1.Dynamic;
col2.Dynamic;
row.Create (Layout_Table.all);
row.Style ("vertical-align", "top");
col1.Create (row.all, "Message");
col2.Create (row.all);
View.Message.Create (Form => View.Widget_Form,
Columns => (if DEBUGGING then 20 else 120),
Rows => (if DEBUGGING then 10 else 20),
Name => "Message");
View.Message.Style("background-size","100% 1.2em");
View.Message.Style("background-image",
"linear-gradient(90deg, transparent 79px, #abced4 79px, #abced4 81px, transparent 81px),"&
"linear-gradient(#eee .1em, transparent .1em)");
View.Message.Style("Wrap", "hard"); --Word_Wrap(True);
-- NOTE: This limit comes from Gnoga.Server.Connection. Within
-- Gnoga_HTTP_Content type, the Text field is defined as:
-- Aliased Strings_Edit.Streams.String_Stream (500);
View.Message.Attribute("maxlength", "4000" );
View.Message.Place_Inside_Top_Of (col2.all);
end;
View.My_Submit.Create (Form => View.Widget_Form, Value => "Submit");
View.My_Submit.Place_After (Layout_Table.all);
end Create;
End Report_Form;
|
Working Disassembly/Levels/MGZ/Misc Object Data/Map - Head Trigger.asm | TeamASM-Blur/Sonic-3-Blue-Balls-Edition | 5 | 170989 | <gh_stars>1-10
Map_233812: dc.w Frame_233822-Map_233812 ; ...
dc.w Frame_23382A-Map_233812
dc.w Frame_233832-Map_233812
dc.w Frame_23383A-Map_233812
dc.w Frame_233842-Map_233812
dc.w Frame_23384A-Map_233812
dc.w Frame_233852-Map_233812
dc.w Frame_233866-Map_233812
Frame_233822: dc.w 1
dc.b $FC, $C,$E0,$4E,$FF,$F0
Frame_23382A: dc.w 1
dc.b $F8, 1, 0,$44,$FF,$F8
Frame_233832: dc.w 1
dc.b $F8, 1, 0,$46,$FF,$F8
Frame_23383A: dc.w 1
dc.b $F8, 1, 0,$48,$FF,$F8
Frame_233842: dc.w 1
dc.b $F8, 1, 0,$4A,$FF,$F8
Frame_23384A: dc.w 1
dc.b $F8, 1, 0,$4C,$FF,$F8
Frame_233852: dc.w 3
dc.b $E8, 9,$20,$26,$FF,$F8
dc.b $F8, $B, 0,$2C,$FF,$F8
dc.b $18, $B, 0,$38,$FF,$F8
Frame_233866: dc.w 0
|
oeis/040/A040272.asm | neoneye/loda-programs | 11 | 101897 | ; A040272: Continued fraction for sqrt(290).
; Submitted by <NAME>
; 17,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34,34
min $0,1
add $0,1
mul $0,17
|
notes/papers/implicit/examples/Example.agda | asr/agda-kanso | 1 | 6342 |
module Example where
data Nat : Set where
zero : Nat
suc : Nat -> Nat
postulate
case-Nat : (P : Nat -> Set) -> P zero ->
((n:Nat) -> P (suc n)) ->
(n : Nat) -> P n
-- test : Nat -> Nat
test = case-Nat _ zero (\n -> n)
{-
data Size : Set where
empty : Size
nonempty : Size
whatever : Size
data Nat : Set where
zero : Nat
suc : Nat -> Nat
data List (A:Set) : Set where
nil : List A
(::) : A -> List A -> List A
data Monad (M:Set -> Set) : Set1 where
monad : Monad M
postulate
build : {M:Set -> Set} -> Monad M -> {C:Size -> Set} -> (A:Set) ->
(A -> C nonempty) ->
((n:Size) -> List (C n) -> M (List A)) ->
List A -> M (C whatever)
test : (A:Set) -> Nat
test A = build monad A (\x -> x) (\n xs -> xs) nil
-}
|
Transynther/x86/_processed/NONE/_xt_/i7-7700_9_0x48_notsx.log_21829_970.asm | ljhsiun2/medusa | 9 | 10498 | <reponame>ljhsiun2/medusa
.global s_prepare_buffers
s_prepare_buffers:
push %r10
push %r8
push %rax
push %rbp
push %rbx
push %rcx
push %rdi
push %rdx
push %rsi
lea addresses_WT_ht+0xf211, %r8
nop
nop
nop
nop
nop
and $8122, %rbx
movl $0x61626364, (%r8)
nop
nop
nop
nop
nop
and $22702, %rbp
lea addresses_WT_ht+0x1acf2, %rax
clflush (%rax)
nop
dec %rdi
mov $0x6162636465666768, %r10
movq %r10, %xmm2
and $0xffffffffffffffc0, %rax
movntdq %xmm2, (%rax)
nop
nop
nop
nop
inc %rdx
lea addresses_UC_ht+0x1a432, %rbp
nop
nop
nop
nop
nop
xor $40676, %rbx
and $0xffffffffffffffc0, %rbp
vmovntdqa (%rbp), %ymm0
vextracti128 $0, %ymm0, %xmm0
vpextrq $1, %xmm0, %rdi
xor $2832, %r8
lea addresses_normal_ht+0xfa32, %rsi
lea addresses_A_ht+0x10832, %rdi
clflush (%rsi)
clflush (%rdi)
nop
xor $20134, %rdx
mov $70, %rcx
rep movsq
and $8792, %rcx
lea addresses_UC_ht+0x3632, %r10
nop
nop
nop
cmp %rsi, %rsi
mov (%r10), %rbx
nop
add %rbx, %rbx
lea addresses_normal_ht+0x3432, %rsi
lea addresses_WT_ht+0x6432, %rdi
nop
nop
and $8237, %rax
mov $78, %rcx
rep movsl
add %r8, %r8
lea addresses_normal_ht+0x8962, %rdx
nop
add %r10, %r10
movb $0x61, (%rdx)
nop
sub %rcx, %rcx
lea addresses_WT_ht+0x632, %rcx
nop
nop
nop
nop
nop
and $29521, %r10
mov $0x6162636465666768, %rsi
movq %rsi, %xmm5
and $0xffffffffffffffc0, %rcx
vmovaps %ymm5, (%rcx)
nop
nop
nop
nop
nop
add %rbx, %rbx
lea addresses_normal_ht+0x1d196, %rbx
nop
nop
nop
nop
sub %rax, %rax
mov $0x6162636465666768, %rdx
movq %rdx, %xmm6
vmovups %ymm6, (%rbx)
xor %r8, %r8
lea addresses_A_ht+0x67be, %r8
nop
nop
xor $61481, %rdi
mov (%r8), %esi
nop
nop
nop
cmp %rbx, %rbx
lea addresses_A_ht+0x4e32, %rdi
and $29239, %r10
movb (%rdi), %r8b
nop
nop
add $5934, %r8
lea addresses_A_ht+0x4ad2, %rsi
lea addresses_normal_ht+0x317, %rdi
nop
sub %rbx, %rbx
mov $85, %rcx
rep movsw
nop
cmp $16393, %rax
lea addresses_WT_ht+0xeb5e, %rsi
nop
nop
xor $7774, %rbx
movups (%rsi), %xmm0
vpextrq $0, %xmm0, %rbp
nop
nop
nop
nop
nop
xor $51509, %rsi
lea addresses_A_ht+0x16342, %rbx
nop
add $36479, %rdi
movl $0x61626364, (%rbx)
nop
nop
nop
nop
dec %rsi
lea addresses_D_ht+0xb596, %r8
nop
dec %rdi
mov $0x6162636465666768, %rbx
movq %rbx, %xmm5
vmovups %ymm5, (%r8)
nop
nop
nop
add %r10, %r10
pop %rsi
pop %rdx
pop %rdi
pop %rcx
pop %rbx
pop %rbp
pop %rax
pop %r8
pop %r10
ret
.global s_faulty_load
s_faulty_load:
push %r11
push %r13
push %r14
push %r9
push %rbp
push %rdx
// Faulty Load
lea addresses_A+0x15c32, %r14
nop
nop
nop
nop
nop
add $21516, %r9
mov (%r14), %r11
lea oracles, %rdx
and $0xff, %r11
shlq $12, %r11
mov (%rdx,%r11,1), %r11
pop %rdx
pop %rbp
pop %r9
pop %r14
pop %r13
pop %r11
ret
/*
<gen_faulty_load>
[REF]
{'OP': 'LOAD', 'src': {'same': False, 'NT': False, 'AVXalign': False, 'size': 16, 'type': 'addresses_A', 'congruent': 0}}
[Faulty Load]
{'OP': 'LOAD', 'src': {'same': True, 'NT': False, 'AVXalign': False, 'size': 8, 'type': 'addresses_A', 'congruent': 0}}
<gen_prepare_buffer>
{'dst': {'same': False, 'NT': False, 'AVXalign': True, 'size': 4, 'type': 'addresses_WT_ht', 'congruent': 0}, 'OP': 'STOR'}
{'dst': {'same': False, 'NT': True, 'AVXalign': False, 'size': 16, 'type': 'addresses_WT_ht', 'congruent': 6}, 'OP': 'STOR'}
{'OP': 'LOAD', 'src': {'same': False, 'NT': True, 'AVXalign': False, 'size': 32, 'type': 'addresses_UC_ht', 'congruent': 10}}
{'dst': {'same': False, 'congruent': 10, 'type': 'addresses_A_ht'}, 'OP': 'REPM', 'src': {'same': False, 'congruent': 5, 'type': 'addresses_normal_ht'}}
{'OP': 'LOAD', 'src': {'same': False, 'NT': False, 'AVXalign': False, 'size': 8, 'type': 'addresses_UC_ht', 'congruent': 9}}
{'dst': {'same': False, 'congruent': 11, 'type': 'addresses_WT_ht'}, 'OP': 'REPM', 'src': {'same': False, 'congruent': 5, 'type': 'addresses_normal_ht'}}
{'dst': {'same': False, 'NT': False, 'AVXalign': False, 'size': 1, 'type': 'addresses_normal_ht', 'congruent': 4}, 'OP': 'STOR'}
{'dst': {'same': False, 'NT': False, 'AVXalign': True, 'size': 32, 'type': 'addresses_WT_ht', 'congruent': 9}, 'OP': 'STOR'}
{'dst': {'same': True, 'NT': False, 'AVXalign': False, 'size': 32, 'type': 'addresses_normal_ht', 'congruent': 2}, 'OP': 'STOR'}
{'OP': 'LOAD', 'src': {'same': False, 'NT': False, 'AVXalign': False, 'size': 4, 'type': 'addresses_A_ht', 'congruent': 2}}
{'OP': 'LOAD', 'src': {'same': False, 'NT': False, 'AVXalign': False, 'size': 1, 'type': 'addresses_A_ht', 'congruent': 7}}
{'dst': {'same': False, 'congruent': 0, 'type': 'addresses_normal_ht'}, 'OP': 'REPM', 'src': {'same': False, 'congruent': 3, 'type': 'addresses_A_ht'}}
{'OP': 'LOAD', 'src': {'same': False, 'NT': False, 'AVXalign': False, 'size': 16, 'type': 'addresses_WT_ht', 'congruent': 1}}
{'dst': {'same': True, 'NT': True, 'AVXalign': False, 'size': 4, 'type': 'addresses_A_ht', 'congruent': 3}, 'OP': 'STOR'}
{'dst': {'same': True, 'NT': False, 'AVXalign': False, 'size': 32, 'type': 'addresses_D_ht', 'congruent': 2}, 'OP': 'STOR'}
{'35': 21829}
35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35
*/
|
engine/engine/video/declarations/draw/pixel.asm | neomura/atmega328p-cartridge | 0 | 82225 | ; Draws a point on the current scanline.
; Clobbers r30 and r31.
; - A r* to clobber.
; - A r* to clobber.
; - A r* containing the number of pixels between the left edge of the screen and the point to draw.
; - A r* containing the color to use, repeated to fill the byte.
.macro draw_pixel
; This will detect both being left of 0, and right of VIDEO_COLUMNS.
cpi @2, VIDEO_COLUMNS
brsh video_point_end
; Determine which byte we need to write to.
mov @0, @2
lsr @0
lsr @0
; Load this into Z.
load_framebuffer_z
add r30, @0
ldi @0, 0
adc r31, @0
; Read the pixel we'll be modifying and make a copy of the color we'll be using.
ld @0, Z
mov @1, @3
; Determine which crumb we'll be modifying - checking the high bit here, so between 0, 1 and 2, 3.
sbrc @2, 1
rjmp video_point_2_3
; Determine which crumb we'll be modifying - checking the low bit here where the high bit is 0, so between 0 and 1.
sbrc @2, 0
rjmp video_point_1
; It's crumb 0.
andi @0, 0b00111111
andi @1, 0b11000000
rjmp video_point_write_and_end
video_point_1:
andi @0, 0b11001111
andi @1, 0b00110000
rjmp video_point_write_and_end
; Determine which crumb we'll be modifying - checking the low bit here where the high bit is 1, so between 2 and 3.
video_point_2_3:
sbrc @2, 0
rjmp video_point_3
; It's crumb 2.
andi @0, 0b11110011
andi @1, 0b00001100
rjmp video_point_write_and_end
video_point_3:
andi @0, 0b11111100
andi @1, 0b00000011
video_point_write_and_end:
or @0, @1
st Z, @0
video_point_end:
.endm
|
tmux/spotify.scpt | malramsay64/dotfiles | 2 | 3647 | (* Get the current song from spotify *)
if application "Spotify" is running then
tell application "Spotify"
set theName to name of the current track
set theArtist to artist of the current track
set theAlbum to album of the current track
set theState to player state as string
if theState is "playing" then
set stateSym to "ο "
else
set stateSym to "ο "
end if
try
return " β« " & stateSym & " " & theName & " - " & theArtist
on error err
end try
end tell
end if
|
Transynther/x86/_processed/NONE/_zr_/i7-7700_9_0xca.log_21829_1181.asm | ljhsiun2/medusa | 9 | 12052 | <reponame>ljhsiun2/medusa<gh_stars>1-10
.global s_prepare_buffers
s_prepare_buffers:
push %r10
push %r12
push %r13
push %r14
push %r15
push %r9
push %rbp
push %rcx
push %rdi
push %rsi
lea addresses_WT_ht+0x13ac2, %r10
nop
nop
cmp $24299, %r12
vmovups (%r10), %ymm0
vextracti128 $1, %ymm0, %xmm0
vpextrq $1, %xmm0, %r15
nop
inc %r9
lea addresses_WC_ht+0x19ec2, %r13
and $22496, %r14
mov (%r13), %ebp
xor $33759, %r14
lea addresses_WT_ht+0x1eac7, %rsi
lea addresses_D_ht+0x19d42, %rdi
nop
nop
and $46487, %rbp
mov $52, %rcx
rep movsq
nop
nop
nop
xor $557, %r12
lea addresses_WT_ht+0x18d82, %rsi
lea addresses_normal_ht+0x9c2, %rdi
nop
xor %r12, %r12
mov $84, %rcx
rep movsl
nop
nop
dec %rbp
lea addresses_normal_ht+0xccc2, %rsi
lea addresses_normal_ht+0x897a, %rdi
nop
sub %r15, %r15
mov $43, %rcx
rep movsb
nop
nop
nop
dec %r14
pop %rsi
pop %rdi
pop %rcx
pop %rbp
pop %r9
pop %r15
pop %r14
pop %r13
pop %r12
pop %r10
ret
.global s_faulty_load
s_faulty_load:
push %r11
push %r15
push %r8
push %rax
push %rdx
push %rsi
// Faulty Load
lea addresses_WC+0x81c2, %r11
nop
nop
nop
sub $59475, %r8
mov (%r11), %rsi
lea oracles, %r8
and $0xff, %rsi
shlq $12, %rsi
mov (%r8,%rsi,1), %rsi
pop %rsi
pop %rdx
pop %rax
pop %r8
pop %r15
pop %r11
ret
/*
<gen_faulty_load>
[REF]
{'src': {'congruent': 0, 'AVXalign': False, 'same': True, 'size': 16, 'NT': False, 'type': 'addresses_WC'}, 'OP': 'LOAD'}
[Faulty Load]
{'src': {'congruent': 0, 'AVXalign': False, 'same': True, 'size': 8, 'NT': False, 'type': 'addresses_WC'}, 'OP': 'LOAD'}
<gen_prepare_buffer>
{'src': {'congruent': 8, 'AVXalign': False, 'same': False, 'size': 32, 'NT': False, 'type': 'addresses_WT_ht'}, 'OP': 'LOAD'}
{'src': {'congruent': 7, 'AVXalign': False, 'same': False, 'size': 4, 'NT': False, 'type': 'addresses_WC_ht'}, 'OP': 'LOAD'}
{'src': {'congruent': 0, 'same': False, 'type': 'addresses_WT_ht'}, 'OP': 'REPM', 'dst': {'congruent': 4, 'same': False, 'type': 'addresses_D_ht'}}
{'src': {'congruent': 5, 'same': False, 'type': 'addresses_WT_ht'}, 'OP': 'REPM', 'dst': {'congruent': 6, 'same': False, 'type': 'addresses_normal_ht'}}
{'src': {'congruent': 8, 'same': False, 'type': 'addresses_normal_ht'}, 'OP': 'REPM', 'dst': {'congruent': 1, 'same': False, 'type': 'addresses_normal_ht'}}
{'00': 21829}
00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00
*/
|
tools/yasm/tests/nasm/error1.asm | fasttr-org/ftr | 0 | 19998 | <reponame>fasttr-org/ftr
BITS 16
mov ax, es:[di]
|
samples/upload_servlet.ads | My-Colaborations/ada-servlet | 0 | 903 | -----------------------------------------------------------------------
-- upload_servlet -- Servlet example to upload files on the server
-- Copyright (C) 2012, 2018 <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 Servlet.Core;
with Servlet.Requests;
with Servlet.Responses;
with servlet.Streams;
package Upload_Servlet is
use Servlet;
type File_Type is (IMAGE, PDF, TAR_GZ, TAR, ZIP, UNKNOWN);
-- Guess a file type depending on a content type or a file name.
function Get_File_Type (Content_Type : in String;
Name : in String) return File_Type;
-- Execute a command and write the result to the output stream.
procedure Execute (Command : in String;
Output : in out Streams.Print_Stream);
-- The <b>Servlet</b> represents the component that will handle
-- an HTTP request received by the server.
type Servlet is new Core.Servlet with null record;
-- Called by the servlet container when a GET request is received.
-- Display the upload form page.
procedure Do_Get (Server : in Servlet;
Request : in out Requests.Request'Class;
Response : in out Responses.Response'Class);
-- Called by the servlet container when a POST request is received.
-- Receives the uploaded files and identify them using some external command.
procedure Do_Post (Server : in Servlet;
Request : in out Requests.Request'Class;
Response : in out Responses.Response'Class);
private
-- Write the upload form page with an optional response message.
procedure Write (Response : in out Responses.Response'Class;
Message : in String);
end Upload_Servlet;
|
Control Statements/tell/iCal/calendars/events/properties.applescript | looking-for-a-job/applescript-examples | 1 | 4575 | <filename>Control Statements/tell/iCal/calendars/events/properties.applescript
#!/usr/loca/bin/osascript
tell application "iCal"
repeat with c in every calendar
tell c
repeat with e in every events
get properties of e
end repeat
end tell
end repeat
end tell |
core/src/main/antlr/apoc/custom/Signature.g4 | alexwoolford/neo4j-apoc-procedures | 1,481 | 1431 | <reponame>alexwoolford/neo4j-apoc-procedures<gh_stars>1000+
grammar Signature;
procedure: namespace? name '(' (parameter',')*(parameter)? ')' '::' results ;
function: namespace? name '(' (parameter',')*(parameter)? ')' '::' (type | '(' type ')');
results: empty | '(' (result',')*(result) ')' ;
parameter: name ('=' defaultValue)? '::' type ;
result: name '::' type ;
namespace: (name'.')+ ;
name: IDENTIFIER | QUOTED_IDENTIFIER ;
empty: 'VOID' ;
type: opt_type | list_type ;
defaultValue: value;
list_type: 'LIST''?'?' OF '+opt_type ;
opt_type: base_type'?'? ;
base_type: 'MAP' | 'ANY' | 'NODE' | 'REL' | 'RELATIONSHIP' | 'EDGE' | 'PATH' | 'NUMBER' | 'LONG' | 'INT' | 'INTEGER' | 'FLOAT' | 'DOUBLE' | 'BOOL' | 'BOOLEAN' | 'DATE' | 'TIME' | 'LOCALTIME' | 'DATETIME' | 'LOCALDATETIME' | 'DURATION' | 'POINT' | 'GEO' | 'GEOMETRY' | 'STRING' | 'TEXT' ;
NEWLINE: [\r\n]+ ;
QUOTED_IDENTIFIER: '`' [^`]+? '`' ;
IDENTIFIER: [a-zA-Z_][a-zA-Z0-9_]+ ;
WS: [ \t\r\n]+ -> skip ;
value: nullValue | INT_VALUE | FLOAT_VALUE | boolValue | mapValue | listValue | stringValue;
INT_VALUE: [0-9]+;
FLOAT_VALUE: ([0-9]+'.'[0-9]+) | 'NaN';
boolValue: 'true'|'false';
stringValue: QUOTED_STRING_VALUE | PLAIN_STRING_VALUE;
QUOTED_STRING_VALUE: '"'[^"]+?'"';
PLAIN_STRING_VALUE: .+?;
nullValue: 'null';
listValue: '[' ((value',')*value)?']';
mapValue: '{' (((name ':' value)',')*(name ':' value) | ((name '=' value)',')*(name '=' value))? '}';
|
src/main/antlr/MyGrammar.g4 | joaofel-u/ine5426-compiladores | 0 | 7373 | /**
* Developed by:
* @JoΓ£o_Fellipe_Uller
* @Leonardo_Kreuch
* @Uriel_Kindermann_Caminha
*/
grammar MyGrammar;
@header {
package main.antlr;
}
/*channels {
ERROR
}*/
/*options {
superClass = T1Lexer;
}*/
program: statement | funclist | ;
funclist: funcdef funclistaux;
funclistaux: funclist | ;
funcdef: Def Ident Lparen paramlist Rparen Lbrace statelist Rbrace;
paramlist: vartype Ident paramlistaux | ;
paramlistaux: Comma paramlist | ;
statement:
vardecl Semicolon |
atribstat Semicolon |
printstat Semicolon |
readstat Semicolon |
returnstat Semicolon |
ifstat |
forstat |
Lbrace statelist Rbrace |
breakstat |
Semicolon;
vardecl: vartype Ident vardeclaux;
vardeclaux: Lbracket Int_constant Rbracket vardeclaux | ;
vartype: Int | Float | String;
atribstat: lvalue Assign atribstataux;
atribstataux: expression | allocexpression | funccall;
funccall: Ident Lparen paramlistcall Rparen;
paramlistcall: Ident paramlistcallaux | ;
paramlistcallaux: Comma paramlistcall | ;
printstat: Print expression;
readstat: Read lvalue;
returnstat: Return;
breakstat: Break Semicolon;
ifstat: If Lparen expression Rparen statement elsestat;
elsestat: Else statement | ;
forstat: For Lparen atribstat Semicolon expression Semicolon atribstat Rparen statement;
statelist: statement statelistaux;
statelistaux: statelist | ;
allocexpression: New vartype Lbracket numexpression Rbracket allocexpressionaux;
allocexpressionaux: Lbracket numexpression Rbracket allocexpressionaux2 | ;
allocexpressionaux2: Lbracket numexpression Rbracket allocexpressionaux | ;
expression: numexpression expressionaux;
expressionaux: comparator numexpression | ;
comparator:
Lesser |
Greater |
Lesserequal |
Greaterequal |
Equal |
Different ;
numexpression: term numexpressionaux;
numexpressionaux: minusplus numexpression | ;
term: unaryexpr termaux;
termaux: operators unaryexpr termaux | ;
minusplus: Plus | Minus;
operators: Multiply | Divide | Module;
unaryexpr: minusplus factor | factor;
factor:
Int_constant |
Float_constant |
String_constant |
Null |
lvalue |
Lparen numexpression Rparen ;
lvalue: Ident allocexpressionaux;
/**
* Reserved words.
*/
Def : 'def';
Int : 'int';
Float : 'float';
String : 'string';
Print : 'print';
Read : 'read';
Return : 'return';
Break : 'break';
If : 'if';
Else : 'else';
For : 'for';
New : 'new';
Null : 'null';
/**
* Language elements.
*/
Ident : LETTER (LETTER | DIGIT)*;
Int_constant : DIGIT+;
Float_constant : DIGIT+ '.' DIGIT+;
String_constant : '"' ('\\' | ALPHABET)*? '"';
Whitespace : WHITESPACE -> skip;
/**
* Graphic signals.
*/
Lparen : '(';
Rparen : ')';
Lbrace : '{';
Rbrace : '}';
Lbracket : '[';
Rbracket : ']';
Semicolon : ';';
Comma : ',';
Assign : '=';
Lesser : '<';
Greater : '>';
Lesserequal : '<=';
Greaterequal : '>=';
Equal : '==';
Different : '!=';
Plus : '+';
Minus : '-';
Multiply : '*';
Divide : '/';
Module : '%';
/**
* Fragments.
*/
fragment DIGIT : [0-9];
fragment LETTER : ([a-z] | [A-Z]);
fragment PUNCTUATION : ('.' | ',' | ':' | ';' | '!' | '?');
fragment GRAPHICS : ('$' | '&' | '@' | '#' | '%' | '{' | '}' | '[' | ']' | '(' | ')' | '|' | '_');
fragment RELOPS : ('+' | '-' | '*' | '/' | '>' | '<' | '=');
fragment WHITESPACE : (' ' | '\t' | '\n' | '\r')+;
fragment ALPHABET : (DIGIT | LETTER | PUNCTUATION | GRAPHICS | RELOPS | ' ');
|
language/Data.g4 | phodal/data | 0 | 2208 | <reponame>phodal/data
grammar Data;
compilationUnit
: importDeclaration* typeDeclaration* EOF
;
importDeclaration
: IMPORT IDENTIFIER
;
typeDeclaration
: operationDeclaration
| ruleDeclaration
| typeTypeDeclaration
| customTypeDeclaration
;
customTypeDeclaration
: 'type' typeName '{' typeAttribute* '}'
;
typeName: IDENTIFIER;
typeAttribute
: 'name' ':'
;
//
typeTypeDeclaration
: TYPETYPE IDENTIFIER '{' attribute* '}'
;
attribute: IDENTIFIER ':' predefinedType;
predefinedType: IDENTIFIER;
TYPETYPE
: 'string'
| 'number'
| 'array'
;
operationDeclaration
: OPERAPTION
;
OPERAPTION: 'operaption';
//
ruleDeclaration: RULE IDENTIFIER TRANSFORM sourceModel TO targetModel;
sourceModel: IDENTIFIER;
targetModel: IDENTIFIER;
RULE: 'rule';
TRANSFORM: 'transform';
TO: 'to';
IMPORT: 'import';
IDENTIFIER: Letter LetterOrDigit*;
// Whitespace and comments
WS: [ \t\r\n\u000C]+ -> channel(HIDDEN);
COMMENT: '/*' .*? '*/' -> channel(HIDDEN);
LINE_COMMENT: '//' ~[\r\n]* -> channel(HIDDEN);
fragment LetterOrDigit
: Letter
| [0-9]
;
fragment Letter
: [a-zA-Z$_] // these are the "java letters" below 0x7F
| ~[\u0000-\u007F\uD800-\uDBFF] // covers all characters above 0x7F which are not a surrogate
| [\uD800-\uDBFF] [\uDC00-\uDFFF] // covers UTF-16 surrogate pairs encodings for U+10000 to U+10FFFF
;
|
src/Black.Beard.Suggestion/Black.Beard.Suggestion.Parser/grammar/Suggestion.g4 | gaelgael5/Suggestion | 0 | 144 | /** Grammar definition for suggestion language
version 1.0
*/
grammar Suggestion;
options
{
}
AND: '&';
ANDALSO: '&&';
OR: '|';
XOR: '||';
NOT: '!';
K_ALL: A L L;
K_SHOW: S H O W;
K_WHERE: W H E R E;
K_WITH : W I T H;
K_FACETS : F A C E T S;
K_ORDER : O R D E R;
K_BY : B Y;
DIGIT: [0-9];
IDENTIFIER
: [a-zA-Z_] [a-zA-Z_0-9]*
;
COMMENT_INPUT
: '/*' .*? '*/' -> channel(HIDDEN);
LINE_COMMENT:
(
( '-- ' | '#') ~[\r\n]* ('\r'? '\n' | EOF)
| '--' ('\r'? '\n' | EOF)
) -> channel(HIDDEN);
/*
################## LEXER RULES ##################
*/
stmt_list
: ';'* stmt_line ( ';'+ stmt_line )* ';'*
;
stmt_line
: stmt_show
| select_stmt
| stmt_Set_globalParameter
| stmt_Del_globalParameter
;
/*
################## Show ##################
*/
stmt_show
: K_SHOW any_name any_name?
;
/*
################## Parameters ##################
*/
stmt_Set_globalParameter
: 'SET' any_name '=' stmt_Set_globalParameter_literal
;
stmt_Set_globalParameter_literal
: numeric_literal
| string_literal_expr
| char_literal_expr
| datetime_expr
;
stmt_Del_globalParameter
: 'DEL' any_name
;
/*
################## SELECT RULES ##################
*/
select_stmt
: where_stmt order_stmt? facet_stmt?
;
where_stmt
: K_WHERE (expr | K_ALL)
;
order_stmt
: K_ORDER K_BY identifier_stmt
;
facet_stmt
: K_WITH K_FACETS IDENTIFIER ( ',' IDENTIFIER )*
;
function_stmt
: function_name '(' function_args_stmt? ')'
;
function_args_stmt
: expr ( ',' expr )*
;
identifier_stmt
: IDENTIFIER ('.' IDENTIFIER)*
;
bind_parameter
: ':' IDENTIFIER
;
constant
: '$' IDENTIFIER
;
variable
: '@' IDENTIFIER
;
Char_literal
: '\'' ( ~'\'' | '\'\'' ) '\''
;
String_literal
: '"' ( ~'"' | '""' )* '"'
;
numeric_literal
: numeric_double_literal
| numeric_integer_literal
;
numeric_integer_literal
: '-'? DIGIT+
;
numeric_double_literal
: '-'? DIGIT + '.' DIGIT+
;
binary_operator
: AND | OR | ANDALSO | XOR
;
unary_operator
: NOT
;
expr
: literal
| array_expr
| bind_parameter
| sub_expr
| unary_operator_expr
| expr binary_operator expr
| function_stmt
;
sub_expr
: '(' expr ')'
;
unary_operator_expr
: unary_operator expr
;
array_expr
: '[' literal? ( ',' literal )* ']'
;
literal
: numeric_literal
| string_literal_expr
| char_literal_expr
| datetime_expr
| constant
| variable
;
function_name
: any_name
;
any_name
: IDENTIFIER
;
string_literal_expr
: String_literal
;
char_literal_expr
: Char_literal
;
datetime_expr
: Datetime (datetime_mask datetime_culture?)?
;
datetime_mask
: String_literal
;
datetime_culture
: String_literal
;
Datetime
: '/' ~'/'* '/'
;
fragment A: [aA];
fragment B: [bB];
fragment C: [cC];
fragment D: [dD];
fragment E: [eE];
fragment F: [fF];
fragment G: [gG];
fragment H: [hH];
fragment I: [iI];
fragment J: [jJ];
fragment K: [kK];
fragment L: [lL];
fragment M: [mM];
fragment N: [nN];
fragment O: [oO];
fragment P: [pP];
fragment Q: [qQ];
fragment R: [rR];
fragment S: [sS];
fragment T: [tT];
fragment U: [uU];
fragment V: [vV];
fragment W: [wW];
fragment X: [xX];
fragment Y: [yY];
fragment Z: [zZ];
|
Types.agda | iwilare/imp-semantics | 6 | 6295 | <filename>Types.agda
open import Data.Nat using (β) renaming (_+_ to _+α΅’_; _β€?_ to _β€?α΅’_)
open import Agda.Builtin.Float renaming (primFloatPlus to _+α΅£_; primFloatLess to _β€?α΅£_)
open import Data.Bool using (Bool; true; false; not; _β§_)
open import Data.Sum using (injβ; injβ; _β_)
open import Data.Product using (_Γ_; _,_; -,_; _-,-_; β; β-syntax; projβ)
open import Data.String using (String; _β_)
open import Relation.Nullary using (Β¬_; yes; no)
open import Relation.Nullary.Decidable using (β_β)
open import Relation.Nullary.Negation using (contradiction)
open import Relation.Binary.PropositionalEquality using (_β‘_; refl; sym)
vname = String
int = β
real = Float
bool = Bool
data val : Set where
Iv : int β val
Rv : real β val
data aexp : Set where
Ic : int β aexp
Rc : real β aexp
V : vname β aexp
Plus : aexp β aexp β aexp
data bexp : Set where
Bc : Bool β bexp
Not : bexp β bexp
And : bexp β bexp β bexp
Less : aexp β aexp β bexp
data com : Set where
SKIP : com
_::=_ : String β aexp β com
_::_ : com β com β com
IF_THEN_ELSE_ : bexp β com β com β com
WHILE_DO_ : bexp β com β com
data ty : Set where
Ity : ty
Rty : ty
tyenv = vname β ty
state = vname β val
_[_::=_] : state β vname β val β state
(s [ X ::= n ]) Y with Y β X
... | yes _ = n
... | no _ = s Y
data _β’β_β·_ : tyenv β aexp β ty β Set where
taexpI : β{Ξ i} β Ξ β’β Ic i β· Ity
taexpR : β{Ξ r} β Ξ β’β Rc r β· Rty
taexpV : β{Ξ x} β Ξ β’β V x β· Ξ x
taexpP : β{Ξ aβ aβ Ο}
β Ξ β’β aβ β· Ο
β Ξ β’β aβ β· Ο
β Ξ β’β Plus aβ aβ β· Ο
data _β’β_ : tyenv β bexp β Set where
tbexpC : β{Ξ v} β Ξ β’β Bc v
tbexpN : β{Ξ b} β Ξ β’β b
β Ξ β’β Not b
tbexpA : β{Ξ bβ bβ}
β Ξ β’β bβ
β Ξ β’β bβ
β Ξ β’β And bβ bβ
tbexpL : β{Ξ aβ aβ Ο}
β Ξ β’β aβ β· Ο
β Ξ β’β aβ β· Ο
β Ξ β’β Less aβ aβ
data _β’_ : tyenv β com β Set where
TSkip : β{Ξ} β Ξ β’ SKIP
TLoc : β{Ξ a x} β Ξ β’β a β· Ξ x
β Ξ β’ (x ::= a)
TSeq : β{Ξ cβ cβ}
β Ξ β’ cβ
β Ξ β’ cβ
β Ξ β’ (cβ :: cβ)
TIf : β{Ξ b cβ cβ}
β Ξ β’β b
β Ξ β’ cβ
β Ξ β’ cβ
β Ξ β’ (IF b THEN cβ ELSE cβ)
TWhile : β{Ξ b c}
β Ξ β’β b
β Ξ β’ c
β Ξ β’ (WHILE b DO c)
type : val β ty
type (Iv i) = Ity
type (Rv r) = Rty
_β’β_ : tyenv β state β Set
Ξ β’β s = β x β type (s x) β‘ Ξ x
data taval : aexp β state β val β Set where
tavalI : β{i s}
β taval (Ic i) s (Iv i)
tavalR : β{r s}
β taval (Rc r) s (Rv r)
tavalV : β{x s}
β taval (V x) s (s x)
tavalSI : β{s aβ aβ iβ iβ}
β taval aβ s (Iv iβ)
β taval aβ s (Iv iβ)
β taval (Plus aβ aβ) s (Iv (iβ +α΅’ iβ))
tavalSR : β{s aβ aβ rβ rβ}
β taval aβ s (Rv rβ)
β taval aβ s (Rv rβ)
β taval (Plus aβ aβ) s (Rv (rβ +α΅£ rβ))
data tbval : bexp β state β bool β Set where
tbvalC : β{s v}
β tbval (Bc v) s v
tbvalN : β{s b bv}
β tbval b s bv
β tbval (Not b) s (not bv)
tbvalA : β{s bβ bβ bvβ bvβ}
β tbval bβ s bvβ
β tbval bβ s bvβ
β tbval (And bβ bβ) s (bvβ β§ bvβ)
tbvalLI : β{s aβ aβ iβ iβ}
β taval aβ s (Iv iβ)
β taval aβ s (Iv iβ)
β tbval (Less aβ aβ) s (β iβ β€?α΅’ iβ β)
tbvalLR : β{s aβ aβ rβ rβ}
β taval aβ s (Rv rβ)
β taval aβ s (Rv rβ)
β tbval (Less aβ aβ) s (rβ β€?α΅£ rβ)
data β¦
_,_β¦ββ¦
_,_β¦ : com β state β com β state β Set where
Loc : β{x a s v}
β taval a s v
β β¦
x ::= a , s β¦ββ¦
SKIP , s [ x ::= v ] β¦
Compβ : β{c s}
β β¦
SKIP :: c , s β¦ββ¦
c , s β¦
Compβ : β{cβ cββ² cβ s sβ²}
β β¦
cβ , s β¦ββ¦
cββ² , sβ² β¦
β β¦
cβ :: cβ , s β¦ββ¦
cββ² :: cβ , sβ² β¦
IfTrue : β{b s cβ cβ}
β tbval b s true
β β¦
IF b THEN cβ ELSE cβ , s β¦ββ¦
cβ , s β¦
IfFalse : β{b s cβ cβ}
β tbval b s false
β β¦
IF b THEN cβ ELSE cβ , s β¦ββ¦
cβ , s β¦
While : β{b s c}
β β¦
WHILE b DO c , s β¦ββ¦
IF b THEN (c :: (WHILE b DO c)) ELSE SKIP , s β¦
data β¦
_,_β¦β*β¦
_,_β¦ : com β state β com β state β Set where
Ref : β{c s} β β¦
c , s β¦β*β¦
c , s β¦
Step : β{c cβ² cΒ² s sβ² sΒ²}
β β¦
c , s β¦ββ¦
cβ² , sβ² β¦
β β¦
cβ² , sβ² β¦β*β¦
cΒ² , sΒ² β¦
β β¦
c , s β¦β*β¦
cΒ² , sΒ² β¦
trans : β{c cβ² cΒ² s sβ² sΒ²}
β β¦
c , s β¦β*β¦
cβ² , sβ² β¦
β β¦
cβ² , sβ² β¦β*β¦
cΒ² , sΒ² β¦
β β¦
c , s β¦β*β¦
cΒ² , sΒ² β¦
trans Ref b = b
trans (Step x a) b = Step x (trans a b)
preservation-aval : β{Ξ a s Ο v}
β Ξ β’β a β· Ο
β Ξ β’β s
β taval a s v
β type v β‘ Ο
preservation-aval taexpI b tavalI = refl
preservation-aval taexpR b tavalR = refl
preservation-aval taexpV b (tavalV {x}) = b x
preservation-aval (taexpP a aβ) b (tavalSI c cβ) = preservation-aval aβ b cβ
preservation-aval (taexpP a aβ) b (tavalSR c cβ) = preservation-aval aβ b cβ
extract-ity : β v
β type v β‘ Ity
β β[ i ] (v β‘ Iv i)
extract-ity (Iv x) r = x , refl
extract-rty : β v
β type v β‘ Rty
β β[ i ] (v β‘ Rv i)
extract-rty (Rv x) r = x , refl
progress-aval : β{Ξ a s Ο}
β Ξ β’β a β· Ο
β Ξ β’β s
β β[ v ] (taval a s v)
progress-aval taexpI b = -, tavalI
progress-aval taexpR b = -, tavalR
progress-aval taexpV b = -, tavalV
progress-aval {Ο = Ity} (taexpP aβ aβ) b with progress-aval aβ b | progress-aval aβ b
... | rv , r | mv , m with extract-ity rv (preservation-aval aβ b r)
| extract-ity mv (preservation-aval aβ b m)
... | v1 , e1 | v2 , e2 rewrite e1 | e2 = -, tavalSI r m
progress-aval {Ο = Rty} (taexpP aβ aβ) b with progress-aval aβ b | progress-aval aβ b
... | rv , r | mv , m with extract-rty rv (preservation-aval aβ b r)
| extract-rty mv (preservation-aval aβ b m)
... | v1 , e1 | v2 , e2 rewrite e1 | e2 = -, tavalSR r m
progress-bval : β{Ξ b s}
β Ξ β’β b
β Ξ β’β s
β β[ v ] (tbval b s v)
progress-bval tbexpC xβ = -, tbvalC
progress-bval (tbexpN x) xβ = -, tbvalN (projβ (progress-bval x xβ))
progress-bval (tbexpA a b) x = -, tbvalA (projβ (progress-bval a x))
(projβ (progress-bval b x))
progress-bval (tbexpL {Ο = Ity} aβ aβ) b with progress-aval aβ b | progress-aval aβ b
... | rv , r | mv , m with extract-ity rv (preservation-aval aβ b r)
| extract-ity mv (preservation-aval aβ b m)
... | v1 , e1 | v2 , e2 rewrite e1 | e2 = -, tbvalLI r m
progress-bval (tbexpL {Ο = Rty} aβ aβ) b with progress-aval aβ b | progress-aval aβ b
... | rv , r | mv , m with extract-rty rv (preservation-aval aβ b r)
| extract-rty mv (preservation-aval aβ b m)
... | v1 , e1 | v2 , e2 rewrite e1 | e2 = -, tbvalLR r m
preservation-com : β{Ξ c s cβ² sβ²}
β β¦
c , s β¦ββ¦
cβ² , sβ² β¦
β Ξ β’ c
β Ξ β’ cβ²
preservation-com (Loc xβ) (TLoc xβ) = TSkip
preservation-com Compβ (TSeq b bβ) = bβ
preservation-com (Compβ a) (TSeq b bβ) = TSeq (preservation-com a b) bβ
preservation-com (IfTrue x) (TIf xβ b bβ) = b
preservation-com (IfFalse x) (TIf xβ b bβ) = bβ
preservation-com While (TWhile x b) = TIf x (TSeq b (TWhile x b)) TSkip
preservation-state : β{Ξ c s cβ² sβ²}
β β¦
c , s β¦ββ¦
cβ² , sβ² β¦
β Ξ β’ c
β Ξ β’β s
β Ξ β’β sβ²
preservation-state (Loc {xβ} xβ) (TLoc xβ) r xβ with xβ β xβ
... | no Β¬p = r xβ
... | yes p with preservation-aval xβ r xβ
... | z rewrite p = z
preservation-state Compβ (TSeq c cβ) r = r
preservation-state (Compβ d) (TSeq c cβ) r = preservation-state d c r
preservation-state (IfTrue x) (TIf xβ c cβ) r = r
preservation-state (IfFalse x) (TIf xβ c cβ) r = r
preservation-state While (TWhile x c) r = r
preservation : β{Ξ c s cβ² sβ²}
β Ξ β’ c
β Ξ β’β s
β β¦
c , s β¦ββ¦
cβ² , sβ² β¦
β Ξ β’ cβ² Γ Ξ β’β sβ²
preservation a b c = preservation-com c a , preservation-state c a b
either-skip : β c
β c β‘ SKIP β Β¬ c β‘ SKIP
either-skip SKIP = injβ refl
either-skip (x ::= xβ) = injβ (Ξ» ())
either-skip (c :: cβ) = injβ (Ξ» ())
either-skip (IF x THEN c ELSE cβ) = injβ (Ξ» ())
either-skip (WHILE x DO c) = injβ (Ξ» ())
progress : β{Ξ c s}
β Ξ β’ c
β Ξ β’β s
β Β¬ c β‘ SKIP
β β[ cβ² ] (β[ sβ² ] ( β¦
c , s β¦ββ¦
cβ² , sβ² β¦ ))
progress TSkip b c = contradiction refl c
progress {s = s} (TLoc x) b _ = SKIP , -, Loc (projβ (progress-aval x b))
progress {s = s} (TSeq {_}{cβ}{cβ} a aβ) b _ with either-skip cβ
... | injβ skip rewrite skip = cβ , s , Compβ
... | injβ Β¬skip = let cββ² , sβ² , r = progress a b Β¬skip
in cββ² :: cβ , sβ² , Compβ r
progress (TIf x a aβ) b _ with progress-bval x b
... | false , tb = -, -, IfFalse tb
... | true , tb = -, -, IfTrue tb
progress (TWhile x a) b _ = -, -, While
type-soundness : β{c s cβ² sβ² Ξ}
β β¦
c , s β¦β*β¦
cβ² , sβ² β¦
β Ξ β’ c
β Ξ β’β s
β Β¬ cβ² β‘ SKIP
β β[ cβ³ ] (β[ sβ³ ] ( β¦
cβ² , sβ² β¦ββ¦
cβ³ , sβ³ β¦ ))
type-soundness Ref c d e = progress c d e
type-soundness (Step x r) c d e with preservation c d x
... | ct , st = type-soundness r ct st e
|
libsrc/_DEVELOPMENT/arch/zxn/memory/c/sccz80/zxn_page_from_addr.asm | jpoikela/z88dk | 38 | 84006 | ; unsigned char zxn_page_from_addr(uint32_t addr)
SECTION code_clib
SECTION code_arch
PUBLIC zxn_page_from_addr
EXTERN asm_zxn_page_from_addr
defc zxn_page_from_addr = asm_zxn_page_from_addr
|
agda-stdlib/src/Data/List/Membership/Propositional.agda | DreamLinuxer/popl21-artifact | 5 | 16785 | ------------------------------------------------------------------------
-- The Agda standard library
--
-- Data.List.Any.Membership instantiated with propositional equality,
-- along with some additional definitions.
------------------------------------------------------------------------
{-# OPTIONS --without-K --safe #-}
module Data.List.Membership.Propositional {a} {A : Set a} where
open import Data.List.Relation.Unary.Any using (Any)
open import Relation.Binary.PropositionalEquality using (_β‘_; _β’_; setoid; subst)
import Data.List.Membership.Setoid as SetoidMembership
------------------------------------------------------------------------
-- Re-export contents of setoid membership
open SetoidMembership (setoid A) public hiding (lose)
------------------------------------------------------------------------
-- Different members
_β’β_ : β {x y : A} {xs} β x β xs β y β xs β Set _
_β’β_ xβxs yβxs = β xβ‘y β subst (_β _) xβ‘y xβxs β’ yβxs
------------------------------------------------------------------------
-- Other operations
lose : β {p} {P : A β Set p} {x xs} β x β xs β P x β Any P xs
lose = SetoidMembership.lose (setoid A) (subst _)
|
experiments/test-suite/mutation-based/10/1/nqueens.als | kaiyuanw/AlloyFLCore | 1 | 3526 | <filename>experiments/test-suite/mutation-based/10/1/nqueens.als
pred test63 {
some disj Queen0: Queen {
Queen = Queen0
row = Queen0->0
col = Queen0->-8
}
}
run test63 for 4 expect 0
pred test14 {
some disj Queen0, Queen1, Queen2, Queen3: Queen {
Queen = Queen0 + Queen1 + Queen2 + Queen3
row = Queen0->0 + Queen1->0 + Queen2->1 + Queen3->0
col = Queen0->2 + Queen1->0 + Queen2->1 + Queen3->0
nothreat[Queen3,Queen2]
}
}
run test14 for 4 expect 0
pred test21 {
some disj Queen0, Queen1, Queen2, Queen3: Queen {
Queen = Queen0 + Queen1 + Queen2 + Queen3
row = Queen0->2 + Queen1->0 + Queen2->2 + Queen3->0
col = Queen0->3 + Queen1->0 + Queen2->0 + Queen3->1
nothreat[Queen3,Queen2]
}
}
run test21 for 4 expect 1
pred test59 {
some disj Queen0, Queen1, Queen2: Queen {
Queen = Queen0 + Queen1 + Queen2
row = Queen0->0 + Queen1->6 + Queen2->5
col = Queen0->2 + Queen1->-8 + Queen2->-8
}
}
run test59 for 4 expect 0
pred test16 {
some disj Queen0, Queen1, Queen2, Queen3: Queen {
Queen = Queen0 + Queen1 + Queen2 + Queen3
row = Queen0->0 + Queen1->2 + Queen2->3 + Queen3->2
col = Queen0->3 + Queen1->1 + Queen2->0 + Queen3->2
nothreat[Queen3,Queen2]
}
}
run test16 for 4 expect 1
pred test71 {
some disj Queen0, Queen1, Queen2: Queen {
Queen = Queen0 + Queen1 + Queen2
row = Queen0->6 + Queen1->6 + Queen2->5
col = Queen0->2 + Queen1->2 + Queen2->2
}
}
run test71 for 4 expect 0
pred test9 {
some disj Queen0: Queen {
Queen = Queen0
row = Queen0->0
col = Queen0->-3 + Queen0->-2 + Queen0->-1 + Queen0->1 + Queen0->2 + Queen0->3
}
}
run test9 for 4 expect 0
|
alloy4fun_models/trashltl/models/7/dEBFNY7WTZHQZQSjL.als | Kaixi26/org.alloytools.alloy | 0 | 884 | <gh_stars>0
open main
pred iddEBFNY7WTZHQZQSjL_prop8 {
eventually ( all f1,f2 : File | f1->f2 in link implies f2 in Trash )
}
pred __repair { iddEBFNY7WTZHQZQSjL_prop8 }
check __repair { iddEBFNY7WTZHQZQSjL_prop8 <=> prop8o } |
data/compressed_files_index.asm | artrag/voicenc_scc | 4 | 29845 | <gh_stars>1-10
; Game_Over.wav
db :sample1+sample1/0x2000-3
dw 0x6000+(sample1 & 0x1FFF)
; Land_now.wav
db :sample2+sample2/0x2000-3
dw 0x6000+(sample2 & 0x1FFF)
; Level_Start.wav
db :sample3+sample3/0x2000-3
dw 0x6000+(sample3 & 0x1FFF)
; Level_up.wav
db :sample4+sample4/0x2000-3
dw 0x6000+(sample4 & 0x1FFF)
; Power_up.wav
db :sample5+sample5/0x2000-3
dw 0x6000+(sample5 & 0x1FFF)
; Warning.wav
db :sample6+sample6/0x2000-3
dw 0x6000+(sample6 & 0x1FFF)
; Wave_incoming.wav
db :sample7+sample7/0x2000-3
dw 0x6000+(sample7 & 0x1FFF)
; completed.wav
db :sample8+sample8/0x2000-3
dw 0x6000+(sample8 & 0x1FFF)
; crithealth.wav
db :sample9+sample9/0x2000-3
dw 0x6000+(sample9 & 0x1FFF)
; failed.wav
db :sample10+sample10/0x2000-3
dw 0x6000+(sample10 & 0x1FFF)
; lowammo.wav
db :sample11+sample11/0x2000-3
dw 0x6000+(sample11 & 0x1FFF)
; lowhealth.wav
db :sample12+sample12/0x2000-3
dw 0x6000+(sample12 & 0x1FFF)
; radiation.wav
db :sample13+sample13/0x2000-3
dw 0x6000+(sample13 & 0x1FFF)
nfiles: equ 13
|
src/vn/ductt/verk/tmp/MytestLexer.g4 | bynoud/verk | 0 | 5916 | <reponame>bynoud/verk<filename>src/vn/ductt/verk/tmp/MytestLexer.g4<gh_stars>0
lexer grammar MytestLexer;
fragment F_newline : '\r'? '\n' ;
Directive_define : '`define' -> pushMode(DEFINE_MODE) ;
Verilog_directive : '`' Simple_identifier ;
Simple_identifier: [a-zA-Z_] ( [a-zA-Z_0-9] )* ;
Forward_slash_forward_slash : '//' -> channel(3);
mode DEFINE_MODE;
Define_left_angle: '<' ;
Define_right_angle: '>' ;
Define_open_parent: '(' ;
Define_close_parent: ')' ;
Define_open_bracket: [{[] ;
Define_close_bracket: [}\]] ;
Define_comma: ',' ;
Define_equal: '=' ;
Define_delimit: '``' ; // this just to separate Token
Define_escaped_char: '`' ~[ \t\r\n] ;
Define_identifier: Simple_identifier ;
Define_white_space: [ \t]+ ;
Define_escaped_newline: '\\' F_newline;
Define_any_char: ~[\r\n] ;
Define_new_line: F_newline -> popMode ;
Define_comment_continue : '//' .*? Define_escaped_newline ;
Define_comment_end : '//' .*? F_newline -> popMode ;
|
Transynther/x86/_processed/AVXALIGN/_st_zr_un_sm_/i3-7100_9_0x84_notsx.log_21829_160.asm | ljhsiun2/medusa | 9 | 242447 | <filename>Transynther/x86/_processed/AVXALIGN/_st_zr_un_sm_/i3-7100_9_0x84_notsx.log_21829_160.asm
.global s_prepare_buffers
s_prepare_buffers:
push %r13
push %r9
push %rcx
push %rdi
push %rdx
push %rsi
lea addresses_A_ht+0x1e8ac, %r9
nop
nop
nop
dec %rsi
mov (%r9), %cx
nop
nop
xor %r13, %r13
lea addresses_UC_ht+0x15a90, %rsi
lea addresses_A_ht+0x1146c, %rdi
clflush (%rdi)
nop
nop
nop
sub $22186, %rdx
mov $87, %rcx
rep movsw
nop
nop
nop
cmp %rdx, %rdx
lea addresses_WT_ht+0x846c, %rsi
lea addresses_D_ht+0x1952c, %rdi
nop
nop
nop
add $11510, %rdx
mov $82, %rcx
rep movsq
nop
inc %rsi
pop %rsi
pop %rdx
pop %rdi
pop %rcx
pop %r9
pop %r13
ret
.global s_faulty_load
s_faulty_load:
push %r10
push %r11
push %r14
push %rax
push %rbp
push %rbx
push %rsi
// Store
lea addresses_PSE+0xafec, %r11
nop
nop
nop
nop
and $308, %r10
movl $0x51525354, (%r11)
nop
nop
xor $38112, %r11
// Store
lea addresses_WT+0x10346, %rbp
cmp %r14, %r14
movb $0x51, (%rbp)
nop
nop
nop
nop
nop
sub $10440, %rsi
// Store
lea addresses_UC+0x1f168, %rbp
clflush (%rbp)
nop
nop
nop
nop
nop
add $16011, %rax
mov $0x5152535455565758, %r11
movq %r11, %xmm4
movups %xmm4, (%rbp)
nop
nop
inc %rsi
// Store
mov $0x38c82b000000066c, %r11
nop
nop
nop
sub %rbp, %rbp
mov $0x5152535455565758, %rax
movq %rax, %xmm3
vmovups %ymm3, (%r11)
nop
nop
nop
nop
nop
and $56773, %rsi
// Faulty Load
mov $0x38c82b000000066c, %rbp
nop
dec %rax
mov (%rbp), %rsi
lea oracles, %rax
and $0xff, %rsi
shlq $12, %rsi
mov (%rax,%rsi,1), %rsi
pop %rsi
pop %rbx
pop %rbp
pop %rax
pop %r14
pop %r11
pop %r10
ret
/*
<gen_faulty_load>
[REF]
{'src': {'type': 'addresses_NC', 'same': False, 'size': 1, 'congruent': 0, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'}
{'dst': {'type': 'addresses_PSE', 'same': False, 'size': 4, 'congruent': 7, 'NT': False, 'AVXalign': False}, 'OP': 'STOR'}
{'dst': {'type': 'addresses_WT', 'same': False, 'size': 1, 'congruent': 1, 'NT': False, 'AVXalign': False}, 'OP': 'STOR'}
{'dst': {'type': 'addresses_UC', 'same': False, 'size': 16, 'congruent': 2, 'NT': False, 'AVXalign': False}, 'OP': 'STOR'}
{'dst': {'type': 'addresses_NC', 'same': True, 'size': 32, 'congruent': 0, 'NT': False, 'AVXalign': False}, 'OP': 'STOR'}
[Faulty Load]
{'src': {'type': 'addresses_NC', 'same': True, 'size': 8, 'congruent': 0, 'NT': False, 'AVXalign': True}, 'OP': 'LOAD'}
<gen_prepare_buffer>
{'src': {'type': 'addresses_A_ht', 'same': False, 'size': 2, 'congruent': 6, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'}
{'src': {'type': 'addresses_UC_ht', 'congruent': 2, 'same': False}, 'dst': {'type': 'addresses_A_ht', 'congruent': 7, 'same': False}, 'OP': 'REPM'}
{'src': {'type': 'addresses_WT_ht', 'congruent': 9, 'same': True}, 'dst': {'type': 'addresses_D_ht', 'congruent': 6, 'same': True}, 'OP': 'REPM'}
{'00': 242, '58': 20892, '79': 695}
58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 00 58 00 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 79 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 00 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 79 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 00 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 79 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 00 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 79 58 58 79 58 58 58 58 58 00 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 00 58 58 58 58 00 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 00 58 58 58 58 58 58 58 58 58 58 58 58 79 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58 58
*/
|
programs/oeis/131/A131579.asm | karttu/loda | 1 | 19069 | <gh_stars>1-10
; A131579: Period 10: repeat 0, 3, 6, 9, 2, 5, 8, 1, 4, 7.
; 0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7,0,3,6,9,2,5,8,1,4,7
mov $1,$0
mul $1,3
mod $1,10
|
oeis/175/A175151.asm | neoneye/loda-programs | 11 | 162773 | ; A175151: a(n)=Sum_(i=1..n)((i+1)^i -1)/i
; Submitted by <NAME>(s2)
; 1,5,26,182,1737,21345,320938,5701778,116812889,2710555349,70256770866,2011763864406,63066746422417,2148275748236033,79009709388692498,3120334201617871778,131703367127423550129,5916556161455825857509
add $0,1
lpb $0
mov $2,$0
sub $0,1
seq $2,60072 ; a(n) = (n^(n-1) - 1)/(n-1) for n>1, a(1) = 0.
add $1,$2
lpe
mov $0,$1
|
src/servlet-parts-mockup.adb | My-Colaborations/ada-servlet | 6 | 11982 | -----------------------------------------------------------------------
-- servlet-parts-mockup -- Mockup servlet parts (ie, local files)
-- Copyright (C) 2020 <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 Ada.Directories;
package body Servlet.Parts.Mockup is
-- ------------------------------
-- Get the size of the mime part.
-- ------------------------------
overriding
function Get_Size (Data : in Part) return Natural is
begin
return Natural (Ada.Directories.Size (To_String (Data.Path)));
end Get_Size;
-- ------------------------------
-- Get the content name submitted in the mime part.
-- ------------------------------
overriding
function Get_Name (Data : in Part) return String is
begin
return To_String (Data.Name);
end Get_Name;
-- ------------------------------
-- Get the path of the local file which contains the part.
-- ------------------------------
overriding
function Get_Local_Filename (Data : in Part) return String is
begin
return To_String (Data.Path);
end Get_Local_Filename;
-- ------------------------------
-- Get the content type of the part.
-- ------------------------------
overriding
function Get_Content_Type (Data : in Part) return String is
begin
return To_String (Data.Content_Type);
end Get_Content_Type;
-- ------------------------------
-- Create the part content by using a local file path.
-- ------------------------------
procedure Create (Into : out Part;
Name : in String;
Path : in String;
Content_Type : in String) is
begin
Into.Name := To_Unbounded_String (Name);
Into.Path := To_Unbounded_String (Path);
Into.Content_Type := To_Unbounded_String (Content_Type);
end Create;
end Servlet.Parts.Mockup;
|
src/005/animals.adb | xeenta/learning-ada | 0 | 19282 | <reponame>xeenta/learning-ada
package body Animals is
function Legs
(A : Animal) return Natural
is (A.Number_Of_Legs);
function Wings
(A : Animal) return Natural
is (A.Number_Of_Wings);
procedure Add_Wings (A : in out Animal;
N : Positive) is
begin
A.Number_Of_Wings := A.Wings + 2 * N;
end Add_Wings;
procedure Add_Legs (A : in out Animal;
N : Positive) is
begin
A.Number_Of_Legs := A.Number_Of_Legs + 2 * N;
end Add_Legs;
end Animals;
|
Practica 02/P02_Ficheros/src/fich_1.adb | dpr1005/Tiempo-Real-Ejercicios | 0 | 25372 | <gh_stars>0
with Ada.Text_IO;
with Ada.Strings.Unbounded;
use Ada.Text_IO;
procedure Fich_1 is
package ASU renames Ada.Strings.Unbounded;
Fich : Ada.Text_IO.File_Type;
S : ASU.Unbounded_String;
T : ASU.Unbounded_String;
begin
-- Abre fichero prueba.tmp
Open(Fich, Ada.Text_IO.Out_File, "prueba.tmp");
S := ASU.To_Unbounded_String(Ada.Text_IO.Get_Line(Fich));
Put(ASU.To_String(S)); New_Line;
T := ASU.To_Unbounded_String(Ada.Text_IO.Get_Line(Fich)); New_Line;
Put(ASU.To_String(T));New_Line;
Close(Fich);
-- Cierro el fichero
-- CREA
Create(Fich, Out_File, "prueba3.txt");
Put_Line(Fich, "esto es una linea");
Put_Line(Fich, "esto es la segunda linea");
Close(Fich);
-- ANYADE
Open(Fich, Append_File, "prueba3.txt");
Put_Line(Fich, "esto es la tercera linea");
S := ASU.To_Unbounded_String(Ada.Text_IO.Get_Line(Fich));
-- da error, ya que estamos en modo escritura, no lectura
Put(ASU.To_String(S)); New_Line;
Close(Fich);
end Fich_1;
|
Transynther/x86/_processed/NONE/_xt_/i7-7700_9_0xca.log_21829_1271.asm | ljhsiun2/medusa | 9 | 4386 | .global s_prepare_buffers
s_prepare_buffers:
push %r11
push %r14
push %rbx
push %rcx
push %rdi
push %rsi
lea addresses_WT_ht+0x1dd40, %r14
nop
nop
nop
sub %rcx, %rcx
mov $0x6162636465666768, %rbx
movq %rbx, (%r14)
nop
nop
nop
nop
nop
add %r11, %r11
lea addresses_WT_ht+0x8cd2, %rsi
lea addresses_WT_ht+0xd340, %rdi
nop
nop
nop
nop
nop
inc %rbx
mov $3, %rcx
rep movsw
nop
inc %rdi
pop %rsi
pop %rdi
pop %rcx
pop %rbx
pop %r14
pop %r11
ret
.global s_faulty_load
s_faulty_load:
push %r10
push %r12
push %r13
push %r14
push %rbx
push %rdi
// Faulty Load
lea addresses_D+0x1ef40, %rdi
nop
and $161, %r14
mov (%rdi), %r13w
lea oracles, %rdi
and $0xff, %r13
shlq $12, %r13
mov (%rdi,%r13,1), %r13
pop %rdi
pop %rbx
pop %r14
pop %r13
pop %r12
pop %r10
ret
/*
<gen_faulty_load>
[REF]
{'src': {'congruent': 0, 'AVXalign': False, 'same': False, 'size': 2, 'NT': False, 'type': 'addresses_D'}, 'OP': 'LOAD'}
[Faulty Load]
{'src': {'congruent': 0, 'AVXalign': False, 'same': True, 'size': 2, 'NT': False, 'type': 'addresses_D'}, 'OP': 'LOAD'}
<gen_prepare_buffer>
{'OP': 'STOR', 'dst': {'congruent': 8, 'AVXalign': False, 'same': False, 'size': 8, 'NT': False, 'type': 'addresses_WT_ht'}}
{'src': {'congruent': 1, 'same': False, 'type': 'addresses_WT_ht'}, 'OP': 'REPM', 'dst': {'congruent': 8, 'same': False, 'type': 'addresses_WT_ht'}}
{'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
*/
|
Transynther/x86/_processed/NC/_st_zr_un_4k_/i7-8650U_0xd2.log_5388_40.asm | ljhsiun2/medusa | 9 | 175109 | <filename>Transynther/x86/_processed/NC/_st_zr_un_4k_/i7-8650U_0xd2.log_5388_40.asm
.global s_prepare_buffers
s_prepare_buffers:
push %r11
push %r13
push %r14
push %r15
push %rcx
push %rdi
push %rdx
push %rsi
lea addresses_UC_ht+0x14de, %r11
add $8102, %rsi
mov $0x6162636465666768, %rdx
movq %rdx, %xmm0
vmovups %ymm0, (%r11)
nop
nop
nop
xor $41834, %r13
lea addresses_WC_ht+0x1d092, %rdi
nop
add %r14, %r14
movups (%rdi), %xmm2
vpextrq $0, %xmm2, %r15
nop
nop
nop
add %r14, %r14
lea addresses_normal_ht+0x59ea, %r15
nop
nop
nop
nop
nop
cmp $20921, %rdi
mov (%r15), %r13w
nop
add $2400, %r15
lea addresses_WT_ht+0x15efa, %r15
nop
add $40511, %rdx
vmovups (%r15), %ymm3
vextracti128 $0, %ymm3, %xmm3
vpextrq $1, %xmm3, %r14
nop
nop
nop
and $24289, %r13
lea addresses_WC_ht+0x10c46, %rsi
lea addresses_A_ht+0x111ca, %rdi
xor $51107, %r15
mov $44, %rcx
rep movsl
nop
sub $51717, %r14
pop %rsi
pop %rdx
pop %rdi
pop %rcx
pop %r15
pop %r14
pop %r13
pop %r11
ret
.global s_faulty_load
s_faulty_load:
push %r11
push %r12
push %r14
push %rbp
push %rcx
push %rdi
push %rdx
// Store
lea addresses_WT+0xd9ca, %rdi
nop
nop
nop
nop
add $6333, %r14
movb $0x51, (%rdi)
nop
add $30838, %rdx
// Faulty Load
mov $0x4d8c1700000009ca, %rdx
nop
nop
add %r11, %r11
mov (%rdx), %rdi
lea oracles, %rdx
and $0xff, %rdi
shlq $12, %rdi
mov (%rdx,%rdi,1), %rdi
pop %rdx
pop %rdi
pop %rcx
pop %rbp
pop %r14
pop %r12
pop %r11
ret
/*
<gen_faulty_load>
[REF]
{'OP': 'LOAD', 'src': {'type': 'addresses_NC', 'size': 1, 'AVXalign': False, 'NT': True, 'congruent': 0, 'same': False}}
{'OP': 'STOR', 'dst': {'type': 'addresses_WT', 'size': 1, 'AVXalign': False, 'NT': False, 'congruent': 11, 'same': False}}
[Faulty Load]
{'OP': 'LOAD', 'src': {'type': 'addresses_NC', 'size': 8, 'AVXalign': False, 'NT': False, 'congruent': 0, 'same': True}}
<gen_prepare_buffer>
{'OP': 'STOR', 'dst': {'type': 'addresses_UC_ht', 'size': 32, 'AVXalign': False, 'NT': False, 'congruent': 1, 'same': False}}
{'OP': 'LOAD', 'src': {'type': 'addresses_WC_ht', 'size': 16, 'AVXalign': False, 'NT': False, 'congruent': 2, 'same': False}}
{'OP': 'LOAD', 'src': {'type': 'addresses_normal_ht', 'size': 2, 'AVXalign': True, 'NT': False, 'congruent': 4, 'same': False}}
{'OP': 'LOAD', 'src': {'type': 'addresses_WT_ht', 'size': 32, 'AVXalign': False, 'NT': False, 'congruent': 1, 'same': False}}
{'OP': 'REPM', 'src': {'type': 'addresses_WC_ht', 'congruent': 2, 'same': True}, 'dst': {'type': 'addresses_A_ht', 'congruent': 11, 'same': False}}
{'51': 634, '00': 4626, '16': 128}
51 51 00 00 00 00 00 51 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 51 00 00 00 51 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 51 00 00 16 00 00 00 00 00 16 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 16 00 00 51 00 00 00 16 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 51 00 51 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 16 00 00 00 00 00 00 00 16 00 00 00 00 00 00 00 00 00 00 00 00 51 00 51 00 00 00 00 00 00 00 00 00 51 00 00 00 51 00 00 00 00 00 51 16 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 16 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 16 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 51 00 00 00 00 51 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 51 00 00 00 00 00 16 00 00 00 00 00 00 00 00 00 16 00 00 00 51 00 00 00 00 00 00 51 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 16 00 00 00 00 51 00 00 00 00 00 00 00 00 51 00 00 51 00 00 00 51 00 00 51 51 00 00 00 51 00 00 00 00 00 00 00 51 00 00 00 00 00 00 16 00 00 00 00 00 00 00 00 00 00 51 00 00 00 16 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 51 00 00 00 51 00 00 51 00 16 51 00 00 00 51 00 00 00 51 00 00 00 00 00 51 00 00 00 00 00 00 00 16 51 16 51 00 00 51 00 00 00 00 00 00 51 00 00 00 00 51 00 00 00 00 00 00 51 51 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 51 00 00 00 00 51 00 00 00 00 00 51 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 51 00 00 00 00 00 00 00 00 00 00 51 00 51 16 51 00 00 16 00 00 00 00 00 51 00 51 00 51 00 00 00 00 00 00 00 00 00 00 00 51 51 00 00 00 00 00 00 00 51 00 00 51 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 16 51 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 51 00 00 00 00 51 00 00 51 00 00 00 16 51 51 51 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 51 00 00 00 51 00 00 00 00 00 00 00 51 00 00 00 00 51 00 00 00 51 00 51 00 00 00 00 00 00 51 00 51 51 51 51 00 00 00 00 00 00 00 00 00 51 00 00 00 51 00 00 00 00 00 00 16 00 00 51 00 00 00 00 00 00 51 00 00 00 00 00 00 00 00 00 00 00 00 00 00 51 00 00 00 00 51 00 00 51 00 00 00 00 00 00 00 00 00 51 00 00 00 00 00 51 16 00 00 00 00 00
*/
|
awa/src/awa-events-configs.adb | fuzzysloth/ada-awa | 0 | 27447 | -----------------------------------------------------------------------
-- awa-events-configs -- Event configuration
-- Copyright (C) 2012, 2013 <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 Util.Serialize.Mappers.Record_Mapper;
with EL.Utils;
with AWA.Services.Contexts;
package body AWA.Events.Configs is
use AWA.Events.Queues;
-- ------------------------------
-- Set the configuration value identified by <b>Value</b> after having parsed
-- the element identified by <b>Field</b>.
-- ------------------------------
procedure Set_Member (Into : in out Controller_Config;
Field : in Config_Fields;
Value : in Util.Beans.Objects.Object) is
use Ada.Strings.Unbounded;
use Util.Beans.Objects;
begin
case Field is
when FIELD_NAME =>
Into.Name := Value;
when FIELD_TYPE =>
Into.Queue_Type := Value;
when FIELD_QUEUE_NAME =>
declare
Name : constant String := Util.Beans.Objects.To_String (Value);
begin
Into.Queue := Into.Manager.Find_Queue (Name);
end;
when FIELD_ACTION =>
declare
Expr : constant String := Util.Beans.Objects.To_String (Value);
begin
Into.Action := EL.Expressions.Create_Expression (Expr, Into.Context.all);
exception
when others =>
raise Util.Serialize.Mappers.Field_Error with "Invalid entity type: " & Expr;
end;
when FIELD_PROPERTY_NAME =>
Into.Prop_Name := Value;
when FIELD_PROPERTY_VALUE =>
if Util.Beans.Objects.Is_Null (Into.Prop_Name) then
raise Util.Serialize.Mappers.Field_Error with "Missing property name";
end if;
-- Add the new property.
declare
Name : constant String := Util.Beans.Objects.To_String (Into.Prop_Name);
Expr : constant String := Util.Beans.Objects.To_String (Value);
begin
EL.Beans.Add_Parameter (Container => Into.Params,
Name => Name,
Value => Expr,
Context => Into.Context.all);
end;
Into.Prop_Name := Util.Beans.Objects.Null_Object;
when FIELD_ON_EVENT =>
if Util.Beans.Objects.Is_Null (Into.Name) then
raise Util.Serialize.Mappers.Field_Error with "Missing event name";
end if;
declare
Name : constant String := Util.Beans.Objects.To_String (Into.Name);
begin
Into.Manager.Add_Action (Event => Name,
Queue => Into.Queue,
Action => Into.Action,
Params => Into.Params);
end;
Into.Name := Util.Beans.Objects.Null_Object;
Into.Queue := AWA.Events.Queues.Null_Queue;
Into.Params.Clear;
when FIELD_QUEUE =>
-- Create the queue with the given name and properties and add it to the manager.
declare
Name : constant String := Util.Beans.Objects.To_String (Into.Name);
Kind : constant String := Util.Beans.Objects.To_String (Into.Queue_Type);
Queue : constant Queue_Ref := Queues.Create_Queue (Name => Name,
Kind => Kind,
Props => Into.Params,
Context => Into.Context.all);
begin
Into.Manager.Add_Queue (Queue);
end;
Into.Name := Util.Beans.Objects.Null_Object;
Into.Queue_Type := Util.Beans.Objects.Null_Object;
Into.Params.Clear;
when FIELD_DISPATCHER_PRIORITY =>
Into.Priority := To_Integer (EL.Utils.Eval (Value => Value,
Context => Into.Context.all));
when FIELD_DISPATCHER_COUNT =>
Into.Count := To_Integer (EL.Utils.Eval (Value => Value,
Context => Into.Context.all));
when FIELD_DISPATCHER_QUEUE =>
declare
Match : constant String := Util.Beans.Objects.To_String (Value);
begin
if Length (Into.Match) > 0 then
Append (Into.Match, ",");
end if;
Append (Into.Match, Match);
end;
when FIELD_DISPATCHER =>
if Into.Count > 0 then
Into.Manager.Add_Dispatcher (Match => To_String (Into.Match),
Count => Into.Count,
Priority => Into.Priority);
end if;
Into.Match := To_Unbounded_String ("");
end case;
end Set_Member;
package Config_Mapper is
new Util.Serialize.Mappers.Record_Mapper (Element_Type => Controller_Config,
Element_Type_Access => Controller_Config_Access,
Fields => Config_Fields,
Set_Member => Set_Member);
Mapper : aliased Config_Mapper.Mapper;
-- Setup the XML parser to read the <b>queue</b> and <b>on-event</b> description.
-- For example:
--
-- <queue name="async" type="fifo">
-- <property name="size">254</property>
-- </queue>
--
-- <on-event name="create-user" queue="async">
-- <action>#{mail.send}</action>
-- <property name="user">#{event.name}</property>
-- <property name="template">mail/welcome.xhtml</property>
-- </on-event>
--
-- This defines an event action called when the <b>create-user</b> event is posted.
-- The Ada bean <b>mail</b> is created and is populated with the <b>user</b> and
-- <b>template</b> properties. The Ada bean action method <b>send</b> is called.
package body Reader_Config is
begin
Reader.Add_Mapping ("module", Mapper'Access);
Config.Manager := Manager;
Config.Context := Context;
Config.Session := AWA.Services.Contexts.Get_Session (AWA.Services.Contexts.Current);
Config_Mapper.Set_Context (Reader, Config'Unchecked_Access);
end Reader_Config;
begin
Mapper.Add_Mapping ("queue", FIELD_QUEUE);
Mapper.Add_Mapping ("queue/@name", FIELD_NAME);
Mapper.Add_Mapping ("queue/@type", FIELD_TYPE);
Mapper.Add_Mapping ("queue/property/@name", FIELD_PROPERTY_NAME);
Mapper.Add_Mapping ("queue/property", FIELD_PROPERTY_VALUE);
Mapper.Add_Mapping ("on-event", FIELD_ON_EVENT);
Mapper.Add_Mapping ("on-event/@name", FIELD_NAME);
Mapper.Add_Mapping ("on-event/@queue", FIELD_QUEUE_NAME);
Mapper.Add_Mapping ("on-event/property/@name", FIELD_PROPERTY_NAME);
Mapper.Add_Mapping ("on-event/property", FIELD_PROPERTY_VALUE);
Mapper.Add_Mapping ("on-event/action", FIELD_ACTION);
Mapper.Add_Mapping ("dispatcher", FIELD_DISPATCHER);
Mapper.Add_Mapping ("dispatcher/@name", FIELD_NAME);
Mapper.Add_Mapping ("dispatcher/queue/@match", FIELD_DISPATCHER_QUEUE);
Mapper.Add_Mapping ("dispatcher/priority", FIELD_DISPATCHER_PRIORITY);
Mapper.Add_Mapping ("dispatcher/count", FIELD_DISPATCHER_COUNT);
end AWA.Events.Configs;
|
3-mid/impact/source/2d/orbs/collision/shapes/impact-d2-orbs-shape.ads | charlie5/lace | 20 | 20170 | with impact.d2.orbs.Collision,
impact.d2.Math;
package impact.d2.orbs.Shape
--
-- Our only shape is a circle.
--
-- A shape is used for collision detection. You can create a shape however you like.
-- Shapes used for simulation in b2World are created automatically when a b2Fixture is created.
--
is
-- use impact.d2.Math;
type Item is tagged
record
m_radius : float32;
end record;
type View is access all Item'Class;
----------
--- Forge
--
function to_Circle (Radius : in float_math.Real) return Shape.item;
function Clone (Self : in Item) return Shape.item; -- Clone the concrete shape using the provided allocator.
procedure destruct (Self : in out Item) is null;
---------------
--- Operations
--
-- Test a point for containment in this shape. This only works for convex shapes.
-- 'xf' the shape world transform.
-- 'p' a point in world coordinates.
--
function test_Point (Self : in Item; xf : in impact.d2.Math.b2Transform;
p : in impact.d2.Math.b2Vec2 ) return Boolean;
-- Cast a ray against this shape.
-- 'output' the ray-cast results.
-- 'input' the ray-cast input parameters.
-- 'transform' the transform to be applied to the shape.
--
function ray_Cast (Self : in Item; output : access collision.b2RayCastOutput;
input : in collision.b2RayCastInput;
transform : in impact.d2.Math.b2Transform ) return Boolean;
-- Given a transform, compute the associated axis aligned bounding box for this shape.
-- 'aabb' returns the axis aligned box.
-- 'xf' the world transform of the shape.
--
procedure compute_AABB (Self : in Item; aabb : access collision.b2AABB;
xf : in impact.d2.Math.b2Transform);
---------
--- Mass
--
-- This holds the mass data computed for a shape.
--
type mass_Data is
record
mass : float32; -- The mass of the shape, usually in kilograms.
center : impact.d2.Math.b2Vec2; -- The position of the shapes centroid relative to the shapes origin.
I : float32; -- The rotational inertia of the shape about the local origin.
end record;
-- Compute the mass properties of this shape using its dimensions and density.
--
-- The inertia tensor is computed about the local origin.
-- 'massData' returns the mass data for this shape.
-- 'density' the density in kilograms per meter squared.
--
procedure compute_Mass (Self : in Item; massData : access mass_Data;
density : in float32);
------------
--- Support
--
function get_Support (Self : in Item; d : in impact.d2.Math.b2Vec2) return int32; -- Get the supporting vertex index in the given direction.
function get_support_Vertex (Self : in Item; d : in impact.d2.Math.b2Vec2) return impact.d2.Math.b2Vec2; -- Get the supporting vertex in the given direction.
function get_vertex_Count (Self : in Item ) return int32; -- Get the vertex count.
function get_Vertex (Self : in Item; index : in int32) return impact.d2.Math.b2Vec2; -- Get a vertex by index. Used by b2Distance.
end impact.d2.orbs.Shape;
|
programs/oeis/131/A131724.asm | jmorken/loda | 1 | 8318 | ; A131724: Period 6: repeat [1, 9, 7, 13, 11, 9].
; 1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13,11,9,1,9,7,13
mod $0,6
mul $0,3
add $0,1
lpb $0
mov $1,$0
sub $0,4
lpe
mul $1,2
add $1,1
|
programs/oeis/290/A290251.asm | karttu/loda | 0 | 19570 | <filename>programs/oeis/290/A290251.asm
; A290251: a(n) is the number of parts in the integer partition having viabin number n.
; 0,1,2,1,3,2,2,1,4,3,3,2,3,2,2,1,5,4,4,3,4,3,3,2,4,3,3,2,3,2,2,1,6,5,5,4,5,4,4,3,5,4,4,3,4,3,3,2,5,4,4,3,4,3,3,2,4,3,3,2,3,2,2,1,7,6,6,5,6,5,5,4,6,5,5,4,5,4,4,3,6,5,5,4,5,4,4,3,5,4,4,3,4
mul $0,2
mov $1,96
sub $1,$0
add $1,2
lpb $0,1
div $0,2
add $1,4
add $1,$0
sub $1,3
lpe
sub $1,98
|
tests/z80n/op_cspect_emulator.asm | cizo2000/sjasmplus | 220 | 19552 | OUTPUT "op_cspect_emulator.bin"
;;; CSpect emulator extensions, instructions EXIT and BREAK
;;; available only with option `--zxnext=cspect`
exit ; #DD00
break ; #DD01
|
src/test/resources/asm/hidden.asm | yottatsa/basicv2 | 71 | 178982 | *=$c200
DATA=$c000
XP=$c1fb
YP=$c1fd
SP=$c1ff
SCR=$0400
VIC=$d000
INIT:
JSR IOOFF
LDA #0
STA I
STA II
STA CP
STA LA
STA XS
STA YS
STA CA
STA CX
STA CN
STA OY
STA CG
LDA XP
STA XT
LDA XP+1
STA XT+1
LDA YP
STA YT
LDA #208
STA CA+1
LDA 53272
AND #6
CMP #6
BNE UPPER
LDA CA+1
CLC
ADC #$8
STA CA+1
UPPER:
JSR CALCSCR
LDA #64 ; calc addr of sprite block
STA T1
INC BL
LDA BL
CMP #15
BNE NOT15
LDA #13
STA BL
NOT15:
STA T2
JSR MUL
LDA T1
STA BS
LDA T1+1
STA BS+1
LDA #0 ; reset vars
STA I
STA II
STA OY
STA CG
JSR CHAROFFSET
MAINLOOP:
LDX I
LDA DATA,X
BEQ SKIPDRAW
STA LA
JSR FILLCP
LDX CX
BEQ DCPSHIFT
CPSHIFT:
ASL CP
DEX
BNE CPSHIFT
DCPSHIFT:
LDA #$ff
EOR CP
AND LA
STA LA
LDA CX
BEQ NOCHK1
LDA II
AND #3
CMP #3
BEQ NOCHK1
JSR DRAWRIGHT
NOCHK1:
LDA BS
CLC
ADC I
STA $22
LDA BS+1
ADC #0
STA $23
LDA LA
STA ($22),Y
SKIPDRAW:
LDX I
INX
INX
INX
STX I
INC CN
INC CG
LDA CN
CMP #8
BCS NOCHK2
LDA CG
CMP #8
BCS NOCHK2
CPX #63 ; I is still in X
BCS NOCHK2
JMP MAINLOOP
NOCHK2:
CPX #65
BCC CONT1
JMP EXIT
CONT1:
LDA CN
CMP #8
BNE NOCHK3
LDA OY
BNE NOCHK3
LDA CG
CMP #8
BCS NOCHK3
JSR YOVERFLOW
JMP MAINLOOP
NOCHK3:
LDA OY
BEQ NOCHK4
LDA YP
SEC
SBC #8
STA YP
LDA #0
STA OY
NOCHK4:
LDA XP
CLC
ADC #8
STA XP
LDA XP+1
ADC #0
STA XP+1
INC II
LDA II
AND #3
CMP #3
BNE NOCHK5
LDA II
CLC
ADC #21
STA II
LDA XP
SEC
SBC #24
STA XP
LDA XP+1
SBC #0
STA XP+1
LDA YP
CLC
ADC #8
STA YP
NOCHK5:
LDA II
STA I
JSR CHAROFFSET
JSR CALCSCR
LDA #0
STA CG
JMP MAINLOOP
EXIT:
JSR IOON
RASTERWAIT:
;LDA $d012 ; wait for raster below sprite
;CMP YP
;BCC RASTERWAIT
LDA SP
TAY
ASL
TAX
LDA XT
STA VIC,X
INX
LDA YT
STA VIC,X
LDA BYT,Y
LDX XT+1
BEQ LOW255
ORA $d010
STA $d010
JMP RETURN
LOW255:
EOR #$ff
AND $d010
STA $d010
RETURN:
LDA BL
LDX SP
STA 2040,X
;LDA #0
;STA 53280
RTS
FILLCP:
LDA CH
CLC
ADC CN
STA $22
LDA CH+1
ADC #0
STA $23
LDY #0
LDA ($22),Y
STA CP
RTS
YOVERFLOW:
LDA #7
SEC
SBC CN
STA CG
LDA #0
STA CN
LDA YP
CLC
ADC #8
STA YP
JSR CALCSCR
LDA #1
STA OY
RTS
DRAWRIGHT:
LDA XS
CMP #39
BCC DODRAW
RTS
DODRAW:
LDA XP
CLC
ADC #8
STA XP
LDA XP+1
ADC #0
STA XP+1
JSR CALCSCR
JSR FILLCP
LDA #8
SEC
SBC CX
TAX
BEQ DCPSHIFT2
CPSHIFT2:
LSR CP
DEX
BNE CPSHIFT2
DCPSHIFT2:
LDX CX
LDA POW,X
STA MM
LDA #$ff
EOR CP
STA T1
LDA #$ff
EOR MM
AND T1
ORA MM
AND LA
STA LA
LDA XP
SEC
SBC #8
STA XP
LDA XP+1
SBC #0
STA XP+1
JSR CALCSCR
RTS
CHAROFFSET:
LDA YP
SEC
SBC #50
AND #7
STA CN
LDA XP
AND #7
STA CX
RTS
CALCSCR:
LDA XP
SEC
SBC #24
STA T1
LDA XP+1
SBC #0
STA T1+1
JSR DIV8
LDA T1
STA XS ; x-pos on screen
LDA YP
SEC
SBC #50
LSR
LSR
LSR
STA YS ; y-pos on screen
STA T2 ; mul by 40
LDA #40
STA T1
JSR MUL
LDA T1
CLC ; add x pos
ADC XS
STA T1
LDA T1+1
ADC #0
STA T1+1
LDA T1 ; add screen address
CLC
ADC #<SCR
STA $22
LDA T1+1
ADC #>SCR
STA $23
LDY #0
STY T1+1
LDA ($22),Y
CMP #126 ;exclude this char code
BNE ENDCP
LDA #32
ENDCP:
STA T1
JSR MUL8
LDA T1
CLC
ADC CA
STA CH
LDA T1+1
ADC CA+1
STA CH+1
RTS
DIV8:
LSR T1+1
ROR T1
LSR T1+1
ROR T1
LSR T1+1
ROR T1
RTS
MUL8:
ASL T1
ROL T1+1
ASL T1
ROL T1+1
ASL T1
ROL T1+1
RTS
MUL:
LDA #$00
TAY
STY T1+1
BEQ ENTERLOOP
DOADD:
CLC
ADC T1
TAX
TYA
ADC T1+1
TAY
TXA
LOOP:
ASL T1
ROL T1+1
ENTERLOOP:
LSR T2
BCS DOADD
BNE LOOP
STA T1
STY T1+1
RTS
IOOFF:
SEI
LDA 1
AND #251
STA 1
RTS
IOON:
LDA 1
ORA #4
STA 1
CLI
RTS
I .byte 0
II .byte 0
CP .byte 0
CG .byte 0
OY .byte 0
LA .byte 0
XS .byte 0
YS .byte 0
MM .byte 0
CA .word 53248
CH .word 0
CN .byte 0
CX .byte 0
BS .word 0
T1 .word 0
T2 .word 0
XT .word 0
YT .byte 0
POW .byte $ff $fe $fc $f8 $f0 $e0 $c0 $80 $00
BYT .byte 1 2 4 8 16 32 64 128
BL .byte 13
|
Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/s-thread.ads | djamal2727/Main-Bearing-Analytical-Model | 0 | 3686 | <filename>Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/s-thread.ads
------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- S Y S T E M . T H R E A D S --
-- --
-- S p e c --
-- --
-- Copyright (C) 1992-2020, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package provides facilities to register a thread to the runtime,
-- and allocate its task specific datas.
-- This package is currently implemented for:
-- VxWorks AE653 rts-cert
-- VxWorks AE653 rts-full (not rts-kernel)
with Ada.Exceptions;
with Ada.Unchecked_Conversion;
with Interfaces.C;
with System.Secondary_Stack;
with System.Soft_Links;
package System.Threads is
package SST renames System.Secondary_Stack;
type ATSD is limited private;
-- Type of the Ada thread specific data. It contains datas needed
-- by the GNAT runtime.
type ATSD_Access is access ATSD;
function From_Address is
new Ada.Unchecked_Conversion (Address, ATSD_Access);
subtype STATUS is Interfaces.C.int;
-- Equivalent of the C type STATUS
type t_id is new Interfaces.C.long;
subtype Thread_Id is t_id;
function Register (T : Thread_Id) return STATUS;
-- Create the task specific data necessary for Ada language support
--------------------------
-- Thread Body Handling --
--------------------------
-- The subprograms in this section are called from the process body
-- wrapper in the APEX process registration package.
procedure Thread_Body_Enter
(Sec_Stack_Ptr : SST.SS_Stack_Ptr;
Process_ATSD_Address : System.Address);
-- Enter thread body, see above for details
procedure Thread_Body_Leave;
-- Leave thread body (normally), see above for details
procedure Thread_Body_Exceptional_Exit
(EO : Ada.Exceptions.Exception_Occurrence);
-- Leave thread body (abnormally on exception), see above for details
private
type ATSD is new System.Soft_Links.TSD;
end System.Threads;
|
programs/oeis/170/A170881.asm | neoneye/loda | 22 | 14702 | ; A170881: a(0)=0; thereafter a(n) = (3*n+1)*2^(n-2)+1.
; 1,3,8,21,53,129,305,705,1601,3585,7937,17409,37889,81921,176129,376833,802817,1703937,3604481,7602177,15990785,33554433,70254593,146800641,306184193,637534209,1325400065,2751463425,5704253441,11811160065,24427626497,50465865729
mov $1,$0
mul $0,3
add $0,1
mov $2,2
pow $2,$1
mul $0,$2
div $0,4
add $0,1
|
source/amf/uml/amf-uml-enumeration_literals-collections.ads | svn2github/matreshka | 24 | 11906 | <reponame>svn2github/matreshka<filename>source/amf/uml/amf-uml-enumeration_literals-collections.ads
------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright Β© 2011-2012, <NAME> <<EMAIL>> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
with AMF.Generic_Collections;
package AMF.UML.Enumeration_Literals.Collections is
pragma Preelaborate;
package UML_Enumeration_Literal_Collections is
new AMF.Generic_Collections
(UML_Enumeration_Literal,
UML_Enumeration_Literal_Access);
type Set_Of_UML_Enumeration_Literal is
new UML_Enumeration_Literal_Collections.Set with null record;
Empty_Set_Of_UML_Enumeration_Literal : constant Set_Of_UML_Enumeration_Literal;
type Ordered_Set_Of_UML_Enumeration_Literal is
new UML_Enumeration_Literal_Collections.Ordered_Set with null record;
Empty_Ordered_Set_Of_UML_Enumeration_Literal : constant Ordered_Set_Of_UML_Enumeration_Literal;
type Bag_Of_UML_Enumeration_Literal is
new UML_Enumeration_Literal_Collections.Bag with null record;
Empty_Bag_Of_UML_Enumeration_Literal : constant Bag_Of_UML_Enumeration_Literal;
type Sequence_Of_UML_Enumeration_Literal is
new UML_Enumeration_Literal_Collections.Sequence with null record;
Empty_Sequence_Of_UML_Enumeration_Literal : constant Sequence_Of_UML_Enumeration_Literal;
private
Empty_Set_Of_UML_Enumeration_Literal : constant Set_Of_UML_Enumeration_Literal
:= (UML_Enumeration_Literal_Collections.Set with null record);
Empty_Ordered_Set_Of_UML_Enumeration_Literal : constant Ordered_Set_Of_UML_Enumeration_Literal
:= (UML_Enumeration_Literal_Collections.Ordered_Set with null record);
Empty_Bag_Of_UML_Enumeration_Literal : constant Bag_Of_UML_Enumeration_Literal
:= (UML_Enumeration_Literal_Collections.Bag with null record);
Empty_Sequence_Of_UML_Enumeration_Literal : constant Sequence_Of_UML_Enumeration_Literal
:= (UML_Enumeration_Literal_Collections.Sequence with null record);
end AMF.UML.Enumeration_Literals.Collections;
|
source/image/required/s-imgint.ads | ytomino/drake | 33 | 29562 | pragma License (Unrestricted);
-- implementation unit required by compiler
with System.Long_Long_Integer_Types;
package System.Img_Int is
pragma Pure;
-- required for Integer'Image by compiler (s-imgint.ads)
procedure Image_Integer (
V : Integer;
S : in out String;
P : out Natural);
-- helper
procedure Image (
V : Long_Long_Integer_Types.Word_Integer;
S : in out String;
P : out Natural);
end System.Img_Int;
|
agda/InsertSort/Impl1/Correctness/Permutation/Alternative.agda | bgbianchi/sorting | 6 | 12222 | <gh_stars>1-10
open import Relation.Binary.Core
module InsertSort.Impl1.Correctness.Permutation.Alternative {A : Set}
(_β€_ : A β A β Set)
(totβ€ : Total _β€_) where
open import Data.List
open import Data.Sum
open import Function
open import InsertSort.Impl1 _β€_ totβ€
open import List.Permutation.Alternative A renaming (_βΌ_ to _βΌβ²_)
open import List.Permutation.Alternative.Correctness A
open import List.Permutation.Base A
lemma-insertβΌβ² : (x : A)(xs : List A) β (x β· xs) βΌβ² insert x xs
lemma-insertβΌβ² x [] = βΌrefl
lemma-insertβΌβ² x (y β· ys)
with totβ€ x y
... | injβ xβ€y = βΌrefl
... | injβ yβ€x = βΌtrans (βΌswap βΌrefl) (βΌhead y (lemma-insertβΌβ² x ys))
lemma-insertSortβΌβ² : (xs : List A) β xs βΌβ² insertSort xs
lemma-insertSortβΌβ² [] = βΌrefl
lemma-insertSortβΌβ² (x β· xs) = βΌtrans (βΌhead x (lemma-insertSortβΌβ² xs)) (lemma-insertβΌβ² x (insertSort xs))
theorem-insertSortβΌ : (xs : List A) β xs βΌ insertSort xs
theorem-insertSortβΌ = lemma-βΌβ²-βΌ β lemma-insertSortβΌβ²
|
Views/ConsoleDrawing.asm | TinfoilAsteroid/EliteNext | 9 | 103022 | <filename>Views/ConsoleDrawing.asm
; bc = start position, d = length, e = colour
Draw3LineBar: ld e,16
push bc,,de
MMUSelectLayer2
call l2_draw_horz_line
pop bc,,de
dec b
push bc,,de
ld e,20
MMUSelectLayer2
call l2_draw_horz_line
pop bc,,de
dec b
MMUSelectLayer2
call l2_draw_horz_line
ret
DrawColourCodedBar: ld e,124
cp 40
jr nc,DrawColourEBar
ld e,84
cp 30
jr nc,DrawColourEBar
ld e,216
cp 20
ld e,236
cp 10
jr nc,DrawColourEBar
ld e,225
cp 5
jr nc,DrawColourEBar
ld e,224
DrawColourEBar: push bc,,de
MMUSelectLayer2
call l2_draw_horz_line
pop bc,,de
dec b
push bc,,de
MMUSelectLayer2
call l2_draw_horz_line
pop bc,,de
dec b
MMUSelectLayer2
call l2_draw_horz_line
ret
; no ret needed as jp handles it
UpdateConsole: ld a,(DELTA)
cp 0 ; don't draw if there is nothing to draw
jr z,.UpdateRoll
ld bc,SpeedoStart
ld hl,SpeedoMapping
add hl,a
ld d,(hl)
call Draw3LineBar
.UpdateRoll: ld a,(ALP1)
cp 0
jp z,.UpdatePitch
ld hl,RollMiddle
ld a,(ALP2)
cp 0
jp z,.PosRoll
.NegRoll: ld d,0
ld a,(ALP1)
sla a
ld e,a
or a
sbc hl,de
ld bc,hl
ld a,DialMiddleXPos
sub c
ld d,a
ld e,$FF
call Draw3LineBar
jr .UpdatePitch
.PosRoll: ld bc,RollMiddle
ld a,(ALP1)
sla a
ld d,a
ld e,$FF
call Draw3LineBar
.UpdatePitch: ld a,(BET1)
cp 0
jp z,.Fuel
ld hl,PitchMiddle
ld a,(BET2)
cp 0
jp z,.PosPitch
.NegPitch: ld d,0
ld a,(BET1)
sla a
ld e,a
or a
sbc hl,de
ld bc,hl
ld a,DialMiddleXPos
sub c
ld d,a
ld e,$FF
call Draw3LineBar
jp .Fuel
.PosPitch: ld bc,PitchMiddle
ld a,(BET1)
sla a
ld d,a
ld e,$FF
call Draw3LineBar
.Fuel: ld a,(Fuel)
srl a ; divide by 4 to get range on screen
ld hl,FuelMapping
add hl,a
ld a,(hl)
ld bc,FuelStart
ld d,a
call DrawColourCodedBar
.FrontShield: ld a,(ForeShield)
srl a
srl a
srl a
ld bc,FShieldStart
ld d,a
call DrawColourCodedBar
.AftShield: ld a,(AftShield)
srl a
srl a
srl a
ld bc,AShieldStart
ld d,a
call DrawColourCodedBar
;PlayerEnergy
; BNEED LASER temp
; NEED CABIN TEMP
;NEED ALTITUDE
; Draw compas - if in range draw station, else do planet
.EnergyBars: ld a,(PlayerEnergy)
srl a ; energy = energy / 2 so 31 per bar
JumpIfALTNusng 31 + 1, Draw1EnergyBar
JumpIfALTNusng (31*2) + 1, Draw2EnergyBars
JumpIfALTNusng (31*3) + 1, Draw3EnergyBars
jp Draw4EnergyBars
; implicit ret
; NEED ENERGY BAR
.DoneConsole: ret
Draw1EnergyBar: ld e,224
ld d,a
ld bc,EnergyBar1Start
call DrawColourEBar
ret
Draw2EnergyBars: ld e,216
sub 31
ld d,a
ld bc,EnergyBar2Start
call DrawColourEBar
ld d,31
ld e,216
ld bc,EnergyBar1Start
call DrawColourEBar
ret
Draw3EnergyBars: ld e,20
sub 31*2
ld d,a
ld e,20
ld bc,EnergyBar3Start
call DrawColourEBar
ld d,31
ld e,20
ld bc,EnergyBar2Start
call DrawColourEBar
ld d,31
ld e,20
ld bc,EnergyBar1Start
call DrawColourEBar
ret
Draw4EnergyBars: ld e,24
sub 31*3
JumpIfALTNusng 31,.NoMax
.Max ld a,31
.NoMax: ld d,a
ld bc,EnergyBar4Start
call DrawColourEBar
ld d,31
ld e,24
ld bc,EnergyBar3Start
call DrawColourEBar
ld d,31
ld e,24
ld bc,EnergyBar2Start
call DrawColourEBar
ld d,31
ld e,24
ld bc,EnergyBar1Start
call DrawColourEBar
ret
ScannerBottom equ 190
ScannerTypeMissle equ 2
ScannerXRangeOffset equ $35
ScannerCenter equ 127
ScannerDefault equ 0
ScannerMissile equ 2
ScannerStation equ 4
ScannerEnemy equ 6
SunXScaled DB 0
SunYScaled DB 0
SunZScaled DB 0
ScannerColourTable: DB L2ColourGREEN_2, L2ColourGREEN_1, L2ColourYELLOW_4,L2ColourYELLOW_1,L2ColourCYAN_2,L2ColourCYAN_1,L2ColourRED_4,L2ColourPINK_4
ScannerColourTableAngry:DB L2ColourRED_2, L2ColourRED_1 ; just a place holder for now
GetShipColor: MACRO
ld a,(ShipTypeAddr)
sla a ; as its byte pairs * 2
ld hl,ScannerColourTable
add hl,a
ld a,(hl)
ENDM
GetShipColorBright: MACRO
ld a,(ShipTypeAddr)
sla a ; as its byte pairs * 2
inc a
ld hl,ScannerColourTable
add hl,a
ld a,(hl)
ENDM
Shift24BitScan: MACRO regHi, reglo
ld hl,(regHi)
ld b,h
ld a,h
and SignMask8Bit
ld h,a
ld a,(reglo)
sla a
rl l
rl h
sla a
rl l
rl h
sla a
rl l
rl h
sla a
rl l
rl h
sla a
rl l
rl h
sla a
rl l
rl h
ENDM
SunShiftRight MACRO reglo, reghi, regsgn
ld a,regsgn
srl a
rr reghi
rr reglo
ld regsgn,a
ENDM
;SunShiftPosTo15Bit: ld de,(SBnKzlo)
; ld a,(SBnKzsgn)
; push af
; and SignMask8Bit
; ld iyl,a
; ld hl,(SBnKxlo)
; ld a,(SBnKxsgn)
; push af
; and SignMask8Bit
; ld ixl,a
; ld bc,(SBnKylo)
; ld a,(SBnKysgn)
; and SignMask8Bit
; push af
; ld iyh,a
;.ShiftLoop: ld a,iyh
; or iyl
; or ixl
; jr z,.ShiftBit15
;.ShiftZ: SunShiftRight iyl, d, e
;.ShiftX: SunShiftRight ixl, h, l
;.ShiftY: SunShiftRight ixh, b, c
; jr .ShipLoop
;.ShiftBit15: ld a,iyh
; or iyl
; or ixl
; jr z,.CompletedShift
;.ShiftZ: SunShiftRight iyl, d, e
;.ShiftX: SunShiftRight ixl, h, l
;.ShiftY: SunShiftRight ixh, b, c ; finally shift to 15 bits so we can get the sign back
;.CompletedShift: pop af ; get ysgn
; and SignOnly8Bit
; or b
; ld b,a
; pop af ; get xsgn
; and SignOnly8Bit
; or h
; ld h,a
; pop af ; get zsgn
; and SignOnly8Bit
; or d
; ld d,a
; ret
;
ScalePlanetPos: ld de,(PBnKzhi) ; de = abs z & save sign on stack
ld a,d ; .
push af ; .
and SignMask8Bit ; .
ld d,a ; .
ld hl,(PBnKxhi) ; hl = abs x & save sign on stack
ld a,h ; .
push af ; .
and SignMask8Bit ; .
ld h,a ; .
ld bc,(PBnKyhi) ; bc = abs y & save sign on stack
ld a,b ; .
push af ; .
and SignMask8Bit ; .
ld b,a ; .
.ShiftLoop: ld a,b ; Scale down to an 8 bit value
or d ; .
or h ; .
jr z,.Shifted ; .
ShiftBCRight1 ; .
ShiftHLRight1 ; .
ShiftDERight1 ; .
jr .ShiftLoop
.Shifted: ld a,c ; See if we already have 7 bit
or l ;
or e ;
and $80 ;
jr z,.NoAdditionalShift ;
ShiftBCRight1 ; we want 7 bit
ShiftHLRight1 ; to acommodate the sign
ShiftDERight1 ; .
.NoAdditionalShift: pop af ; get ysgn
and SignOnly8Bit ;
ld b,a ; bc = shifted signed Y
pop af ; get xsgn
and SignOnly8Bit ;
ld h,a ; hl = shifted signed X
pop af ; get zsgn
and SignOnly8Bit ;
ld d,a ; de = shifted signed Z
ret
ScaleSunPos: ld de,(SBnKzhi) ; de = abs z & save sign on stack
ld a,d ; .
push af ; .
and SignMask8Bit ; .
ld d,a ; .
ld hl,(SBnKxhi) ; hl = abs x & save sign on stack
ld a,h ; .
push af ; .
and SignMask8Bit ; .
ld h,a ; .
ld bc,(SBnKyhi) ; bc = abs y & save sign on stack
ld a,b ; .
push af ; .
and SignMask8Bit ; .
ld b,a ; .
.ShiftLoop: ld a,b ; Scale down to an 8 bit value
or d ; .
or h ; .
jr z,.Shifted ; .
ShiftBCRight1 ; .
ShiftHLRight1 ; .
ShiftDERight1 ; .
jr .ShiftLoop
.Shifted: ld a,c ; See if we already have 7 bit
or l ;
or e ;
and $80 ;
jr z,.NoAdditionalShift ;
ShiftBCRight1 ; we want 7 bit
ShiftHLRight1 ; to acommodate the sign
ShiftDERight1 ; .
.NoAdditionalShift: pop af ; get ysgn
and SignOnly8Bit ;
ld b,a ; bc = shifted signed Y
pop af ; get xsgn
and SignOnly8Bit ;
ld h,a ; hl = shifted signed X
pop af ; get zsgn
and SignOnly8Bit ;
ld d,a ; de = shifted signed Z
ret
;compass sun
; if value is still 24 bit
; copy xhi/xsgn y and z to xxx15 ([2 1 0 ] [ 5 4 3] [ 8 7 6 ]
; normalise vector (note this assumes sun is just sign byte+ 2 bytes)
; tempk39 = OR 3 low bytes
; tempkA = OR 3 high bytes
; TAL2: repeat
; asl tempka tempk39
; exit if carry set
; x coord << 1
; y corrd << 1
; z coord << 1
; until carry clear
; TA2: shift x y and z right one and put sign bit in from sign bytes
; now XX15 holds sign + 7 bit bytes maximused for coords
; RQ = AP = X ^ 2
; TP = AP = Y ^ 2
; RQ = RQ + TP
; TP = AP = Z ^ 2
; RQ = RQ + TP
; Q = SQRT (RQ)
; for each coord - A = A/Q * 3/ 8
;
;
UpscaleSunPosition: ld de,(SBnKzhi) ; de = abs z & save sign on stack
ld hl,(SBnKxhi) ; hl = abs x & save sign on stack
ld bc,(SBnKyhi) ; bc = abs y & save sign on stack
ld a,d
and SignOnly8Bit
srl a
ld iyl,a
ld a,h
and SignOnly8Bit
or iyl
srl a
ld a,b
and SignOnly8Bit
or iyl
ld iyl,a ; IYL now equals YXH00000 where letters = sign bits
ClearSignBit d
ClearSignBit h
ClearSignBit b
ld a,b
or e
or h
or l
or b
or c
jr z, .Setto1 ; to prevent and infinite loop in upscale if all zero
ld a,d
or e
or h
sla a
jr c,.DoneCalc
jr z,.DoneCalc
.UpscaleLoop: ShiftDELeft1
ShiftHLLeft1
ShiftBCLeft1
sla a
jr c,.DoneCalc
jp .UpscaleLoop
.DoneCalc ShiftDERight1
ShiftHLRight1
ShiftBCRight1
.NowSetResultInLowByte: ld e,d
ld l,h
ld c,b
ld a,iyl
and SignOnly8Bit
ld b,a
ld a,iyl
sla a
ld iyl,a
and SignOnly8Bit
ld h,a
ld a,iyl
sla a
and SignOnly8Bit
ld d,a
ret
.Setto1: ld a,1
ld c,a
ld e,a
ld l,a
ld a,iyl
sla a
sla a
and SignOnly8Bit
or e
ld e,a
ret
UpdateCompassSun: MMUSelectSun
call ScaleSunPos ; get as 7 bit signed
push bc,,hl,,de ; +3 save to stack Y, X and Z scaled and signed hihg = sign, low = 7 bit value
.normaliseYSqr: ld d,c ; bc = y ^ 2
ld e,c ; .
mul ; .
ld bc,de ; .
.normaliseXSqr: ld d,l ; hl = x ^ 2
ld e,l ; .
mul ; .
ex de,hl ; .
.normaliseZSqr: pop de ; +2 get Z saved from stack so now stack contains Y Z X
ld d,e ; de = z ^
mul ; .
.normaliseSqrt: add hl,de ; de = x^2 + y^2 + z^2
add hl,bc ; .
ex de,hl ; .
call asm_sqrt ; (Q) = hl = sqrt (x^2 + y^2 + x^2)
; if h <> 0 then more difficult
ld d,l ; iyl = q
ld iyl,d ; .
.NormaliseX: pop hl ; +1 get back hl x scaled
ld a,h ; c = sign
and SignOnly8Bit ; .
ld c,a ; .
push bc ; +2 save bc temporarily as it will get altered
ld a,l ; a = 8 bit abs z
call AequAdivQmul96ABS ; e = a /q * 96 (d was already loaded with q)
ld e,a ; .
EDiv10Inline ; a = e / 10
ld a,h ; .
pop bc ; +1 retrieve bc
cp 0 ; if result in h was 0 then done
jr z,.DoneNormX ; in case we end up with - 0
bit 7,c ; if sign is negative then 2'c value
jr z,.DoneNormX
neg
.DoneNormX: ld ixh,a ; ixh = (signed 2's c x /q * 96) / 10
.NormaliseY: ld d,iyl ; d = q
pop hl ; +0 hl y scaled
ld a,h ; c = sign
and SignOnly8Bit ; .
ld c,a ; .
push bc ; +1 save sign to stack
ld a,l ; a = 8 bit signed z
call AequAdivQmul96ABS ; .
ld e,a ; a = e / 10
EDiv10Inline ; .
ld a,h ; retrieve sign
pop bc ; +1 retrieve sign
cp 0
jr z,.DoneNormY ; in case we end up with - 0
bit 7,c ; if sign is negative then 2'c value
jr z,.DoneNormY
neg ;
.DoneNormY: ld b,a ; result from Y
ld c,ixh ; x = saved X
.SetSprite: MMUSelectSpriteBank
call compass_sun_move
ld a,ixl
bit 7,a
jr nz,.SunBehind
.SunInfront: call show_compass_sun_infront
ret
.SunBehind: call show_compass_sun_behind
ret
UpdateCompassPlanet: MMUSelectPlanet
call ScalePlanetPos ; get as 7 bit signed
push bc,,hl,,de ; save to stack Y, Z, X and copy of X scaled and signed hihg = sign, low = 7 bit value
.normaliseYSqr: ld d,c ; bc = y ^ 2
ld e,c ; .
mul ; .
ld bc,de ; .
.normaliseXSqr: ld d,l ; hl = x ^ 2
ld e,l ; .
mul ; .
ex de,hl ; .
.normaliseZSqr: pop de ; get saved from stack 2
ld d,e ; de = z ^
mul ; .
.normaliseSqrt: add hl,de ; hl = x^2 + y^2 + z^2
add hl,bc
ex de,hl
call asm_sqrt ; (Q) = hl = sqrt (x^2 + y^2 + x^2)
; if h <> 0 then more difficult
ld d,l ; iyl = q
ld iyl,d ; .
.NormaliseX: pop hl ; hl x scaled
ld a,h ; c = sign
and SignOnly8Bit ; .
ld c,a ; .
push bc ; save sign to stack
ld a,l ; a = 8 bit abs z
call AequAdivQmul96ABS ; e = a /q * 96 (d was already loaded with q)
ld e,a ; .
EDiv10Inline ; a = e / 10
ld a,h ; .
pop bc ; retrieve sign
cp 0
jr z,.DoneNormX ; in case we end up with - 0
bit 7,c ; if sign is negative then 2'c value
jr z,.DoneNormX
neg
.DoneNormX: ld ixh,a ; ixh = (signed 2's c x /q * 96) / 10
.NormaliseY: ld d,iyl ; d = q
pop hl ; hl y scaled
ld a,h ; c = sign
and SignOnly8Bit ; .
ld c,a ; .
push bc ; save sign to stack
ld a,l ; a = 8 bit signed z
call AequAdivQmul96ABS ; .
ld e,a ; a = e / 10
EDiv10Inline ; .
ld a,h ; retrieve sign
pop bc ; retrieve sign
cp 0
jr z,.DoneNormY ; in case we end up with - 0
bit 7,c ; if sign is negative then 2'c value
jr z,.DoneNormY
neg ;
.DoneNormY: ld b,a ; result from Y
ld c,ixh ; x = saved X
.SetSprite: MMUSelectSpriteBank
call compass_station_move
ld a,ixl
bit 7,a
jr nz,.PlanetBehind
.PlanetInfront: call show_compass_station_infront
ret
.PlanetBehind: call show_compass_station_behind
ret
UpdatePlanetSun: MMUSelectPlanet
Shift24BitScan PBnKyhi, PBnKylo
.IsItInRange: ld a,(PBnKxsgn) ; if the high byte is not
ld hl,PBnKysgn ; a sign only
or (hl) ; then its too far away
ld hl,PBnKzsgn ; for the scanner to draw
or (hl) ; so rely on the compass
and SignMask8Bit ;
ret nz ;
.ItsInRange: ld hl,(PBnKzlo) ; we will get unsigned values
ld de,(PBnKxlo)
ld bc,(PBnKylo)
ld a,h
or d
or b
and %11000000
ret nz ; if distance Hi > 64 on any ccord- off screen
.MakeX2Compliment: ld a,(PBnKxsgn)
bit 7,a
jr z,.absXHi
NegD
.absXHi: ld a,d
add ScannerX
ld ixh,a ; store adjusted X in ixh
.ProcessZCoord: srl h
srl h
.MakeZ2Compliment: ld a,(PBnKzsgn)
bit 7,a
jr z,.absZHi
NegH
.absZHi: ld a,ScannerY
sub h
ld iyh,a ; make iyh adjusted Z = row on screen
.ProcessStickLength: srl b ; divide b by 2
jr nz,.StickHasLength
.Stick0Length: ld a,iyh ; abs stick end is row - length
ld iyl,a
MMUSelectLayer2
jp .NoStick
.StickHasLength: ld a,(PBnKysgn) ; if b = 0 then no line
bit 7,a
jr z,.absYHi
NegB
.absYHi: ld a,iyh
.SetStickPos: sub b
JumpIfALTNusng ScannerBottom, .StickOnScreen
ld a,ScannerBottom
.StickOnScreen: ld iyl,a ; iyh is again stick end point
ld ixl,a
ld b,iyh ; from row
ld c,ixh ; from col
ld d,iyl ; to row
ld e,L2SunScanner
MMUSelectLayer2
call l2_draw_vert_line_to
.NoStick: ld b,iyl ; row
ld c,ixh ; col
ld a,L2SunScannerBright
call l2_plot_pixel
ld b,iyl
ld c,ixh
inc c
ld a,L2SunScannerBright
call l2_plot_pixel
ret
UpdateCompassStation: MMUSelectShipBankN 0
call ScaleSunPos ; get as 7 bit signed
push bc,,de,,hl,,de ; save to stack Y, Z, X and copy of X scaled and signed hihg = sign, low = 7 bit value
.normaliseYSqr: ld d,c ; bc = y ^ 2
ld e,c ; .
mul ; .
ld bc,de ; .
.normaliseXSqr: ld d,l ; hl = x ^ 2
ld e,l ; .
mul ; .
ex de,hl ; .
.normaliseZSqr: pop de ; get saved from stack 2
ld d,e ; de = z ^
mul ; .
.normaliseSqrt: add hl,de ; hl = x^2 + y^2 + x^2
add hl,bc
ex de,hl
call asm_sqrt ; (Q) = hl = sqrt (x^2 + y^2 + x^2)
; if h <> 0 then more difficult
ld d,l ; iyl = q
ld iyl,d ; .
.NormaliseX: pop hl ; hl x scaled
ld a,h ; c = sign
and SignOnly8Bit ; .
ld c,a ; .
push bc ; save sign to stack
ld a,l ; a = 8 bit abs z
call AequAdivQmul96ABS ; e = a /q * 96 (d was already loaded with q)
ld e,a ; .
EDiv10Inline ; a = e / 10
ld a,h ; .
pop bc ; retrieve sign
cp 0
jr z,.DoneNormX ; in case we end up with - 0
bit 7,c ; if sign is negative then 2'c value
jr z,.DoneNormX
neg
.DoneNormX: ld ixh,a ; ixh = (signed 2's c x /q * 96) / 10
.NormaliseZ: ld d,iyl ; d = q
pop hl ; hl z scaled
ld a,h ; c = sign
and SignOnly8Bit ; .
ld c,a ; .
push bc ; save sign to stack
ld a,l ; e = a /q * 96
call AequAdivQmul96ABS ; .
ld e,a ; a = e / 10
EDiv10Inline ; .
ld a,h ; retrieve sign
pop bc ; retrieve sign
bit 7,c ; if sign is negative then 2'c value
jr z,.DoneNormZ
neg
.DoneNormZ: ld ixl,a ; .
.NormaliseY: ld d,iyl ; d = q
pop hl ; hl y scaled
ld a,h ; c = sign
and SignOnly8Bit ; .
ld c,a ; .
push bc ; save sign to stack
ld a,l ; a = 8 bit signed z
call AequAdivQmul96ABS ; .
ld e,a ; a = e / 10
EDiv10Inline ; .
ld a,h ; retrieve sign
pop bc ; retrieve sign
cp 0
jr z,.DoneNormY ; in case we end up with - 0
bit 7,c ; if sign is negative then 2'c value
jr z,.DoneNormY
neg
.DoneNormY: ld b,a ; .
ld c,ixh
.SetSprite: MMUSelectSpriteBank
call compass_sun_move
ld a,ixl
bit 7,a
jr nz,.SunBehind
.SunInfront: call show_compass_sun_infront
ret
.SunBehind: call show_compass_sun_behind
ret
UpdateScannerSun: MMUSelectSun
Shift24BitScan SBnKyhi, SBnKylo
.IsItInRange: ld a,(SBnKxsgn) ; if the high byte is not
ld hl,SBnKysgn ; a sign only
or (hl) ; then its too far away
ld hl,SBnKzsgn ; for the scanner to draw
or (hl) ; so rely on the compass
and SignMask8Bit ;
ret nz ;
.ItsInRange: ld hl,(SBnKzlo) ; we will get unsigned values
ld de,(SBnKxlo)
ld bc,(SBnKylo)
ld a,h
or d
or b
and %11000000
ret nz ; if distance Hi > 64 on any ccord- off screen
.MakeX2Compliment: ld a,(SBnKxsgn)
bit 7,a
jr z,.absXHi
NegD
.absXHi: ld a,d
add ScannerX
ld ixh,a ; store adjusted X in ixh
.ProcessZCoord: srl h
srl h
.MakeZ2Compliment: ld a,(SBnKzsgn)
bit 7,a
jr z,.absZHi
NegH
.absZHi: ld a,ScannerY
sub h
ld iyh,a ; make iyh adjusted Z = row on screen
.ProcessStickLength: srl b ; divide b by 2
jr nz,.StickHasLength
.Stick0Length: ld a,iyh ; abs stick end is row - length
ld iyl,a
MMUSelectLayer2
jp .NoStick
.StickHasLength: ld a,(SBnKysgn) ; if b = 0 then no line
bit 7,a
jr z,.absYHi
NegB
.absYHi: ld a,iyh
.SetStickPos: sub b
JumpIfALTNusng ScannerBottom, .StickOnScreen
ld a,ScannerBottom
.StickOnScreen: ld iyl,a ; iyh is again stick end point
ld ixl,a
ld b,iyh ; from row
ld c,ixh ; from col
ld d,iyl ; to row
ld e,L2SunScanner
MMUSelectLayer2
call l2_draw_vert_line_to
.NoStick: ld b,iyl ; row
ld c,ixh ; col
ld a,L2SunScannerBright
call l2_plot_pixel
ld b,iyl
ld c,ixh
inc c
ld a,L2SunScannerBright
call l2_plot_pixel
ret
; This will do a planet update if we are not in space station range
UpdateScannerPlanet: MMUSelectPlanet
Shift24BitScan PBnKyhi, PBnKylo
.IsItInRange: ld a,(PBnKxsgn) ; if the high byte is not
ld hl,PBnKysgn ; a sign only
or (hl) ; then its too far away
ld hl,PBnKzsgn ; for the scanner to draw
or (hl) ; so rely on the compass
and SignMask8Bit ;
ret nz ;
.ItsInRange: ld hl,(PBnKzlo) ; we will get unsigned values
ld de,(PBnKxlo)
ld bc,(PBnKylo)
ld a,h
or d
or b
and %11000000
ret nz ; if distance Hi > 64 on any ccord- off screen
.MakeX2Compliment: ld a,(PBnKxsgn)
bit 7,a
jr z,.absXHi
NegD
.absXHi: ld a,d
add ScannerX
ld ixh,a ; store adjusted X in ixh
.ProcessZCoord: srl h
srl h
.MakeZ2Compliment: ld a,(PBnKzsgn)
bit 7,a
jr z,.absZHi
NegH
.absZHi: ld a,ScannerY
sub h
ld iyh,a ; make iyh adjusted Z = row on screen
.ProcessStickLength: srl b ; divide b by 2
jr nz,.StickHasLength
.Stick0Length: ld a,iyh ; abs stick end is row - length
ld iyl,a
MMUSelectLayer2
jp .NoStick
.StickHasLength: ld a,(PBnKysgn) ; if b = 0 then no line
bit 7,a
jr z,.absYHi
NegB
.absYHi: ld a,iyh
.SetStickPos: sub b
JumpIfALTNusng ScannerBottom, .StickOnScreen
ld a,ScannerBottom
.StickOnScreen: ld iyl,a ; iyh is again stick end point
ld ixl,a
ld b,iyh ; from row
ld c,ixh ; from col
ld d,iyl ; to row
ld e,L2SunScanner
MMUSelectLayer2
call l2_draw_vert_line_to
.NoStick: ld b,iyl ; row
ld c,ixh ; col
ld a,L2SunScannerBright
call l2_plot_pixel
ld b,iyl
ld c,ixh
inc c
ld a,L2SunScannerBright
call l2_plot_pixel
ret
; As the space station is always ship 0 then we can just use the scanner
; This will go though all the universe ship data banks and plot, for now we will just work on one bank
UpdateScannerShip: ld a,(UBnKexplDsp) ; if bit 4 is clear then ship should not be drawn
bit 4,a ; .
;DEBUG ret z ; .
ld a,(ShipTypeAddr) ; if its a planet or sun, do not display
bit 7,a
ret nz
; DEBUG Add in station types later
.NotMissile: ld hl,(UBnKzlo)
ld de,(UBnKxlo)
ld bc,(UBnKylo)
ld a,h
or d
or b
and %11000000
ret nz ; if distance Hi > 64 on any ccord- off screen
.MakeX2Compliment: ld a,(UBnKxsgn)
bit 7,a
jr z,.absXHi
NegD
.absXHi: ld a,d
add ScannerX
ld ixh,a ; store adjusted X in ixh
.ProcessZCoord: srl h
srl h
.MakeZ2Compliment: ld a,(UBnKzsgn)
bit 7,a
jr z,.absZHi
NegH
.absZHi: ld a,ScannerY
sub h
ld iyh,a ; make iyh adjusted Z = row on screen
.ProcessStickLength: srl b ; divide b by 2
jr nz,.StickHasLength
.Stick0Length: ld a,iyh ; abs stick end is row - length
ld iyl,a
ld a,ixl
GetShipColorBright
MMUSelectLayer2
jp .NoStick
.StickHasLength: ld a,(UBnKysgn) ; if b = 0 then no line
bit 7,a
jr z,.absYHi
NegB
.absYHi: ld a,iyh
.SetStickPos: sub b
JumpIfALTNusng ScannerBottom, .StickOnScreen
ld a,ScannerBottom
.StickOnScreen: ld iyl,a ; iyh is again stick end point
GetShipColor
ld ixl,a
ld b,iyh ; from row
ld c,ixh ; from col
ld d,iyl ; to row
ld e,ixl ; colur will only be green or yellow for now
push hl
MMUSelectLayer2
call l2_draw_vert_line_to
pop hl
inc hl
ld a,(hl)
.NoStick: ld b,iyl ; row
ld c,ixh ; col
push af
call l2_plot_pixel
pop af
ld b,iyl
ld c,ixh
inc c
call l2_plot_pixel
ret
|
programs/oeis/021/A021308.asm | neoneye/loda | 22 | 175377 | ; A021308: Decimal expansion of 1/304.
; 0,0,3,2,8,9,4,7,3,6,8,4,2,1,0,5,2,6,3,1,5,7,8,9,4,7,3,6,8,4,2,1,0,5,2,6,3,1,5,7,8,9,4,7,3,6,8,4,2,1,0,5,2,6,3,1,5,7,8,9,4,7,3,6,8,4,2,1,0,5,2,6,3,1,5,7,8,9,4,7,3,6,8,4,2,1,0,5,2,6,3,1,5,7,8,9,4,7,3
add $0,1
mov $1,10
pow $1,$0
mul $1,4
div $1,1216
mod $1,10
mov $0,$1
|
rewrite-protobuf/src/main/antlr/Protobuf2Lexer.g4 | thomaszub/rewrite | 0 | 3591 | <filename>rewrite-protobuf/src/main/antlr/Protobuf2Lexer.g4<gh_stars>0
lexer grammar Protobuf2Lexer;
SEMI : ';';
COLON : ':';
BOOL : 'bool';
BYTES : 'bytes';
DOUBLE : 'double';
ENUM : 'enum';
EXTEND : 'extend';
FIXED32 : 'fixed32';
FIXED64 : 'fixed64';
FLOAT : 'float';
IMPORT : 'import';
INT32 : 'int32';
INT64 : 'int64';
MAP : 'map';
MESSAGE : 'message';
ONEOF : 'oneof';
OPTION : 'option';
PACKAGE : 'package';
PUBLIC : 'public';
REPEATED : 'repeated';
REQUIRED : 'required';
RESERVED : 'reserved';
RETURNS : 'returns';
RPC : 'rpc';
SERVICE : 'service';
SFIXED32 : 'sfixed32';
SFIXED64 : 'sfixed64';
SINT32 : 'sint32';
SINT64 : 'sint64';
STREAM : 'stream';
STRING : 'string';
SYNTAX : 'syntax';
TO : 'to';
UINT32 : 'uint32';
UINT64 : 'uint64';
WEAK : 'weak';
OPTIONAL : 'optional';
fragment Letter
: [A-Za-z_]
;
fragment DecimalDigit
: [0-9]
;
fragment OctalDigit
: [0-7]
;
fragment HexDigit
: [0-9A-Fa-f]
;
Ident
: Letter (Letter | DecimalDigit)*
;
IntegerLiteral
: DecimalLiteral
| OctalLiteral
| HexLiteral
;
NumericLiteral
: (MINUS | PLUS)? (IntegerLiteral | FloatLiteral)
;
fragment DecimalLiteral
: [1-9] DecimalDigit*
;
fragment OctalLiteral
: '0' OctalDigit*
;
fragment HexLiteral
: '0' ('x' | 'X') HexDigit+
;
FloatLiteral
: (Decimals '.' Decimals? Exponent? | Decimals Exponent | '.' Decimals Exponent?)
| 'inf'
| 'nan'
;
fragment Decimals
: DecimalDigit+
;
fragment Exponent
: ('e' | 'E') ('+' | '-')? Decimals
;
BooleanLiteral
: 'true'
| 'false'
;
StringLiteral
: '\'' CharValue* '\''
| '"' CharValue* '"'
;
fragment CharValue
: HexEscape
| OctEscape
| CharEscape
| ~[\u0000\n\\]
;
fragment HexEscape
: '\\' ('x' | 'X') HexDigit HexDigit
;
fragment OctEscape
: '\\' OctalDigit OctalDigit OctalDigit
;
fragment CharEscape
: '\\' [abfnrtv\\'"]
;
Quote
: '\''
| '"'
;
LPAREN : '(';
RPAREN : ')';
LBRACE : '{';
RBRACE : '}';
LBRACK : '[';
RBRACK : ']';
LCHEVR : '<';
RCHEVR : '>';
COMMA : ',';
DOT : '.';
MINUS : '-';
PLUS : '+';
ASSIGN : '=';
WS
: [ \t\n\r\u00A0\uFEFF\u2003] + -> skip
;
UTF_8_BOM : '\uFEFF' -> skip
;
COMMENT
: '/*' .*? '*/' -> skip
;
LINE_COMMENT
: '//' ~[\r\n]* -> skip
;
|
src/Utilities/ExistsSyntax.agda | armkeh/agda-computability | 0 | 14160 | module Utilities.ExistsSyntax where
open import Level using (Level ; _β_)
open import Data.Product using (Ξ£)
variable
a b : Level
A : Set a
B : Set b
β-syntax : (A : Set a) β (A β Set b) β Set (a β b)
β-syntax = Ξ£
syntax β-syntax A (Ξ» x β B) = β x βΆ A β’ B
|
source/tasking/a-stcoed.ads | ytomino/drake | 33 | 9222 | pragma License (Unrestricted);
-- Ada 2012
with Ada.Real_Time;
package Ada.Synchronous_Task_Control.EDF is
procedure Suspend_Until_True_And_Set_Deadline (
S : in out Suspension_Object;
TS : Real_Time.Time_Span);
-- extended
-- If State is True, Set_True is called, otherwise it's timeout.
procedure Suspend_Until_True_And_Set_Deadline (
S : in out Suspension_Object;
TS : Real_Time.Time_Span;
State : out Boolean);
end Ada.Synchronous_Task_Control.EDF;
|
programs/oeis/131/A131326.asm | karttu/loda | 1 | 178135 | <reponame>karttu/loda
; A131326: Row sums of A131325.
; 1,3,4,9,13,24,37,63,100,165,265,432,697,1131,1828,2961,4789,7752,12541,20295,32836,53133,85969,139104,225073,364179,589252,953433,1542685,2496120,4038805,6534927,10573732,17108661,27682393,44791056,72473449,117264507,189737956,307002465,496740421,803742888,1300483309,2104226199,3404709508,5508935709,8913645217,14422580928,23336226145,37758807075,61095033220,98853840297,159948873517,258802713816,418751587333,677554301151,1096305888484,1773860189637,2870166078121,4644026267760,7514192345881,12158218613643,19672410959524,31830629573169,51503040532693,83333670105864,134836710638557,218170380744423,353007091382980,571177472127405,924184563510385,1495362035637792,2419546599148177,3914908634785971,6334455233934148
add $0,1
cal $0,97133 ; 3*Fibonacci(n)+(-1)^n.
mov $1,$0
sub $1,1
|
Data/Dyck/Except.agda | oisdk/agda-playground | 6 | 12322 | {-# OPTIONS --cubical --safe --postfix-projections #-}
-- This file contains an implementation of the stack-based compiler for Hutton's
-- razor, as from:
--
-- <NAME> and <NAME>, βCalculating correct compilers,β Journal of
-- Functional Programming, vol. 25, no. e14, Sep. 2015,
-- doi: 10.1017/S0956796815000180.
--
-- The compiler is total and the evaluator is stack-safe, and furthermore we have
-- proven a full isomorphism between the code representation and the AST.
module Data.Dyck.Except where
open import Prelude
open import Data.Nat using (_+_)
open import Data.Vec.Iterated using (Vec; _β·_; []; foldlN; head)
private
variable
n : β
--------------------------------------------------------------------------------
-- Language for Arithmetic Expressions
--------------------------------------------------------------------------------
data Expr (A : Type a) : Type a where
[_] : A β Expr A
_β_ : Expr A β Expr A β Expr A
throw : Expr A
catch : Expr A β Expr A β Expr A
--------------------------------------------------------------------------------
-- Code for the virtual stack machine.
--------------------------------------------------------------------------------
data Code (A : Type a) : β β Type a where
HALT : Code A 1
PUSH : A β Code A (1 + n) β Code A n
ADD : Code A (1 + n) β Code A (2 + n)
RAISE : Code A (1 + n) β Code A n
CATCH : Code A (1 + n) β Code A (2 + n)
--------------------------------------------------------------------------------
-- Conversion from a Code to a Expr (evaluation / execution)
--------------------------------------------------------------------------------
codeβexprβ : Code A n β Vec (Expr A) n β Expr A
codeβexprβ HALT (v β· []) = v
codeβexprβ (PUSH v is) st = codeβexprβ is ([ v ] β· st)
codeβexprβ (ADD is) (tβ β· tβ β· st) = codeβexprβ is (tβ β tβ β· st)
codeβexprβ (RAISE is) st = codeβexprβ is (throw β· st)
codeβexprβ (CATCH is) (tβ β· tβ β· st) = codeβexprβ is (catch tβ tβ β· st)
codeβexpr : Code A zero β Expr A
codeβexpr ds = codeβexprβ ds []
--------------------------------------------------------------------------------
-- Conversion from a Expr to a Code (compilation)
--------------------------------------------------------------------------------
exprβcodeβ : Expr A β Code A (1 + n) β Code A n
exprβcodeβ [ x ] = PUSH x
exprβcodeβ (xs β ys) = exprβcodeβ xs β exprβcodeβ ys β ADD
exprβcodeβ throw = RAISE
exprβcodeβ (catch xs ys) = exprβcodeβ xs β exprβcodeβ ys β CATCH
exprβcode : Expr A β Code A 0
exprβcode tr = exprβcodeβ tr HALT
--------------------------------------------------------------------------------
-- Execution
--------------------------------------------------------------------------------
Func : Type a β β β Type _
Func A zero = Maybe A
Func A (suc n) = Maybe A β Func A n
open import Data.Maybe.Sugar
exec : Code β n β Func β n
exec HALT = Ξ» x β x
exec (PUSH x xs) = exec xs (just x)
exec (ADD xs) = Ξ» xβ xβ β exec xs β¦ xβ + xβ β¦
exec (RAISE xs) = exec xs nothing
exec (CATCH xs) = Ξ» xβ xβ β exec xs (xβ <|> xβ)
_ : exec (exprβcode (catch ([ 3 ] β throw) ([ 10 ] β [ 2 ]))) β‘ just 12
_ = refl
--------------------------------------------------------------------------------
-- Proof of isomorphism
--------------------------------------------------------------------------------
exprβcodeβexprβ : {is : Code A (1 + n)} {st : Vec (Expr A) n} (e : Expr A) β
codeβexprβ (exprβcodeβ e is) st β‘ codeβexprβ is (e β· st)
exprβcodeβexprβ [ x ] = refl
exprβcodeβexprβ (xs β ys) = exprβcodeβexprβ xs ΝΎ exprβcodeβexprβ ys
exprβcodeβexprβ throw = refl
exprβcodeβexprβ (catch xs ys) = exprβcodeβexprβ xs ΝΎ exprβcodeβexprβ ys
codeβexprβcodeβ : {st : Vec (Expr A) n} (is : Code A n) β
exprβcode (codeβexprβ is st) β‘ foldlN (Code A) exprβcodeβ is st
codeβexprβcodeβ HALT = refl
codeβexprβcodeβ (PUSH i is) = codeβexprβcodeβ is
codeβexprβcodeβ (ADD is) = codeβexprβcodeβ is
codeβexprβcodeβ (RAISE is) = codeβexprβcodeβ is
codeβexprβcodeβ (CATCH is) = codeβexprβcodeβ is
prog-iso : Code A 0 β Expr A
prog-iso .fun = codeβexpr
prog-iso .inv = exprβcode
prog-iso .rightInv = exprβcodeβexprβ
prog-iso .leftInv = codeβexprβcodeβ
|
asm/Visual Studio 2017_14_MSVC_x64_Debug/span_compile_only.asm | dbd64/GSL | 0 | 166558 | ; Listing generated by Microsoft (R) Optimizing Compiler Version 19.16.27026.1
include listing.inc
INCLUDELIB MSVCRTD
INCLUDELIB OLDNAMES
CONST SEGMENT
$SG50093 DB 'GSL: Postcondition failure at c:\projects\gsl\include\gs'
DB 'l\string_span: 114', 00H
ORG $+5
$SG50094 DB 'GSL: Postcondition failure at c:\projects\gsl\include\gs'
DB 'l\string_span: 118', 00H
ORG $+5
$SG50095 DB 'GSL: Postcondition failure at c:\projects\gsl\include\gs'
DB 'l\string_span: 122', 00H
ORG $+5
$SG38436 DB 'iVtrau lDC', 00H
ORG $+5
$SG46805 DB 'GSL: Precondition failure at c:\projects\gsl\include\gsl'
DB '\gsl_algorithm: 50', 00H
ORG $+5
$SG38743 DB 'iVtrau lDC', 00H
ORG $+5
$SG47305 DB 'GSL: Precondition failure at c:\projects\gsl\include\gsl'
DB '\gsl_algorithm: 50', 00H
CONST ENDS
PUBLIC ?__empty_global_delete@@YAXPEAX@Z ; __empty_global_delete
PUBLIC ?__empty_global_delete@@YAXPEAX_K@Z ; __empty_global_delete
PUBLIC ??0exception@std@@QEAA@XZ ; std::exception::exception
PUBLIC ??0exception@std@@QEAA@QEBD@Z ; std::exception::exception
PUBLIC ??0exception@std@@QEAA@AEBV01@@Z ; std::exception::exception
PUBLIC ??1exception@std@@UEAA@XZ ; std::exception::~exception
PUBLIC ?what@exception@std@@UEBAPEBDXZ ; std::exception::what
PUBLIC ??_Gexception@std@@UEAAPEAXI@Z ; std::exception::`scalar deleting destructor'
PUBLIC ??0logic_error@std@@QEAA@PEBD@Z ; std::logic_error::logic_error
PUBLIC ??1logic_error@std@@UEAA@XZ ; std::logic_error::~logic_error
PUBLIC ??0logic_error@std@@QEAA@AEBV01@@Z ; std::logic_error::logic_error
PUBLIC ??0logic_error@std@@QEAA@$$QEAV01@@Z ; std::logic_error::logic_error
PUBLIC ??_Glogic_error@std@@UEAAPEAXI@Z ; std::logic_error::`scalar deleting destructor'
PUBLIC ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
PUBLIC ??1fail_fast@gsl@@UEAA@XZ ; gsl::fail_fast::~fail_fast
PUBLIC ??0fail_fast@gsl@@QEAA@AEBU01@@Z ; gsl::fail_fast::fail_fast
PUBLIC ??0fail_fast@gsl@@QEAA@$$QEAU01@@Z ; gsl::fail_fast::fail_fast
PUBLIC ??_Gfail_fast@gsl@@UEAAPEAXI@Z ; gsl::fail_fast::`scalar deleting destructor'
PUBLIC ??0narrowing_error@gsl@@QEAA@XZ ; gsl::narrowing_error::narrowing_error
PUBLIC ??1narrowing_error@gsl@@UEAA@XZ ; gsl::narrowing_error::~narrowing_error
PUBLIC ??0narrowing_error@gsl@@QEAA@AEBU01@@Z ; gsl::narrowing_error::narrowing_error
PUBLIC ??0narrowing_error@gsl@@QEAA@$$QEAU01@@Z ; gsl::narrowing_error::narrowing_error
PUBLIC ??_Gnarrowing_error@gsl@@UEAAPEAXI@Z ; gsl::narrowing_error::`scalar deleting destructor'
PUBLIC ??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z ; gsl::details::extent_type<-1>::extent_type<-1>
PUBLIC ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
PUBLIC ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
PUBLIC ?test_span_unoptimizable_rangecheck@@YAXV?$span@H$0?0@gsl@@H@Z ; test_span_unoptimizable_rangecheck
PUBLIC ??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z ; gsl::span<int,-1>::span<int,-1>
PUBLIC ?last@?$span@H$0?0@gsl@@QEBA?AV12@_J@Z ; gsl::span<int,-1>::last
PUBLIC ?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z ; gsl::span<int,-1>::subspan
PUBLIC ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
PUBLIC ??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z ; gsl::span<int,-1>::operator[]
PUBLIC ?data@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::data
PUBLIC ?begin@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<int,-1>::begin
PUBLIC ?end@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<int,-1>::end
PUBLIC ?_Unchecked_begin@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::_Unchecked_begin
PUBLIC ?_Unchecked_end@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::_Unchecked_end
PUBLIC ?CheckRange@?$span@H$0?0@gsl@@CA_N_J0@Z ; gsl::span<int,-1>::CheckRange
PUBLIC ?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::data
PUBLIC ??0?$span@H$0?0@gsl@@AEAA@UKnownNotNull@01@_J@Z ; gsl::span<int,-1>::span<int,-1>
PUBLIC ?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z ; gsl::span<int,-1>::make_subspan
PUBLIC ?test_span_for@@YAXV?$span@H$0?0@gsl@@@Z ; test_span_for
PUBLIC ?test_span_iter@@YAXV?$span@H$0?0@gsl@@@Z ; test_span_iter
PUBLIC ??0?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@H$0?0@2@_J@Z ; gsl::details::span_iterator<gsl::span<int,-1>,0>::span_iterator<gsl::span<int,-1>,0>
PUBLIC ??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ ; gsl::details::span_iterator<gsl::span<int,-1>,0>::operator*
PUBLIC ??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ ; gsl::details::span_iterator<gsl::span<int,-1>,0>::operator++
PUBLIC ??8details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z ; gsl::details::operator==
PUBLIC ??9details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z ; gsl::details::operator!=
PUBLIC ?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z ; gsl::details::_Verify_range
PUBLIC ?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Verify_offset
PUBLIC ?_Unwrapped@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAPEAHXZ ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Unwrapped
PUBLIC ?_Seek_to@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAH@Z ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Seek_to
PUBLIC ?test_span_rangeiter@@YAXV?$span@H$0?0@gsl@@@Z ; test_span_rangeiter
PUBLIC ?size@?$span@G$0?0@gsl@@QEBA_JXZ ; gsl::span<unsigned short,-1>::size
PUBLIC ?size_bytes@?$span@G$0?0@gsl@@QEBA_JXZ ; gsl::span<unsigned short,-1>::size_bytes
PUBLIC ?data@?$span@G$0?0@gsl@@QEBAPEAGXZ ; gsl::span<unsigned short,-1>::data
PUBLIC ?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@G$0?0@gsl@@QEBAPEAGXZ ; gsl::span<unsigned short,-1>::storage_type<gsl::details::extent_type<-1> >::data
PUBLIC ?static_size_array_span@@YAXAEAUIDE_DRIVE_STATE@@@Z ; static_size_array_span
PUBLIC ??0?$span@E$0?0@gsl@@QEAA@PEAE_J@Z ; gsl::span<unsigned char,-1>::span<unsigned char,-1>
PUBLIC ?size@?$span@E$0?0@gsl@@QEBA_JXZ ; gsl::span<unsigned char,-1>::size
PUBLIC ??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z ; gsl::span<unsigned char,-1>::operator[]
PUBLIC ?data@?$span@E$0?0@gsl@@QEBAPEAEXZ ; gsl::span<unsigned char,-1>::data
PUBLIC ?begin@?$span@E$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<unsigned char,-1>::begin
PUBLIC ?CheckRange@?$span@E$0?0@gsl@@CA_N_J0@Z ; gsl::span<unsigned char,-1>::CheckRange
PUBLIC ?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEBAPEAEXZ ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::data
PUBLIC ??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z ; gsl::span<unsigned char,-1>::span<unsigned char,-1><6>
PUBLIC ?test_convert_span_Joe@@YAEAEAUIDE_DRIVE_STATE@@@Z ; test_convert_span_Joe
PUBLIC ??$convert_span@EV?$span@G$0?0@gsl@@@@YA?AV?$span@E$0?0@gsl@@V?$span@G$0?0@1@@Z ; convert_span<unsigned char,gsl::span<unsigned short,-1> >
PUBLIC ?mysubspan1@@YA_JXZ ; mysubspan1
PUBLIC ?last@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J@Z ; gsl::span<int,6>::last
PUBLIC ?subspan@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J0@Z ; gsl::span<int,6>::subspan
PUBLIC ?size@?$span@H$05@gsl@@QEBA_JXZ ; gsl::span<int,6>::size
PUBLIC ?data@?$span@H$05@gsl@@QEBAPEAHXZ ; gsl::span<int,6>::data
PUBLIC ??0?$extent_type@$05@details@gsl@@QEAA@XZ ; gsl::details::extent_type<6>::extent_type<6>
PUBLIC ??0?$extent_type@$05@details@gsl@@QEAA@_J@Z ; gsl::details::extent_type<6>::extent_type<6>
PUBLIC ?size@?$extent_type@$05@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<6>::size
PUBLIC ?data@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEBAPEAHXZ ; gsl::span<int,6>::storage_type<gsl::details::extent_type<6> >::data
PUBLIC ??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z ; gsl::span<int,6>::span<int,6><6>
PUBLIC ?mysubspan2@@YA_J_J@Z ; mysubspan2
PUBLIC ?mysubspan3@@YA_JXZ ; mysubspan3
PUBLIC ?mysubspan4@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z ; mysubspan4
PUBLIC ??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ ; gsl::span<int,-1>::span<int,-1><0,void>
PUBLIC ?mysubspan5@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z ; mysubspan5
PUBLIC ?mysubspan6@@YA?AV?$span@H$0?0@gsl@@PEAH_J@Z ; mysubspan6
PUBLIC ?mysubspan7@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z ; mysubspan7
PUBLIC ?mysubspan8@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z ; mysubspan8
PUBLIC ?mysubspan9@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z ; mysubspan9
PUBLIC ?doterminate@@YAXXZ ; doterminate
PUBLIC ?copy_span@@YAXV?$span@H$0?0@gsl@@0@Z ; copy_span
PUBLIC ??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z ; std::copy<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
PUBLIC ?gsl_copy_span@@YAXV?$span@H$0?0@gsl@@0@Z ; gsl_copy_span
PUBLIC ??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z ; gsl::copy<int,-1,int,-1>
PUBLIC ?test_string_std_copy@@YAXXZ ; test_string_std_copy
PUBLIC ??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z ; gsl::span<unsigned char,-1>::span<unsigned char,-1><10>
PUBLIC ??0?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z ; gsl::span<char const ,-1>::span<char const ,-1>
PUBLIC ?size@?$span@$$CBD$0?0@gsl@@QEBA_JXZ ; gsl::span<char const ,-1>::size
PUBLIC ?data@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ ; gsl::span<char const ,-1>::data
PUBLIC ?begin@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<char const ,-1>::begin
PUBLIC ?end@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<char const ,-1>::end
PUBLIC ?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ ; gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::data
PUBLIC ?data@?$basic_string_span@$$CBD$0?0@gsl@@QEBAPEBDXZ ; gsl::basic_string_span<char const ,-1>::data
PUBLIC ?size@?$basic_string_span@$$CBD$0?0@gsl@@QEBA_JXZ ; gsl::basic_string_span<char const ,-1>::size
PUBLIC ?begin@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ ; gsl::basic_string_span<char const ,-1>::begin
PUBLIC ?end@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ ; gsl::basic_string_span<char const ,-1>::end
PUBLIC ??$ensure_z@$$CBD$0L@@gsl@@YA?AV?$span@$$CBD$0?0@0@AEAY0L@$$CBD@Z ; gsl::ensure_z<char const ,11>
PUBLIC ??$?0V?$span@$$CBD$0?0@gsl@@X@?$basic_string_span@$$CBD$0?0@gsl@@QEAA@AEBV?$span@$$CBD$0?0@1@@Z ; gsl::basic_string_span<char const ,-1>::basic_string_span<char const ,-1><gsl::span<char const ,-1>,void>
PUBLIC ??0?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@$$CBD$0?0@2@_J@Z ; gsl::details::span_iterator<gsl::span<char const ,-1>,0>::span_iterator<gsl::span<char const ,-1>,0>
PUBLIC ?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z ; gsl::details::_Verify_range
PUBLIC ?_Unwrapped@?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEBAPEBDXZ ; gsl::details::span_iterator<gsl::span<char const ,-1>,0>::_Unwrapped
PUBLIC ??0?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@E$0?0@2@_J@Z ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::span_iterator<gsl::span<unsigned char,-1>,0>
PUBLIC ?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::_Verify_offset
PUBLIC ?_Unwrapped@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAPEAEXZ ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::_Unwrapped
PUBLIC ?_Seek_to@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAE@Z ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::_Seek_to
PUBLIC ??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z ; std::copy<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<unsigned char,-1>,0> >
PUBLIC ?test_string_gsl_copy@@YAXXZ ; test_string_gsl_copy
PUBLIC ??$?0V?$basic_string_span@$$CBD$0?0@gsl@@X@?$span@$$CBD$0?0@gsl@@QEAA@AEAV?$basic_string_span@$$CBD$0?0@1@@Z ; gsl::span<char const ,-1>::span<char const ,-1><gsl::basic_string_span<char const ,-1>,void>
PUBLIC ??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z ; gsl::copy<char const ,-1,unsigned char,-1>
PUBLIC ??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z ; gsl::span<int,6>::make_subspan<6>
PUBLIC ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>
PUBLIC ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>
PUBLIC ??$narrow_cast@_KAEA_J@gsl@@YA_KAEA_J@Z ; gsl::narrow_cast<unsigned __int64,__int64 &>
PUBLIC ??$forward@Ufail_fast@gsl@@@std@@YA$$QEAUfail_fast@gsl@@AEAU12@@Z ; std::forward<gsl::fail_fast>
PUBLIC ??$addressof@E@std@@YAPEAEAEAE@Z ; std::addressof<unsigned char>
PUBLIC ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >
PUBLIC ??$addressof@H@std@@YAPEAHAEAH@Z ; std::addressof<int>
PUBLIC ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z ; gsl::span<int,6>::storage_type<gsl::details::extent_type<6> >::storage_type<gsl::details::extent_type<6> ><gsl::details::extent_type<6> >
PUBLIC ??0?$extent_type@$0A@@details@gsl@@QEAA@XZ ; gsl::details::extent_type<0>::extent_type<0>
PUBLIC ?size@?$extent_type@$0A@@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<0>::size
PUBLIC ??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<0> >
PUBLIC ??$_Adl_verify_range@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0@Z ; std::_Adl_verify_range<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
PUBLIC ??$_Get_unwrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@@Z ; std::_Get_unwrapped<gsl::details::span_iterator<gsl::span<int,-1>,0>,0>
PUBLIC ??$_Idl_distance@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0@Z ; std::_Idl_distance<gsl::details::span_iterator<gsl::span<int,-1>,0>,int *>
PUBLIC ??$_Idl_distance1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0Urandom_access_iterator_tag@0@@Z ; std::_Idl_distance1<gsl::details::span_iterator<gsl::span<int,-1>,0>,int *>
PUBLIC ??$_Get_unwrapped_n@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J@Z ; std::_Get_unwrapped_n<gsl::details::span_iterator<gsl::span<int,-1>,0>,__int64,0>
PUBLIC ??$_Copy_unchecked@PEAHPEAH@std@@YAPEAHPEAH00@Z ; std::_Copy_unchecked<int *,int *>
PUBLIC ??$_Seek_wrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH$0A@@std@@YAXAEAV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@AEBQEAH@Z ; std::_Seek_wrapped<gsl::details::span_iterator<gsl::span<int,-1>,0>,int *,0>
PUBLIC ??$copy_n@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z ; std::copy_n<int *,__int64,int *>
PUBLIC ??0?$extent_type@$09@details@gsl@@QEAA@XZ ; gsl::details::extent_type<10>::extent_type<10>
PUBLIC ?size@?$extent_type@$09@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<10>::size
PUBLIC ??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<10> >
PUBLIC ??$narrow_cast@_J_K@gsl@@YA_J$$QEA_K@Z ; gsl::narrow_cast<__int64,unsigned __int64>
PUBLIC ??$ensure_z@$$CBD@gsl@@YA?AV?$span@$$CBD$0?0@0@AEBQEBD_J@Z ; gsl::ensure_z<char const >
PUBLIC ??$_Adl_verify_range@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0@Z ; std::_Adl_verify_range<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<char const ,-1>,0> >
PUBLIC ??$_Get_unwrapped@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEBDAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@@Z ; std::_Get_unwrapped<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,0>
PUBLIC ??$_Idl_distance@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0@Z ; std::_Idl_distance<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,char const *>
PUBLIC ??$_Idl_distance1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0Urandom_access_iterator_tag@0@@Z ; std::_Idl_distance1<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,char const *>
PUBLIC ??$_Get_unwrapped_n@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAEAEBV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J@Z ; std::_Get_unwrapped_n<gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>,__int64,0>
PUBLIC ??$_Copy_unchecked@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z ; std::_Copy_unchecked<char const *,unsigned char *>
PUBLIC ??$_Seek_wrapped@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@PEAE$0A@@std@@YAXAEAV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@AEBQEAE@Z ; std::_Seek_wrapped<gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>,unsigned char *,0>
PUBLIC ??$narrow@_J_J@gsl@@YA_J_J@Z ; gsl::narrow<__int64,__int64>
PUBLIC ??$copy_n@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z ; std::copy_n<char const *,__int64,unsigned char *>
PUBLIC ??$?0H$05X@?$span@H$0?0@gsl@@QEAA@AEBV?$span@H$05@1@@Z ; gsl::span<int,-1>::span<int,-1><int,6,void>
PUBLIC ??$forward@AEA_J@std@@YAAEA_JAEA_J@Z ; std::forward<__int64 &>
PUBLIC ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z ; gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>
PUBLIC ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>
PUBLIC ??$?0$05@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$05@12@@Z ; gsl::details::extent_type<-1>::extent_type<-1><6>
PUBLIC ??$?0$0A@@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$0A@@12@@Z ; gsl::details::extent_type<-1>::extent_type<-1><0>
PUBLIC ??$_Adl_verify_range1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z ; std::_Adl_verify_range1<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
PUBLIC ??$_Ptr_copy_cat@HH@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEAH0@Z ; std::_Ptr_copy_cat<int,int>
PUBLIC ??$_Copy_unchecked1@PEAHPEAH@std@@YAPEAHPEAH00U_Trivially_copyable_ptr_iterator_tag@0@@Z ; std::_Copy_unchecked1<int *,int *>
PUBLIC ??$_Get_unwrapped_n@H_J$0A@@std@@YAPEAHQEAH_J@Z ; std::_Get_unwrapped_n<int,__int64,0>
PUBLIC ??$_Copy_n_unchecked3@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z ; std::_Copy_n_unchecked3<int *,__int64,int *>
PUBLIC ??$_Seek_wrapped@H@std@@YAXAEAPEAHQEAH@Z ; std::_Seek_wrapped<int>
PUBLIC ??$?0$09@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$09@12@@Z ; gsl::details::extent_type<-1>::extent_type<-1><10>
PUBLIC ??$forward@_K@std@@YA$$QEA_KAEA_K@Z ; std::forward<unsigned __int64>
PUBLIC ??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z ; gsl::ensure_sentinel<char const ,0>
PUBLIC ??$_Adl_verify_range1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z ; std::_Adl_verify_range1<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<char const ,-1>,0> >
PUBLIC ??$_Ptr_copy_cat@$$CBDE@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEBDAEBQEAE@Z ; std::_Ptr_copy_cat<char const ,unsigned char>
PUBLIC ??$_Copy_unchecked1@PEBDPEAE@std@@YAPEAEPEBD0PEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z ; std::_Copy_unchecked1<char const *,unsigned char *>
PUBLIC ??$narrow_cast@_JAEA_J@gsl@@YA_JAEA_J@Z ; gsl::narrow_cast<__int64,__int64 &>
PUBLIC ??$throw_exception@Unarrowing_error@gsl@@@details@gsl@@YAX$$QEAUnarrowing_error@1@@Z ; gsl::details::throw_exception<gsl::narrowing_error>
PUBLIC ??$_Get_unwrapped_n@$$CBD_J$0A@@std@@YAPEBDQEBD_J@Z ; std::_Get_unwrapped_n<char const ,__int64,0>
PUBLIC ??$_Get_unwrapped_n@E_J$0A@@std@@YAPEAEQEAE_J@Z ; std::_Get_unwrapped_n<unsigned char,__int64,0>
PUBLIC ??$_Copy_n_unchecked3@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z ; std::_Copy_n_unchecked3<char const *,__int64,unsigned char *>
PUBLIC ??$_Seek_wrapped@E@std@@YAXAEAPEAEQEAE@Z ; std::_Seek_wrapped<unsigned char>
PUBLIC ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >
PUBLIC ??$_Copy_memmove@PEAHPEAH@std@@YAPEAHPEAH00@Z ; std::_Copy_memmove<int *,int *>
PUBLIC ??$_Copy_n_unchecked4@PEAH_JPEAH@std@@YAPEAHPEAH_J0U_Trivially_copyable_ptr_iterator_tag@0@@Z ; std::_Copy_n_unchecked4<int *,__int64,int *>
PUBLIC ??$_Copy_memmove@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z ; std::_Copy_memmove<char const *,unsigned char *>
PUBLIC ??$forward@Unarrowing_error@gsl@@@std@@YA$$QEAUnarrowing_error@gsl@@AEAU12@@Z ; std::forward<gsl::narrowing_error>
PUBLIC ??$_Copy_n_unchecked4@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z ; std::_Copy_n_unchecked4<char const *,__int64,unsigned char *>
PUBLIC ??_7exception@std@@6B@ ; std::exception::`vftable'
PUBLIC ??_C@_0BC@EOODALEL@Unknown?5exception@ ; `string'
PUBLIC ??_C@_02DKCKIIND@?$CFs@ ; `string'
PUBLIC ??_C@_0GJ@EJIMBHLG@c?3?2program?5files?5?$CIx86?$CJ?2microsof@ ; `string'
PUBLIC ??_C@_1NC@FANNPLN@?$AAc?$AA?3?$AA?2?$AAp?$AAr?$AAo?$AAg?$AAr?$AAa?$AAm?$AA?5?$AAf?$AAi?$AAl?$AAe@ ; `string'
PUBLIC ??_7logic_error@std@@6B@ ; std::logic_error::`vftable'
PUBLIC ??_7fail_fast@gsl@@6B@ ; gsl::fail_fast::`vftable'
PUBLIC ??_R0?AVexception@std@@@8 ; std::exception `RTTI Type Descriptor'
PUBLIC _CT??_R0?AVexception@std@@@8??0exception@std@@QEAA@AEBV01@@Z24
PUBLIC ??_7narrowing_error@gsl@@6B@ ; gsl::narrowing_error::`vftable'
PUBLIC ??_C@_0ED@NAHIIAGE@GSL?3?5Precondition?5failure?5at?5c?3@ ; `string'
PUBLIC ??_C@_0ED@HAMNHNCO@GSL?3?5Precondition?5failure?5at?5c?3@ ; `string'
PUBLIC ??_C@_0ED@PLCCJGML@GSL?3?5Precondition?5failure?5at?5c?3@ ; `string'
PUBLIC ??_C@_0ED@GHOHAFBM@GSL?3?5Precondition?5failure?5at?5c?3@ ; `string'
PUBLIC ??_C@_0ED@KIOHOGJB@GSL?3?5Precondition?5failure?5at?5c?3@ ; `string'
PUBLIC ??_C@_0ED@MMILCDJF@GSL?3?5Precondition?5failure?5at?5c?3@ ; `string'
PUBLIC _TI3?AUfail_fast@gsl@@
PUBLIC _CTA3?AUfail_fast@gsl@@
PUBLIC ??_R0?AUfail_fast@gsl@@@8 ; gsl::fail_fast `RTTI Type Descriptor'
PUBLIC _CT??_R0?AUfail_fast@gsl@@@8??0fail_fast@gsl@@QEAA@AEBU01@@Z24
PUBLIC ??_R0?AVlogic_error@std@@@8 ; std::logic_error `RTTI Type Descriptor'
PUBLIC _CT??_R0?AVlogic_error@std@@@8??0logic_error@std@@QEAA@AEBV01@@Z24
PUBLIC ??_C@_0BB@KBEKGHFK@integer?5overflow@ ; `string'
PUBLIC ??_C@_1CM@MJCLAPGA@?$AAs?$AAt?$AAd?$AA?3?$AA?3?$AA_?$AAG?$AAe?$AAt?$AA_?$AAu?$AAn?$AAw?$AAr?$AAa@ ; `string'
PUBLIC ??_C@_1CG@NMONALKO@?$AA?$CC?$AAi?$AAn?$AAt?$AAe?$AAg?$AAe?$AAr?$AA?5?$AAo?$AAv?$AAe?$AAr?$AAf?$AAl@ ; `string'
PUBLIC ??_C@_0ED@GGAHHHOA@GSL?3?5Precondition?5failure?5at?5c?3@ ; `string'
PUBLIC ??_C@_0ED@HPBMEGKB@GSL?3?5Precondition?5failure?5at?5c?3@ ; `string'
PUBLIC ??_C@_0ED@JMOIJPGK@GSL?3?5Precondition?5failure?5at?5c?3@ ; `string'
PUBLIC ??_C@_0ED@LKBIKNJ@GSL?3?5Precondition?5failure?5at?5c?3@ ; `string'
PUBLIC ??_C@_0ED@JOPLHMJE@GSL?3?5Precondition?5failure?5at?5c?3@ ; `string'
PUBLIC _TI2?AUnarrowing_error@gsl@@
PUBLIC _CTA2?AUnarrowing_error@gsl@@
PUBLIC ??_R0?AUnarrowing_error@gsl@@@8 ; gsl::narrowing_error `RTTI Type Descriptor'
PUBLIC _CT??_R0?AUnarrowing_error@gsl@@@8??0narrowing_error@gsl@@QEAA@AEBU01@@Z24
PUBLIC ??_C@_0ED@GOAPCFOK@GSL?3?5Precondition?5failure?5at?5c?3@ ; `string'
PUBLIC ??_R4exception@std@@6B@ ; std::exception::`RTTI Complete Object Locator'
PUBLIC ??_R3exception@std@@8 ; std::exception::`RTTI Class Hierarchy Descriptor'
PUBLIC ??_R2exception@std@@8 ; std::exception::`RTTI Base Class Array'
PUBLIC ??_R1A@?0A@EA@exception@std@@8 ; std::exception::`RTTI Base Class Descriptor at (0,-1,0,64)'
PUBLIC ??_R4logic_error@std@@6B@ ; std::logic_error::`RTTI Complete Object Locator'
PUBLIC ??_R3logic_error@std@@8 ; std::logic_error::`RTTI Class Hierarchy Descriptor'
PUBLIC ??_R2logic_error@std@@8 ; std::logic_error::`RTTI Base Class Array'
PUBLIC ??_R1A@?0A@EA@logic_error@std@@8 ; std::logic_error::`RTTI Base Class Descriptor at (0,-1,0,64)'
PUBLIC ??_R4fail_fast@gsl@@6B@ ; gsl::fail_fast::`RTTI Complete Object Locator'
PUBLIC ??_R3fail_fast@gsl@@8 ; gsl::fail_fast::`RTTI Class Hierarchy Descriptor'
PUBLIC ??_R2fail_fast@gsl@@8 ; gsl::fail_fast::`RTTI Base Class Array'
PUBLIC ??_R1A@?0A@EA@fail_fast@gsl@@8 ; gsl::fail_fast::`RTTI Base Class Descriptor at (0,-1,0,64)'
PUBLIC ??_R4narrowing_error@gsl@@6B@ ; gsl::narrowing_error::`RTTI Complete Object Locator'
PUBLIC ??_R3narrowing_error@gsl@@8 ; gsl::narrowing_error::`RTTI Class Hierarchy Descriptor'
PUBLIC ??_R2narrowing_error@gsl@@8 ; gsl::narrowing_error::`RTTI Base Class Array'
PUBLIC ??_R1A@?0A@EA@narrowing_error@gsl@@8 ; gsl::narrowing_error::`RTTI Base Class Descriptor at (0,-1,0,64)'
EXTRN ??3@YAXPEAX_K@Z:PROC ; operator delete
EXTRN __imp__invalid_parameter:PROC
EXTRN __imp__CrtDbgReport:PROC
EXTRN __imp_terminate:PROC
EXTRN __std_exception_copy:PROC
EXTRN __std_exception_destroy:PROC
EXTRN ??_Eexception@std@@UEAAPEAXI@Z:PROC ; std::exception::`vector deleting destructor'
EXTRN memmove:PROC
EXTRN ??_Elogic_error@std@@UEAAPEAXI@Z:PROC ; std::logic_error::`vector deleting destructor'
EXTRN ??_Efail_fast@gsl@@UEAAPEAXI@Z:PROC ; gsl::fail_fast::`vector deleting destructor'
EXTRN ??_Enarrowing_error@gsl@@UEAAPEAXI@Z:PROC ; gsl::narrowing_error::`vector deleting destructor'
EXTRN ?bar@@YAXV?$span@E$0?0@gsl@@@Z:PROC ; bar
EXTRN _CxxThrowException:PROC
EXTRN _RTC_CheckStackVars:PROC
EXTRN _RTC_InitBase:PROC
EXTRN _RTC_Shutdown:PROC
EXTRN __CxxFrameHandler3:PROC
EXTRN __GSHandlerCheck:PROC
EXTRN __security_check_cookie:PROC
EXTRN ??_7type_info@@6B@:BYTE ; type_info::`vftable'
EXTRN __security_cookie:QWORD
; COMDAT pdata
pdata SEGMENT
$pdata$?__empty_global_delete@@YAXPEAX@Z DD imagerel $LN3
DD imagerel $LN3+8
DD imagerel $unwind$?__empty_global_delete@@YAXPEAX@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?__empty_global_delete@@YAXPEAX_K@Z DD imagerel $LN3
DD imagerel $LN3+13
DD imagerel $unwind$?__empty_global_delete@@YAXPEAX_K@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0exception@std@@QEAA@XZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$??0exception@std@@QEAA@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0exception@std@@QEAA@QEBD@Z DD imagerel $LN3
DD imagerel $LN3+140
DD imagerel $unwind$??0exception@std@@QEAA@QEBD@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0exception@std@@QEAA@AEBV01@@Z DD imagerel $LN3
DD imagerel $LN3+108
DD imagerel $unwind$??0exception@std@@QEAA@AEBV01@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??1exception@std@@UEAA@XZ DD imagerel $LN3
DD imagerel $LN3+68
DD imagerel $unwind$??1exception@std@@UEAA@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?what@exception@std@@UEBAPEBDXZ DD imagerel $LN5
DD imagerel $LN5+78
DD imagerel $unwind$?what@exception@std@@UEBAPEBDXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??_Gexception@std@@UEAAPEAXI@Z DD imagerel $LN4
DD imagerel $LN4+81
DD imagerel $unwind$??_Gexception@std@@UEAAPEAXI@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0logic_error@std@@QEAA@PEBD@Z DD imagerel $LN4
DD imagerel $LN4+76
DD imagerel $unwind$??0logic_error@std@@QEAA@PEBD@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??1logic_error@std@@UEAA@XZ DD imagerel $LN3
DD imagerel $LN3+46
DD imagerel $unwind$??1logic_error@std@@UEAA@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0logic_error@std@@QEAA@AEBV01@@Z DD imagerel $LN3
DD imagerel $LN3+76
DD imagerel $unwind$??0logic_error@std@@QEAA@AEBV01@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0logic_error@std@@QEAA@$$QEAV01@@Z DD imagerel $LN3
DD imagerel $LN3+76
DD imagerel $unwind$??0logic_error@std@@QEAA@$$QEAV01@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??_Glogic_error@std@@UEAAPEAXI@Z DD imagerel $LN4
DD imagerel $LN4+81
DD imagerel $unwind$??_Glogic_error@std@@UEAAPEAXI@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0fail_fast@gsl@@QEAA@QEBD@Z DD imagerel $LN4
DD imagerel $LN4+76
DD imagerel $unwind$??0fail_fast@gsl@@QEAA@QEBD@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??1fail_fast@gsl@@UEAA@XZ DD imagerel $LN3
DD imagerel $LN3+46
DD imagerel $unwind$??1fail_fast@gsl@@UEAA@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0fail_fast@gsl@@QEAA@AEBU01@@Z DD imagerel $LN3
DD imagerel $LN3+76
DD imagerel $unwind$??0fail_fast@gsl@@QEAA@AEBU01@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0fail_fast@gsl@@QEAA@$$QEAU01@@Z DD imagerel $LN3
DD imagerel $LN3+76
DD imagerel $unwind$??0fail_fast@gsl@@QEAA@$$QEAU01@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??_Gfail_fast@gsl@@UEAAPEAXI@Z DD imagerel $LN4
DD imagerel $LN4+81
DD imagerel $unwind$??_Gfail_fast@gsl@@UEAAPEAXI@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0narrowing_error@gsl@@QEAA@XZ DD imagerel $LN3
DD imagerel $LN3+66
DD imagerel $unwind$??0narrowing_error@gsl@@QEAA@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??1narrowing_error@gsl@@UEAA@XZ DD imagerel $LN3
DD imagerel $LN3+46
DD imagerel $unwind$??1narrowing_error@gsl@@UEAA@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0narrowing_error@gsl@@QEAA@AEBU01@@Z DD imagerel $LN3
DD imagerel $LN3+76
DD imagerel $unwind$??0narrowing_error@gsl@@QEAA@AEBU01@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0narrowing_error@gsl@@QEAA@$$QEAU01@@Z DD imagerel $LN3
DD imagerel $LN3+76
DD imagerel $unwind$??0narrowing_error@gsl@@QEAA@$$QEAU01@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??_Gnarrowing_error@gsl@@UEAAPEAXI@Z DD imagerel $LN4
DD imagerel $LN4+81
DD imagerel $unwind$??_Gnarrowing_error@gsl@@UEAAPEAXI@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z DD imagerel $LN9
DD imagerel $LN9+166
DD imagerel $unwind$??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z@4HA DD imagerel ?dtor$0@?0???0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z@4HA
DD imagerel ?dtor$0@?0???0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ DD imagerel $LN3
DD imagerel $LN3+16
DD imagerel $unwind$?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z DD imagerel $LN3
DD imagerel $LN3+76
DD imagerel $unwind$??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z
pdata ENDS
pdata SEGMENT
$pdata$?test_span_unoptimizable_rangecheck@@YAXV?$span@H$0?0@gsl@@H@Z DD imagerel $LN6
DD imagerel $LN6+114
DD imagerel $unwind$?test_span_unoptimizable_rangecheck@@YAXV?$span@H$0?0@gsl@@H@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z DD imagerel $LN3
DD imagerel $LN3+74
DD imagerel $unwind$??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?last@?$span@H$0?0@gsl@@QEBA?AV12@_J@Z DD imagerel $LN3
DD imagerel $LN3+117
DD imagerel $unwind$?last@?$span@H$0?0@gsl@@QEBA?AV12@_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z DD imagerel $LN3
DD imagerel $LN3+107
DD imagerel $unwind$?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?size@?$span@H$0?0@gsl@@QEBA_JXZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$?size@?$span@H$0?0@gsl@@QEBA_JXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z DD imagerel $LN9
DD imagerel $LN9+192
DD imagerel $unwind$??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???A?$span@H$0?0@gsl@@QEBAAEAH_J@Z@4HA DD imagerel ?dtor$0@?0???A?$span@H$0?0@gsl@@QEBAAEAH_J@Z@4HA
DD imagerel ?dtor$0@?0???A?$span@H$0?0@gsl@@QEBAAEAH_J@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???A?$span@H$0?0@gsl@@QEBAAEAH_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?data@?$span@H$0?0@gsl@@QEBAPEAHXZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$?data@?$span@H$0?0@gsl@@QEBAPEAHXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?begin@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ DD imagerel $LN3
DD imagerel $LN3+64
DD imagerel $unwind$?begin@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?end@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ DD imagerel $LN3
DD imagerel $LN3+74
DD imagerel $unwind$?end@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?_Unchecked_begin@?$span@H$0?0@gsl@@QEBAPEAHXZ DD imagerel $LN3
DD imagerel $LN3+46
DD imagerel $unwind$?_Unchecked_begin@?$span@H$0?0@gsl@@QEBAPEAHXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?_Unchecked_end@?$span@H$0?0@gsl@@QEBAPEAHXZ DD imagerel $LN3
DD imagerel $LN3+70
DD imagerel $unwind$?_Unchecked_end@?$span@H$0?0@gsl@@QEBAPEAHXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?CheckRange@?$span@H$0?0@gsl@@CA_N_J0@Z DD imagerel $LN9
DD imagerel $LN9+153
DD imagerel $unwind$?CheckRange@?$span@H$0?0@gsl@@CA_N_J0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEBAPEAHXZ DD imagerel $LN3
DD imagerel $LN3+17
DD imagerel $unwind$?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEBAPEAHXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0?$span@H$0?0@gsl@@AEAA@UKnownNotNull@01@_J@Z DD imagerel $LN3
DD imagerel $LN3+74
DD imagerel $unwind$??0?$span@H$0?0@gsl@@AEAA@UKnownNotNull@01@_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z DD imagerel $LN15
DD imagerel $LN15+521
DD imagerel $unwind$?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA DD imagerel ?dtor$0@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA
DD imagerel ?dtor$0@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$1@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA DD imagerel ?dtor$1@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA
DD imagerel ?dtor$1@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA+49
DD imagerel $unwind$?dtor$1@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA
pdata ENDS
pdata SEGMENT
$pdata$?test_span_for@@YAXV?$span@H$0?0@gsl@@@Z DD imagerel $LN6
DD imagerel $LN6+115
DD imagerel $unwind$?test_span_for@@YAXV?$span@H$0?0@gsl@@@Z
$pdata$?test_span_iter@@YAXV?$span@H$0?0@gsl@@@Z DD imagerel $LN6
DD imagerel $LN6+218
DD imagerel $unwind$?test_span_iter@@YAXV?$span@H$0?0@gsl@@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@H$0?0@2@_J@Z DD imagerel $LN3
DD imagerel $LN3+50
DD imagerel $unwind$??0?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@H$0?0@2@_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ DD imagerel $LN9
DD imagerel $LN9+185
DD imagerel $unwind$??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ@4HA DD imagerel ?dtor$0@?0???D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ@4HA
DD imagerel ?dtor$0@?0???D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ@4HA+49
DD imagerel $unwind$?dtor$0@?0???D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ DD imagerel $LN9
DD imagerel $LN9+197
DD imagerel $unwind$??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ@4HA DD imagerel ?dtor$0@?0???E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ@4HA
DD imagerel ?dtor$0@?0???E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ@4HA+49
DD imagerel $unwind$?dtor$0@?0???E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??8details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z DD imagerel $LN5
DD imagerel $LN5+99
DD imagerel $unwind$??8details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??9details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z DD imagerel $LN5
DD imagerel $LN5+128
DD imagerel $unwind$??9details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z DD imagerel $LN7
DD imagerel $LN7+157
DD imagerel $unwind$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z DD imagerel $LN7
DD imagerel $LN7+181
DD imagerel $unwind$?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?_Unwrapped@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAPEAHXZ DD imagerel $LN3
DD imagerel $LN3+62
DD imagerel $unwind$?_Unwrapped@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAPEAHXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?_Seek_to@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAH@Z DD imagerel $LN3
DD imagerel $LN3+78
DD imagerel $unwind$?_Seek_to@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAH@Z
pdata ENDS
pdata SEGMENT
$pdata$?test_span_rangeiter@@YAXV?$span@H$0?0@gsl@@@Z DD imagerel $LN6
DD imagerel $LN6+132
DD imagerel $unwind$?test_span_rangeiter@@YAXV?$span@H$0?0@gsl@@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?size@?$span@G$0?0@gsl@@QEBA_JXZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$?size@?$span@G$0?0@gsl@@QEBA_JXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?size_bytes@?$span@G$0?0@gsl@@QEBA_JXZ DD imagerel $LN3
DD imagerel $LN3+82
DD imagerel $unwind$?size_bytes@?$span@G$0?0@gsl@@QEBA_JXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?data@?$span@G$0?0@gsl@@QEBAPEAGXZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$?data@?$span@G$0?0@gsl@@QEBAPEAGXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@G$0?0@gsl@@QEBAPEAGXZ DD imagerel $LN3
DD imagerel $LN3+17
DD imagerel $unwind$?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@G$0?0@gsl@@QEBAPEAGXZ
pdata ENDS
pdata SEGMENT
$pdata$?static_size_array_span@@YAXAEAUIDE_DRIVE_STATE@@@Z DD imagerel $LN6
DD imagerel $LN6+119
DD imagerel $unwind$?static_size_array_span@@YAXAEAUIDE_DRIVE_STATE@@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0?$span@E$0?0@gsl@@QEAA@PEAE_J@Z DD imagerel $LN3
DD imagerel $LN3+74
DD imagerel $unwind$??0?$span@E$0?0@gsl@@QEAA@PEAE_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?size@?$span@E$0?0@gsl@@QEBA_JXZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$?size@?$span@E$0?0@gsl@@QEBA_JXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z DD imagerel $LN9
DD imagerel $LN9+188
DD imagerel $unwind$??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???A?$span@E$0?0@gsl@@QEBAAEAE_J@Z@4HA DD imagerel ?dtor$0@?0???A?$span@E$0?0@gsl@@QEBAAEAE_J@Z@4HA
DD imagerel ?dtor$0@?0???A?$span@E$0?0@gsl@@QEBAAEAE_J@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???A?$span@E$0?0@gsl@@QEBAAEAE_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?data@?$span@E$0?0@gsl@@QEBAPEAEXZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$?data@?$span@E$0?0@gsl@@QEBAPEAEXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?begin@?$span@E$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@2@XZ DD imagerel $LN3
DD imagerel $LN3+64
DD imagerel $unwind$?begin@?$span@E$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@2@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?CheckRange@?$span@E$0?0@gsl@@CA_N_J0@Z DD imagerel $LN9
DD imagerel $LN9+153
DD imagerel $unwind$?CheckRange@?$span@E$0?0@gsl@@CA_N_J0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEBAPEAEXZ DD imagerel $LN3
DD imagerel $LN3+17
DD imagerel $unwind$?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEBAPEAEXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z DD imagerel $LN3
DD imagerel $LN3+120
DD imagerel $unwind$??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z
pdata ENDS
pdata SEGMENT
$pdata$?test_convert_span_Joe@@YAEAEAUIDE_DRIVE_STATE@@@Z DD imagerel $LN3
DD imagerel $LN3+117
DD imagerel $unwind$?test_convert_span_Joe@@YAEAEAUIDE_DRIVE_STATE@@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$convert_span@EV?$span@G$0?0@gsl@@@@YA?AV?$span@E$0?0@gsl@@V?$span@G$0?0@1@@Z DD imagerel $LN3
DD imagerel $LN3+89
DD imagerel $unwind$??$convert_span@EV?$span@G$0?0@gsl@@@@YA?AV?$span@E$0?0@gsl@@V?$span@G$0?0@1@@Z
pdata ENDS
pdata SEGMENT
$pdata$?mysubspan1@@YA_JXZ DD imagerel $LN3
DD imagerel $LN3+182
DD imagerel $unwind$?mysubspan1@@YA_JXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?last@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J@Z DD imagerel $LN3
DD imagerel $LN3+117
DD imagerel $unwind$?last@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?subspan@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J0@Z DD imagerel $LN3
DD imagerel $LN3+107
DD imagerel $unwind$?subspan@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?size@?$span@H$05@gsl@@QEBA_JXZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$?size@?$span@H$05@gsl@@QEBA_JXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?data@?$span@H$05@gsl@@QEBAPEAHXZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$?data@?$span@H$05@gsl@@QEBAPEAHXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0?$extent_type@$05@details@gsl@@QEAA@XZ DD imagerel $LN3
DD imagerel $LN3+13
DD imagerel $unwind$??0?$extent_type@$05@details@gsl@@QEAA@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0?$extent_type@$05@details@gsl@@QEAA@_J@Z DD imagerel $LN9
DD imagerel $LN9+153
DD imagerel $unwind$??0?$extent_type@$05@details@gsl@@QEAA@_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???0?$extent_type@$05@details@gsl@@QEAA@_J@Z@4HA DD imagerel ?dtor$0@?0???0?$extent_type@$05@details@gsl@@QEAA@_J@Z@4HA
DD imagerel ?dtor$0@?0???0?$extent_type@$05@details@gsl@@QEAA@_J@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???0?$extent_type@$05@details@gsl@@QEAA@_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?size@?$extent_type@$05@details@gsl@@QEBA_JXZ DD imagerel $LN3
DD imagerel $LN3+13
DD imagerel $unwind$?size@?$extent_type@$05@details@gsl@@QEBA_JXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?data@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEBAPEAHXZ DD imagerel $LN3
DD imagerel $LN3+16
DD imagerel $unwind$?data@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEBAPEAHXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z DD imagerel $LN3
DD imagerel $LN3+120
DD imagerel $unwind$??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z
pdata ENDS
pdata SEGMENT
$pdata$?mysubspan2@@YA_J_J@Z DD imagerel $LN3
DD imagerel $LN3+196
DD imagerel $unwind$?mysubspan2@@YA_J_J@Z
$pdata$?mysubspan3@@YA_JXZ DD imagerel $LN3
DD imagerel $LN3+189
DD imagerel $unwind$?mysubspan3@@YA_JXZ
$pdata$?mysubspan4@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z DD imagerel $LN4
DD imagerel $LN4+142
DD imagerel $unwind$?mysubspan4@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ DD imagerel $LN3
DD imagerel $LN3+78
DD imagerel $unwind$??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ
pdata ENDS
pdata SEGMENT
$pdata$?mysubspan5@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z DD imagerel $LN4
DD imagerel $LN4+149
DD imagerel $unwind$?mysubspan5@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z
$pdata$?mysubspan6@@YA?AV?$span@H$0?0@gsl@@PEAH_J@Z DD imagerel $LN4
DD imagerel $LN4+145
DD imagerel $unwind$?mysubspan6@@YA?AV?$span@H$0?0@gsl@@PEAH_J@Z
$pdata$?mysubspan7@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z DD imagerel $LN4
DD imagerel $LN4+148
DD imagerel $unwind$?mysubspan7@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z
$pdata$?mysubspan8@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z DD imagerel $LN4
DD imagerel $LN4+161
DD imagerel $unwind$?mysubspan8@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z
$pdata$?mysubspan9@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z DD imagerel $LN4
DD imagerel $LN4+148
DD imagerel $unwind$?mysubspan9@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z
$pdata$?doterminate@@YAXXZ DD imagerel $LN3
DD imagerel $LN3+33
DD imagerel $unwind$?doterminate@@YAXXZ
$pdata$?copy_span@@YAXV?$span@H$0?0@gsl@@0@Z DD imagerel $LN3
DD imagerel $LN3+191
DD imagerel $unwind$?copy_span@@YAXV?$span@H$0?0@gsl@@0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z DD imagerel $LN3
DD imagerel $LN3+244
DD imagerel $unwind$??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z
pdata ENDS
pdata SEGMENT
$pdata$?gsl_copy_span@@YAXV?$span@H$0?0@gsl@@0@Z DD imagerel $LN3
DD imagerel $LN3+98
DD imagerel $unwind$?gsl_copy_span@@YAXV?$span@H$0?0@gsl@@0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z DD imagerel $LN9
DD imagerel $LN9+257
DD imagerel $unwind$??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z@4HA DD imagerel ?dtor$0@?0???$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z@4HA
DD imagerel ?dtor$0@?0???$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z@4HA
pdata ENDS
pdata SEGMENT
$pdata$?test_string_std_copy@@YAXXZ DD imagerel $LN3
DD imagerel $LN3+334
DD imagerel $unwind$?test_string_std_copy@@YAXXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z DD imagerel $LN3
DD imagerel $LN3+120
DD imagerel $unwind$??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z DD imagerel $LN3
DD imagerel $LN3+74
DD imagerel $unwind$??0?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?size@?$span@$$CBD$0?0@gsl@@QEBA_JXZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$?size@?$span@$$CBD$0?0@gsl@@QEBA_JXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?data@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$?data@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?begin@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ DD imagerel $LN3
DD imagerel $LN3+64
DD imagerel $unwind$?begin@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?end@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ DD imagerel $LN3
DD imagerel $LN3+74
DD imagerel $unwind$?end@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ DD imagerel $LN3
DD imagerel $LN3+17
DD imagerel $unwind$?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?data@?$basic_string_span@$$CBD$0?0@gsl@@QEBAPEBDXZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$?data@?$basic_string_span@$$CBD$0?0@gsl@@QEBAPEBDXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?size@?$basic_string_span@$$CBD$0?0@gsl@@QEBA_JXZ DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$?size@?$basic_string_span@$$CBD$0?0@gsl@@QEBA_JXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?begin@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ DD imagerel $LN3
DD imagerel $LN3+64
DD imagerel $unwind$?begin@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?end@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ DD imagerel $LN3
DD imagerel $LN3+64
DD imagerel $unwind$?end@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$ensure_z@$$CBD$0L@@gsl@@YA?AV?$span@$$CBD$0?0@0@AEAY0L@$$CBD@Z DD imagerel $LN3
DD imagerel $LN3+108
DD imagerel $unwind$??$ensure_z@$$CBD$0L@@gsl@@YA?AV?$span@$$CBD$0?0@0@AEAY0L@$$CBD@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0V?$span@$$CBD$0?0@gsl@@X@?$basic_string_span@$$CBD$0?0@gsl@@QEAA@AEBV?$span@$$CBD$0?0@1@@Z DD imagerel $LN3
DD imagerel $LN3+37
DD imagerel $unwind$??$?0V?$span@$$CBD$0?0@gsl@@X@?$basic_string_span@$$CBD$0?0@gsl@@QEAA@AEBV?$span@$$CBD$0?0@1@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@$$CBD$0?0@2@_J@Z DD imagerel $LN3
DD imagerel $LN3+50
DD imagerel $unwind$??0?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@$$CBD$0?0@2@_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z DD imagerel $LN7
DD imagerel $LN7+157
DD imagerel $unwind$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?_Unwrapped@?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEBAPEBDXZ DD imagerel $LN3
DD imagerel $LN3+58
DD imagerel $unwind$?_Unwrapped@?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEBAPEBDXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@E$0?0@2@_J@Z DD imagerel $LN3
DD imagerel $LN3+50
DD imagerel $unwind$??0?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@E$0?0@2@_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z DD imagerel $LN7
DD imagerel $LN7+181
DD imagerel $unwind$?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?_Unwrapped@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAPEAEXZ DD imagerel $LN3
DD imagerel $LN3+58
DD imagerel $unwind$?_Unwrapped@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAPEAEXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?_Seek_to@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAE@Z DD imagerel $LN3
DD imagerel $LN3+74
DD imagerel $unwind$?_Seek_to@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAE@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z DD imagerel $LN3
DD imagerel $LN3+244
DD imagerel $unwind$??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z
pdata ENDS
pdata SEGMENT
$pdata$?test_string_gsl_copy@@YAXXZ DD imagerel $LN3
DD imagerel $LN3+263
DD imagerel $unwind$?test_string_gsl_copy@@YAXXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0V?$basic_string_span@$$CBD$0?0@gsl@@X@?$span@$$CBD$0?0@gsl@@QEAA@AEAV?$basic_string_span@$$CBD$0?0@1@@Z DD imagerel $LN3
DD imagerel $LN3+100
DD imagerel $unwind$??$?0V?$basic_string_span@$$CBD$0?0@gsl@@X@?$span@$$CBD$0?0@gsl@@QEAA@AEAV?$basic_string_span@$$CBD$0?0@1@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z DD imagerel $LN9
DD imagerel $LN9+257
DD imagerel $unwind$??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z@4HA DD imagerel ?dtor$0@?0???$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z@4HA
DD imagerel ?dtor$0@?0???$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z DD imagerel $LN3
DD imagerel $LN3+117
DD imagerel $unwind$??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z DD imagerel $LN14
DD imagerel $LN14+330
DD imagerel $unwind$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA DD imagerel ?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA
DD imagerel ?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA DD imagerel ?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA
DD imagerel ?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA+49
DD imagerel $unwind$?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z DD imagerel $LN9
DD imagerel $LN9+197
DD imagerel $unwind$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z@4HA DD imagerel ?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z@4HA
DD imagerel ?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$narrow_cast@_KAEA_J@gsl@@YA_KAEA_J@Z DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$??$narrow_cast@_KAEA_J@gsl@@YA_KAEA_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$forward@Ufail_fast@gsl@@@std@@YA$$QEAUfail_fast@gsl@@AEAU12@@Z DD imagerel $LN3
DD imagerel $LN3+13
DD imagerel $unwind$??$forward@Ufail_fast@gsl@@@std@@YA$$QEAUfail_fast@gsl@@AEAU12@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$addressof@E@std@@YAPEAEAEAE@Z DD imagerel $LN3
DD imagerel $LN3+13
DD imagerel $unwind$??$addressof@E@std@@YAPEAEAEAE@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z DD imagerel $LN9
DD imagerel $LN9+197
DD imagerel $unwind$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA DD imagerel ?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA
DD imagerel ?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$addressof@H@std@@YAPEAHAEAH@Z DD imagerel $LN3
DD imagerel $LN3+13
DD imagerel $unwind$??$addressof@H@std@@YAPEAHAEAH@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z DD imagerel $LN9
DD imagerel $LN9+178
DD imagerel $unwind$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA DD imagerel ?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA
DD imagerel ?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0?$extent_type@$0A@@details@gsl@@QEAA@XZ DD imagerel $LN3
DD imagerel $LN3+13
DD imagerel $unwind$??0?$extent_type@$0A@@details@gsl@@QEAA@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?size@?$extent_type@$0A@@details@gsl@@QEBA_JXZ DD imagerel $LN3
DD imagerel $LN3+10
DD imagerel $unwind$?size@?$extent_type@$0A@@details@gsl@@QEBA_JXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z DD imagerel $LN14
DD imagerel $LN14+330
DD imagerel $unwind$??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA DD imagerel ?dtor$0@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA
DD imagerel ?dtor$0@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$1@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA DD imagerel ?dtor$1@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA
DD imagerel ?dtor$1@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA+49
DD imagerel $unwind$?dtor$1@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Adl_verify_range@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0@Z DD imagerel $LN3
DD imagerel $LN3+79
DD imagerel $unwind$??$_Adl_verify_range@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Get_unwrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@@Z DD imagerel $LN3
DD imagerel $LN3+46
DD imagerel $unwind$??$_Get_unwrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Idl_distance@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0@Z DD imagerel $LN3
DD imagerel $LN3+62
DD imagerel $unwind$??$_Idl_distance@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Idl_distance1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0Urandom_access_iterator_tag@0@@Z DD imagerel $LN3
DD imagerel $LN3+41
DD imagerel $unwind$??$_Idl_distance1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0Urandom_access_iterator_tag@0@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Get_unwrapped_n@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J@Z DD imagerel $LN13
DD imagerel $LN13+235
DD imagerel $unwind$??$_Get_unwrapped_n@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Copy_unchecked@PEAHPEAH@std@@YAPEAHPEAH00@Z DD imagerel $LN3
DD imagerel $LN3+92
DD imagerel $unwind$??$_Copy_unchecked@PEAHPEAH@std@@YAPEAHPEAH00@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Seek_wrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH$0A@@std@@YAXAEAV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@AEBQEAH@Z DD imagerel $LN3
DD imagerel $LN3+59
DD imagerel $unwind$??$_Seek_wrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH$0A@@std@@YAXAEAV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@AEBQEAH@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$copy_n@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z DD imagerel $LN4
DD imagerel $LN4+138
DD imagerel $unwind$??$copy_n@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??0?$extent_type@$09@details@gsl@@QEAA@XZ DD imagerel $LN3
DD imagerel $LN3+13
DD imagerel $unwind$??0?$extent_type@$09@details@gsl@@QEAA@XZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?size@?$extent_type@$09@details@gsl@@QEBA_JXZ DD imagerel $LN3
DD imagerel $LN3+13
DD imagerel $unwind$?size@?$extent_type@$09@details@gsl@@QEBA_JXZ
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z DD imagerel $LN9
DD imagerel $LN9+197
DD imagerel $unwind$??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z@4HA DD imagerel ?dtor$0@?0???$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z@4HA
DD imagerel ?dtor$0@?0???$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$narrow_cast@_J_K@gsl@@YA_J$$QEA_K@Z DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$??$narrow_cast@_J_K@gsl@@YA_J$$QEA_K@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$ensure_z@$$CBD@gsl@@YA?AV?$span@$$CBD$0?0@0@AEBQEBD_J@Z DD imagerel $LN3
DD imagerel $LN3+74
DD imagerel $unwind$??$ensure_z@$$CBD@gsl@@YA?AV?$span@$$CBD$0?0@0@AEBQEBD_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Adl_verify_range@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0@Z DD imagerel $LN3
DD imagerel $LN3+79
DD imagerel $unwind$??$_Adl_verify_range@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Get_unwrapped@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEBDAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@@Z DD imagerel $LN3
DD imagerel $LN3+46
DD imagerel $unwind$??$_Get_unwrapped@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEBDAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Idl_distance@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0@Z DD imagerel $LN3
DD imagerel $LN3+62
DD imagerel $unwind$??$_Idl_distance@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Idl_distance1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0Urandom_access_iterator_tag@0@@Z DD imagerel $LN3
DD imagerel $LN3+37
DD imagerel $unwind$??$_Idl_distance1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0Urandom_access_iterator_tag@0@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Get_unwrapped_n@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAEAEBV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J@Z DD imagerel $LN13
DD imagerel $LN13+235
DD imagerel $unwind$??$_Get_unwrapped_n@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAEAEBV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Copy_unchecked@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z DD imagerel $LN3
DD imagerel $LN3+92
DD imagerel $unwind$??$_Copy_unchecked@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Seek_wrapped@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@PEAE$0A@@std@@YAXAEAV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@AEBQEAE@Z DD imagerel $LN3
DD imagerel $LN3+59
DD imagerel $unwind$??$_Seek_wrapped@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@PEAE$0A@@std@@YAXAEAV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@AEBQEAE@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$narrow@_J_J@gsl@@YA_J_J@Z DD imagerel $LN8
DD imagerel $LN8+226
DD imagerel $unwind$??$narrow@_J_J@gsl@@YA_J_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA DD imagerel ?dtor$0@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA
DD imagerel ?dtor$0@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA+35
DD imagerel $unwind$?dtor$0@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$1@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA DD imagerel ?dtor$1@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA
DD imagerel ?dtor$1@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA+35
DD imagerel $unwind$?dtor$1@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$copy_n@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z DD imagerel $LN4
DD imagerel $LN4+138
DD imagerel $unwind$??$copy_n@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0H$05X@?$span@H$0?0@gsl@@QEAA@AEBV?$span@H$05@1@@Z DD imagerel $LN3
DD imagerel $LN3+106
DD imagerel $unwind$??$?0H$05X@?$span@H$0?0@gsl@@QEAA@AEBV?$span@H$05@1@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$forward@AEA_J@std@@YAAEA_JAEA_J@Z DD imagerel $LN3
DD imagerel $LN3+13
DD imagerel $unwind$??$forward@AEA_J@std@@YAAEA_JAEA_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z DD imagerel $LN14
DD imagerel $LN14+330
DD imagerel $unwind$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA DD imagerel ?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA
DD imagerel ?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA DD imagerel ?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA
DD imagerel ?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA+49
DD imagerel $unwind$?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z DD imagerel $LN14
DD imagerel $LN14+330
DD imagerel $unwind$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA DD imagerel ?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA
DD imagerel ?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA DD imagerel ?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA
DD imagerel ?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA+49
DD imagerel $unwind$?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0$05@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$05@12@@Z DD imagerel $LN3
DD imagerel $LN3+63
DD imagerel $unwind$??$?0$05@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$05@12@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0$0A@@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$0A@@12@@Z DD imagerel $LN3
DD imagerel $LN3+63
DD imagerel $unwind$??$?0$0A@@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$0A@@12@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Adl_verify_range1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z DD imagerel $LN3
DD imagerel $LN3+103
DD imagerel $unwind$??$_Adl_verify_range1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Ptr_copy_cat@HH@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEAH0@Z DD imagerel $LN3
DD imagerel $LN3+23
DD imagerel $unwind$??$_Ptr_copy_cat@HH@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEAH0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Copy_unchecked1@PEAHPEAH@std@@YAPEAHPEAH00U_Trivially_copyable_ptr_iterator_tag@0@@Z DD imagerel $LN3
DD imagerel $LN3+71
DD imagerel $unwind$??$_Copy_unchecked1@PEAHPEAH@std@@YAPEAHPEAH00U_Trivially_copyable_ptr_iterator_tag@0@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Get_unwrapped_n@H_J$0A@@std@@YAPEAHQEAH_J@Z DD imagerel $LN3
DD imagerel $LN3+18
DD imagerel $unwind$??$_Get_unwrapped_n@H_J$0A@@std@@YAPEAHQEAH_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Copy_n_unchecked3@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z DD imagerel $LN3
DD imagerel $LN3+92
DD imagerel $unwind$??$_Copy_n_unchecked3@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Seek_wrapped@H@std@@YAXAEAPEAHQEAH@Z DD imagerel $LN3
DD imagerel $LN3+26
DD imagerel $unwind$??$_Seek_wrapped@H@std@@YAXAEAPEAHQEAH@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0$09@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$09@12@@Z DD imagerel $LN3
DD imagerel $LN3+63
DD imagerel $unwind$??$?0$09@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$09@12@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$forward@_K@std@@YA$$QEA_KAEA_K@Z DD imagerel $LN3
DD imagerel $LN3+13
DD imagerel $unwind$??$forward@_K@std@@YA$$QEA_KAEA_K@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z DD imagerel $LN21
DD imagerel $LN21+505
DD imagerel $unwind$??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA DD imagerel ?dtor$0@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA
DD imagerel ?dtor$0@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$1@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA DD imagerel ?dtor$1@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA
DD imagerel ?dtor$1@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA+49
DD imagerel $unwind$?dtor$1@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$2@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA DD imagerel ?dtor$2@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA
DD imagerel ?dtor$2@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA+49
DD imagerel $unwind$?dtor$2@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Adl_verify_range1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z DD imagerel $LN3
DD imagerel $LN3+103
DD imagerel $unwind$??$_Adl_verify_range1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Ptr_copy_cat@$$CBDE@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEBDAEBQEAE@Z DD imagerel $LN3
DD imagerel $LN3+23
DD imagerel $unwind$??$_Ptr_copy_cat@$$CBDE@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEBDAEBQEAE@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Copy_unchecked1@PEBDPEAE@std@@YAPEAEPEBD0PEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z DD imagerel $LN3
DD imagerel $LN3+71
DD imagerel $unwind$??$_Copy_unchecked1@PEBDPEAE@std@@YAPEAEPEBD0PEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$narrow_cast@_JAEA_J@gsl@@YA_JAEA_J@Z DD imagerel $LN3
DD imagerel $LN3+49
DD imagerel $unwind$??$narrow_cast@_JAEA_J@gsl@@YA_JAEA_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$throw_exception@Unarrowing_error@gsl@@@details@gsl@@YAX$$QEAUnarrowing_error@1@@Z DD imagerel $LN3
DD imagerel $LN3+76
DD imagerel $unwind$??$throw_exception@Unarrowing_error@gsl@@@details@gsl@@YAX$$QEAUnarrowing_error@1@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Get_unwrapped_n@$$CBD_J$0A@@std@@YAPEBDQEBD_J@Z DD imagerel $LN3
DD imagerel $LN3+18
DD imagerel $unwind$??$_Get_unwrapped_n@$$CBD_J$0A@@std@@YAPEBDQEBD_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Get_unwrapped_n@E_J$0A@@std@@YAPEAEQEAE_J@Z DD imagerel $LN3
DD imagerel $LN3+18
DD imagerel $unwind$??$_Get_unwrapped_n@E_J$0A@@std@@YAPEAEQEAE_J@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Copy_n_unchecked3@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z DD imagerel $LN3
DD imagerel $LN3+92
DD imagerel $unwind$??$_Copy_n_unchecked3@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Seek_wrapped@E@std@@YAXAEAPEAEQEAE@Z DD imagerel $LN3
DD imagerel $LN3+26
DD imagerel $unwind$??$_Seek_wrapped@E@std@@YAXAEAPEAEQEAE@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z DD imagerel $LN14
DD imagerel $LN14+330
DD imagerel $unwind$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA DD imagerel ?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA
DD imagerel ?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA+49
DD imagerel $unwind$?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$?dtor$1@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA DD imagerel ?dtor$1@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA
DD imagerel ?dtor$1@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA+49
DD imagerel $unwind$?dtor$1@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Copy_memmove@PEAHPEAH@std@@YAPEAHPEAH00@Z DD imagerel $LN3
DD imagerel $LN3+133
DD imagerel $unwind$??$_Copy_memmove@PEAHPEAH@std@@YAPEAHPEAH00@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Copy_n_unchecked4@PEAH_JPEAH@std@@YAPEAHPEAH_J0U_Trivially_copyable_ptr_iterator_tag@0@@Z DD imagerel $LN3
DD imagerel $LN3+83
DD imagerel $unwind$??$_Copy_n_unchecked4@PEAH_JPEAH@std@@YAPEAHPEAH_J0U_Trivially_copyable_ptr_iterator_tag@0@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Copy_memmove@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z DD imagerel $LN3
DD imagerel $LN3+133
DD imagerel $unwind$??$_Copy_memmove@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$forward@Unarrowing_error@gsl@@@std@@YA$$QEAUnarrowing_error@gsl@@AEAU12@@Z DD imagerel $LN3
DD imagerel $LN3+13
DD imagerel $unwind$??$forward@Unarrowing_error@gsl@@@std@@YA$$QEAUnarrowing_error@gsl@@AEAU12@@Z
pdata ENDS
; COMDAT pdata
pdata SEGMENT
$pdata$??$_Copy_n_unchecked4@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z DD imagerel $LN3
DD imagerel $LN3+85
DD imagerel $unwind$??$_Copy_n_unchecked4@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z
pdata ENDS
; COMDAT rtc$TMZ
rtc$TMZ SEGMENT
_RTC_Shutdown.rtc$TMZ DQ FLAT:_RTC_Shutdown
rtc$TMZ ENDS
; COMDAT rtc$IMZ
rtc$IMZ SEGMENT
_RTC_InitBase.rtc$IMZ DQ FLAT:_RTC_InitBase
rtc$IMZ ENDS
; COMDAT ??_R1A@?0A@EA@narrowing_error@gsl@@8
rdata$r SEGMENT
??_R1A@?0A@EA@narrowing_error@gsl@@8 DD imagerel ??_R0?AUnarrowing_error@gsl@@@8 ; gsl::narrowing_error::`RTTI Base Class Descriptor at (0,-1,0,64)'
DD 01H
DD 00H
DD 0ffffffffH
DD 00H
DD 040H
DD imagerel ??_R3narrowing_error@gsl@@8
rdata$r ENDS
; COMDAT ??_R2narrowing_error@gsl@@8
rdata$r SEGMENT
??_R2narrowing_error@gsl@@8 DD imagerel ??_R1A@?0A@EA@narrowing_error@gsl@@8 ; gsl::narrowing_error::`RTTI Base Class Array'
DD imagerel ??_R1A@?0A@EA@exception@std@@8
ORG $+3
rdata$r ENDS
; COMDAT ??_R3narrowing_error@gsl@@8
rdata$r SEGMENT
??_R3narrowing_error@gsl@@8 DD 00H ; gsl::narrowing_error::`RTTI Class Hierarchy Descriptor'
DD 00H
DD 02H
DD imagerel ??_R2narrowing_error@gsl@@8
rdata$r ENDS
; COMDAT ??_R4narrowing_error@gsl@@6B@
rdata$r SEGMENT
??_R4narrowing_error@gsl@@6B@ DD 01H ; gsl::narrowing_error::`RTTI Complete Object Locator'
DD 00H
DD 00H
DD imagerel ??_R0?AUnarrowing_error@gsl@@@8
DD imagerel ??_R3narrowing_error@gsl@@8
DD imagerel ??_R4narrowing_error@gsl@@6B@
rdata$r ENDS
; COMDAT ??_R1A@?0A@EA@fail_fast@gsl@@8
rdata$r SEGMENT
??_R1A@?0A@EA@fail_fast@gsl@@8 DD imagerel ??_R0?AUfail_fast@gsl@@@8 ; gsl::fail_fast::`RTTI Base Class Descriptor at (0,-1,0,64)'
DD 02H
DD 00H
DD 0ffffffffH
DD 00H
DD 040H
DD imagerel ??_R3fail_fast@gsl@@8
rdata$r ENDS
; COMDAT ??_R2fail_fast@gsl@@8
rdata$r SEGMENT
??_R2fail_fast@gsl@@8 DD imagerel ??_R1A@?0A@EA@fail_fast@gsl@@8 ; gsl::fail_fast::`RTTI Base Class Array'
DD imagerel ??_R1A@?0A@EA@logic_error@std@@8
DD imagerel ??_R1A@?0A@EA@exception@std@@8
ORG $+3
rdata$r ENDS
; COMDAT ??_R3fail_fast@gsl@@8
rdata$r SEGMENT
??_R3fail_fast@gsl@@8 DD 00H ; gsl::fail_fast::`RTTI Class Hierarchy Descriptor'
DD 00H
DD 03H
DD imagerel ??_R2fail_fast@gsl@@8
rdata$r ENDS
; COMDAT ??_R4fail_fast@gsl@@6B@
rdata$r SEGMENT
??_R4fail_fast@gsl@@6B@ DD 01H ; gsl::fail_fast::`RTTI Complete Object Locator'
DD 00H
DD 00H
DD imagerel ??_R0?AUfail_fast@gsl@@@8
DD imagerel ??_R3fail_fast@gsl@@8
DD imagerel ??_R4fail_fast@gsl@@6B@
rdata$r ENDS
; COMDAT ??_R1A@?0A@EA@logic_error@std@@8
rdata$r SEGMENT
??_R1A@?0A@EA@logic_error@std@@8 DD imagerel ??_R0?AVlogic_error@std@@@8 ; std::logic_error::`RTTI Base Class Descriptor at (0,-1,0,64)'
DD 01H
DD 00H
DD 0ffffffffH
DD 00H
DD 040H
DD imagerel ??_R3logic_error@std@@8
rdata$r ENDS
; COMDAT ??_R2logic_error@std@@8
rdata$r SEGMENT
??_R2logic_error@std@@8 DD imagerel ??_R1A@?0A@EA@logic_error@std@@8 ; std::logic_error::`RTTI Base Class Array'
DD imagerel ??_R1A@?0A@EA@exception@std@@8
ORG $+3
rdata$r ENDS
; COMDAT ??_R3logic_error@std@@8
rdata$r SEGMENT
??_R3logic_error@std@@8 DD 00H ; std::logic_error::`RTTI Class Hierarchy Descriptor'
DD 00H
DD 02H
DD imagerel ??_R2logic_error@std@@8
rdata$r ENDS
; COMDAT ??_R4logic_error@std@@6B@
rdata$r SEGMENT
??_R4logic_error@std@@6B@ DD 01H ; std::logic_error::`RTTI Complete Object Locator'
DD 00H
DD 00H
DD imagerel ??_R0?AVlogic_error@std@@@8
DD imagerel ??_R3logic_error@std@@8
DD imagerel ??_R4logic_error@std@@6B@
rdata$r ENDS
; COMDAT ??_R1A@?0A@EA@exception@std@@8
rdata$r SEGMENT
??_R1A@?0A@EA@exception@std@@8 DD imagerel ??_R0?AVexception@std@@@8 ; std::exception::`RTTI Base Class Descriptor at (0,-1,0,64)'
DD 00H
DD 00H
DD 0ffffffffH
DD 00H
DD 040H
DD imagerel ??_R3exception@std@@8
rdata$r ENDS
; COMDAT ??_R2exception@std@@8
rdata$r SEGMENT
??_R2exception@std@@8 DD imagerel ??_R1A@?0A@EA@exception@std@@8 ; std::exception::`RTTI Base Class Array'
ORG $+3
rdata$r ENDS
; COMDAT ??_R3exception@std@@8
rdata$r SEGMENT
??_R3exception@std@@8 DD 00H ; std::exception::`RTTI Class Hierarchy Descriptor'
DD 00H
DD 01H
DD imagerel ??_R2exception@std@@8
rdata$r ENDS
; COMDAT ??_R4exception@std@@6B@
rdata$r SEGMENT
??_R4exception@std@@6B@ DD 01H ; std::exception::`RTTI Complete Object Locator'
DD 00H
DD 00H
DD imagerel ??_R0?AVexception@std@@@8
DD imagerel ??_R3exception@std@@8
DD imagerel ??_R4exception@std@@6B@
rdata$r ENDS
; COMDAT ??_C@_0ED@GOAPCFOK@GSL?3?5Precondition?5failure?5at?5c?3@
CONST SEGMENT
??_C@_0ED@GOAPCFOK@GSL?3?5Precondition?5failure?5at?5c?3@ DB 'GSL: Precon'
DB 'dition failure at c:\projects\gsl\include\gsl\span: 266', 00H ; `string'
CONST ENDS
; COMDAT _CT??_R0?AUnarrowing_error@gsl@@@8??0narrowing_error@gsl@@QEAA@AEBU01@@Z24
xdata$x SEGMENT
_CT??_R0?AUnarrowing_error@gsl@@@8??0narrowing_error@gsl@@QEAA@AEBU01@@Z24 DD 00H
DD imagerel ??_R0?AUnarrowing_error@gsl@@@8
DD 00H
DD 0ffffffffH
ORG $+4
DD 018H
DD imagerel ??0narrowing_error@gsl@@QEAA@AEBU01@@Z
xdata$x ENDS
; COMDAT ??_R0?AUnarrowing_error@gsl@@@8
data$r SEGMENT
??_R0?AUnarrowing_error@gsl@@@8 DQ FLAT:??_7type_info@@6B@ ; gsl::narrowing_error `RTTI Type Descriptor'
DQ 0000000000000000H
DB '.?AUnarrowing_error@gsl@@', 00H
data$r ENDS
; COMDAT _CTA2?AUnarrowing_error@gsl@@
xdata$x SEGMENT
_CTA2?AUnarrowing_error@gsl@@ DD 02H
DD imagerel _CT??_R0?AUnarrowing_error@gsl@@@8??0narrowing_error@gsl@@QEAA@AEBU01@@Z24
DD imagerel _CT??_R0?AVexception@std@@@8??0exception@std@@QEAA@AEBV01@@Z24
xdata$x ENDS
; COMDAT _TI2?AUnarrowing_error@gsl@@
xdata$x SEGMENT
_TI2?AUnarrowing_error@gsl@@ DD 00H
DD imagerel ??1narrowing_error@gsl@@UEAA@XZ
DD 00H
DD imagerel _CTA2?AUnarrowing_error@gsl@@
xdata$x ENDS
; COMDAT ??_C@_0ED@JOPLHMJE@GSL?3?5Precondition?5failure?5at?5c?3@
CONST SEGMENT
??_C@_0ED@JOPLHMJE@GSL?3?5Precondition?5failure?5at?5c?3@ DB 'GSL: Precon'
DB 'dition failure at c:\projects\gsl\include\gsl\span: 321', 00H ; `string'
CONST ENDS
; COMDAT ??_C@_0ED@LKBIKNJ@GSL?3?5Precondition?5failure?5at?5c?3@
CONST SEGMENT
??_C@_0ED@LKBIKNJ@GSL?3?5Precondition?5failure?5at?5c?3@ DB 'GSL: Precond'
DB 'ition failure at c:\projects\gsl\include\gsl\span: 272', 00H ; `string'
CONST ENDS
; COMDAT ??_C@_0ED@JMOIJPGK@GSL?3?5Precondition?5failure?5at?5c?3@
CONST SEGMENT
??_C@_0ED@JMOIJPGK@GSL?3?5Precondition?5failure?5at?5c?3@ DB 'GSL: Precon'
DB 'dition failure at c:\projects\gsl\include\gsl\span: 592', 00H ; `string'
CONST ENDS
; COMDAT ??_C@_0ED@HPBMEGKB@GSL?3?5Precondition?5failure?5at?5c?3@
CONST SEGMENT
??_C@_0ED@HPBMEGKB@GSL?3?5Precondition?5failure?5at?5c?3@ DB 'GSL: Precon'
DB 'dition failure at c:\projects\gsl\include\gsl\span: 599', 00H ; `string'
CONST ENDS
; COMDAT ??_C@_0ED@GGAHHHOA@GSL?3?5Precondition?5failure?5at?5c?3@
CONST SEGMENT
??_C@_0ED@GGAHHHOA@GSL?3?5Precondition?5failure?5at?5c?3@ DB 'GSL: Precon'
DB 'dition failure at c:\projects\gsl\include\gsl\span: 598', 00H ; `string'
CONST ENDS
; COMDAT ??_C@_1CG@NMONALKO@?$AA?$CC?$AAi?$AAn?$AAt?$AAe?$AAg?$AAe?$AAr?$AA?5?$AAo?$AAv?$AAe?$AAr?$AAf?$AAl@
CONST SEGMENT
??_C@_1CG@NMONALKO@?$AA?$CC?$AAi?$AAn?$AAt?$AAe?$AAg?$AAe?$AAr?$AA?5?$AAo?$AAv?$AAe?$AAr?$AAf?$AAl@ DB '"'
DB 00H, 'i', 00H, 'n', 00H, 't', 00H, 'e', 00H, 'g', 00H, 'e', 00H
DB 'r', 00H, ' ', 00H, 'o', 00H, 'v', 00H, 'e', 00H, 'r', 00H, 'f'
DB 00H, 'l', 00H, 'o', 00H, 'w', 00H, '"', 00H, 00H, 00H ; `string'
CONST ENDS
; COMDAT ??_C@_1CM@MJCLAPGA@?$AAs?$AAt?$AAd?$AA?3?$AA?3?$AA_?$AAG?$AAe?$AAt?$AA_?$AAu?$AAn?$AAw?$AAr?$AAa@
CONST SEGMENT
??_C@_1CM@MJCLAPGA@?$AAs?$AAt?$AAd?$AA?3?$AA?3?$AA_?$AAG?$AAe?$AAt?$AA_?$AAu?$AAn?$AAw?$AAr?$AAa@ DB 's'
DB 00H, 't', 00H, 'd', 00H, ':', 00H, ':', 00H, '_', 00H, 'G', 00H
DB 'e', 00H, 't', 00H, '_', 00H, 'u', 00H, 'n', 00H, 'w', 00H, 'r'
DB 00H, 'a', 00H, 'p', 00H, 'p', 00H, 'e', 00H, 'd', 00H, '_', 00H
DB 'n', 00H, 00H, 00H ; `string'
CONST ENDS
; COMDAT ??_C@_0BB@KBEKGHFK@integer?5overflow@
CONST SEGMENT
??_C@_0BB@KBEKGHFK@integer?5overflow@ DB 'integer overflow', 00H ; `string'
CONST ENDS
; COMDAT _CT??_R0?AVlogic_error@std@@@8??0logic_error@std@@QEAA@AEBV01@@Z24
xdata$x SEGMENT
_CT??_R0?AVlogic_error@std@@@8??0logic_error@std@@QEAA@AEBV01@@Z24 DD 00H
DD imagerel ??_R0?AVlogic_error@std@@@8
DD 00H
DD 0ffffffffH
ORG $+4
DD 018H
DD imagerel ??0logic_error@std@@QEAA@AEBV01@@Z
xdata$x ENDS
; COMDAT ??_R0?AVlogic_error@std@@@8
data$r SEGMENT
??_R0?AVlogic_error@std@@@8 DQ FLAT:??_7type_info@@6B@ ; std::logic_error `RTTI Type Descriptor'
DQ 0000000000000000H
DB '.?AVlogic_error@std@@', 00H
data$r ENDS
; COMDAT _CT??_R0?AUfail_fast@gsl@@@8??0fail_fast@gsl@@QEAA@AEBU01@@Z24
xdata$x SEGMENT
_CT??_R0?AUfail_fast@gsl@@@8??0fail_fast@gsl@@QEAA@AEBU01@@Z24 DD 00H
DD imagerel ??_R0?AUfail_fast@gsl@@@8
DD 00H
DD 0ffffffffH
ORG $+4
DD 018H
DD imagerel ??0fail_fast@gsl@@QEAA@AEBU01@@Z
xdata$x ENDS
; COMDAT ??_R0?AUfail_fast@gsl@@@8
data$r SEGMENT
??_R0?AUfail_fast@gsl@@@8 DQ FLAT:??_7type_info@@6B@ ; gsl::fail_fast `RTTI Type Descriptor'
DQ 0000000000000000H
DB '.?AUfail_fast@gsl@@', 00H
data$r ENDS
; COMDAT _CTA3?AUfail_fast@gsl@@
xdata$x SEGMENT
_CTA3?AUfail_fast@gsl@@ DD 03H
DD imagerel _CT??_R0?AUfail_fast@gsl@@@8??0fail_fast@gsl@@QEAA@AEBU01@@Z24
DD imagerel _CT??_R0?AVlogic_error@std@@@8??0logic_error@std@@QEAA@AEBV01@@Z24
DD imagerel _CT??_R0?AVexception@std@@@8??0exception@std@@QEAA@AEBV01@@Z24
xdata$x ENDS
; COMDAT _TI3?AUfail_fast@gsl@@
xdata$x SEGMENT
_TI3?AUfail_fast@gsl@@ DD 00H
DD imagerel ??1fail_fast@gsl@@UEAA@XZ
DD 00H
DD imagerel _CTA3?AUfail_fast@gsl@@
xdata$x ENDS
; COMDAT ??_C@_0ED@MMILCDJF@GSL?3?5Precondition?5failure?5at?5c?3@
CONST SEGMENT
??_C@_0ED@MMILCDJF@GSL?3?5Precondition?5failure?5at?5c?3@ DB 'GSL: Precon'
DB 'dition failure at c:\projects\gsl\include\gsl\span: 635', 00H ; `string'
CONST ENDS
; COMDAT ??_C@_0ED@KIOHOGJB@GSL?3?5Precondition?5failure?5at?5c?3@
CONST SEGMENT
??_C@_0ED@KIOHOGJB@GSL?3?5Precondition?5failure?5at?5c?3@ DB 'GSL: Precon'
DB 'dition failure at c:\projects\gsl\include\gsl\span: 631', 00H ; `string'
CONST ENDS
; COMDAT ??_C@_0ED@GHOHAFBM@GSL?3?5Precondition?5failure?5at?5c?3@
CONST SEGMENT
??_C@_0ED@GHOHAFBM@GSL?3?5Precondition?5failure?5at?5c?3@ DB 'GSL: Precon'
DB 'dition failure at c:\projects\gsl\include\gsl\span: 157', 00H ; `string'
CONST ENDS
; COMDAT ??_C@_0ED@PLCCJGML@GSL?3?5Precondition?5failure?5at?5c?3@
CONST SEGMENT
??_C@_0ED@PLCCJGML@GSL?3?5Precondition?5failure?5at?5c?3@ DB 'GSL: Precon'
DB 'dition failure at c:\projects\gsl\include\gsl\span: 169', 00H ; `string'
CONST ENDS
; COMDAT ??_C@_0ED@HAMNHNCO@GSL?3?5Precondition?5failure?5at?5c?3@
CONST SEGMENT
??_C@_0ED@HAMNHNCO@GSL?3?5Precondition?5failure?5at?5c?3@ DB 'GSL: Precon'
DB 'dition failure at c:\projects\gsl\include\gsl\span: 509', 00H ; `string'
CONST ENDS
; COMDAT ??_C@_0ED@NAHIIAGE@GSL?3?5Precondition?5failure?5at?5c?3@
CONST SEGMENT
??_C@_0ED@NAHIIAGE@GSL?3?5Precondition?5failure?5at?5c?3@ DB 'GSL: Precon'
DB 'dition failure at c:\projects\gsl\include\gsl\span: 336', 00H ; `string'
CONST ENDS
; COMDAT ??_7narrowing_error@gsl@@6B@
CONST SEGMENT
??_7narrowing_error@gsl@@6B@ DQ FLAT:??_R4narrowing_error@gsl@@6B@ ; gsl::narrowing_error::`vftable'
DQ FLAT:??_Enarrowing_error@gsl@@UEAAPEAXI@Z
DQ FLAT:?what@exception@std@@UEBAPEBDXZ
CONST ENDS
; COMDAT _CT??_R0?AVexception@std@@@8??0exception@std@@QEAA@AEBV01@@Z24
xdata$x SEGMENT
_CT??_R0?AVexception@std@@@8??0exception@std@@QEAA@AEBV01@@Z24 DD 00H
DD imagerel ??_R0?AVexception@std@@@8
DD 00H
DD 0ffffffffH
ORG $+4
DD 018H
DD imagerel ??0exception@std@@QEAA@AEBV01@@Z
xdata$x ENDS
; COMDAT ??_R0?AVexception@std@@@8
data$r SEGMENT
??_R0?AVexception@std@@@8 DQ FLAT:??_7type_info@@6B@ ; std::exception `RTTI Type Descriptor'
DQ 0000000000000000H
DB '.?AVexception@std@@', 00H
data$r ENDS
; COMDAT ??_7fail_fast@gsl@@6B@
CONST SEGMENT
??_7fail_fast@gsl@@6B@ DQ FLAT:??_R4fail_fast@gsl@@6B@ ; gsl::fail_fast::`vftable'
DQ FLAT:??_Efail_fast@gsl@@UEAAPEAXI@Z
DQ FLAT:?what@exception@std@@UEBAPEBDXZ
CONST ENDS
; COMDAT ??_7logic_error@std@@6B@
CONST SEGMENT
??_7logic_error@std@@6B@ DQ FLAT:??_R4logic_error@std@@6B@ ; std::logic_error::`vftable'
DQ FLAT:??_Elogic_error@std@@UEAAPEAXI@Z
DQ FLAT:?what@exception@std@@UEBAPEBDXZ
CONST ENDS
; COMDAT ??_C@_1NC@FANNPLN@?$AAc?$AA?3?$AA?2?$AAp?$AAr?$AAo?$AAg?$AAr?$AAa?$AAm?$AA?5?$AAf?$AAi?$AAl?$AAe@
CONST SEGMENT
??_C@_1NC@FANNPLN@?$AAc?$AA?3?$AA?2?$AAp?$AAr?$AAo?$AAg?$AAr?$AAa?$AAm?$AA?5?$AAf?$AAi?$AAl?$AAe@ DB 'c'
DB 00H, ':', 00H, '\', 00H, 'p', 00H, 'r', 00H, 'o', 00H, 'g', 00H
DB 'r', 00H, 'a', 00H, 'm', 00H, ' ', 00H, 'f', 00H, 'i', 00H, 'l'
DB 00H, 'e', 00H, 's', 00H, ' ', 00H, '(', 00H, 'x', 00H, '8', 00H
DB '6', 00H, ')', 00H, '\', 00H, 'm', 00H, 'i', 00H, 'c', 00H, 'r'
DB 00H, 'o', 00H, 's', 00H, 'o', 00H, 'f', 00H, 't', 00H, ' ', 00H
DB 'v', 00H, 'i', 00H, 's', 00H, 'u', 00H, 'a', 00H, 'l', 00H, ' '
DB 00H, 's', 00H, 't', 00H, 'u', 00H, 'd', 00H, 'i', 00H, 'o', 00H
DB '\', 00H, '2', 00H, '0', 00H, '1', 00H, '7', 00H, '\', 00H, 'c'
DB 00H, 'o', 00H, 'm', 00H, 'm', 00H, 'u', 00H, 'n', 00H, 'i', 00H
DB 't', 00H, 'y', 00H, '\', 00H, 'v', 00H, 'c', 00H, '\', 00H, 't'
DB 00H, 'o', 00H, 'o', 00H, 'l', 00H, 's', 00H, '\', 00H, 'm', 00H
DB 's', 00H, 'v', 00H, 'c', 00H, '\', 00H, '1', 00H, '4', 00H, '.'
DB 00H, '1', 00H, '6', 00H, '.', 00H, '2', 00H, '7', 00H, '0', 00H
DB '2', 00H, '3', 00H, '\', 00H, 'i', 00H, 'n', 00H, 'c', 00H, 'l'
DB 00H, 'u', 00H, 'd', 00H, 'e', 00H, '\', 00H, 'x', 00H, 'u', 00H
DB 't', 00H, 'i', 00H, 'l', 00H, 'i', 00H, 't', 00H, 'y', 00H, 00H
DB 00H ; `string'
CONST ENDS
; COMDAT ??_C@_0GJ@EJIMBHLG@c?3?2program?5files?5?$CIx86?$CJ?2microsof@
CONST SEGMENT
??_C@_0GJ@EJIMBHLG@c?3?2program?5files?5?$CIx86?$CJ?2microsof@ DB 'c:\pro'
DB 'gram files (x86)\microsoft visual studio\2017\community\vc\to'
DB 'ols\msvc\14.16.27023\include\xutility', 00H ; `string'
CONST ENDS
; COMDAT ??_C@_02DKCKIIND@?$CFs@
CONST SEGMENT
??_C@_02DKCKIIND@?$CFs@ DB '%s', 00H ; `string'
CONST ENDS
; COMDAT ??_C@_0BC@EOODALEL@Unknown?5exception@
CONST SEGMENT
??_C@_0BC@EOODALEL@Unknown?5exception@ DB 'Unknown exception', 00H ; `string'
CONST ENDS
; COMDAT ??_7exception@std@@6B@
CONST SEGMENT
??_7exception@std@@6B@ DQ FLAT:??_R4exception@std@@6B@ ; std::exception::`vftable'
DQ FLAT:??_Eexception@std@@UEAAPEAXI@Z
DQ FLAT:?what@exception@std@@UEBAPEBDXZ
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Copy_n_unchecked4@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z DD 022d01H
DD 070153219H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$forward@Unarrowing_error@gsl@@@std@@YA$$QEAUnarrowing_error@gsl@@AEAU12@@Z DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Copy_memmove@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z DD 022801H
DD 070107214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Copy_n_unchecked4@PEAH_JPEAH@std@@YAPEAHPEAH_J0U_Trivially_copyable_ptr_iterator_tag@0@@Z DD 022d01H
DD 070153219H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Copy_memmove@PEAHPEAH@std@@YAPEAHPEAH00@Z DD 022801H
DD 070107214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$1@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z DD imagerel ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z
DD 0ffffffffH
DD imagerel ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z+156
DD 00H
DD imagerel ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z+178
DD 0ffffffffH
DD imagerel ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z+265
DD 01H
DD imagerel ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z+287
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA
DD 0ffffffffH
DD imagerel ?dtor$1@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z DD 019930522H
DD 02H
DD imagerel $stateUnwindMap$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z
DD 00H
DD 00H
DD 05H
DD imagerel $ip2state$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z
DD 058H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z DD 023711H
DD 07010f217H
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Seek_wrapped@E@std@@YAXAEAPEAEQEAE@Z DD 010b01H
DD 0700bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Copy_n_unchecked3@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z DD 022801H
DD 070105214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Get_unwrapped_n@E_J$0A@@std@@YAPEAEQEAE_J@Z DD 010b01H
DD 0700bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Get_unwrapped_n@$$CBD_J$0A@@std@@YAPEBDQEBD_J@Z DD 010b01H
DD 0700bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$throw_exception@Unarrowing_error@gsl@@@details@gsl@@YAX$$QEAUnarrowing_error@1@@Z DD 021e01H
DD 07006720aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$narrow_cast@_JAEA_J@gsl@@YA_JAEA_J@Z DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Copy_unchecked1@PEBDPEAE@std@@YAPEAEPEBD0PEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z DD 022d01H
DD 070153219H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Ptr_copy_cat@$$CBDE@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEBDAEBQEAE@Z DD 011001H
DD 07010H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Adl_verify_range1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z DD 032901H
DD 070118215H
DD 06010H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$2@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$1@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z DD imagerel ??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z
DD 0ffffffffH
DD imagerel ??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z+117
DD 00H
DD imagerel ??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z+142
DD 0ffffffffH
DD imagerel ??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z+232
DD 01H
DD imagerel ??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z+257
DD 0ffffffffH
DD imagerel ??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z+394
DD 02H
DD imagerel ??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z+419
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA
DD 0ffffffffH
DD imagerel ?dtor$1@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA
DD 0ffffffffH
DD imagerel ?dtor$2@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z DD 019930522H
DD 03H
DD imagerel $stateUnwindMap$??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z
DD 00H
DD 00H
DD 07H
DD imagerel $ip2state$??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z
DD 078H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z DD 033711H
DD 0160117H
DD 07010H
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$forward@_K@std@@YA$$QEA_KAEA_K@Z DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0$09@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$09@12@@Z DD 022201H
DD 0700a320eH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Seek_wrapped@H@std@@YAXAEAPEAHQEAH@Z DD 010b01H
DD 0700bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Copy_n_unchecked3@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z DD 022801H
DD 070105214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Get_unwrapped_n@H_J$0A@@std@@YAPEAHQEAH_J@Z DD 010b01H
DD 0700bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Copy_unchecked1@PEAHPEAH@std@@YAPEAHPEAH00U_Trivially_copyable_ptr_iterator_tag@0@@Z DD 022d01H
DD 070153219H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Ptr_copy_cat@HH@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEAH0@Z DD 011001H
DD 07010H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Adl_verify_range1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z DD 032901H
DD 070118215H
DD 06010H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0$0A@@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$0A@@12@@Z DD 022201H
DD 0700a320eH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0$05@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$05@12@@Z DD 022201H
DD 0700a320eH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z
DD 0ffffffffH
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z+156
DD 00H
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z+178
DD 0ffffffffH
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z+265
DD 01H
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z+287
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA
DD 0ffffffffH
DD imagerel ?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z DD 019930522H
DD 02H
DD imagerel $stateUnwindMap$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z
DD 00H
DD 00H
DD 05H
DD imagerel $ip2state$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z
DD 058H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z DD 023711H
DD 07010f217H
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z
DD 0ffffffffH
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z+156
DD 00H
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z+178
DD 0ffffffffH
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z+265
DD 01H
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z+287
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA
DD 0ffffffffH
DD imagerel ?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z DD 019930522H
DD 02H
DD imagerel $stateUnwindMap$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z
DD 00H
DD 00H
DD 05H
DD imagerel $ip2state$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z
DD 058H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z DD 023711H
DD 07010f217H
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$forward@AEA_J@std@@YAAEA_JAEA_J@Z DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0H$05X@?$span@H$0?0@gsl@@QEAA@AEBV?$span@H$05@1@@Z DD 022301H
DD 0700b520fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$copy_n@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z DD 022801H
DD 070105214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$1@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$narrow@_J_J@gsl@@YA_J_J@Z DD imagerel ??$narrow@_J_J@gsl@@YA_J_J@Z
DD 0ffffffffH
DD imagerel ??$narrow@_J_J@gsl@@YA_J_J@Z+120
DD 00H
DD imagerel ??$narrow@_J_J@gsl@@YA_J_J@Z+142
DD 0ffffffffH
DD imagerel ??$narrow@_J_J@gsl@@YA_J_J@Z+190
DD 01H
DD imagerel ??$narrow@_J_J@gsl@@YA_J_J@Z+212
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$narrow@_J_J@gsl@@YA_J_J@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA
DD 0ffffffffH
DD imagerel ?dtor$1@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$narrow@_J_J@gsl@@YA_J_J@Z DD 019930522H
DD 02H
DD imagerel $stateUnwindMap$??$narrow@_J_J@gsl@@YA_J_J@Z
DD 00H
DD 00H
DD 05H
DD imagerel $ip2state$??$narrow@_J_J@gsl@@YA_J_J@Z
DD 058H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$narrow@_J_J@gsl@@YA_J_J@Z DD 022d11H
DD 07006f20dH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$narrow@_J_J@gsl@@YA_J_J@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Seek_wrapped@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@PEAE$0A@@std@@YAXAEAV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@AEBQEAE@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Copy_unchecked@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z DD 022801H
DD 070105214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Get_unwrapped_n@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAEAEBV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J@Z DD 022301H
DD 0700b720fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Idl_distance1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0Urandom_access_iterator_tag@0@@Z DD 011001H
DD 07010H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Idl_distance@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0@Z DD 022301H
DD 0700b520fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Get_unwrapped@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEBDAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@@Z DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Adl_verify_range@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0@Z DD 022301H
DD 0700b520fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$ensure_z@$$CBD@gsl@@YA?AV?$span@$$CBD$0?0@0@AEBQEBD_J@Z DD 022801H
DD 070103214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$narrow_cast@_J_K@gsl@@YA_J$$QEA_K@Z DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z DD imagerel ??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z
DD 0ffffffffH
DD imagerel ??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z+138
DD 00H
DD imagerel ??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z+160
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z DD 019930522H
DD 01H
DD imagerel $stateUnwindMap$??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z
DD 00H
DD 00H
DD 03H
DD imagerel $ip2state$??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z
DD 040H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z DD 023111H
DD 07010b214H
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?size@?$extent_type@$09@details@gsl@@QEBA_JXZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0?$extent_type@$09@details@gsl@@QEAA@XZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$copy_n@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z DD 022801H
DD 070105214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Seek_wrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH$0A@@std@@YAXAEAV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@AEBQEAH@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Copy_unchecked@PEAHPEAH@std@@YAPEAHPEAH00@Z DD 022801H
DD 070105214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Get_unwrapped_n@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J@Z DD 022301H
DD 0700b720fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Idl_distance1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0Urandom_access_iterator_tag@0@@Z DD 011001H
DD 07010H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Idl_distance@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0@Z DD 022301H
DD 0700b520fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Get_unwrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@@Z DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$_Adl_verify_range@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0@Z DD 022301H
DD 0700b520fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$1@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z DD imagerel ??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z
DD 0ffffffffH
DD imagerel ??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z+156
DD 00H
DD imagerel ??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z+178
DD 0ffffffffH
DD imagerel ??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z+265
DD 01H
DD imagerel ??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z+287
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA
DD 0ffffffffH
DD imagerel ?dtor$1@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z DD 019930522H
DD 02H
DD imagerel $stateUnwindMap$??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z
DD 00H
DD 00H
DD 05H
DD imagerel $ip2state$??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z
DD 058H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z DD 023711H
DD 07010f217H
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?size@?$extent_type@$0A@@details@gsl@@QEBA_JXZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0?$extent_type@$0A@@details@gsl@@QEAA@XZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z DD imagerel ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z
DD 0ffffffffH
DD imagerel ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z+119
DD 00H
DD imagerel ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z+141
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z DD 019930522H
DD 01H
DD imagerel $stateUnwindMap$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z
DD 00H
DD 00H
DD 03H
DD imagerel $ip2state$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z
DD 040H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z DD 023111H
DD 07010b214H
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$addressof@H@std@@YAPEAHAEAH@Z DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z DD imagerel ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z
DD 0ffffffffH
DD imagerel ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z+138
DD 00H
DD imagerel ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z+160
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z DD 019930522H
DD 01H
DD imagerel $stateUnwindMap$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z
DD 00H
DD 00H
DD 03H
DD imagerel $ip2state$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z
DD 040H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z DD 023111H
DD 07010b214H
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$addressof@E@std@@YAPEAEAEAE@Z DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$forward@Ufail_fast@gsl@@@std@@YA$$QEAUfail_fast@gsl@@AEAU12@@Z DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$narrow_cast@_KAEA_J@gsl@@YA_KAEA_J@Z DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z
DD 0ffffffffH
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z+138
DD 00H
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z+160
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z DD 019930522H
DD 01H
DD imagerel $stateUnwindMap$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z
DD 00H
DD 00H
DD 03H
DD imagerel $ip2state$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z
DD 040H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z DD 023111H
DD 07010b214H
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z
DD 0ffffffffH
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z+156
DD 00H
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z+178
DD 0ffffffffH
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z+265
DD 01H
DD imagerel ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z+287
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA
DD 0ffffffffH
DD imagerel ?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z DD 019930522H
DD 02H
DD imagerel $stateUnwindMap$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z
DD 00H
DD 00H
DD 05H
DD imagerel $ip2state$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z
DD 058H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z DD 023711H
DD 07010f217H
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z DD 022d01H
DD 070159219H
xdata ENDS
; COMDAT CONST
CONST SEGMENT
??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z$rtcName$0 DB 074H ; gsl::span<int,6>::make_subspan<6>
DB 06dH
DB 070H
DB 00H
ORG $+12
??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z$rtcVarDesc DD 028H ; gsl::span<int,6>::make_subspan<6>
DD 010H
DQ FLAT:??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z$rtcName$0
ORG $+48
??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z$rtcFrameData DD 01H ; gsl::span<int,6>::make_subspan<6>
DD 00H
DQ FLAT:??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z$rtcVarDesc
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z DD imagerel ??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z
DD 0ffffffffH
DD imagerel ??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z+130
DD 00H
DD imagerel ??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z+152
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z DD 019930522H
DD 01H
DD imagerel $stateUnwindMap$??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z
DD 00H
DD 00H
DD 03H
DD imagerel $ip2state$??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z
DD 040H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z DD 022f11H
DD 0700bd20fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0V?$basic_string_span@$$CBD$0?0@gsl@@X@?$span@$$CBD$0?0@gsl@@QEAA@AEAV?$basic_string_span@$$CBD$0?0@1@@Z DD 022301H
DD 0700b520fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z DD 033101H
DD 07016e21aH
DD 06015H
xdata ENDS
; COMDAT CONST
CONST SEGMENT
??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z$rtcName$0 DB 05fH ; std::copy<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<unsigned char,-1>,0> >
DB 055H
DB 046H
DB 069H
DB 072H
DB 073H
DB 074H
DB 00H
??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z$rtcName$1 DB 05fH ; std::copy<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<unsigned char,-1>,0> >
DB 055H
DB 04cH
DB 061H
DB 073H
DB 074H
DB 00H
ORG $+1
??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z$rtcVarDesc DD 048H ; std::copy<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<unsigned char,-1>,0> >
DD 08H
DQ FLAT:??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z$rtcName$1
DD 028H
DD 08H
DQ FLAT:??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z$rtcName$0
ORG $+96
??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z$rtcFrameData DD 02H ; std::copy<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<unsigned char,-1>,0> >
DD 00H
DQ FLAT:??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z$rtcVarDesc
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?_Seek_to@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAE@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?_Unwrapped@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAPEAEXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z DD imagerel ?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z
DD 0ffffffffH
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z DD 019930522H
DD 00H
DD 00H
DD 00H
DD 00H
DD 01H
DD imagerel $ip2state$?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z
DD 040H
DD 00H
DD 05H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z DD 022c19H
DD 0700b920fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@E$0?0@2@_J@Z DD 011001H
DD 07010H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?_Unwrapped@?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEBAPEBDXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z DD imagerel ?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z
DD 0ffffffffH
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z DD 019930522H
DD 00H
DD 00H
DD 00H
DD 00H
DD 01H
DD imagerel $ip2state$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z
DD 040H
DD 00H
DD 05H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z DD 022c19H
DD 0700b920fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@$$CBD$0?0@2@_J@Z DD 011001H
DD 07010H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0V?$span@$$CBD$0?0@gsl@@X@?$basic_string_span@$$CBD$0?0@gsl@@QEAA@AEBV?$span@$$CBD$0?0@1@@Z DD 020c01H
DD 0600b700cH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$ensure_z@$$CBD$0L@@gsl@@YA?AV?$span@$$CBD$0?0@0@AEAY0L@$$CBD@Z DD 022301H
DD 0700b520fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?end@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?begin@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?size@?$basic_string_span@$$CBD$0?0@gsl@@QEBA_JXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?data@?$basic_string_span@$$CBD$0?0@gsl@@QEBAPEBDXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?end@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?begin@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?data@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?size@?$span@$$CBD$0?0@gsl@@QEBA_JXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z DD 022801H
DD 070103214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z DD imagerel ??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z
DD 0ffffffffH
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z DD 019930522H
DD 00H
DD 00H
DD 00H
DD 00H
DD 01H
DD imagerel $ip2state$??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z
DD 030H
DD 00H
DD 05H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z DD 022c19H
DD 0700b720fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z DD imagerel ??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z
DD 0ffffffffH
DD imagerel ??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z+130
DD 00H
DD imagerel ??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z+152
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z DD 019930522H
DD 01H
DD imagerel $stateUnwindMap$??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z
DD 00H
DD 00H
DD 03H
DD imagerel $ip2state$??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z
DD 040H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z DD 022f11H
DD 0700bd20fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z DD 033101H
DD 07016e21aH
DD 06015H
xdata ENDS
; COMDAT CONST
CONST SEGMENT
??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z$rtcName$0 DB 05fH ; std::copy<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
DB 055H
DB 046H
DB 069H
DB 072H
DB 073H
DB 074H
DB 00H
??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z$rtcName$1 DB 05fH ; std::copy<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
DB 055H
DB 04cH
DB 061H
DB 073H
DB 074H
DB 00H
ORG $+1
??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z$rtcVarDesc DD 048H ; std::copy<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
DD 08H
DQ FLAT:??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z$rtcName$1
DD 028H
DD 08H
DQ FLAT:??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z$rtcName$0
ORG $+96
??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z$rtcFrameData DD 02H ; std::copy<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
DD 00H
DQ FLAT:??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z$rtcVarDesc
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ DD imagerel ??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ
DD 0ffffffffH
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ DD 019930522H
DD 00H
DD 00H
DD 00H
DD 00H
DD 01H
DD imagerel $ip2state$??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ
DD 028H
DD 00H
DD 05H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ DD 022719H
DD 07006520aH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z DD imagerel ??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z
DD 0ffffffffH
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z DD 019930522H
DD 00H
DD 00H
DD 00H
DD 00H
DD 01H
DD imagerel $ip2state$??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z
DD 030H
DD 00H
DD 05H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z DD 022c19H
DD 0700b720fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?data@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEBAPEAHXZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?size@?$extent_type@$05@details@gsl@@QEBA_JXZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???0?$extent_type@$05@details@gsl@@QEAA@_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??0?$extent_type@$05@details@gsl@@QEAA@_J@Z DD imagerel ??0?$extent_type@$05@details@gsl@@QEAA@_J@Z
DD 0ffffffffH
DD imagerel ??0?$extent_type@$05@details@gsl@@QEAA@_J@Z+94
DD 00H
DD imagerel ??0?$extent_type@$05@details@gsl@@QEAA@_J@Z+116
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??0?$extent_type@$05@details@gsl@@QEAA@_J@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???0?$extent_type@$05@details@gsl@@QEAA@_J@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??0?$extent_type@$05@details@gsl@@QEAA@_J@Z DD 019930522H
DD 01H
DD imagerel $stateUnwindMap$??0?$extent_type@$05@details@gsl@@QEAA@_J@Z
DD 00H
DD 00H
DD 03H
DD imagerel $ip2state$??0?$extent_type@$05@details@gsl@@QEAA@_J@Z
DD 040H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0?$extent_type@$05@details@gsl@@QEAA@_J@Z DD 022c11H
DD 0700bb20fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??0?$extent_type@$05@details@gsl@@QEAA@_J@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0?$extent_type@$05@details@gsl@@QEAA@XZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?data@?$span@H$05@gsl@@QEBAPEAHXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?size@?$span@H$05@gsl@@QEBA_JXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?subspan@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J0@Z DD 022d01H
DD 070157219H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?last@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J@Z DD 022801H
DD 070107214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$convert_span@EV?$span@G$0?0@gsl@@@@YA?AV?$span@E$0?0@gsl@@V?$span@G$0?0@1@@Z DD 022301H
DD 0700b520fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z DD imagerel ??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z
DD 0ffffffffH
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z DD 019930522H
DD 00H
DD 00H
DD 00H
DD 00H
DD 01H
DD imagerel $ip2state$??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z
DD 030H
DD 00H
DD 05H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z DD 022c19H
DD 0700b720fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEBAPEAEXZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?CheckRange@?$span@E$0?0@gsl@@CA_N_J0@Z DD 022301H
DD 0700b520fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?begin@?$span@E$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@2@XZ DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?data@?$span@E$0?0@gsl@@QEBAPEAEXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???A?$span@E$0?0@gsl@@QEBAAEAE_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z DD imagerel ??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z
DD 0ffffffffH
DD imagerel ??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z+119
DD 00H
DD imagerel ??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z+141
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???A?$span@E$0?0@gsl@@QEBAAEAE_J@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z DD 019930522H
DD 01H
DD imagerel $stateUnwindMap$??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z
DD 00H
DD 00H
DD 03H
DD imagerel $ip2state$??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z
DD 040H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z DD 022c11H
DD 0700bb20fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?size@?$span@E$0?0@gsl@@QEBA_JXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0?$span@E$0?0@gsl@@QEAA@PEAE_J@Z DD 022801H
DD 070103214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@G$0?0@gsl@@QEBAPEAGXZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?data@?$span@G$0?0@gsl@@QEBAPEAGXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?size_bytes@?$span@G$0?0@gsl@@QEBA_JXZ DD 021e01H
DD 07006520aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?size@?$span@G$0?0@gsl@@QEBA_JXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?_Seek_to@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAH@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?_Unwrapped@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAPEAHXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z DD imagerel ?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z
DD 0ffffffffH
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z DD 019930522H
DD 00H
DD 00H
DD 00H
DD 00H
DD 01H
DD imagerel $ip2state$?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z
DD 040H
DD 00H
DD 05H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z DD 022c19H
DD 0700b920fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z DD imagerel ?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z
DD 0ffffffffH
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z DD 019930522H
DD 00H
DD 00H
DD 00H
DD 00H
DD 01H
DD imagerel $ip2state$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z
DD 040H
DD 00H
DD 05H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z DD 022c19H
DD 0700b920fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??9details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z DD 032401H
DD 0700ca210H
DD 0600bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??8details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z DD 022301H
DD 0700b120fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ DD imagerel ??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ
DD 0ffffffffH
DD imagerel ??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ+117
DD 00H
DD imagerel ??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ+139
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ DD 0ffffffffH
DD imagerel ?dtor$0@?0???E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ DD 019930522H
DD 01H
DD imagerel $stateUnwindMap$??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ
DD 00H
DD 00H
DD 03H
DD imagerel $ip2state$??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ
DD 040H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ DD 022711H
DD 07006b20aH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ DD imagerel ??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ
DD 0ffffffffH
DD imagerel ??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ+105
DD 00H
DD imagerel ??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ+127
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ DD 0ffffffffH
DD imagerel ?dtor$0@?0???D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ DD 019930522H
DD 01H
DD imagerel $stateUnwindMap$??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ
DD 00H
DD 00H
DD 03H
DD imagerel $ip2state$??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ
DD 040H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ DD 022711H
DD 07006b20aH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@H$0?0@2@_J@Z DD 011001H
DD 07010H
xdata ENDS
CONST SEGMENT
ORG $+1
?test_span_iter@@YAXV?$span@H$0?0@gsl@@@Z$rtcName$0 DB 069H ; test_span_iter
DB 074H
DB 00H
ORG $+1
?test_span_iter@@YAXV?$span@H$0?0@gsl@@@Z$rtcVarDesc DD 028H ; test_span_iter
DD 010H
DQ FLAT:?test_span_iter@@YAXV?$span@H$0?0@gsl@@@Z$rtcName$0
ORG $+48
?test_span_iter@@YAXV?$span@H$0?0@gsl@@@Z$rtcFrameData DD 01H ; test_span_iter
DD 00H
DQ FLAT:?test_span_iter@@YAXV?$span@H$0?0@gsl@@@Z$rtcVarDesc
?static_size_array_span@@YAXAEAUIDE_DRIVE_STATE@@@Z$rtcName$0 DB 073H ; static_size_array_span
DB 070H
DB 00H
ORG $+5
?static_size_array_span@@YAXAEAUIDE_DRIVE_STATE@@@Z$rtcFrameData DD 01H ; static_size_array_span
DD 00H
DQ FLAT:?static_size_array_span@@YAXAEAUIDE_DRIVE_STATE@@@Z$rtcVarDesc
?mysubspan1@@YA_JXZ$rtcName$0 DB 078H ; mysubspan1
DB 00H
ORG $+6
?static_size_array_span@@YAXAEAUIDE_DRIVE_STATE@@@Z$rtcVarDesc DD 028H ; static_size_array_span
DD 010H
DQ FLAT:?static_size_array_span@@YAXAEAUIDE_DRIVE_STATE@@@Z$rtcName$0
ORG $+48
?test_convert_span_Joe@@YAEAEAUIDE_DRIVE_STATE@@@Z$rtcName$0 DB 063H ; test_convert_span_Joe
DB 075H
DB 072H
DB 042H
DB 075H
DB 066H
DB 066H
DB 065H
DB 072H
DB 00H
ORG $+6
?test_convert_span_Joe@@YAEAEAUIDE_DRIVE_STATE@@@Z$rtcVarDesc DD 028H ; test_convert_span_Joe
DD 010H
DQ FLAT:?test_convert_span_Joe@@YAEAEAUIDE_DRIVE_STATE@@@Z$rtcName$0
ORG $+48
?test_convert_span_Joe@@YAEAEAUIDE_DRIVE_STATE@@@Z$rtcFrameData DD 01H ; test_convert_span_Joe
DD 00H
DQ FLAT:?test_convert_span_Joe@@YAEAEAUIDE_DRIVE_STATE@@@Z$rtcVarDesc
?mysubspan1@@YA_JXZ$rtcName$1 DB 073H ; mysubspan1
DB 00H
ORG $+2
?mysubspan2@@YA_J_J@Z$rtcName$0 DB 078H ; mysubspan2
DB 00H
ORG $+2
?mysubspan1@@YA_JXZ$rtcName$2 DB 073H ; mysubspan1
DB 075H
DB 062H
DB 073H
DB 070H
DB 061H
DB 06eH
DB 00H
?mysubspan1@@YA_JXZ$rtcVarDesc DD 078H ; mysubspan1
DD 010H
DQ FLAT:?mysubspan1@@YA_JXZ$rtcName$2
DD 058H
DD 08H
DQ FLAT:?mysubspan1@@YA_JXZ$rtcName$1
DD 028H
DD 018H
DQ FLAT:?mysubspan1@@YA_JXZ$rtcName$0
ORG $+144
?mysubspan1@@YA_JXZ$rtcFrameData DD 03H ; mysubspan1
DD 00H
DQ FLAT:?mysubspan1@@YA_JXZ$rtcVarDesc
?mysubspan2@@YA_J_J@Z$rtcName$1 DB 073H ; mysubspan2
DB 00H
ORG $+2
?mysubspan3@@YA_JXZ$rtcName$0 DB 078H ; mysubspan3
DB 00H
ORG $+2
?mysubspan2@@YA_J_J@Z$rtcName$2 DB 073H ; mysubspan2
DB 075H
DB 062H
DB 073H
DB 070H
DB 061H
DB 06eH
DB 00H
?mysubspan2@@YA_J_J@Z$rtcVarDesc DD 078H ; mysubspan2
DD 010H
DQ FLAT:?mysubspan2@@YA_J_J@Z$rtcName$2
DD 058H
DD 08H
DQ FLAT:?mysubspan2@@YA_J_J@Z$rtcName$1
DD 028H
DD 018H
DQ FLAT:?mysubspan2@@YA_J_J@Z$rtcName$0
ORG $+144
?mysubspan2@@YA_J_J@Z$rtcFrameData DD 03H ; mysubspan2
DD 00H
DQ FLAT:?mysubspan2@@YA_J_J@Z$rtcVarDesc
?mysubspan3@@YA_JXZ$rtcName$1 DB 073H ; mysubspan3
DB 00H
ORG $+2
?mysubspan4@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcName$0 DB 073H ; mysubspan4
DB 00H
ORG $+2
?mysubspan3@@YA_JXZ$rtcName$2 DB 073H ; mysubspan3
DB 075H
DB 062H
DB 073H
DB 070H
DB 061H
DB 06eH
DB 00H
?mysubspan3@@YA_JXZ$rtcVarDesc DD 078H ; mysubspan3
DD 010H
DQ FLAT:?mysubspan3@@YA_JXZ$rtcName$2
DD 058H
DD 08H
DQ FLAT:?mysubspan3@@YA_JXZ$rtcName$1
DD 028H
DD 018H
DQ FLAT:?mysubspan3@@YA_JXZ$rtcName$0
ORG $+144
?mysubspan3@@YA_JXZ$rtcFrameData DD 03H ; mysubspan3
DD 00H
DQ FLAT:?mysubspan3@@YA_JXZ$rtcVarDesc
?mysubspan4@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcVarDesc DD 028H ; mysubspan4
DD 010H
DQ FLAT:?mysubspan4@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcName$0
ORG $+48
?mysubspan4@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcFrameData DD 01H ; mysubspan4
DD 00H
DQ FLAT:?mysubspan4@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcVarDesc
?mysubspan5@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcName$0 DB 073H ; mysubspan5
DB 00H
ORG $+6
?mysubspan5@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcFrameData DD 01H ; mysubspan5
DD 00H
DQ FLAT:?mysubspan5@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcVarDesc
?mysubspan6@@YA?AV?$span@H$0?0@gsl@@PEAH_J@Z$rtcName$0 DB 073H ; mysubspan6
DB 00H
ORG $+6
?mysubspan5@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcVarDesc DD 028H ; mysubspan5
DD 010H
DQ FLAT:?mysubspan5@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcName$0
ORG $+48
?mysubspan6@@YA?AV?$span@H$0?0@gsl@@PEAH_J@Z$rtcVarDesc DD 028H ; mysubspan6
DD 010H
DQ FLAT:?mysubspan6@@YA?AV?$span@H$0?0@gsl@@PEAH_J@Z$rtcName$0
ORG $+48
?mysubspan6@@YA?AV?$span@H$0?0@gsl@@PEAH_J@Z$rtcFrameData DD 01H ; mysubspan6
DD 00H
DQ FLAT:?mysubspan6@@YA?AV?$span@H$0?0@gsl@@PEAH_J@Z$rtcVarDesc
?mysubspan7@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcName$0 DB 073H ; mysubspan7
DB 00H
ORG $+6
?mysubspan7@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcFrameData DD 01H ; mysubspan7
DD 00H
DQ FLAT:?mysubspan7@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcVarDesc
?mysubspan8@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcName$0 DB 073H ; mysubspan8
DB 00H
ORG $+6
?mysubspan7@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcVarDesc DD 028H ; mysubspan7
DD 010H
DQ FLAT:?mysubspan7@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcName$0
ORG $+48
?mysubspan8@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcVarDesc DD 028H ; mysubspan8
DD 010H
DQ FLAT:?mysubspan8@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcName$0
ORG $+48
?mysubspan8@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcFrameData DD 01H ; mysubspan8
DD 00H
DQ FLAT:?mysubspan8@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcVarDesc
?mysubspan9@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcName$0 DB 073H ; mysubspan9
DB 00H
ORG $+6
?mysubspan9@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcFrameData DD 01H ; mysubspan9
DD 00H
DQ FLAT:?mysubspan9@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcVarDesc
?test_string_std_copy@@YAXXZ$rtcName$0 DB 062H ; test_string_std_copy
DB 079H
DB 074H
DB 065H
DB 073H
DB 00H
ORG $+2
?mysubspan9@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcVarDesc DD 028H ; mysubspan9
DD 010H
DQ FLAT:?mysubspan9@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcName$0
ORG $+48
?test_string_std_copy@@YAXXZ$rtcName$1 DB 062H ; test_string_std_copy
DB 079H
DB 074H
DB 065H
DB 053H
DB 070H
DB 061H
DB 06eH
DB 00H
ORG $+3
?test_string_gsl_copy@@YAXXZ$rtcName$0 DB 062H ; test_string_gsl_copy
DB 079H
DB 074H
DB 065H
DB 073H
DB 00H
ORG $+6
?test_string_std_copy@@YAXXZ$rtcName$2 DB 063H ; test_string_std_copy
DB 064H
DB 04dH
DB 06fH
DB 064H
DB 065H
DB 06cH
DB 054H
DB 079H
DB 070H
DB 065H
DB 00H
ORG $+12
?test_string_std_copy@@YAXXZ$rtcVarDesc DD 088H ; test_string_std_copy
DD 010H
DQ FLAT:?test_string_std_copy@@YAXXZ$rtcName$2
DD 058H
DD 010H
DQ FLAT:?test_string_std_copy@@YAXXZ$rtcName$1
DD 028H
DD 0aH
DQ FLAT:?test_string_std_copy@@YAXXZ$rtcName$0
ORG $+144
?test_string_std_copy@@YAXXZ$rtcFrameData DD 03H ; test_string_std_copy
DD 00H
DQ FLAT:?test_string_std_copy@@YAXXZ$rtcVarDesc
?test_string_gsl_copy@@YAXXZ$rtcName$1 DB 062H ; test_string_gsl_copy
DB 079H
DB 074H
DB 065H
DB 053H
DB 070H
DB 061H
DB 06eH
DB 00H
ORG $+7
?test_string_gsl_copy@@YAXXZ$rtcName$2 DB 063H ; test_string_gsl_copy
DB 064H
DB 04dH
DB 06fH
DB 064H
DB 065H
DB 06cH
DB 054H
DB 079H
DB 070H
DB 065H
DB 00H
ORG $+4
?test_string_gsl_copy@@YAXXZ$rtcVarDesc DD 088H ; test_string_gsl_copy
DD 010H
DQ FLAT:?test_string_gsl_copy@@YAXXZ$rtcName$2
DD 058H
DD 010H
DQ FLAT:?test_string_gsl_copy@@YAXXZ$rtcName$1
DD 028H
DD 0aH
DQ FLAT:?test_string_gsl_copy@@YAXXZ$rtcName$0
ORG $+144
?test_string_gsl_copy@@YAXXZ$rtcFrameData DD 03H ; test_string_gsl_copy
DD 00H
DQ FLAT:?test_string_gsl_copy@@YAXXZ$rtcVarDesc
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$1@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z DD imagerel ?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z
DD 0ffffffffH
DD imagerel ?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z+142
DD 00H
DD imagerel ?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z+167
DD 0ffffffffH
DD imagerel ?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z+397
DD 01H
DD imagerel ?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z+422
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA
DD 0ffffffffH
DD imagerel ?dtor$1@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z DD 019930522H
DD 02H
DD imagerel $stateUnwindMap$?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z
DD 00H
DD 00H
DD 05H
DD imagerel $ip2state$?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z
DD 070H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z DD 033c11H
DD 014011cH
DD 07015H
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0?$span@H$0?0@gsl@@AEAA@UKnownNotNull@01@_J@Z DD 022801H
DD 070103214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEBAPEAHXZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?CheckRange@?$span@H$0?0@gsl@@CA_N_J0@Z DD 022301H
DD 0700b520fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?_Unchecked_end@?$span@H$0?0@gsl@@QEBAPEAHXZ DD 021e01H
DD 07006520aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?_Unchecked_begin@?$span@H$0?0@gsl@@QEBAPEAHXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?end@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?begin@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?data@?$span@H$0?0@gsl@@QEBAPEAHXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???A?$span@H$0?0@gsl@@QEBAAEAH_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z DD imagerel ??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z
DD 0ffffffffH
DD imagerel ??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z+119
DD 00H
DD imagerel ??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z+141
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???A?$span@H$0?0@gsl@@QEBAAEAH_J@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z DD 019930522H
DD 01H
DD imagerel $stateUnwindMap$??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z
DD 00H
DD 00H
DD 03H
DD imagerel $ip2state$??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z
DD 040H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z DD 022c11H
DD 0700bb20fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?size@?$span@H$0?0@gsl@@QEBA_JXZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z DD 022d01H
DD 070157219H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?last@?$span@H$0?0@gsl@@QEBA?AV12@_J@Z DD 022801H
DD 070107214H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z DD 022801H
DD 070103214H
xdata ENDS
xdata SEGMENT
$unwind$?test_span_unoptimizable_rangecheck@@YAXV?$span@H$0?0@gsl@@H@Z DD 022201H
DD 0700a520eH
$unwind$?test_span_for@@YAXV?$span@H$0?0@gsl@@@Z DD 021e01H
DD 07006520aH
$unwind$?test_span_iter@@YAXV?$span@H$0?0@gsl@@@Z DD 042501H
DD 013010eH
DD 060067007H
$unwind$?test_span_rangeiter@@YAXV?$span@H$0?0@gsl@@@Z DD 021e01H
DD 07006720aH
$unwind$?static_size_array_span@@YAXAEAUIDE_DRIVE_STATE@@@Z DD 021e01H
DD 07006920aH
$unwind$?test_convert_span_Joe@@YAEAEAUIDE_DRIVE_STATE@@@Z DD 032201H
DD 07007c20bH
DD 06006H
$unwind$?mysubspan1@@YA_JXZ DD 032a19H
DD 0160109H
DD 07002H
DD imagerel __GSHandlerCheck
DD 0a0H
$unwind$?mysubspan2@@YA_J_J@Z DD 033619H
DD 016010dH
DD 07006H
DD imagerel __GSHandlerCheck
DD 0a0H
$unwind$?mysubspan3@@YA_JXZ DD 032a19H
DD 0160109H
DD 07002H
DD imagerel __GSHandlerCheck
DD 0a0H
$unwind$?mysubspan4@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z DD 022d01H
DD 070159219H
$unwind$?mysubspan5@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z DD 022d01H
DD 070159219H
$unwind$?mysubspan6@@YA?AV?$span@H$0?0@gsl@@PEAH_J@Z DD 022801H
DD 070109214H
$unwind$?mysubspan7@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z DD 022d01H
DD 070159219H
$unwind$?mysubspan8@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z DD 022d01H
DD 070159219H
$unwind$?mysubspan9@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z DD 022d01H
DD 070159219H
$unwind$?doterminate@@YAXXZ DD 021501H
DD 070023206H
$unwind$?copy_span@@YAXV?$span@H$0?0@gsl@@0@Z DD 042a01H
DD 0130113H
DD 0600b700cH
$unwind$?gsl_copy_span@@YAXV?$span@H$0?0@gsl@@0@Z DD 032401H
DD 0700c8210H
DD 0600bH
$unwind$?test_string_std_copy@@YAXXZ DD 042b19H
DD 02b010aH
DD 060027003H
DD imagerel __GSHandlerCheck
DD 0140H
$unwind$?test_string_gsl_copy@@YAXXZ DD 042b19H
DD 023010aH
DD 060027003H
DD imagerel __GSHandlerCheck
DD 0100H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z DD 021e01H
DD 07006720aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?dtor$0@?0???0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z@4HA DD 031001H
DD 0700c4210H
DD 0500bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$ip2state$??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z DD imagerel ??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z
DD 0ffffffffH
DD imagerel ??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z+107
DD 00H
DD imagerel ??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z+129
DD 0ffffffffH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$stateUnwindMap$??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z DD 0ffffffffH
DD imagerel ?dtor$0@?0???0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z@4HA
xdata ENDS
; COMDAT CONST
CONST SEGMENT
$cppxdata$??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z DD 019930522H
DD 01H
DD imagerel $stateUnwindMap$??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z
DD 00H
DD 00H
DD 03H
DD imagerel $ip2state$??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z
DD 040H
DD 00H
DD 01H
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z DD 022c11H
DD 0700bb20fH
DD imagerel __CxxFrameHandler3
DD imagerel $cppxdata$??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??_Gnarrowing_error@gsl@@UEAAPEAXI@Z DD 022201H
DD 0700a320eH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0narrowing_error@gsl@@QEAA@$$QEAU01@@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0narrowing_error@gsl@@QEAA@AEBU01@@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??1narrowing_error@gsl@@UEAA@XZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0narrowing_error@gsl@@QEAA@XZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??_Gfail_fast@gsl@@UEAAPEAXI@Z DD 022201H
DD 0700a320eH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0fail_fast@gsl@@QEAA@$$QEAU01@@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0fail_fast@gsl@@QEAA@AEBU01@@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??1fail_fast@gsl@@UEAA@XZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0fail_fast@gsl@@QEAA@QEBD@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??_Glogic_error@std@@UEAAPEAXI@Z DD 022201H
DD 0700a320eH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0logic_error@std@@QEAA@$$QEAV01@@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0logic_error@std@@QEAA@AEBV01@@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??1logic_error@std@@UEAA@XZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0logic_error@std@@QEAA@PEBD@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??_Gexception@std@@UEAAPEAXI@Z DD 022201H
DD 0700a320eH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?what@exception@std@@UEBAPEBDXZ DD 021e01H
DD 07006120aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??1exception@std@@UEAA@XZ DD 021e01H
DD 07006320aH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0exception@std@@QEAA@AEBV01@@Z DD 022301H
DD 0700b320fH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0exception@std@@QEAA@QEBD@Z DD 022301H
DD 0700b920fH
xdata ENDS
; COMDAT CONST
CONST SEGMENT
??0exception@std@@QEAA@QEBD@Z$rtcName$0 DB 05fH ; std::exception::exception
DB 049H
DB 06eH
DB 069H
DB 074H
DB 044H
DB 061H
DB 074H
DB 061H
DB 00H
ORG $+6
??0exception@std@@QEAA@QEBD@Z$rtcVarDesc DD 028H ; std::exception::exception
DD 010H
DQ FLAT:??0exception@std@@QEAA@QEBD@Z$rtcName$0
ORG $+48
??0exception@std@@QEAA@QEBD@Z$rtcFrameData DD 01H ; std::exception::exception
DD 00H
DQ FLAT:??0exception@std@@QEAA@QEBD@Z$rtcVarDesc
CONST ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$??0exception@std@@QEAA@XZ DD 010601H
DD 07006H
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?__empty_global_delete@@YAXPEAX_K@Z DD 010b01H
DD 0700bH
xdata ENDS
; COMDAT xdata
xdata SEGMENT
$unwind$?__empty_global_delete@@YAXPEAX@Z DD 010601H
DD 07006H
xdata ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Copy_n_unchecked4@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z
_TEXT SEGMENT
_First$ = 48
_Count$ = 56
_Dest$ = 64
__formal$ = 72
??$_Copy_n_unchecked4@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z PROC ; std::_Copy_n_unchecked4<char const *,__int64,unsigned char *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2516
$LN3:
mov BYTE PTR [rsp+32], r9b
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 2518
mov rax, QWORD PTR _Count$[rsp]
mov rcx, QWORD PTR _First$[rsp]
add rcx, rax
mov rax, rcx
mov r8, QWORD PTR _Dest$[rsp]
mov rdx, rax
mov rcx, QWORD PTR _First$[rsp]
call ??$_Copy_memmove@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z ; std::_Copy_memmove<char const *,unsigned char *>
; Line 2519
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$_Copy_n_unchecked4@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z ENDP ; std::_Copy_n_unchecked4<char const *,__int64,unsigned char *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$forward@Unarrowing_error@gsl@@@std@@YA$$QEAUnarrowing_error@gsl@@AEAU12@@Z
_TEXT SEGMENT
_Arg$ = 16
??$forward@Unarrowing_error@gsl@@@std@@YA$$QEAUnarrowing_error@gsl@@AEAU12@@Z PROC ; std::forward<gsl::narrowing_error>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\type_traits
; Line 1573
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 1574
mov rax, QWORD PTR _Arg$[rsp]
; Line 1575
pop rdi
ret 0
??$forward@Unarrowing_error@gsl@@@std@@YA$$QEAUnarrowing_error@gsl@@AEAU12@@Z ENDP ; std::forward<gsl::narrowing_error>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Copy_memmove@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z
_TEXT SEGMENT
_First_ch$ = 32
_Last_ch$ = 40
_Dest_ch$ = 48
_Count$ = 56
_First$ = 80
_Last$ = 88
_Dest$ = 96
??$_Copy_memmove@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z PROC ; std::_Copy_memmove<char const *,unsigned char *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2398
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
; Line 2399
mov rax, QWORD PTR _First$[rsp]
mov QWORD PTR _First_ch$[rsp], rax
; Line 2400
mov rax, QWORD PTR _Last$[rsp]
mov QWORD PTR _Last_ch$[rsp], rax
; Line 2401
mov rax, QWORD PTR _Dest$[rsp]
mov QWORD PTR _Dest_ch$[rsp], rax
; Line 2402
mov rax, QWORD PTR _First_ch$[rsp]
mov rcx, QWORD PTR _Last_ch$[rsp]
sub rcx, rax
mov rax, rcx
mov QWORD PTR _Count$[rsp], rax
; Line 2403
mov r8, QWORD PTR _Count$[rsp]
mov rdx, QWORD PTR _First_ch$[rsp]
mov rcx, QWORD PTR _Dest_ch$[rsp]
call memmove
; Line 2404
mov rax, QWORD PTR _Count$[rsp]
mov rcx, QWORD PTR _Dest_ch$[rsp]
add rcx, rax
mov rax, rcx
; Line 2405
add rsp, 64 ; 00000040H
pop rdi
ret 0
??$_Copy_memmove@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z ENDP ; std::_Copy_memmove<char const *,unsigned char *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Copy_n_unchecked4@PEAH_JPEAH@std@@YAPEAHPEAH_J0U_Trivially_copyable_ptr_iterator_tag@0@@Z
_TEXT SEGMENT
_First$ = 48
_Count$ = 56
_Dest$ = 64
__formal$ = 72
??$_Copy_n_unchecked4@PEAH_JPEAH@std@@YAPEAHPEAH_J0U_Trivially_copyable_ptr_iterator_tag@0@@Z PROC ; std::_Copy_n_unchecked4<int *,__int64,int *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2516
$LN3:
mov BYTE PTR [rsp+32], r9b
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 2518
mov rax, QWORD PTR _First$[rsp]
mov rcx, QWORD PTR _Count$[rsp]
lea rax, QWORD PTR [rax+rcx*4]
mov r8, QWORD PTR _Dest$[rsp]
mov rdx, rax
mov rcx, QWORD PTR _First$[rsp]
call ??$_Copy_memmove@PEAHPEAH@std@@YAPEAHPEAH00@Z ; std::_Copy_memmove<int *,int *>
; Line 2519
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$_Copy_n_unchecked4@PEAH_JPEAH@std@@YAPEAHPEAH_J0U_Trivially_copyable_ptr_iterator_tag@0@@Z ENDP ; std::_Copy_n_unchecked4<int *,__int64,int *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Copy_memmove@PEAHPEAH@std@@YAPEAHPEAH00@Z
_TEXT SEGMENT
_First_ch$ = 32
_Last_ch$ = 40
_Dest_ch$ = 48
_Count$ = 56
_First$ = 80
_Last$ = 88
_Dest$ = 96
??$_Copy_memmove@PEAHPEAH@std@@YAPEAHPEAH00@Z PROC ; std::_Copy_memmove<int *,int *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2398
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
; Line 2399
mov rax, QWORD PTR _First$[rsp]
mov QWORD PTR _First_ch$[rsp], rax
; Line 2400
mov rax, QWORD PTR _Last$[rsp]
mov QWORD PTR _Last_ch$[rsp], rax
; Line 2401
mov rax, QWORD PTR _Dest$[rsp]
mov QWORD PTR _Dest_ch$[rsp], rax
; Line 2402
mov rax, QWORD PTR _First_ch$[rsp]
mov rcx, QWORD PTR _Last_ch$[rsp]
sub rcx, rax
mov rax, rcx
mov QWORD PTR _Count$[rsp], rax
; Line 2403
mov r8, QWORD PTR _Count$[rsp]
mov rdx, QWORD PTR _First_ch$[rsp]
mov rcx, QWORD PTR _Dest_ch$[rsp]
call memmove
; Line 2404
mov rax, QWORD PTR _Count$[rsp]
mov rcx, QWORD PTR _Dest_ch$[rsp]
add rcx, rax
mov rax, rcx
; Line 2405
add rsp, 64 ; 00000040H
pop rdi
ret 0
??$_Copy_memmove@PEAHPEAH@std@@YAPEAHPEAH00@Z ENDP ; std::_Copy_memmove<int *,int *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z PROC ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 597
$LN14:
mov BYTE PTR [rsp+24], r8b
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 128 ; 00000080H
mov rdi, rsp
mov ecx, 32 ; 00000020H
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+144]
mov QWORD PTR $T4[rsp], -2
mov DWORD PTR $T3[rsp], 0
; Line 596
movzx edx, BYTE PTR ext$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??$?0$05@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$05@12@@Z ; gsl::details::extent_type<-1>::extent_type<-1><6>
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR data$[rsp]
mov QWORD PTR [rax+8], rcx
; Line 598
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
jl SHORT $LN3@extent_typ
jmp SHORT $LN4@extent_typ
$LN3@extent_typ:
lea rdx, OFFSET FLAT:??_C@_0ED@GGAHHHOA@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv144[rsp], rax
mov rax, QWORD PTR tv144[rsp]
mov QWORD PTR tv134[rsp], rax
mov eax, DWORD PTR $T3[rsp]
or eax, 1
mov DWORD PTR $T3[rsp], eax
mov rcx, QWORD PTR tv134[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@extent_typ:
mov eax, DWORD PTR $T3[rsp]
and eax, 1
test eax, eax
je SHORT $LN9@extent_typ
and DWORD PTR $T3[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN9@extent_typ:
; Line 599
cmp QWORD PTR data$[rsp], 0
jne SHORT $LN5@extent_typ
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
je SHORT $LN5@extent_typ
lea rdx, OFFSET FLAT:??_C@_0ED@HPBMEGKB@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T2[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv146[rsp], rax
mov rax, QWORD PTR tv146[rsp]
mov QWORD PTR tv141[rsp], rax
mov eax, DWORD PTR $T3[rsp]
or eax, 2
mov DWORD PTR $T3[rsp], eax
mov rcx, QWORD PTR tv141[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN5@extent_typ:
mov eax, DWORD PTR $T3[rsp]
and eax, 2
test eax, eax
je SHORT $LN12@extent_typ
and DWORD PTR $T3[rsp], -3
lea rcx, QWORD PTR $T2[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN12@extent_typ:
; Line 600
mov rax, QWORD PTR this$[rsp]
add rsp, 128 ; 00000080H
pop rdi
ret 0
$LN13@extent_typ:
??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z ENDP ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 1
test eax, eax
je SHORT $LN8@dtor$0
and DWORD PTR $T3[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN8@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >'::`1'::dtor$0
text$x ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$1@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 2
test eax, eax
je SHORT $LN11@dtor$1
and DWORD PTR $T3[rbp], -3
lea rcx, QWORD PTR $T2[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN11@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 1
test eax, eax
je SHORT $LN8@dtor$0
and DWORD PTR $T3[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN8@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$1@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 2
test eax, eax
je SHORT $LN11@dtor$1
and DWORD PTR $T3[rbp], -3
lea rcx, QWORD PTR $T2[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN11@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Seek_wrapped@E@std@@YAXAEAPEAEQEAE@Z
_TEXT SEGMENT
_It$ = 16
_UIt$ = 24
??$_Seek_wrapped@E@std@@YAXAEAPEAEQEAE@Z PROC ; std::_Seek_wrapped<unsigned char>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 871
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 872
mov rax, QWORD PTR _It$[rsp]
mov rcx, QWORD PTR _UIt$[rsp]
mov QWORD PTR [rax], rcx
; Line 873
pop rdi
ret 0
??$_Seek_wrapped@E@std@@YAXAEAPEAEQEAE@Z ENDP ; std::_Seek_wrapped<unsigned char>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Copy_n_unchecked3@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 33
_First$ = 64
_Count$ = 72
_Dest$ = 80
??$_Copy_n_unchecked3@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z PROC ; std::_Copy_n_unchecked3<char const *,__int64,unsigned char *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2526
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 2528
lea r8, QWORD PTR _Dest$[rsp]
lea rdx, QWORD PTR _First$[rsp]
lea rcx, QWORD PTR $T1[rsp]
call ??$_Ptr_copy_cat@$$CBDE@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEBDAEBQEAE@Z ; std::_Ptr_copy_cat<char const ,unsigned char>
movzx r9d, BYTE PTR $T2[rsp]
mov r8, QWORD PTR _Dest$[rsp]
mov rdx, QWORD PTR _Count$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Copy_n_unchecked4@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z ; std::_Copy_n_unchecked4<char const *,__int64,unsigned char *>
; Line 2530
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$_Copy_n_unchecked3@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z ENDP ; std::_Copy_n_unchecked3<char const *,__int64,unsigned char *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Get_unwrapped_n@E_J$0A@@std@@YAPEAEQEAE_J@Z
_TEXT SEGMENT
_Src$ = 16
__formal$ = 24
??$_Get_unwrapped_n@E_J$0A@@std@@YAPEAEQEAE_J@Z PROC ; std::_Get_unwrapped_n<unsigned char,__int64,0>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 808
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 809
mov rax, QWORD PTR _Src$[rsp]
; Line 810
pop rdi
ret 0
??$_Get_unwrapped_n@E_J$0A@@std@@YAPEAEQEAE_J@Z ENDP ; std::_Get_unwrapped_n<unsigned char,__int64,0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Get_unwrapped_n@$$CBD_J$0A@@std@@YAPEBDQEBD_J@Z
_TEXT SEGMENT
_Src$ = 16
__formal$ = 24
??$_Get_unwrapped_n@$$CBD_J$0A@@std@@YAPEBDQEBD_J@Z PROC ; std::_Get_unwrapped_n<char const ,__int64,0>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 808
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 809
mov rax, QWORD PTR _Src$[rsp]
; Line 810
pop rdi
ret 0
??$_Get_unwrapped_n@$$CBD_J$0A@@std@@YAPEBDQEBD_J@Z ENDP ; std::_Get_unwrapped_n<char const ,__int64,0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$throw_exception@Unarrowing_error@gsl@@@details@gsl@@YAX$$QEAUnarrowing_error@1@@Z
_TEXT SEGMENT
$T1 = 32
exception$ = 80
??$throw_exception@Unarrowing_error@gsl@@@details@gsl@@YAX$$QEAUnarrowing_error@1@@Z PROC ; gsl::details::throw_exception<gsl::narrowing_error>, COMDAT
; File c:\projects\gsl\include\gsl\gsl_assert
; Line 143
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
; Line 144
mov rcx, QWORD PTR exception$[rsp]
call ??$forward@Unarrowing_error@gsl@@@std@@YA$$QEAUnarrowing_error@gsl@@AEAU12@@Z ; std::forward<gsl::narrowing_error>
mov rdx, rax
lea rcx, QWORD PTR $T1[rsp]
call ??0narrowing_error@gsl@@QEAA@$$QEAU01@@Z
lea rdx, OFFSET FLAT:_TI2?AUnarrowing_error@gsl@@
lea rcx, QWORD PTR $T1[rsp]
call _CxxThrowException
$LN2@throw_exce:
; Line 145
add rsp, 64 ; 00000040H
pop rdi
ret 0
??$throw_exception@Unarrowing_error@gsl@@@details@gsl@@YAX$$QEAUnarrowing_error@1@@Z ENDP ; gsl::details::throw_exception<gsl::narrowing_error>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$narrow_cast@_JAEA_J@gsl@@YA_JAEA_J@Z
_TEXT SEGMENT
u$ = 48
??$narrow_cast@_JAEA_J@gsl@@YA_JAEA_J@Z PROC ; gsl::narrow_cast<__int64,__int64 &>, COMDAT
; File c:\projects\gsl\include\gsl\gsl_util
; Line 99
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 100
mov rcx, QWORD PTR u$[rsp]
call ??$forward@AEA_J@std@@YAAEA_JAEA_J@Z ; std::forward<__int64 &>
mov rax, QWORD PTR [rax]
; Line 101
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$narrow_cast@_JAEA_J@gsl@@YA_JAEA_J@Z ENDP ; gsl::narrow_cast<__int64,__int64 &>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Copy_unchecked1@PEBDPEAE@std@@YAPEAEPEBD0PEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z
_TEXT SEGMENT
_First$ = 48
_Last$ = 56
_Dest$ = 64
__formal$ = 72
??$_Copy_unchecked1@PEBDPEAE@std@@YAPEAEPEBD0PEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z PROC ; std::_Copy_unchecked1<char const *,unsigned char *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2424
$LN3:
mov BYTE PTR [rsp+32], r9b
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 2425
mov r8, QWORD PTR _Dest$[rsp]
mov rdx, QWORD PTR _Last$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Copy_memmove@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z ; std::_Copy_memmove<char const *,unsigned char *>
; Line 2426
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$_Copy_unchecked1@PEBDPEAE@std@@YAPEAEPEBD0PEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z ENDP ; std::_Copy_unchecked1<char const *,unsigned char *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Ptr_copy_cat@$$CBDE@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEBDAEBQEAE@Z
_TEXT SEGMENT
__$ReturnUdt$ = 16
__formal$ = 24
__formal$ = 32
??$_Ptr_copy_cat@$$CBDE@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEBDAEBQEAE@Z PROC ; std::_Ptr_copy_cat<char const ,unsigned char>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 1069
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 1070
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 1071
pop rdi
ret 0
??$_Ptr_copy_cat@$$CBDE@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEBDAEBQEAE@Z ENDP ; std::_Ptr_copy_cat<char const ,unsigned char>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Adl_verify_range1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 48
_First$ = 96
_Last$ = 104
__formal$ = 112
??$_Adl_verify_range1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z PROC ; std::_Adl_verify_range1<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<char const ,-1>,0> >, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 602
$LN3:
mov BYTE PTR [rsp+24], r8b
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rsi
push rdi
sub rsp, 72 ; 00000048H
mov rdi, rsp
mov ecx, 18
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
; Line 603
lea rax, QWORD PTR $T2[rsp]
mov rdi, rax
mov rsi, QWORD PTR _Last$[rsp]
mov ecx, 16
rep movsb
lea rax, QWORD PTR $T1[rsp]
mov rdi, rax
mov rsi, QWORD PTR _First$[rsp]
mov ecx, 16
rep movsb
lea rdx, QWORD PTR $T2[rsp]
lea rcx, QWORD PTR $T1[rsp]
call ?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z ; gsl::details::_Verify_range
; Line 604
add rsp, 72 ; 00000048H
pop rdi
pop rsi
ret 0
??$_Adl_verify_range1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z ENDP ; std::_Adl_verify_range1<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<char const ,-1>,0> >
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z
_TEXT SEGMENT
cur$ = 32
$T1 = 40
$T2 = 64
$T3 = 88
$T4 = 112
$T5 = 120
tv148 = 128
tv131 = 136
tv150 = 144
tv138 = 152
tv152 = 160
tv145 = 168
__$ReturnUdt$ = 192
seq$ = 200
max$ = 208
??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z PROC ; gsl::ensure_sentinel<char const ,0>, COMDAT
; File c:\projects\gsl\include\gsl\string_span
; Line 113
$LN21:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 176 ; 000000b0H
mov rdi, rsp
mov ecx, 44 ; 0000002cH
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+192]
mov QWORD PTR $T5[rsp], -2
mov DWORD PTR $T4[rsp], 0
; Line 114
cmp QWORD PTR seq$[rsp], 0
je SHORT $LN5@ensure_sen
jmp SHORT $LN6@ensure_sen
$LN5@ensure_sen:
lea rdx, OFFSET FLAT:$SG50093
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv148[rsp], rax
mov rax, QWORD PTR tv148[rsp]
mov QWORD PTR tv131[rsp], rax
mov eax, DWORD PTR $T4[rsp]
or eax, 1
mov DWORD PTR $T4[rsp], eax
mov rcx, QWORD PTR tv131[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN6@ensure_sen:
mov eax, DWORD PTR $T4[rsp]
and eax, 1
test eax, eax
je SHORT $LN13@ensure_sen
and DWORD PTR $T4[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN13@ensure_sen:
; Line 117
mov rax, QWORD PTR seq$[rsp]
mov QWORD PTR cur$[rsp], rax
; Line 118
cmp QWORD PTR cur$[rsp], 0
je SHORT $LN7@ensure_sen
jmp SHORT $LN8@ensure_sen
$LN7@ensure_sen:
lea rdx, OFFSET FLAT:$SG50094
lea rcx, QWORD PTR $T2[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv150[rsp], rax
mov rax, QWORD PTR tv150[rsp]
mov QWORD PTR tv138[rsp], rax
mov eax, DWORD PTR $T4[rsp]
or eax, 2
mov DWORD PTR $T4[rsp], eax
mov rcx, QWORD PTR tv138[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN8@ensure_sen:
mov eax, DWORD PTR $T4[rsp]
and eax, 2
test eax, eax
je SHORT $LN2@ensure_sen
and DWORD PTR $T4[rsp], -3
lea rcx, QWORD PTR $T2[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN2@ensure_sen:
; Line 121
mov rax, QWORD PTR seq$[rsp]
mov rcx, QWORD PTR cur$[rsp]
sub rcx, rax
mov rax, rcx
cmp rax, QWORD PTR max$[rsp]
jge SHORT $LN3@ensure_sen
mov rax, QWORD PTR cur$[rsp]
movsx eax, BYTE PTR [rax]
test eax, eax
je SHORT $LN3@ensure_sen
mov rax, QWORD PTR cur$[rsp]
inc rax
mov QWORD PTR cur$[rsp], rax
jmp SHORT $LN2@ensure_sen
$LN3@ensure_sen:
; Line 122
mov rax, QWORD PTR cur$[rsp]
movsx eax, BYTE PTR [rax]
test eax, eax
jne SHORT $LN9@ensure_sen
jmp SHORT $LN10@ensure_sen
$LN9@ensure_sen:
lea rdx, OFFSET FLAT:$SG50095
lea rcx, QWORD PTR $T3[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv152[rsp], rax
mov rax, QWORD PTR tv152[rsp]
mov QWORD PTR tv145[rsp], rax
mov eax, DWORD PTR $T4[rsp]
or eax, 4
mov DWORD PTR $T4[rsp], eax
mov rcx, QWORD PTR tv145[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN10@ensure_sen:
mov eax, DWORD PTR $T4[rsp]
and eax, 4
test eax, eax
je SHORT $LN19@ensure_sen
and DWORD PTR $T4[rsp], -5
lea rcx, QWORD PTR $T3[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN19@ensure_sen:
; Line 123
mov rax, QWORD PTR seq$[rsp]
mov rcx, QWORD PTR cur$[rsp]
sub rcx, rax
mov rax, rcx
mov r8, rax
mov rdx, QWORD PTR seq$[rsp]
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??0?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z ; gsl::span<char const ,-1>::span<char const ,-1>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 124
add rsp, 176 ; 000000b0H
pop rdi
ret 0
$LN20@ensure_sen:
??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z ENDP ; gsl::ensure_sentinel<char const ,0>
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
cur$ = 32
$T1 = 40
$T2 = 64
$T3 = 88
$T4 = 112
$T5 = 120
tv148 = 128
tv131 = 136
tv150 = 144
tv138 = 152
tv152 = 160
tv145 = 168
__$ReturnUdt$ = 192
seq$ = 200
max$ = 208
?dtor$0@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA PROC ; `gsl::ensure_sentinel<char const ,0>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T4[rbp]
and eax, 1
test eax, eax
je SHORT $LN12@dtor$0
and DWORD PTR $T4[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN12@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA ENDP ; `gsl::ensure_sentinel<char const ,0>'::`1'::dtor$0
text$x ENDS
; COMDAT text$x
text$x SEGMENT
cur$ = 32
$T1 = 40
$T2 = 64
$T3 = 88
$T4 = 112
$T5 = 120
tv148 = 128
tv131 = 136
tv150 = 144
tv138 = 152
tv152 = 160
tv145 = 168
__$ReturnUdt$ = 192
seq$ = 200
max$ = 208
?dtor$1@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA PROC ; `gsl::ensure_sentinel<char const ,0>'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T4[rbp]
and eax, 2
test eax, eax
je SHORT $LN15@dtor$1
and DWORD PTR $T4[rbp], -3
lea rcx, QWORD PTR $T2[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN15@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA ENDP ; `gsl::ensure_sentinel<char const ,0>'::`1'::dtor$1
text$x ENDS
; COMDAT text$x
text$x SEGMENT
cur$ = 32
$T1 = 40
$T2 = 64
$T3 = 88
$T4 = 112
$T5 = 120
tv148 = 128
tv131 = 136
tv150 = 144
tv138 = 152
tv152 = 160
tv145 = 168
__$ReturnUdt$ = 192
seq$ = 200
max$ = 208
?dtor$2@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA PROC ; `gsl::ensure_sentinel<char const ,0>'::`1'::dtor$2
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T4[rbp]
and eax, 4
test eax, eax
je SHORT $LN18@dtor$2
and DWORD PTR $T4[rbp], -5
lea rcx, QWORD PTR $T3[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN18@dtor$2:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$2@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA ENDP ; `gsl::ensure_sentinel<char const ,0>'::`1'::dtor$2
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
cur$ = 32
$T1 = 40
$T2 = 64
$T3 = 88
$T4 = 112
$T5 = 120
tv148 = 128
tv131 = 136
tv150 = 144
tv138 = 152
tv152 = 160
tv145 = 168
__$ReturnUdt$ = 192
seq$ = 200
max$ = 208
?dtor$0@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA PROC ; `gsl::ensure_sentinel<char const ,0>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T4[rbp]
and eax, 1
test eax, eax
je SHORT $LN12@dtor$0
and DWORD PTR $T4[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN12@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA ENDP ; `gsl::ensure_sentinel<char const ,0>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
cur$ = 32
$T1 = 40
$T2 = 64
$T3 = 88
$T4 = 112
$T5 = 120
tv148 = 128
tv131 = 136
tv150 = 144
tv138 = 152
tv152 = 160
tv145 = 168
__$ReturnUdt$ = 192
seq$ = 200
max$ = 208
?dtor$1@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA PROC ; `gsl::ensure_sentinel<char const ,0>'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T4[rbp]
and eax, 2
test eax, eax
je SHORT $LN15@dtor$1
and DWORD PTR $T4[rbp], -3
lea rcx, QWORD PTR $T2[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN15@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA ENDP ; `gsl::ensure_sentinel<char const ,0>'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
cur$ = 32
$T1 = 40
$T2 = 64
$T3 = 88
$T4 = 112
$T5 = 120
tv148 = 128
tv131 = 136
tv150 = 144
tv138 = 152
tv152 = 160
tv145 = 168
__$ReturnUdt$ = 192
seq$ = 200
max$ = 208
?dtor$2@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA PROC ; `gsl::ensure_sentinel<char const ,0>'::`1'::dtor$2
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T4[rbp]
and eax, 4
test eax, eax
je SHORT $LN18@dtor$2
and DWORD PTR $T4[rbp], -5
lea rcx, QWORD PTR $T3[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN18@dtor$2:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$2@?0???$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z@4HA ENDP ; `gsl::ensure_sentinel<char const ,0>'::`1'::dtor$2
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$forward@_K@std@@YA$$QEA_KAEA_K@Z
_TEXT SEGMENT
_Arg$ = 16
??$forward@_K@std@@YA$$QEA_KAEA_K@Z PROC ; std::forward<unsigned __int64>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\type_traits
; Line 1573
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 1574
mov rax, QWORD PTR _Arg$[rsp]
; Line 1575
pop rdi
ret 0
??$forward@_K@std@@YA$$QEA_KAEA_K@Z ENDP ; std::forward<unsigned __int64>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0$09@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$09@12@@Z
_TEXT SEGMENT
this$ = 48
ext$ = 56
??$?0$09@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$09@12@@Z PROC ; gsl::details::extent_type<-1>::extent_type<-1><10>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 334
$LN3:
mov BYTE PTR [rsp+16], dl
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 333
lea rcx, QWORD PTR ext$[rsp]
call ?size@?$extent_type@$09@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<10>::size
mov rcx, QWORD PTR this$[rsp]
mov QWORD PTR [rcx], rax
; Line 334
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$?0$09@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$09@12@@Z ENDP ; gsl::details::extent_type<-1>::extent_type<-1><10>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Seek_wrapped@H@std@@YAXAEAPEAHQEAH@Z
_TEXT SEGMENT
_It$ = 16
_UIt$ = 24
??$_Seek_wrapped@H@std@@YAXAEAPEAHQEAH@Z PROC ; std::_Seek_wrapped<int>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 871
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 872
mov rax, QWORD PTR _It$[rsp]
mov rcx, QWORD PTR _UIt$[rsp]
mov QWORD PTR [rax], rcx
; Line 873
pop rdi
ret 0
??$_Seek_wrapped@H@std@@YAXAEAPEAHQEAH@Z ENDP ; std::_Seek_wrapped<int>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Copy_n_unchecked3@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 33
_First$ = 64
_Count$ = 72
_Dest$ = 80
??$_Copy_n_unchecked3@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z PROC ; std::_Copy_n_unchecked3<int *,__int64,int *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2526
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 2528
lea r8, QWORD PTR _Dest$[rsp]
lea rdx, QWORD PTR _First$[rsp]
lea rcx, QWORD PTR $T1[rsp]
call ??$_Ptr_copy_cat@HH@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEAH0@Z ; std::_Ptr_copy_cat<int,int>
movzx r9d, BYTE PTR $T2[rsp]
mov r8, QWORD PTR _Dest$[rsp]
mov rdx, QWORD PTR _Count$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Copy_n_unchecked4@PEAH_JPEAH@std@@YAPEAHPEAH_J0U_Trivially_copyable_ptr_iterator_tag@0@@Z ; std::_Copy_n_unchecked4<int *,__int64,int *>
; Line 2530
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$_Copy_n_unchecked3@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z ENDP ; std::_Copy_n_unchecked3<int *,__int64,int *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Get_unwrapped_n@H_J$0A@@std@@YAPEAHQEAH_J@Z
_TEXT SEGMENT
_Src$ = 16
__formal$ = 24
??$_Get_unwrapped_n@H_J$0A@@std@@YAPEAHQEAH_J@Z PROC ; std::_Get_unwrapped_n<int,__int64,0>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 808
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 809
mov rax, QWORD PTR _Src$[rsp]
; Line 810
pop rdi
ret 0
??$_Get_unwrapped_n@H_J$0A@@std@@YAPEAHQEAH_J@Z ENDP ; std::_Get_unwrapped_n<int,__int64,0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Copy_unchecked1@PEAHPEAH@std@@YAPEAHPEAH00U_Trivially_copyable_ptr_iterator_tag@0@@Z
_TEXT SEGMENT
_First$ = 48
_Last$ = 56
_Dest$ = 64
__formal$ = 72
??$_Copy_unchecked1@PEAHPEAH@std@@YAPEAHPEAH00U_Trivially_copyable_ptr_iterator_tag@0@@Z PROC ; std::_Copy_unchecked1<int *,int *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2424
$LN3:
mov BYTE PTR [rsp+32], r9b
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 2425
mov r8, QWORD PTR _Dest$[rsp]
mov rdx, QWORD PTR _Last$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Copy_memmove@PEAHPEAH@std@@YAPEAHPEAH00@Z ; std::_Copy_memmove<int *,int *>
; Line 2426
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$_Copy_unchecked1@PEAHPEAH@std@@YAPEAHPEAH00U_Trivially_copyable_ptr_iterator_tag@0@@Z ENDP ; std::_Copy_unchecked1<int *,int *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Ptr_copy_cat@HH@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEAH0@Z
_TEXT SEGMENT
__$ReturnUdt$ = 16
__formal$ = 24
__formal$ = 32
??$_Ptr_copy_cat@HH@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEAH0@Z PROC ; std::_Ptr_copy_cat<int,int>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 1069
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 1070
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 1071
pop rdi
ret 0
??$_Ptr_copy_cat@HH@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEAH0@Z ENDP ; std::_Ptr_copy_cat<int,int>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Adl_verify_range1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 48
_First$ = 96
_Last$ = 104
__formal$ = 112
??$_Adl_verify_range1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z PROC ; std::_Adl_verify_range1<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 602
$LN3:
mov BYTE PTR [rsp+24], r8b
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rsi
push rdi
sub rsp, 72 ; 00000048H
mov rdi, rsp
mov ecx, 18
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
; Line 603
lea rax, QWORD PTR $T2[rsp]
mov rdi, rax
mov rsi, QWORD PTR _Last$[rsp]
mov ecx, 16
rep movsb
lea rax, QWORD PTR $T1[rsp]
mov rdi, rax
mov rsi, QWORD PTR _First$[rsp]
mov ecx, 16
rep movsb
lea rdx, QWORD PTR $T2[rsp]
lea rcx, QWORD PTR $T1[rsp]
call ?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z ; gsl::details::_Verify_range
; Line 604
add rsp, 72 ; 00000048H
pop rdi
pop rsi
ret 0
??$_Adl_verify_range1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z ENDP ; std::_Adl_verify_range1<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0$0A@@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$0A@@12@@Z
_TEXT SEGMENT
this$ = 48
ext$ = 56
??$?0$0A@@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$0A@@12@@Z PROC ; gsl::details::extent_type<-1>::extent_type<-1><0>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 334
$LN3:
mov BYTE PTR [rsp+16], dl
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 333
lea rcx, QWORD PTR ext$[rsp]
call ?size@?$extent_type@$0A@@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<0>::size
mov rcx, QWORD PTR this$[rsp]
mov QWORD PTR [rcx], rax
; Line 334
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$?0$0A@@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$0A@@12@@Z ENDP ; gsl::details::extent_type<-1>::extent_type<-1><0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0$05@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$05@12@@Z
_TEXT SEGMENT
this$ = 48
ext$ = 56
??$?0$05@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$05@12@@Z PROC ; gsl::details::extent_type<-1>::extent_type<-1><6>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 334
$LN3:
mov BYTE PTR [rsp+16], dl
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 333
lea rcx, QWORD PTR ext$[rsp]
call ?size@?$extent_type@$05@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<6>::size
mov rcx, QWORD PTR this$[rsp]
mov QWORD PTR [rcx], rax
; Line 334
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$?0$05@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$05@12@@Z ENDP ; gsl::details::extent_type<-1>::extent_type<-1><6>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z PROC ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 597
$LN14:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 128 ; 00000080H
mov rdi, rsp
mov ecx, 32 ; 00000020H
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+144]
mov QWORD PTR $T4[rsp], -2
mov DWORD PTR $T3[rsp], 0
; Line 596
mov rdx, QWORD PTR ext$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z ; gsl::details::extent_type<-1>::extent_type<-1>
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR data$[rsp]
mov QWORD PTR [rax+8], rcx
; Line 598
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
jl SHORT $LN3@extent_typ
jmp SHORT $LN4@extent_typ
$LN3@extent_typ:
lea rdx, OFFSET FLAT:??_C@_0ED@GGAHHHOA@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv144[rsp], rax
mov rax, QWORD PTR tv144[rsp]
mov QWORD PTR tv134[rsp], rax
mov eax, DWORD PTR $T3[rsp]
or eax, 1
mov DWORD PTR $T3[rsp], eax
mov rcx, QWORD PTR tv134[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@extent_typ:
mov eax, DWORD PTR $T3[rsp]
and eax, 1
test eax, eax
je SHORT $LN9@extent_typ
and DWORD PTR $T3[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN9@extent_typ:
; Line 599
cmp QWORD PTR data$[rsp], 0
jne SHORT $LN5@extent_typ
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
je SHORT $LN5@extent_typ
lea rdx, OFFSET FLAT:??_C@_0ED@HPBMEGKB@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T2[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv146[rsp], rax
mov rax, QWORD PTR tv146[rsp]
mov QWORD PTR tv141[rsp], rax
mov eax, DWORD PTR $T3[rsp]
or eax, 2
mov DWORD PTR $T3[rsp], eax
mov rcx, QWORD PTR tv141[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN5@extent_typ:
mov eax, DWORD PTR $T3[rsp]
and eax, 2
test eax, eax
je SHORT $LN12@extent_typ
and DWORD PTR $T3[rsp], -3
lea rcx, QWORD PTR $T2[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN12@extent_typ:
; Line 600
mov rax, QWORD PTR this$[rsp]
add rsp, 128 ; 00000080H
pop rdi
ret 0
$LN13@extent_typ:
??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z ENDP ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA PROC ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 1
test eax, eax
je SHORT $LN8@dtor$0
and DWORD PTR $T3[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN8@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA ENDP ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
text$x ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA PROC ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 2
test eax, eax
je SHORT $LN11@dtor$1
and DWORD PTR $T3[rbp], -3
lea rcx, QWORD PTR $T2[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN11@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA ENDP ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA PROC ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 1
test eax, eax
je SHORT $LN8@dtor$0
and DWORD PTR $T3[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN8@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA ENDP ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA PROC ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 2
test eax, eax
je SHORT $LN11@dtor$1
and DWORD PTR $T3[rbp], -3
lea rcx, QWORD PTR $T2[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN11@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z@4HA ENDP ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z PROC ; gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 597
$LN14:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 128 ; 00000080H
mov rdi, rsp
mov ecx, 32 ; 00000020H
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+144]
mov QWORD PTR $T4[rsp], -2
mov DWORD PTR $T3[rsp], 0
; Line 596
mov rdx, QWORD PTR ext$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z ; gsl::details::extent_type<-1>::extent_type<-1>
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR data$[rsp]
mov QWORD PTR [rax+8], rcx
; Line 598
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
jl SHORT $LN3@extent_typ
jmp SHORT $LN4@extent_typ
$LN3@extent_typ:
lea rdx, OFFSET FLAT:??_C@_0ED@GGAHHHOA@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv144[rsp], rax
mov rax, QWORD PTR tv144[rsp]
mov QWORD PTR tv134[rsp], rax
mov eax, DWORD PTR $T3[rsp]
or eax, 1
mov DWORD PTR $T3[rsp], eax
mov rcx, QWORD PTR tv134[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@extent_typ:
mov eax, DWORD PTR $T3[rsp]
and eax, 1
test eax, eax
je SHORT $LN9@extent_typ
and DWORD PTR $T3[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN9@extent_typ:
; Line 599
cmp QWORD PTR data$[rsp], 0
jne SHORT $LN5@extent_typ
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
je SHORT $LN5@extent_typ
lea rdx, OFFSET FLAT:??_C@_0ED@HPBMEGKB@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T2[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv146[rsp], rax
mov rax, QWORD PTR tv146[rsp]
mov QWORD PTR tv141[rsp], rax
mov eax, DWORD PTR $T3[rsp]
or eax, 2
mov DWORD PTR $T3[rsp], eax
mov rcx, QWORD PTR tv141[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN5@extent_typ:
mov eax, DWORD PTR $T3[rsp]
and eax, 2
test eax, eax
je SHORT $LN12@extent_typ
and DWORD PTR $T3[rsp], -3
lea rcx, QWORD PTR $T2[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN12@extent_typ:
; Line 600
mov rax, QWORD PTR this$[rsp]
add rsp, 128 ; 00000080H
pop rdi
ret 0
$LN13@extent_typ:
??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z ENDP ; gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA PROC ; `gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 1
test eax, eax
je SHORT $LN8@dtor$0
and DWORD PTR $T3[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN8@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA ENDP ; `gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
text$x ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA PROC ; `gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 2
test eax, eax
je SHORT $LN11@dtor$1
and DWORD PTR $T3[rbp], -3
lea rcx, QWORD PTR $T2[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN11@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA ENDP ; `gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA PROC ; `gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 1
test eax, eax
je SHORT $LN8@dtor$0
and DWORD PTR $T3[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN8@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA ENDP ; `gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA PROC ; `gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 2
test eax, eax
je SHORT $LN11@dtor$1
and DWORD PTR $T3[rbp], -3
lea rcx, QWORD PTR $T2[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN11@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z@4HA ENDP ; `gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$forward@AEA_J@std@@YAAEA_JAEA_J@Z
_TEXT SEGMENT
_Arg$ = 16
??$forward@AEA_J@std@@YAAEA_JAEA_J@Z PROC ; std::forward<__int64 &>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\type_traits
; Line 1573
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 1574
mov rax, QWORD PTR _Arg$[rsp]
; Line 1575
pop rdi
ret 0
??$forward@AEA_J@std@@YAAEA_JAEA_J@Z ENDP ; std::forward<__int64 &>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0H$05X@?$span@H$0?0@gsl@@QEAA@AEBV?$span@H$05@1@@Z
_TEXT SEGMENT
$T1 = 32
tv68 = 40
this$ = 64
other$ = 72
??$?0H$05X@?$span@H$0?0@gsl@@QEAA@AEBV?$span@H$05@1@@Z PROC ; gsl::span<int,-1>::span<int,-1><int,6,void>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 448
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 447
mov rcx, QWORD PTR other$[rsp]
call ?size@?$span@H$05@gsl@@QEBA_JXZ ; gsl::span<int,6>::size
mov rdx, rax
lea rcx, QWORD PTR $T1[rsp]
call ??0?$extent_type@$05@details@gsl@@QEAA@_J@Z ; gsl::details::extent_type<6>::extent_type<6>
mov QWORD PTR tv68[rsp], rax
mov rcx, QWORD PTR other$[rsp]
call ?data@?$span@H$05@gsl@@QEBAPEAHXZ ; gsl::span<int,6>::data
mov rcx, QWORD PTR this$[rsp]
mov rdx, QWORD PTR tv68[rsp]
movzx r8d, BYTE PTR [rdx]
mov rdx, rax
call ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$05@details@2@@Z ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >
; Line 448
mov rax, QWORD PTR this$[rsp]
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$?0H$05X@?$span@H$0?0@gsl@@QEAA@AEBV?$span@H$05@1@@Z ENDP ; gsl::span<int,-1>::span<int,-1><int,6,void>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$copy_n@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z
_TEXT SEGMENT
_Count$ = 32
tv66 = 40
_First$ = 64
_Count_raw$ = 72
_Dest$ = 80
??$copy_n@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z PROC ; std::copy_n<char const *,__int64,unsigned char *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2536
$LN4:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 2537
mov rax, QWORD PTR _Count_raw$[rsp]
mov QWORD PTR _Count$[rsp], rax
; Line 2538
cmp QWORD PTR _Count$[rsp], 0
jle SHORT $LN2@copy_n
; Line 2540
mov rdx, QWORD PTR _Count$[rsp]
mov rcx, QWORD PTR _Dest$[rsp]
call ??$_Get_unwrapped_n@E_J$0A@@std@@YAPEAEQEAE_J@Z ; std::_Get_unwrapped_n<unsigned char,__int64,0>
mov QWORD PTR tv66[rsp], rax
mov rdx, QWORD PTR _Count$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Get_unwrapped_n@$$CBD_J$0A@@std@@YAPEBDQEBD_J@Z ; std::_Get_unwrapped_n<char const ,__int64,0>
mov rcx, QWORD PTR tv66[rsp]
mov r8, rcx
mov rdx, QWORD PTR _Count$[rsp]
mov rcx, rax
call ??$_Copy_n_unchecked3@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z ; std::_Copy_n_unchecked3<char const *,__int64,unsigned char *>
mov rdx, rax
lea rcx, QWORD PTR _Dest$[rsp]
call ??$_Seek_wrapped@E@std@@YAXAEAPEAEQEAE@Z ; std::_Seek_wrapped<unsigned char>
$LN2@copy_n:
; Line 2544
mov rax, QWORD PTR _Dest$[rsp]
; Line 2545
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$copy_n@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z ENDP ; std::copy_n<char const *,__int64,unsigned char *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$narrow@_J_J@gsl@@YA_J_J@Z
_TEXT SEGMENT
t$ = 32
$T1 = 40
$T2 = 64
$T3 = 88
tv90 = 96
tv87 = 104
tv91 = 112
tv89 = 120
u$ = 144
??$narrow@_J_J@gsl@@YA_J_J@Z PROC ; gsl::narrow<__int64,__int64>, COMDAT
; File c:\projects\gsl\include\gsl\gsl_util
; Line 124
$LN8:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 128 ; 00000080H
mov rdi, rsp
mov ecx, 32 ; 00000020H
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+144]
mov QWORD PTR $T3[rsp], -2
; Line 125
lea rcx, QWORD PTR u$[rsp]
call ??$narrow_cast@_JAEA_J@gsl@@YA_JAEA_J@Z ; gsl::narrow_cast<__int64,__int64 &>
mov QWORD PTR t$[rsp], rax
; Line 126
mov rax, QWORD PTR u$[rsp]
cmp QWORD PTR t$[rsp], rax
je SHORT $LN2@narrow
lea rax, QWORD PTR $T1[rsp]
mov rdi, rax
xor eax, eax
mov ecx, 24
rep stosb
lea rcx, QWORD PTR $T1[rsp]
call ??0narrowing_error@gsl@@QEAA@XZ
mov QWORD PTR tv90[rsp], rax
mov rax, QWORD PTR tv90[rsp]
mov QWORD PTR tv87[rsp], rax
mov rcx, QWORD PTR tv87[rsp]
call ??$throw_exception@Unarrowing_error@gsl@@@details@gsl@@YAX$$QEAUnarrowing_error@1@@Z ; gsl::details::throw_exception<gsl::narrowing_error>
npad 1
lea rcx, QWORD PTR $T1[rsp]
call ??1narrowing_error@gsl@@UEAA@XZ
npad 1
$LN2@narrow:
; Line 127
xor eax, eax
test eax, eax
je SHORT $LN3@narrow
; Line 128
lea rax, QWORD PTR $T2[rsp]
mov rdi, rax
xor eax, eax
mov ecx, 24
rep stosb
lea rcx, QWORD PTR $T2[rsp]
call ??0narrowing_error@gsl@@QEAA@XZ
mov QWORD PTR tv91[rsp], rax
mov rax, QWORD PTR tv91[rsp]
mov QWORD PTR tv89[rsp], rax
mov rcx, QWORD PTR tv89[rsp]
call ??$throw_exception@Unarrowing_error@gsl@@@details@gsl@@YAX$$QEAUnarrowing_error@1@@Z ; gsl::details::throw_exception<gsl::narrowing_error>
npad 1
lea rcx, QWORD PTR $T2[rsp]
call ??1narrowing_error@gsl@@UEAA@XZ
npad 1
$LN3@narrow:
; Line 129
mov rax, QWORD PTR t$[rsp]
; Line 130
add rsp, 128 ; 00000080H
pop rdi
ret 0
$LN7@narrow:
??$narrow@_J_J@gsl@@YA_J_J@Z ENDP ; gsl::narrow<__int64,__int64>
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
t$ = 32
$T1 = 40
$T2 = 64
$T3 = 88
tv90 = 96
tv87 = 104
tv91 = 112
tv89 = 120
u$ = 144
?dtor$0@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA PROC ; `gsl::narrow<__int64,__int64>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
lea rcx, QWORD PTR $T1[rbp]
call ??1narrowing_error@gsl@@UEAA@XZ
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA ENDP ; `gsl::narrow<__int64,__int64>'::`1'::dtor$0
text$x ENDS
; COMDAT text$x
text$x SEGMENT
t$ = 32
$T1 = 40
$T2 = 64
$T3 = 88
tv90 = 96
tv87 = 104
tv91 = 112
tv89 = 120
u$ = 144
?dtor$1@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA PROC ; `gsl::narrow<__int64,__int64>'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
lea rcx, QWORD PTR $T2[rbp]
call ??1narrowing_error@gsl@@UEAA@XZ
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA ENDP ; `gsl::narrow<__int64,__int64>'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
t$ = 32
$T1 = 40
$T2 = 64
$T3 = 88
tv90 = 96
tv87 = 104
tv91 = 112
tv89 = 120
u$ = 144
?dtor$0@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA PROC ; `gsl::narrow<__int64,__int64>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
lea rcx, QWORD PTR $T1[rbp]
call ??1narrowing_error@gsl@@UEAA@XZ
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA ENDP ; `gsl::narrow<__int64,__int64>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
t$ = 32
$T1 = 40
$T2 = 64
$T3 = 88
tv90 = 96
tv87 = 104
tv91 = 112
tv89 = 120
u$ = 144
?dtor$1@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA PROC ; `gsl::narrow<__int64,__int64>'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
lea rcx, QWORD PTR $T2[rbp]
call ??1narrowing_error@gsl@@UEAA@XZ
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$narrow@_J_J@gsl@@YA_J_J@Z@4HA ENDP ; `gsl::narrow<__int64,__int64>'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Seek_wrapped@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@PEAE$0A@@std@@YAXAEAV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@AEBQEAE@Z
_TEXT SEGMENT
_It$ = 48
_UIt$ = 56
??$_Seek_wrapped@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@PEAE$0A@@std@@YAXAEAV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@AEBQEAE@Z PROC ; std::_Seek_wrapped<gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>,unsigned char *,0>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 856
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 857
mov rax, QWORD PTR _UIt$[rsp]
mov rdx, QWORD PTR [rax]
mov rcx, QWORD PTR _It$[rsp]
call ?_Seek_to@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAE@Z ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::_Seek_to
; Line 858
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$_Seek_wrapped@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@PEAE$0A@@std@@YAXAEAV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@AEBQEAE@Z ENDP ; std::_Seek_wrapped<gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>,unsigned char *,0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Copy_unchecked@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 33
_First$ = 64
_Last$ = 72
_Dest$ = 80
??$_Copy_unchecked@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z PROC ; std::_Copy_unchecked<char const *,unsigned char *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2432
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 2434
lea r8, QWORD PTR _Dest$[rsp]
lea rdx, QWORD PTR _First$[rsp]
lea rcx, QWORD PTR $T1[rsp]
call ??$_Ptr_copy_cat@$$CBDE@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEBDAEBQEAE@Z ; std::_Ptr_copy_cat<char const ,unsigned char>
movzx r9d, BYTE PTR $T2[rsp]
mov r8, QWORD PTR _Dest$[rsp]
mov rdx, QWORD PTR _Last$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Copy_unchecked1@PEBDPEAE@std@@YAPEAEPEBD0PEAEU_Trivially_copyable_ptr_iterator_tag@0@@Z ; std::_Copy_unchecked1<char const *,unsigned char *>
; Line 2435
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$_Copy_unchecked@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z ENDP ; std::_Copy_unchecked<char const *,unsigned char *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Get_unwrapped_n@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAEAEBV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J@Z
_TEXT SEGMENT
_COff$ = 48
_It$ = 80
_Off$ = 88
??$_Get_unwrapped_n@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAEAEBV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J@Z PROC ; std::_Get_unwrapped_n<gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>,__int64,0>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 760
$LN13:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
; Line 763
mov rax, QWORD PTR _Off$[rsp]
mov QWORD PTR _COff$[rsp], rax
$LN4@Get_unwrap:
; Line 765
mov rax, 9223372036854775807 ; 7fffffffffffffffH
cmp QWORD PTR _COff$[rsp], rax
jg SHORT $LN8@Get_unwrap
xor eax, eax
test eax, eax
jne SHORT $LN10@Get_unwrap
mov rax, -9223372036854775808 ; 8000000000000000H
cmp QWORD PTR _COff$[rsp], rax
jl SHORT $LN8@Get_unwrap
$LN10@Get_unwrap:
jmp SHORT $LN9@Get_unwrap
$LN8@Get_unwrap:
$LN7@Get_unwrap:
lea rax, OFFSET FLAT:??_C@_0BB@KBEKGHFK@integer?5overflow@
mov QWORD PTR [rsp+40], rax
lea rax, OFFSET FLAT:??_C@_02DKCKIIND@?$CFs@
mov QWORD PTR [rsp+32], rax
xor r9d, r9d
mov r8d, 767 ; 000002ffH
lea rdx, OFFSET FLAT:??_C@_0GJ@EJIMBHLG@c?3?2program?5files?5?$CIx86?$CJ?2microsof@
mov ecx, 2
call QWORD PTR __imp__CrtDbgReport
cmp eax, 1
jne SHORT $LN12@Get_unwrap
int 3
xor eax, eax
$LN12@Get_unwrap:
mov QWORD PTR [rsp+32], 0
mov r9d, 767 ; 000002ffH
lea r8, OFFSET FLAT:??_C@_1NC@FANNPLN@?$AAc?$AA?3?$AA?2?$AAp?$AAr?$AAo?$AAg?$AAr?$AAa?$AAm?$AA?5?$AAf?$AAi?$AAl?$AAe@
lea rdx, OFFSET FLAT:??_C@_1CM@MJCLAPGA@?$AAs?$AAt?$AAd?$AA?3?$AA?3?$AA_?$AAG?$AAe?$AAt?$AA_?$AAu?$AAn?$AAw?$AAr?$AAa@
lea rcx, OFFSET FLAT:??_C@_1CG@NMONALKO@?$AA?$CC?$AAi?$AAn?$AAt?$AAe?$AAg?$AAe?$AAr?$AA?5?$AAo?$AAv?$AAe?$AAr?$AAf?$AAl@
call QWORD PTR __imp__invalid_parameter
xor eax, eax
test eax, eax
jne SHORT $LN7@Get_unwrap
$LN9@Get_unwrap:
xor eax, eax
test eax, eax
jne $LN4@Get_unwrap
; Line 770
mov rdx, QWORD PTR _Off$[rsp]
mov rcx, QWORD PTR _It$[rsp]
call ?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::_Verify_offset
; Line 771
mov rcx, QWORD PTR _It$[rsp]
call ?_Unwrapped@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAPEAEXZ ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::_Unwrapped
; Line 772
add rsp, 64 ; 00000040H
pop rdi
ret 0
??$_Get_unwrapped_n@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAEAEBV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J@Z ENDP ; std::_Get_unwrapped_n<gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>,__int64,0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Idl_distance1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0Urandom_access_iterator_tag@0@@Z
_TEXT SEGMENT
_First$ = 16
_Last$ = 24
__formal$ = 32
??$_Idl_distance1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0Urandom_access_iterator_tag@0@@Z PROC ; std::_Idl_distance1<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,char const *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 967
$LN3:
mov BYTE PTR [rsp+24], r8b
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 968
mov rax, QWORD PTR _Last$[rsp]
mov rcx, QWORD PTR _First$[rsp]
mov rcx, QWORD PTR [rcx]
mov rax, QWORD PTR [rax]
sub rax, rcx
; Line 969
pop rdi
ret 0
??$_Idl_distance1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0Urandom_access_iterator_tag@0@@Z ENDP ; std::_Idl_distance1<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,char const *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Idl_distance@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0@Z
_TEXT SEGMENT
$T1 = 32
_First$ = 64
_Last$ = 72
??$_Idl_distance@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0@Z PROC ; std::_Idl_distance<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,char const *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 974
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 975
movzx r8d, BYTE PTR $T1[rsp]
mov rdx, QWORD PTR _Last$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Idl_distance1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0Urandom_access_iterator_tag@0@@Z ; std::_Idl_distance1<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,char const *>
; Line 976
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$_Idl_distance@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0@Z ENDP ; std::_Idl_distance<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,char const *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Get_unwrapped@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEBDAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@@Z
_TEXT SEGMENT
_It$ = 48
??$_Get_unwrapped@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEBDAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@@Z PROC ; std::_Get_unwrapped<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,0>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 642
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 643
mov rcx, QWORD PTR _It$[rsp]
call ?_Unwrapped@?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEBAPEBDXZ ; gsl::details::span_iterator<gsl::span<char const ,-1>,0>::_Unwrapped
; Line 644
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$_Get_unwrapped@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEBDAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@@Z ENDP ; std::_Get_unwrapped<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Adl_verify_range@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0@Z
_TEXT SEGMENT
$T1 = 32
_First$ = 64
_Last$ = 72
??$_Adl_verify_range@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0@Z PROC ; std::_Adl_verify_range<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<char const ,-1>,0> >, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 615
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 616
lea rax, QWORD PTR $T1[rsp]
mov rdi, rax
xor eax, eax
mov ecx, 1
rep stosb
movzx r8d, BYTE PTR $T1[rsp]
mov rdx, QWORD PTR _Last$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Adl_verify_range1@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z ; std::_Adl_verify_range1<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<char const ,-1>,0> >
; Line 617
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$_Adl_verify_range@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0@Z ENDP ; std::_Adl_verify_range<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<char const ,-1>,0> >
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$ensure_z@$$CBD@gsl@@YA?AV?$span@$$CBD$0?0@0@AEBQEBD_J@Z
_TEXT SEGMENT
__$ReturnUdt$ = 48
sz$ = 56
max$ = 64
??$ensure_z@$$CBD@gsl@@YA?AV?$span@$$CBD$0?0@0@AEBQEBD_J@Z PROC ; gsl::ensure_z<char const >, COMDAT
; File c:\projects\gsl\include\gsl\string_span
; Line 133
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 134
mov r8, QWORD PTR max$[rsp]
mov rax, QWORD PTR sz$[rsp]
mov rdx, QWORD PTR [rax]
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??$ensure_sentinel@$$CBD$0A@@gsl@@YA?AV?$span@$$CBD$0?0@0@PEBD_J@Z ; gsl::ensure_sentinel<char const ,0>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 135
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$ensure_z@$$CBD@gsl@@YA?AV?$span@$$CBD$0?0@0@AEBQEBD_J@Z ENDP ; gsl::ensure_z<char const >
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$narrow_cast@_J_K@gsl@@YA_J$$QEA_K@Z
_TEXT SEGMENT
u$ = 48
??$narrow_cast@_J_K@gsl@@YA_J$$QEA_K@Z PROC ; gsl::narrow_cast<__int64,unsigned __int64>, COMDAT
; File c:\projects\gsl\include\gsl\gsl_util
; Line 99
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 100
mov rcx, QWORD PTR u$[rsp]
call ??$forward@_K@std@@YA$$QEA_KAEA_K@Z ; std::forward<unsigned __int64>
mov rax, QWORD PTR [rax]
; Line 101
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$narrow_cast@_J_K@gsl@@YA_J$$QEA_K@Z ENDP ; gsl::narrow_cast<__int64,unsigned __int64>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv91 = 72
tv88 = 80
this$ = 112
data$ = 120
ext$ = 128
??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z PROC ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<10> >, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 591
$LN9:
mov BYTE PTR [rsp+24], r8b
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 96 ; 00000060H
mov rdi, rsp
mov ecx, 24
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+112]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 590
movzx edx, BYTE PTR ext$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??$?0$09@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$09@12@@Z ; gsl::details::extent_type<-1>::extent_type<-1><10>
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR data$[rsp]
mov QWORD PTR [rax+8], rcx
; Line 592
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
jl SHORT $LN3@extent_typ
jmp SHORT $LN4@extent_typ
$LN3@extent_typ:
lea rdx, OFFSET FLAT:??_C@_0ED@JMOIJPGK@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv91[rsp], rax
mov rax, QWORD PTR tv91[rsp]
mov QWORD PTR tv88[rsp], rax
mov eax, DWORD PTR $T2[rsp]
or eax, 1
mov DWORD PTR $T2[rsp], eax
mov rcx, QWORD PTR tv88[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@extent_typ:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN7@extent_typ
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN7@extent_typ:
; Line 593
mov rax, QWORD PTR this$[rsp]
add rsp, 96 ; 00000060H
pop rdi
ret 0
$LN8@extent_typ:
??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z ENDP ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<10> >
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv91 = 72
tv88 = 80
this$ = 112
data$ = 120
ext$ = 128
?dtor$0@?0???$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z@4HA PROC ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<10> >'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z@4HA ENDP ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<10> >'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv91 = 72
tv88 = 80
this$ = 112
data$ = 120
ext$ = 128
?dtor$0@?0???$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z@4HA PROC ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<10> >'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z@4HA ENDP ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<10> >'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?size@?$extent_type@$09@details@gsl@@QEBA_JXZ
_TEXT SEGMENT
this$ = 16
?size@?$extent_type@$09@details@gsl@@QEBA_JXZ PROC ; gsl::details::extent_type<10>::size, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 323
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
mov eax, 10
pop rdi
ret 0
?size@?$extent_type@$09@details@gsl@@QEBA_JXZ ENDP ; gsl::details::extent_type<10>::size
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0?$extent_type@$09@details@gsl@@QEAA@XZ
_TEXT SEGMENT
this$ = 16
??0?$extent_type@$09@details@gsl@@QEAA@XZ PROC ; gsl::details::extent_type<10>::extent_type<10>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 311
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
mov rax, QWORD PTR this$[rsp]
pop rdi
ret 0
??0?$extent_type@$09@details@gsl@@QEAA@XZ ENDP ; gsl::details::extent_type<10>::extent_type<10>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$copy_n@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z
_TEXT SEGMENT
_Count$ = 32
tv66 = 40
_First$ = 64
_Count_raw$ = 72
_Dest$ = 80
??$copy_n@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z PROC ; std::copy_n<int *,__int64,int *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2536
$LN4:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 2537
mov rax, QWORD PTR _Count_raw$[rsp]
mov QWORD PTR _Count$[rsp], rax
; Line 2538
cmp QWORD PTR _Count$[rsp], 0
jle SHORT $LN2@copy_n
; Line 2540
mov rdx, QWORD PTR _Count$[rsp]
mov rcx, QWORD PTR _Dest$[rsp]
call ??$_Get_unwrapped_n@H_J$0A@@std@@YAPEAHQEAH_J@Z ; std::_Get_unwrapped_n<int,__int64,0>
mov QWORD PTR tv66[rsp], rax
mov rdx, QWORD PTR _Count$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Get_unwrapped_n@H_J$0A@@std@@YAPEAHQEAH_J@Z ; std::_Get_unwrapped_n<int,__int64,0>
mov rcx, QWORD PTR tv66[rsp]
mov r8, rcx
mov rdx, QWORD PTR _Count$[rsp]
mov rcx, rax
call ??$_Copy_n_unchecked3@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z ; std::_Copy_n_unchecked3<int *,__int64,int *>
mov rdx, rax
lea rcx, QWORD PTR _Dest$[rsp]
call ??$_Seek_wrapped@H@std@@YAXAEAPEAHQEAH@Z ; std::_Seek_wrapped<int>
$LN2@copy_n:
; Line 2544
mov rax, QWORD PTR _Dest$[rsp]
; Line 2545
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$copy_n@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z ENDP ; std::copy_n<int *,__int64,int *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Seek_wrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH$0A@@std@@YAXAEAV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@AEBQEAH@Z
_TEXT SEGMENT
_It$ = 48
_UIt$ = 56
??$_Seek_wrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH$0A@@std@@YAXAEAV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@AEBQEAH@Z PROC ; std::_Seek_wrapped<gsl::details::span_iterator<gsl::span<int,-1>,0>,int *,0>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 856
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 857
mov rax, QWORD PTR _UIt$[rsp]
mov rdx, QWORD PTR [rax]
mov rcx, QWORD PTR _It$[rsp]
call ?_Seek_to@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAH@Z ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Seek_to
; Line 858
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$_Seek_wrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH$0A@@std@@YAXAEAV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@AEBQEAH@Z ENDP ; std::_Seek_wrapped<gsl::details::span_iterator<gsl::span<int,-1>,0>,int *,0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Copy_unchecked@PEAHPEAH@std@@YAPEAHPEAH00@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 33
_First$ = 64
_Last$ = 72
_Dest$ = 80
??$_Copy_unchecked@PEAHPEAH@std@@YAPEAHPEAH00@Z PROC ; std::_Copy_unchecked<int *,int *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2432
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 2434
lea r8, QWORD PTR _Dest$[rsp]
lea rdx, QWORD PTR _First$[rsp]
lea rcx, QWORD PTR $T1[rsp]
call ??$_Ptr_copy_cat@HH@std@@YA?AU_Really_trivial_ptr_iterator_tag@0@AEBQEAH0@Z ; std::_Ptr_copy_cat<int,int>
movzx r9d, BYTE PTR $T2[rsp]
mov r8, QWORD PTR _Dest$[rsp]
mov rdx, QWORD PTR _Last$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Copy_unchecked1@PEAHPEAH@std@@YAPEAHPEAH00U_Trivially_copyable_ptr_iterator_tag@0@@Z ; std::_Copy_unchecked1<int *,int *>
; Line 2435
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$_Copy_unchecked@PEAHPEAH@std@@YAPEAHPEAH00@Z ENDP ; std::_Copy_unchecked<int *,int *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Get_unwrapped_n@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J@Z
_TEXT SEGMENT
_COff$ = 48
_It$ = 80
_Off$ = 88
??$_Get_unwrapped_n@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J@Z PROC ; std::_Get_unwrapped_n<gsl::details::span_iterator<gsl::span<int,-1>,0>,__int64,0>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 760
$LN13:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
; Line 763
mov rax, QWORD PTR _Off$[rsp]
mov QWORD PTR _COff$[rsp], rax
$LN4@Get_unwrap:
; Line 765
mov rax, 9223372036854775807 ; 7fffffffffffffffH
cmp QWORD PTR _COff$[rsp], rax
jg SHORT $LN8@Get_unwrap
xor eax, eax
test eax, eax
jne SHORT $LN10@Get_unwrap
mov rax, -9223372036854775808 ; 8000000000000000H
cmp QWORD PTR _COff$[rsp], rax
jl SHORT $LN8@Get_unwrap
$LN10@Get_unwrap:
jmp SHORT $LN9@Get_unwrap
$LN8@Get_unwrap:
$LN7@Get_unwrap:
lea rax, OFFSET FLAT:??_C@_0BB@KBEKGHFK@integer?5overflow@
mov QWORD PTR [rsp+40], rax
lea rax, OFFSET FLAT:??_C@_02DKCKIIND@?$CFs@
mov QWORD PTR [rsp+32], rax
xor r9d, r9d
mov r8d, 767 ; 000002ffH
lea rdx, OFFSET FLAT:??_C@_0GJ@EJIMBHLG@c?3?2program?5files?5?$CIx86?$CJ?2microsof@
mov ecx, 2
call QWORD PTR __imp__CrtDbgReport
cmp eax, 1
jne SHORT $LN12@Get_unwrap
int 3
xor eax, eax
$LN12@Get_unwrap:
mov QWORD PTR [rsp+32], 0
mov r9d, 767 ; 000002ffH
lea r8, OFFSET FLAT:??_C@_1NC@FANNPLN@?$AAc?$AA?3?$AA?2?$AAp?$AAr?$AAo?$AAg?$AAr?$AAa?$AAm?$AA?5?$AAf?$AAi?$AAl?$AAe@
lea rdx, OFFSET FLAT:??_C@_1CM@MJCLAPGA@?$AAs?$AAt?$AAd?$AA?3?$AA?3?$AA_?$AAG?$AAe?$AAt?$AA_?$AAu?$AAn?$AAw?$AAr?$AAa@
lea rcx, OFFSET FLAT:??_C@_1CG@NMONALKO@?$AA?$CC?$AAi?$AAn?$AAt?$AAe?$AAg?$AAe?$AAr?$AA?5?$AAo?$AAv?$AAe?$AAr?$AAf?$AAl@
call QWORD PTR __imp__invalid_parameter
xor eax, eax
test eax, eax
jne SHORT $LN7@Get_unwrap
$LN9@Get_unwrap:
xor eax, eax
test eax, eax
jne $LN4@Get_unwrap
; Line 770
mov rdx, QWORD PTR _Off$[rsp]
mov rcx, QWORD PTR _It$[rsp]
call ?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Verify_offset
; Line 771
mov rcx, QWORD PTR _It$[rsp]
call ?_Unwrapped@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAPEAHXZ ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Unwrapped
; Line 772
add rsp, 64 ; 00000040H
pop rdi
ret 0
??$_Get_unwrapped_n@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J@Z ENDP ; std::_Get_unwrapped_n<gsl::details::span_iterator<gsl::span<int,-1>,0>,__int64,0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Idl_distance1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0Urandom_access_iterator_tag@0@@Z
_TEXT SEGMENT
_First$ = 16
_Last$ = 24
__formal$ = 32
??$_Idl_distance1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0Urandom_access_iterator_tag@0@@Z PROC ; std::_Idl_distance1<gsl::details::span_iterator<gsl::span<int,-1>,0>,int *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 967
$LN3:
mov BYTE PTR [rsp+24], r8b
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 968
mov rax, QWORD PTR _Last$[rsp]
mov rcx, QWORD PTR _First$[rsp]
mov rcx, QWORD PTR [rcx]
mov rax, QWORD PTR [rax]
sub rax, rcx
sar rax, 2
; Line 969
pop rdi
ret 0
??$_Idl_distance1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0Urandom_access_iterator_tag@0@@Z ENDP ; std::_Idl_distance1<gsl::details::span_iterator<gsl::span<int,-1>,0>,int *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Idl_distance@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0@Z
_TEXT SEGMENT
$T1 = 32
_First$ = 64
_Last$ = 72
??$_Idl_distance@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0@Z PROC ; std::_Idl_distance<gsl::details::span_iterator<gsl::span<int,-1>,0>,int *>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 974
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 975
movzx r8d, BYTE PTR $T1[rsp]
mov rdx, QWORD PTR _Last$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Idl_distance1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0Urandom_access_iterator_tag@0@@Z ; std::_Idl_distance1<gsl::details::span_iterator<gsl::span<int,-1>,0>,int *>
; Line 976
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$_Idl_distance@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0@Z ENDP ; std::_Idl_distance<gsl::details::span_iterator<gsl::span<int,-1>,0>,int *>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Get_unwrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@@Z
_TEXT SEGMENT
_It$ = 48
??$_Get_unwrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@@Z PROC ; std::_Get_unwrapped<gsl::details::span_iterator<gsl::span<int,-1>,0>,0>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 642
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 643
mov rcx, QWORD PTR _It$[rsp]
call ?_Unwrapped@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAPEAHXZ ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Unwrapped
; Line 644
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$_Get_unwrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@@Z ENDP ; std::_Get_unwrapped<gsl::details::span_iterator<gsl::span<int,-1>,0>,0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$_Adl_verify_range@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0@Z
_TEXT SEGMENT
$T1 = 32
_First$ = 64
_Last$ = 72
??$_Adl_verify_range@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0@Z PROC ; std::_Adl_verify_range<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 615
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 616
lea rax, QWORD PTR $T1[rsp]
mov rdi, rax
xor eax, eax
mov ecx, 1
rep stosb
movzx r8d, BYTE PTR $T1[rsp]
mov rdx, QWORD PTR _Last$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Adl_verify_range1@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0U?$integral_constant@_N$00@0@@Z ; std::_Adl_verify_range1<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
; Line 617
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$_Adl_verify_range@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0@Z ENDP ; std::_Adl_verify_range<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z PROC ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<0> >, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 597
$LN14:
mov BYTE PTR [rsp+24], r8b
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 128 ; 00000080H
mov rdi, rsp
mov ecx, 32 ; 00000020H
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+144]
mov QWORD PTR $T4[rsp], -2
mov DWORD PTR $T3[rsp], 0
; Line 596
movzx edx, BYTE PTR ext$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??$?0$0A@@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$0A@@12@@Z ; gsl::details::extent_type<-1>::extent_type<-1><0>
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR data$[rsp]
mov QWORD PTR [rax+8], rcx
; Line 598
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
jl SHORT $LN3@extent_typ
jmp SHORT $LN4@extent_typ
$LN3@extent_typ:
lea rdx, OFFSET FLAT:??_C@_0ED@GGAHHHOA@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv144[rsp], rax
mov rax, QWORD PTR tv144[rsp]
mov QWORD PTR tv134[rsp], rax
mov eax, DWORD PTR $T3[rsp]
or eax, 1
mov DWORD PTR $T3[rsp], eax
mov rcx, QWORD PTR tv134[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@extent_typ:
mov eax, DWORD PTR $T3[rsp]
and eax, 1
test eax, eax
je SHORT $LN9@extent_typ
and DWORD PTR $T3[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN9@extent_typ:
; Line 599
cmp QWORD PTR data$[rsp], 0
jne SHORT $LN5@extent_typ
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
je SHORT $LN5@extent_typ
lea rdx, OFFSET FLAT:??_C@_0ED@HPBMEGKB@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T2[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv146[rsp], rax
mov rax, QWORD PTR tv146[rsp]
mov QWORD PTR tv141[rsp], rax
mov eax, DWORD PTR $T3[rsp]
or eax, 2
mov DWORD PTR $T3[rsp], eax
mov rcx, QWORD PTR tv141[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN5@extent_typ:
mov eax, DWORD PTR $T3[rsp]
and eax, 2
test eax, eax
je SHORT $LN12@extent_typ
and DWORD PTR $T3[rsp], -3
lea rcx, QWORD PTR $T2[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN12@extent_typ:
; Line 600
mov rax, QWORD PTR this$[rsp]
add rsp, 128 ; 00000080H
pop rdi
ret 0
$LN13@extent_typ:
??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z ENDP ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<0> >
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$0@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<0> >'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 1
test eax, eax
je SHORT $LN8@dtor$0
and DWORD PTR $T3[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN8@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<0> >'::`1'::dtor$0
text$x ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$1@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<0> >'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 2
test eax, eax
je SHORT $LN11@dtor$1
and DWORD PTR $T3[rbp], -3
lea rcx, QWORD PTR $T2[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN11@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<0> >'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$0@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<0> >'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 1
test eax, eax
je SHORT $LN8@dtor$0
and DWORD PTR $T3[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN8@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<0> >'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$1@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<0> >'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 2
test eax, eax
je SHORT $LN11@dtor$1
and DWORD PTR $T3[rbp], -3
lea rcx, QWORD PTR $T2[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN11@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<0> >'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?size@?$extent_type@$0A@@details@gsl@@QEBA_JXZ
_TEXT SEGMENT
this$ = 16
?size@?$extent_type@$0A@@details@gsl@@QEBA_JXZ PROC ; gsl::details::extent_type<0>::size, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 323
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
xor eax, eax
pop rdi
ret 0
?size@?$extent_type@$0A@@details@gsl@@QEBA_JXZ ENDP ; gsl::details::extent_type<0>::size
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0?$extent_type@$0A@@details@gsl@@QEAA@XZ
_TEXT SEGMENT
this$ = 16
??0?$extent_type@$0A@@details@gsl@@QEAA@XZ PROC ; gsl::details::extent_type<0>::extent_type<0>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 311
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
mov rax, QWORD PTR this$[rsp]
pop rdi
ret 0
??0?$extent_type@$0A@@details@gsl@@QEAA@XZ ENDP ; gsl::details::extent_type<0>::extent_type<0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv89 = 72
tv86 = 80
this$ = 112
data$ = 120
ext$ = 128
??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z PROC ; gsl::span<int,6>::storage_type<gsl::details::extent_type<6> >::storage_type<gsl::details::extent_type<6> ><gsl::details::extent_type<6> >, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 591
$LN9:
mov BYTE PTR [rsp+24], r8b
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 96 ; 00000060H
mov rdi, rsp
mov ecx, 24
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+112]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 590
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR data$[rsp]
mov QWORD PTR [rax], rcx
; Line 592
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$05@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<6>::size
test rax, rax
jl SHORT $LN3@extent_typ
jmp SHORT $LN4@extent_typ
$LN3@extent_typ:
lea rdx, OFFSET FLAT:??_C@_0ED@JMOIJPGK@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv89[rsp], rax
mov rax, QWORD PTR tv89[rsp]
mov QWORD PTR tv86[rsp], rax
mov eax, DWORD PTR $T2[rsp]
or eax, 1
mov DWORD PTR $T2[rsp], eax
mov rcx, QWORD PTR tv86[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@extent_typ:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN7@extent_typ
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN7@extent_typ:
; Line 593
mov rax, QWORD PTR this$[rsp]
add rsp, 96 ; 00000060H
pop rdi
ret 0
$LN8@extent_typ:
??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z ENDP ; gsl::span<int,6>::storage_type<gsl::details::extent_type<6> >::storage_type<gsl::details::extent_type<6> ><gsl::details::extent_type<6> >
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv89 = 72
tv86 = 80
this$ = 112
data$ = 120
ext$ = 128
?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA PROC ; `gsl::span<int,6>::storage_type<gsl::details::extent_type<6> >::storage_type<gsl::details::extent_type<6> ><gsl::details::extent_type<6> >'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA ENDP ; `gsl::span<int,6>::storage_type<gsl::details::extent_type<6> >::storage_type<gsl::details::extent_type<6> ><gsl::details::extent_type<6> >'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv89 = 72
tv86 = 80
this$ = 112
data$ = 120
ext$ = 128
?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA PROC ; `gsl::span<int,6>::storage_type<gsl::details::extent_type<6> >::storage_type<gsl::details::extent_type<6> ><gsl::details::extent_type<6> >'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA ENDP ; `gsl::span<int,6>::storage_type<gsl::details::extent_type<6> >::storage_type<gsl::details::extent_type<6> ><gsl::details::extent_type<6> >'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$addressof@H@std@@YAPEAHAEAH@Z
_TEXT SEGMENT
_Val$ = 16
??$addressof@H@std@@YAPEAHAEAH@Z PROC ; std::addressof<int>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xstddef
; Line 329
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 330
mov rax, QWORD PTR _Val$[rsp]
; Line 331
pop rdi
ret 0
??$addressof@H@std@@YAPEAHAEAH@Z ENDP ; std::addressof<int>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv91 = 72
tv88 = 80
this$ = 112
data$ = 120
ext$ = 128
??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z PROC ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 591
$LN9:
mov BYTE PTR [rsp+24], r8b
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 96 ; 00000060H
mov rdi, rsp
mov ecx, 24
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+112]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 590
movzx edx, BYTE PTR ext$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??$?0$05@?$extent_type@$0?0@details@gsl@@QEAA@V?$extent_type@$05@12@@Z ; gsl::details::extent_type<-1>::extent_type<-1><6>
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR data$[rsp]
mov QWORD PTR [rax+8], rcx
; Line 592
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
jl SHORT $LN3@extent_typ
jmp SHORT $LN4@extent_typ
$LN3@extent_typ:
lea rdx, OFFSET FLAT:??_C@_0ED@JMOIJPGK@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv91[rsp], rax
mov rax, QWORD PTR tv91[rsp]
mov QWORD PTR tv88[rsp], rax
mov eax, DWORD PTR $T2[rsp]
or eax, 1
mov DWORD PTR $T2[rsp], eax
mov rcx, QWORD PTR tv88[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@extent_typ:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN7@extent_typ
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN7@extent_typ:
; Line 593
mov rax, QWORD PTR this$[rsp]
add rsp, 96 ; 00000060H
pop rdi
ret 0
$LN8@extent_typ:
??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z ENDP ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv91 = 72
tv88 = 80
this$ = 112
data$ = 120
ext$ = 128
?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA PROC ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA ENDP ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv91 = 72
tv88 = 80
this$ = 112
data$ = 120
ext$ = 128
?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA PROC ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z@4HA ENDP ; `gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$addressof@E@std@@YAPEAEAEAE@Z
_TEXT SEGMENT
_Val$ = 16
??$addressof@E@std@@YAPEAEAEAE@Z PROC ; std::addressof<unsigned char>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xstddef
; Line 329
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 330
mov rax, QWORD PTR _Val$[rsp]
; Line 331
pop rdi
ret 0
??$addressof@E@std@@YAPEAEAEAE@Z ENDP ; std::addressof<unsigned char>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$forward@Ufail_fast@gsl@@@std@@YA$$QEAUfail_fast@gsl@@AEAU12@@Z
_TEXT SEGMENT
_Arg$ = 16
??$forward@Ufail_fast@gsl@@@std@@YA$$QEAUfail_fast@gsl@@AEAU12@@Z PROC ; std::forward<gsl::fail_fast>, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\type_traits
; Line 1573
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 1574
mov rax, QWORD PTR _Arg$[rsp]
; Line 1575
pop rdi
ret 0
??$forward@Ufail_fast@gsl@@@std@@YA$$QEAUfail_fast@gsl@@AEAU12@@Z ENDP ; std::forward<gsl::fail_fast>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$narrow_cast@_KAEA_J@gsl@@YA_KAEA_J@Z
_TEXT SEGMENT
u$ = 48
??$narrow_cast@_KAEA_J@gsl@@YA_KAEA_J@Z PROC ; gsl::narrow_cast<unsigned __int64,__int64 &>, COMDAT
; File c:\projects\gsl\include\gsl\gsl_util
; Line 99
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 100
mov rcx, QWORD PTR u$[rsp]
call ??$forward@AEA_J@std@@YAAEA_JAEA_J@Z ; std::forward<__int64 &>
mov rax, QWORD PTR [rax]
; Line 101
add rsp, 32 ; 00000020H
pop rdi
ret 0
??$narrow_cast@_KAEA_J@gsl@@YA_KAEA_J@Z ENDP ; gsl::narrow_cast<unsigned __int64,__int64 &>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv91 = 72
tv88 = 80
this$ = 112
data$ = 120
ext$ = 128
??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z PROC ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 591
$LN9:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 96 ; 00000060H
mov rdi, rsp
mov ecx, 24
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+112]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 590
mov rdx, QWORD PTR ext$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z ; gsl::details::extent_type<-1>::extent_type<-1>
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR data$[rsp]
mov QWORD PTR [rax+8], rcx
; Line 592
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
jl SHORT $LN3@extent_typ
jmp SHORT $LN4@extent_typ
$LN3@extent_typ:
lea rdx, OFFSET FLAT:??_C@_0ED@JMOIJPGK@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv91[rsp], rax
mov rax, QWORD PTR tv91[rsp]
mov QWORD PTR tv88[rsp], rax
mov eax, DWORD PTR $T2[rsp]
or eax, 1
mov DWORD PTR $T2[rsp], eax
mov rcx, QWORD PTR tv88[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@extent_typ:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN7@extent_typ
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN7@extent_typ:
; Line 593
mov rax, QWORD PTR this$[rsp]
add rsp, 96 ; 00000060H
pop rdi
ret 0
$LN8@extent_typ:
??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z ENDP ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv91 = 72
tv88 = 80
this$ = 112
data$ = 120
ext$ = 128
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv91 = 72
tv88 = 80
this$ = 112
data$ = 120
ext$ = 128
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z PROC ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 597
$LN14:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 128 ; 00000080H
mov rdi, rsp
mov ecx, 32 ; 00000020H
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+144]
mov QWORD PTR $T4[rsp], -2
mov DWORD PTR $T3[rsp], 0
; Line 596
mov rdx, QWORD PTR ext$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z ; gsl::details::extent_type<-1>::extent_type<-1>
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR data$[rsp]
mov QWORD PTR [rax+8], rcx
; Line 598
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
jl SHORT $LN3@extent_typ
jmp SHORT $LN4@extent_typ
$LN3@extent_typ:
lea rdx, OFFSET FLAT:??_C@_0ED@GGAHHHOA@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv144[rsp], rax
mov rax, QWORD PTR tv144[rsp]
mov QWORD PTR tv134[rsp], rax
mov eax, DWORD PTR $T3[rsp]
or eax, 1
mov DWORD PTR $T3[rsp], eax
mov rcx, QWORD PTR tv134[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@extent_typ:
mov eax, DWORD PTR $T3[rsp]
and eax, 1
test eax, eax
je SHORT $LN9@extent_typ
and DWORD PTR $T3[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN9@extent_typ:
; Line 599
cmp QWORD PTR data$[rsp], 0
jne SHORT $LN5@extent_typ
mov rcx, QWORD PTR this$[rsp]
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
test rax, rax
je SHORT $LN5@extent_typ
lea rdx, OFFSET FLAT:??_C@_0ED@HPBMEGKB@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T2[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv146[rsp], rax
mov rax, QWORD PTR tv146[rsp]
mov QWORD PTR tv141[rsp], rax
mov eax, DWORD PTR $T3[rsp]
or eax, 2
mov DWORD PTR $T3[rsp], eax
mov rcx, QWORD PTR tv141[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN5@extent_typ:
mov eax, DWORD PTR $T3[rsp]
and eax, 2
test eax, eax
je SHORT $LN12@extent_typ
and DWORD PTR $T3[rsp], -3
lea rcx, QWORD PTR $T2[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN12@extent_typ:
; Line 600
mov rax, QWORD PTR this$[rsp]
add rsp, 128 ; 00000080H
pop rdi
ret 0
$LN13@extent_typ:
??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z ENDP ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 1
test eax, eax
je SHORT $LN8@dtor$0
and DWORD PTR $T3[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN8@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
text$x ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 2
test eax, eax
je SHORT $LN11@dtor$1
and DWORD PTR $T3[rbp], -3
lea rcx, QWORD PTR $T2[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN11@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 1
test eax, eax
je SHORT $LN8@dtor$0
and DWORD PTR $T3[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN8@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 80
$T4 = 88
tv144 = 96
tv134 = 104
tv146 = 112
tv141 = 120
this$ = 144
data$ = 152
ext$ = 160
?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA PROC ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T3[rbp]
and eax, 2
test eax, eax
je SHORT $LN11@dtor$1
and DWORD PTR $T3[rbp], -3
lea rcx, QWORD PTR $T2[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN11@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0???$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z@4HA ENDP ; `gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z
_TEXT SEGMENT
tmp$ = 40
this$ = 96
__$ReturnUdt$ = 104
offset$ = 112
count$ = 120
__formal$ = 128
??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z PROC ; gsl::span<int,6>::make_subspan<6>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 622
$LN3:
mov QWORD PTR [rsp+32], r9
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
; Line 623
mov rdx, QWORD PTR this$[rsp]
lea rcx, QWORD PTR tmp$[rsp]
call ??$?0H$05X@?$span@H$0?0@gsl@@QEAA@AEBV?$span@H$05@1@@Z ; gsl::span<int,-1>::span<int,-1><int,6,void>
; Line 624
mov r9, QWORD PTR count$[rsp]
mov r8, QWORD PTR offset$[rsp]
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
lea rcx, QWORD PTR tmp$[rsp]
call ?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z ; gsl::span<int,-1>::subspan
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 625
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
add rsp, 80 ; 00000050H
pop rdi
ret 0
??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z ENDP ; gsl::span<int,6>::make_subspan<6>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv65 = 72
tv91 = 80
tv88 = 88
tv77 = 96
tv80 = 104
src$ = 128
dest$ = 136
??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z PROC ; gsl::copy<char const ,-1,unsigned char,-1>, COMDAT
; File c:\projects\gsl\include\gsl\gsl_algorithm
; Line 43
$LN9:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 112 ; 00000070H
mov rdi, rsp
mov ecx, 28
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+128]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 50
mov rcx, QWORD PTR dest$[rsp]
call ?size@?$span@E$0?0@gsl@@QEBA_JXZ ; gsl::span<unsigned char,-1>::size
mov QWORD PTR tv65[rsp], rax
mov rcx, QWORD PTR src$[rsp]
call ?size@?$span@$$CBD$0?0@gsl@@QEBA_JXZ ; gsl::span<char const ,-1>::size
mov rcx, QWORD PTR tv65[rsp]
cmp rcx, rax
jl SHORT $LN3@copy
jmp SHORT $LN4@copy
$LN3@copy:
lea rdx, OFFSET FLAT:$SG47305
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv91[rsp], rax
mov rax, QWORD PTR tv91[rsp]
mov QWORD PTR tv88[rsp], rax
mov eax, DWORD PTR $T2[rsp]
or eax, 1
mov DWORD PTR $T2[rsp], eax
mov rcx, QWORD PTR tv88[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@copy:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN7@copy
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN7@copy:
; Line 51
mov rcx, QWORD PTR dest$[rsp]
call ?data@?$span@E$0?0@gsl@@QEBAPEAEXZ ; gsl::span<unsigned char,-1>::data
mov QWORD PTR tv77[rsp], rax
mov rcx, QWORD PTR src$[rsp]
call ?size@?$span@$$CBD$0?0@gsl@@QEBA_JXZ ; gsl::span<char const ,-1>::size
mov QWORD PTR tv80[rsp], rax
mov rcx, QWORD PTR src$[rsp]
call ?data@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ ; gsl::span<char const ,-1>::data
mov rcx, QWORD PTR tv77[rsp]
mov r8, rcx
mov rcx, QWORD PTR tv80[rsp]
mov rdx, rcx
mov rcx, rax
call ??$copy_n@PEBD_JPEAE@std@@YAPEAEPEBD_JPEAE@Z ; std::copy_n<char const *,__int64,unsigned char *>
; Line 53
add rsp, 112 ; 00000070H
pop rdi
ret 0
$LN8@copy:
??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z ENDP ; gsl::copy<char const ,-1,unsigned char,-1>
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv65 = 72
tv91 = 80
tv88 = 88
tv77 = 96
tv80 = 104
src$ = 128
dest$ = 136
?dtor$0@?0???$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z@4HA PROC ; `gsl::copy<char const ,-1,unsigned char,-1>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z@4HA ENDP ; `gsl::copy<char const ,-1,unsigned char,-1>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv65 = 72
tv91 = 80
tv88 = 88
tv77 = 96
tv80 = 104
src$ = 128
dest$ = 136
?dtor$0@?0???$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z@4HA PROC ; `gsl::copy<char const ,-1,unsigned char,-1>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z@4HA ENDP ; `gsl::copy<char const ,-1,unsigned char,-1>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0V?$basic_string_span@$$CBD$0?0@gsl@@X@?$span@$$CBD$0?0@gsl@@QEAA@AEAV?$basic_string_span@$$CBD$0?0@1@@Z
_TEXT SEGMENT
tv66 = 32
this$ = 64
cont$ = 72
??$?0V?$basic_string_span@$$CBD$0?0@gsl@@X@?$span@$$CBD$0?0@gsl@@QEAA@AEAV?$basic_string_span@$$CBD$0?0@1@@Z PROC ; gsl::span<char const ,-1>::span<char const ,-1><gsl::basic_string_span<char const ,-1>,void>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 428
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 427
mov rcx, QWORD PTR cont$[rsp]
call ?size@?$basic_string_span@$$CBD$0?0@gsl@@QEBA_JXZ ; gsl::basic_string_span<char const ,-1>::size
mov rcx, rax
call ??$narrow@_J_J@gsl@@YA_J_J@Z ; gsl::narrow<__int64,__int64>
mov QWORD PTR tv66[rsp], rax
mov rcx, QWORD PTR cont$[rsp]
call ?data@?$basic_string_span@$$CBD$0?0@gsl@@QEBAPEBDXZ ; gsl::basic_string_span<char const ,-1>::data
mov rcx, QWORD PTR tv66[rsp]
mov r8, rcx
mov rdx, rax
mov rcx, QWORD PTR this$[rsp]
call ??0?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z ; gsl::span<char const ,-1>::span<char const ,-1>
; Line 428
mov rax, QWORD PTR this$[rsp]
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$?0V?$basic_string_span@$$CBD$0?0@gsl@@X@?$span@$$CBD$0?0@gsl@@QEAA@AEAV?$basic_string_span@$$CBD$0?0@1@@Z ENDP ; gsl::span<char const ,-1>::span<char const ,-1><gsl::basic_string_span<char const ,-1>,void>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
bytes$ = 40
byteSpan$ = 88
cdModelType$ = 136
$T6 = 176
$T7 = 192
$T8 = 208
$T9 = 224
$T10 = 240
__$ArrayPad$ = 256
?test_string_gsl_copy@@YAXXZ PROC ; test_string_gsl_copy
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 333
$LN3:
push rsi
push rdi
sub rsp, 280 ; 00000118H
mov rdi, rsp
mov ecx, 70 ; 00000046H
mov eax, -858993460 ; ccccccccH
rep stosd
mov rax, QWORD PTR __security_cookie
xor rax, rsp
mov QWORD PTR __$ArrayPad$[rsp], rax
; Line 335
lea rdx, QWORD PTR bytes$[rsp]
lea rcx, QWORD PTR byteSpan$[rsp]
call ??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z ; gsl::span<unsigned char,-1>::span<unsigned char,-1><10>
; Line 337
lea rdx, OFFSET FLAT:$SG38743
lea rcx, QWORD PTR $T6[rsp]
call ??$ensure_z@$$CBD$0L@@gsl@@YA?AV?$span@$$CBD$0?0@0@AEAY0L@$$CBD@Z ; gsl::ensure_z<char const ,11>
mov rdx, rax
lea rcx, QWORD PTR cdModelType$[rsp]
call ??$?0V?$span@$$CBD$0?0@gsl@@X@?$basic_string_span@$$CBD$0?0@gsl@@QEAA@AEBV?$span@$$CBD$0?0@1@@Z ; gsl::basic_string_span<char const ,-1>::basic_string_span<char const ,-1><gsl::span<char const ,-1>,void>
; Line 338
lea rax, QWORD PTR $T9[rsp]
lea rcx, QWORD PTR byteSpan$[rsp]
mov rdi, rax
mov rsi, rcx
mov ecx, 16
rep movsb
lea rdx, QWORD PTR cdModelType$[rsp]
lea rcx, QWORD PTR $T7[rsp]
call ??$?0V?$basic_string_span@$$CBD$0?0@gsl@@X@?$span@$$CBD$0?0@gsl@@QEAA@AEAV?$basic_string_span@$$CBD$0?0@1@@Z ; gsl::span<char const ,-1>::span<char const ,-1><gsl::basic_string_span<char const ,-1>,void>
lea rcx, QWORD PTR $T8[rsp]
mov rdi, rcx
mov rsi, rax
mov ecx, 16
rep movsb
lea rdx, QWORD PTR $T9[rsp]
lea rcx, QWORD PTR $T8[rsp]
call ??$copy@$$CBD$0?0E$0?0@gsl@@YAXV?$span@$$CBD$0?0@0@V?$span@E$0?0@0@@Z ; gsl::copy<char const ,-1,unsigned char,-1>
; Line 340
lea rax, QWORD PTR $T10[rsp]
lea rcx, QWORD PTR byteSpan$[rsp]
mov rdi, rax
mov rsi, rcx
mov ecx, 16
rep movsb
lea rcx, QWORD PTR $T10[rsp]
call ?bar@@YAXV?$span@E$0?0@gsl@@@Z ; bar
; Line 341
mov rcx, rsp
lea rdx, OFFSET FLAT:?test_string_gsl_copy@@YAXXZ$rtcFrameData
call _RTC_CheckStackVars
mov rcx, QWORD PTR __$ArrayPad$[rsp]
xor rcx, rsp
call __security_check_cookie
add rsp, 280 ; 00000118H
pop rdi
pop rsi
ret 0
?test_string_gsl_copy@@YAXXZ ENDP ; test_string_gsl_copy
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z
_TEXT SEGMENT
_UFirst$ = 40
_ULast$ = 72
_UDest$ = 88
$T5 = 96
__$ReturnUdt$ = 144
_First$ = 152
_Last$ = 160
_Dest$ = 168
??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z PROC ; std::copy<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<unsigned char,-1>,0> >, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2440
$LN3:
mov QWORD PTR [rsp+32], r9
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rsi
push rdi
sub rsp, 120 ; 00000078H
mov rdi, rsp
mov ecx, 30
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+144]
; Line 2441
mov rdx, QWORD PTR _Last$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Adl_verify_range@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@0@Z ; std::_Adl_verify_range<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<char const ,-1>,0> >
; Line 2442
mov rcx, QWORD PTR _First$[rsp]
call ??$_Get_unwrapped@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEBDAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@@Z ; std::_Get_unwrapped<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,0>
mov QWORD PTR _UFirst$[rsp], rax
; Line 2443
mov rcx, QWORD PTR _Last$[rsp]
call ??$_Get_unwrapped@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEBDAEBV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@@Z ; std::_Get_unwrapped<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,0>
mov QWORD PTR _ULast$[rsp], rax
; Line 2444
lea rdx, QWORD PTR _ULast$[rsp]
lea rcx, QWORD PTR _UFirst$[rsp]
call ??$_Idl_distance@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@PEBD@std@@YA_JAEBQEBD0@Z ; std::_Idl_distance<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,char const *>
mov rdx, rax
mov rcx, QWORD PTR _Dest$[rsp]
call ??$_Get_unwrapped_n@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAEAEBV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@_J@Z ; std::_Get_unwrapped_n<gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>,__int64,0>
mov QWORD PTR _UDest$[rsp], rax
; Line 2445
mov r8, QWORD PTR _UDest$[rsp]
mov rdx, QWORD PTR _ULast$[rsp]
mov rcx, QWORD PTR _UFirst$[rsp]
call ??$_Copy_unchecked@PEBDPEAE@std@@YAPEAEPEBD0PEAE@Z ; std::_Copy_unchecked<char const *,unsigned char *>
mov QWORD PTR $T5[rsp], rax
lea rdx, QWORD PTR $T5[rsp]
mov rcx, QWORD PTR _Dest$[rsp]
call ??$_Seek_wrapped@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@PEAE$0A@@std@@YAXAEAV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@AEBQEAE@Z ; std::_Seek_wrapped<gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>,unsigned char *,0>
; Line 2446
mov rdi, QWORD PTR __$ReturnUdt$[rsp]
mov rsi, QWORD PTR _Dest$[rsp]
mov ecx, 16
rep movsb
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 2447
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
add rsp, 120 ; 00000078H
pop rdi
pop rsi
ret 0
??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z ENDP ; std::copy<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<unsigned char,-1>,0> >
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?_Seek_to@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAE@Z
_TEXT SEGMENT
this$ = 48
p$ = 56
?_Seek_to@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAE@Z PROC ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::_Seek_to, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 292
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 294
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR [rax]
call ?data@?$span@E$0?0@gsl@@QEBAPEAEXZ ; gsl::span<unsigned char,-1>::data
mov rcx, QWORD PTR p$[rsp]
sub rcx, rax
mov rax, rcx
mov rcx, QWORD PTR this$[rsp]
mov QWORD PTR [rcx+8], rax
; Line 295
add rsp, 32 ; 00000020H
pop rdi
ret 0
?_Seek_to@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAE@Z ENDP ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::_Seek_to
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?_Unwrapped@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAPEAEXZ
_TEXT SEGMENT
this$ = 48
?_Unwrapped@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAPEAEXZ PROC ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::_Unwrapped, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 277
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 280
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR [rax]
call ?data@?$span@E$0?0@gsl@@QEBAPEAEXZ ; gsl::span<unsigned char,-1>::data
mov rcx, QWORD PTR this$[rsp]
add rax, QWORD PTR [rcx+8]
; Line 281
add rsp, 32 ; 00000020H
pop rdi
ret 0
?_Unwrapped@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAPEAEXZ ENDP ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::_Unwrapped
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv68 = 72
this$ = 96
n$ = 104
?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z PROC ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::_Verify_offset, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 270
$LN7:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 272
mov rax, QWORD PTR this$[rsp]
mov rax, QWORD PTR [rax+8]
add rax, QWORD PTR n$[rsp]
test rax, rax
jl SHORT $LN3@Verify_off
mov rax, QWORD PTR this$[rsp]
mov rax, QWORD PTR [rax+8]
add rax, QWORD PTR n$[rsp]
mov QWORD PTR tv68[rsp], rax
mov rcx, QWORD PTR this$[rsp]
mov rcx, QWORD PTR [rcx]
call ?size@?$span@E$0?0@gsl@@QEBA_JXZ ; gsl::span<unsigned char,-1>::size
npad 1
mov rcx, QWORD PTR tv68[rsp]
cmp rcx, rax
jg SHORT $LN3@Verify_off
jmp SHORT $LN4@Verify_off
$LN3@Verify_off:
lea rdx, OFFSET FLAT:??_C@_0ED@LKBIKNJ@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
npad 1
or DWORD PTR $T2[rsp], 1
mov rcx, rax
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@Verify_off:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN2@Verify_off
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
npad 1
$LN2@Verify_off:
; Line 273
add rsp, 80 ; 00000050H
pop rdi
ret 0
$LN6@Verify_off:
?_Verify_offset@?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z ENDP ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::_Verify_offset
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@E$0?0@2@_J@Z
_TEXT SEGMENT
this$ = 16
span$ = 24
idx$ = 32
??0?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@E$0?0@2@_J@Z PROC ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::span_iterator<gsl::span<unsigned char,-1>,0>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 146
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 145
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR span$[rsp]
mov QWORD PTR [rax], rcx
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR idx$[rsp]
mov QWORD PTR [rax+8], rcx
; Line 146
mov rax, QWORD PTR this$[rsp]
pop rdi
ret 0
??0?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@E$0?0@2@_J@Z ENDP ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::span_iterator<gsl::span<unsigned char,-1>,0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?_Unwrapped@?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEBAPEBDXZ
_TEXT SEGMENT
this$ = 48
?_Unwrapped@?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEBAPEBDXZ PROC ; gsl::details::span_iterator<gsl::span<char const ,-1>,0>::_Unwrapped, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 277
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 280
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR [rax]
call ?data@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ ; gsl::span<char const ,-1>::data
mov rcx, QWORD PTR this$[rsp]
add rax, QWORD PTR [rcx+8]
; Line 281
add rsp, 32 ; 00000020H
pop rdi
ret 0
?_Unwrapped@?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEBAPEBDXZ ENDP ; gsl::details::span_iterator<gsl::span<char const ,-1>,0>::_Unwrapped
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
lhs$ = 96
rhs$ = 104
?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z PROC ; gsl::details::_Verify_range, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 264
$LN7:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 265
mov rax, QWORD PTR lhs$[rsp]
mov rcx, QWORD PTR rhs$[rsp]
mov rcx, QWORD PTR [rcx]
cmp QWORD PTR [rax], rcx
jne SHORT $LN3@Verify_ran
mov rax, QWORD PTR lhs$[rsp]
mov rcx, QWORD PTR rhs$[rsp]
mov rcx, QWORD PTR [rcx+8]
cmp QWORD PTR [rax+8], rcx
jg SHORT $LN3@Verify_ran
jmp SHORT $LN4@Verify_ran
$LN3@Verify_ran:
lea rdx, OFFSET FLAT:??_C@_0ED@GOAPCFOK@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
npad 1
or DWORD PTR $T2[rsp], 1
mov rcx, rax
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@Verify_ran:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN2@Verify_ran
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
npad 1
$LN2@Verify_ran:
; Line 267
add rsp, 80 ; 00000050H
pop rdi
ret 0
$LN6@Verify_ran:
?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@12@0@Z ENDP ; gsl::details::_Verify_range
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@$$CBD$0?0@2@_J@Z
_TEXT SEGMENT
this$ = 16
span$ = 24
idx$ = 32
??0?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@$$CBD$0?0@2@_J@Z PROC ; gsl::details::span_iterator<gsl::span<char const ,-1>,0>::span_iterator<gsl::span<char const ,-1>,0>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 146
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 145
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR span$[rsp]
mov QWORD PTR [rax], rcx
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR idx$[rsp]
mov QWORD PTR [rax+8], rcx
; Line 146
mov rax, QWORD PTR this$[rsp]
pop rdi
ret 0
??0?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@$$CBD$0?0@2@_J@Z ENDP ; gsl::details::span_iterator<gsl::span<char const ,-1>,0>::span_iterator<gsl::span<char const ,-1>,0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0V?$span@$$CBD$0?0@gsl@@X@?$basic_string_span@$$CBD$0?0@gsl@@QEAA@AEBV?$span@$$CBD$0?0@1@@Z
_TEXT SEGMENT
this$ = 24
cont$ = 32
??$?0V?$span@$$CBD$0?0@gsl@@X@?$basic_string_span@$$CBD$0?0@gsl@@QEAA@AEBV?$span@$$CBD$0?0@1@@Z PROC ; gsl::basic_string_span<char const ,-1>::basic_string_span<char const ,-1><gsl::span<char const ,-1>,void>, COMDAT
; File c:\projects\gsl\include\gsl\string_span
; Line 244
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rsi
push rdi
; Line 243
mov rdi, QWORD PTR this$[rsp]
mov rsi, QWORD PTR cont$[rsp]
mov ecx, 16
rep movsb
; Line 244
mov rax, QWORD PTR this$[rsp]
pop rdi
pop rsi
ret 0
??$?0V?$span@$$CBD$0?0@gsl@@X@?$basic_string_span@$$CBD$0?0@gsl@@QEAA@AEBV?$span@$$CBD$0?0@1@@Z ENDP ; gsl::basic_string_span<char const ,-1>::basic_string_span<char const ,-1><gsl::span<char const ,-1>,void>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$ensure_z@$$CBD$0L@@gsl@@YA?AV?$span@$$CBD$0?0@0@AEAY0L@$$CBD@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 40
__$ReturnUdt$ = 64
sz$ = 72
??$ensure_z@$$CBD$0L@@gsl@@YA?AV?$span@$$CBD$0?0@0@AEAY0L@$$CBD@Z PROC ; gsl::ensure_z<char const ,11>, COMDAT
; File c:\projects\gsl\include\gsl\string_span
; Line 139
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 140
mov QWORD PTR $T1[rsp], 11
mov eax, 1
imul rax, rax, 0
mov rcx, QWORD PTR sz$[rsp]
add rcx, rax
mov rax, rcx
mov QWORD PTR $T2[rsp], rax
lea rcx, QWORD PTR $T1[rsp]
call ??$narrow_cast@_J_K@gsl@@YA_J$$QEA_K@Z ; gsl::narrow_cast<__int64,unsigned __int64>
mov r8, rax
lea rdx, QWORD PTR $T2[rsp]
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??$ensure_z@$$CBD@gsl@@YA?AV?$span@$$CBD$0?0@0@AEBQEBD_J@Z ; gsl::ensure_z<char const >
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 141
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$ensure_z@$$CBD$0L@@gsl@@YA?AV?$span@$$CBD$0?0@0@AEAY0L@$$CBD@Z ENDP ; gsl::ensure_z<char const ,11>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?end@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ
_TEXT SEGMENT
this$ = 48
__$ReturnUdt$ = 56
?end@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ PROC ; gsl::basic_string_span<char const ,-1>::end, COMDAT
; File c:\projects\gsl\include\gsl\string_span
; Line 301
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
mov rcx, rax
call ?end@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<char const ,-1>::end
mov rax, QWORD PTR __$ReturnUdt$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
?end@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ ENDP ; gsl::basic_string_span<char const ,-1>::end
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?begin@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ
_TEXT SEGMENT
this$ = 48
__$ReturnUdt$ = 56
?begin@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ PROC ; gsl::basic_string_span<char const ,-1>::begin, COMDAT
; File c:\projects\gsl\include\gsl\string_span
; Line 300
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
mov rcx, rax
call ?begin@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<char const ,-1>::begin
mov rax, QWORD PTR __$ReturnUdt$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
?begin@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ ENDP ; gsl::basic_string_span<char const ,-1>::begin
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?size@?$basic_string_span@$$CBD$0?0@gsl@@QEBA_JXZ
_TEXT SEGMENT
this$ = 48
?size@?$basic_string_span@$$CBD$0?0@gsl@@QEBA_JXZ PROC ; gsl::basic_string_span<char const ,-1>::size, COMDAT
; File c:\projects\gsl\include\gsl\string_span
; Line 295
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?size@?$span@$$CBD$0?0@gsl@@QEBA_JXZ ; gsl::span<char const ,-1>::size
add rsp, 32 ; 00000020H
pop rdi
ret 0
?size@?$basic_string_span@$$CBD$0?0@gsl@@QEBA_JXZ ENDP ; gsl::basic_string_span<char const ,-1>::size
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?data@?$basic_string_span@$$CBD$0?0@gsl@@QEBAPEBDXZ
_TEXT SEGMENT
this$ = 48
?data@?$basic_string_span@$$CBD$0?0@gsl@@QEBAPEBDXZ PROC ; gsl::basic_string_span<char const ,-1>::data, COMDAT
; File c:\projects\gsl\include\gsl\string_span
; Line 292
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?data@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ ; gsl::span<char const ,-1>::data
add rsp, 32 ; 00000020H
pop rdi
ret 0
?data@?$basic_string_span@$$CBD$0?0@gsl@@QEBAPEBDXZ ENDP ; gsl::basic_string_span<char const ,-1>::data
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ
_TEXT SEGMENT
this$ = 16
?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ PROC ; gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::data, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 602
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
mov rax, QWORD PTR this$[rsp]
mov rax, QWORD PTR [rax+8]
pop rdi
ret 0
?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ ENDP ; gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::data
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?end@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ
_TEXT SEGMENT
this$ = 48
__$ReturnUdt$ = 56
?end@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ PROC ; gsl::span<char const ,-1>::end, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 519
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rcx, QWORD PTR this$[rsp]
call ?size@?$span@$$CBD$0?0@gsl@@QEBA_JXZ ; gsl::span<char const ,-1>::size
mov r8, rax
mov rdx, QWORD PTR this$[rsp]
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??0?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@$$CBD$0?0@2@_J@Z ; gsl::details::span_iterator<gsl::span<char const ,-1>,0>::span_iterator<gsl::span<char const ,-1>,0>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
?end@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ ENDP ; gsl::span<char const ,-1>::end
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?begin@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ
_TEXT SEGMENT
this$ = 48
__$ReturnUdt$ = 56
?begin@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ PROC ; gsl::span<char const ,-1>::begin, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 518
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
xor r8d, r8d
mov rdx, QWORD PTR this$[rsp]
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??0?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@$$CBD$0?0@2@_J@Z ; gsl::details::span_iterator<gsl::span<char const ,-1>,0>::span_iterator<gsl::span<char const ,-1>,0>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
?begin@?$span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ ENDP ; gsl::span<char const ,-1>::begin
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?data@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ
_TEXT SEGMENT
this$ = 48
?data@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ PROC ; gsl::span<char const ,-1>::data, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 515
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ ; gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::data
add rsp, 32 ; 00000020H
pop rdi
ret 0
?data@?$span@$$CBD$0?0@gsl@@QEBAPEBDXZ ENDP ; gsl::span<char const ,-1>::data
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?size@?$span@$$CBD$0?0@gsl@@QEBA_JXZ
_TEXT SEGMENT
this$ = 48
?size@?$span@$$CBD$0?0@gsl@@QEBA_JXZ PROC ; gsl::span<char const ,-1>::size, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 498
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
add rsp, 32 ; 00000020H
pop rdi
ret 0
?size@?$span@$$CBD$0?0@gsl@@QEBA_JXZ ENDP ; gsl::span<char const ,-1>::size
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z
_TEXT SEGMENT
this$ = 48
ptr$ = 56
count$ = 64
??0?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z PROC ; gsl::span<char const ,-1>::span<char const ,-1>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 386
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov r8, QWORD PTR count$[rsp]
mov rdx, QWORD PTR ptr$[rsp]
mov rcx, rax
call ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z ; gsl::span<char const ,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0?$span@$$CBD$0?0@gsl@@QEAA@PEBD_J@Z ENDP ; gsl::span<char const ,-1>::span<char const ,-1>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 40
$T3 = 48
this$ = 80
arr$ = 88
??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z PROC ; gsl::span<unsigned char,-1>::span<unsigned char,-1><10>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 395
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
mov QWORD PTR $T3[rsp], -2
; Line 394
mov eax, 1
imul rax, rax, 0
mov rcx, QWORD PTR arr$[rsp]
add rcx, rax
mov rax, rcx
mov rcx, rax
call ??$addressof@E@std@@YAPEAEAEAE@Z ; std::addressof<unsigned char>
npad 1
mov QWORD PTR $T2[rsp], rax
lea rcx, QWORD PTR $T1[rsp]
call ??0?$extent_type@$09@details@gsl@@QEAA@XZ ; gsl::details::extent_type<10>::extent_type<10>
npad 1
mov rcx, QWORD PTR this$[rsp]
movzx r8d, BYTE PTR [rax]
mov rdx, QWORD PTR $T2[rsp]
call ??$?0V?$extent_type@$09@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$09@details@2@@Z ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<10> >
npad 1
; Line 395
mov rax, QWORD PTR this$[rsp]
add rsp, 64 ; 00000040H
pop rdi
ret 0
??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z ENDP ; gsl::span<unsigned char,-1>::span<unsigned char,-1><10>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
bytes$ = 40
byteSpan$ = 88
cdModelType$ = 136
$T6 = 176
$T7 = 192
$T8 = 208
$T9 = 224
$T10 = 240
$T11 = 256
$T12 = 272
$T13 = 288
$T14 = 304
__$ArrayPad$ = 320
?test_string_std_copy@@YAXXZ PROC ; test_string_std_copy
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 322
$LN3:
push rsi
push rdi
sub rsp, 344 ; 00000158H
mov rdi, rsp
mov ecx, 86 ; 00000056H
mov eax, -858993460 ; ccccccccH
rep stosd
mov rax, QWORD PTR __security_cookie
xor rax, rsp
mov QWORD PTR __$ArrayPad$[rsp], rax
; Line 324
lea rdx, QWORD PTR bytes$[rsp]
lea rcx, QWORD PTR byteSpan$[rsp]
call ??$?0$09@?$span@E$0?0@gsl@@QEAA@AEAY09E@Z ; gsl::span<unsigned char,-1>::span<unsigned char,-1><10>
; Line 326
lea rdx, OFFSET FLAT:$SG38436
lea rcx, QWORD PTR $T6[rsp]
call ??$ensure_z@$$CBD$0L@@gsl@@YA?AV?$span@$$CBD$0?0@0@AEAY0L@$$CBD@Z ; gsl::ensure_z<char const ,11>
mov rdx, rax
lea rcx, QWORD PTR cdModelType$[rsp]
call ??$?0V?$span@$$CBD$0?0@gsl@@X@?$basic_string_span@$$CBD$0?0@gsl@@QEAA@AEBV?$span@$$CBD$0?0@1@@Z ; gsl::basic_string_span<char const ,-1>::basic_string_span<char const ,-1><gsl::span<char const ,-1>,void>
; Line 327
lea rdx, QWORD PTR $T7[rsp]
lea rcx, QWORD PTR byteSpan$[rsp]
call ?begin@?$span@E$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<unsigned char,-1>::begin
lea rcx, QWORD PTR $T13[rsp]
mov rdi, rcx
mov rsi, rax
mov ecx, 16
rep movsb
lea rdx, QWORD PTR $T8[rsp]
lea rcx, QWORD PTR cdModelType$[rsp]
call ?end@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ ; gsl::basic_string_span<char const ,-1>::end
lea rcx, QWORD PTR $T12[rsp]
mov rdi, rcx
mov rsi, rax
mov ecx, 16
rep movsb
lea rdx, QWORD PTR $T9[rsp]
lea rcx, QWORD PTR cdModelType$[rsp]
call ?begin@?$basic_string_span@$$CBD$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@2@XZ ; gsl::basic_string_span<char const ,-1>::begin
lea rcx, QWORD PTR $T11[rsp]
mov rdi, rcx
mov rsi, rax
mov ecx, 16
rep movsb
lea r9, QWORD PTR $T13[rsp]
lea r8, QWORD PTR $T12[rsp]
lea rdx, QWORD PTR $T11[rsp]
lea rcx, QWORD PTR $T10[rsp]
call ??$copy@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@E$0?0@gsl@@$0A@@23@@std@@YA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@V?$span_iterator@V?$span@$$CBD$0?0@gsl@@$0A@@23@0V123@@Z ; std::copy<gsl::details::span_iterator<gsl::span<char const ,-1>,0>,gsl::details::span_iterator<gsl::span<unsigned char,-1>,0> >
; Line 329
lea rax, QWORD PTR $T14[rsp]
lea rcx, QWORD PTR byteSpan$[rsp]
mov rdi, rax
mov rsi, rcx
mov ecx, 16
rep movsb
lea rcx, QWORD PTR $T14[rsp]
call ?bar@@YAXV?$span@E$0?0@gsl@@@Z ; bar
; Line 330
mov rcx, rsp
lea rdx, OFFSET FLAT:?test_string_std_copy@@YAXXZ$rtcFrameData
call _RTC_CheckStackVars
mov rcx, QWORD PTR __$ArrayPad$[rsp]
xor rcx, rsp
call __security_check_cookie
add rsp, 344 ; 00000158H
pop rdi
pop rsi
ret 0
?test_string_std_copy@@YAXXZ ENDP ; test_string_std_copy
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv65 = 72
tv91 = 80
tv88 = 88
tv77 = 96
tv80 = 104
src$ = 128
dest$ = 136
??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z PROC ; gsl::copy<int,-1,int,-1>, COMDAT
; File c:\projects\gsl\include\gsl\gsl_algorithm
; Line 43
$LN9:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 112 ; 00000070H
mov rdi, rsp
mov ecx, 28
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+128]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 50
mov rcx, QWORD PTR dest$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
mov QWORD PTR tv65[rsp], rax
mov rcx, QWORD PTR src$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
mov rcx, QWORD PTR tv65[rsp]
cmp rcx, rax
jl SHORT $LN3@copy
jmp SHORT $LN4@copy
$LN3@copy:
lea rdx, OFFSET FLAT:$SG46805
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv91[rsp], rax
mov rax, QWORD PTR tv91[rsp]
mov QWORD PTR tv88[rsp], rax
mov eax, DWORD PTR $T2[rsp]
or eax, 1
mov DWORD PTR $T2[rsp], eax
mov rcx, QWORD PTR tv88[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@copy:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN7@copy
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN7@copy:
; Line 51
mov rcx, QWORD PTR dest$[rsp]
call ?data@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::data
mov QWORD PTR tv77[rsp], rax
mov rcx, QWORD PTR src$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
mov QWORD PTR tv80[rsp], rax
mov rcx, QWORD PTR src$[rsp]
call ?data@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::data
mov rcx, QWORD PTR tv77[rsp]
mov r8, rcx
mov rcx, QWORD PTR tv80[rsp]
mov rdx, rcx
mov rcx, rax
call ??$copy_n@PEAH_JPEAH@std@@YAPEAHPEAH_J0@Z ; std::copy_n<int *,__int64,int *>
; Line 53
add rsp, 112 ; 00000070H
pop rdi
ret 0
$LN8@copy:
??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z ENDP ; gsl::copy<int,-1,int,-1>
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv65 = 72
tv91 = 80
tv88 = 88
tv77 = 96
tv80 = 104
src$ = 128
dest$ = 136
?dtor$0@?0???$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z@4HA PROC ; `gsl::copy<int,-1,int,-1>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z@4HA ENDP ; `gsl::copy<int,-1,int,-1>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv65 = 72
tv91 = 80
tv88 = 88
tv77 = 96
tv80 = 104
src$ = 128
dest$ = 136
?dtor$0@?0???$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z@4HA PROC ; `gsl::copy<int,-1,int,-1>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z@4HA ENDP ; `gsl::copy<int,-1,int,-1>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
$T1 = 32
$T2 = 48
x$ = 96
y$ = 104
?gsl_copy_span@@YAXV?$span@H$0?0@gsl@@0@Z PROC ; gsl_copy_span
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 317
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rsi
push rdi
sub rsp, 72 ; 00000048H
mov rdi, rsp
mov ecx, 18
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
; Line 318
lea rax, QWORD PTR $T2[rsp]
mov rdi, rax
mov rsi, QWORD PTR y$[rsp]
mov ecx, 16
rep movsb
lea rax, QWORD PTR $T1[rsp]
mov rdi, rax
mov rsi, QWORD PTR x$[rsp]
mov ecx, 16
rep movsb
lea rdx, QWORD PTR $T2[rsp]
lea rcx, QWORD PTR $T1[rsp]
call ??$copy@H$0?0H$0?0@gsl@@YAXV?$span@H$0?0@0@0@Z ; gsl::copy<int,-1,int,-1>
; Line 319
add rsp, 72 ; 00000048H
pop rdi
pop rsi
ret 0
?gsl_copy_span@@YAXV?$span@H$0?0@gsl@@0@Z ENDP ; gsl_copy_span
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z
_TEXT SEGMENT
_UFirst$ = 40
_ULast$ = 72
_UDest$ = 88
$T5 = 96
__$ReturnUdt$ = 144
_First$ = 152
_Last$ = 160
_Dest$ = 168
??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z PROC ; std::copy<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\xutility
; Line 2440
$LN3:
mov QWORD PTR [rsp+32], r9
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rsi
push rdi
sub rsp, 120 ; 00000078H
mov rdi, rsp
mov ecx, 30
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+144]
; Line 2441
mov rdx, QWORD PTR _Last$[rsp]
mov rcx, QWORD PTR _First$[rsp]
call ??$_Adl_verify_range@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YAXAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@0@Z ; std::_Adl_verify_range<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
; Line 2442
mov rcx, QWORD PTR _First$[rsp]
call ??$_Get_unwrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@@Z ; std::_Get_unwrapped<gsl::details::span_iterator<gsl::span<int,-1>,0>,0>
mov QWORD PTR _UFirst$[rsp], rax
; Line 2443
mov rcx, QWORD PTR _Last$[rsp]
call ??$_Get_unwrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@@Z ; std::_Get_unwrapped<gsl::details::span_iterator<gsl::span<int,-1>,0>,0>
mov QWORD PTR _ULast$[rsp], rax
; Line 2444
lea rdx, QWORD PTR _ULast$[rsp]
lea rcx, QWORD PTR _UFirst$[rsp]
call ??$_Idl_distance@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH@std@@YA_JAEBQEAH0@Z ; std::_Idl_distance<gsl::details::span_iterator<gsl::span<int,-1>,0>,int *>
mov rdx, rax
mov rcx, QWORD PTR _Dest$[rsp]
call ??$_Get_unwrapped_n@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J$0A@@std@@YAPEAHAEBV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@_J@Z ; std::_Get_unwrapped_n<gsl::details::span_iterator<gsl::span<int,-1>,0>,__int64,0>
mov QWORD PTR _UDest$[rsp], rax
; Line 2445
mov r8, QWORD PTR _UDest$[rsp]
mov rdx, QWORD PTR _ULast$[rsp]
mov rcx, QWORD PTR _UFirst$[rsp]
call ??$_Copy_unchecked@PEAHPEAH@std@@YAPEAHPEAH00@Z ; std::_Copy_unchecked<int *,int *>
mov QWORD PTR $T5[rsp], rax
lea rdx, QWORD PTR $T5[rsp]
mov rcx, QWORD PTR _Dest$[rsp]
call ??$_Seek_wrapped@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@PEAH$0A@@std@@YAXAEAV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@AEBQEAH@Z ; std::_Seek_wrapped<gsl::details::span_iterator<gsl::span<int,-1>,0>,int *,0>
; Line 2446
mov rdi, QWORD PTR __$ReturnUdt$[rsp]
mov rsi, QWORD PTR _Dest$[rsp]
mov ecx, 16
rep movsb
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 2447
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
add rsp, 120 ; 00000078H
pop rdi
pop rsi
ret 0
??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z ENDP ; std::copy<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
$T1 = 32
$T2 = 48
$T3 = 64
$T4 = 80
$T5 = 96
$T6 = 112
$T7 = 128
x$ = 176
y$ = 184
?copy_span@@YAXV?$span@H$0?0@gsl@@0@Z PROC ; copy_span
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 312
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rsi
push rdi
sub rsp, 152 ; 00000098H
mov rdi, rsp
mov ecx, 38 ; 00000026H
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+176]
; Line 313
lea rdx, QWORD PTR $T1[rsp]
mov rcx, QWORD PTR y$[rsp]
call ?begin@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<int,-1>::begin
lea rcx, QWORD PTR $T7[rsp]
mov rdi, rcx
mov rsi, rax
mov ecx, 16
rep movsb
lea rdx, QWORD PTR $T2[rsp]
mov rcx, QWORD PTR x$[rsp]
call ?end@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<int,-1>::end
lea rcx, QWORD PTR $T6[rsp]
mov rdi, rcx
mov rsi, rax
mov ecx, 16
rep movsb
lea rdx, QWORD PTR $T3[rsp]
mov rcx, QWORD PTR x$[rsp]
call ?begin@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<int,-1>::begin
lea rcx, QWORD PTR $T5[rsp]
mov rdi, rcx
mov rsi, rax
mov ecx, 16
rep movsb
lea r9, QWORD PTR $T7[rsp]
lea r8, QWORD PTR $T6[rsp]
lea rdx, QWORD PTR $T5[rsp]
lea rcx, QWORD PTR $T4[rsp]
call ??$copy@V?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@@std@@YA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@V123@00@Z ; std::copy<gsl::details::span_iterator<gsl::span<int,-1>,0>,gsl::details::span_iterator<gsl::span<int,-1>,0> >
; Line 314
add rsp, 152 ; 00000098H
pop rdi
pop rsi
ret 0
?copy_span@@YAXV?$span@H$0?0@gsl@@0@Z ENDP ; copy_span
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
?doterminate@@YAXXZ PROC ; doterminate
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 305
$LN3:
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
; Line 306
call QWORD PTR __imp_terminate
$LN2@doterminat:
; Line 307
add rsp, 32 ; 00000020H
pop rdi
ret 0
?doterminate@@YAXXZ ENDP ; doterminate
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
s$4 = 40
__$ReturnUdt$ = 96
p$ = 104
size$ = 112
i$ = 120
?mysubspan9@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z PROC ; mysubspan9
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 246
$LN4:
mov QWORD PTR [rsp+32], r9
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
; Line 247
cmp QWORD PTR p$[rsp], 0
je SHORT $LN2@mysubspan9
; Line 249
mov r8, QWORD PTR size$[rsp]
mov rdx, QWORD PTR p$[rsp]
lea rcx, QWORD PTR s$4[rsp]
call ??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z ; gsl::span<int,-1>::span<int,-1>
; Line 250
mov r9, QWORD PTR i$[rsp]
mov r8d, 3
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
lea rcx, QWORD PTR s$4[rsp]
call ?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z ; gsl::span<int,-1>::subspan
mov rax, QWORD PTR __$ReturnUdt$[rsp]
jmp SHORT $LN1@mysubspan9
$LN2@mysubspan9:
; Line 253
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ ; gsl::span<int,-1>::span<int,-1><0,void>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
$LN1@mysubspan9:
; Line 254
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:?mysubspan9@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
add rsp, 80 ; 00000050H
pop rdi
ret 0
?mysubspan9@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z ENDP ; mysubspan9
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
s$4 = 40
__$ReturnUdt$ = 96
p$ = 104
size$ = 112
i$ = 120
?mysubspan8@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z PROC ; mysubspan8
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 234
$LN4:
mov QWORD PTR [rsp+32], r9
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
; Line 235
cmp QWORD PTR p$[rsp], 0
je SHORT $LN2@mysubspan8
; Line 237
mov r8, QWORD PTR size$[rsp]
mov rdx, QWORD PTR p$[rsp]
lea rcx, QWORD PTR s$4[rsp]
call ??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z ; gsl::span<int,-1>::span<int,-1>
; Line 238
mov rax, QWORD PTR i$[rsp]
mov rcx, QWORD PTR size$[rsp]
sub rcx, rax
mov rax, rcx
mov r9, rax
mov r8, QWORD PTR i$[rsp]
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
lea rcx, QWORD PTR s$4[rsp]
call ?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z ; gsl::span<int,-1>::subspan
mov rax, QWORD PTR __$ReturnUdt$[rsp]
jmp SHORT $LN1@mysubspan8
$LN2@mysubspan8:
; Line 241
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ ; gsl::span<int,-1>::span<int,-1><0,void>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
$LN1@mysubspan8:
; Line 242
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:?mysubspan8@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
add rsp, 80 ; 00000050H
pop rdi
ret 0
?mysubspan8@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z ENDP ; mysubspan8
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
s$4 = 40
__$ReturnUdt$ = 96
p$ = 104
size$ = 112
i$ = 120
?mysubspan7@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z PROC ; mysubspan7
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 223
$LN4:
mov QWORD PTR [rsp+32], r9
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
; Line 224
cmp QWORD PTR p$[rsp], 0
je SHORT $LN2@mysubspan7
; Line 226
mov r8, QWORD PTR size$[rsp]
mov rdx, QWORD PTR p$[rsp]
lea rcx, QWORD PTR s$4[rsp]
call ??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z ; gsl::span<int,-1>::span<int,-1>
; Line 227
mov r9d, 3
mov r8, QWORD PTR i$[rsp]
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
lea rcx, QWORD PTR s$4[rsp]
call ?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z ; gsl::span<int,-1>::subspan
mov rax, QWORD PTR __$ReturnUdt$[rsp]
jmp SHORT $LN1@mysubspan7
$LN2@mysubspan7:
; Line 230
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ ; gsl::span<int,-1>::span<int,-1><0,void>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
$LN1@mysubspan7:
; Line 231
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:?mysubspan7@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
add rsp, 80 ; 00000050H
pop rdi
ret 0
?mysubspan7@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z ENDP ; mysubspan7
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
s$4 = 40
__$ReturnUdt$ = 96
p$ = 104
size$ = 112
?mysubspan6@@YA?AV?$span@H$0?0@gsl@@PEAH_J@Z PROC ; mysubspan6
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 211
$LN4:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
; Line 212
cmp QWORD PTR p$[rsp], 0
je SHORT $LN2@mysubspan6
; Line 214
mov r8, QWORD PTR size$[rsp]
mov rdx, QWORD PTR p$[rsp]
lea rcx, QWORD PTR s$4[rsp]
call ??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z ; gsl::span<int,-1>::span<int,-1>
; Line 215
mov r9, -1
mov r8d, 3
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
lea rcx, QWORD PTR s$4[rsp]
call ?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z ; gsl::span<int,-1>::subspan
mov rax, QWORD PTR __$ReturnUdt$[rsp]
jmp SHORT $LN1@mysubspan6
$LN2@mysubspan6:
; Line 218
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ ; gsl::span<int,-1>::span<int,-1><0,void>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
$LN1@mysubspan6:
; Line 219
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:?mysubspan6@@YA?AV?$span@H$0?0@gsl@@PEAH_J@Z$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
add rsp, 80 ; 00000050H
pop rdi
ret 0
?mysubspan6@@YA?AV?$span@H$0?0@gsl@@PEAH_J@Z ENDP ; mysubspan6
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
s$4 = 40
__$ReturnUdt$ = 96
p$ = 104
size$ = 112
i$ = 120
?mysubspan5@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z PROC ; mysubspan5
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 199
$LN4:
mov QWORD PTR [rsp+32], r9
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
; Line 200
cmp QWORD PTR p$[rsp], 0
je SHORT $LN2@mysubspan5
; Line 202
mov r8, QWORD PTR size$[rsp]
mov rdx, QWORD PTR p$[rsp]
lea rcx, QWORD PTR s$4[rsp]
call ??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z ; gsl::span<int,-1>::span<int,-1>
; Line 203
mov r9, -1
mov r8, QWORD PTR i$[rsp]
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
lea rcx, QWORD PTR s$4[rsp]
call ?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z ; gsl::span<int,-1>::subspan
mov rax, QWORD PTR __$ReturnUdt$[rsp]
jmp SHORT $LN1@mysubspan5
$LN2@mysubspan5:
; Line 206
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ ; gsl::span<int,-1>::span<int,-1><0,void>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
$LN1@mysubspan5:
; Line 207
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:?mysubspan5@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
add rsp, 80 ; 00000050H
pop rdi
ret 0
?mysubspan5@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z ENDP ; mysubspan5
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ
_TEXT SEGMENT
$T1 = 32
$T2 = 40
this$ = 64
??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ PROC ; gsl::span<int,-1>::span<int,-1><0,void>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 384
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
mov QWORD PTR $T2[rsp], -2
; Line 383
lea rcx, QWORD PTR $T1[rsp]
call ??0?$extent_type@$0A@@details@gsl@@QEAA@XZ ; gsl::details::extent_type<0>::extent_type<0>
npad 1
mov rcx, QWORD PTR this$[rsp]
movzx r8d, BYTE PTR [rax]
xor edx, edx
call ??$?0V?$extent_type@$0A@@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAHV?$extent_type@$0A@@details@2@@Z ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<0> >
npad 1
; Line 384
mov rax, QWORD PTR this$[rsp]
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ ENDP ; gsl::span<int,-1>::span<int,-1><0,void>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
s$4 = 40
__$ReturnUdt$ = 96
p$ = 104
size$ = 112
i$ = 120
?mysubspan4@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z PROC ; mysubspan4
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 188
$LN4:
mov QWORD PTR [rsp+32], r9
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
; Line 189
cmp QWORD PTR p$[rsp], 0
je SHORT $LN2@mysubspan4
; Line 191
mov r8, QWORD PTR size$[rsp]
mov rdx, QWORD PTR p$[rsp]
lea rcx, QWORD PTR s$4[rsp]
call ??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z ; gsl::span<int,-1>::span<int,-1>
; Line 192
mov r8, QWORD PTR i$[rsp]
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
lea rcx, QWORD PTR s$4[rsp]
call ?last@?$span@H$0?0@gsl@@QEBA?AV12@_J@Z ; gsl::span<int,-1>::last
mov rax, QWORD PTR __$ReturnUdt$[rsp]
jmp SHORT $LN1@mysubspan4
$LN2@mysubspan4:
; Line 195
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??$?0$0A@X@?$span@H$0?0@gsl@@QEAA@XZ ; gsl::span<int,-1>::span<int,-1><0,void>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
$LN1@mysubspan4:
; Line 196
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:?mysubspan4@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
add rsp, 80 ; 00000050H
pop rdi
ret 0
?mysubspan4@@YA?AV?$span@H$0?0@gsl@@PEAH_J1@Z ENDP ; mysubspan4
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
x$ = 40
s$ = 88
subspan$ = 120
__$ArrayPad$ = 160
?mysubspan3@@YA_JXZ PROC ; mysubspan3
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 177
$LN3:
push rdi
sub rsp, 176 ; 000000b0H
mov rdi, rsp
mov ecx, 44 ; 0000002cH
mov eax, -858993460 ; ccccccccH
rep stosd
mov rax, QWORD PTR __security_cookie
xor rax, rsp
mov QWORD PTR __$ArrayPad$[rsp], rax
; Line 178
mov DWORD PTR x$[rsp], 0
mov DWORD PTR x$[rsp+4], 1
mov DWORD PTR x$[rsp+8], 2
mov DWORD PTR x$[rsp+12], 3
mov DWORD PTR x$[rsp+16], 4
mov DWORD PTR x$[rsp+20], 5
; Line 179
lea rdx, QWORD PTR x$[rsp]
lea rcx, QWORD PTR s$[rsp]
call ??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z ; gsl::span<int,6>::span<int,6><6>
; Line 181
mov r9, -1
mov r8d, 3
lea rdx, QWORD PTR subspan$[rsp]
lea rcx, QWORD PTR s$[rsp]
call ?subspan@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J0@Z ; gsl::span<int,6>::subspan
; Line 183
lea rcx, QWORD PTR subspan$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
; Line 184
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:?mysubspan3@@YA_JXZ$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
mov rcx, QWORD PTR __$ArrayPad$[rsp]
xor rcx, rsp
call __security_check_cookie
add rsp, 176 ; 000000b0H
pop rdi
ret 0
?mysubspan3@@YA_JXZ ENDP ; mysubspan3
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
x$ = 40
s$ = 88
subspan$ = 120
__$ArrayPad$ = 160
i$ = 192
?mysubspan2@@YA_J_J@Z PROC ; mysubspan2
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 166
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 176 ; 000000b0H
mov rdi, rsp
mov ecx, 44 ; 0000002cH
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+192]
mov rax, QWORD PTR __security_cookie
xor rax, rsp
mov QWORD PTR __$ArrayPad$[rsp], rax
; Line 167
mov DWORD PTR x$[rsp], 0
mov DWORD PTR x$[rsp+4], 1
mov DWORD PTR x$[rsp+8], 2
mov DWORD PTR x$[rsp+12], 3
mov DWORD PTR x$[rsp+16], 4
mov DWORD PTR x$[rsp+20], 5
; Line 168
lea rdx, QWORD PTR x$[rsp]
lea rcx, QWORD PTR s$[rsp]
call ??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z ; gsl::span<int,6>::span<int,6><6>
; Line 170
mov r8, QWORD PTR i$[rsp]
lea rdx, QWORD PTR subspan$[rsp]
lea rcx, QWORD PTR s$[rsp]
call ?last@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J@Z ; gsl::span<int,6>::last
; Line 172
lea rcx, QWORD PTR subspan$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
; Line 173
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:?mysubspan2@@YA_J_J@Z$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
mov rcx, QWORD PTR __$ArrayPad$[rsp]
xor rcx, rsp
call __security_check_cookie
add rsp, 176 ; 000000b0H
pop rdi
ret 0
?mysubspan2@@YA_J_J@Z ENDP ; mysubspan2
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 40
$T3 = 48
this$ = 80
arr$ = 88
??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z PROC ; gsl::span<int,6>::span<int,6><6>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 395
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
mov QWORD PTR $T3[rsp], -2
; Line 394
mov eax, 4
imul rax, rax, 0
mov rcx, QWORD PTR arr$[rsp]
add rcx, rax
mov rax, rcx
mov rcx, rax
call ??$addressof@H@std@@YAPEAHAEAH@Z ; std::addressof<int>
npad 1
mov QWORD PTR $T2[rsp], rax
lea rcx, QWORD PTR $T1[rsp]
call ??0?$extent_type@$05@details@gsl@@QEAA@XZ ; gsl::details::extent_type<6>::extent_type<6>
npad 1
mov rcx, QWORD PTR this$[rsp]
movzx r8d, BYTE PTR [rax]
mov rdx, QWORD PTR $T2[rsp]
call ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z ; gsl::span<int,6>::storage_type<gsl::details::extent_type<6> >::storage_type<gsl::details::extent_type<6> ><gsl::details::extent_type<6> >
npad 1
; Line 395
mov rax, QWORD PTR this$[rsp]
add rsp, 64 ; 00000040H
pop rdi
ret 0
??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z ENDP ; gsl::span<int,6>::span<int,6><6>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?data@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEBAPEAHXZ
_TEXT SEGMENT
this$ = 16
?data@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEBAPEAHXZ PROC ; gsl::span<int,6>::storage_type<gsl::details::extent_type<6> >::data, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 602
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
mov rax, QWORD PTR this$[rsp]
mov rax, QWORD PTR [rax]
pop rdi
ret 0
?data@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEBAPEAHXZ ENDP ; gsl::span<int,6>::storage_type<gsl::details::extent_type<6> >::data
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?size@?$extent_type@$05@details@gsl@@QEBA_JXZ
_TEXT SEGMENT
this$ = 16
?size@?$extent_type@$05@details@gsl@@QEBA_JXZ PROC ; gsl::details::extent_type<6>::size, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 323
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
mov eax, 6
pop rdi
ret 0
?size@?$extent_type@$05@details@gsl@@QEBA_JXZ ENDP ; gsl::details::extent_type<6>::size
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0?$extent_type@$05@details@gsl@@QEAA@_J@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv78 = 72
tv75 = 80
this$ = 112
size$ = 120
??0?$extent_type@$05@details@gsl@@QEAA@_J@Z PROC ; gsl::details::extent_type<6>::extent_type<6>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 321
$LN9:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 96 ; 00000060H
mov rdi, rsp
mov ecx, 24
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+112]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
cmp QWORD PTR size$[rsp], 6
jne SHORT $LN3@extent_typ
jmp SHORT $LN4@extent_typ
$LN3@extent_typ:
lea rdx, OFFSET FLAT:??_C@_0ED@JOPLHMJE@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv78[rsp], rax
mov rax, QWORD PTR tv78[rsp]
mov QWORD PTR tv75[rsp], rax
mov eax, DWORD PTR $T2[rsp]
or eax, 1
mov DWORD PTR $T2[rsp], eax
mov rcx, QWORD PTR tv75[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@extent_typ:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN7@extent_typ
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN7@extent_typ:
mov rax, QWORD PTR this$[rsp]
add rsp, 96 ; 00000060H
pop rdi
ret 0
$LN8@extent_typ:
??0?$extent_type@$05@details@gsl@@QEAA@_J@Z ENDP ; gsl::details::extent_type<6>::extent_type<6>
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv78 = 72
tv75 = 80
this$ = 112
size$ = 120
?dtor$0@?0???0?$extent_type@$05@details@gsl@@QEAA@_J@Z@4HA PROC ; `gsl::details::extent_type<6>::extent_type<6>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???0?$extent_type@$05@details@gsl@@QEAA@_J@Z@4HA ENDP ; `gsl::details::extent_type<6>::extent_type<6>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv78 = 72
tv75 = 80
this$ = 112
size$ = 120
?dtor$0@?0???0?$extent_type@$05@details@gsl@@QEAA@_J@Z@4HA PROC ; `gsl::details::extent_type<6>::extent_type<6>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???0?$extent_type@$05@details@gsl@@QEAA@_J@Z@4HA ENDP ; `gsl::details::extent_type<6>::extent_type<6>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0?$extent_type@$05@details@gsl@@QEAA@XZ
_TEXT SEGMENT
this$ = 16
??0?$extent_type@$05@details@gsl@@QEAA@XZ PROC ; gsl::details::extent_type<6>::extent_type<6>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 311
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
mov rax, QWORD PTR this$[rsp]
pop rdi
ret 0
??0?$extent_type@$05@details@gsl@@QEAA@XZ ENDP ; gsl::details::extent_type<6>::extent_type<6>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?data@?$span@H$05@gsl@@QEBAPEAHXZ
_TEXT SEGMENT
this$ = 48
?data@?$span@H$05@gsl@@QEBAPEAHXZ PROC ; gsl::span<int,6>::data, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 515
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?data@?$storage_type@V?$extent_type@$05@details@gsl@@@?$span@H$05@gsl@@QEBAPEAHXZ ; gsl::span<int,6>::storage_type<gsl::details::extent_type<6> >::data
add rsp, 32 ; 00000020H
pop rdi
ret 0
?data@?$span@H$05@gsl@@QEBAPEAHXZ ENDP ; gsl::span<int,6>::data
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?size@?$span@H$05@gsl@@QEBA_JXZ
_TEXT SEGMENT
this$ = 48
?size@?$span@H$05@gsl@@QEBA_JXZ PROC ; gsl::span<int,6>::size, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 498
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?size@?$extent_type@$05@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<6>::size
add rsp, 32 ; 00000020H
pop rdi
ret 0
?size@?$span@H$05@gsl@@QEBA_JXZ ENDP ; gsl::span<int,6>::size
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?subspan@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J0@Z
_TEXT SEGMENT
$T1 = 48
this$ = 80
__$ReturnUdt$ = 88
offset$ = 96
count$ = 104
?subspan@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J0@Z PROC ; gsl::span<int,6>::subspan, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 493
$LN3:
mov QWORD PTR [rsp+32], r9
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
; Line 494
lea rax, QWORD PTR $T1[rsp]
mov rdi, rax
xor eax, eax
mov ecx, 1
rep stosb
movzx eax, BYTE PTR $T1[rsp]
mov BYTE PTR [rsp+32], al
mov r9, QWORD PTR count$[rsp]
mov r8, QWORD PTR offset$[rsp]
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z ; gsl::span<int,6>::make_subspan<6>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 495
add rsp, 64 ; 00000040H
pop rdi
ret 0
?subspan@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J0@Z ENDP ; gsl::span<int,6>::subspan
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?last@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J@Z
_TEXT SEGMENT
$T1 = 48
this$ = 80
__$ReturnUdt$ = 88
count$ = 96
?last@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J@Z PROC ; gsl::span<int,6>::last, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 487
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
; Line 488
lea rax, QWORD PTR $T1[rsp]
mov rdi, rax
xor eax, eax
mov ecx, 1
rep stosb
mov rcx, QWORD PTR this$[rsp]
call ?size@?$span@H$05@gsl@@QEBA_JXZ ; gsl::span<int,6>::size
sub rax, QWORD PTR count$[rsp]
movzx ecx, BYTE PTR $T1[rsp]
mov BYTE PTR [rsp+32], cl
mov r9, -1
mov r8, rax
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??$make_subspan@$05@?$span@H$05@gsl@@AEBA?AV?$span@H$0?0@1@_J0V?$subspan_selector@$05@01@@Z ; gsl::span<int,6>::make_subspan<6>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 489
add rsp, 64 ; 00000040H
pop rdi
ret 0
?last@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J@Z ENDP ; gsl::span<int,6>::last
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
x$ = 40
s$ = 88
subspan$ = 120
__$ArrayPad$ = 160
?mysubspan1@@YA_JXZ PROC ; mysubspan1
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 155
$LN3:
push rdi
sub rsp, 176 ; 000000b0H
mov rdi, rsp
mov ecx, 44 ; 0000002cH
mov eax, -858993460 ; ccccccccH
rep stosd
mov rax, QWORD PTR __security_cookie
xor rax, rsp
mov QWORD PTR __$ArrayPad$[rsp], rax
; Line 156
mov DWORD PTR x$[rsp], 0
mov DWORD PTR x$[rsp+4], 1
mov DWORD PTR x$[rsp+8], 2
mov DWORD PTR x$[rsp+12], 3
mov DWORD PTR x$[rsp+16], 4
mov DWORD PTR x$[rsp+20], 5
; Line 157
lea rdx, QWORD PTR x$[rsp]
lea rcx, QWORD PTR s$[rsp]
call ??$?0$05@?$span@H$05@gsl@@QEAA@AEAY05H@Z ; gsl::span<int,6>::span<int,6><6>
; Line 159
mov r8d, 3
lea rdx, QWORD PTR subspan$[rsp]
lea rcx, QWORD PTR s$[rsp]
call ?last@?$span@H$05@gsl@@QEBA?AV?$span@H$0?0@2@_J@Z ; gsl::span<int,6>::last
; Line 161
lea rcx, QWORD PTR subspan$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
; Line 162
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:?mysubspan1@@YA_JXZ$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
mov rcx, QWORD PTR __$ArrayPad$[rsp]
xor rcx, rsp
call __security_check_cookie
add rsp, 176 ; 000000b0H
pop rdi
ret 0
?mysubspan1@@YA_JXZ ENDP ; mysubspan1
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$convert_span@EV?$span@G$0?0@gsl@@@@YA?AV?$span@E$0?0@gsl@@V?$span@G$0?0@1@@Z
_TEXT SEGMENT
ptr$ = 32
__$ReturnUdt$ = 64
s$ = 72
??$convert_span@EV?$span@G$0?0@gsl@@@@YA?AV?$span@E$0?0@gsl@@V?$span@G$0?0@1@@Z PROC ; convert_span<unsigned char,gsl::span<unsigned short,-1> >, COMDAT
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 129
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 132
mov rcx, QWORD PTR s$[rsp]
call ?data@?$span@G$0?0@gsl@@QEBAPEAGXZ ; gsl::span<unsigned short,-1>::data
mov QWORD PTR ptr$[rsp], rax
; Line 133
mov rcx, QWORD PTR s$[rsp]
call ?size_bytes@?$span@G$0?0@gsl@@QEBA_JXZ ; gsl::span<unsigned short,-1>::size_bytes
mov r8, rax
mov rdx, QWORD PTR ptr$[rsp]
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??0?$span@E$0?0@gsl@@QEAA@PEAE_J@Z ; gsl::span<unsigned char,-1>::span<unsigned char,-1>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 134
add rsp, 48 ; 00000030H
pop rdi
ret 0
??$convert_span@EV?$span@G$0?0@gsl@@@@YA?AV?$span@E$0?0@gsl@@V?$span@G$0?0@1@@Z ENDP ; convert_span<unsigned char,gsl::span<unsigned short,-1> >
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
curBuffer$ = 40
$T4 = 80
Drive$ = 128
?test_convert_span_Joe@@YAEAEAUIDE_DRIVE_STATE@@@Z PROC ; test_convert_span_Joe
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 145
$LN3:
mov QWORD PTR [rsp+8], rcx
push rsi
push rdi
sub rsp, 104 ; 00000068H
mov rdi, rsp
mov ecx, 26
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+128]
; Line 146
lea rax, QWORD PTR $T4[rsp]
mov rcx, QWORD PTR Drive$[rsp]
mov rdi, rax
lea rsi, QWORD PTR [rcx+8]
mov ecx, 16
rep movsb
lea rdx, QWORD PTR $T4[rsp]
lea rcx, QWORD PTR curBuffer$[rsp]
call ??$convert_span@EV?$span@G$0?0@gsl@@@@YA?AV?$span@E$0?0@gsl@@V?$span@G$0?0@1@@Z ; convert_span<unsigned char,gsl::span<unsigned short,-1> >
; Line 148
xor edx, edx
lea rcx, QWORD PTR curBuffer$[rsp]
call ??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z ; gsl::span<unsigned char,-1>::operator[]
movzx eax, BYTE PTR [rax]
; Line 149
mov edi, eax
mov rcx, rsp
lea rdx, OFFSET FLAT:?test_convert_span_Joe@@YAEAEAUIDE_DRIVE_STATE@@@Z$rtcFrameData
call _RTC_CheckStackVars
mov eax, edi
add rsp, 104 ; 00000068H
pop rdi
pop rsi
ret 0
?test_convert_span_Joe@@YAEAEAUIDE_DRIVE_STATE@@@Z ENDP ; test_convert_span_Joe
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 40
$T3 = 48
this$ = 80
arr$ = 88
??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z PROC ; gsl::span<unsigned char,-1>::span<unsigned char,-1><6>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 395
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
mov QWORD PTR $T3[rsp], -2
; Line 394
mov eax, 1
imul rax, rax, 0
mov rcx, QWORD PTR arr$[rsp]
add rcx, rax
mov rax, rcx
mov rcx, rax
call ??$addressof@E@std@@YAPEAEAEAE@Z ; std::addressof<unsigned char>
npad 1
mov QWORD PTR $T2[rsp], rax
lea rcx, QWORD PTR $T1[rsp]
call ??0?$extent_type@$05@details@gsl@@QEAA@XZ ; gsl::details::extent_type<6>::extent_type<6>
npad 1
mov rcx, QWORD PTR this$[rsp]
movzx r8d, BYTE PTR [rax]
mov rdx, QWORD PTR $T2[rsp]
call ??$?0V?$extent_type@$05@details@gsl@@@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@UKnownNotNull@12@V?$extent_type@$05@details@2@@Z ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><gsl::details::extent_type<6> >
npad 1
; Line 395
mov rax, QWORD PTR this$[rsp]
add rsp, 64 ; 00000040H
pop rdi
ret 0
??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z ENDP ; gsl::span<unsigned char,-1>::span<unsigned char,-1><6>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEBAPEAEXZ
_TEXT SEGMENT
this$ = 16
?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEBAPEAEXZ PROC ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::data, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 602
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
mov rax, QWORD PTR this$[rsp]
mov rax, QWORD PTR [rax+8]
pop rdi
ret 0
?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEBAPEAEXZ ENDP ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::data
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?CheckRange@?$span@E$0?0@gsl@@CA_N_J0@Z
_TEXT SEGMENT
tv65 = 32
tv70 = 40
tv74 = 44
idx$ = 64
size$ = 72
?CheckRange@?$span@E$0?0@gsl@@CA_N_J0@Z PROC ; gsl::span<unsigned char,-1>::CheckRange, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 548
$LN9:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 562
xor eax, eax
cmp eax, 1
je SHORT $LN2@CheckRange
; Line 565
lea rcx, QWORD PTR idx$[rsp]
call ??$narrow_cast@_KAEA_J@gsl@@YA_KAEA_J@Z ; gsl::narrow_cast<unsigned __int64,__int64 &>
mov QWORD PTR tv65[rsp], rax
lea rcx, QWORD PTR size$[rsp]
call ??$narrow_cast@_KAEA_J@gsl@@YA_KAEA_J@Z ; gsl::narrow_cast<unsigned __int64,__int64 &>
mov rcx, QWORD PTR tv65[rsp]
cmp rcx, rax
jae SHORT $LN5@CheckRange
mov DWORD PTR tv70[rsp], 1
jmp SHORT $LN6@CheckRange
$LN5@CheckRange:
mov DWORD PTR tv70[rsp], 0
$LN6@CheckRange:
movzx eax, BYTE PTR tv70[rsp]
jmp SHORT $LN1@CheckRange
; Line 567
jmp SHORT $LN1@CheckRange
$LN2@CheckRange:
; Line 569
cmp QWORD PTR idx$[rsp], 0
jl SHORT $LN7@CheckRange
mov rax, QWORD PTR size$[rsp]
cmp QWORD PTR idx$[rsp], rax
jge SHORT $LN7@CheckRange
mov DWORD PTR tv74[rsp], 1
jmp SHORT $LN8@CheckRange
$LN7@CheckRange:
mov DWORD PTR tv74[rsp], 0
$LN8@CheckRange:
movzx eax, BYTE PTR tv74[rsp]
$LN1@CheckRange:
; Line 571
add rsp, 48 ; 00000030H
pop rdi
ret 0
?CheckRange@?$span@E$0?0@gsl@@CA_N_J0@Z ENDP ; gsl::span<unsigned char,-1>::CheckRange
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?begin@?$span@E$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@2@XZ
_TEXT SEGMENT
this$ = 48
__$ReturnUdt$ = 56
?begin@?$span@E$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@2@XZ PROC ; gsl::span<unsigned char,-1>::begin, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 518
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
xor r8d, r8d
mov rdx, QWORD PTR this$[rsp]
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??0?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@E$0?0@2@_J@Z ; gsl::details::span_iterator<gsl::span<unsigned char,-1>,0>::span_iterator<gsl::span<unsigned char,-1>,0>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
?begin@?$span@E$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@E$0?0@gsl@@$0A@@details@2@XZ ENDP ; gsl::span<unsigned char,-1>::begin
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?data@?$span@E$0?0@gsl@@QEBAPEAEXZ
_TEXT SEGMENT
this$ = 48
?data@?$span@E$0?0@gsl@@QEBAPEAEXZ PROC ; gsl::span<unsigned char,-1>::data, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 515
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEBAPEAEXZ ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::data
add rsp, 32 ; 00000020H
pop rdi
ret 0
?data@?$span@E$0?0@gsl@@QEBAPEAEXZ ENDP ; gsl::span<unsigned char,-1>::data
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv93 = 72
tv90 = 80
this$ = 112
idx$ = 120
??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z PROC ; gsl::span<unsigned char,-1>::operator[], COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 508
$LN9:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 96 ; 00000060H
mov rdi, rsp
mov ecx, 24
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+112]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 509
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
mov rdx, rax
mov rcx, QWORD PTR idx$[rsp]
call ?CheckRange@?$span@E$0?0@gsl@@CA_N_J0@Z ; gsl::span<unsigned char,-1>::CheckRange
movzx eax, al
test eax, eax
je SHORT $LN3@operator
jmp SHORT $LN4@operator
$LN3@operator:
lea rdx, OFFSET FLAT:??_C@_0ED@HAMNHNCO@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv93[rsp], rax
mov rax, QWORD PTR tv93[rsp]
mov QWORD PTR tv90[rsp], rax
mov eax, DWORD PTR $T2[rsp]
or eax, 1
mov DWORD PTR $T2[rsp], eax
mov rcx, QWORD PTR tv90[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@operator:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN7@operator
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN7@operator:
; Line 510
mov rcx, QWORD PTR this$[rsp]
call ?data@?$span@E$0?0@gsl@@QEBAPEAEXZ ; gsl::span<unsigned char,-1>::data
add rax, QWORD PTR idx$[rsp]
; Line 511
add rsp, 96 ; 00000060H
pop rdi
ret 0
$LN8@operator:
??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z ENDP ; gsl::span<unsigned char,-1>::operator[]
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv93 = 72
tv90 = 80
this$ = 112
idx$ = 120
?dtor$0@?0???A?$span@E$0?0@gsl@@QEBAAEAE_J@Z@4HA PROC ; `gsl::span<unsigned char,-1>::operator[]'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???A?$span@E$0?0@gsl@@QEBAAEAE_J@Z@4HA ENDP ; `gsl::span<unsigned char,-1>::operator[]'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv93 = 72
tv90 = 80
this$ = 112
idx$ = 120
?dtor$0@?0???A?$span@E$0?0@gsl@@QEBAAEAE_J@Z@4HA PROC ; `gsl::span<unsigned char,-1>::operator[]'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???A?$span@E$0?0@gsl@@QEBAAEAE_J@Z@4HA ENDP ; `gsl::span<unsigned char,-1>::operator[]'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?size@?$span@E$0?0@gsl@@QEBA_JXZ
_TEXT SEGMENT
this$ = 48
?size@?$span@E$0?0@gsl@@QEBA_JXZ PROC ; gsl::span<unsigned char,-1>::size, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 498
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
add rsp, 32 ; 00000020H
pop rdi
ret 0
?size@?$span@E$0?0@gsl@@QEBA_JXZ ENDP ; gsl::span<unsigned char,-1>::size
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0?$span@E$0?0@gsl@@QEAA@PEAE_J@Z
_TEXT SEGMENT
this$ = 48
ptr$ = 56
count$ = 64
??0?$span@E$0?0@gsl@@QEAA@PEAE_J@Z PROC ; gsl::span<unsigned char,-1>::span<unsigned char,-1>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 386
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov r8, QWORD PTR count$[rsp]
mov rdx, QWORD PTR ptr$[rsp]
mov rcx, rax
call ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@E$0?0@gsl@@QEAA@PEAE_J@Z ; gsl::span<unsigned char,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0?$span@E$0?0@gsl@@QEAA@PEAE_J@Z ENDP ; gsl::span<unsigned char,-1>::span<unsigned char,-1>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
sp$ = 40
i$4 = 68
Drive$ = 96
?static_size_array_span@@YAXAEAUIDE_DRIVE_STATE@@@Z PROC ; static_size_array_span
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 96
$LN6:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
; Line 97
mov rax, QWORD PTR Drive$[rsp]
mov rdx, rax
lea rcx, QWORD PTR sp$[rsp]
call ??$?0$05@?$span@E$0?0@gsl@@QEAA@AEAY05E@Z ; gsl::span<unsigned char,-1>::span<unsigned char,-1><6>
; Line 99
mov DWORD PTR i$4[rsp], 0
jmp SHORT $LN4@static_siz
$LN2@static_siz:
mov eax, DWORD PTR i$4[rsp]
inc eax
mov DWORD PTR i$4[rsp], eax
$LN4@static_siz:
cmp DWORD PTR i$4[rsp], 6
jge SHORT $LN3@static_siz
; Line 101
movsxd rax, DWORD PTR i$4[rsp]
mov rdx, rax
lea rcx, QWORD PTR sp$[rsp]
call ??A?$span@E$0?0@gsl@@QEBAAEAE_J@Z ; gsl::span<unsigned char,-1>::operator[]
mov BYTE PTR [rax], 1
; Line 102
jmp SHORT $LN2@static_siz
$LN3@static_siz:
; Line 103
mov rcx, rsp
lea rdx, OFFSET FLAT:?static_size_array_span@@YAXAEAUIDE_DRIVE_STATE@@@Z$rtcFrameData
call _RTC_CheckStackVars
add rsp, 80 ; 00000050H
pop rdi
ret 0
?static_size_array_span@@YAXAEAUIDE_DRIVE_STATE@@@Z ENDP ; static_size_array_span
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@G$0?0@gsl@@QEBAPEAGXZ
_TEXT SEGMENT
this$ = 16
?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@G$0?0@gsl@@QEBAPEAGXZ PROC ; gsl::span<unsigned short,-1>::storage_type<gsl::details::extent_type<-1> >::data, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 602
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
mov rax, QWORD PTR this$[rsp]
mov rax, QWORD PTR [rax+8]
pop rdi
ret 0
?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@G$0?0@gsl@@QEBAPEAGXZ ENDP ; gsl::span<unsigned short,-1>::storage_type<gsl::details::extent_type<-1> >::data
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?data@?$span@G$0?0@gsl@@QEBAPEAGXZ
_TEXT SEGMENT
this$ = 48
?data@?$span@G$0?0@gsl@@QEBAPEAGXZ PROC ; gsl::span<unsigned short,-1>::data, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 515
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@G$0?0@gsl@@QEBAPEAGXZ ; gsl::span<unsigned short,-1>::storage_type<gsl::details::extent_type<-1> >::data
add rsp, 32 ; 00000020H
pop rdi
ret 0
?data@?$span@G$0?0@gsl@@QEBAPEAGXZ ENDP ; gsl::span<unsigned short,-1>::data
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?size_bytes@?$span@G$0?0@gsl@@QEBA_JXZ
_TEXT SEGMENT
$T1 = 32
tv65 = 40
this$ = 64
?size_bytes@?$span@G$0?0@gsl@@QEBA_JXZ PROC ; gsl::span<unsigned short,-1>::size_bytes, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 500
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 501
mov QWORD PTR $T1[rsp], 2
mov rcx, QWORD PTR this$[rsp]
call ?size@?$span@G$0?0@gsl@@QEBA_JXZ ; gsl::span<unsigned short,-1>::size
mov QWORD PTR tv65[rsp], rax
lea rcx, QWORD PTR $T1[rsp]
call ??$narrow_cast@_J_K@gsl@@YA_J$$QEA_K@Z ; gsl::narrow_cast<__int64,unsigned __int64>
mov rcx, QWORD PTR tv65[rsp]
imul rcx, rax
mov rax, rcx
; Line 502
add rsp, 48 ; 00000030H
pop rdi
ret 0
?size_bytes@?$span@G$0?0@gsl@@QEBA_JXZ ENDP ; gsl::span<unsigned short,-1>::size_bytes
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?size@?$span@G$0?0@gsl@@QEBA_JXZ
_TEXT SEGMENT
this$ = 48
?size@?$span@G$0?0@gsl@@QEBA_JXZ PROC ; gsl::span<unsigned short,-1>::size, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 498
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
add rsp, 32 ; 00000020H
pop rdi
ret 0
?size@?$span@G$0?0@gsl@@QEBA_JXZ ENDP ; gsl::span<unsigned short,-1>::size
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
<range>$L0$1 = 32
<begin>$L0$2 = 40
<end>$L0$3 = 48
e$4 = 56
s$ = 80
?test_span_rangeiter@@YAXV?$span@H$0?0@gsl@@@Z PROC ; test_span_rangeiter
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 69
$LN6:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
; Line 70
mov rax, QWORD PTR s$[rsp]
mov QWORD PTR <range>$L0$1[rsp], rax
mov rcx, QWORD PTR <range>$L0$1[rsp]
call ?_Unchecked_begin@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::_Unchecked_begin
mov QWORD PTR <begin>$L0$2[rsp], rax
mov rcx, QWORD PTR <range>$L0$1[rsp]
call ?_Unchecked_end@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::_Unchecked_end
mov QWORD PTR <end>$L0$3[rsp], rax
jmp SHORT $LN4@test_span_
$LN2@test_span_:
mov rax, QWORD PTR <begin>$L0$2[rsp]
add rax, 4
mov QWORD PTR <begin>$L0$2[rsp], rax
$LN4@test_span_:
mov rax, QWORD PTR <end>$L0$3[rsp]
cmp QWORD PTR <begin>$L0$2[rsp], rax
je SHORT $LN3@test_span_
mov rax, QWORD PTR <begin>$L0$2[rsp]
mov QWORD PTR e$4[rsp], rax
; Line 72
mov rax, QWORD PTR e$4[rsp]
mov eax, DWORD PTR [rax]
inc eax
mov rcx, QWORD PTR e$4[rsp]
mov DWORD PTR [rcx], eax
; Line 73
jmp SHORT $LN2@test_span_
$LN3@test_span_:
; Line 74
add rsp, 64 ; 00000040H
pop rdi
ret 0
?test_span_rangeiter@@YAXV?$span@H$0?0@gsl@@@Z ENDP ; test_span_rangeiter
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?_Seek_to@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAH@Z
_TEXT SEGMENT
this$ = 48
p$ = 56
?_Seek_to@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAH@Z PROC ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Seek_to, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 292
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 294
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR [rax]
call ?data@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::data
mov rcx, QWORD PTR p$[rsp]
sub rcx, rax
mov rax, rcx
sar rax, 2
mov rcx, QWORD PTR this$[rsp]
mov QWORD PTR [rcx+8], rax
; Line 295
add rsp, 32 ; 00000020H
pop rdi
ret 0
?_Seek_to@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAXQEAH@Z ENDP ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Seek_to
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?_Unwrapped@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAPEAHXZ
_TEXT SEGMENT
this$ = 48
?_Unwrapped@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAPEAHXZ PROC ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Unwrapped, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 277
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 280
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR [rax]
call ?data@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::data
mov rcx, QWORD PTR this$[rsp]
mov rcx, QWORD PTR [rcx+8]
lea rax, QWORD PTR [rax+rcx*4]
; Line 281
add rsp, 32 ; 00000020H
pop rdi
ret 0
?_Unwrapped@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAPEAHXZ ENDP ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Unwrapped
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv68 = 72
this$ = 96
n$ = 104
?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z PROC ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Verify_offset, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 270
$LN7:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 272
mov rax, QWORD PTR this$[rsp]
mov rax, QWORD PTR [rax+8]
add rax, QWORD PTR n$[rsp]
test rax, rax
jl SHORT $LN3@Verify_off
mov rax, QWORD PTR this$[rsp]
mov rax, QWORD PTR [rax+8]
add rax, QWORD PTR n$[rsp]
mov QWORD PTR tv68[rsp], rax
mov rcx, QWORD PTR this$[rsp]
mov rcx, QWORD PTR [rcx]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
npad 1
mov rcx, QWORD PTR tv68[rsp]
cmp rcx, rax
jg SHORT $LN3@Verify_off
jmp SHORT $LN4@Verify_off
$LN3@Verify_off:
lea rdx, OFFSET FLAT:??_C@_0ED@LKBIKNJ@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
npad 1
or DWORD PTR $T2[rsp], 1
mov rcx, rax
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@Verify_off:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN2@Verify_off
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
npad 1
$LN2@Verify_off:
; Line 273
add rsp, 80 ; 00000050H
pop rdi
ret 0
$LN6@Verify_off:
?_Verify_offset@?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAX_J@Z ENDP ; gsl::details::span_iterator<gsl::span<int,-1>,0>::_Verify_offset
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
lhs$ = 96
rhs$ = 104
?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z PROC ; gsl::details::_Verify_range, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 264
$LN7:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 265
mov rax, QWORD PTR lhs$[rsp]
mov rcx, QWORD PTR rhs$[rsp]
mov rcx, QWORD PTR [rcx]
cmp QWORD PTR [rax], rcx
jne SHORT $LN3@Verify_ran
mov rax, QWORD PTR lhs$[rsp]
mov rcx, QWORD PTR rhs$[rsp]
mov rcx, QWORD PTR [rcx+8]
cmp QWORD PTR [rax+8], rcx
jg SHORT $LN3@Verify_ran
jmp SHORT $LN4@Verify_ran
$LN3@Verify_ran:
lea rdx, OFFSET FLAT:??_C@_0ED@GOAPCFOK@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
npad 1
or DWORD PTR $T2[rsp], 1
mov rcx, rax
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@Verify_ran:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN2@Verify_ran
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
npad 1
$LN2@Verify_ran:
; Line 267
add rsp, 80 ; 00000050H
pop rdi
ret 0
$LN6@Verify_ran:
?_Verify_range@details@gsl@@YAXV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@12@0@Z ENDP ; gsl::details::_Verify_range
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??9details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 48
tv69 = 64
lhs$ = 112
rhs$ = 120
??9details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z PROC ; gsl::details::operator!=, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 235
$LN5:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rsi
push rdi
sub rsp, 88 ; 00000058H
mov rdi, rsp
mov ecx, 22
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+112]
; Line 236
lea rax, QWORD PTR $T2[rsp]
mov rdi, rax
mov rsi, QWORD PTR rhs$[rsp]
mov ecx, 16
rep movsb
lea rax, QWORD PTR $T1[rsp]
mov rdi, rax
mov rsi, QWORD PTR lhs$[rsp]
mov ecx, 16
rep movsb
lea rdx, QWORD PTR $T2[rsp]
lea rcx, QWORD PTR $T1[rsp]
call ??8details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z ; gsl::details::operator==
movzx eax, al
test eax, eax
jne SHORT $LN3@operator
mov DWORD PTR tv69[rsp], 1
jmp SHORT $LN4@operator
$LN3@operator:
mov DWORD PTR tv69[rsp], 0
$LN4@operator:
movzx eax, BYTE PTR tv69[rsp]
; Line 237
add rsp, 88 ; 00000058H
pop rdi
pop rsi
ret 0
??9details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z ENDP ; gsl::details::operator!=
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??8details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z
_TEXT SEGMENT
tv70 = 0
lhs$ = 32
rhs$ = 40
??8details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z PROC ; gsl::details::operator==, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 230
$LN5:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 16
mov rdi, rsp
mov ecx, 4
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+32]
; Line 231
mov rax, QWORD PTR lhs$[rsp]
mov rcx, QWORD PTR rhs$[rsp]
mov rcx, QWORD PTR [rcx]
cmp QWORD PTR [rax], rcx
jne SHORT $LN3@operator
mov rax, QWORD PTR lhs$[rsp]
mov rcx, QWORD PTR rhs$[rsp]
mov rcx, QWORD PTR [rcx+8]
cmp QWORD PTR [rax+8], rcx
jne SHORT $LN3@operator
mov DWORD PTR tv70[rsp], 1
jmp SHORT $LN4@operator
$LN3@operator:
mov DWORD PTR tv70[rsp], 0
$LN4@operator:
movzx eax, BYTE PTR tv70[rsp]
; Line 232
add rsp, 16
pop rdi
ret 0
??8details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z ENDP ; gsl::details::operator==
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv87 = 72
tv84 = 80
this$ = 112
??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ PROC ; gsl::details::span_iterator<gsl::span<int,-1>,0>::operator++, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 168
$LN9:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 96 ; 00000060H
mov rdi, rsp
mov ecx, 24
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+112]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 169
mov rax, QWORD PTR this$[rsp]
cmp QWORD PTR [rax+8], 0
jl SHORT $LN3@operator
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR [rax]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
mov rcx, QWORD PTR this$[rsp]
cmp QWORD PTR [rcx+8], rax
je SHORT $LN3@operator
jmp SHORT $LN4@operator
$LN3@operator:
lea rdx, OFFSET FLAT:??_C@_0ED@PLCCJGML@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv87[rsp], rax
mov rax, QWORD PTR tv87[rsp]
mov QWORD PTR tv84[rsp], rax
mov eax, DWORD PTR $T2[rsp]
or eax, 1
mov DWORD PTR $T2[rsp], eax
mov rcx, QWORD PTR tv84[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@operator:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN7@operator
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN7@operator:
; Line 170
mov rax, QWORD PTR this$[rsp]
mov rax, QWORD PTR [rax+8]
inc rax
mov rcx, QWORD PTR this$[rsp]
mov QWORD PTR [rcx+8], rax
; Line 171
mov rax, QWORD PTR this$[rsp]
; Line 172
add rsp, 96 ; 00000060H
pop rdi
ret 0
$LN8@operator:
??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ ENDP ; gsl::details::span_iterator<gsl::span<int,-1>,0>::operator++
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv87 = 72
tv84 = 80
this$ = 112
?dtor$0@?0???E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ@4HA PROC ; `gsl::details::span_iterator<gsl::span<int,-1>,0>::operator++'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ@4HA ENDP ; `gsl::details::span_iterator<gsl::span<int,-1>,0>::operator++'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv87 = 72
tv84 = 80
this$ = 112
?dtor$0@?0???E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ@4HA PROC ; `gsl::details::span_iterator<gsl::span<int,-1>,0>::operator++'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ@4HA ENDP ; `gsl::details::span_iterator<gsl::span<int,-1>,0>::operator++'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv88 = 72
tv85 = 80
this$ = 112
??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ PROC ; gsl::details::span_iterator<gsl::span<int,-1>,0>::operator*, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 156
$LN9:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 96 ; 00000060H
mov rdi, rsp
mov ecx, 24
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+112]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 157
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR [rax]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
mov rcx, QWORD PTR this$[rsp]
cmp QWORD PTR [rcx+8], rax
je SHORT $LN3@operator
jmp SHORT $LN4@operator
$LN3@operator:
lea rdx, OFFSET FLAT:??_C@_0ED@GHOHAFBM@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv88[rsp], rax
mov rax, QWORD PTR tv88[rsp]
mov QWORD PTR tv85[rsp], rax
mov eax, DWORD PTR $T2[rsp]
or eax, 1
mov DWORD PTR $T2[rsp], eax
mov rcx, QWORD PTR tv85[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@operator:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN7@operator
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN7@operator:
; Line 158
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR [rax]
call ?data@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::data
mov rcx, QWORD PTR this$[rsp]
mov rcx, QWORD PTR [rcx+8]
lea rax, QWORD PTR [rax+rcx*4]
; Line 159
add rsp, 96 ; 00000060H
pop rdi
ret 0
$LN8@operator:
??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ ENDP ; gsl::details::span_iterator<gsl::span<int,-1>,0>::operator*
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv88 = 72
tv85 = 80
this$ = 112
?dtor$0@?0???D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ@4HA PROC ; `gsl::details::span_iterator<gsl::span<int,-1>,0>::operator*'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ@4HA ENDP ; `gsl::details::span_iterator<gsl::span<int,-1>,0>::operator*'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv88 = 72
tv85 = 80
this$ = 112
?dtor$0@?0???D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ@4HA PROC ; `gsl::details::span_iterator<gsl::span<int,-1>,0>::operator*'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ@4HA ENDP ; `gsl::details::span_iterator<gsl::span<int,-1>,0>::operator*'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@H$0?0@2@_J@Z
_TEXT SEGMENT
this$ = 16
span$ = 24
idx$ = 32
??0?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@H$0?0@2@_J@Z PROC ; gsl::details::span_iterator<gsl::span<int,-1>,0>::span_iterator<gsl::span<int,-1>,0>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 146
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
; Line 145
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR span$[rsp]
mov QWORD PTR [rax], rcx
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR idx$[rsp]
mov QWORD PTR [rax+8], rcx
; Line 146
mov rax, QWORD PTR this$[rsp]
pop rdi
ret 0
??0?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@H$0?0@2@_J@Z ENDP ; gsl::details::span_iterator<gsl::span<int,-1>,0>::span_iterator<gsl::span<int,-1>,0>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
it$4 = 40
$T5 = 72
$T6 = 96
$T7 = 112
tv77 = 128
s$ = 176
?test_span_iter@@YAXV?$span@H$0?0@gsl@@@Z PROC ; test_span_iter
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 60
$LN6:
mov QWORD PTR [rsp+8], rcx
push rsi
push rdi
sub rsp, 152 ; 00000098H
mov rdi, rsp
mov ecx, 38 ; 00000026H
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+176]
; Line 61
lea rdx, QWORD PTR it$4[rsp]
mov rcx, QWORD PTR s$[rsp]
call ?begin@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<int,-1>::begin
jmp SHORT $LN4@test_span_
$LN2@test_span_:
lea rcx, QWORD PTR it$4[rsp]
call ??E?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAAAEAV012@XZ ; gsl::details::span_iterator<gsl::span<int,-1>,0>::operator++
$LN4@test_span_:
lea rdx, QWORD PTR $T5[rsp]
mov rcx, QWORD PTR s$[rsp]
call ?end@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ ; gsl::span<int,-1>::end
lea rcx, QWORD PTR $T7[rsp]
mov rdi, rcx
mov rsi, rax
mov ecx, 16
rep movsb
lea rax, QWORD PTR $T6[rsp]
lea rcx, QWORD PTR it$4[rsp]
mov rdi, rax
mov rsi, rcx
mov ecx, 16
rep movsb
lea rdx, QWORD PTR $T7[rsp]
lea rcx, QWORD PTR $T6[rsp]
call ??9details@gsl@@YA_NV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@01@0@Z ; gsl::details::operator!=
movzx eax, al
test eax, eax
je SHORT $LN3@test_span_
; Line 63
lea rcx, QWORD PTR it$4[rsp]
call ??D?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEBAAEAHXZ ; gsl::details::span_iterator<gsl::span<int,-1>,0>::operator*
mov QWORD PTR tv77[rsp], rax
mov rax, QWORD PTR tv77[rsp]
mov eax, DWORD PTR [rax]
inc eax
mov rcx, QWORD PTR tv77[rsp]
mov DWORD PTR [rcx], eax
; Line 64
jmp $LN2@test_span_
$LN3@test_span_:
; Line 65
mov rcx, rsp
lea rdx, OFFSET FLAT:?test_span_iter@@YAXV?$span@H$0?0@gsl@@@Z$rtcFrameData
call _RTC_CheckStackVars
add rsp, 152 ; 00000098H
pop rdi
pop rsi
ret 0
?test_span_iter@@YAXV?$span@H$0?0@gsl@@@Z ENDP ; test_span_iter
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
i$1 = 32
tv71 = 40
s$ = 64
?test_span_for@@YAXV?$span@H$0?0@gsl@@@Z PROC ; test_span_for
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 51
$LN6:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 52
mov QWORD PTR i$1[rsp], 0
jmp SHORT $LN4@test_span_
$LN2@test_span_:
mov rax, QWORD PTR i$1[rsp]
inc rax
mov QWORD PTR i$1[rsp], rax
$LN4@test_span_:
mov rcx, QWORD PTR s$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
cmp QWORD PTR i$1[rsp], rax
jge SHORT $LN3@test_span_
; Line 54
mov rdx, QWORD PTR i$1[rsp]
mov rcx, QWORD PTR s$[rsp]
call ??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z ; gsl::span<int,-1>::operator[]
mov QWORD PTR tv71[rsp], rax
mov rax, QWORD PTR tv71[rsp]
mov eax, DWORD PTR [rax]
inc eax
mov rcx, QWORD PTR tv71[rsp]
mov DWORD PTR [rcx], eax
; Line 55
jmp SHORT $LN2@test_span_
$LN3@test_span_:
; Line 56
add rsp, 48 ; 00000030H
pop rdi
ret 0
?test_span_for@@YAXV?$span@H$0?0@gsl@@@Z ENDP ; test_span_for
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
$T4 = 72
$T5 = 96
$T6 = 104
$T7 = 112
tv153 = 120
tv143 = 128
tv88 = 136
tv155 = 144
tv150 = 152
this$ = 176
__$ReturnUdt$ = 184
offset$ = 192
count$ = 200
__formal$ = 208
?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z PROC ; gsl::span<int,-1>::make_subspan, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 630
$LN15:
mov QWORD PTR [rsp+32], r9
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 160 ; 000000a0H
mov rdi, rsp
mov ecx, 40 ; 00000028H
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+176]
mov QWORD PTR $T7[rsp], -2
mov DWORD PTR $T6[rsp], 0
; Line 631
cmp QWORD PTR offset$[rsp], 0
jl SHORT $LN4@make_subsp
mov rcx, QWORD PTR this$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
sub rax, QWORD PTR offset$[rsp]
test rax, rax
jl SHORT $LN4@make_subsp
jmp SHORT $LN5@make_subsp
$LN4@make_subsp:
lea rdx, OFFSET FLAT:??_C@_0ED@KIOHOGJB@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv153[rsp], rax
mov rax, QWORD PTR tv153[rsp]
mov QWORD PTR tv143[rsp], rax
mov eax, DWORD PTR $T6[rsp]
or eax, 1
mov DWORD PTR $T6[rsp], eax
mov rcx, QWORD PTR tv143[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN5@make_subsp:
mov eax, DWORD PTR $T6[rsp]
and eax, 1
test eax, eax
je SHORT $LN10@make_subsp
and DWORD PTR $T6[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN10@make_subsp:
; Line 633
cmp QWORD PTR count$[rsp], -1
jne SHORT $LN2@make_subsp
mov rcx, QWORD PTR this$[rsp]
call ?data@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::data
mov rcx, QWORD PTR offset$[rsp]
lea rax, QWORD PTR [rax+rcx*4]
mov QWORD PTR $T2[rsp], rax
mov rax, QWORD PTR $T2[rsp]
mov QWORD PTR $T3[rsp], rax
mov rcx, QWORD PTR this$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
sub rax, QWORD PTR offset$[rsp]
mov QWORD PTR tv88[rsp], rax
mov r8, QWORD PTR tv88[rsp]
mov rdx, QWORD PTR $T3[rsp]
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??0?$span@H$0?0@gsl@@AEAA@UKnownNotNull@01@_J@Z ; gsl::span<int,-1>::span<int,-1>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
jmp $LN3@make_subsp
$LN2@make_subsp:
; Line 635
cmp QWORD PTR count$[rsp], 0
jl SHORT $LN6@make_subsp
mov rcx, QWORD PTR this$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
sub rax, QWORD PTR offset$[rsp]
cmp rax, QWORD PTR count$[rsp]
jl SHORT $LN6@make_subsp
jmp SHORT $LN7@make_subsp
$LN6@make_subsp:
lea rdx, OFFSET FLAT:??_C@_0ED@MMILCDJF@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T4[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv155[rsp], rax
mov rax, QWORD PTR tv155[rsp]
mov QWORD PTR tv150[rsp], rax
mov eax, DWORD PTR $T6[rsp]
or eax, 2
mov DWORD PTR $T6[rsp], eax
mov rcx, QWORD PTR tv150[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN7@make_subsp:
mov eax, DWORD PTR $T6[rsp]
and eax, 2
test eax, eax
je SHORT $LN13@make_subsp
and DWORD PTR $T6[rsp], -3
lea rcx, QWORD PTR $T4[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN13@make_subsp:
; Line 636
mov rcx, QWORD PTR this$[rsp]
call ?data@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::data
mov rcx, QWORD PTR offset$[rsp]
lea rax, QWORD PTR [rax+rcx*4]
mov QWORD PTR $T5[rsp], rax
mov r8, QWORD PTR count$[rsp]
mov rdx, QWORD PTR $T5[rsp]
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??0?$span@H$0?0@gsl@@AEAA@UKnownNotNull@01@_J@Z ; gsl::span<int,-1>::span<int,-1>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
$LN3@make_subsp:
; Line 637
add rsp, 160 ; 000000a0H
pop rdi
ret 0
$LN14@make_subsp:
?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z ENDP ; gsl::span<int,-1>::make_subspan
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
$T4 = 72
$T5 = 96
$T6 = 104
$T7 = 112
tv153 = 120
tv143 = 128
tv88 = 136
tv155 = 144
tv150 = 152
this$ = 176
__$ReturnUdt$ = 184
offset$ = 192
count$ = 200
__formal$ = 208
?dtor$0@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA PROC ; `gsl::span<int,-1>::make_subspan'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T6[rbp]
and eax, 1
test eax, eax
je SHORT $LN9@dtor$0
and DWORD PTR $T6[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN9@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA ENDP ; `gsl::span<int,-1>::make_subspan'::`1'::dtor$0
text$x ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
$T4 = 72
$T5 = 96
$T6 = 104
$T7 = 112
tv153 = 120
tv143 = 128
tv88 = 136
tv155 = 144
tv150 = 152
this$ = 176
__$ReturnUdt$ = 184
offset$ = 192
count$ = 200
__formal$ = 208
?dtor$1@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA PROC ; `gsl::span<int,-1>::make_subspan'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T6[rbp]
and eax, 2
test eax, eax
je SHORT $LN12@dtor$1
and DWORD PTR $T6[rbp], -3
lea rcx, QWORD PTR $T4[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN12@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA ENDP ; `gsl::span<int,-1>::make_subspan'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
$T4 = 72
$T5 = 96
$T6 = 104
$T7 = 112
tv153 = 120
tv143 = 128
tv88 = 136
tv155 = 144
tv150 = 152
this$ = 176
__$ReturnUdt$ = 184
offset$ = 192
count$ = 200
__formal$ = 208
?dtor$0@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA PROC ; `gsl::span<int,-1>::make_subspan'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T6[rbp]
and eax, 1
test eax, eax
je SHORT $LN9@dtor$0
and DWORD PTR $T6[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN9@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA ENDP ; `gsl::span<int,-1>::make_subspan'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
$T4 = 72
$T5 = 96
$T6 = 104
$T7 = 112
tv153 = 120
tv143 = 128
tv88 = 136
tv155 = 144
tv150 = 152
this$ = 176
__$ReturnUdt$ = 184
offset$ = 192
count$ = 200
__formal$ = 208
?dtor$1@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA PROC ; `gsl::span<int,-1>::make_subspan'::`1'::dtor$1
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T6[rbp]
and eax, 2
test eax, eax
je SHORT $LN12@dtor$1
and DWORD PTR $T6[rbp], -3
lea rcx, QWORD PTR $T4[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN12@dtor$1:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$1@?0??make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z@4HA ENDP ; `gsl::span<int,-1>::make_subspan'::`1'::dtor$1
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0?$span@H$0?0@gsl@@AEAA@UKnownNotNull@01@_J@Z
_TEXT SEGMENT
this$ = 48
ptr$ = 56
count$ = 64
??0?$span@H$0?0@gsl@@AEAA@UKnownNotNull@01@_J@Z PROC ; gsl::span<int,-1>::span<int,-1>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 612
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov r8, QWORD PTR count$[rsp]
mov rdx, QWORD PTR ptr$[rsp]
mov rcx, rax
call ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@UKnownNotNull@12@_J@Z ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0?$span@H$0?0@gsl@@AEAA@UKnownNotNull@01@_J@Z ENDP ; gsl::span<int,-1>::span<int,-1>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEBAPEAHXZ
_TEXT SEGMENT
this$ = 16
?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEBAPEAHXZ PROC ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::data, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 602
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
mov rax, QWORD PTR this$[rsp]
mov rax, QWORD PTR [rax+8]
pop rdi
ret 0
?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEBAPEAHXZ ENDP ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::data
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?CheckRange@?$span@H$0?0@gsl@@CA_N_J0@Z
_TEXT SEGMENT
tv65 = 32
tv70 = 40
tv74 = 44
idx$ = 64
size$ = 72
?CheckRange@?$span@H$0?0@gsl@@CA_N_J0@Z PROC ; gsl::span<int,-1>::CheckRange, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 548
$LN9:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 562
xor eax, eax
cmp eax, 1
je SHORT $LN2@CheckRange
; Line 565
lea rcx, QWORD PTR idx$[rsp]
call ??$narrow_cast@_KAEA_J@gsl@@YA_KAEA_J@Z ; gsl::narrow_cast<unsigned __int64,__int64 &>
mov QWORD PTR tv65[rsp], rax
lea rcx, QWORD PTR size$[rsp]
call ??$narrow_cast@_KAEA_J@gsl@@YA_KAEA_J@Z ; gsl::narrow_cast<unsigned __int64,__int64 &>
mov rcx, QWORD PTR tv65[rsp]
cmp rcx, rax
jae SHORT $LN5@CheckRange
mov DWORD PTR tv70[rsp], 1
jmp SHORT $LN6@CheckRange
$LN5@CheckRange:
mov DWORD PTR tv70[rsp], 0
$LN6@CheckRange:
movzx eax, BYTE PTR tv70[rsp]
jmp SHORT $LN1@CheckRange
; Line 567
jmp SHORT $LN1@CheckRange
$LN2@CheckRange:
; Line 569
cmp QWORD PTR idx$[rsp], 0
jl SHORT $LN7@CheckRange
mov rax, QWORD PTR size$[rsp]
cmp QWORD PTR idx$[rsp], rax
jge SHORT $LN7@CheckRange
mov DWORD PTR tv74[rsp], 1
jmp SHORT $LN8@CheckRange
$LN7@CheckRange:
mov DWORD PTR tv74[rsp], 0
$LN8@CheckRange:
movzx eax, BYTE PTR tv74[rsp]
$LN1@CheckRange:
; Line 571
add rsp, 48 ; 00000030H
pop rdi
ret 0
?CheckRange@?$span@H$0?0@gsl@@CA_N_J0@Z ENDP ; gsl::span<int,-1>::CheckRange
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?_Unchecked_end@?$span@H$0?0@gsl@@QEBAPEAHXZ
_TEXT SEGMENT
tv65 = 32
this$ = 64
?_Unchecked_end@?$span@H$0?0@gsl@@QEBAPEAHXZ PROC ; gsl::span<int,-1>::_Unchecked_end, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 540
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 542
mov rcx, QWORD PTR this$[rsp]
call ?data@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::data
mov QWORD PTR tv65[rsp], rax
mov rcx, QWORD PTR this$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
mov rcx, QWORD PTR tv65[rsp]
lea rax, QWORD PTR [rcx+rax*4]
; Line 543
add rsp, 48 ; 00000030H
pop rdi
ret 0
?_Unchecked_end@?$span@H$0?0@gsl@@QEBAPEAHXZ ENDP ; gsl::span<int,-1>::_Unchecked_end
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?_Unchecked_begin@?$span@H$0?0@gsl@@QEBAPEAHXZ
_TEXT SEGMENT
this$ = 48
?_Unchecked_begin@?$span@H$0?0@gsl@@QEBAPEAHXZ PROC ; gsl::span<int,-1>::_Unchecked_begin, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 538
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rcx, QWORD PTR this$[rsp]
call ?data@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::data
add rsp, 32 ; 00000020H
pop rdi
ret 0
?_Unchecked_begin@?$span@H$0?0@gsl@@QEBAPEAHXZ ENDP ; gsl::span<int,-1>::_Unchecked_begin
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?end@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ
_TEXT SEGMENT
this$ = 48
__$ReturnUdt$ = 56
?end@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ PROC ; gsl::span<int,-1>::end, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 519
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rcx, QWORD PTR this$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
mov r8, rax
mov rdx, QWORD PTR this$[rsp]
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??0?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@H$0?0@2@_J@Z ; gsl::details::span_iterator<gsl::span<int,-1>,0>::span_iterator<gsl::span<int,-1>,0>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
?end@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ ENDP ; gsl::span<int,-1>::end
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?begin@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ
_TEXT SEGMENT
this$ = 48
__$ReturnUdt$ = 56
?begin@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ PROC ; gsl::span<int,-1>::begin, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 518
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
xor r8d, r8d
mov rdx, QWORD PTR this$[rsp]
mov rcx, QWORD PTR __$ReturnUdt$[rsp]
call ??0?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@gsl@@QEAA@PEBV?$span@H$0?0@2@_J@Z ; gsl::details::span_iterator<gsl::span<int,-1>,0>::span_iterator<gsl::span<int,-1>,0>
mov rax, QWORD PTR __$ReturnUdt$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
?begin@?$span@H$0?0@gsl@@QEBA?AV?$span_iterator@V?$span@H$0?0@gsl@@$0A@@details@2@XZ ENDP ; gsl::span<int,-1>::begin
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?data@?$span@H$0?0@gsl@@QEBAPEAHXZ
_TEXT SEGMENT
this$ = 48
?data@?$span@H$0?0@gsl@@QEBAPEAHXZ PROC ; gsl::span<int,-1>::data, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 515
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?data@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::data
add rsp, 32 ; 00000020H
pop rdi
ret 0
?data@?$span@H$0?0@gsl@@QEBAPEAHXZ ENDP ; gsl::span<int,-1>::data
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv93 = 72
tv90 = 80
this$ = 112
idx$ = 120
??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z PROC ; gsl::span<int,-1>::operator[], COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 508
$LN9:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 96 ; 00000060H
mov rdi, rsp
mov ecx, 24
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+112]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
; Line 509
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
mov rdx, rax
mov rcx, QWORD PTR idx$[rsp]
call ?CheckRange@?$span@H$0?0@gsl@@CA_N_J0@Z ; gsl::span<int,-1>::CheckRange
movzx eax, al
test eax, eax
je SHORT $LN3@operator
jmp SHORT $LN4@operator
$LN3@operator:
lea rdx, OFFSET FLAT:??_C@_0ED@HAMNHNCO@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv93[rsp], rax
mov rax, QWORD PTR tv93[rsp]
mov QWORD PTR tv90[rsp], rax
mov eax, DWORD PTR $T2[rsp]
or eax, 1
mov DWORD PTR $T2[rsp], eax
mov rcx, QWORD PTR tv90[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@operator:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN7@operator
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN7@operator:
; Line 510
mov rcx, QWORD PTR this$[rsp]
call ?data@?$span@H$0?0@gsl@@QEBAPEAHXZ ; gsl::span<int,-1>::data
mov rcx, QWORD PTR idx$[rsp]
lea rax, QWORD PTR [rax+rcx*4]
; Line 511
add rsp, 96 ; 00000060H
pop rdi
ret 0
$LN8@operator:
??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z ENDP ; gsl::span<int,-1>::operator[]
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv93 = 72
tv90 = 80
this$ = 112
idx$ = 120
?dtor$0@?0???A?$span@H$0?0@gsl@@QEBAAEAH_J@Z@4HA PROC ; `gsl::span<int,-1>::operator[]'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???A?$span@H$0?0@gsl@@QEBAAEAH_J@Z@4HA ENDP ; `gsl::span<int,-1>::operator[]'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv93 = 72
tv90 = 80
this$ = 112
idx$ = 120
?dtor$0@?0???A?$span@H$0?0@gsl@@QEBAAEAH_J@Z@4HA PROC ; `gsl::span<int,-1>::operator[]'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???A?$span@H$0?0@gsl@@QEBAAEAH_J@Z@4HA ENDP ; `gsl::span<int,-1>::operator[]'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?size@?$span@H$0?0@gsl@@QEBA_JXZ
_TEXT SEGMENT
this$ = 48
?size@?$span@H$0?0@gsl@@QEBA_JXZ PROC ; gsl::span<int,-1>::size, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 498
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov rcx, rax
call ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ; gsl::details::extent_type<-1>::size
add rsp, 32 ; 00000020H
pop rdi
ret 0
?size@?$span@H$0?0@gsl@@QEBA_JXZ ENDP ; gsl::span<int,-1>::size
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z
_TEXT SEGMENT
$T1 = 48
this$ = 80
__$ReturnUdt$ = 88
offset$ = 96
count$ = 104
?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z PROC ; gsl::span<int,-1>::subspan, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 493
$LN3:
mov QWORD PTR [rsp+32], r9
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
; Line 494
lea rax, QWORD PTR $T1[rsp]
mov rdi, rax
xor eax, eax
mov ecx, 1
rep stosb
movzx eax, BYTE PTR $T1[rsp]
mov BYTE PTR [rsp+32], al
mov r9, QWORD PTR count$[rsp]
mov r8, QWORD PTR offset$[rsp]
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z ; gsl::span<int,-1>::make_subspan
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 495
add rsp, 64 ; 00000040H
pop rdi
ret 0
?subspan@?$span@H$0?0@gsl@@QEBA?AV12@_J0@Z ENDP ; gsl::span<int,-1>::subspan
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?last@?$span@H$0?0@gsl@@QEBA?AV12@_J@Z
_TEXT SEGMENT
$T1 = 48
this$ = 80
__$ReturnUdt$ = 88
count$ = 96
?last@?$span@H$0?0@gsl@@QEBA?AV12@_J@Z PROC ; gsl::span<int,-1>::last, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 487
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
; Line 488
lea rax, QWORD PTR $T1[rsp]
mov rdi, rax
xor eax, eax
mov ecx, 1
rep stosb
mov rcx, QWORD PTR this$[rsp]
call ?size@?$span@H$0?0@gsl@@QEBA_JXZ ; gsl::span<int,-1>::size
sub rax, QWORD PTR count$[rsp]
movzx ecx, BYTE PTR $T1[rsp]
mov BYTE PTR [rsp+32], cl
mov r9, -1
mov r8, rax
mov rdx, QWORD PTR __$ReturnUdt$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ?make_subspan@?$span@H$0?0@gsl@@AEBA?AV12@_J0V?$subspan_selector@$0?0@12@@Z ; gsl::span<int,-1>::make_subspan
mov rax, QWORD PTR __$ReturnUdt$[rsp]
; Line 489
add rsp, 64 ; 00000040H
pop rdi
ret 0
?last@?$span@H$0?0@gsl@@QEBA?AV12@_J@Z ENDP ; gsl::span<int,-1>::last
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z
_TEXT SEGMENT
this$ = 48
ptr$ = 56
count$ = 64
??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z PROC ; gsl::span<int,-1>::span<int,-1>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 386
$LN3:
mov QWORD PTR [rsp+24], r8
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
mov r8, QWORD PTR count$[rsp]
mov rdx, QWORD PTR ptr$[rsp]
mov rcx, rax
call ??$?0_J@?$storage_type@V?$extent_type@$0?0@details@gsl@@@?$span@H$0?0@gsl@@QEAA@PEAH_J@Z ; gsl::span<int,-1>::storage_type<gsl::details::extent_type<-1> >::storage_type<gsl::details::extent_type<-1> ><__int64>
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0?$span@H$0?0@gsl@@QEAA@PEAH_J@Z ENDP ; gsl::span<int,-1>::span<int,-1>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
_TEXT SEGMENT
i$1 = 32
tv70 = 40
s$ = 64
len$ = 72
?test_span_unoptimizable_rangecheck@@YAXV?$span@H$0?0@gsl@@H@Z PROC ; test_span_unoptimizable_rangecheck
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 41
$LN6:
mov DWORD PTR [rsp+16], edx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 48 ; 00000030H
mov rdi, rsp
mov ecx, 12
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+64]
; Line 42
mov QWORD PTR i$1[rsp], 0
jmp SHORT $LN4@test_span_
$LN2@test_span_:
mov rax, QWORD PTR i$1[rsp]
inc rax
mov QWORD PTR i$1[rsp], rax
$LN4@test_span_:
movsxd rax, DWORD PTR len$[rsp]
cmp QWORD PTR i$1[rsp], rax
jge SHORT $LN3@test_span_
; Line 44
mov rdx, QWORD PTR i$1[rsp]
mov rcx, QWORD PTR s$[rsp]
call ??A?$span@H$0?0@gsl@@QEBAAEAH_J@Z ; gsl::span<int,-1>::operator[]
mov QWORD PTR tv70[rsp], rax
mov rax, QWORD PTR tv70[rsp]
mov eax, DWORD PTR [rax]
inc eax
mov rcx, QWORD PTR tv70[rsp]
mov DWORD PTR [rcx], eax
; Line 45
jmp SHORT $LN2@test_span_
$LN3@test_span_:
; Line 46
add rsp, 48 ; 00000030H
pop rdi
ret 0
?test_span_unoptimizable_rangecheck@@YAXV?$span@H$0?0@gsl@@H@Z ENDP ; test_span_unoptimizable_rangecheck
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z
_TEXT SEGMENT
$T1 = 32
exception$ = 80
??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z PROC ; gsl::details::throw_exception<gsl::fail_fast>, COMDAT
; File c:\projects\gsl\include\gsl\gsl_assert
; Line 143
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 64 ; 00000040H
mov rdi, rsp
mov ecx, 16
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+80]
; Line 144
mov rcx, QWORD PTR exception$[rsp]
call ??$forward@Ufail_fast@gsl@@@std@@YA$$QEAUfail_fast@gsl@@AEAU12@@Z ; std::forward<gsl::fail_fast>
mov rdx, rax
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@$$QEAU01@@Z
lea rdx, OFFSET FLAT:_TI3?AUfail_fast@gsl@@
lea rcx, QWORD PTR $T1[rsp]
call _CxxThrowException
$LN2@throw_exce:
; Line 145
add rsp, 64 ; 00000040H
pop rdi
ret 0
??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ENDP ; gsl::details::throw_exception<gsl::fail_fast>
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ
_TEXT SEGMENT
this$ = 16
?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ PROC ; gsl::details::extent_type<-1>::size, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 338
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
mov rax, QWORD PTR this$[rsp]
mov rax, QWORD PTR [rax]
pop rdi
ret 0
?size@?$extent_type@$0?0@details@gsl@@QEBA_JXZ ENDP ; gsl::details::extent_type<-1>::size
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z
_TEXT SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv79 = 72
tv76 = 80
this$ = 112
size$ = 120
??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z PROC ; gsl::details::extent_type<-1>::extent_type<-1>, COMDAT
; File c:\projects\gsl\include\gsl\span
; Line 336
$LN9:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 96 ; 00000060H
mov rdi, rsp
mov ecx, 24
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+112]
mov QWORD PTR $T3[rsp], -2
mov DWORD PTR $T2[rsp], 0
mov rax, QWORD PTR this$[rsp]
mov rcx, QWORD PTR size$[rsp]
mov QWORD PTR [rax], rcx
cmp QWORD PTR size$[rsp], 0
jl SHORT $LN3@extent_typ
jmp SHORT $LN4@extent_typ
$LN3@extent_typ:
lea rdx, OFFSET FLAT:??_C@_0ED@NAHIIAGE@GSL?3?5Precondition?5failure?5at?5c?3@
lea rcx, QWORD PTR $T1[rsp]
call ??0fail_fast@gsl@@QEAA@QEBD@Z ; gsl::fail_fast::fail_fast
mov QWORD PTR tv79[rsp], rax
mov rax, QWORD PTR tv79[rsp]
mov QWORD PTR tv76[rsp], rax
mov eax, DWORD PTR $T2[rsp]
or eax, 1
mov DWORD PTR $T2[rsp], eax
mov rcx, QWORD PTR tv76[rsp]
call ??$throw_exception@Ufail_fast@gsl@@@details@gsl@@YAX$$QEAUfail_fast@1@@Z ; gsl::details::throw_exception<gsl::fail_fast>
npad 1
$LN4@extent_typ:
mov eax, DWORD PTR $T2[rsp]
and eax, 1
test eax, eax
je SHORT $LN7@extent_typ
and DWORD PTR $T2[rsp], -2
lea rcx, QWORD PTR $T1[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN7@extent_typ:
mov rax, QWORD PTR this$[rsp]
add rsp, 96 ; 00000060H
pop rdi
ret 0
$LN8@extent_typ:
??0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z ENDP ; gsl::details::extent_type<-1>::extent_type<-1>
_TEXT ENDS
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv79 = 72
tv76 = 80
this$ = 112
size$ = 120
?dtor$0@?0???0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z@4HA PROC ; `gsl::details::extent_type<-1>::extent_type<-1>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z@4HA ENDP ; `gsl::details::extent_type<-1>::extent_type<-1>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT text$x
text$x SEGMENT
$T1 = 32
$T2 = 56
$T3 = 64
tv79 = 72
tv76 = 80
this$ = 112
size$ = 120
?dtor$0@?0???0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z@4HA PROC ; `gsl::details::extent_type<-1>::extent_type<-1>'::`1'::dtor$0
mov QWORD PTR [rsp+8], rcx
mov QWORD PTR [rsp+16], rdx
push rbp
push rdi
sub rsp, 40 ; 00000028H
mov rbp, rdx
mov eax, DWORD PTR $T2[rbp]
and eax, 1
test eax, eax
je SHORT $LN6@dtor$0
and DWORD PTR $T2[rbp], -2
lea rcx, QWORD PTR $T1[rbp]
call ??1fail_fast@gsl@@UEAA@XZ
$LN6@dtor$0:
add rsp, 40 ; 00000028H
pop rdi
pop rbp
ret 0
?dtor$0@?0???0?$extent_type@$0?0@details@gsl@@QEAA@_J@Z@4HA ENDP ; `gsl::details::extent_type<-1>::extent_type<-1>'::`1'::dtor$0
text$x ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??_Gnarrowing_error@gsl@@UEAAPEAXI@Z
_TEXT SEGMENT
this$ = 48
__flags$ = 56
??_Gnarrowing_error@gsl@@UEAAPEAXI@Z PROC ; gsl::narrowing_error::`scalar deleting destructor', COMDAT
$LN4:
mov DWORD PTR [rsp+16], edx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rcx, QWORD PTR this$[rsp]
call ??1narrowing_error@gsl@@UEAA@XZ
mov eax, DWORD PTR __flags$[rsp]
and eax, 1
test eax, eax
je SHORT $LN2@scalar
mov edx, 24
mov rcx, QWORD PTR this$[rsp]
call ??3@YAXPEAX_K@Z ; operator delete
$LN2@scalar:
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??_Gnarrowing_error@gsl@@UEAAPEAXI@Z ENDP ; gsl::narrowing_error::`scalar deleting destructor'
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0narrowing_error@gsl@@QEAA@$$QEAU01@@Z
_TEXT SEGMENT
this$ = 48
__that$ = 56
??0narrowing_error@gsl@@QEAA@$$QEAU01@@Z PROC ; gsl::narrowing_error::narrowing_error, COMDAT
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rdx, QWORD PTR __that$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??0exception@std@@QEAA@AEBV01@@Z ; std::exception::exception
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7narrowing_error@gsl@@6B@
mov QWORD PTR [rax], rcx
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0narrowing_error@gsl@@QEAA@$$QEAU01@@Z ENDP ; gsl::narrowing_error::narrowing_error
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0narrowing_error@gsl@@QEAA@AEBU01@@Z
_TEXT SEGMENT
this$ = 48
__that$ = 56
??0narrowing_error@gsl@@QEAA@AEBU01@@Z PROC ; gsl::narrowing_error::narrowing_error, COMDAT
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rdx, QWORD PTR __that$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??0exception@std@@QEAA@AEBV01@@Z ; std::exception::exception
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7narrowing_error@gsl@@6B@
mov QWORD PTR [rax], rcx
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0narrowing_error@gsl@@QEAA@AEBU01@@Z ENDP ; gsl::narrowing_error::narrowing_error
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??1narrowing_error@gsl@@UEAA@XZ
_TEXT SEGMENT
this$ = 48
??1narrowing_error@gsl@@UEAA@XZ PROC ; gsl::narrowing_error::~narrowing_error, COMDAT
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rcx, QWORD PTR this$[rsp]
call ??1exception@std@@UEAA@XZ ; std::exception::~exception
add rsp, 32 ; 00000020H
pop rdi
ret 0
??1narrowing_error@gsl@@UEAA@XZ ENDP ; gsl::narrowing_error::~narrowing_error
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0narrowing_error@gsl@@QEAA@XZ
_TEXT SEGMENT
this$ = 48
??0narrowing_error@gsl@@QEAA@XZ PROC ; gsl::narrowing_error::narrowing_error, COMDAT
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rcx, QWORD PTR this$[rsp]
call ??0exception@std@@QEAA@XZ ; std::exception::exception
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7narrowing_error@gsl@@6B@
mov QWORD PTR [rax], rcx
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0narrowing_error@gsl@@QEAA@XZ ENDP ; gsl::narrowing_error::narrowing_error
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??_Gfail_fast@gsl@@UEAAPEAXI@Z
_TEXT SEGMENT
this$ = 48
__flags$ = 56
??_Gfail_fast@gsl@@UEAAPEAXI@Z PROC ; gsl::fail_fast::`scalar deleting destructor', COMDAT
$LN4:
mov DWORD PTR [rsp+16], edx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rcx, QWORD PTR this$[rsp]
call ??1fail_fast@gsl@@UEAA@XZ
mov eax, DWORD PTR __flags$[rsp]
and eax, 1
test eax, eax
je SHORT $LN2@scalar
mov edx, 24
mov rcx, QWORD PTR this$[rsp]
call ??3@YAXPEAX_K@Z ; operator delete
$LN2@scalar:
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??_Gfail_fast@gsl@@UEAAPEAXI@Z ENDP ; gsl::fail_fast::`scalar deleting destructor'
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0fail_fast@gsl@@QEAA@$$QEAU01@@Z
_TEXT SEGMENT
this$ = 48
__that$ = 56
??0fail_fast@gsl@@QEAA@$$QEAU01@@Z PROC ; gsl::fail_fast::fail_fast, COMDAT
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rdx, QWORD PTR __that$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??0logic_error@std@@QEAA@$$QEAV01@@Z
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7fail_fast@gsl@@6B@
mov QWORD PTR [rax], rcx
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0fail_fast@gsl@@QEAA@$$QEAU01@@Z ENDP ; gsl::fail_fast::fail_fast
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0fail_fast@gsl@@QEAA@AEBU01@@Z
_TEXT SEGMENT
this$ = 48
__that$ = 56
??0fail_fast@gsl@@QEAA@AEBU01@@Z PROC ; gsl::fail_fast::fail_fast, COMDAT
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rdx, QWORD PTR __that$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??0logic_error@std@@QEAA@AEBV01@@Z
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7fail_fast@gsl@@6B@
mov QWORD PTR [rax], rcx
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0fail_fast@gsl@@QEAA@AEBU01@@Z ENDP ; gsl::fail_fast::fail_fast
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??1fail_fast@gsl@@UEAA@XZ
_TEXT SEGMENT
this$ = 48
??1fail_fast@gsl@@UEAA@XZ PROC ; gsl::fail_fast::~fail_fast, COMDAT
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rcx, QWORD PTR this$[rsp]
call ??1logic_error@std@@UEAA@XZ
add rsp, 32 ; 00000020H
pop rdi
ret 0
??1fail_fast@gsl@@UEAA@XZ ENDP ; gsl::fail_fast::~fail_fast
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0fail_fast@gsl@@QEAA@QEBD@Z
_TEXT SEGMENT
this$ = 48
message$ = 56
??0fail_fast@gsl@@QEAA@QEBD@Z PROC ; gsl::fail_fast::fail_fast, COMDAT
; File c:\projects\gsl\include\gsl\gsl_assert
; Line 99
$LN4:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rdx, QWORD PTR message$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??0logic_error@std@@QEAA@PEBD@Z ; std::logic_error::logic_error
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7fail_fast@gsl@@6B@
mov QWORD PTR [rax], rcx
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0fail_fast@gsl@@QEAA@QEBD@Z ENDP ; gsl::fail_fast::fail_fast
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??_Glogic_error@std@@UEAAPEAXI@Z
_TEXT SEGMENT
this$ = 48
__flags$ = 56
??_Glogic_error@std@@UEAAPEAXI@Z PROC ; std::logic_error::`scalar deleting destructor', COMDAT
$LN4:
mov DWORD PTR [rsp+16], edx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rcx, QWORD PTR this$[rsp]
call ??1logic_error@std@@UEAA@XZ
mov eax, DWORD PTR __flags$[rsp]
and eax, 1
test eax, eax
je SHORT $LN2@scalar
mov edx, 24
mov rcx, QWORD PTR this$[rsp]
call ??3@YAXPEAX_K@Z ; operator delete
$LN2@scalar:
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??_Glogic_error@std@@UEAAPEAXI@Z ENDP ; std::logic_error::`scalar deleting destructor'
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0logic_error@std@@QEAA@$$QEAV01@@Z
_TEXT SEGMENT
this$ = 48
__that$ = 56
??0logic_error@std@@QEAA@$$QEAV01@@Z PROC ; std::logic_error::logic_error, COMDAT
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rdx, QWORD PTR __that$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??0exception@std@@QEAA@AEBV01@@Z ; std::exception::exception
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7logic_error@std@@6B@
mov QWORD PTR [rax], rcx
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0logic_error@std@@QEAA@$$QEAV01@@Z ENDP ; std::logic_error::logic_error
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0logic_error@std@@QEAA@AEBV01@@Z
_TEXT SEGMENT
this$ = 48
__that$ = 56
??0logic_error@std@@QEAA@AEBV01@@Z PROC ; std::logic_error::logic_error, COMDAT
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rdx, QWORD PTR __that$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??0exception@std@@QEAA@AEBV01@@Z ; std::exception::exception
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7logic_error@std@@6B@
mov QWORD PTR [rax], rcx
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0logic_error@std@@QEAA@AEBV01@@Z ENDP ; std::logic_error::logic_error
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??1logic_error@std@@UEAA@XZ
_TEXT SEGMENT
this$ = 48
??1logic_error@std@@UEAA@XZ PROC ; std::logic_error::~logic_error, COMDAT
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rcx, QWORD PTR this$[rsp]
call ??1exception@std@@UEAA@XZ ; std::exception::~exception
add rsp, 32 ; 00000020H
pop rdi
ret 0
??1logic_error@std@@UEAA@XZ ENDP ; std::logic_error::~logic_error
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0logic_error@std@@QEAA@PEBD@Z
_TEXT SEGMENT
this$ = 48
_Message$ = 56
??0logic_error@std@@QEAA@PEBD@Z PROC ; std::logic_error::logic_error, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\stdexcept
; Line 30
$LN4:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
; Line 29
mov rdx, QWORD PTR _Message$[rsp]
mov rcx, QWORD PTR this$[rsp]
call ??0exception@std@@QEAA@QEBD@Z ; std::exception::exception
; Line 30
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7logic_error@std@@6B@
mov QWORD PTR [rax], rcx
; Line 31
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0logic_error@std@@QEAA@PEBD@Z ENDP ; std::logic_error::logic_error
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??_Gexception@std@@UEAAPEAXI@Z
_TEXT SEGMENT
this$ = 48
__flags$ = 56
??_Gexception@std@@UEAAPEAXI@Z PROC ; std::exception::`scalar deleting destructor', COMDAT
$LN4:
mov DWORD PTR [rsp+16], edx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rcx, QWORD PTR this$[rsp]
call ??1exception@std@@UEAA@XZ ; std::exception::~exception
mov eax, DWORD PTR __flags$[rsp]
and eax, 1
test eax, eax
je SHORT $LN2@scalar
mov edx, 24
mov rcx, QWORD PTR this$[rsp]
call ??3@YAXPEAX_K@Z ; operator delete
$LN2@scalar:
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??_Gexception@std@@UEAAPEAXI@Z ENDP ; std::exception::`scalar deleting destructor'
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?what@exception@std@@UEBAPEBDXZ
_TEXT SEGMENT
tv69 = 0
this$ = 32
?what@exception@std@@UEBAPEBDXZ PROC ; std::exception::what, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\vcruntime_exception.h
; Line 90
$LN5:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 16
mov rdi, rsp
mov ecx, 4
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+32]
; Line 91
mov rax, QWORD PTR this$[rsp]
cmp QWORD PTR [rax+8], 0
je SHORT $LN3@what
mov rax, QWORD PTR this$[rsp]
mov rax, QWORD PTR [rax+8]
mov QWORD PTR tv69[rsp], rax
jmp SHORT $LN4@what
$LN3@what:
lea rax, OFFSET FLAT:??_C@_0BC@EOODALEL@Unknown?5exception@
mov QWORD PTR tv69[rsp], rax
$LN4@what:
mov rax, QWORD PTR tv69[rsp]
; Line 92
add rsp, 16
pop rdi
ret 0
?what@exception@std@@UEBAPEBDXZ ENDP ; std::exception::what
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??1exception@std@@UEAA@XZ
_TEXT SEGMENT
this$ = 48
??1exception@std@@UEAA@XZ PROC ; std::exception::~exception, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\vcruntime_exception.h
; Line 85
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7exception@std@@6B@
mov QWORD PTR [rax], rcx
; Line 86
mov rax, QWORD PTR this$[rsp]
add rax, 8
mov rcx, rax
call __std_exception_destroy
; Line 87
add rsp, 32 ; 00000020H
pop rdi
ret 0
??1exception@std@@UEAA@XZ ENDP ; std::exception::~exception
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0exception@std@@QEAA@AEBV01@@Z
_TEXT SEGMENT
this$ = 48
_Other$ = 56
??0exception@std@@QEAA@AEBV01@@Z PROC ; std::exception::exception, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\vcruntime_exception.h
; Line 68
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 32 ; 00000020H
mov rdi, rsp
mov ecx, 8
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+48]
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7exception@std@@6B@
mov QWORD PTR [rax], rcx
; Line 67
mov rax, QWORD PTR this$[rsp]
add rax, 8
mov rdi, rax
xor eax, eax
mov ecx, 16
rep stosb
; Line 69
mov rax, QWORD PTR this$[rsp]
add rax, 8
mov rcx, QWORD PTR _Other$[rsp]
add rcx, 8
mov rdx, rax
call __std_exception_copy
; Line 70
mov rax, QWORD PTR this$[rsp]
add rsp, 32 ; 00000020H
pop rdi
ret 0
??0exception@std@@QEAA@AEBV01@@Z ENDP ; std::exception::exception
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0exception@std@@QEAA@QEBD@Z
_TEXT SEGMENT
_InitData$ = 40
this$ = 96
_Message$ = 104
??0exception@std@@QEAA@QEBD@Z PROC ; std::exception::exception, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\vcruntime_exception.h
; Line 55
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
sub rsp, 80 ; 00000050H
mov rdi, rsp
mov ecx, 20
mov eax, -858993460 ; ccccccccH
rep stosd
mov rcx, QWORD PTR [rsp+96]
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7exception@std@@6B@
mov QWORD PTR [rax], rcx
; Line 54
mov rax, QWORD PTR this$[rsp]
add rax, 8
mov rdi, rax
xor eax, eax
mov ecx, 16
rep stosb
; Line 56
mov rax, QWORD PTR _Message$[rsp]
mov QWORD PTR _InitData$[rsp], rax
mov BYTE PTR _InitData$[rsp+8], 1
; Line 57
mov rax, QWORD PTR this$[rsp]
add rax, 8
mov rdx, rax
lea rcx, QWORD PTR _InitData$[rsp]
call __std_exception_copy
; Line 58
mov rax, QWORD PTR this$[rsp]
mov rdi, rax
mov rcx, rsp
lea rdx, OFFSET FLAT:??0exception@std@@QEAA@QEBD@Z$rtcFrameData
call _RTC_CheckStackVars
mov rax, rdi
add rsp, 80 ; 00000050H
pop rdi
ret 0
??0exception@std@@QEAA@QEBD@Z ENDP ; std::exception::exception
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ??0exception@std@@QEAA@XZ
_TEXT SEGMENT
this$ = 16
??0exception@std@@QEAA@XZ PROC ; std::exception::exception, COMDAT
; File c:\program files (x86)\microsoft visual studio\2017\community\vc\tools\msvc\14.16.27023\include\vcruntime_exception.h
; Line 50
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
mov rax, QWORD PTR this$[rsp]
lea rcx, OFFSET FLAT:??_7exception@std@@6B@
mov QWORD PTR [rax], rcx
; Line 49
mov rax, QWORD PTR this$[rsp]
add rax, 8
mov rdi, rax
xor eax, eax
mov ecx, 16
rep stosb
; Line 51
mov rax, QWORD PTR this$[rsp]
pop rdi
ret 0
??0exception@std@@QEAA@XZ ENDP ; std::exception::exception
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?__empty_global_delete@@YAXPEAX_K@Z
_TEXT SEGMENT
__formal$ = 16
__formal$ = 24
?__empty_global_delete@@YAXPEAX_K@Z PROC ; __empty_global_delete, COMDAT
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 342
$LN3:
mov QWORD PTR [rsp+16], rdx
mov QWORD PTR [rsp+8], rcx
push rdi
pop rdi
ret 0
?__empty_global_delete@@YAXPEAX_K@Z ENDP ; __empty_global_delete
_TEXT ENDS
; Function compile flags: /Odtp /RTCsu
; COMDAT ?__empty_global_delete@@YAXPEAX@Z
_TEXT SEGMENT
__formal$ = 16
?__empty_global_delete@@YAXPEAX@Z PROC ; __empty_global_delete, COMDAT
; File c:\projects\gsl\tests\span_compile_only.cpp
; Line 342
$LN3:
mov QWORD PTR [rsp+8], rcx
push rdi
pop rdi
ret 0
?__empty_global_delete@@YAXPEAX@Z ENDP ; __empty_global_delete
_TEXT ENDS
END
|
src/main/antlr4/liquid/parser/v4/LiquidLexer.g4 | jlitola/Liqp | 0 | 4110 | lexer grammar LiquidLexer;
@lexer::members {
private boolean stripSpacesAroundTags = false;
private boolean stripSingleLine = false;
public LiquidLexer(CharStream charStream, boolean stripSpacesAroundTags) {
this(charStream, stripSpacesAroundTags, false);
}
public LiquidLexer(CharStream charStream, boolean stripSpacesAroundTags, boolean stripSingleLine) {
this(charStream);
this.stripSpacesAroundTags = stripSpacesAroundTags;
this.stripSingleLine = stripSingleLine;
}
}
OutStart
: ( {stripSpacesAroundTags && stripSingleLine}? SpaceOrTab* '{{'
| {stripSpacesAroundTags && !stripSingleLine}? WhitespaceChar* '{{'
| WhitespaceChar* '{{-'
| '{{'
) -> pushMode(IN_TAG)
;
TagStart
: ( {stripSpacesAroundTags && stripSingleLine}? SpaceOrTab* '{%'
| {stripSpacesAroundTags && !stripSingleLine}? WhitespaceChar* '{%'
| WhitespaceChar* '{%-'
| '{%'
) -> pushMode(IN_TAG)
;
Other
: .
;
fragment SStr : '\'' ~'\''* '\'';
fragment DStr : '"' ~'"'* '"';
fragment WhitespaceChar : [ \t\r\n];
fragment SpaceOrTab : [ \t];
fragment LineBreak : '\r'? '\n' | '\r';
fragment Letter : [a-zA-Z];
fragment Digit : [0-9];
mode IN_TAG;
OutStart2 : '{{' -> pushMode(IN_TAG);
TagStart2 : '{%' -> pushMode(IN_TAG);
OutEnd
: ( {stripSpacesAroundTags && stripSingleLine}? '}}' SpaceOrTab* LineBreak?
| {stripSpacesAroundTags && !stripSingleLine}? '}}' WhitespaceChar*
| '-}}' WhitespaceChar*
| '}}'
) -> popMode
;
TagEnd
: ( {stripSpacesAroundTags && stripSingleLine}? '%}' SpaceOrTab* LineBreak?
| {stripSpacesAroundTags && !stripSingleLine}? '%}' WhitespaceChar*
| '-%}' WhitespaceChar*
| '%}'
) -> popMode
;
Str : SStr | DStr;
DotDot : '..';
Dot : '.';
NEq : '!=' | '<>';
Eq : '==';
EqSign : '=';
GtEq : '>=';
Gt : '>';
LtEq : '<=';
Lt : '<';
Minus : '-';
Pipe : '|';
Col : ':';
Comma : ',';
OPar : '(';
CPar : ')';
OBr : '[';
CBr : ']';
QMark : '?';
PathSep : [/\\];
DoubleNum
: '-'? Digit+ '.' Digit+
| '-'? Digit+ '.' {_input.LA(1) != '.'}?
;
LongNum : '-'? Digit+;
WS : WhitespaceChar+ -> channel(HIDDEN);
CaptureStart : 'capture';
CaptureEnd : 'endcapture';
CommentStart : 'comment';
CommentEnd : 'endcomment';
RawStart : 'raw' WhitespaceChar* '%}' -> pushMode(IN_RAW);
IfStart : 'if';
Elsif : 'elsif';
IfEnd : 'endif';
UnlessStart : 'unless';
UnlessEnd : 'endunless';
Else : 'else';
Contains : 'contains';
CaseStart : 'case';
CaseEnd : 'endcase';
When : 'when';
Cycle : 'cycle';
ForStart : 'for';
ForEnd : 'endfor';
In : 'in';
And : 'and';
Or : 'or';
TableStart : 'tablerow';
TableEnd : 'endtablerow';
Assign : 'assign';
True : 'true';
False : 'false';
Nil : 'nil' | 'null';
Include : 'include';
With : 'with';
Empty : 'empty';
EndId : 'end' Id;
Id : ( Letter | '_' ) (Letter | '_' | '-' | Digit)*;
mode IN_RAW;
RawEnd : '{%' WhitespaceChar* 'endraw' -> popMode;
OtherRaw : . ;
|
test/Fail/Issue950b.agda | shlevy/agda | 1,989 | 1657 | <filename>test/Fail/Issue950b.agda
{-# OPTIONS --copatterns #-}
module Issue950b where
postulate
A : Set
record R : Set where
field
x : A
record S : Set where
field
y : A
open R
f : ?
x f = ?
-- Good error:
-- Cannot eliminate type ?0 with projection pattern x
-- when checking that the clause x f = ? has type ?0
|
smsq/q68/kbd/int.asm | olifink/smsqe | 0 | 83632 | ; Q68 Keyboard interrupt handler 1.00 (c) 2020 <NAME>
; 2020-10-27 1.01 removed debug code
; based on Keyboard Interrupt handler V2.00 1998 <NAME> QJUMP
section kbdint
xdef kbd_intr
xref kbd_at102cvt
include 'dev8_keys_q68'
include 'dev8_keys_hwt'
include 'dev8_keys_sys'
include 'dev8_smsq_kbd_keys'
include 'dev8_keys_qdos_sms'
; set up the interrupt handler
kbd_intr ; setup the interrupt "server"
lea kbd_iserve,a1 ; interrupt routine
lea kbd_xlnk,a0
move.l a1,4(a0)
moveq #sms.lexi,d0
trap #1 ; link it in
st kbd_status ; show that we use interrupts
st kbd_unlock ; keyboard may start up
rts
; the following means that this code is not rommable.
kbd_xlnk dc.l 0 ; external interrupt linkage
kbd_xiad dc.l 0 ; absolute ext. int. service routine address
;+++
; This routine handles keyboard interrupts.
;---
kbd_iserve
btst #kbd.rcv,kbd_status ; any keyboard data?
beq.s kbd_out ; ... no
moveq #0,D0
move.b kbd_code,d0 ; IBM keycode
st kbd_unlock ; acknowledge key receipt
move.l sys_klnk(a6),a3 ; set pointer to linkage
; this should clear the kbd.rcv bit in kbd_status
tst.b kb_err(a3) ; strip queue on error?
bgt.s kbd_out ; ... yes
kbd bra kbd_at102cvt ; process key code
kbd_out rts
end
|
other.7z/SFC.7z/SFC/γ½γΌγΉγγΌγΏ/MarioKart/kart-init-e.asm | prismotizm/gigaleak | 0 | 2881 | Name: kart-init-e.asm
Type: file
Size: 60322
Last-Modified: '1992-08-30T15:00:00Z'
SHA-1: 40B061155B8DCA0F170F83EEE11E3B9C30D9FE6F
Description: null
|
programs/oeis/242/A242374.asm | karttu/loda | 1 | 99380 | <reponame>karttu/loda
; A242374: Number of digits in the decimal expansion of n^8.
; 1,1,3,4,5,6,7,7,8,8,9,9,9,9,10,10,10,10,11,11,11,11,11,11,12,12,12,12,12,12,12,12,13,13,13,13,13,13,13,13,13,13,13,14,14,14,14,14,14,14,14,14,14,14,14,14,14,15,15,15,15,15,15,15,15,15,15,15
pow $0,8
add $0,1
log $0,10
mov $1,$0
add $1,1
|
courses/fundamentals_of_ada/labs/radar/040_statements/util/radar_internals.adb | AdaCore/training_material | 15 | 10454 | <reponame>AdaCore/training_material
with Ada.Text_IO; use Ada.Text_IO;
package body Radar_Internals is
T : Natural := 0;
type Angle_Degrees_T is mod 360;
Antenna_Angle : Angle_Degrees_T := 120;
type Object_Type_T is (Sarah_Connor, Peon, John_Connor);
Active_Object_Type : Object_Type_T := Sarah_Connor;
Active_Object_Status : Object_Status_T := Out_Of_Range;
Active_Object_Distance : Object_Distance_Km_T := 9.0;
Current_Walk_Speed : Speed_Setting_T;
Has_E_T_A : Boolean := False;
Time_To_Arrival : Float := 0.0;
procedure Rotate_Antenna (Speed : Speed_Setting_T) is
begin
Antenna_Angle := Antenna_Angle + (case Speed is
when Slow => 7,
when Normal => 17,
when Fast => 59,
when Stopped => 0);
end Rotate_Antenna;
procedure Walk_And_Scan is
begin
Put_Line ("Scanning " & Object_Type_T'Image (Active_Object_Type));
Get_Closer (Slow);
if Active_Object_Status = Tracked then
if Active_Object_Type = John_Connor then
Active_Object_Status := Selected;
else
Active_Object_Status := Cleared;
end if;
end if;
end Walk_And_Scan;
procedure Next_Object is
begin
Active_Object_Distance := 9.0;
Active_Object_Status := Out_Of_Range;
if Active_Object_Type = Object_Type_T'Last then
Active_Object_Type := Object_Type_T'First;
else
Active_Object_Type := Object_Type_T'Val (Object_Type_T'Pos (Active_Object_Type) + 1);
end if;
end Next_Object;
procedure Get_Closer (Speed : Speed_Setting_T) is
begin
Current_Walk_Speed := Speed;
end Get_Closer;
function Get_Active_Object_Status return Object_Status_T is
begin
return Active_Object_Status;
end Get_Active_Object_Status;
function Get_Active_Object_Distance return Object_Distance_Km_T is
begin
return Active_Object_Distance;
end Get_Active_Object_Distance;
function Get_Running_Speed return Speed_Kph_T is
begin
return (case Current_Walk_Speed is
when Stopped => 0.0,
when Slow => 4.0,
when Normal => 8.0,
when Fast => 30.0);
end Get_Running_Speed;
procedure Update_E_T_A (E_T_A : Float) is
begin
Has_E_T_A := True;
Time_To_Arrival := E_T_A;
end Update_E_T_A;
procedure Update_No_E_T_A is
begin
Has_E_T_A := False;
end Update_No_E_T_A;
procedure Time_Step is
begin
Put ("T =" & Natural'Image(T)
& " Antenna" & Angle_Degrees_T'Image (Antenna_Angle)
& "deg."& ASCII.HT & "ETA");
if Has_E_T_A then
declare
E_T_A_H : Integer
:= Integer (Float'Floor (Time_To_Arrival / 3600.0));
E_T_A_M : Integer
:= Integer (Float'Floor (Time_To_Arrival / 60.0)) mod 60;
E_T_A_S : Integer
:= Integer (Float'Rounding (Time_To_Arrival)) mod 60;
begin
Put ( Integer'Image (E_T_A_H) & "h"
& Integer'Image (E_T_A_M) & "m"
& Integer'Image (E_T_A_S) & "s");
end;
if Time_To_Arrival <= 500.0 then
Active_Object_Distance := Object_Distance_Km_T'First;
else
Active_Object_Distance := Active_Object_Distance
- Object_Distance_Km_T'Min (Active_Object_Distance - Object_Distance_Km_T'First,
Active_Object_Distance * 500.0 / Time_To_Arrival);
end if;
else
Put (" none ");
end if;
if Active_Object_Distance < 5.0 and Active_Object_Status = Out_Of_Range then
Active_Object_Status := Tracked;
end if;
Put_Line (ASCII.HT & Object_Type_T'Image (Active_Object_Type)
& " is " & Object_Status_T'Image (Active_Object_Status));
T := T + 1;
end Time_Step;
end Radar_Internals;
|
src/asis/a4g-expr_sem.adb | My-Colaborations/dynamo | 15 | 24786 | <reponame>My-Colaborations/dynamo<filename>src/asis/a4g-expr_sem.adb
------------------------------------------------------------------------------
-- --
-- ASIS-for-GNAT IMPLEMENTATION COMPONENTS --
-- --
-- A 4 G . E X P R _ S E M --
-- --
-- B o d y --
-- --
-- Copyright (C) 1995-2012, Free Software Foundation, Inc. --
-- --
-- ASIS-for-GNAT is free software; you can redistribute it and/or modify it --
-- under terms of the GNU General Public License as published by the Free --
-- Software Foundation; either version 2, or (at your option) any later --
-- version. ASIS-for-GNAT is distributed in the hope that it will be use- --
-- ful, but WITHOUT ANY WARRANTY; without even the implied warranty of MER- --
-- CHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General --
-- Public License for more details. You should have received a copy of the --
-- GNU General Public License distributed with ASIS-for-GNAT; see file --
-- COPYING. If not, write to the Free Software Foundation, 51 Franklin --
-- Street, Fifth Floor, Boston, MA 02110-1301, USA. --
-- --
-- --
-- --
-- --
-- --
-- --
-- --
-- --
-- ASIS-for-GNAT was originally developed by the ASIS-for-GNAT team at the --
-- Software Engineering Laboratory of the Swiss Federal Institute of --
-- Technology (LGL-EPFL) in Lausanne, Switzerland, in cooperation with the --
-- Scientific Research Computer Center of Moscow State University (SRCC --
-- MSU), Russia, with funding partially provided by grants from the Swiss --
-- National Science Foundation and the Swiss Academy of Engineering --
-- Sciences. ASIS-for-GNAT is now maintained by AdaCore --
-- (http://www.adac<EMAIL>). --
-- --
------------------------------------------------------------------------------
with Ada.Wide_Characters.Unicode;
with Asis.Clauses; use Asis.Clauses;
with Asis.Compilation_Units; use Asis.Compilation_Units;
with Asis.Declarations; use Asis.Declarations;
with Asis.Elements; use Asis.Elements;
with Asis.Expressions; use Asis.Expressions;
with Asis.Extensions; use Asis.Extensions;
with Asis.Iterator; use Asis.Iterator;
with Asis.Statements; use Asis.Statements;
with Asis.Set_Get; use Asis.Set_Get;
with A4G.A_Debug; use A4G.A_Debug;
with A4G.A_Output; use A4G.A_Output;
with A4G.A_Sem; use A4G.A_Sem;
with A4G.A_Stand; use A4G.A_Stand;
with A4G.A_Types; use A4G.A_Types;
with A4G.Asis_Tables; use A4G.Asis_Tables;
with A4G.Contt.UT; use A4G.Contt.UT;
with A4G.Int_Knds; use A4G.Int_Knds;
with A4G.Knd_Conv; use A4G.Knd_Conv;
with A4G.Mapping; use A4G.Mapping;
with Atree; use Atree;
with Einfo; use Einfo;
with Namet; use Namet;
with Nlists; use Nlists;
with Output; use Output;
with Sem_Aux; use Sem_Aux;
with Sinfo; use Sinfo;
with Snames; use Snames;
with Stand; use Stand;
with Types; use Types;
package body A4G.Expr_Sem is
-----------------------
-- Local subprograms --
-----------------------
function Explicit_Type_Declaration (Entity_Node : Node_Id) return Node_Id;
-- Taking the Entity node obtained as a result of some call to Etype
-- function, this function yields the node for corresponding explicit
-- type or subtype declaration. This means that this function traverses all
-- the internal types generated by the compiler.
--
-- In case of an anonymous access type, this function returns the entity
-- node which is created by the compiler for this type (there is no tree
-- type structure for the type declaration in this case), and a caller is
-- responsible for further analysis
--
-- SHOULD WE MOVE THIS FUNCTION IN THE SPEC???
function Explicit_Type_Declaration_Unwound
(Entity_Node : Node_Id;
Reference_Node : Node_Id := Empty)
return Node_Id;
-- Does the same as Explicit_Type_Declaration and unwinds all the
-- subtypings (if any), resulting in a root type declaration.
-- Reference_Node is a node representing a "place" from which this function
-- is called. If the result type is private, but from the "place" of the
-- call the full view is visible, the full view is returned. If
-- Reference_Node is Empty, no private/full view check is made
function Explicit_Type_Declaration_Unwound_Unaccess
(Entity_Node : Node_Id;
Reference_Node : Node_Id := Empty)
return Node_Id;
-- Does the same as Explicit_Type_Declaration_Unwound and in case of access
-- types goes from the access to the designated type. --???
--
-- In case of an anonymous access type returns directly designated type.
function Rewritten_Image (Selector_Name : Node_Id) return Node_Id;
pragma Unreferenced (Rewritten_Image);
-- this is an example of the tricky programming needed because of the
-- tree rewriting. The problem is, that in the original tree structure
-- for a record aggregate a N_Identifier node for a component selector
-- name does not have an Entity field set. So we have to go to the
-- corresponding (that is, to representing the same component selector
-- name) node in the rewritten structure.
--
-- It is an error to use this function for a node which is does not
-- represent a component selector name in the original tree structure
-- for a record aggregate
--
-- This function is not used now, it is replaced by Search_Record_Comp
function Search_Record_Comp (Selector_Name : Node_Id) return Entity_Id;
-- This function looks for the entity node corresponding to a name from a
-- choices list from a record or extension aggregate. The problem here is
-- that an aggregate node is rewritten, and in the original tree structure
-- the nodes corresponding to component names do not have the Entity
-- field set. This function locates the corresponding entity node by
-- detecting the aggregate type and searching the component defining
-- identifier with the same name in the record definition.
-- It might be the case (because of the absence of some semantic
-- information in the tree or because of the ASIS bug) that Selector_Name
-- actually does not represent a name from the aggregate choice list, in
-- this case this function raises Assert_Failure or (if assertions are off)
-- returns the Empty node.
function Get_Statement_Identifier (Def_Id : Node_Id) return Node_Id;
-- For Int_Node which should represent the defining identifier from an
-- implicit declaration of a label (or a statement name?) (otherwise it
-- is an error to use this function), this function returns the "defining"
-- name representing the definition of this statement identifier in the
-- ASIS sense.
function GFP_Declaration (Par_Id : Node_Id) return Node_Id;
-- this is (I hope, temporary) fix for the problem 14: the Entity
-- field is not set for N_Identifier node representing the parameter
-- name in a named generic association, so we need this function to
-- compute the Entity for such an N_Identifier node.
-- ??? what about formal parameters in associations like
-- ??? "*" => Some_Function
--
-- This function is supposed to be called for an actual representing
-- the name of a generic formal parameter in a named formal parameter
-- association (it's an error to call it for any other actual)
function Is_Explicit_Type_Component
(Comp_Def_Name : Node_Id;
Type_Decl : Node_Id)
return Boolean;
-- Expects Comp_Def_Name to be a defining identifier of a record component
-- and Type_Decl to be a type declaration. Checks if Comp_Def_Name denotes
-- a component explicitly declared by this type declaration. (This function
-- is useful for discriminants and components explicitly declared in
-- derived type declarations.
function Is_Type_Discriminant
(Discr_Node : Node_Id;
Type_Node : Node_Id)
return Boolean;
-- Assuming that Discr_Node is N_Defining_Identifier node and Type_Node
-- represents a type declaration, this function checks if Discr_Node is
-- a discriminant of this type (we cannot just use Parent to check this
-- because of tree rewriting for discriminant types.
function Full_View_Visible
(Priv_Type : Node_Id;
Ref : Node_Id)
return Boolean;
-- Assuming that Priv_Type is a node representing a private type
-- declaration, checks, that in place of Ref the full view of the type is
-- visible
function Reset_To_Full_View
(Full_View : Node_Id;
Discr : Node_Id)
return Node_Id;
-- Assuming that Full_View is the full type declaration for some private
-- type and Discr is a defining name of a discriminant of the type
-- (probably, from its private view), this function returns the defining
-- name of this discriminant in the full view
function Is_Part_Of_Defining_Unit_Name (Name_Node : Node_Id) return Boolean;
-- Assuming that Name_Node is of N_Identifier kind, this function checks,
-- if it is a part of a defining program unit name
function Reset_To_Spec (Name_Node : Node_Id) return Node_Id;
-- Assuming that Name_Node is a part of a defining unit name which in turn
-- is a part of a compilation unit body (for such nodes Entity field is not
-- set), this function resets it to the node pointing to the same part of
-- the defining unit name, but in the spec of the corresponding library
-- unit
function Reference_Kind
(Name : Asis.Element)
return Internal_Element_Kinds;
-- If Name is of A_Defining_Name kind then this function returns the kind
-- of An_Expression elements which may be simple-name-form references to
-- the given name (that is, A_Defining_Identifier -> An_Identifier,
-- A_Defining_And_Operator -> An_And_Operator), otherwise returns
-- Not_An_Element. Note, that the result can never be
-- A_Selected_Component, because only references which are simple names
-- are considered.
function Get_Specificed_Component
(Comp : Node_Id;
Rec_Type : Entity_Id)
return Entity_Id;
-- Provided that Comp is the reference to a record component from the
-- component clause being a component of a record representation clause
-- for the record type Rec_Type, this function computes the corresponding
-- component entity
function Get_Entity_From_Long_Name (N : Node_Id) return Entity_Id;
-- Supposing that N denotes some component of a long expanded name
-- and for N and for its prefix the Entity fields are not set, this
-- function computes the corresponding entity node by traversing
-- the "chain" of definitions corresponding to this expanded name
function Get_Rewritten_Discr_Ref (N : Node_Id) return Node_Id;
pragma Unreferenced (Get_Rewritten_Discr_Ref);
-- This function is supposed to be called for a discriminant reference
-- from the discriminant constraint from derived type, in case if the
-- parent type is a task or protected type. In this case
-- N_Subtype_Indication node from the derived type definition is rewritten
-- in a subtype mark pointing to the internal subtype. The original
-- structure is not decorated, so we have to go to the corresponding
-- node in the definition of this internal subtype to get the semantic
-- information. See F407-011
-- Do we need this after fixing the regression caused by K120-031
function Get_Discriminant_From_Type (N : Node_Id) return Entity_Id;
-- Starting from the reference to discriminant in a discriminant
-- constraint, tries to compute the corresponding discriminant entity by
-- getting to the declaration of the corresponding type and traversing
-- its discriminant part.
function Is_Limited_Withed
(E : Entity_Id;
Reference : Asis.Element)
return Boolean;
-- Assuming that Reference is an_Identifier Element and E is the entity
-- node for the entity denoted by Reference, checks if this entity is
-- defined in a compilation unit that is limited withed by the unit
-- containing Reference
function To_Upper_Case (S : Wide_String) return Wide_String;
-- Folds the argument to upper case, may be used for string normalization
-- before comparing strings if the casing is not important for comparing
-- (Copied from ASIS_UL.Misc to avoid dependencies on ASIS UL in "pure"
-- ASIS.
---------------------------------------
-- Character_Literal_Name_Definition --
---------------------------------------
function Character_Literal_Name_Definition
(Reference_Ch : Element)
return Asis.Defining_Name
is
-- for now, the code is very similar to the code
-- for Identifier_Name_Definition. Any aggregation has been
-- put off till everything will work
Arg_Node : Node_Id;
Special_Case : Special_Cases := Not_A_Special_Case;
Result_Element : Asis.Defining_Name := Nil_Element;
Is_Inherited : Boolean := False;
Association_Type : Node_Id := Empty;
Set_Char_Code : Boolean := False;
Result_Node : Node_Id;
Result_Unit : Compilation_Unit;
Result_Kind : constant Internal_Element_Kinds :=
A_Defining_Character_Literal;
begin
-- We have to distinguish and to treat separately four (???)
-- different situations:
--
-- 1. a literal from user-defined character type (fully implemented
-- for now);
--
-- 2. a literal from a type derived from some user-defined character
-- type (not implemented for now as related to Implicit Elements);
--
-- 3. a literal from a character type defined in Standard (not
-- implemented for now);
--
-- 4. a literal from a type derived a character type defined in
-- Standard (not implemented for now as related to Implicit
-- Elements);
Arg_Node := Node (Reference_Ch);
-- if Reference_Ch is a Selector_Name in some N_Expanded_Name,
-- the corresponding Entity field is set not for the Node on which
-- this Reference_En is based, but for the whole expanded name.
-- (The same for Etype) So:
if Nkind (Parent (Arg_Node)) = N_Expanded_Name or else
Nkind (Parent (Arg_Node)) = N_Character_Literal
then
-- the last alternative of the condition corresponds to an expanded
-- name of a predefined character literal or to an expanded name
-- of a literal of a type derived from a predefined character type -
-- such an expanded name is rewritten into (another) "instance"
-- of the same literal
Arg_Node := Parent (Arg_Node);
end if;
Result_Node := Entity (Arg_Node);
-- will be Empty for any character literal belonging to
-- Standard.Character, Standard.Whide_Character or any type
-- derived (directly or indirectly) from any of these types
Association_Type := Etype (Arg_Node);
if No (Result_Node) and then
No (Association_Type) and then
Is_From_Unknown_Pragma (R_Node (Reference_Ch))
then
return Nil_Element;
end if;
if No (Association_Type) then
-- this may be the case if some character literals are
-- rewritten into a string constant
Association_Type := Arg_Node;
while Present (Association_Type) loop
exit when Nkind (Association_Type) = N_String_Literal;
Association_Type := Parent (Association_Type);
end loop;
pragma Assert (Present (Association_Type));
Association_Type := Etype (Association_Type);
Association_Type := Component_Type (Association_Type);
end if;
Association_Type := Explicit_Type_Declaration_Unwound (Association_Type);
if No (Result_Node) then
Set_Char_Code := True;
Result_Node := Association_Type;
Result_Node := Sinfo.Type_Definition (Result_Node);
if Char_Defined_In_Standard (Arg_Node) then
Special_Case := Stand_Char_Literal;
else
Is_Inherited := True;
end if;
elsif not Comes_From_Source (Result_Node) then
Is_Inherited := True;
end if;
if Char_Defined_In_Standard (Arg_Node) then
Result_Unit := Get_Comp_Unit
(Standard_Id, Encl_Cont_Id (Reference_Ch));
else
Result_Unit := Enclosing_Unit
(Encl_Cont_Id (Reference_Ch), Result_Node);
end if;
Result_Element := Node_To_Element_New
(Node => Result_Node,
Node_Field_1 => Association_Type,
Internal_Kind => Result_Kind,
Spec_Case => Special_Case,
Inherited => Is_Inherited,
In_Unit => Result_Unit);
if Set_Char_Code then
Set_Character_Code (Result_Element, Character_Code (Reference_Ch));
end if;
return Result_Element;
end Character_Literal_Name_Definition;
---------------------------------
-- Collect_Overloaded_Entities --
---------------------------------
procedure Collect_Overloaded_Entities (Reference : Asis.Element) is
Arg_Node : Node_Id;
Arg_Pragma_Chars : Name_Id;
Next_Entity : Entity_Id;
Result_Unit : Asis.Compilation_Unit;
Result_Context : constant Context_Id := Encl_Cont_Id (Reference);
Res_Node : Node_Id;
Res_NF_1 : Node_Id;
Res_Ekind : Entity_Kind;
Res_Inherited : Boolean;
Is_Program_Unit_Pragma : Boolean := False;
Enclosing_Scope_Entity : Entity_Id;
Enclosing_List : List_Id;
function Should_Be_Collected (Ent : Entity_Id) return Boolean;
-- When traversing the chain of homonyms potentially referred by
-- Reference, it checks if Ent should be used to create the next
-- Element in the Result list
function Should_Be_Collected (Ent : Entity_Id) return Boolean is
Result : Boolean := False;
N : Node_Id;
begin
if not (Ekind (Ent) = E_Operator and then
Is_Predefined (Ent))
then
if Is_Program_Unit_Pragma then
Result := Scope (Ent) = Enclosing_Scope_Entity;
else
N := Parent (Ent);
while Present (N) and then
not (Is_List_Member (N))
loop
N := Parent (N);
end loop;
if Present (N) and then Is_List_Member (N) then
Result := List_Containing (N) = Enclosing_List;
end if;
end if;
end if;
return Result;
end Should_Be_Collected;
begin
-- First, we decide what kind of pragma we have, because the search
-- depends on this:
Arg_Node := Node (Reference);
Arg_Pragma_Chars := Pragma_Name (Parent (Parent (Arg_Node)));
if Arg_Pragma_Chars = Name_Inline then
Is_Program_Unit_Pragma := True;
-- ??? is it enough? what about GNAT-specific pragmas?
-- In this case we have to search in the same declarative region
-- (in the same scope):
Enclosing_Scope_Entity := Scope (Entity (Arg_Node));
-- This is no more than a trick: actually, we have to compute
-- the scope node for the declarative region which encloses
-- Arg_Node, but entry bodies makes a serious problem (at the
-- moment of writing this code there is no semantic links between
-- protected entry declarations and bodies). So we just assume
-- that Arg_Node has the Entity field set, and this field
-- points to some correct (from the point of view of
-- Corresponding_Name_Definition_List query) entity, so we
-- just take the Scope of this entity...
else
Enclosing_List := List_Containing (Parent (Parent (Arg_Node)));
end if;
Next_Entity := Entity (Arg_Node);
while Present (Next_Entity) and then
Should_Be_Collected (Next_Entity)
loop
Result_Unit := Enclosing_Unit (Result_Context, Next_Entity);
Res_Ekind := Ekind (Next_Entity);
if Res_Ekind in Subprogram_Kind then
if Comes_From_Source (Next_Entity) then
Res_Node := Next_Entity;
Res_NF_1 := Empty;
Res_Inherited := False;
else
Res_Node := Alias (Next_Entity);
while Present (Alias (Res_Node)) loop
Res_Node := Alias (Res_Node);
end loop;
Res_NF_1 := Next_Entity;
Res_Inherited := True;
end if;
Asis_Element_Table.Append
(Node_To_Element_New (Node => Res_Node,
Node_Field_1 => Res_NF_1,
Inherited => Res_Inherited,
In_Unit => Result_Unit));
end if;
Next_Entity := Homonym (Next_Entity);
end loop;
end Collect_Overloaded_Entities;
---------------------------
-- Correct_Impl_Form_Par --
---------------------------
procedure Correct_Impl_Form_Par
(Result : in out Element;
Reference : Element)
is
Res_Node : Node_Id := Node (Result);
Subprogram_Name : Element;
Subprogram_Node : Node_Id := Node (Result);
Res_Sloc : Source_Ptr;
Top_Node : Node_Id;
Result_Unit : Compilation_Unit;
begin
Res_Node := Defining_Identifier (Parent (Res_Node));
Subprogram_Name := Enclosing_Element (Enclosing_Element (Reference));
case Int_Kind (Subprogram_Name) is
when A_Function_Call =>
Subprogram_Name := Prefix (Subprogram_Name);
when A_Procedure_Call_Statement |
An_Entry_Call_Statement =>
Subprogram_Name := Called_Name (Subprogram_Name);
when others =>
null;
pragma Assert (False);
end case;
Subprogram_Node := Node (Subprogram_Name);
Subprogram_Node := Associated_Node (Subprogram_Node);
Top_Node := Parent (Subprogram_Node);
while Nkind (Top_Node) /= N_Compilation_Unit loop
Top_Node := Parent (Top_Node);
end loop;
Res_Sloc := Sloc (Res_Node) - Sloc (Top_Node);
Result_Unit :=
Enclosing_Unit (Encl_Cont_Id (Reference), Subprogram_Node);
Set_Node (Result, Res_Node);
Set_R_Node (Result, Res_Node);
Set_From_Implicit (Result, True);
Set_From_Inherited (Result, True);
Set_From_Instance (Result, Is_From_Instance (Subprogram_Node));
Set_Node_Field_1 (Result, Subprogram_Node);
Set_Rel_Sloc (Result, Res_Sloc);
Set_Encl_Unit_Id (Result, Get_Unit_Id (Result_Unit));
end Correct_Impl_Form_Par;
--------------------
-- Correct_Result --
--------------------
procedure Correct_Result
(Result : in out Element;
Reference : Element)
is
Enclosing_Generic : Element := Nil_Element;
Tmp : Element;
Tmp_Generic : Element;
Is_From_Body : Boolean := False;
Instance : Element := Nil_Element;
procedure Check_Number_Name
(Element : Asis.Element;
Control : in out Traverse_Control;
State : in out No_State);
-- Check if the argument is the defining name of the named number
-- defining the same named number as Result, but in the template.
-- As soon as the check is successful, replace Result with this
-- defining name and terminates the traversal
Control : Traverse_Control := Continue;
State : No_State := Not_Used;
procedure Traverse_Instance is new Traverse_Element
(State_Information => No_State,
Pre_Operation => Check_Number_Name,
Post_Operation => No_Op);
procedure Check_Number_Name
(Element : Asis.Element;
Control : in out Traverse_Control;
State : in out No_State)
is
pragma Unreferenced (State);
El_Kind : constant Internal_Element_Kinds := Int_Kind (Element);
begin
case El_Kind is
when A_Defining_Identifier =>
if Int_Kind (Enclosing_Element (Element)) in
An_Integer_Number_Declaration .. A_Real_Number_Declaration
and then
Chars (Node (Result)) = Chars (Node (Element))
then
Result := Element;
Control := Terminate_Immediately;
end if;
when An_Integer_Number_Declaration |
A_Real_Number_Declaration |
A_Procedure_Body_Declaration |
A_Function_Body_Declaration |
A_Package_Declaration |
A_Package_Body_Declaration |
A_Task_Body_Declaration |
A_Protected_Body_Declaration |
An_Entry_Body_Declaration |
A_Generic_Package_Declaration |
A_Block_Statement =>
null;
when others =>
Control := Abandon_Children;
end case;
end Check_Number_Name;
begin
-- First, check if Result is declared in a template
Tmp := Enclosing_Element (Result);
while not Is_Nil (Tmp) loop
if Int_Kind (Tmp) in An_Internal_Generic_Declaration
or else
(Int_Kind (Tmp) in A_Procedure_Body_Declaration ..
A_Package_Body_Declaration
and then
Int_Kind (Corresponding_Declaration (Tmp)) in
An_Internal_Generic_Declaration)
then
if Int_Kind (Tmp) in A_Procedure_Body_Declaration ..
A_Package_Body_Declaration
then
Enclosing_Generic := Corresponding_Declaration (Tmp);
Is_From_Body := True;
else
Enclosing_Generic := Tmp;
end if;
exit;
end if;
Tmp := Enclosing_Element (Tmp);
end loop;
if Is_Nil (Enclosing_Generic) then
-- No need to correct anything!
return;
end if;
-- Now, traversing the instantiation chain from the Reference, looking
-- for the instantiation of Enlosing_Generic:
Tmp := Enclosing_Element (Reference);
while not Is_Nil (Tmp) loop
if Int_Kind (Tmp) in An_Internal_Generic_Instantiation then
Tmp_Generic := Generic_Unit_Name (Tmp);
if Int_Kind (Tmp_Generic) = A_Selected_Component then
Tmp_Generic := Selector (Tmp_Generic);
end if;
Tmp_Generic := Corresponding_Name_Declaration (Tmp_Generic);
if Is_Equal (Enclosing_Generic, Tmp_Generic) then
Instance := Tmp;
exit;
end if;
end if;
Tmp := Enclosing_Element (Tmp);
end loop;
if Is_Nil (Instance) then
-- No need to correct anything - we do not have a nested generics!
return;
end if;
-- And now we have to find the "image' of Result in expanded Instance
if Is_From_Body then
Instance := Corresponding_Body (Instance);
else
Instance := Corresponding_Declaration (Instance);
end if;
Traverse_Instance (Instance, Control, State);
end Correct_Result;
-------------------------------
-- Explicit_Type_Declaration --
-------------------------------
function Explicit_Type_Declaration (Entity_Node : Node_Id) return Node_Id is
Next_Node : Node_Id;
Result_Node : Node_Id;
Res_Ekind : Entity_Kind;
function Is_Explicit_Type_Declaration
(Type_Entity_Node : Node_Id)
return Boolean;
-- checks if Type_Entity_Node corresponds to the explicit type
-- declaration which is looked for (that is, the needed type declaration
-- node is Parent (Type_Entity_Node) )
function Is_Explicit_Type_Declaration
(Type_Entity_Node : Node_Id)
return Boolean
is
Type_Decl_Node : constant Node_Id := Parent (Type_Entity_Node);
Type_Decl_Nkind : Node_Kind;
Is_Full_Type_Decl : Boolean := False;
Is_Derived_Type_Decl : Boolean := False;
Is_Formal_Type_Decl : Boolean := False;
begin
if not Is_Itype (Entity_Node)
and then
Present (Type_Decl_Node)
then
Is_Full_Type_Decl :=
Comes_From_Source (Type_Decl_Node) and then
(not Is_Rewrite_Substitution (Type_Decl_Node));
if not Is_Full_Type_Decl and then
Is_Rewrite_Substitution (Type_Decl_Node)
then
-- The second part of the condition is common for all the cases
-- which require special analysis
Type_Decl_Nkind := Nkind (Type_Decl_Node);
Is_Derived_Type_Decl :=
(Type_Decl_Nkind = N_Subtype_Declaration or else
Type_Decl_Nkind = N_Full_Type_Declaration or else
Type_Decl_Nkind = N_Formal_Type_Declaration)
and then
(Nkind (Original_Node (Type_Decl_Node)) =
N_Full_Type_Declaration and then
Nkind (Sinfo.Type_Definition (Original_Node (Type_Decl_Node)))
= N_Derived_Type_Definition);
if not Is_Derived_Type_Decl then
Is_Formal_Type_Decl :=
(Type_Decl_Nkind = N_Private_Extension_Declaration
or else
Type_Decl_Nkind = N_Full_Type_Declaration)
and then
Nkind (Original_Node (Type_Decl_Node)) =
N_Formal_Type_Declaration;
end if;
end if;
end if;
return Is_Full_Type_Decl or else
Is_Derived_Type_Decl or else
Is_Formal_Type_Decl;
end Is_Explicit_Type_Declaration;
begin
-- well, here we have a (sub)type entity node passed as an actual...
-- the aim is to return the _explicit_ type declaration corresponding
-- to this (sub)type entity. It should be such a declaration, if this
-- function is called...
--
-- We try to organize the processing in a recursive way - may be,
-- not the most effective one, but easy-to maintain
if Is_Explicit_Type_Declaration (Entity_Node) then
-- the first part of the condition is the protection from
-- non-accurate settings of Comes_From_Source flag :((
Result_Node := Parent (Entity_Node);
elsif Sloc (Entity_Node) <= Standard_Location then
-- here we have a predefined type declared in Standard.
-- it may be the type entity or the entity for its 'Base
-- type. In the latter case we have to go to the type
-- entity
if Present (Parent (Entity_Node)) then
-- type entity, therefore simply
Result_Node := Parent (Entity_Node);
else
-- 'Base type, so we have to compute the first named
-- type. The code which does it looks tricky, but for now we
-- do not know any better solution:
Result_Node := Parent (Parent (Scalar_Range (Entity_Node)));
end if;
elsif Etype (Entity_Node) = Entity_Node and then
Present (Associated_Node_For_Itype (Entity_Node)) and then
Nkind (Associated_Node_For_Itype (Entity_Node)) =
N_Object_Declaration
then
-- this corresponds to an anonymous array subtype created by an
-- object declaration with array_type_definition
Result_Node := Empty;
else
-- Entity_Node corresponds to some internal or implicit type created
-- by the compiler. Here we have to traverse the tree till the
-- explicit type declaration being the cause for generating this
-- implicit type will be found
Res_Ekind := Ekind (Entity_Node);
if Res_Ekind = E_Anonymous_Access_Type then
-- There is no type declaration node in this case at all,
-- so we just return this N_Defining_Identifier node for
-- further analysis in the calling context:
return Entity_Node;
-- ??? Why do not we return Empty in this case???
elsif Res_Ekind = E_Anonymous_Access_Subprogram_Type then
-- No explicit type declaration, so
return Empty;
elsif Res_Ekind = E_String_Literal_Subtype
or else
(Res_Ekind = E_Array_Subtype
and then
Present (Parent (Entity_Node)))
then
-- The first part of the condition corresponds to a special case
-- E_String_Literal_Subtype is created for, see Einfo (spec) for
-- the details. The second part corresponds to the access to
-- string type, see E626-002
Result_Node := Parent (Etype (Entity_Node));
if No (Result_Node) then
Result_Node := Associated_Node_For_Itype (Etype (Entity_Node));
end if;
elsif Ekind (Entity_Node) = E_Enumeration_Type then
if Present (Associated_Node_For_Itype (Entity_Node)) then
Result_Node := Associated_Node_For_Itype (Entity_Node);
else
-- Entity_Node represents an implicit type created for
-- a derived enumeration type. we have to go down to this
-- derived type
Result_Node := Parent (Entity_Node);
while Present (Result_Node) loop
Result_Node := Next (Result_Node);
exit when Nkind (Result_Node) = N_Subtype_Declaration
and then
Is_Rewrite_Substitution (Result_Node);
end loop;
end if;
pragma Assert (Present (Result_Node));
elsif (No (Parent (Entity_Node)) or else
not Comes_From_Source (Parent (Entity_Node)))
and then
Etype (Entity_Node) /= Entity_Node
and then
not (Ekind (Entity_Node) = E_Floating_Point_Type or else
Ekind (Entity_Node) = E_Signed_Integer_Type or else
Ekind (Entity_Node) = E_Array_Type or else
Ekind (Entity_Node) = E_Private_Type or else
Ekind (Entity_Node) = E_Limited_Private_Type)
then
if Is_Itype (Entity_Node)
and then
Nkind (Associated_Node_For_Itype (Entity_Node)) =
N_Subtype_Declaration
then
Next_Node :=
Defining_Identifier (Associated_Node_For_Itype (Entity_Node));
if Next_Node = Entity_Node then
Next_Node := Etype (Entity_Node);
end if;
else
-- subtypes created for objects when an explicit constraint
-- presents in the object declaration ???
Next_Node := Etype (Entity_Node);
end if;
Result_Node := Explicit_Type_Declaration (Next_Node);
else
Next_Node := Associated_Node_For_Itype (Entity_Node);
pragma Assert (Present (Next_Node));
if Nkind (Original_Node (Next_Node)) = N_Full_Type_Declaration
or else
Nkind (Original_Node (Next_Node)) = N_Formal_Type_Declaration
then
Result_Node := Next_Node;
elsif Nkind (Next_Node) = N_Loop_Parameter_Specification then
-- here we have to traverse the loop parameter specification,
-- because otherwise we may get the base type instead of
-- the actually needed named subtype.
Result_Node := Next_Node;
Result_Node := Sinfo.Discrete_Subtype_Definition (Result_Node);
case Nkind (Result_Node) is
when N_Subtype_Indication =>
Result_Node := Sinfo.Subtype_Mark (Result_Node);
Result_Node := Parent (Entity (Result_Node));
when N_Identifier | N_Expanded_Name =>
Result_Node := Parent (Entity (Result_Node));
when N_Range =>
-- and here we have to use the Etype field of
-- the implicit type itself, because we do not have
-- any type mark to start from in the loop parameter
-- specification:
Result_Node := Explicit_Type_Declaration
(Etype (Entity_Node));
when others =>
null;
pragma Assert (False);
-- this is definitely wrong! Should be corrected
-- during debugging!!!
end case;
else
if Etype (Entity_Node) /= Entity_Node then
-- otherwise we will be in dead circle
Result_Node := Etype (Entity_Node);
Result_Node := Explicit_Type_Declaration (Result_Node);
else
-- for now, the only guess is that we have an object
-- defined by an object declaration with constrained
-- array definition, or an initialization expression
-- from such a declaration
pragma Assert (
Nkind (Next_Node) = N_Object_Declaration and then
Nkind (Object_Definition (Next_Node)) =
N_Constrained_Array_Definition);
return Empty;
-- what else could we return here?
end if;
end if;
end if;
end if;
return Result_Node;
end Explicit_Type_Declaration;
---------------------------------------
-- Explicit_Type_Declaration_Unwound --
---------------------------------------
function Explicit_Type_Declaration_Unwound
(Entity_Node : Node_Id;
Reference_Node : Node_Id := Empty)
return Node_Id
is
Result_Node : Node_Id;
Subtype_Mark_Node : Node_Id;
begin
Result_Node := Explicit_Type_Declaration (Entity_Node);
while Nkind (Original_Node (Result_Node)) = N_Subtype_Declaration loop
Subtype_Mark_Node :=
Sinfo.Subtype_Indication (Original_Node (Result_Node));
if Nkind (Subtype_Mark_Node) = N_Subtype_Indication then
Subtype_Mark_Node := Sinfo.Subtype_Mark (Subtype_Mark_Node);
end if;
Result_Node := Explicit_Type_Declaration (Entity (Subtype_Mark_Node));
end loop;
if Present (Reference_Node) and then
(Nkind (Original_Node (Result_Node)) = N_Private_Type_Declaration
or else
Nkind (Original_Node (Result_Node)) =
N_Private_Extension_Declaration)
and then
Full_View_Visible (Result_Node, Reference_Node)
then
Result_Node := Parent (Full_View (Defining_Identifier (Result_Node)));
end if;
return Result_Node;
end Explicit_Type_Declaration_Unwound;
------------------------------------------------
-- Explicit_Type_Declaration_Unwound_Unaccess --
------------------------------------------------
function Explicit_Type_Declaration_Unwound_Unaccess
(Entity_Node : Node_Id;
Reference_Node : Node_Id := Empty)
return Node_Id
is
Result_Node : Node_Id;
Subtype_Mark_Node : Node_Id;
Tmp : Node_Id;
begin
Result_Node := Explicit_Type_Declaration_Unwound (
Entity_Node, Reference_Node);
if Nkind (Result_Node) = N_Defining_Identifier and then
Ekind (Result_Node) = E_Anonymous_Access_Type
then
Result_Node := Explicit_Type_Declaration_Unwound (
Directly_Designated_Type (Result_Node), Reference_Node);
end if;
-- This loop unwinds accessing^
while (Nkind (Original_Node (Result_Node)) = N_Full_Type_Declaration
and then
Nkind (Sinfo.Type_Definition (Original_Node (Result_Node))) =
N_Access_To_Object_Definition)
or else
(Nkind (Original_Node (Result_Node)) = N_Formal_Type_Declaration
and then
Nkind (Sinfo.Formal_Type_Definition (Original_Node (
Result_Node))) = N_Access_To_Object_Definition)
loop
Subtype_Mark_Node := Original_Node (Result_Node);
if Nkind (Subtype_Mark_Node) = N_Full_Type_Declaration then
Subtype_Mark_Node := Sinfo.Subtype_Indication (
Sinfo.Type_Definition (Subtype_Mark_Node));
else
Subtype_Mark_Node := Sinfo.Subtype_Indication (
Sinfo.Formal_Type_Definition (Subtype_Mark_Node));
end if;
if Nkind (Subtype_Mark_Node) = N_Subtype_Indication then
Subtype_Mark_Node := Sinfo.Subtype_Mark (Subtype_Mark_Node);
end if;
Result_Node := Explicit_Type_Declaration_Unwound (
Entity (Subtype_Mark_Node), Reference_Node);
if Nkind (Result_Node) = N_Incomplete_Type_Declaration then
-- To be 100% honest, we have to check that at place of
-- Reference_Node the full view is visible. But we could hardly
-- call this routine (for a legal code) if we do not see the full
-- view from Reference_Node.
Tmp := Full_View (Defining_Identifier (Result_Node));
if Present (Tmp) then
Result_Node := Parent (Tmp);
end if;
end if;
end loop;
-- If we have a type derived from an access type, we have to go through
-- this derivation and unwind accessing
if Nkind (Result_Node) = N_Full_Type_Declaration
and then
Nkind (Sinfo.Type_Definition (Result_Node)) =
N_Derived_Type_Definition
then
Tmp := Defining_Identifier (Result_Node);
if Ekind (Tmp) in Access_Kind then
Result_Node :=
Explicit_Type_Declaration_Unwound_Unaccess
(Directly_Designated_Type (Tmp),
Reference_Node);
end if;
end if;
return Result_Node;
end Explicit_Type_Declaration_Unwound_Unaccess;
---------------
-- Expr_Type --
---------------
function Expr_Type (Expression : Asis.Expression) return Asis.Declaration is
Arg_Node : Node_Id;
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Expression);
Result_Entity : Node_Id;
Result_Node : Node_Id;
Result_Unit : Compilation_Unit;
Res_Spec_Case : Special_Cases := Not_A_Special_Case;
Encl_Cont : constant Context_Id := Encl_Cont_Id (Expression);
begin
-- first, we should check whether Expression has a universal
-- numeric type and return the corresponding ASIS universal type.
-- For now, this check includes numeric literals and some of the
-- attribute references is:
if Arg_Kind = An_Integer_Literal or else
Arg_Kind = An_Alignment_Attribute or else
Arg_Kind = A_Component_Size_Attribute or else
Arg_Kind = A_Digits_Attribute or else
Arg_Kind = A_Count_Attribute or else
Arg_Kind = An_Exponent_Attribute or else
Arg_Kind = A_First_Bit_Attribute or else
Arg_Kind = A_Fore_Attribute or else
Arg_Kind = A_Last_Bit_Attribute or else
Arg_Kind = A_Length_Attribute or else
Arg_Kind = A_Machine_Emax_Attribute or else
Arg_Kind = A_Machine_Emin_Attribute or else
Arg_Kind = A_Machine_Mantissa_Attribute or else
Arg_Kind = A_Machine_Radix_Attribute or else
Arg_Kind = A_Max_Size_In_Storage_Elements_Attribute or else
Arg_Kind = A_Model_Emin_Attribute or else
Arg_Kind = A_Model_Mantissa_Attribute or else
Arg_Kind = A_Modulus_Attribute or else
Arg_Kind = A_Partition_ID_Attribute or else
Arg_Kind = A_Pos_Attribute or else
Arg_Kind = A_Position_Attribute or else
Arg_Kind = A_Scale_Attribute or else
Arg_Kind = A_Size_Attribute or else
Arg_Kind = A_Storage_Size_Attribute or else
Arg_Kind = A_Wide_Width_Attribute or else
Arg_Kind = A_Width_Attribute or else
(Special_Case (Expression) = Rewritten_Named_Number
and then Nkind (R_Node (Expression)) = N_Integer_Literal)
then
return Set_Root_Type_Declaration
(A_Universal_Integer_Definition,
Encl_Cont);
elsif Arg_Kind = A_Real_Literal or else
Arg_Kind = A_Delta_Attribute or else
Arg_Kind = A_Model_Epsilon_Attribute or else
Arg_Kind = A_Model_Small_Attribute or else
Arg_Kind = A_Safe_First_Attribute or else
Arg_Kind = A_Safe_Last_Attribute or else
Arg_Kind = A_Small_Attribute or else
(Special_Case (Expression) = Rewritten_Named_Number
and then Nkind (R_Node (Expression)) = N_Real_Literal)
then
return Set_Root_Type_Declaration
(A_Universal_Real_Definition,
Encl_Cont);
end if;
Arg_Node := Node (Expression);
-- In some cases we have to use the rewritten node
if Is_Rewrite_Substitution (R_Node (Expression)) and then
(Nkind (Arg_Node) = N_Aggregate and then
Nkind (R_Node (Expression)) = N_String_Literal)
then
Arg_Node := R_Node (Expression);
end if;
while Nkind (Arg_Node) = N_String_Literal
and then
Nkind (Parent (Arg_Node)) = N_String_Literal
loop
-- Trick for F109-A24: for string literals in a static expression,
-- Etype points to some dummy subtype node (the tree structure is
-- rewritten for the whole expression, and the original subtree is
-- not fully decorated), so we take the type information from the
-- rewritten result of the expression
Arg_Node := Parent (Arg_Node);
end loop;
-- if the expression node is rewritten, all the semantic
-- information can be found only through the rewritten node
if Nkind (Parent (Arg_Node)) = N_Expanded_Name and then
Arg_Node = Selector_Name (Parent (Arg_Node))
then
-- selector in an expanded name - all the semantic fields
-- are set for the whole name, but not for this selector.
-- So:
Arg_Node := Parent (Arg_Node);
end if;
-- ??? <tree problem 1>
-- this fragment should be revised when the problem is fixed (as it should)
if Nkind (Arg_Node) = N_Selected_Component then
if Etype (Arg_Node) = Any_Type then
-- for now (GNAT 3.05) this means, that Expression is an expanded
-- name of the character literal of ether a predefined character
-- type or of the type derived from a predefined character type
Arg_Node := R_Node (Expression);
-- resetting Arg_Node pointing to the rewritten node for the
-- expanded name
--
-- ???
-- This looks strange... Should be revised
else
Arg_Node := Selector_Name (Arg_Node);
-- here the actual type is!
end if;
elsif Nkind (Arg_Node) = N_Character_Literal and then
No (Etype (Arg_Node))
-- for now (GNAT 3.05) this means, that Expression is the
-- selector in an expanded name of the character literal of
-- ether a predefined character type or of the type derived
-- from a predefined character type
then
Arg_Node := Parent (Arg_Node);
-- resetting Arg_Node pointing to the rewritten node for the whole
-- expanded name
end if;
-- ??? <tree problem 1> - end
-- now the idea is to take the Etype attribute of the expression
-- and to go to the corresponding type declaration. But
-- special processing for computing the right Etype is
-- required for some cases
if Nkind (Parent (Arg_Node)) = N_Qualified_Expression and then
Arg_Node = Sinfo.Expression (Parent (Arg_Node))
then
Result_Entity := Etype (Sinfo.Subtype_Mark (Parent (Arg_Node)));
-- we'll keep the commented code below for a while...
-- elsif (Arg_Kind = A_First_Attribute or else
-- Arg_Kind = A_Last_Attribute)
-- and then not Comes_From_Source (Etype (Arg_Node))
-- and then Sloc (Etype (Arg_Node)) > Standard_Location
-- and then Etype (Etype (Arg_Node)) = Etype (Arg_Node)
-- then
-- -- this tricky condition corresponds to the situation, when
-- -- 'First or 'Last attribute is applied to a formal discrete
-- -- type @:-(
-- -- In this case we simply use the attribute prefix to define
-- -- the result type
-- Result_Entity := Etype (Prefix (Arg_Node));
else
-- how nice it would be if *everything* would be so simple
Result_Entity := Etype (Arg_Node);
end if;
if Result_Entity = Any_Composite then
-- Here we have an aggregate in some original tree structure that has
-- not been properly decorated. All the semantic decorations are in
-- the corresponding rewritten structure, so we have to find the
-- corresponding node there.
declare
Tmp : Node_Id;
New_Arg_Node : Node_Id := Empty;
Arg_Kind : constant Node_Kind := Nkind (Arg_Node);
Arg_Sloc : constant Source_Ptr := Sloc (Arg_Node);
function Find (Node : Node_Id) return Traverse_Result;
-- Check if its argument represents the same construct as
-- Arg_Node, and if it does, stores Node in New_Arg_Node and
-- returns Abandon, otherwise returns OK.
procedure Find_Rewr_Aggr is new Traverse_Proc (Find);
function Find (Node : Node_Id) return Traverse_Result is
begin
if Nkind (Node) = Arg_Kind
and then
Sloc (Node) = Arg_Sloc
then
New_Arg_Node := Node;
return Abandon;
else
return OK;
end if;
end Find;
begin
Tmp := Parent (Arg_Node);
while not Is_Rewrite_Substitution (Tmp) loop
Tmp := Parent (Tmp);
end loop;
Find_Rewr_Aggr (Tmp);
pragma Assert (Present (New_Arg_Node));
Result_Entity := Etype (New_Arg_Node);
end;
end if;
Result_Node := Explicit_Type_Declaration (Result_Entity);
if No (Result_Node) then
return Nil_Element;
-- we cannot represent the type declaration in ASIS;
-- for example, an object defined by an object declaration
-- with constrained array definition
end if;
if Sloc (Result_Entity) <= Standard_Location then
Result_Unit := Get_Comp_Unit
(Standard_Id, Encl_Cont_Id (Expression));
Res_Spec_Case := Explicit_From_Standard;
else
Result_Unit := Enclosing_Unit
(Encl_Cont_Id (Expression), Result_Node);
end if;
return Node_To_Element_New (Node => Result_Node,
Spec_Case => Res_Spec_Case,
In_Unit => Result_Unit);
end Expr_Type;
-----------------------
-- Full_View_Visible --
-----------------------
function Full_View_Visible
(Priv_Type : Node_Id;
Ref : Node_Id)
return Boolean
is
Type_Scope : constant Node_Id :=
Scope (Defining_Identifier (Priv_Type));
Type_Scope_Body : Node_Id;
Type_Full_View : Node_Id;
Scope_Node : Node_Id := Empty;
Next_Node : Node_Id := Parent (Ref);
Next_Node_Inner : Node_Id := Ref;
Result : Boolean := False;
begin
Type_Scope_Body := Parent (Type_Scope);
if Nkind (Type_Scope_Body) = N_Defining_Program_Unit_Name then
Type_Scope_Body := Parent (Type_Scope_Body);
end if;
Type_Scope_Body := Corresponding_Body (Parent (Type_Scope_Body));
if Nkind (Parent (Type_Scope_Body)) = N_Defining_Program_Unit_Name then
Type_Scope_Body := Parent (Type_Scope_Body);
end if;
while Present (Next_Node) loop
if (Nkind (Next_Node) = N_Package_Specification and then
Defining_Unit_Name (Next_Node) = Type_Scope)
or else
(Nkind (Next_Node) = N_Package_Body and then
Defining_Unit_Name (Next_Node) = Type_Scope_Body)
then
Scope_Node := Next_Node;
exit;
end if;
Next_Node_Inner := Next_Node;
Next_Node := Parent (Next_Node);
end loop;
if Present (Scope_Node) then
if Nkind (Scope_Node) = N_Package_Body then
Result := True;
elsif List_Containing (Next_Node_Inner) =
Private_Declarations (Scope_Node)
then
-- That is, Ref is in the private part of the package where
-- Priv_Type is declared, and we have to check what goes first:
-- Ref (or a construct it is enclosed into - it is pointed by
-- Next_Node_Inner) or the full view of the private type:
Type_Full_View := Parent (Full_View
(Defining_Identifier (Priv_Type)));
Next_Node := First_Non_Pragma (Private_Declarations (Scope_Node));
while Present (Next_Node) loop
if Next_Node = Type_Full_View then
Result := True;
exit;
elsif Next_Node = Next_Node_Inner then
exit;
else
Next_Node := Next_Non_Pragma (Next_Node);
end if;
end loop;
end if;
end if;
return Result;
end Full_View_Visible;
--------------------------------
-- Get_Discriminant_From_Type --
--------------------------------
function Get_Discriminant_From_Type (N : Node_Id) return Entity_Id is
Type_Entity : Entity_Id := Parent (N);
Res_Chars : constant Name_Id := Chars (N);
Result : Entity_Id;
begin
while not (Nkind (Type_Entity) = N_Subtype_Declaration
or else
Nkind (Type_Entity) = N_Subtype_Indication)
loop
Type_Entity := Parent (Type_Entity);
if Nkind (Type_Entity) = N_Allocator then
Type_Entity := Etype (Type_Entity);
while Ekind (Type_Entity) in Access_Kind loop
Type_Entity := Directly_Designated_Type (Type_Entity);
end loop;
exit;
end if;
end loop;
if Nkind (Type_Entity) = N_Subtype_Indication and then
Nkind (Parent (Type_Entity)) = N_Subtype_Declaration
then
Type_Entity := Parent (Type_Entity);
end if;
if Nkind (Type_Entity) = N_Subtype_Declaration then
Type_Entity := Defining_Identifier (Type_Entity);
else
Type_Entity := Entity (Sinfo.Subtype_Mark (Type_Entity));
end if;
while
Type_Entity /= Etype (Type_Entity)
loop
exit when Comes_From_Source (Type_Entity)
and then
Comes_From_Source (Original_Node (Parent (Type_Entity)))
and then
Nkind (Parent (Type_Entity)) /= N_Subtype_Declaration;
Type_Entity := Etype (Type_Entity);
if Ekind (Type_Entity) = E_Access_Type then
Type_Entity := Directly_Designated_Type (Type_Entity);
elsif (Ekind (Type_Entity) = E_Private_Type
or else
Ekind (Type_Entity) = E_Limited_Private_Type)
and then
Present (Full_View (Type_Entity))
then
Type_Entity := Full_View (Type_Entity);
end if;
end loop;
-- Take care of a private type with unknown discriminant part:
if Nkind (Parent (Type_Entity)) in
N_Private_Extension_Declaration .. N_Private_Type_Declaration
and then
Unknown_Discriminants_Present (Parent (Type_Entity))
then
Type_Entity := Full_View (Type_Entity);
end if;
-- In case of a derived types, we may have discriminants declared for an
-- ansector type and then redefined for some child type
Search_Discriminant : loop
Result := Original_Node (Parent (Type_Entity));
Result := First (Discriminant_Specifications (Result));
while Present (Result) loop
if Chars (Defining_Identifier (Result)) = Res_Chars then
Result := Defining_Identifier (Result);
exit Search_Discriminant;
else
Result := Next (Result);
end if;
end loop;
exit Search_Discriminant when Type_Entity = Etype (Type_Entity);
Type_Entity := Etype (Type_Entity);
end loop Search_Discriminant;
pragma Assert (Present (Result));
return Result;
end Get_Discriminant_From_Type;
-------------------------------
-- Get_Entity_From_Long_Name --
-------------------------------
function Get_Entity_From_Long_Name (N : Node_Id) return Entity_Id is
Result : Entity_Id := Empty;
Arg_Chars : constant Name_Id := Chars (N);
Res_Chars : Name_Id;
P : Node_Id;
Next_Entity : Entity_Id;
begin
P := Parent (N);
while No (Entity (P)) loop
P := Parent (P);
end loop;
Next_Entity := Entity (P);
Res_Chars := Chars (Next_Entity);
loop
if Res_Chars = Arg_Chars then
Result := Next_Entity;
exit;
end if;
if Nkind (Parent (Next_Entity)) = N_Defining_Program_Unit_Name then
P := Sinfo.Name (Parent (Next_Entity));
Next_Entity := Entity (P);
Res_Chars := Chars (Next_Entity);
else
exit;
end if;
end loop;
pragma Assert (Present (Result));
return Result;
end Get_Entity_From_Long_Name;
-----------------------------
-- Get_Rewritten_Discr_Ref --
-----------------------------
function Get_Rewritten_Discr_Ref (N : Node_Id) return Node_Id is
Res_Chars : constant Name_Id := Chars (N);
Result : Node_Id := Parent (N);
begin
while not (Nkind (Result) = N_Identifier
and then
Is_Rewrite_Substitution (Result)
and then
Nkind (Original_Node (Result)) = N_Subtype_Indication)
loop
Result := Parent (Result);
end loop;
-- Go to the declaration of this internal subtype
Result := Parent (Entity (Result));
-- Now - no the constraint
Result := Sinfo.Constraint (Sinfo.Subtype_Indication (Result));
-- And iterating through discriminant names
Result := First (Constraints (Result));
Result := First (Selector_Names (Result));
while Present (Result) loop
if Chars (Result) = Res_Chars then
exit;
end if;
-- Get to the next discriminant
if Present (Next (Result)) then
Result := Next (Result);
else
Result := Next (Parent (Result));
if Present (Result) then
Result := First (Selector_Names (Result));
end if;
end if;
end loop;
pragma Assert (Present (Result));
return Result;
end Get_Rewritten_Discr_Ref;
------------------------------
-- Get_Specificed_Component --
------------------------------
function Get_Specificed_Component
(Comp : Node_Id;
Rec_Type : Entity_Id)
return Entity_Id
is
Rec_Type_Entity : Entity_Id;
Result : Entity_Id := Empty;
Res_Chars : constant Name_Id := Chars (Comp);
Next_Comp : Node_Id;
begin
if Ekind (Rec_Type) = E_Private_Type or else
Ekind (Rec_Type) = E_Limited_Private_Type
then
Rec_Type_Entity := Full_View (Rec_Type);
else
Rec_Type_Entity := Rec_Type;
end if;
Next_Comp := First_Entity (Rec_Type_Entity);
while Present (Next_Comp) loop
if Chars (Next_Comp) = Res_Chars then
Result := Next_Comp;
exit;
end if;
Next_Comp := Next_Entity (Next_Comp);
end loop;
pragma Assert (Present (Result));
return Result;
end Get_Specificed_Component;
------------------------------
-- Get_Statement_Identifier --
------------------------------
function Get_Statement_Identifier (Def_Id : Node_Id) return Node_Id is
Result_Node : Node_Id := Empty;
-- List_Elem : Node_Id;
begin
Result_Node := Label_Construct (Parent (Def_Id));
if not (Nkind (Result_Node) = N_Label) then
-- this means, that Result_Node is of N_Block_Statement or
-- of N_Loop_Statement kind, therefore
Result_Node := Sinfo.Identifier (Result_Node);
end if;
return Result_Node;
end Get_Statement_Identifier;
---------------------
-- GFP_Declaration --
---------------------
function GFP_Declaration (Par_Id : Node_Id) return Node_Id is
Par_Chars : constant Name_Id := Chars (Par_Id);
Result_Node : Node_Id;
Gen_Par_Decl : Node_Id;
begin
-- First, going up to the generic instantiation itself:
Result_Node := Parent (Parent (Par_Id));
-- then taking the name of the generic unit being instantiated
-- and going to its definition - and declaration:
Result_Node := Parent (Parent (Entity (Sinfo.Name (Result_Node))));
-- and now - searching the declaration of the corresponding
-- generic parameter:
Gen_Par_Decl :=
First_Non_Pragma (Generic_Formal_Declarations (Result_Node));
while Present (Gen_Par_Decl) loop
if Nkind (Gen_Par_Decl) in N_Formal_Subprogram_Declaration then
Result_Node := Defining_Unit_Name (Specification (Gen_Par_Decl));
else
Result_Node := Defining_Identifier (Gen_Par_Decl);
end if;
if Chars (Result_Node) = Par_Chars then
exit;
else
Gen_Par_Decl := Next_Non_Pragma (Gen_Par_Decl);
end if;
end loop;
return Result_Node;
end GFP_Declaration;
--------------------------------
-- Identifier_Name_Definition --
--------------------------------
function Identifier_Name_Definition
(Reference_I : Element)
return Asis.Defining_Name
is
Arg_Node : Node_Id;
Arg_Node_Kind : Node_Kind;
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Reference_I);
Result_Node : Node_Id := Empty;
Result_Unit : Compilation_Unit;
Spec_Case : Special_Cases := Not_A_Special_Case;
Result_Kind : Internal_Element_Kinds := Not_An_Element;
Is_Inherited : Boolean := False;
Association_Type : Node_Id := Empty;
-- ??? Is it a good name for a parameter?
Componnet_Name : Node_Id := Empty;
Tmp_Node : Node_Id;
Result : Asis.Element;
function Ekind (N : Node_Id) return Entity_Kind;
-- This function differs from Atree.Ekind in that it can operate
-- with N_Defining_Program_Unit_Name (in this case it returns
-- Atree.Ekind for the corresponding Defining_Identifier node.
function Ekind (N : Node_Id) return Entity_Kind is
Arg_Node : Node_Id := N;
begin
if Nkind (Arg_Node) = N_Defining_Program_Unit_Name then
Arg_Node := Defining_Identifier (Arg_Node);
end if;
return Atree.Ekind (Arg_Node);
end Ekind;
begin
-- this function is currently integrated with
-- Enumeration_Literal_Name_Definition and
-- Operator_Symbol_Name_Definition
-- The implementation approach is very similar to that one of
-- A4G.A_Sem.Get_Corr_Called_Entity. Now the implicit *predefined*
-- operations are turned off for a while
------------------------------------------------------------------
-- 1. Defining Result_Node (and adjusting Arg_Node, if needed) --
------------------------------------------------------------------
if Arg_Kind = An_Identifier then
Result_Kind := A_Defining_Identifier;
-- may be changed to A_Defining_Expanded_Name later
elsif Arg_Kind = An_Enumeration_Literal then
Result_Kind := A_Defining_Enumeration_Literal;
elsif Arg_Kind in Internal_Operator_Symbol_Kinds then
Result_Kind := Def_Operator_Kind (Int_Kind (Reference_I));
end if;
if Special_Case (Reference_I) = Rewritten_Named_Number then
Arg_Node := R_Node (Reference_I);
else
-- Arg_Node := Get_Actual_Type_Name (Node (Reference_I));
Arg_Node := Node (Reference_I);
end if;
-- the code below is really awful! In some future we'll have
-- to revise this "patch on patch" approach!!!
if Is_Part_Of_Defining_Unit_Name (Arg_Node) and then
Kind (Encl_Unit (Reference_I)) in A_Library_Unit_Body
then
-- this means, that we have a part of a prefix of a defining
-- unit name which is a part of a body. These components do not
-- have Entity field set, so we have to go to the spec:
Arg_Node := Reset_To_Spec (Arg_Node);
end if;
if Nkind (Arg_Node) in N_Entity then
-- This is the case of the reference to a formal type inside
-- the expanded code when the actual type is a derived type
-- In this case Get_Actual_Type_Name returns the entity node
-- (see 8924-006)
Result_Node := Arg_Node;
Arg_Node := Node (Reference_I);
-- For the rest of the processing we need Arg_Node properly set as
-- the reference, but not as an entity node
elsif Special_Case (Reference_I) = Rewritten_Named_Number then
-- See BB10-002
Result_Node := Original_Entity (Arg_Node);
elsif No (Entity (Arg_Node)) then
Arg_Node_Kind := Nkind (Original_Node (Parent (Arg_Node)));
-- in some cases we can try to "repair" the situation:
if Arg_Node_Kind = N_Expanded_Name then
-- the Entity field is set for the whole expanded name:
if Entity_Present (Original_Node (Parent (Arg_Node))) or else
Entity_Present (Parent (Arg_Node))
then
Arg_Node := Parent (Arg_Node);
-- In case of renamings, here we may have the expanded name
-- rewritten, and the Entity field for the new name pointing
-- to the renamed entity, but not to the entity defined by
-- the renamed declaration, see B924-A13
if Is_Rewrite_Substitution (Arg_Node) and then
Entity_Present (Original_Node (Arg_Node))
then
Arg_Node := Original_Node (Arg_Node);
end if;
else
-- Trying to "traverse a "long" defining program unit
-- name (see 7917-005)
Result_Node := Get_Entity_From_Long_Name (Arg_Node);
end if;
elsif Arg_Node_Kind = N_Component_Definition and then
Sloc (Arg_Node) = Standard_Location
then
-- Special case of Subtype_Indication for predefined String
-- and Wide_String types:
Result_Node := Parent (Parent (Parent (Arg_Node)));
-- Here we are in N_Full_Type_Declaration node
Result_Node := Defining_Identifier (Result_Node);
Result_Node := Component_Type (Result_Node);
Spec_Case := Explicit_From_Standard;
elsif Arg_Node_Kind = N_Function_Call then
-- this is a special case of a parameterless function call
-- of the form P.F
Arg_Node := Sinfo.Name (Original_Node (Parent (Arg_Node)));
elsif Arg_Node_Kind = N_Integer_Literal or else
Arg_Node_Kind = N_Real_Literal or else
Arg_Node_Kind = N_Character_Literal or else
Arg_Node_Kind = N_String_Literal or else
Arg_Node_Kind = N_Identifier
then
-- All but last conditions are a result of some compile-time
-- optimization. The last one is a kind of
-- semantically-transparent transformation which loses some
-- semantic information for replaced structures (see the test
-- for 9429-006).
--
-- The last condition may need some more attention in case if new
-- Corresponding_Name_Definition problems are detected
Arg_Node := Original_Node (Parent (Arg_Node));
elsif Arg_Node_Kind = N_Component_Association and then
Nkind (Parent (Parent (Arg_Node))) = N_Raise_Constraint_Error
then
-- A whole aggregate is rewritten into N_Raise_Constraint_Error
-- node, see G628-026
Tmp_Node := Parent (Parent (Arg_Node));
Tmp_Node := Etype (Tmp_Node);
Tmp_Node := First_Entity (Tmp_Node);
while Present (Tmp_Node) loop
if Chars (Tmp_Node) = Chars (Arg_Node) then
Result_Node := Tmp_Node;
exit;
end if;
Tmp_Node := Next_Entity (Tmp_Node);
end loop;
pragma Assert (Present (Result_Node));
if not (Comes_From_Source (Result_Node))
and then
Comes_From_Source (Parent (Result_Node))
then
Result_Node := Defining_Identifier (Parent (Result_Node));
end if;
elsif Arg_Node_Kind = N_Component_Association and then
Nkind (Sinfo.Expression (Parent (Arg_Node))) =
N_Raise_Constraint_Error
then
-- here we are guessing for the situation when a compiler
-- optimization take place. We can probably be non-accurate
-- for inherited record components, but what can we do....
--
-- first, defining the corresponding Entity Node, we assume
-- it to be a record component definition
Result_Node := Parent (Parent (Arg_Node)); -- aggregate
Association_Type := Etype (Result_Node);
if Ekind (Association_Type) in Private_Kind then
Association_Type := Full_View (Association_Type);
end if;
Result_Node := First_Entity (Association_Type);
while Chars (Result_Node) /= Chars (Arg_Node) loop
Result_Node := Next_Entity (Result_Node);
end loop;
elsif Arg_Node_Kind = N_Parameter_Association and then
Arg_Node = Selector_Name (Parent (Arg_Node))
then
-- Currently we assume, that this corresponds to the case of
-- formal parameters of predefined operations
return Nil_Element;
elsif Arg_Node_Kind = N_Component_Clause then
-- Component clause in record representation clause - Entity
-- field is not set, we have to traverse the list of components
-- of the record type
Association_Type :=
Entity (Sinfo.Identifier (Parent (Parent (Arg_Node))));
if Ekind (Association_Type) = E_Record_Subtype then
-- In case of a subtype it may be the case that some components
-- depending on discriminant are skipped in case of a static
-- discriminnat constraint, see also
-- A4G.Mapping.Set_Inherited_Components
Association_Type := Etype (Association_Type);
end if;
Result_Node :=
Get_Specificed_Component (Arg_Node, Association_Type);
Association_Type := Empty;
-- Association_Type is set back to Empty to make it possible
-- to use the general approach for computing Association_Type
-- later
elsif Nkind (Arg_Node) = N_Identifier and then
Sloc (Parent (Arg_Node)) = Standard_ASCII_Location
then
-- reference to Character in a constant definition in the
-- ASCII package, see 8303-011
Result_Node := Standard_Character;
elsif not (Arg_Node_Kind = N_Discriminant_Association or else
Arg_Node_Kind = N_Generic_Association)
and then
not Is_From_Unknown_Pragma (R_Node (Reference_I))
then
-- now we are considering all the other cases as component simple
-- names in a (rewritten!) record aggregate, and we go from the
-- original to the rewritten structure (because the original
-- structure is not decorated). If this is not the case, we should
-- get the Assert_Failure raised in Rewritten_Image
-- Arg_Node := Rewritten_Image (Arg_Node);
Result_Node := Search_Record_Comp (Arg_Node);
end if;
end if;
if No (Result_Node) and then
No (Entity (Arg_Node)) and then
not (Nkind (Parent (Arg_Node)) = N_Discriminant_Association or else
Nkind (Parent (Arg_Node)) = N_Generic_Association or else
Is_From_Unknown_Pragma (R_Node (Reference_I)))
then
if Debug_Flag_S then
Write_Str ("A4G.Expr_Sem.Identifier_Name_Definition:");
Write_Eol;
Write_Str ("no Entity field is set for Node ");
Write_Int (Int (Arg_Node));
Write_Eol;
Write_Str (" the debug image of the query argument is:");
Write_Eol;
Debug_String (Reference_I);
Write_Str (Debug_Buffer (1 .. Debug_Buffer_Len));
Write_Eol;
end if;
raise Internal_Implementation_Error;
end if;
if Present (Result_Node) then
null;
elsif Is_From_Unknown_Pragma (R_Node (Reference_I)) then
return Nil_Element;
elsif Nkind (Parent (Arg_Node)) = N_Discriminant_Association and then
Arg_Node /= Original_Node (Sinfo.Expression (Parent (Arg_Node)))
then
-- We use Original_Node (Sinfo.Expression (Parent (Arg_Node)))
-- because of C730-016 (named numbers rewritten into their values)
if No (Original_Discriminant (Arg_Node)) then
Result_Node := Get_Discriminant_From_Type (Arg_Node);
else
Result_Node := Original_Discriminant (Arg_Node);
if Present (Corresponding_Discriminant (Result_Node)) then
Result_Node := Corresponding_Discriminant (Result_Node);
end if;
end if;
elsif No (Entity (Arg_Node)) and then
Nkind (Parent (Arg_Node)) = N_Generic_Association
then
-- this is the problem up to 3.10p. We have to compute
-- N_Defining_Identifier_Node for this generic formal
-- parameter "by hands"
-- ??? should be rechecked for 3.11w!!!
Result_Node := GFP_Declaration (Arg_Node);
else
Result_Node := Entity (Arg_Node);
end if;
-- Here we have Result_Node set. And now we have a whole bunch of
-- situations when we have to correct Result_Node because of different
-- reasons
-- If Result_Node is the type reference, and the type has both private
-- and full view, Result_Node will point to the private view. In some
-- situations we have to replace it with the full view.
if Ekind (Result_Node) in Einfo.Type_Kind
and then
Nkind (Original_Node (Parent (Result_Node))) in
N_Private_Extension_Declaration .. N_Private_Type_Declaration
and then
Full_View_Visible
(Priv_Type => Parent (Result_Node),
Ref => Arg_Node)
then
Result_Node := Full_View (Result_Node);
end if;
-- FB02-015: Ada 2005 - reference to a record type with self-referencing
-- components, The front-end creates an incomplete type
-- declaration, and the Entity field may point to this
-- incomplete type.
if Ekind (Result_Node) = E_Incomplete_Type
and then
not Comes_From_Source (Result_Node)
and then
Nkind (Parent (Result_Node)) = N_Incomplete_Type_Declaration
then
Tmp_Node := Full_View (Result_Node);
if Present (Tmp_Node) then
Result_Node := Full_View (Result_Node);
end if;
end if;
-- F818-A05: reference to a formal parameter of a child subprogram in
-- case when the subprogram does not have a separate spec.
-- The front-end creates some artificial data structures to
-- represent this separate spec, so the entity field of a
-- parameter reference points to some artificial node
if Nkind (Parent (Result_Node)) = N_Parameter_Specification
and then
not (Comes_From_Source (Result_Node))
then
-- Check if we are in the artificial spec created for child
-- subprogram body:
Tmp_Node := Scope (Result_Node);
Tmp_Node := Parent (Parent (Parent (Tmp_Node)));
if Nkind (Tmp_Node) = N_Subprogram_Declaration
and then
not Comes_From_Source (Tmp_Node)
and then
Present (Parent_Spec (Tmp_Node))
and then
Present (Corresponding_Body (Tmp_Node))
then
-- Go to the defining identifier of this parameter in subprogram
-- body:
Tmp_Node := Corresponding_Body (Tmp_Node);
Tmp_Node := Parent (Parent (Tmp_Node));
Tmp_Node := First_Non_Pragma (Parameter_Specifications (Tmp_Node));
while Present (Tmp_Node) loop
if Chars (Defining_Identifier (Tmp_Node)) =
Chars (Result_Node)
then
Result_Node := Defining_Identifier (Tmp_Node);
exit;
end if;
Tmp_Node := Next_Non_Pragma (Tmp_Node);
end loop;
pragma Assert (Present (Tmp_Node));
end if;
end if;
-- E802-015: for a protected operation items that do not have separate
-- specs the front-end creates these specs and sets all the Entity
-- fields pointing to the entities from these artificial specs.
if Is_Artificial_Protected_Op_Item_Spec (Result_Node) then
if Ekind (Result_Node) in Formal_Kind then
Tmp_Node := Parent (Parent (Parent (Result_Node)));
Tmp_Node := Parent (Corresponding_Body (Tmp_Node));
Tmp_Node := First_Non_Pragma (Parameter_Specifications (Tmp_Node));
while Present (Tmp_Node) loop
if Chars (Defining_Identifier (Tmp_Node)) =
Chars (Result_Node)
then
Result_Node := Defining_Identifier (Tmp_Node);
exit;
else
Tmp_Node := Next_Non_Pragma (Tmp_Node);
end if;
end loop;
else
-- The only possibility - the protected operation entity
Result_Node := Corresponding_Body (Parent (Parent (Result_Node)));
end if;
end if;
-- See E421-006: problem with reference to a formal type in an expanded
-- code.
if Present (Result_Node)
and then
Is_Itype (Result_Node)
-- and then Present (Cloned_Subtype (Result_Node))
then
if Special_Case (Reference_I) = Dummy_Base_Attribute_Prefix then
Result_Node := Associated_Node_For_Itype (Result_Node);
else
Result_Node := Etype (Result_Node);
end if;
-- This is for E912-013
if No (Parent (Result_Node))
and then
Present (Associated_Node_For_Itype (Result_Node))
then
Result_Node :=
Defining_Identifier (Associated_Node_For_Itype (Result_Node));
elsif Special_Case (Reference_I) = Dummy_Base_Attribute_Prefix then
Result_Node := Defining_Identifier (Result_Node);
end if;
end if;
-- Problem with System redefined with Extend_System pragma (E315-001)
if Nkind (Arg_Node) in N_Has_Chars
and then
Chars (Arg_Node) = Name_System
and then
Chars (Result_Node) /= Name_System
and then
Nkind (Parent (Result_Node)) = N_Defining_Program_Unit_Name
then
Result_Node := Entity (Sinfo.Name (Parent (Result_Node)));
pragma Assert (Chars (Result_Node) = Name_System);
end if;
-- Problem with tasks defined by a single task definition: for such a
-- definition the front-end creates an artificial variable declaration
-- node, and for the references to such task, the Entity field points to
-- the entity node from this artificial variable declaration (E224-024).
-- The same problem exists for a single protected declaration
-- (E418-015)
Tmp_Node := Parent (Result_Node);
if Comes_From_Source (Result_Node)
and then
not Comes_From_Source (Tmp_Node)
and then
Nkind (Tmp_Node) = N_Object_Declaration
and then
not Constant_Present (Tmp_Node)
and then
No (Corresponding_Generic_Association (Tmp_Node))
then
Tmp_Node := Etype (Result_Node);
if Ekind (Tmp_Node) in Concurrent_Kind then
Result_Node := Parent (Result_Node);
while not (Nkind (Result_Node) = N_Task_Type_Declaration
or else
Nkind (Result_Node) = N_Protected_Type_Declaration)
loop
Result_Node := Prev (Result_Node);
end loop;
end if;
Result_Node := Defining_Identifier (Original_Node (Result_Node));
end if;
-- F703-020: see the comment marked by this TN in the body of
-- A4G.A_Sem.Get_Corr_Called_Entity
if not Comes_From_Source (Result_Node)
and then
Is_Overloadable (Result_Node)
and then
Present (Alias (Result_Node))
and then
not (Is_Intrinsic_Subprogram (Result_Node))
and then
Pass_Generic_Actual (Parent (Result_Node))
then
-- ???
Result_Node := Alias (Result_Node);
end if;
-- and here we have to solve the problem with generic instances:
-- for them Result_Node as it has been obtained above points not
-- to the defining identifier from the corresponding instantiation,
-- but to an entity defined in a "implicit" package created by the
-- compiler
if Is_Generic_Instance (Result_Node) then
Result_Node := Get_Instance_Name (Result_Node);
end if;
-- If the argument is Is_Part_Of_Implicit reference to a type, we
-- have to check if it is the reference to a type mark in parameter
-- or parameter and result profile of inherited subprogram and if it
-- should be substituted by the reference to the corresponding
-- derived type
Tmp_Node := Node_Field_1 (Reference_I);
if Ekind (Result_Node) in Einfo.Type_Kind
and then
Is_From_Inherited (Reference_I)
and then
Nkind (Tmp_Node) in Sinfo.N_Entity
and then
(Ekind (Tmp_Node) = E_Procedure or else
Ekind (Tmp_Node) = E_Function)
then
Result_Node := Get_Derived_Type (Type_Entity => Result_Node,
Inherited_Subpr => Tmp_Node);
end if;
-- labels (and, probably, statement names!!) makes another problem:
-- we have to return not the implicit label (statement identifier??)
-- declaration, but the label (statement name) attached to the
-- corresponding statement
if Nkind (Parent (Result_Node)) = N_Implicit_Label_Declaration then
Result_Node := Get_Statement_Identifier (Result_Node);
end if;
Tmp_Node := Original_Node (Parent (Parent (Result_Node)));
while Nkind (Tmp_Node) = N_Subprogram_Renaming_Declaration
and then
not (Comes_From_Source (Tmp_Node))
and then
not Pass_Generic_Actual (Tmp_Node)
loop
-- Result_Node is a defining name from the artificial renaming
-- declarations created by the compiler in the for wrapper
-- package for expanded subprogram instantiation. We
-- have to go to expanded subprogram spec which is renamed.
--
-- We have to do this in a loop in case of nested instantiations
Result_Node := Sinfo.Name (Tmp_Node);
if Nkind (Result_Node) = N_Selected_Component then
Result_Node := Selector_Name (Result_Node);
end if;
Result_Node := Entity (Result_Node);
Tmp_Node := Parent (Parent (Result_Node));
end loop;
-- -- ???
-- if Ekind (Result_Node) = E_Operator then
-- Result_Kind := N_Defining_Identifier_Mapping (Result_Node);
-- end if;
if Nkind (Parent (Result_Node)) = N_Defining_Program_Unit_Name or else
Nkind (Result_Node) = N_Defining_Program_Unit_Name
then
-- if we are processing the reference to a child unit, we have to
-- go from a defining identifier to the corresponding defining
-- unit name (the first part of the condition).
-- If this is a reference to a child subprogram, for which
-- the separate subprogram specification does not exist,
-- GNAT generates the tree structure corresponding to such a
-- separate subprogram specification, and it set the Entity
-- field for all references to this subprogram pointing
-- to the defining identifier in this inserted subprogram
-- specification. This case may be distinguished by the fact,
-- that Comes_From_Source field for this defining identifier
-- is set OFF. And in this case we have to go to the defining
-- identifier in the subprogram body:
if not Comes_From_Source (Result_Node) then
-- we have to go to the defining identifier in the
-- corresponding body:
while not (Nkind (Result_Node) = N_Subprogram_Declaration) loop
Result_Node := Parent (Result_Node);
end loop;
Result_Node := Corresponding_Body (Result_Node);
end if;
if Nkind (Result_Node) /= N_Defining_Program_Unit_Name then
Result_Node := Parent (Result_Node);
end if;
Result_Kind := A_Defining_Expanded_Name;
if not Comes_From_Source (Result_Node) then
-- now it means that we have a library level instantiation
-- of a generic child package
Result_Node := Parent (Parent (Result_Node));
Result_Node := Original_Node (Result_Node);
if Nkind (Result_Node) = N_Package_Declaration then
Result_Node := Sinfo.Corresponding_Body (Result_Node);
while Nkind (Result_Node) /= N_Package_Body loop
Result_Node := Parent (Result_Node);
end loop;
Result_Node := Original_Node (Result_Node);
end if;
Result_Node := Defining_Unit_Name (Result_Node);
end if;
end if;
if Nkind (Result_Node) = N_Defining_Identifier and then
(Ekind (Result_Node) = E_In_Parameter or else
Ekind (Result_Node) = E_Constant) and then
Present (Discriminal_Link (Result_Node))
then
-- here we have to go to an original discriminant
Result_Node := Discriminal_Link (Result_Node);
end if;
-- FA13-008: subtype mark in parameter specification in implicit "/="
-- declaration in case if in the corresponding "=" the parameter is
-- specified by 'Class attribute:
if Nkind (Arg_Node) = N_Identifier
and then
not Comes_From_Source (Arg_Node)
and then
Ekind (Result_Node) = E_Class_Wide_Type
and then
Result_Node /= Defining_Identifier (Parent (Result_Node))
then
Result_Node := Defining_Identifier (Parent (Result_Node));
end if;
-- Now we have Result_Node pointing to some defining name. There are
-- some kinds of entities which require special processing. For
-- implicitly declared entities we have to set Association_Type
-- pointing to a type which "generates" the corresponding implicit
-- declaration (there is no harm to set Association_Type for explicitly
-- declared entities, but for them it is of no use). For predefined
-- entities the special case attribute should be set.
----------------------------------------
-- temporary solution for 5522-003 ???--
----------------------------------------
-- The problem for record components:
--
-- 1. The Entity field for references to record components and
-- disciminants may point to field of some implicit types created
-- by the compiler
--
-- 2. The Entity field for the references to the (implicitly declared!)
-- components of a derived record type point to the explicit
-- declarations of the component of the ancestor record type
--
-- 3. Probably, all this stuff should be incapsulated in a separate
-- subprogram???
-- Here we already have Result_Node:
if Nkind (Result_Node) = N_Defining_Identifier and then
(Ekind (Result_Node) = E_Component or else
Ekind (Result_Node) = E_Discriminant or else
Ekind (Result_Node) = E_Entry or else
Ekind (Result_Node) = E_Procedure or else
Ekind (Result_Node) = E_Function)
then
-- first, we compute Association_Type as pointed to a type
-- declaration for which Agr_Node is a component:
if No (Association_Type) then
Association_Type := Parent (Arg_Node);
if Nkind (Association_Type) = N_Function_Call then
Association_Type := Sinfo.Name (Association_Type);
end if;
case Nkind (Association_Type) is
when N_Component_Clause =>
Association_Type :=
Sinfo.Identifier (Parent (Association_Type));
when N_Selected_Component =>
Association_Type := Prefix (Association_Type);
if Nkind (Association_Type) = N_Attribute_Reference
and then
(Attribute_Name (Association_Type) =
Name_Unrestricted_Access
or else
Attribute_Name (Association_Type) = Name_Access)
then
-- See G222-012
Association_Type := Prefix (Association_Type);
end if;
if Nkind (Association_Type) = N_Selected_Component then
Association_Type := Selector_Name (Association_Type);
end if;
when N_Component_Association =>
Association_Type := Parent (Association_Type);
when N_Discriminant_Association =>
if Arg_Node = Sinfo.Expression (Association_Type) then
-- using a discriminant in initialization expression
Association_Type := Empty;
else
Association_Type := Scope (Result_Node);
end if;
when others =>
-- We set Association_Type as Empty to indicate the case of
-- a definitely explicit result
Association_Type := Empty;
end case;
end if;
if Present (Association_Type) then
if not (Comes_From_Source (Association_Type)
and then
Nkind (Association_Type) in N_Entity
and then
Ekind (Association_Type) in Einfo.Type_Kind)
then
Association_Type := Etype (Association_Type);
end if;
if Nkind (Original_Node (Parent (Association_Type))) =
N_Single_Task_Declaration
or else
Nkind (Original_Node (Parent (Association_Type))) =
N_Single_Protected_Declaration
then
Association_Type := Empty;
else
if Ekind (Result_Node) = E_Component
and then
not Comes_From_Source (Parent (Result_Node))
and then
Ekind (Association_Type) in Private_Kind
then
Association_Type := Full_View (Association_Type);
end if;
Association_Type :=
Explicit_Type_Declaration_Unwound_Unaccess
(Association_Type, Arg_Node);
if Nkind (Original_Node (Association_Type)) in
N_Protected_Type_Declaration ..
N_Private_Extension_Declaration
then
Association_Type :=
Parent
(Full_View (Defining_Identifier (Original_Node
(Association_Type))));
end if;
end if;
end if;
-- then, we have to adjust result Node:
if Ekind (Result_Node) = E_Discriminant and then
Chars (Discriminal (Result_Node)) /=
Chars (Original_Record_Component (Result_Node))
then
-- This condition is the clue for discriminants explicitly
-- declared in declarations of derived types.
-- These assignments below resets Result_Node to
-- N_Defining_Identifier node which denotes the same discriminant
-- but has a properly set bottom-up chain of Parent nodes
Result_Node := Discriminal (Result_Node);
Result_Node := Discriminal_Link (Result_Node);
else
-- There we have to come from an implicit type to a explicitly
-- declared type:
Tmp_Node := Scope (Result_Node);
if Ekind (Tmp_Node) = E_Record_Subtype then
Tmp_Node := Etype (Tmp_Node);
end if;
if (Ekind (Result_Node) = E_Component
or else
Ekind (Result_Node) = E_Discriminant)
and then
not (Comes_From_Source (Result_Node)
and then
not Comes_From_Source (Parent (Result_Node)))
then
-- This condition leaves unchanged inherited discriminants
-- of derived record types
Tmp_Node := First_Entity (Tmp_Node);
while Present (Tmp_Node) loop
if Chars (Tmp_Node) = Chars (Result_Node) then
Result_Node := Tmp_Node;
exit;
end if;
Tmp_Node := Next_Entity (Tmp_Node);
end loop;
end if;
end if;
-- A private type may require some special adjustment in case if
-- full view is visible: if Result_Node is a discriminant:
-- it points to a discriminant in a private view, and we have
-- to reset it to point to the discriminant in the full view
if Present (Association_Type)
and then
Has_Private_Declaration (Defining_Identifier (Association_Type))
and then
Ekind (Result_Node) = E_Discriminant
and then
Nkind (Association_Type) /= N_Private_Type_Declaration
and then
Nkind (Association_Type) /= N_Private_Extension_Declaration
and then
Is_Type_Discriminant (Result_Node,
Original_Node (Association_Type))
then
Result_Node := Reset_To_Full_View (Association_Type, Result_Node);
end if;
-- Now, we have to define if we have an implicit component here.
-- Result_Context_Node is finally supposed to be set to the
-- declaration of the type to which the argument component belongs
if No (Association_Type) then
-- definitely explicit result:
Is_Inherited := False;
elsif Is_Rewrite_Substitution (Association_Type) then
-- here we have a derived type with no record extension part
-- but it can have an explicitly declared discriminant
if Ekind (Result_Node) = E_Discriminant then
Is_Inherited := not (Is_Type_Discriminant (
Result_Node, Original_Node (Association_Type)));
else
Is_Inherited := True;
end if;
elsif Nkind (Association_Type) = N_Incomplete_Type_Declaration
or else
Nkind (Association_Type) = N_Private_Extension_Declaration
or else
Nkind (Association_Type) = N_Private_Type_Declaration
or else
Nkind (Association_Type) = N_Task_Type_Declaration
or else
Nkind (Association_Type) = N_Protected_Type_Declaration
or else
(Nkind (Association_Type) = N_Formal_Type_Declaration and then
Nkind (Sinfo.Formal_Type_Definition (Association_Type)) =
N_Formal_Private_Type_Definition)
or else
Nkind (Sinfo.Type_Definition (Association_Type)) =
N_Record_Definition
then
-- should be an explicit component
Is_Inherited := False;
-- Patch for E407-A08
if Ekind (Result_Node) = E_Component then
Result_Node := Original_Record_Component (Result_Node);
end if;
elsif Nkind (Sinfo.Type_Definition (Association_Type)) =
N_Derived_Type_Definition
then
-- it may be an inherited component or an explicitly declared
-- discriminant or a component from a record extension part
if Is_Explicit_Type_Component (Result_Node, Association_Type) then
Is_Inherited := False;
else
Is_Inherited := True;
end if;
else
-- ??? this Assert pragma - only for development/debug period
-- ??? what else except N_Selected_Component could be here
null;
pragma Assert (False);
end if;
end if;
-------------------------------------------------
-- end for the temporary solution for 5522-003 --
-------------------------------------------------
--------------------------
-- Enumeration literals --
--------------------------
if not (Defined_In_Standard (Arg_Node))
and then
Nkind (Result_Node) = N_Defining_Identifier
-- or else
-- Nkind (Result_Node) = N_Defining_Character_Literal)
and then
Ekind (Result_Node) = E_Enumeration_Literal
and then (not Comes_From_Source (Result_Node))
then
-- an enumeration literal inherited by a derived type definition
-- (character literals are still processed by a separate function
-- Character_Literal_Name_Definition, that's why the corresponding
-- part of the condition is commented out)
-- ???Needs revising for the new model of implicit Elements
Is_Inherited := True;
Association_Type := Etype (Arg_Node);
Association_Type :=
Explicit_Type_Declaration_Unwound (Association_Type);
end if;
---------------------------------------
-- The rest of special processing: --
-- somewhat messy and needs revising --
---------------------------------------
-- We have to turn off for a while the full processing of the
-- implicit elements (Hope to fix this soon).
if Defined_In_Standard (Arg_Node)
or else
Sloc (Arg_Node) <= Standard_Location
or else
Sloc (Result_Node) <= Standard_Location
then
-- We need the second part of the condition for references to
-- Standard.Characters which are parts of the definitions in
-- the ASCII package
if Ekind (Result_Node) = E_Operator then
return Nil_Element;
else
-- I hope, that I'm right, that all the *identifiers* declared
-- in standard are declared explicitly, and all the rest
-- (which are defined in Standard) are implicit
-- Root and universal types can make a problem, but let's
-- see it before...
Spec_Case := Explicit_From_Standard;
end if;
else
if Result_Kind in Internal_Defining_Operator_Kinds then
if Is_Predefined (Result_Node) then
Spec_Case := Predefined_Operation;
-- -- note, that Predefined_Operation corresponds to an
-- -- implicitly declared operation of a type, which is defined
-- -- not in the Standard package
-- Association_Type := Enclosed_Type (Result_Node);
-- -- we have to use namely Association_Type, but not Result_Node
-- -- to define Result_Unit, because sometimes Result_Node
-- -- does not have the Parent field set
return Nil_Element;
-- ???!!! this turns off all the predefined operations
-- !!!??? defined not in Standard
elsif Is_Impl_Neq (Result_Node) then
Spec_Case := Is_From_Imp_Neq_Declaration;
end if;
end if;
end if;
-------------------
-- Limited views --
-------------------
if Spec_Case = Not_A_Special_Case then
Tmp_Node := Result_Node;
if Nkind (Tmp_Node) = N_Defining_Program_Unit_Name then
Tmp_Node := Defining_Identifier (Tmp_Node);
end if;
if Nkind (Tmp_Node) in N_Entity then
case Ekind (Tmp_Node) is
when Einfo.Type_Kind =>
if not Comes_From_Source (Tmp_Node)
and then
Ekind (Tmp_Node) in Incomplete_Kind
and then
Present (Non_Limited_View (Tmp_Node))
then
Spec_Case := From_Limited_View;
Result_Node := Non_Limited_View (Result_Node);
end if;
when E_Package =>
if not Is_Generic_Instance (Tmp_Node) then
if not Analyzed (Parent (Result_Node)) then
Spec_Case := From_Limited_View;
elsif Is_Limited_Withed (Result_Node, Reference_I) then
Spec_Case := From_Limited_View;
end if;
end if;
when others =>
null;
end case;
end if;
end if;
if Spec_Case not in Predefined
and then
Spec_Case /= Is_From_Imp_Neq_Declaration
and then
Spec_Case /= From_Limited_View
and then
not Comes_From_Source (Result_Node)
and then
No (Association_Type)
and then
not Part_Of_Pass_Generic_Actual (Result_Node)
then
-- Here we may have the following possibilities:
-- - library-level subprogram instantiation;
-- - artificial entity created for an inner package from a package
-- "withed" by a limited with clause;
-- - defining name from the artificial spec created for subprogram
-- body which acts as a spec;
-- - prefix of the artificial 'Class attribute reference (ASIS has
-- to emulate such an attribute reference in case if a class-wide
-- type is use as an actual type in the instantiation);
-- - index (sub)type in case if the corresponding type is declared as
-- private (F424-A01);
-- - F619-024;
-- - F627-001
-- - inherited subprogram;
if Nkind (Parent (Result_Node)) in N_Subprogram_Specification then
if Is_Generic_Instance (Result_Node) then
-- Library-level subprogram instantiation
-- Here we have to go from the rewritten to the original
-- tree structure
-- This code appeared at some point, but it seems that it is
-- of no real need. Will be for a while - just in case.
-- It does not allow to fix G312-006
-- ???
-- Result_Node := Parent (Parent (Parent (Parent (Result_Node))));
-- Result_Node := Original_Node (Result_Node);
-- Result_Node := Sinfo.Defining_Unit_Name (Result_Node);
null;
else
-- Artificial subprogram spec created for the body acting
-- as spec
Result_Node := Parent (Parent (Result_Node));
Result_Node := Corresponding_Body (Result_Node);
end if;
elsif Nkind (Parent (Result_Node)) = N_Package_Specification
and then
Comes_From_Source (Parent (Result_Node))
then
-- An artificial internal entity created for a local package
-- from a package that is "withed" by limited with clause
-- We go to the entity node the package spec points to.
-- See F310-025 and F311-003.
Result_Node := Defining_Unit_Name (Parent (Result_Node));
elsif Special_Case (Reference_I) = Dummy_Class_Attribute_Prefix
and then
Ekind (Result_Node) = E_Class_Wide_Type
then
Result_Node := Defining_Identifier (Parent (Result_Node));
elsif Ekind (Result_Node) in Discrete_Kind
and then
Nkind (Parent (Result_Node)) = N_Subtype_Declaration
then
-- Go to the full view of the corresponding private type:
Result_Node := Sinfo.Subtype_Indication (Parent (Result_Node));
Result_Node := Entity (Result_Node);
pragma Assert (Ekind (Result_Node) in Private_Kind);
Result_Node := Full_View (Result_Node);
elsif Ekind (Result_Node) = E_Package
and then
Is_Hidden (Result_Node)
and then
Is_Rewrite_Substitution (R_Node (Reference_I))
then
-- This is the case when we have a reference to the instantiation
-- of generic parent in the instantiation of generic child,
-- see F619-024
Result_Node := Entity (R_Node (Reference_I));
if Nkind (Parent (Result_Node)) = N_Defining_Program_Unit_Name then
Result_Node := Parent (Result_Node);
Result_Kind := A_Defining_Expanded_Name;
end if;
elsif Ekind (Result_Node) = E_Package
and then
Nkind (Parent (Result_Node)) = N_Package_Renaming_Declaration
and then
not Comes_From_Source (Parent (Result_Node))
then
-- Reference_I is the reference to the name of the instantiation
-- inside an expanded template, but the name of the template is
-- the defining expanded name. In this case we have to use the
-- entity of the rewritten node (F627-001)
Result_Node := Entity (R_Node (Reference_I));
else
-- It should be inherited!
-- The last condition is needed to filter out already processed
-- cases. This case corresponds to inherited user-defined
-- subprograms
Is_Inherited := True;
if Ekind (Result_Node) = E_Function or else
Ekind (Result_Node) = E_Procedure
then
Association_Type := Result_Node;
-- Points to the defining identifier of implicit inherited
-- subprogram
Result_Node := Explicit_Parent_Subprogram (Result_Node);
-- Now Result_Node points to the defining identifier of
-- explicit subprogram which is inherited
else
-- ??? Probably will need revising when inherited record
-- components and enumeration literals are fully
-- implemented
Association_Type := Defining_Identifier (Parent (Result_Node));
Association_Type := First_Subtype (Association_Type);
end if;
end if;
end if;
if Defined_In_Standard (Arg_Node) then
-- Here we may need to adjust the result node in case if it is an
-- entity representing an unconstrained base type for a signed
-- integer type (see Cstand.Create_Unconstrained_Base_Type)
if No (Parent (Result_Node))
and then
Ekind (Result_Node) = E_Signed_Integer_Type
then
Result_Node := Parent (Scalar_Range (Result_Node));
end if;
Result_Unit := Get_Comp_Unit
(Standard_Id, Encl_Cont_Id (Reference_I));
else
if Result_Kind in Internal_Defining_Operator_Kinds and then
Is_Predefined (Result_Node)
then
null;
-- -- note, that Predefined_Operation corresponds to an
-- -- implicitly declared operation of a type, which is defined
-- -- not in the Standard package
-- Association_Type := Enclosed_Type (Result_Node);
-- -- we have to use namely Association_Type, but not Result_Node
-- -- to define Result_Unit, because sometimes Result_Node
-- -- does not have the Parent field set
-- Result_Unit :=
-- Enclosing_Unit (Encl_Cont_Id (Reference_I), Association_Type);
return Nil_Element;
-- ???!!! this turns off all the predefined operations
-- !!!??? defined not in Standard
elsif Is_Inherited then
Result_Unit :=
Enclosing_Unit (Encl_Cont_Id (Reference_I), Association_Type);
else
Result_Unit :=
Enclosing_Unit (Encl_Cont_Id (Reference_I), Result_Node);
end if;
end if;
if Is_Inherited
and then
(Ekind (Result_Node) = E_Component or else
Ekind (Result_Node) = E_Discriminant)
then
Componnet_Name := Result_Node;
end if;
-- A special case of fake Numeric_Error renaming is handled
-- separately (see B712-0050)
if Result_Node = Standard_Constraint_Error and then
Chars (Result_Node) /= Chars (Arg_Node)
then
Result := Get_Numeric_Error_Renaming;
Set_Int_Kind (Result, A_Defining_Identifier);
else
Result :=
Node_To_Element_New (Node => Result_Node,
Node_Field_1 => Association_Type,
Node_Field_2 => Componnet_Name,
Internal_Kind => Result_Kind,
Spec_Case => Spec_Case,
Inherited => Is_Inherited,
In_Unit => Result_Unit);
end if;
-- See the comment in the body of A4G.A_Sem.Get_Corr_Called_Entity
if Present (Association_Type) then
if Is_From_Instance (Association_Type) then
Set_From_Instance (Result, True);
else
Set_From_Instance (Result, False);
end if;
end if;
if Spec_Case = From_Limited_View then
Set_From_Implicit (Result, True);
end if;
return Result;
end Identifier_Name_Definition;
--------------------------------
-- Is_Explicit_Type_Component --
--------------------------------
function Is_Explicit_Type_Component
(Comp_Def_Name : Node_Id;
Type_Decl : Node_Id)
return Boolean
is
Result : Boolean := False;
Cont_Node : Node_Id;
begin
Cont_Node := Parent (Comp_Def_Name);
while Present (Cont_Node) loop
if Cont_Node = Type_Decl then
Result := True;
exit;
end if;
Cont_Node := Parent (Cont_Node);
end loop;
return Result;
end Is_Explicit_Type_Component;
------------------------------
-- Is_From_Dispatching_Call --
------------------------------
function Is_From_Dispatching_Call (Reference : Element) return Boolean is
Can_Be_Dynamically_Identified : Boolean := False;
Ref_Node : Node_Id;
Parent_Ref_Node : Node_Id;
Ref_Entity : Entity_Id;
Parent_Call : Node_Id := Empty;
Result : Boolean := False;
begin
Ref_Node := R_Node (Reference);
if not (Nkind (Ref_Node) = N_Identifier
or else
Nkind (Ref_Node) = N_Operator_Symbol)
then
return False;
end if;
Parent_Ref_Node := Parent (Ref_Node);
if Nkind (Parent_Ref_Node) = N_Expanded_Name
and then
Ref_Node = Selector_Name (Parent_Ref_Node)
then
Ref_Node := Parent (Ref_Node);
Parent_Ref_Node := Parent (Ref_Node);
end if;
-- First, detect if Reference indeed can be dynamically identified, that
-- is, it is either a subprogram name in a call or a formal parameter
-- name in a parameter association. Because of the performance reasons,
-- we do this on the tree structures, but not using ASIS queries
case Nkind (Parent_Ref_Node) is
when N_Parameter_Association =>
if Selector_Name (Parent_Ref_Node) = Ref_Node then
Can_Be_Dynamically_Identified := True;
end if;
when N_Procedure_Call_Statement |
N_Function_Call =>
if Sinfo.Name (Parent_Ref_Node) = Ref_Node then
Can_Be_Dynamically_Identified := True;
end if;
when others =>
null;
end case;
if Can_Be_Dynamically_Identified then
Ref_Entity := Entity (Ref_Node);
if No (Ref_Entity)
and then
Nkind (Parent (Ref_Node)) = N_Expanded_Name
and then
Ref_Node = Selector_Name (Parent (Ref_Node))
then
Ref_Node := Parent (Ref_Node);
Ref_Entity := Entity (Ref_Node);
end if;
if Present (Ref_Entity) then
case Ekind (Ref_Entity) is
when Formal_Kind =>
Parent_Call := Parent (Parent (Ref_Node));
when Subprogram_Kind =>
Parent_Call := Parent (Ref_Node);
when others =>
null;
end case;
end if;
if Present (Parent_Call)
and then
(Nkind (Parent_Call) = N_Procedure_Call_Statement
or else
Nkind (Parent_Call) = N_Function_Call)
and then
Present (Controlling_Argument (Parent_Call))
then
Result := True;
end if;
end if;
return Result;
end Is_From_Dispatching_Call;
----------------------------
-- Is_Implicit_Formal_Par --
----------------------------
function Is_Implicit_Formal_Par (Result_El : Element) return Boolean is
Result : Boolean := False;
Res_Node : constant Node_Id := Node (Result_El);
Parent_Node : Node_Id;
begin
if Nkind (Res_Node) in N_Entity
and then
Ekind (Res_Node) in Formal_Kind
then
Parent_Node := Parent (Res_Node);
if Present (Parent_Node)
and then
Nkind (Parent_Node) = N_Parameter_Specification
and then
Res_Node /= Defining_Identifier (Parent_Node)
then
-- The condition is no more than just a clue...
Result := True;
end if;
end if;
return Result;
end Is_Implicit_Formal_Par;
-----------------------
-- Is_Limited_Withed --
-----------------------
function Is_Limited_Withed
(E : Entity_Id;
Reference : Asis.Element)
return Boolean
is
Result : Boolean := False;
CU_E : Asis.Compilation_Unit;
CU_R : Asis.Compilation_Unit;
begin
CU_E := Enclosing_Unit (Encl_Cont_Id (Reference), E);
if Unit_Kind (CU_E) = A_Package then
CU_R := Enclosing_Compilation_Unit (Reference);
if not Is_Equal (CU_R, CU_E) then
declare
CU_E_Name : constant Program_Text :=
To_Upper_Case (Unit_Full_Name (CU_E));
Comp_Clauses : constant Asis.Element_List :=
Context_Clause_Elements (CU_R);
Name_List : Element_List_Access;
begin
for C in Comp_Clauses'Range loop
if Trait_Kind (Comp_Clauses (C)) in
A_Limited_Trait .. A_Limited_Private_Trait
then
Name_List :=
new Asis.Element_List'(Clause_Names (Comp_Clauses (C)));
for N in Name_List'Range loop
if To_Upper_Case (Full_Name_Image (Name_List (N))) =
CU_E_Name
then
Free (Name_List);
Result := True;
exit;
end if;
end loop;
Free (Name_List);
end if;
end loop;
end;
end if;
end if;
return Result;
end Is_Limited_Withed;
-----------------------------------
-- Is_Part_Of_Defining_Unit_Name --
-----------------------------------
function Is_Part_Of_Defining_Unit_Name
(Name_Node : Node_Id)
return Boolean
is
Result : Boolean := False;
Next_Node : Node_Id := Parent (Name_Node);
begin
while Present (Next_Node) loop
if Nkind (Next_Node) = N_Defining_Program_Unit_Name then
Result := True;
exit;
elsif not (Nkind (Next_Node) = N_Expanded_Name or else
Nkind (Next_Node) = N_Selected_Component)
then
-- theoretically, we need only the first part of the condition,
-- but the unit name in the body is not fully decorated and,
-- therefore, has the wrong syntax structure, so we need the
-- second part. We are keeping both in order to have the correct
-- code if it is changed in the tree.
exit;
else
Next_Node := Parent (Next_Node);
end if;
end loop;
return Result;
end Is_Part_Of_Defining_Unit_Name;
------------------
-- Is_Reference --
------------------
function Is_Reference
(Name : Asis.Element;
Ref : Asis.Element)
return Boolean
is
Ref_Kind : constant Internal_Element_Kinds := Reference_Kind (Name);
Result : Boolean := False;
begin
if Int_Kind (Ref) = Ref_Kind then
begin
if Is_Equal (Corresponding_Name_Definition (Ref), Name) then
Result := True;
end if;
exception
-- Corresponding_Name_Definition may raise Asis_Failed with
-- Value_Error status when applied to identifiers which
-- cannot have definitions (see section 17.6). Here we
-- have to skip such Elements paying no attention to
-- exception raising
when others => null;
end;
end if;
return Result;
end Is_Reference;
--------------------------
-- Is_Type_Discriminant --
--------------------------
function Is_Type_Discriminant
(Discr_Node : Node_Id;
Type_Node : Node_Id)
return Boolean
is
Discr_Chars : constant Name_Id := Chars (Discr_Node);
Discr_List : List_Id;
Next_Discr_Spec : Node_Id;
Result : Boolean := False;
begin
Discr_List := Discriminant_Specifications (Type_Node);
if Present (Discr_List) then
Next_Discr_Spec := First (Discr_List);
while Present (Next_Discr_Spec) loop
if Chars (Defining_Identifier (Next_Discr_Spec)) = Discr_Chars then
Result := True;
exit;
end if;
Next_Discr_Spec := Next (Next_Discr_Spec);
end loop;
end if;
return Result;
end Is_Type_Discriminant;
----------------
-- Needs_List --
----------------
function Needs_List (Reference : Asis.Element) return Boolean is
Result : Boolean := False;
N : Node_Id := R_Node (Reference);
Entity_N : Entity_Id;
Pragma_Name_Id : Name_Id;
begin
if Nkind (Parent (N)) = N_Pragma_Argument_Association then
Pragma_Name_Id := Pragma_Name (Parent (Parent (N)));
if Pragma_Name_Id = Name_Asynchronous or else
Pragma_Name_Id = Name_Convention or else
Pragma_Name_Id = Name_Export or else
Pragma_Name_Id = Name_Import or else
Pragma_Name_Id = Name_Inline
then
Entity_N := Entity (N);
if Present (Entity_N) and then
Is_Overloadable (Entity_N) and then
Has_Homonym (Entity_N)
then
-- ??? Is this the right condition???
-- ??? At the moment we do not consider any GNAT-specific
-- pragma
N := Homonym (Entity_N);
if Present (N)
and then
(not (Sloc (N) <= Standard_Location
-- !!! Note, that this check filters out the predefined
-- implicitly declared operations!!!
or else
Part_Of_Pass_Generic_Actual (N)
or else
(Ekind (N) in Subprogram_Kind and then
Is_Formal_Subprogram (N))))
then
Result := True;
end if;
end if;
end if;
end if;
return Result;
end Needs_List;
--------------------
-- Reference_Kind --
--------------------
function Reference_Kind
(Name : Asis.Element)
return Internal_Element_Kinds
is
Arg_Kind : Internal_Element_Kinds := Int_Kind (Name);
Result : Internal_Element_Kinds := Not_An_Element;
begin
if Arg_Kind in Internal_Defining_Name_Kinds then
if Arg_Kind = A_Defining_Expanded_Name then
Arg_Kind := Int_Kind (Defining_Selector (Name));
end if;
end if;
case Arg_Kind is
when A_Defining_Identifier =>
Result := An_Identifier;
when A_Defining_Character_Literal =>
Result := A_Character_Literal;
when A_Defining_Enumeration_Literal =>
Result := An_Enumeration_Literal;
when A_Defining_And_Operator =>
Result := An_And_Operator;
when A_Defining_Or_Operator =>
Result := An_Or_Operator;
when A_Defining_Xor_Operator =>
Result := An_Xor_Operator;
when A_Defining_Equal_Operator =>
Result := An_Equal_Operator;
when A_Defining_Not_Equal_Operator =>
Result := A_Not_Equal_Operator;
when A_Defining_Less_Than_Operator =>
Result := A_Less_Than_Operator;
when A_Defining_Less_Than_Or_Equal_Operator =>
Result := A_Less_Than_Or_Equal_Operator;
when A_Defining_Greater_Than_Operator =>
Result := A_Greater_Than_Operator;
when A_Defining_Greater_Than_Or_Equal_Operator =>
Result := A_Greater_Than_Or_Equal_Operator;
when A_Defining_Plus_Operator =>
Result := A_Plus_Operator;
when A_Defining_Minus_Operator =>
Result := A_Minus_Operator;
when A_Defining_Concatenate_Operator =>
Result := A_Concatenate_Operator;
when A_Defining_Unary_Plus_Operator =>
Result := A_Unary_Plus_Operator;
when A_Defining_Unary_Minus_Operator =>
Result := A_Unary_Minus_Operator;
when A_Defining_Multiply_Operator =>
Result := A_Multiply_Operator;
when A_Defining_Divide_Operator =>
Result := A_Divide_Operator;
when A_Defining_Mod_Operator =>
Result := A_Mod_Operator;
when A_Defining_Rem_Operator =>
Result := A_Rem_Operator;
when A_Defining_Exponentiate_Operator =>
Result := An_Exponentiate_Operator;
when A_Defining_Abs_Operator =>
Result := An_Abs_Operator;
when A_Defining_Not_Operator =>
Result := A_Not_Operator;
when others =>
null;
end case;
return Result;
end Reference_Kind;
------------------------
-- Reset_To_Full_View --
------------------------
function Reset_To_Full_View
(Full_View : Node_Id;
Discr : Node_Id)
return Node_Id
is
Result : Node_Id;
Discr_Chars : constant Name_Id := Chars (Discr);
begin
Result := First (Discriminant_Specifications (Full_View));
while Present (Result) loop
exit when Chars (Defining_Identifier (Result)) = Discr_Chars;
Result := Next (Result);
end loop;
pragma Assert (Present (Result));
Result := Defining_Identifier (Result);
return Result;
end Reset_To_Full_View;
-------------------
-- Reset_To_Spec --
-------------------
function Reset_To_Spec (Name_Node : Node_Id) return Node_Id is
Result : Node_Id := Empty;
Next_Node : Node_Id := Parent (Name_Node);
Name_Chars : constant Name_Id := Chars (Name_Node);
begin
while Nkind (Next_Node) /= N_Defining_Program_Unit_Name loop
Next_Node := Parent (Next_Node);
end loop;
if Nkind (Parent (Next_Node)) in N_Subprogram_Specification then
Next_Node := Parent (Next_Node);
end if;
Next_Node := Corresponding_Spec (Parent (Next_Node));
while Nkind (Next_Node) /= N_Defining_Program_Unit_Name loop
Next_Node := Parent (Next_Node);
end loop;
Next_Node := Parent (Next_Node);
Next_Node := Defining_Unit_Name (Next_Node);
-- Now Next_Node should point to the defining program unit name in the
-- spec:
Next_Node := Sinfo.Name (Next_Node);
while Present (Next_Node) loop
if Nkind (Next_Node) = N_Expanded_Name then
Next_Node := Selector_Name (Next_Node);
end if;
if Name_Chars = Chars (Next_Node) then
Result := Next_Node;
exit;
end if;
Next_Node := Parent (Next_Node);
if Nkind (Next_Node) = N_Expanded_Name then
Next_Node := Prefix (Next_Node);
else
exit;
end if;
end loop;
pragma Assert (Present (Result));
return Result;
end Reset_To_Spec;
---------------------
-- Rewritten_Image --
---------------------
function Rewritten_Image (Selector_Name : Node_Id) return Node_Id is
Name_Chars : constant Name_Id := Chars (Selector_Name);
Aggr_Node : Node_Id;
Result_Node : Node_Id := Empty;
Association_Node : Node_Id;
Choice_Node : Node_Id;
begin
-- may be, we have to be more smart for aggregates in aggregates...
Aggr_Node := Parent (Selector_Name);
-- we are in N_Component_Association node, and its Parent points not
-- to the original, but to the rewritten structure for aggregate
Aggr_Node := Parent (Aggr_Node);
-- we are in the rewritten node for the aggregate
pragma Assert (
(Nkind (Aggr_Node) = N_Aggregate or else
Nkind (Aggr_Node) = N_Extension_Aggregate)
and then
Is_Rewrite_Substitution (Aggr_Node));
-- and now - traversing the rewritten structure
Association_Node :=
First_Non_Pragma (Component_Associations (Aggr_Node));
Associations : while Present (Association_Node) loop
Choice_Node := First_Non_Pragma (Choices (Association_Node));
-- in the rewritten aggregate it is exactly one choice in any
-- component association
if Chars (Choice_Node) = Name_Chars then
Result_Node := Choice_Node;
exit Associations;
end if;
Association_Node := Next_Non_Pragma (Association_Node);
end loop Associations;
pragma Assert (Present (Result_Node));
return Result_Node;
end Rewritten_Image;
------------------------
-- Search_Record_Comp --
------------------------
function Search_Record_Comp (Selector_Name : Node_Id) return Entity_Id is
Result : Entity_Id := Empty;
Res_Chars : constant Name_Id := Chars (Selector_Name);
Aggr_Type : Entity_Id;
begin
Aggr_Type := Parent (Selector_Name);
while not (Nkind (Aggr_Type) = N_Extension_Aggregate
or else
Nkind (Aggr_Type) = N_Aggregate
or else
No (Aggr_Type))
loop
Aggr_Type := Parent (Aggr_Type);
end loop;
if No (Aggr_Type) then
-- This definitely means that something went wrong...
pragma Assert (False);
return Empty;
end if;
Aggr_Type := Etype (Aggr_Type);
while Ekind (Aggr_Type) /= E_Record_Type loop
if Ekind (Aggr_Type) = E_Private_Type
or else
Ekind (Aggr_Type) = E_Limited_Private_Type
or else
Ekind (Aggr_Type) = E_Record_Type_With_Private
then
Aggr_Type := Full_View (Aggr_Type);
else
Aggr_Type := Etype (Aggr_Type);
end if;
end loop;
Result := First_Entity (Aggr_Type);
while Chars (Result) /= Res_Chars loop
Result := Next_Entity (Result);
end loop;
pragma Assert (Present (Result));
return Result;
end Search_Record_Comp;
-------------------
-- To_Upper_Case --
-------------------
function To_Upper_Case (S : Wide_String) return Wide_String is
Result : Wide_String (S'Range);
begin
for J in Result'Range loop
Result (J) := Ada.Wide_Characters.Unicode.To_Upper_Case (S (J));
end loop;
return Result;
end To_Upper_Case;
end A4G.Expr_Sem;
|
alloy4fun_models/trainstlt/models/13/pMGhxMfSFnjnJNxao.als | Kaixi26/org.alloytools.alloy | 0 | 4063 | <reponame>Kaixi26/org.alloytools.alloy
open main
pred idpMGhxMfSFnjnJNxao_prop14 {
always ( all t:Train | (some t.pos and some (t.pos.signal :>Green) )implies (t.pos'.signal in Signal-Green) )
}
pred __repair { idpMGhxMfSFnjnJNxao_prop14 }
check __repair { idpMGhxMfSFnjnJNxao_prop14 <=> prop14o } |
source/tasking/machine-w64-mingw32/s-natint.adb | ytomino/drake | 33 | 18025 | with C.signal;
package body System.Native_Interrupts is
use type C.signed_int;
procedure Raise_Interrupt (Interrupt : Interrupt_Id) is
begin
if C.signal.C_raise (C.signed_int (Interrupt)) < 0 then
raise Program_Error;
end if;
end Raise_Interrupt;
end System.Native_Interrupts;
|
other.7z/SFC.7z/SFC/γ½γΌγΉγγΌγΏ/srd13-SFCγγͺγͺγ³γ¬γ―γ·γ§γ³/export/mario-z/linkp/mario_n1/mn_hp_smsnd.asm | prismotizm/gigaleak | 0 | 14582 | <gh_stars>0
Name: mn_hp_smsnd.asm
Type: file
Size: 23400
Last-Modified: '1993-08-24T11:34:58Z'
SHA-1: 27C8243297853D12CC2928CCBEACB5D919309A46
Description: null
|
opal/asm/base/AMD64.asm | ctrlsys/sensys | 14 | 167676 | START_FILE
TEXT
START_FUNC(opal_atomic_mb)
pushq %rbp
movq %rsp, %rbp
leave
ret
END_FUNC(opal_atomic_mb)
START_FUNC(opal_atomic_rmb)
pushq %rbp
movq %rsp, %rbp
leave
ret
END_FUNC(opal_atomic_rmb)
START_FUNC(opal_atomic_wmb)
pushq %rbp
movq %rsp, %rbp
leave
ret
END_FUNC(opal_atomic_wmb)
START_FUNC(opal_atomic_cmpset_32)
movl %esi, %eax
lock; cmpxchgl %edx,(%rdi)
sete %dl
movzbl %dl, %eax
ret
END_FUNC(opal_atomic_cmpset_32)
START_FUNC(opal_atomic_cmpset_64)
movq %rsi, %rax
lock; cmpxchgq %rdx,(%rdi)
sete %dl
movzbl %dl, %eax
ret
END_FUNC(opal_atomic_cmpset_64)
START_FUNC(opal_sys_timer_get_cycles)
rdtsc
salq $32, %rdx
mov %eax, %eax
orq %rdx, %rax
ret
END_FUNC(opal_sys_timer_get_cycles)
|
drivers/sparse_test.adb | sciencylab/lagrangian-solver | 0 | 20612 | with Numerics, Numerics.Sparse_Matrices, Ada.Text_IO;
use Numerics, Numerics.Sparse_Matrices, Ada.Text_IO;
with Ada.Numerics.Generic_Real_Arrays;
procedure Sparse_Test is
use Real_IO, Int_IO;
package RA is new Ada.Numerics.Generic_Real_Arrays (Real); use RA;
-- U : RA.Real_Matrix := (1 => (1 => 1.0),
-- 2 => (1 => 2.0),
-- 3 => (1 => 0.0),
-- 4 => (1 => 4.0),
-- 5 => (1 => 0.0),
-- 6 => (1 => -3.2));
-- V : RA.Real_Matrix := (1 => (6.0, 0.0, 7.0, 1.0, 8.0, 4.7));
X : Sparse_Vector := Sparse ((1.0, 2.0));
Y : Sparse_Vector := Sparse ((6.0, 0.0));
A : Sparse_Matrix;
B : Sparse_Matrix;
C : Sparse_Matrix;
-- D : RA.Real_Matrix := U * V;
-- E : RA.Real_Matrix := Transpose (D);
-- F : RA.Real_Matrix (E'Range (1), E'Range (2));
begin
A := X * Y; Print (A);
B := X * X; Print (B);
Print (A - B);
Print (B - A);
-- for I in 1 .. 10_000 loop
-- -- C := A * B;
-- F := D * E;
-- end loop;
end Sparse_Test;
|
Transynther/x86/_processed/NONE/_xt_/i7-7700_9_0xca_notsx.log_21829_8.asm | ljhsiun2/medusa | 9 | 100808 | <reponame>ljhsiun2/medusa<filename>Transynther/x86/_processed/NONE/_xt_/i7-7700_9_0xca_notsx.log_21829_8.asm
.global s_prepare_buffers
s_prepare_buffers:
push %r11
push %r15
push %r8
push %rcx
push %rdi
push %rsi
lea addresses_D_ht+0x103af, %rsi
lea addresses_WT_ht+0xe217, %rdi
nop
nop
nop
add $15794, %r15
mov $43, %rcx
rep movsl
nop
nop
dec %r11
lea addresses_UC_ht+0x17bb3, %rsi
nop
nop
nop
and %r8, %r8
vmovups (%rsi), %ymm2
vextracti128 $0, %ymm2, %xmm2
vpextrq $1, %xmm2, %r11
nop
nop
nop
add $60628, %rsi
pop %rsi
pop %rdi
pop %rcx
pop %r8
pop %r15
pop %r11
ret
.global s_faulty_load
s_faulty_load:
push %r12
push %r13
push %r8
push %r9
push %rax
push %rcx
push %rdi
push %rsi
// Load
lea addresses_A+0xa27f, %r8
clflush (%r8)
dec %r9
mov (%r8), %ecx
nop
sub %r8, %r8
// REPMOV
lea addresses_normal+0xbba3, %rsi
lea addresses_WT+0x404f, %rdi
nop
nop
nop
nop
and %rax, %rax
mov $24, %rcx
rep movsb
inc %r8
// Store
lea addresses_RW+0x1e32f, %rcx
nop
nop
nop
nop
and %rsi, %rsi
movl $0x51525354, (%rcx)
nop
nop
nop
nop
sub $8720, %rsi
// Faulty Load
lea addresses_PSE+0xe84f, %rcx
dec %rsi
mov (%rcx), %r8d
lea oracles, %r12
and $0xff, %r8
shlq $12, %r8
mov (%r12,%r8,1), %r8
pop %rsi
pop %rdi
pop %rcx
pop %rax
pop %r9
pop %r8
pop %r13
pop %r12
ret
/*
<gen_faulty_load>
[REF]
{'src': {'NT': False, 'AVXalign': False, 'size': 4, 'congruent': 0, 'same': False, 'type': 'addresses_PSE'}, 'OP': 'LOAD'}
{'src': {'NT': True, 'AVXalign': False, 'size': 4, 'congruent': 4, 'same': False, 'type': 'addresses_A'}, 'OP': 'LOAD'}
{'src': {'congruent': 1, 'same': False, 'type': 'addresses_normal'}, 'dst': {'congruent': 11, 'same': False, 'type': 'addresses_WT'}, 'OP': 'REPM'}
{'dst': {'NT': False, 'AVXalign': False, 'size': 4, 'congruent': 5, 'same': False, 'type': 'addresses_RW'}, 'OP': 'STOR'}
[Faulty Load]
{'src': {'NT': False, 'AVXalign': False, 'size': 4, 'congruent': 0, 'same': True, 'type': 'addresses_PSE'}, 'OP': 'LOAD'}
<gen_prepare_buffer>
{'src': {'congruent': 5, 'same': False, 'type': 'addresses_D_ht'}, 'dst': {'congruent': 3, 'same': False, 'type': 'addresses_WT_ht'}, 'OP': 'REPM'}
{'src': {'NT': False, 'AVXalign': False, 'size': 32, 'congruent': 1, 'same': False, 'type': 'addresses_UC_ht'}, 'OP': 'LOAD'}
{'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
*/
|
awa/plugins/awa-sysadmin/src/model/awa-sysadmin-models.adb | My-Colaborations/ada-awa | 81 | 3182 | -----------------------------------------------------------------------
-- AWA.Sysadmin.Models -- AWA.Sysadmin.Models
-----------------------------------------------------------------------
-- File generated by ada-gen DO NOT MODIFY
-- Template used: templates/model/package-body.xhtml
-- Ada Generator: https://ada-gen.googlecode.com/svn/trunk Revision 1095
-----------------------------------------------------------------------
-- Copyright (C) 2020 <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 Ada.Unchecked_Deallocation;
with ASF.Events.Faces.Actions;
package body AWA.Sysadmin.Models is
use type ADO.Objects.Object_Record_Access;
use type ADO.Objects.Object_Ref;
pragma Warnings (Off, "formal parameter * is not referenced");
procedure Op_Authenticate (Bean : in out Authenticate_Bean;
Outcome : in out Ada.Strings.Unbounded.Unbounded_String);
procedure Op_Authenticate (Bean : in out Authenticate_Bean;
Outcome : in out Ada.Strings.Unbounded.Unbounded_String) is
begin
Authenticate_Bean'Class (Bean).Authenticate (Outcome);
end Op_Authenticate;
package Binding_Authenticate_Bean_1 is
new ASF.Events.Faces.Actions.Action_Method.Bind (Bean => Authenticate_Bean,
Method => Op_Authenticate,
Name => "authenticate");
Binding_Authenticate_Bean_Array : aliased constant Util.Beans.Methods.Method_Binding_Array
:= (1 => Binding_Authenticate_Bean_1.Proxy'Access
);
-- ------------------------------
-- This bean provides some methods that can be used in a Method_Expression.
-- ------------------------------
overriding
function Get_Method_Bindings (From : in Authenticate_Bean)
return Util.Beans.Methods.Method_Binding_Array_Access is
pragma Unreferenced (From);
begin
return Binding_Authenticate_Bean_Array'Access;
end Get_Method_Bindings;
-- ------------------------------
-- Get the bean attribute identified by the name.
-- ------------------------------
overriding
function Get_Value (From : in Authenticate_Bean;
Name : in String) return Util.Beans.Objects.Object is
begin
if Name = "password" then
return Util.Beans.Objects.To_Object (From.Password);
end if;
return Util.Beans.Objects.Null_Object;
end Get_Value;
-- ------------------------------
-- Set the value identified by the name
-- ------------------------------
overriding
procedure Set_Value (Item : in out Authenticate_Bean;
Name : in String;
Value : in Util.Beans.Objects.Object) is
begin
if Name = "password" then
Item.Password := Util.Beans.Objects.To_Unbounded_String (Value);
end if;
end Set_Value;
end AWA.Sysadmin.Models;
|
bb-runtimes/examples/stm32f4-discovery/leds-po/leds.adb | JCGobbi/Nucleo-STM32G474RE | 0 | 9139 | <filename>bb-runtimes/examples/stm32f4-discovery/leds-po/leds.adb
------------------------------------------------------------------------------
-- --
-- GNAT EXAMPLE --
-- --
-- Copyright (C) 2013, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Ada.Interrupts.Names;
with Ada.Real_Time; use Ada.Real_Time;
package body Leds is
protected Button is
pragma Interrupt_Priority;
function Get_Direction return Boolean;
-- Give the state
private
procedure Handler;
pragma Attach_Handler (Handler, Ada.Interrupts.Names.EXTI0_Interrupt);
-- Interrupt handler
Direction : Boolean := False;
-- The state
Last_Time : Time := Clock;
end Button;
Debounce_Time : constant Time_Span := Milliseconds (500);
protected body Button is
function Get_Direction return Boolean is
begin
return Direction;
end Get_Direction;
procedure Handler is
Now : constant Time := Clock;
begin
-- Clear interrupt
EXTI.PR (0) := 1;
-- Debouncing
if Now - Last_Time >= Debounce_Time then
-- Change the direction
Direction := not Direction;
Last_Time := Now;
end if;
end Handler;
end Button;
function Get_Direction return Boolean is
begin
return Button.Get_Direction;
end Get_Direction;
begin
-- Enable clock for GPIO-D (leds) and GPIO-A (button)
RCC.AHB1ENR := RCC.AHB1ENR or RCC_AHB1ENR_GPIOD or RCC_AHB1ENR_GPIOA;
-- And for SYSCFGEN
RCC.APB2ENR := RCC.APB2ENR or RCC_APB2ENR_SYSCFGEN;
-- Configure PD12-15 (leds) and PA0 (Button)
declare
use GPIO;
begin
GPIOD.MODER (12 .. 15) := (others => Mode_OUT);
GPIOD.OTYPER (12 .. 15) := (others => Type_PP);
GPIOD.OSPEEDR (12 .. 15) := (others => Speed_100MHz);
GPIOD.PUPDR (12 .. 15) := (others => No_Pull);
GPIOA.MODER (0) := Mode_IN;
GPIOA.PUPDR (0) := No_Pull;
end;
-- Select PA for EXTI0
SYSCFG.EXTICR1 (0) := 0;
-- Interrupt on rising edge
EXTI.FTSR (0) := 0;
EXTI.RTSR (0) := 1;
EXTI.IMR (0) := 1;
end Leds;
|
gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/cd/cd2d11a.ada | best08618/asylo | 7 | 25704 | <filename>gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/cd/cd2d11a.ada<gh_stars>1-10
-- CD2D11A.ADA
-- Grant of Unlimited Rights
--
-- Under contracts F33600-87-D-0337, F33600-84-D-0280, MDA903-79-C-0687,
-- F08630-91-C-0015, and DCA100-97-D-0025, the U.S. Government obtained
-- unlimited rights in the software and documentation contained herein.
-- Unlimited rights are defined in DFAR 252.227-7013(a)(19). By making
-- this public release, the Government intends to confer upon all
-- recipients unlimited rights equal to those held by the Government.
-- These rights include rights to use, duplicate, release or disclose the
-- released technical data and computer software in whole or in part, in
-- any manner and for any purpose whatsoever, and to have or permit others
-- to do so.
--
-- DISCLAIMER
--
-- ALL MATERIALS OR INFORMATION HEREIN RELEASED, MADE AVAILABLE OR
-- DISCLOSED ARE AS IS. THE GOVERNMENT MAKES NO EXPRESS OR IMPLIED
-- WARRANTY AS TO ANY MATTER WHATSOEVER, INCLUDING THE CONDITIONS OF THE
-- SOFTWARE, DOCUMENTATION OR OTHER INFORMATION RELEASED, MADE AVAILABLE
-- OR DISCLOSED, OR THE OWNERSHIP, MERCHANTABILITY, OR FITNESS FOR A
-- PARTICULAR PURPOSE OF SAID MATERIAL.
--*
-- OBJECTIVE:
-- CHECK THAT IF A SMALL SPECIFICATION IS GIVEN FOR A
-- FIXED POINT TYPE, THEN ARITHMETIC OPERATIONS ON VALUES OF THE
-- TYPE ARE NOT AFFECTED BY THE REPRESENTATION CLAUSE.
-- HISTORY:
-- BCB 09/01/87 CREATED ORIGINAL TEST.
-- PWB 05/11/89 CHANGED EXTENSION FROM '.DEP' TO '.ADA'.
WITH REPORT; USE REPORT;
PROCEDURE CD2D11A IS
BASIC_SMALL : CONSTANT := 2.0 ** (-4);
TYPE BASIC_TYPE IS DELTA 2.0 ** (-4) RANGE -4.0 .. 4.0;
TYPE CHECK_TYPE IS DELTA 1.0 RANGE -4.0 .. 4.0;
FOR CHECK_TYPE'SMALL USE BASIC_SMALL;
CNEG1 : CHECK_TYPE := -3.5;
CNEG2 : CHECK_TYPE := CHECK_TYPE (-1.0/3.0);
CPOS1 : CHECK_TYPE := CHECK_TYPE (4.0/6.0);
CPOS2 : CHECK_TYPE := 3.5;
CZERO : CHECK_TYPE;
TYPE ARRAY_TYPE IS ARRAY (0 .. 3) OF CHECK_TYPE;
CHARRAY : ARRAY_TYPE :=
(-3.5, CHECK_TYPE (-1.0/3.0), CHECK_TYPE (4.0/6.0), 3.5);
TYPE REC_TYPE IS RECORD
COMPN1 : CHECK_TYPE := -3.5;
COMPN2 : CHECK_TYPE := CHECK_TYPE (-1.0/3.0);
COMPP1 : CHECK_TYPE := CHECK_TYPE (4.0/6.0);
COMPP2 : CHECK_TYPE := 3.5;
END RECORD;
CHREC : REC_TYPE;
FUNCTION IDENT (FX : CHECK_TYPE) RETURN CHECK_TYPE IS
BEGIN
IF EQUAL (3, 3) THEN
RETURN FX;
ELSE
RETURN 0.0;
END IF;
END IDENT;
PROCEDURE PROC (N1_IN, P1_IN : CHECK_TYPE;
N2_INOUT,P2_INOUT : IN OUT CHECK_TYPE;
CZOUT : OUT CHECK_TYPE) IS
BEGIN
IF IDENT (N1_IN) + P1_IN NOT IN
-2.875 .. -2.8125 OR
P2_INOUT - IDENT (P1_IN) NOT IN
2.8125 .. 2.875 THEN
FAILED ("INCORRECT RESULTS FOR " &
"BINARY ADDING OPERATORS - 1");
END IF;
IF +IDENT (N2_INOUT) NOT IN -0.375 .. -0.3125 OR
IDENT (-P1_IN) NOT IN -0.6875 .. -0.625 THEN
FAILED ("INCORRECT RESULTS FOR " &
"UNARY ADDING OPERATORS - 1");
END IF;
IF CHECK_TYPE (N1_IN * IDENT (P1_IN)) NOT IN
-2.4375 .. -2.1875 OR
CHECK_TYPE (IDENT (N2_INOUT) / P2_INOUT) NOT IN
-0.125 .. -0.0625 THEN
FAILED ("INCORRECT RESULTS FOR " &
"MULTIPLYING OPERATORS - 1");
END IF;
IF ABS IDENT (N2_INOUT) NOT IN 0.3125 .. 0.375 OR
IDENT (ABS P1_IN) NOT IN 0.625 .. 0.6875 THEN
FAILED ("INCORRECT RESULTS FOR " &
"ABSOLUTE VALUE OPERATORS - 1");
END IF;
CZOUT := 0.0;
END PROC;
BEGIN
TEST ("CD2D11A", "CHECK THAT IF A SMALL SPECIFICATION IS " &
"GIVEN FOR AN FIXED POINT TYPE, THEN " &
"ARITHMETIC OPERATIONS ON VALUES OF THE " &
"TYPE ARE NOT AFFECTED BY THE REPRESENTATION " &
"CLAUSE");
PROC (CNEG1, CPOS1, CNEG2, CPOS2, CZERO);
IF IDENT (CZERO) /= 0.0 THEN
FAILED ("INCORRECT VALUE FOR OUT PARAMETER");
END IF;
IF IDENT (CNEG1) + CPOS1 NOT IN -2.875 .. -2.8125 OR
CPOS2 - IDENT (CPOS1) NOT IN 2.8125 .. 2.875 THEN
FAILED ("INCORRECT RESULTS FOR BINARY ADDING OPERATORS - 2");
END IF;
IF +IDENT (CNEG2) NOT IN -0.375 .. -0.3125 OR
IDENT (-CPOS1) NOT IN -0.6875 .. -0.625 THEN
FAILED ("INCORRECT RESULTS FOR UNARY ADDING OPERATORS - 2");
END IF;
IF CHECK_TYPE (CNEG1 * IDENT (CPOS1)) NOT IN -2.4375 .. -2.1875 OR
CHECK_TYPE (IDENT (CNEG2) / CPOS2) NOT IN
-0.125 .. -0.0625 THEN
FAILED ("INCORRECT RESULTS FOR MULTIPLYING OPERATORS - 2");
END IF;
IF ABS IDENT (CNEG2) NOT IN 0.3125 .. 0.375 OR
IDENT (ABS CPOS1) NOT IN 0.625 .. 0.6875 THEN
FAILED ("INCORRECT RESULTS FOR ABSOLUTE VALUE " &
"OPERATORS - 2");
END IF;
IF IDENT (CPOS1) NOT IN 0.625 .. 0.6875 OR
CNEG2 IN -0.25 .. 0.0 OR
IDENT (CNEG2) IN -1.0 .. -0.4375 THEN
FAILED ("INCORRECT RESULTS FOR MEMBERSHIP OPERATORS - 2");
END IF;
IF IDENT (CHARRAY (0)) + CHARRAY (2) NOT IN
-2.875 .. -2.8125 OR
CHARRAY (3) - IDENT (CHARRAY (2)) NOT IN
2.8125 .. 2.875 THEN
FAILED ("INCORRECT RESULTS FOR BINARY ADDING OPERATORS - 3");
END IF;
IF +IDENT (CHARRAY (1)) NOT IN -0.375 .. -0.3125 OR
IDENT (-CHARRAY (2)) NOT IN -0.6875 .. -0.625 THEN
FAILED ("INCORRECT RESULTS FOR UNARY ADDING OPERATORS - 3");
END IF;
IF CHECK_TYPE (CHARRAY (0) * IDENT (CHARRAY (2))) NOT IN
-2.4375 .. -2.1875 OR
CHECK_TYPE (IDENT (CHARRAY (1)) / CHARRAY (3)) NOT IN
-0.125 .. -0.0625 THEN
FAILED ("INCORRECT RESULTS FOR MULTIPLYING OPERATORS - 3");
END IF;
IF ABS IDENT (CHARRAY (1)) NOT IN 0.3125 .. 0.375 OR
IDENT (ABS CHARRAY (2)) NOT IN 0.625 .. 0.6875 THEN
FAILED ("INCORRECT RESULTS FOR ABSOLUTE VALUE " &
"OPERATORS - 3");
END IF;
IF IDENT (CHARRAY (2)) NOT IN 0.625 .. 0.6875 OR
CHARRAY (1) IN -0.25 .. 0.0 OR
IDENT (CHARRAY (1)) IN -1.0 .. -0.4375 THEN
FAILED ("INCORRECT RESULTS FOR MEMBERSHIP OPERATORS - 3");
END IF;
IF IDENT (CHREC.COMPN1) + CHREC.COMPP1 NOT IN
-2.875 .. -2.8125 OR
CHREC.COMPP2 - IDENT (CHREC.COMPP1) NOT IN
2.8125 .. 2.875 THEN
FAILED ("INCORRECT RESULTS FOR BINARY ADDING OPERATORS - 4");
END IF;
IF +IDENT (CHREC.COMPN2) NOT IN -0.375 .. -0.3125 OR
IDENT (-CHREC.COMPP1) NOT IN -0.6875 .. -0.625 THEN
FAILED ("INCORRECT RESULTS FOR UNARY ADDING OPERATORS - 4");
END IF;
IF CHECK_TYPE (CHREC.COMPN1 * IDENT (CHREC.COMPP1)) NOT IN
-2.4375 .. -2.1875 OR
CHECK_TYPE (IDENT (CHREC.COMPN2) / CHREC.COMPP2) NOT IN
-0.125 .. -0.0625 THEN
FAILED ("INCORRECT RESULTS FOR MULTIPLYING OPERATORS - 4");
END IF;
IF ABS IDENT (CHREC.COMPN2) NOT IN 0.3125 .. 0.375 OR
IDENT (ABS CHREC.COMPP1) NOT IN 0.625 .. 0.6875 THEN
FAILED ("INCORRECT RESULTS FOR ABSOLUTE VALUE " &
"OPERATORS - 4");
END IF;
IF IDENT (CHREC.COMPP1) NOT IN 0.625 .. 0.6875 OR
CHREC.COMPN2 IN -0.25 .. 0.0 OR
IDENT (CHREC.COMPN2) IN -1.0 .. -0.4375 THEN
FAILED ("INCORRECT RESULTS FOR MEMBERSHIP OPERATORS - 4");
END IF;
RESULT;
END CD2D11A;
|
ps.asm | Tookerton21/Xv6_OS | 0 | 241132 | <gh_stars>0
_ps: file format elf32-i386
Disassembly of section .text:
00000000 <main>:
#include "user.h"
#include "uproc.h"
//#include "syscall.h"
#define SIZE 72
int main(int argc, char* argv[]){
0: 8d 4c 24 04 lea 0x4(%esp),%ecx
4: 83 e4 f0 and $0xfffffff0,%esp
7: ff 71 fc pushl -0x4(%ecx)
a: 55 push %ebp
b: 89 e5 mov %esp,%ebp
d: 57 push %edi
e: 56 push %esi
f: 53 push %ebx
10: 51 push %ecx
11: 83 ec 48 sub $0x48,%esp
14: 89 c8 mov %ecx,%eax
//Variable dec
struct uproc *uptr;
int size_ar;
//Test to see if there is a second arg
if(argv[1] != 0)
16: 8b 50 04 mov 0x4(%eax),%edx
19: 83 c2 04 add $0x4,%edx
1c: 8b 12 mov (%edx),%edx
1e: 85 d2 test %edx,%edx
20: 74 19 je 3b <main+0x3b>
size_ar = atoi(argv[1]);//Converting string into an int
22: 8b 40 04 mov 0x4(%eax),%eax
25: 83 c0 04 add $0x4,%eax
28: 8b 00 mov (%eax),%eax
2a: 83 ec 0c sub $0xc,%esp
2d: 50 push %eax
2e: e8 e5 03 00 00 call 418 <atoi>
33: 83 c4 10 add $0x10,%esp
36: 89 45 e4 mov %eax,-0x1c(%ebp)
39: eb 07 jmp 42 <main+0x42>
else//Default to size 72
size_ar = SIZE;
3b: c7 45 e4 48 00 00 00 movl $0x48,-0x1c(%ebp)
uptr = malloc(sizeof(struct uproc) * size_ar);//allocate memory off the heap
42: 8b 45 e4 mov -0x1c(%ebp),%eax
45: 6b c0 5c imul $0x5c,%eax,%eax
48: 83 ec 0c sub $0xc,%esp
4b: 50 push %eax
4c: e8 28 09 00 00 call 979 <malloc>
51: 83 c4 10 add $0x10,%esp
54: 89 45 d8 mov %eax,-0x28(%ebp)
int size = getprocs(size_ar, uptr);//Get the amount of uproc tables
57: 83 ec 08 sub $0x8,%esp
5a: ff 75 d8 pushl -0x28(%ebp)
5d: ff 75 e4 pushl -0x1c(%ebp)
60: e8 62 05 00 00 call 5c7 <getprocs>
65: 83 c4 10 add $0x10,%esp
68: 89 45 d4 mov %eax,-0x2c(%ebp)
//Test to ensure that number return from getprocs is valid
if(size < 0){
6b: 83 7d d4 00 cmpl $0x0,-0x2c(%ebp)
6f: 79 17 jns 88 <main+0x88>
printf(2, "getprocs failed\n");
71: 83 ec 08 sub $0x8,%esp
74: 68 5c 0a 00 00 push $0xa5c
79: 6a 02 push $0x2
7b: e8 26 06 00 00 call 6a6 <printf>
80: 83 c4 10 add $0x10,%esp
exit();
83: e8 67 04 00 00 call 4ef <exit>
}
//Print out the label for the uproc table
printf(2,"%s,\t %s,\t %s,\t %s,\t %s, %s,\t %s,\t %s,\t %s,\t \n","PID",
88: 83 ec 04 sub $0x4,%esp
8b: 68 6d 0a 00 00 push $0xa6d
90: 68 72 0a 00 00 push $0xa72
95: 68 77 0a 00 00 push $0xa77
9a: 68 7d 0a 00 00 push $0xa7d
9f: 68 81 0a 00 00 push $0xa81
a4: 68 89 0a 00 00 push $0xa89
a9: 68 8e 0a 00 00 push $0xa8e
ae: 68 92 0a 00 00 push $0xa92
b3: 68 96 0a 00 00 push $0xa96
b8: 68 9c 0a 00 00 push $0xa9c
bd: 6a 02 push $0x2
bf: e8 e2 05 00 00 call 6a6 <printf>
c4: 83 c4 30 add $0x30,%esp
"CPU",
"State",
"Size",
"Name");
//Print out the Uproc table using size as the condition in the for loop.
for(int i=0; i<size; ++i){
c7: c7 45 e0 00 00 00 00 movl $0x0,-0x20(%ebp)
ce: e9 18 01 00 00 jmp 1eb <main+0x1eb>
uptr[i].ppid,
uptr[i].elapsed_ticks/100, uptr[i].elapsed_ticks%100,
uptr[i].CPU_total_ticks/100, uptr[i].CPU_total_ticks%100,
uptr[i].state,
uptr[i].size,
uptr[i].name);
d3: 8b 45 e0 mov -0x20(%ebp),%eax
d6: 6b d0 5c imul $0x5c,%eax,%edx
d9: 8b 45 d8 mov -0x28(%ebp),%eax
dc: 01 d0 add %edx,%eax
de: 83 c0 3c add $0x3c,%eax
e1: 89 45 c4 mov %eax,-0x3c(%ebp)
uptr[i].gid,
uptr[i].ppid,
uptr[i].elapsed_ticks/100, uptr[i].elapsed_ticks%100,
uptr[i].CPU_total_ticks/100, uptr[i].CPU_total_ticks%100,
uptr[i].state,
uptr[i].size,
e4: 8b 45 e0 mov -0x20(%ebp),%eax
e7: 6b d0 5c imul $0x5c,%eax,%edx
ea: 8b 45 d8 mov -0x28(%ebp),%eax
ed: 01 d0 add %edx,%eax
"State",
"Size",
"Name");
//Print out the Uproc table using size as the condition in the for loop.
for(int i=0; i<size; ++i){
printf(1, ":%d\t :%d\t :%d\t :%d\t :%d.%d\t :%d.%d\t :%s\t :%d\t :%s\t \n", uptr[i].pid,
ef: 8b 78 38 mov 0x38(%eax),%edi
f2: 89 7d c0 mov %edi,-0x40(%ebp)
uptr[i].uid,
uptr[i].gid,
uptr[i].ppid,
uptr[i].elapsed_ticks/100, uptr[i].elapsed_ticks%100,
uptr[i].CPU_total_ticks/100, uptr[i].CPU_total_ticks%100,
uptr[i].state,
f5: 8b 45 e0 mov -0x20(%ebp),%eax
f8: 6b d0 5c imul $0x5c,%eax,%edx
fb: 8b 45 d8 mov -0x28(%ebp),%eax
fe: 01 d0 add %edx,%eax
100: 8d 48 18 lea 0x18(%eax),%ecx
103: 89 4d bc mov %ecx,-0x44(%ebp)
printf(1, ":%d\t :%d\t :%d\t :%d\t :%d.%d\t :%d.%d\t :%s\t :%d\t :%s\t \n", uptr[i].pid,
uptr[i].uid,
uptr[i].gid,
uptr[i].ppid,
uptr[i].elapsed_ticks/100, uptr[i].elapsed_ticks%100,
uptr[i].CPU_total_ticks/100, uptr[i].CPU_total_ticks%100,
106: 8b 45 e0 mov -0x20(%ebp),%eax
109: 6b d0 5c imul $0x5c,%eax,%edx
10c: 8b 45 d8 mov -0x28(%ebp),%eax
10f: 01 d0 add %edx,%eax
111: 8b 48 14 mov 0x14(%eax),%ecx
"State",
"Size",
"Name");
//Print out the Uproc table using size as the condition in the for loop.
for(int i=0; i<size; ++i){
printf(1, ":%d\t :%d\t :%d\t :%d\t :%d.%d\t :%d.%d\t :%s\t :%d\t :%s\t \n", uptr[i].pid,
114: ba 1f 85 eb 51 mov $0x51eb851f,%edx
119: 89 c8 mov %ecx,%eax
11b: f7 e2 mul %edx
11d: 89 d6 mov %edx,%esi
11f: c1 ee 05 shr $0x5,%esi
122: 6b c6 64 imul $0x64,%esi,%eax
125: 89 ce mov %ecx,%esi
127: 29 c6 sub %eax,%esi
uptr[i].uid,
uptr[i].gid,
uptr[i].ppid,
uptr[i].elapsed_ticks/100, uptr[i].elapsed_ticks%100,
uptr[i].CPU_total_ticks/100, uptr[i].CPU_total_ticks%100,
129: 8b 45 e0 mov -0x20(%ebp),%eax
12c: 6b d0 5c imul $0x5c,%eax,%edx
12f: 8b 45 d8 mov -0x28(%ebp),%eax
132: 01 d0 add %edx,%eax
134: 8b 40 14 mov 0x14(%eax),%eax
"State",
"Size",
"Name");
//Print out the Uproc table using size as the condition in the for loop.
for(int i=0; i<size; ++i){
printf(1, ":%d\t :%d\t :%d\t :%d\t :%d.%d\t :%d.%d\t :%s\t :%d\t :%s\t \n", uptr[i].pid,
137: ba 1f 85 eb 51 mov $0x51eb851f,%edx
13c: f7 e2 mul %edx
13e: c1 ea 05 shr $0x5,%edx
141: 89 55 b8 mov %edx,-0x48(%ebp)
uptr[i].uid,
uptr[i].gid,
uptr[i].ppid,
uptr[i].elapsed_ticks/100, uptr[i].elapsed_ticks%100,
144: 8b 45 e0 mov -0x20(%ebp),%eax
147: 6b d0 5c imul $0x5c,%eax,%edx
14a: 8b 45 d8 mov -0x28(%ebp),%eax
14d: 01 d0 add %edx,%eax
14f: 8b 48 10 mov 0x10(%eax),%ecx
"State",
"Size",
"Name");
//Print out the Uproc table using size as the condition in the for loop.
for(int i=0; i<size; ++i){
printf(1, ":%d\t :%d\t :%d\t :%d\t :%d.%d\t :%d.%d\t :%s\t :%d\t :%s\t \n", uptr[i].pid,
152: ba 1f 85 eb 51 mov $0x51eb851f,%edx
157: 89 c8 mov %ecx,%eax
159: f7 e2 mul %edx
15b: 89 d3 mov %edx,%ebx
15d: c1 eb 05 shr $0x5,%ebx
160: 6b c3 64 imul $0x64,%ebx,%eax
163: 89 cb mov %ecx,%ebx
165: 29 c3 sub %eax,%ebx
uptr[i].uid,
uptr[i].gid,
uptr[i].ppid,
uptr[i].elapsed_ticks/100, uptr[i].elapsed_ticks%100,
167: 8b 45 e0 mov -0x20(%ebp),%eax
16a: 6b d0 5c imul $0x5c,%eax,%edx
16d: 8b 45 d8 mov -0x28(%ebp),%eax
170: 01 d0 add %edx,%eax
172: 8b 40 10 mov 0x10(%eax),%eax
"State",
"Size",
"Name");
//Print out the Uproc table using size as the condition in the for loop.
for(int i=0; i<size; ++i){
printf(1, ":%d\t :%d\t :%d\t :%d\t :%d.%d\t :%d.%d\t :%s\t :%d\t :%s\t \n", uptr[i].pid,
175: ba 1f 85 eb 51 mov $0x51eb851f,%edx
17a: f7 e2 mul %edx
17c: 89 d0 mov %edx,%eax
17e: c1 e8 05 shr $0x5,%eax
181: 89 45 b4 mov %eax,-0x4c(%ebp)
uptr[i].uid,
uptr[i].gid,
uptr[i].ppid,
184: 8b 45 e0 mov -0x20(%ebp),%eax
187: 6b d0 5c imul $0x5c,%eax,%edx
18a: 8b 45 d8 mov -0x28(%ebp),%eax
18d: 01 d0 add %edx,%eax
"State",
"Size",
"Name");
//Print out the Uproc table using size as the condition in the for loop.
for(int i=0; i<size; ++i){
printf(1, ":%d\t :%d\t :%d\t :%d\t :%d.%d\t :%d.%d\t :%s\t :%d\t :%s\t \n", uptr[i].pid,
18f: 8b 78 0c mov 0xc(%eax),%edi
192: 89 7d b0 mov %edi,-0x50(%ebp)
uptr[i].uid,
uptr[i].gid,
195: 8b 45 e0 mov -0x20(%ebp),%eax
198: 6b d0 5c imul $0x5c,%eax,%edx
19b: 8b 45 d8 mov -0x28(%ebp),%eax
19e: 01 d0 add %edx,%eax
"State",
"Size",
"Name");
//Print out the Uproc table using size as the condition in the for loop.
for(int i=0; i<size; ++i){
printf(1, ":%d\t :%d\t :%d\t :%d\t :%d.%d\t :%d.%d\t :%s\t :%d\t :%s\t \n", uptr[i].pid,
1a0: 8b 78 08 mov 0x8(%eax),%edi
uptr[i].uid,
1a3: 8b 45 e0 mov -0x20(%ebp),%eax
1a6: 6b d0 5c imul $0x5c,%eax,%edx
1a9: 8b 45 d8 mov -0x28(%ebp),%eax
1ac: 01 d0 add %edx,%eax
"State",
"Size",
"Name");
//Print out the Uproc table using size as the condition in the for loop.
for(int i=0; i<size; ++i){
printf(1, ":%d\t :%d\t :%d\t :%d\t :%d.%d\t :%d.%d\t :%s\t :%d\t :%s\t \n", uptr[i].pid,
1ae: 8b 48 04 mov 0x4(%eax),%ecx
1b1: 8b 45 e0 mov -0x20(%ebp),%eax
1b4: 6b d0 5c imul $0x5c,%eax,%edx
1b7: 8b 45 d8 mov -0x28(%ebp),%eax
1ba: 01 d0 add %edx,%eax
1bc: 8b 00 mov (%eax),%eax
1be: 83 ec 0c sub $0xc,%esp
1c1: ff 75 c4 pushl -0x3c(%ebp)
1c4: ff 75 c0 pushl -0x40(%ebp)
1c7: ff 75 bc pushl -0x44(%ebp)
1ca: 56 push %esi
1cb: ff 75 b8 pushl -0x48(%ebp)
1ce: 53 push %ebx
1cf: ff 75 b4 pushl -0x4c(%ebp)
1d2: ff 75 b0 pushl -0x50(%ebp)
1d5: 57 push %edi
1d6: 51 push %ecx
1d7: 50 push %eax
1d8: 68 cc 0a 00 00 push $0xacc
1dd: 6a 01 push $0x1
1df: e8 c2 04 00 00 call 6a6 <printf>
1e4: 83 c4 40 add $0x40,%esp
"CPU",
"State",
"Size",
"Name");
//Print out the Uproc table using size as the condition in the for loop.
for(int i=0; i<size; ++i){
1e7: 83 45 e0 01 addl $0x1,-0x20(%ebp)
1eb: 8b 45 e0 mov -0x20(%ebp),%eax
1ee: 3b 45 d4 cmp -0x2c(%ebp),%eax
1f1: 0f 8c dc fe ff ff jl d3 <main+0xd3>
uptr[i].state,
uptr[i].size,
uptr[i].name);
}
//Deallocate the memory in the in each of the char ptrs
for(int i=0; i<size; ++i){
1f7: c7 45 dc 00 00 00 00 movl $0x0,-0x24(%ebp)
1fe: eb 38 jmp 238 <main+0x238>
free(uptr[i].state);
200: 8b 45 dc mov -0x24(%ebp),%eax
203: 6b d0 5c imul $0x5c,%eax,%edx
206: 8b 45 d8 mov -0x28(%ebp),%eax
209: 01 d0 add %edx,%eax
20b: 83 c0 18 add $0x18,%eax
20e: 83 ec 0c sub $0xc,%esp
211: 50 push %eax
212: e8 20 06 00 00 call 837 <free>
217: 83 c4 10 add $0x10,%esp
free(uptr[i].name);
21a: 8b 45 dc mov -0x24(%ebp),%eax
21d: 6b d0 5c imul $0x5c,%eax,%edx
220: 8b 45 d8 mov -0x28(%ebp),%eax
223: 01 d0 add %edx,%eax
225: 83 c0 3c add $0x3c,%eax
228: 83 ec 0c sub $0xc,%esp
22b: 50 push %eax
22c: e8 06 06 00 00 call 837 <free>
231: 83 c4 10 add $0x10,%esp
uptr[i].state,
uptr[i].size,
uptr[i].name);
}
//Deallocate the memory in the in each of the char ptrs
for(int i=0; i<size; ++i){
234: 83 45 dc 01 addl $0x1,-0x24(%ebp)
238: 8b 45 dc mov -0x24(%ebp),%eax
23b: 3b 45 d4 cmp -0x2c(%ebp),%eax
23e: 7c c0 jl 200 <main+0x200>
free(uptr[i].state);
free(uptr[i].name);
}
//Deallocate the memory from array of uprocs
free(uptr);
240: 83 ec 0c sub $0xc,%esp
243: ff 75 d8 pushl -0x28(%ebp)
246: e8 ec 05 00 00 call 837 <free>
24b: 83 c4 10 add $0x10,%esp
exit();
24e: e8 9c 02 00 00 call 4ef <exit>
00000253 <stosb>:
"cc");
}
static inline void
stosb(void *addr, int data, int cnt)
{
253: 55 push %ebp
254: 89 e5 mov %esp,%ebp
256: 57 push %edi
257: 53 push %ebx
asm volatile("cld; rep stosb" :
258: 8b 4d 08 mov 0x8(%ebp),%ecx
25b: 8b 55 10 mov 0x10(%ebp),%edx
25e: 8b 45 0c mov 0xc(%ebp),%eax
261: 89 cb mov %ecx,%ebx
263: 89 df mov %ebx,%edi
265: 89 d1 mov %edx,%ecx
267: fc cld
268: f3 aa rep stos %al,%es:(%edi)
26a: 89 ca mov %ecx,%edx
26c: 89 fb mov %edi,%ebx
26e: 89 5d 08 mov %ebx,0x8(%ebp)
271: 89 55 10 mov %edx,0x10(%ebp)
"=D" (addr), "=c" (cnt) :
"0" (addr), "1" (cnt), "a" (data) :
"memory", "cc");
}
274: 90 nop
275: 5b pop %ebx
276: 5f pop %edi
277: 5d pop %ebp
278: c3 ret
00000279 <strcpy>:
#include "user.h"
#include "x86.h"
char*
strcpy(char *s, char *t)
{
279: 55 push %ebp
27a: 89 e5 mov %esp,%ebp
27c: 83 ec 10 sub $0x10,%esp
char *os;
os = s;
27f: 8b 45 08 mov 0x8(%ebp),%eax
282: 89 45 fc mov %eax,-0x4(%ebp)
while((*s++ = *t++) != 0)
285: 90 nop
286: 8b 45 08 mov 0x8(%ebp),%eax
289: 8d 50 01 lea 0x1(%eax),%edx
28c: 89 55 08 mov %edx,0x8(%ebp)
28f: 8b 55 0c mov 0xc(%ebp),%edx
292: 8d 4a 01 lea 0x1(%edx),%ecx
295: 89 4d 0c mov %ecx,0xc(%ebp)
298: 0f b6 12 movzbl (%edx),%edx
29b: 88 10 mov %dl,(%eax)
29d: 0f b6 00 movzbl (%eax),%eax
2a0: 84 c0 test %al,%al
2a2: 75 e2 jne 286 <strcpy+0xd>
;
return os;
2a4: 8b 45 fc mov -0x4(%ebp),%eax
}
2a7: c9 leave
2a8: c3 ret
000002a9 <strcmp>:
int
strcmp(const char *p, const char *q)
{
2a9: 55 push %ebp
2aa: 89 e5 mov %esp,%ebp
while(*p && *p == *q)
2ac: eb 08 jmp 2b6 <strcmp+0xd>
p++, q++;
2ae: 83 45 08 01 addl $0x1,0x8(%ebp)
2b2: 83 45 0c 01 addl $0x1,0xc(%ebp)
}
int
strcmp(const char *p, const char *q)
{
while(*p && *p == *q)
2b6: 8b 45 08 mov 0x8(%ebp),%eax
2b9: 0f b6 00 movzbl (%eax),%eax
2bc: 84 c0 test %al,%al
2be: 74 10 je 2d0 <strcmp+0x27>
2c0: 8b 45 08 mov 0x8(%ebp),%eax
2c3: 0f b6 10 movzbl (%eax),%edx
2c6: 8b 45 0c mov 0xc(%ebp),%eax
2c9: 0f b6 00 movzbl (%eax),%eax
2cc: 38 c2 cmp %al,%dl
2ce: 74 de je 2ae <strcmp+0x5>
p++, q++;
return (uchar)*p - (uchar)*q;
2d0: 8b 45 08 mov 0x8(%ebp),%eax
2d3: 0f b6 00 movzbl (%eax),%eax
2d6: 0f b6 d0 movzbl %al,%edx
2d9: 8b 45 0c mov 0xc(%ebp),%eax
2dc: 0f b6 00 movzbl (%eax),%eax
2df: 0f b6 c0 movzbl %al,%eax
2e2: 29 c2 sub %eax,%edx
2e4: 89 d0 mov %edx,%eax
}
2e6: 5d pop %ebp
2e7: c3 ret
000002e8 <strlen>:
uint
strlen(char *s)
{
2e8: 55 push %ebp
2e9: 89 e5 mov %esp,%ebp
2eb: 83 ec 10 sub $0x10,%esp
int n;
for(n = 0; s[n]; n++)
2ee: c7 45 fc 00 00 00 00 movl $0x0,-0x4(%ebp)
2f5: eb 04 jmp 2fb <strlen+0x13>
2f7: 83 45 fc 01 addl $0x1,-0x4(%ebp)
2fb: 8b 55 fc mov -0x4(%ebp),%edx
2fe: 8b 45 08 mov 0x8(%ebp),%eax
301: 01 d0 add %edx,%eax
303: 0f b6 00 movzbl (%eax),%eax
306: 84 c0 test %al,%al
308: 75 ed jne 2f7 <strlen+0xf>
;
return n;
30a: 8b 45 fc mov -0x4(%ebp),%eax
}
30d: c9 leave
30e: c3 ret
0000030f <memset>:
void*
memset(void *dst, int c, uint n)
{
30f: 55 push %ebp
310: 89 e5 mov %esp,%ebp
stosb(dst, c, n);
312: 8b 45 10 mov 0x10(%ebp),%eax
315: 50 push %eax
316: ff 75 0c pushl 0xc(%ebp)
319: ff 75 08 pushl 0x8(%ebp)
31c: e8 32 ff ff ff call 253 <stosb>
321: 83 c4 0c add $0xc,%esp
return dst;
324: 8b 45 08 mov 0x8(%ebp),%eax
}
327: c9 leave
328: c3 ret
00000329 <strchr>:
char*
strchr(const char *s, char c)
{
329: 55 push %ebp
32a: 89 e5 mov %esp,%ebp
32c: 83 ec 04 sub $0x4,%esp
32f: 8b 45 0c mov 0xc(%ebp),%eax
332: 88 45 fc mov %al,-0x4(%ebp)
for(; *s; s++)
335: eb 14 jmp 34b <strchr+0x22>
if(*s == c)
337: 8b 45 08 mov 0x8(%ebp),%eax
33a: 0f b6 00 movzbl (%eax),%eax
33d: 3a 45 fc cmp -0x4(%ebp),%al
340: 75 05 jne 347 <strchr+0x1e>
return (char*)s;
342: 8b 45 08 mov 0x8(%ebp),%eax
345: eb 13 jmp 35a <strchr+0x31>
}
char*
strchr(const char *s, char c)
{
for(; *s; s++)
347: 83 45 08 01 addl $0x1,0x8(%ebp)
34b: 8b 45 08 mov 0x8(%ebp),%eax
34e: 0f b6 00 movzbl (%eax),%eax
351: 84 c0 test %al,%al
353: 75 e2 jne 337 <strchr+0xe>
if(*s == c)
return (char*)s;
return 0;
355: b8 00 00 00 00 mov $0x0,%eax
}
35a: c9 leave
35b: c3 ret
0000035c <gets>:
char*
gets(char *buf, int max)
{
35c: 55 push %ebp
35d: 89 e5 mov %esp,%ebp
35f: 83 ec 18 sub $0x18,%esp
int i, cc;
char c;
for(i=0; i+1 < max; ){
362: c7 45 f4 00 00 00 00 movl $0x0,-0xc(%ebp)
369: eb 42 jmp 3ad <gets+0x51>
cc = read(0, &c, 1);
36b: 83 ec 04 sub $0x4,%esp
36e: 6a 01 push $0x1
370: 8d 45 ef lea -0x11(%ebp),%eax
373: 50 push %eax
374: 6a 00 push $0x0
376: e8 8c 01 00 00 call 507 <read>
37b: 83 c4 10 add $0x10,%esp
37e: 89 45 f0 mov %eax,-0x10(%ebp)
if(cc < 1)
381: 83 7d f0 00 cmpl $0x0,-0x10(%ebp)
385: 7e 33 jle 3ba <gets+0x5e>
break;
buf[i++] = c;
387: 8b 45 f4 mov -0xc(%ebp),%eax
38a: 8d 50 01 lea 0x1(%eax),%edx
38d: 89 55 f4 mov %edx,-0xc(%ebp)
390: 89 c2 mov %eax,%edx
392: 8b 45 08 mov 0x8(%ebp),%eax
395: 01 c2 add %eax,%edx
397: 0f b6 45 ef movzbl -0x11(%ebp),%eax
39b: 88 02 mov %al,(%edx)
if(c == '\n' || c == '\r')
39d: 0f b6 45 ef movzbl -0x11(%ebp),%eax
3a1: 3c 0a cmp $0xa,%al
3a3: 74 16 je 3bb <gets+0x5f>
3a5: 0f b6 45 ef movzbl -0x11(%ebp),%eax
3a9: 3c 0d cmp $0xd,%al
3ab: 74 0e je 3bb <gets+0x5f>
gets(char *buf, int max)
{
int i, cc;
char c;
for(i=0; i+1 < max; ){
3ad: 8b 45 f4 mov -0xc(%ebp),%eax
3b0: 83 c0 01 add $0x1,%eax
3b3: 3b 45 0c cmp 0xc(%ebp),%eax
3b6: 7c b3 jl 36b <gets+0xf>
3b8: eb 01 jmp 3bb <gets+0x5f>
cc = read(0, &c, 1);
if(cc < 1)
break;
3ba: 90 nop
buf[i++] = c;
if(c == '\n' || c == '\r')
break;
}
buf[i] = '\0';
3bb: 8b 55 f4 mov -0xc(%ebp),%edx
3be: 8b 45 08 mov 0x8(%ebp),%eax
3c1: 01 d0 add %edx,%eax
3c3: c6 00 00 movb $0x0,(%eax)
return buf;
3c6: 8b 45 08 mov 0x8(%ebp),%eax
}
3c9: c9 leave
3ca: c3 ret
000003cb <stat>:
int
stat(char *n, struct stat *st)
{
3cb: 55 push %ebp
3cc: 89 e5 mov %esp,%ebp
3ce: 83 ec 18 sub $0x18,%esp
int fd;
int r;
fd = open(n, O_RDONLY);
3d1: 83 ec 08 sub $0x8,%esp
3d4: 6a 00 push $0x0
3d6: ff 75 08 pushl 0x8(%ebp)
3d9: e8 51 01 00 00 call 52f <open>
3de: 83 c4 10 add $0x10,%esp
3e1: 89 45 f4 mov %eax,-0xc(%ebp)
if(fd < 0)
3e4: 83 7d f4 00 cmpl $0x0,-0xc(%ebp)
3e8: 79 07 jns 3f1 <stat+0x26>
return -1;
3ea: b8 ff ff ff ff mov $0xffffffff,%eax
3ef: eb 25 jmp 416 <stat+0x4b>
r = fstat(fd, st);
3f1: 83 ec 08 sub $0x8,%esp
3f4: ff 75 0c pushl 0xc(%ebp)
3f7: ff 75 f4 pushl -0xc(%ebp)
3fa: e8 48 01 00 00 call 547 <fstat>
3ff: 83 c4 10 add $0x10,%esp
402: 89 45 f0 mov %eax,-0x10(%ebp)
close(fd);
405: 83 ec 0c sub $0xc,%esp
408: ff 75 f4 pushl -0xc(%ebp)
40b: e8 07 01 00 00 call 517 <close>
410: 83 c4 10 add $0x10,%esp
return r;
413: 8b 45 f0 mov -0x10(%ebp),%eax
}
416: c9 leave
417: c3 ret
00000418 <atoi>:
// new atoi added 4/22/17 to be able to handle negative numbers
int
atoi(const char *s)
{
418: 55 push %ebp
419: 89 e5 mov %esp,%ebp
41b: 83 ec 10 sub $0x10,%esp
int n, sign;
n=0;
41e: c7 45 fc 00 00 00 00 movl $0x0,-0x4(%ebp)
while(*s==' ')s++;//Remove leading spaces
425: eb 04 jmp 42b <atoi+0x13>
427: 83 45 08 01 addl $0x1,0x8(%ebp)
42b: 8b 45 08 mov 0x8(%ebp),%eax
42e: 0f b6 00 movzbl (%eax),%eax
431: 3c 20 cmp $0x20,%al
433: 74 f2 je 427 <atoi+0xf>
sign =(*s=='-')?-1 : 1;
435: 8b 45 08 mov 0x8(%ebp),%eax
438: 0f b6 00 movzbl (%eax),%eax
43b: 3c 2d cmp $0x2d,%al
43d: 75 07 jne 446 <atoi+0x2e>
43f: b8 ff ff ff ff mov $0xffffffff,%eax
444: eb 05 jmp 44b <atoi+0x33>
446: b8 01 00 00 00 mov $0x1,%eax
44b: 89 45 f8 mov %eax,-0x8(%ebp)
if(*s=='+' || *s=='-')
44e: 8b 45 08 mov 0x8(%ebp),%eax
451: 0f b6 00 movzbl (%eax),%eax
454: 3c 2b cmp $0x2b,%al
456: 74 0a je 462 <atoi+0x4a>
458: 8b 45 08 mov 0x8(%ebp),%eax
45b: 0f b6 00 movzbl (%eax),%eax
45e: 3c 2d cmp $0x2d,%al
460: 75 2b jne 48d <atoi+0x75>
s++;
462: 83 45 08 01 addl $0x1,0x8(%ebp)
while('0' <= *s&&*s<='9')
466: eb 25 jmp 48d <atoi+0x75>
n = n*10 + *s++ - '0';
468: 8b 55 fc mov -0x4(%ebp),%edx
46b: 89 d0 mov %edx,%eax
46d: c1 e0 02 shl $0x2,%eax
470: 01 d0 add %edx,%eax
472: 01 c0 add %eax,%eax
474: 89 c1 mov %eax,%ecx
476: 8b 45 08 mov 0x8(%ebp),%eax
479: 8d 50 01 lea 0x1(%eax),%edx
47c: 89 55 08 mov %edx,0x8(%ebp)
47f: 0f b6 00 movzbl (%eax),%eax
482: 0f be c0 movsbl %al,%eax
485: 01 c8 add %ecx,%eax
487: 83 e8 30 sub $0x30,%eax
48a: 89 45 fc mov %eax,-0x4(%ebp)
n=0;
while(*s==' ')s++;//Remove leading spaces
sign =(*s=='-')?-1 : 1;
if(*s=='+' || *s=='-')
s++;
while('0' <= *s&&*s<='9')
48d: 8b 45 08 mov 0x8(%ebp),%eax
490: 0f b6 00 movzbl (%eax),%eax
493: 3c 2f cmp $0x2f,%al
495: 7e 0a jle 4a1 <atoi+0x89>
497: 8b 45 08 mov 0x8(%ebp),%eax
49a: 0f b6 00 movzbl (%eax),%eax
49d: 3c 39 cmp $0x39,%al
49f: 7e c7 jle 468 <atoi+0x50>
n = n*10 + *s++ - '0';
return sign*n;
4a1: 8b 45 f8 mov -0x8(%ebp),%eax
4a4: 0f af 45 fc imul -0x4(%ebp),%eax
}
4a8: c9 leave
4a9: c3 ret
000004aa <memmove>:
return n;
}
*/
void*
memmove(void *vdst, void *vsrc, int n)
{
4aa: 55 push %ebp
4ab: 89 e5 mov %esp,%ebp
4ad: 83 ec 10 sub $0x10,%esp
char *dst, *src;
dst = vdst;
4b0: 8b 45 08 mov 0x8(%ebp),%eax
4b3: 89 45 fc mov %eax,-0x4(%ebp)
src = vsrc;
4b6: 8b 45 0c mov 0xc(%ebp),%eax
4b9: 89 45 f8 mov %eax,-0x8(%ebp)
while(n-- > 0)
4bc: eb 17 jmp 4d5 <memmove+0x2b>
*dst++ = *src++;
4be: 8b 45 fc mov -0x4(%ebp),%eax
4c1: 8d 50 01 lea 0x1(%eax),%edx
4c4: 89 55 fc mov %edx,-0x4(%ebp)
4c7: 8b 55 f8 mov -0x8(%ebp),%edx
4ca: 8d 4a 01 lea 0x1(%edx),%ecx
4cd: 89 4d f8 mov %ecx,-0x8(%ebp)
4d0: 0f b6 12 movzbl (%edx),%edx
4d3: 88 10 mov %dl,(%eax)
{
char *dst, *src;
dst = vdst;
src = vsrc;
while(n-- > 0)
4d5: 8b 45 10 mov 0x10(%ebp),%eax
4d8: 8d 50 ff lea -0x1(%eax),%edx
4db: 89 55 10 mov %edx,0x10(%ebp)
4de: 85 c0 test %eax,%eax
4e0: 7f dc jg 4be <memmove+0x14>
*dst++ = *src++;
return vdst;
4e2: 8b 45 08 mov 0x8(%ebp),%eax
}
4e5: c9 leave
4e6: c3 ret
000004e7 <fork>:
name: \
movl $SYS_ ## name, %eax; \
int $T_SYSCALL; \
ret
SYSCALL(fork)
4e7: b8 01 00 00 00 mov $0x1,%eax
4ec: cd 40 int $0x40
4ee: c3 ret
000004ef <exit>:
SYSCALL(exit)
4ef: b8 02 00 00 00 mov $0x2,%eax
4f4: cd 40 int $0x40
4f6: c3 ret
000004f7 <wait>:
SYSCALL(wait)
4f7: b8 03 00 00 00 mov $0x3,%eax
4fc: cd 40 int $0x40
4fe: c3 ret
000004ff <pipe>:
SYSCALL(pipe)
4ff: b8 04 00 00 00 mov $0x4,%eax
504: cd 40 int $0x40
506: c3 ret
00000507 <read>:
SYSCALL(read)
507: b8 05 00 00 00 mov $0x5,%eax
50c: cd 40 int $0x40
50e: c3 ret
0000050f <write>:
SYSCALL(write)
50f: b8 10 00 00 00 mov $0x10,%eax
514: cd 40 int $0x40
516: c3 ret
00000517 <close>:
SYSCALL(close)
517: b8 15 00 00 00 mov $0x15,%eax
51c: cd 40 int $0x40
51e: c3 ret
0000051f <kill>:
SYSCALL(kill)
51f: b8 06 00 00 00 mov $0x6,%eax
524: cd 40 int $0x40
526: c3 ret
00000527 <exec>:
SYSCALL(exec)
527: b8 07 00 00 00 mov $0x7,%eax
52c: cd 40 int $0x40
52e: c3 ret
0000052f <open>:
SYSCALL(open)
52f: b8 0f 00 00 00 mov $0xf,%eax
534: cd 40 int $0x40
536: c3 ret
00000537 <mknod>:
SYSCALL(mknod)
537: b8 11 00 00 00 mov $0x11,%eax
53c: cd 40 int $0x40
53e: c3 ret
0000053f <unlink>:
SYSCALL(unlink)
53f: b8 12 00 00 00 mov $0x12,%eax
544: cd 40 int $0x40
546: c3 ret
00000547 <fstat>:
SYSCALL(fstat)
547: b8 08 00 00 00 mov $0x8,%eax
54c: cd 40 int $0x40
54e: c3 ret
0000054f <link>:
SYSCALL(link)
54f: b8 13 00 00 00 mov $0x13,%eax
554: cd 40 int $0x40
556: c3 ret
00000557 <mkdir>:
SYSCALL(mkdir)
557: b8 14 00 00 00 mov $0x14,%eax
55c: cd 40 int $0x40
55e: c3 ret
0000055f <chdir>:
SYSCALL(chdir)
55f: b8 09 00 00 00 mov $0x9,%eax
564: cd 40 int $0x40
566: c3 ret
00000567 <dup>:
SYSCALL(dup)
567: b8 0a 00 00 00 mov $0xa,%eax
56c: cd 40 int $0x40
56e: c3 ret
0000056f <getpid>:
SYSCALL(getpid)
56f: b8 0b 00 00 00 mov $0xb,%eax
574: cd 40 int $0x40
576: c3 ret
00000577 <sbrk>:
SYSCALL(sbrk)
577: b8 0c 00 00 00 mov $0xc,%eax
57c: cd 40 int $0x40
57e: c3 ret
0000057f <sleep>:
SYSCALL(sleep)
57f: b8 0d 00 00 00 mov $0xd,%eax
584: cd 40 int $0x40
586: c3 ret
00000587 <uptime>:
SYSCALL(uptime)
587: b8 0e 00 00 00 mov $0xe,%eax
58c: cd 40 int $0x40
58e: c3 ret
0000058f <halt>:
SYSCALL(halt)
58f: b8 16 00 00 00 mov $0x16,%eax
594: cd 40 int $0x40
596: c3 ret
00000597 <date>:
//Project additions
SYSCALL(date)
597: b8 17 00 00 00 mov $0x17,%eax
59c: cd 40 int $0x40
59e: c3 ret
0000059f <getuid>:
SYSCALL(getuid)
59f: b8 18 00 00 00 mov $0x18,%eax
5a4: cd 40 int $0x40
5a6: c3 ret
000005a7 <getgid>:
SYSCALL(getgid)
5a7: b8 19 00 00 00 mov $0x19,%eax
5ac: cd 40 int $0x40
5ae: c3 ret
000005af <getppid>:
SYSCALL(getppid)
5af: b8 1a 00 00 00 mov $0x1a,%eax
5b4: cd 40 int $0x40
5b6: c3 ret
000005b7 <setuid>:
SYSCALL(setuid)
5b7: b8 1b 00 00 00 mov $0x1b,%eax
5bc: cd 40 int $0x40
5be: c3 ret
000005bf <setgid>:
SYSCALL(setgid)
5bf: b8 1c 00 00 00 mov $0x1c,%eax
5c4: cd 40 int $0x40
5c6: c3 ret
000005c7 <getprocs>:
SYSCALL(getprocs)
5c7: b8 1d 00 00 00 mov $0x1d,%eax
5cc: cd 40 int $0x40
5ce: c3 ret
000005cf <putc>:
#include "stat.h"
#include "user.h"
static void
putc(int fd, char c)
{
5cf: 55 push %ebp
5d0: 89 e5 mov %esp,%ebp
5d2: 83 ec 18 sub $0x18,%esp
5d5: 8b 45 0c mov 0xc(%ebp),%eax
5d8: 88 45 f4 mov %al,-0xc(%ebp)
write(fd, &c, 1);
5db: 83 ec 04 sub $0x4,%esp
5de: 6a 01 push $0x1
5e0: 8d 45 f4 lea -0xc(%ebp),%eax
5e3: 50 push %eax
5e4: ff 75 08 pushl 0x8(%ebp)
5e7: e8 23 ff ff ff call 50f <write>
5ec: 83 c4 10 add $0x10,%esp
}
5ef: 90 nop
5f0: c9 leave
5f1: c3 ret
000005f2 <printint>:
static void
printint(int fd, int xx, int base, int sgn)
{
5f2: 55 push %ebp
5f3: 89 e5 mov %esp,%ebp
5f5: 53 push %ebx
5f6: 83 ec 24 sub $0x24,%esp
static char digits[] = "0123456789ABCDEF";
char buf[16];
int i, neg;
uint x;
neg = 0;
5f9: c7 45 f0 00 00 00 00 movl $0x0,-0x10(%ebp)
if(sgn && xx < 0){
600: 83 7d 14 00 cmpl $0x0,0x14(%ebp)
604: 74 17 je 61d <printint+0x2b>
606: 83 7d 0c 00 cmpl $0x0,0xc(%ebp)
60a: 79 11 jns 61d <printint+0x2b>
neg = 1;
60c: c7 45 f0 01 00 00 00 movl $0x1,-0x10(%ebp)
x = -xx;
613: 8b 45 0c mov 0xc(%ebp),%eax
616: f7 d8 neg %eax
618: 89 45 ec mov %eax,-0x14(%ebp)
61b: eb 06 jmp 623 <printint+0x31>
} else {
x = xx;
61d: 8b 45 0c mov 0xc(%ebp),%eax
620: 89 45 ec mov %eax,-0x14(%ebp)
}
i = 0;
623: c7 45 f4 00 00 00 00 movl $0x0,-0xc(%ebp)
do{
buf[i++] = digits[x % base];
62a: 8b 4d f4 mov -0xc(%ebp),%ecx
62d: 8d 41 01 lea 0x1(%ecx),%eax
630: 89 45 f4 mov %eax,-0xc(%ebp)
633: 8b 5d 10 mov 0x10(%ebp),%ebx
636: 8b 45 ec mov -0x14(%ebp),%eax
639: ba 00 00 00 00 mov $0x0,%edx
63e: f7 f3 div %ebx
640: 89 d0 mov %edx,%eax
642: 0f b6 80 5c 0d 00 00 movzbl 0xd5c(%eax),%eax
649: 88 44 0d dc mov %al,-0x24(%ebp,%ecx,1)
}while((x /= base) != 0);
64d: 8b 5d 10 mov 0x10(%ebp),%ebx
650: 8b 45 ec mov -0x14(%ebp),%eax
653: ba 00 00 00 00 mov $0x0,%edx
658: f7 f3 div %ebx
65a: 89 45 ec mov %eax,-0x14(%ebp)
65d: 83 7d ec 00 cmpl $0x0,-0x14(%ebp)
661: 75 c7 jne 62a <printint+0x38>
if(neg)
663: 83 7d f0 00 cmpl $0x0,-0x10(%ebp)
667: 74 2d je 696 <printint+0xa4>
buf[i++] = '-';
669: 8b 45 f4 mov -0xc(%ebp),%eax
66c: 8d 50 01 lea 0x1(%eax),%edx
66f: 89 55 f4 mov %edx,-0xc(%ebp)
672: c6 44 05 dc 2d movb $0x2d,-0x24(%ebp,%eax,1)
while(--i >= 0)
677: eb 1d jmp 696 <printint+0xa4>
putc(fd, buf[i]);
679: 8d 55 dc lea -0x24(%ebp),%edx
67c: 8b 45 f4 mov -0xc(%ebp),%eax
67f: 01 d0 add %edx,%eax
681: 0f b6 00 movzbl (%eax),%eax
684: 0f be c0 movsbl %al,%eax
687: 83 ec 08 sub $0x8,%esp
68a: 50 push %eax
68b: ff 75 08 pushl 0x8(%ebp)
68e: e8 3c ff ff ff call 5cf <putc>
693: 83 c4 10 add $0x10,%esp
buf[i++] = digits[x % base];
}while((x /= base) != 0);
if(neg)
buf[i++] = '-';
while(--i >= 0)
696: 83 6d f4 01 subl $0x1,-0xc(%ebp)
69a: 83 7d f4 00 cmpl $0x0,-0xc(%ebp)
69e: 79 d9 jns 679 <printint+0x87>
putc(fd, buf[i]);
}
6a0: 90 nop
6a1: 8b 5d fc mov -0x4(%ebp),%ebx
6a4: c9 leave
6a5: c3 ret
000006a6 <printf>:
// Print to the given fd. Only understands %d, %x, %p, %s.
void
printf(int fd, char *fmt, ...)
{
6a6: 55 push %ebp
6a7: 89 e5 mov %esp,%ebp
6a9: 83 ec 28 sub $0x28,%esp
char *s;
int c, i, state;
uint *ap;
state = 0;
6ac: c7 45 ec 00 00 00 00 movl $0x0,-0x14(%ebp)
ap = (uint*)(void*)&fmt + 1;
6b3: 8d 45 0c lea 0xc(%ebp),%eax
6b6: 83 c0 04 add $0x4,%eax
6b9: 89 45 e8 mov %eax,-0x18(%ebp)
for(i = 0; fmt[i]; i++){
6bc: c7 45 f0 00 00 00 00 movl $0x0,-0x10(%ebp)
6c3: e9 59 01 00 00 jmp 821 <printf+0x17b>
c = fmt[i] & 0xff;
6c8: 8b 55 0c mov 0xc(%ebp),%edx
6cb: 8b 45 f0 mov -0x10(%ebp),%eax
6ce: 01 d0 add %edx,%eax
6d0: 0f b6 00 movzbl (%eax),%eax
6d3: 0f be c0 movsbl %al,%eax
6d6: 25 ff 00 00 00 and $0xff,%eax
6db: 89 45 e4 mov %eax,-0x1c(%ebp)
if(state == 0){
6de: 83 7d ec 00 cmpl $0x0,-0x14(%ebp)
6e2: 75 2c jne 710 <printf+0x6a>
if(c == '%'){
6e4: 83 7d e4 25 cmpl $0x25,-0x1c(%ebp)
6e8: 75 0c jne 6f6 <printf+0x50>
state = '%';
6ea: c7 45 ec 25 00 00 00 movl $0x25,-0x14(%ebp)
6f1: e9 27 01 00 00 jmp 81d <printf+0x177>
} else {
putc(fd, c);
6f6: 8b 45 e4 mov -0x1c(%ebp),%eax
6f9: 0f be c0 movsbl %al,%eax
6fc: 83 ec 08 sub $0x8,%esp
6ff: 50 push %eax
700: ff 75 08 pushl 0x8(%ebp)
703: e8 c7 fe ff ff call 5cf <putc>
708: 83 c4 10 add $0x10,%esp
70b: e9 0d 01 00 00 jmp 81d <printf+0x177>
}
} else if(state == '%'){
710: 83 7d ec 25 cmpl $0x25,-0x14(%ebp)
714: 0f 85 03 01 00 00 jne 81d <printf+0x177>
if(c == 'd'){
71a: 83 7d e4 64 cmpl $0x64,-0x1c(%ebp)
71e: 75 1e jne 73e <printf+0x98>
printint(fd, *ap, 10, 1);
720: 8b 45 e8 mov -0x18(%ebp),%eax
723: 8b 00 mov (%eax),%eax
725: 6a 01 push $0x1
727: 6a 0a push $0xa
729: 50 push %eax
72a: ff 75 08 pushl 0x8(%ebp)
72d: e8 c0 fe ff ff call 5f2 <printint>
732: 83 c4 10 add $0x10,%esp
ap++;
735: 83 45 e8 04 addl $0x4,-0x18(%ebp)
739: e9 d8 00 00 00 jmp 816 <printf+0x170>
} else if(c == 'x' || c == 'p'){
73e: 83 7d e4 78 cmpl $0x78,-0x1c(%ebp)
742: 74 06 je 74a <printf+0xa4>
744: 83 7d e4 70 cmpl $0x70,-0x1c(%ebp)
748: 75 1e jne 768 <printf+0xc2>
printint(fd, *ap, 16, 0);
74a: 8b 45 e8 mov -0x18(%ebp),%eax
74d: 8b 00 mov (%eax),%eax
74f: 6a 00 push $0x0
751: 6a 10 push $0x10
753: 50 push %eax
754: ff 75 08 pushl 0x8(%ebp)
757: e8 96 fe ff ff call 5f2 <printint>
75c: 83 c4 10 add $0x10,%esp
ap++;
75f: 83 45 e8 04 addl $0x4,-0x18(%ebp)
763: e9 ae 00 00 00 jmp 816 <printf+0x170>
} else if(c == 's'){
768: 83 7d e4 73 cmpl $0x73,-0x1c(%ebp)
76c: 75 43 jne 7b1 <printf+0x10b>
s = (char*)*ap;
76e: 8b 45 e8 mov -0x18(%ebp),%eax
771: 8b 00 mov (%eax),%eax
773: 89 45 f4 mov %eax,-0xc(%ebp)
ap++;
776: 83 45 e8 04 addl $0x4,-0x18(%ebp)
if(s == 0)
77a: 83 7d f4 00 cmpl $0x0,-0xc(%ebp)
77e: 75 25 jne 7a5 <printf+0xff>
s = "(null)";
780: c7 45 f4 01 0b 00 00 movl $0xb01,-0xc(%ebp)
while(*s != 0){
787: eb 1c jmp 7a5 <printf+0xff>
putc(fd, *s);
789: 8b 45 f4 mov -0xc(%ebp),%eax
78c: 0f b6 00 movzbl (%eax),%eax
78f: 0f be c0 movsbl %al,%eax
792: 83 ec 08 sub $0x8,%esp
795: 50 push %eax
796: ff 75 08 pushl 0x8(%ebp)
799: e8 31 fe ff ff call 5cf <putc>
79e: 83 c4 10 add $0x10,%esp
s++;
7a1: 83 45 f4 01 addl $0x1,-0xc(%ebp)
} else if(c == 's'){
s = (char*)*ap;
ap++;
if(s == 0)
s = "(null)";
while(*s != 0){
7a5: 8b 45 f4 mov -0xc(%ebp),%eax
7a8: 0f b6 00 movzbl (%eax),%eax
7ab: 84 c0 test %al,%al
7ad: 75 da jne 789 <printf+0xe3>
7af: eb 65 jmp 816 <printf+0x170>
putc(fd, *s);
s++;
}
} else if(c == 'c'){
7b1: 83 7d e4 63 cmpl $0x63,-0x1c(%ebp)
7b5: 75 1d jne 7d4 <printf+0x12e>
putc(fd, *ap);
7b7: 8b 45 e8 mov -0x18(%ebp),%eax
7ba: 8b 00 mov (%eax),%eax
7bc: 0f be c0 movsbl %al,%eax
7bf: 83 ec 08 sub $0x8,%esp
7c2: 50 push %eax
7c3: ff 75 08 pushl 0x8(%ebp)
7c6: e8 04 fe ff ff call 5cf <putc>
7cb: 83 c4 10 add $0x10,%esp
ap++;
7ce: 83 45 e8 04 addl $0x4,-0x18(%ebp)
7d2: eb 42 jmp 816 <printf+0x170>
} else if(c == '%'){
7d4: 83 7d e4 25 cmpl $0x25,-0x1c(%ebp)
7d8: 75 17 jne 7f1 <printf+0x14b>
putc(fd, c);
7da: 8b 45 e4 mov -0x1c(%ebp),%eax
7dd: 0f be c0 movsbl %al,%eax
7e0: 83 ec 08 sub $0x8,%esp
7e3: 50 push %eax
7e4: ff 75 08 pushl 0x8(%ebp)
7e7: e8 e3 fd ff ff call 5cf <putc>
7ec: 83 c4 10 add $0x10,%esp
7ef: eb 25 jmp 816 <printf+0x170>
} else {
// Unknown % sequence. Print it to draw attention.
putc(fd, '%');
7f1: 83 ec 08 sub $0x8,%esp
7f4: 6a 25 push $0x25
7f6: ff 75 08 pushl 0x8(%ebp)
7f9: e8 d1 fd ff ff call 5cf <putc>
7fe: 83 c4 10 add $0x10,%esp
putc(fd, c);
801: 8b 45 e4 mov -0x1c(%ebp),%eax
804: 0f be c0 movsbl %al,%eax
807: 83 ec 08 sub $0x8,%esp
80a: 50 push %eax
80b: ff 75 08 pushl 0x8(%ebp)
80e: e8 bc fd ff ff call 5cf <putc>
813: 83 c4 10 add $0x10,%esp
}
state = 0;
816: c7 45 ec 00 00 00 00 movl $0x0,-0x14(%ebp)
int c, i, state;
uint *ap;
state = 0;
ap = (uint*)(void*)&fmt + 1;
for(i = 0; fmt[i]; i++){
81d: 83 45 f0 01 addl $0x1,-0x10(%ebp)
821: 8b 55 0c mov 0xc(%ebp),%edx
824: 8b 45 f0 mov -0x10(%ebp),%eax
827: 01 d0 add %edx,%eax
829: 0f b6 00 movzbl (%eax),%eax
82c: 84 c0 test %al,%al
82e: 0f 85 94 fe ff ff jne 6c8 <printf+0x22>
putc(fd, c);
}
state = 0;
}
}
}
834: 90 nop
835: c9 leave
836: c3 ret
00000837 <free>:
static Header base;
static Header *freep;
void
free(void *ap)
{
837: 55 push %ebp
838: 89 e5 mov %esp,%ebp
83a: 83 ec 10 sub $0x10,%esp
Header *bp, *p;
bp = (Header*)ap - 1;
83d: 8b 45 08 mov 0x8(%ebp),%eax
840: 83 e8 08 sub $0x8,%eax
843: 89 45 f8 mov %eax,-0x8(%ebp)
for(p = freep; !(bp > p && bp < p->s.ptr); p = p->s.ptr)
846: a1 78 0d 00 00 mov 0xd78,%eax
84b: 89 45 fc mov %eax,-0x4(%ebp)
84e: eb 24 jmp 874 <free+0x3d>
if(p >= p->s.ptr && (bp > p || bp < p->s.ptr))
850: 8b 45 fc mov -0x4(%ebp),%eax
853: 8b 00 mov (%eax),%eax
855: 3b 45 fc cmp -0x4(%ebp),%eax
858: 77 12 ja 86c <free+0x35>
85a: 8b 45 f8 mov -0x8(%ebp),%eax
85d: 3b 45 fc cmp -0x4(%ebp),%eax
860: 77 24 ja 886 <free+0x4f>
862: 8b 45 fc mov -0x4(%ebp),%eax
865: 8b 00 mov (%eax),%eax
867: 3b 45 f8 cmp -0x8(%ebp),%eax
86a: 77 1a ja 886 <free+0x4f>
free(void *ap)
{
Header *bp, *p;
bp = (Header*)ap - 1;
for(p = freep; !(bp > p && bp < p->s.ptr); p = p->s.ptr)
86c: 8b 45 fc mov -0x4(%ebp),%eax
86f: 8b 00 mov (%eax),%eax
871: 89 45 fc mov %eax,-0x4(%ebp)
874: 8b 45 f8 mov -0x8(%ebp),%eax
877: 3b 45 fc cmp -0x4(%ebp),%eax
87a: 76 d4 jbe 850 <free+0x19>
87c: 8b 45 fc mov -0x4(%ebp),%eax
87f: 8b 00 mov (%eax),%eax
881: 3b 45 f8 cmp -0x8(%ebp),%eax
884: 76 ca jbe 850 <free+0x19>
if(p >= p->s.ptr && (bp > p || bp < p->s.ptr))
break;
if(bp + bp->s.size == p->s.ptr){
886: 8b 45 f8 mov -0x8(%ebp),%eax
889: 8b 40 04 mov 0x4(%eax),%eax
88c: 8d 14 c5 00 00 00 00 lea 0x0(,%eax,8),%edx
893: 8b 45 f8 mov -0x8(%ebp),%eax
896: 01 c2 add %eax,%edx
898: 8b 45 fc mov -0x4(%ebp),%eax
89b: 8b 00 mov (%eax),%eax
89d: 39 c2 cmp %eax,%edx
89f: 75 24 jne 8c5 <free+0x8e>
bp->s.size += p->s.ptr->s.size;
8a1: 8b 45 f8 mov -0x8(%ebp),%eax
8a4: 8b 50 04 mov 0x4(%eax),%edx
8a7: 8b 45 fc mov -0x4(%ebp),%eax
8aa: 8b 00 mov (%eax),%eax
8ac: 8b 40 04 mov 0x4(%eax),%eax
8af: 01 c2 add %eax,%edx
8b1: 8b 45 f8 mov -0x8(%ebp),%eax
8b4: 89 50 04 mov %edx,0x4(%eax)
bp->s.ptr = p->s.ptr->s.ptr;
8b7: 8b 45 fc mov -0x4(%ebp),%eax
8ba: 8b 00 mov (%eax),%eax
8bc: 8b 10 mov (%eax),%edx
8be: 8b 45 f8 mov -0x8(%ebp),%eax
8c1: 89 10 mov %edx,(%eax)
8c3: eb 0a jmp 8cf <free+0x98>
} else
bp->s.ptr = p->s.ptr;
8c5: 8b 45 fc mov -0x4(%ebp),%eax
8c8: 8b 10 mov (%eax),%edx
8ca: 8b 45 f8 mov -0x8(%ebp),%eax
8cd: 89 10 mov %edx,(%eax)
if(p + p->s.size == bp){
8cf: 8b 45 fc mov -0x4(%ebp),%eax
8d2: 8b 40 04 mov 0x4(%eax),%eax
8d5: 8d 14 c5 00 00 00 00 lea 0x0(,%eax,8),%edx
8dc: 8b 45 fc mov -0x4(%ebp),%eax
8df: 01 d0 add %edx,%eax
8e1: 3b 45 f8 cmp -0x8(%ebp),%eax
8e4: 75 20 jne 906 <free+0xcf>
p->s.size += bp->s.size;
8e6: 8b 45 fc mov -0x4(%ebp),%eax
8e9: 8b 50 04 mov 0x4(%eax),%edx
8ec: 8b 45 f8 mov -0x8(%ebp),%eax
8ef: 8b 40 04 mov 0x4(%eax),%eax
8f2: 01 c2 add %eax,%edx
8f4: 8b 45 fc mov -0x4(%ebp),%eax
8f7: 89 50 04 mov %edx,0x4(%eax)
p->s.ptr = bp->s.ptr;
8fa: 8b 45 f8 mov -0x8(%ebp),%eax
8fd: 8b 10 mov (%eax),%edx
8ff: 8b 45 fc mov -0x4(%ebp),%eax
902: 89 10 mov %edx,(%eax)
904: eb 08 jmp 90e <free+0xd7>
} else
p->s.ptr = bp;
906: 8b 45 fc mov -0x4(%ebp),%eax
909: 8b 55 f8 mov -0x8(%ebp),%edx
90c: 89 10 mov %edx,(%eax)
freep = p;
90e: 8b 45 fc mov -0x4(%ebp),%eax
911: a3 78 0d 00 00 mov %eax,0xd78
}
916: 90 nop
917: c9 leave
918: c3 ret
00000919 <morecore>:
static Header*
morecore(uint nu)
{
919: 55 push %ebp
91a: 89 e5 mov %esp,%ebp
91c: 83 ec 18 sub $0x18,%esp
char *p;
Header *hp;
if(nu < 4096)
91f: 81 7d 08 ff 0f 00 00 cmpl $0xfff,0x8(%ebp)
926: 77 07 ja 92f <morecore+0x16>
nu = 4096;
928: c7 45 08 00 10 00 00 movl $0x1000,0x8(%ebp)
p = sbrk(nu * sizeof(Header));
92f: 8b 45 08 mov 0x8(%ebp),%eax
932: c1 e0 03 shl $0x3,%eax
935: 83 ec 0c sub $0xc,%esp
938: 50 push %eax
939: e8 39 fc ff ff call 577 <sbrk>
93e: 83 c4 10 add $0x10,%esp
941: 89 45 f4 mov %eax,-0xc(%ebp)
if(p == (char*)-1)
944: 83 7d f4 ff cmpl $0xffffffff,-0xc(%ebp)
948: 75 07 jne 951 <morecore+0x38>
return 0;
94a: b8 00 00 00 00 mov $0x0,%eax
94f: eb 26 jmp 977 <morecore+0x5e>
hp = (Header*)p;
951: 8b 45 f4 mov -0xc(%ebp),%eax
954: 89 45 f0 mov %eax,-0x10(%ebp)
hp->s.size = nu;
957: 8b 45 f0 mov -0x10(%ebp),%eax
95a: 8b 55 08 mov 0x8(%ebp),%edx
95d: 89 50 04 mov %edx,0x4(%eax)
free((void*)(hp + 1));
960: 8b 45 f0 mov -0x10(%ebp),%eax
963: 83 c0 08 add $0x8,%eax
966: 83 ec 0c sub $0xc,%esp
969: 50 push %eax
96a: e8 c8 fe ff ff call 837 <free>
96f: 83 c4 10 add $0x10,%esp
return freep;
972: a1 78 0d 00 00 mov 0xd78,%eax
}
977: c9 leave
978: c3 ret
00000979 <malloc>:
void*
malloc(uint nbytes)
{
979: 55 push %ebp
97a: 89 e5 mov %esp,%ebp
97c: 83 ec 18 sub $0x18,%esp
Header *p, *prevp;
uint nunits;
nunits = (nbytes + sizeof(Header) - 1)/sizeof(Header) + 1;
97f: 8b 45 08 mov 0x8(%ebp),%eax
982: 83 c0 07 add $0x7,%eax
985: c1 e8 03 shr $0x3,%eax
988: 83 c0 01 add $0x1,%eax
98b: 89 45 ec mov %eax,-0x14(%ebp)
if((prevp = freep) == 0){
98e: a1 78 0d 00 00 mov 0xd78,%eax
993: 89 45 f0 mov %eax,-0x10(%ebp)
996: 83 7d f0 00 cmpl $0x0,-0x10(%ebp)
99a: 75 23 jne 9bf <malloc+0x46>
base.s.ptr = freep = prevp = &base;
99c: c7 45 f0 70 0d 00 00 movl $0xd70,-0x10(%ebp)
9a3: 8b 45 f0 mov -0x10(%ebp),%eax
9a6: a3 78 0d 00 00 mov %eax,0xd78
9ab: a1 78 0d 00 00 mov 0xd78,%eax
9b0: a3 70 0d 00 00 mov %eax,0xd70
base.s.size = 0;
9b5: c7 05 74 0d 00 00 00 movl $0x0,0xd74
9bc: 00 00 00
}
for(p = prevp->s.ptr; ; prevp = p, p = p->s.ptr){
9bf: 8b 45 f0 mov -0x10(%ebp),%eax
9c2: 8b 00 mov (%eax),%eax
9c4: 89 45 f4 mov %eax,-0xc(%ebp)
if(p->s.size >= nunits){
9c7: 8b 45 f4 mov -0xc(%ebp),%eax
9ca: 8b 40 04 mov 0x4(%eax),%eax
9cd: 3b 45 ec cmp -0x14(%ebp),%eax
9d0: 72 4d jb a1f <malloc+0xa6>
if(p->s.size == nunits)
9d2: 8b 45 f4 mov -0xc(%ebp),%eax
9d5: 8b 40 04 mov 0x4(%eax),%eax
9d8: 3b 45 ec cmp -0x14(%ebp),%eax
9db: 75 0c jne 9e9 <malloc+0x70>
prevp->s.ptr = p->s.ptr;
9dd: 8b 45 f4 mov -0xc(%ebp),%eax
9e0: 8b 10 mov (%eax),%edx
9e2: 8b 45 f0 mov -0x10(%ebp),%eax
9e5: 89 10 mov %edx,(%eax)
9e7: eb 26 jmp a0f <malloc+0x96>
else {
p->s.size -= nunits;
9e9: 8b 45 f4 mov -0xc(%ebp),%eax
9ec: 8b 40 04 mov 0x4(%eax),%eax
9ef: 2b 45 ec sub -0x14(%ebp),%eax
9f2: 89 c2 mov %eax,%edx
9f4: 8b 45 f4 mov -0xc(%ebp),%eax
9f7: 89 50 04 mov %edx,0x4(%eax)
p += p->s.size;
9fa: 8b 45 f4 mov -0xc(%ebp),%eax
9fd: 8b 40 04 mov 0x4(%eax),%eax
a00: c1 e0 03 shl $0x3,%eax
a03: 01 45 f4 add %eax,-0xc(%ebp)
p->s.size = nunits;
a06: 8b 45 f4 mov -0xc(%ebp),%eax
a09: 8b 55 ec mov -0x14(%ebp),%edx
a0c: 89 50 04 mov %edx,0x4(%eax)
}
freep = prevp;
a0f: 8b 45 f0 mov -0x10(%ebp),%eax
a12: a3 78 0d 00 00 mov %eax,0xd78
return (void*)(p + 1);
a17: 8b 45 f4 mov -0xc(%ebp),%eax
a1a: 83 c0 08 add $0x8,%eax
a1d: eb 3b jmp a5a <malloc+0xe1>
}
if(p == freep)
a1f: a1 78 0d 00 00 mov 0xd78,%eax
a24: 39 45 f4 cmp %eax,-0xc(%ebp)
a27: 75 1e jne a47 <malloc+0xce>
if((p = morecore(nunits)) == 0)
a29: 83 ec 0c sub $0xc,%esp
a2c: ff 75 ec pushl -0x14(%ebp)
a2f: e8 e5 fe ff ff call 919 <morecore>
a34: 83 c4 10 add $0x10,%esp
a37: 89 45 f4 mov %eax,-0xc(%ebp)
a3a: 83 7d f4 00 cmpl $0x0,-0xc(%ebp)
a3e: 75 07 jne a47 <malloc+0xce>
return 0;
a40: b8 00 00 00 00 mov $0x0,%eax
a45: eb 13 jmp a5a <malloc+0xe1>
nunits = (nbytes + sizeof(Header) - 1)/sizeof(Header) + 1;
if((prevp = freep) == 0){
base.s.ptr = freep = prevp = &base;
base.s.size = 0;
}
for(p = prevp->s.ptr; ; prevp = p, p = p->s.ptr){
a47: 8b 45 f4 mov -0xc(%ebp),%eax
a4a: 89 45 f0 mov %eax,-0x10(%ebp)
a4d: 8b 45 f4 mov -0xc(%ebp),%eax
a50: 8b 00 mov (%eax),%eax
a52: 89 45 f4 mov %eax,-0xc(%ebp)
return (void*)(p + 1);
}
if(p == freep)
if((p = morecore(nunits)) == 0)
return 0;
}
a55: e9 6d ff ff ff jmp 9c7 <malloc+0x4e>
}
a5a: c9 leave
a5b: c3 ret
|
src/intel/tools/tests/gen7/endif.asm | SoftReaper/Mesa-Renoir-deb | 0 | 242300 | endif(8) JIP: LABEL1 { align16 1Q };
LABEL1:
endif(8) JIP: LABEL2 { align1 1Q };
LABEL2:
endif(16) JIP: LABEL3 { align1 1H };
LABEL3:
|
gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/c8/c87b31a.ada | best08618/asylo | 7 | 8301 | -- C87B31A.ADA
-- Grant of Unlimited Rights
--
-- Under contracts F33600-87-D-0337, F33600-84-D-0280, MDA903-79-C-0687,
-- F08630-91-C-0015, and DCA100-97-D-0025, the U.S. Government obtained
-- unlimited rights in the software and documentation contained herein.
-- Unlimited rights are defined in DFAR 252.227-7013(a)(19). By making
-- this public release, the Government intends to confer upon all
-- recipients unlimited rights equal to those held by the Government.
-- These rights include rights to use, duplicate, release or disclose the
-- released technical data and computer software in whole or in part, in
-- any manner and for any purpose whatsoever, and to have or permit others
-- to do so.
--
-- DISCLAIMER
--
-- ALL MATERIALS OR INFORMATION HEREIN RELEASED, MADE AVAILABLE OR
-- DISCLOSED ARE AS IS. THE GOVERNMENT MAKES NO EXPRESS OR IMPLIED
-- WARRANTY AS TO ANY MATTER WHATSOEVER, INCLUDING THE CONDITIONS OF THE
-- SOFTWARE, DOCUMENTATION OR OTHER INFORMATION RELEASED, MADE AVAILABLE
-- OR DISCLOSED, OR THE OWNERSHIP, MERCHANTABILITY, OR FITNESS FOR A
-- PARTICULAR PURPOSE OF SAID MATERIAL.
--*
-- CHECK THAT OVERLOADING RESOLUTION USES THE RULE THAT:
--
-- IF THE TYPE OF AN AGGREGATE IS A ONE-DIMENSIONAL ARRAY TYPE
-- THEN EACH CHOICE MUST SPECIFY VALUES OF THE INDEX TYPE, AND
-- THE EXPRESSION OF EACH COMPONENT ASSOCIATION MUST BE OF THE
-- COMPONENT TYPE.
-- TRH 8 AUG 82
-- DSJ 15 JUN 83
-- JRK 2 FEB 84
-- JBG 4/23/84
WITH REPORT; USE REPORT;
PROCEDURE C87B31A IS
TYPE LETTER IS NEW CHARACTER RANGE 'A' .. 'Z';
TYPE NOTE IS (A, B, C, D, E, F, G, H);
TYPE STR IS NEW STRING (1 .. 1);
TYPE BIT IS NEW BOOLEAN;
TYPE YES IS NEW BOOLEAN RANGE TRUE .. TRUE;
TYPE NO IS NEW BOOLEAN RANGE FALSE .. FALSE;
TYPE BOOLEAN IS (FALSE, TRUE);
TYPE LIST IS ARRAY (CHARACTER RANGE <>) OF BIT;
TYPE FLAG IS (PASS, FAIL);
SUBTYPE LIST_A IS LIST('A'..'A');
SUBTYPE LIST_E IS LIST('E'..'E');
SUBTYPE LIST_AE IS LIST('A'..'E');
GENERIC
TYPE T IS PRIVATE;
ARG : IN T;
STAT : IN FLAG;
FUNCTION F1 RETURN T;
FUNCTION F1 RETURN T IS
BEGIN
IF STAT = FAIL THEN
FAILED ("RESOLUTION INCORRECT FOR EXPRESSIONS " &
"IN ARRAY AGGREGATES");
END IF;
RETURN ARG;
END F1;
FUNCTION F IS NEW F1 (BOOLEAN, FALSE, FAIL);
FUNCTION F IS NEW F1 (YES, TRUE, FAIL);
FUNCTION F IS NEW F1 (NO, FALSE, FAIL);
FUNCTION F IS NEW F1 (BIT, TRUE, PASS);
FUNCTION G IS NEW F1 (CHARACTER, 'A', PASS);
FUNCTION G IS NEW F1 (LETTER, 'A', FAIL);
FUNCTION G IS NEW F1 (STR, "A", FAIL);
FUNCTION H IS NEW F1 (CHARACTER, 'E', PASS);
FUNCTION H IS NEW F1 (LETTER, 'E', FAIL);
FUNCTION H IS NEW F1 (STR, "E", FAIL);
BEGIN
TEST ("C87B31A", "OVERLOADED EXPRESSIONS IN ARRAY AGGREGATES");
DECLARE
L1, L2 : LIST_A := (OTHERS => FALSE);
L3, L4 : LIST_E := (OTHERS => FALSE);
L5, L6 : LIST_AE := (OTHERS => FALSE);
L7, L8 : LIST_AE := (OTHERS => FALSE);
BEGIN
L1 := ('A' => F);
L2 := ( G => F);
L3 := ('E' => F);
L4 := ( H => F);
L5 := ('A'..'E' => F);
L6 := (F,F,F,F,F);
L7 := (F,F,F, OTHERS => F);
L8 := LIST_AE'('E' => F, 'B' => F, OTHERS => F);
IF L1 /= LIST_A'(OTHERS => TRUE) THEN
FAILED ("RESOLUTION INCORRECT FOR OVERLOADED" &
" EXPRESSIONS IN ARRAY AGGREGATES - L1");
END IF;
IF L2 /= LIST_A'(OTHERS => TRUE) THEN
FAILED ("RESOLUTION INCORRECT FOR OVERLOADED" &
" EXPRESSIONS IN ARRAY AGGREGATES - L2");
END IF;
IF L3 /= LIST_E'(OTHERS => TRUE) THEN
FAILED ("RESOLUTION INCORRECT FOR OVERLOADED" &
" EXPRESSIONS IN ARRAY AGGREGATES - L3");
END IF;
IF L4 /= LIST_E'(OTHERS => TRUE) THEN
FAILED ("RESOLUTION INCORRECT FOR OVERLOADED" &
" EXPRESSIONS IN ARRAY AGGREGATES - L4");
END IF;
IF L5 /= LIST_AE'(OTHERS => TRUE) THEN
FAILED ("RESOLUTION INCORRECT FOR OVERLOADED" &
" EXPRESSIONS IN ARRAY AGGREGATES - L5");
END IF;
IF L6 /= LIST_AE'(OTHERS => TRUE) THEN
FAILED ("RESOLUTION INCORRECT FOR OVERLOADED" &
" EXPRESSIONS IN ARRAY AGGREGATES - L6");
END IF;
IF L7 /= LIST_AE'(OTHERS => TRUE) THEN
FAILED ("RESOLUTION INCORRECT FOR OVERLOADED" &
" EXPRESSIONS IN ARRAY AGGREGATES - L7");
END IF;
IF L8 /= LIST_AE'(OTHERS => TRUE) THEN
FAILED ("RESOLUTION INCORRECT FOR OVERLOADED" &
" EXPRESSIONS IN ARRAY AGGREGATES - L8");
END IF;
END;
RESULT;
END C87B31A;
|
oeis/284/A284438.asm | neoneye/loda-programs | 11 | 246487 | <filename>oeis/284/A284438.asm
; A284438: a(n) = phi(n)^n.
; Submitted by <NAME>
; 1,1,8,16,1024,64,279936,65536,10077696,1048576,100000000000,16777216,106993205379072,78364164096,35184372088832,281474976710656,295147905179352825856,101559956668416,708235345355337676357632,1152921504606846976,46005119909369701466112,10000000000000000000000,7511413302012830262726227918848,4722366482869645213696,335544320000000000000000000000000,11447545997288281555215581184,7804725584345565904628551916716032,1648446623609512543951043690496,928074647171094496152036391094208962756608
add $0,1
mov $2,$0
lpb $2
mov $3,$2
gcd $3,$0
cmp $3,1
add $1,$3
sub $2,1
mov $4,$0
lpe
mov $5,$1
pow $5,$4
mov $0,$5
|
examples/outdated-and-incorrect/clowns/Dissect.agda | asr/agda-kanso | 1 | 16500 | <filename>examples/outdated-and-incorrect/clowns/Dissect.agda
module Dissect where
import Functor
import Sets
import Isomorphism
open Sets
open Functor
open Functor.Semantics
open Functor.Recursive
infixr 40 _+β_
infixr 60 _Γβ_
β : U -> Uβ
β (K A) = Kβ [0]
β Id = Kβ [1]
β (F + G) = β F +β β G
β (F Γ G) = β F Γβ β G +β β F Γβ β G
diagonal : Uβ -> U
diagonal (Kβ A) = K A
diagonal (β F) = F
diagonal (β F) = F
diagonal (F +β G) = diagonal F + diagonal G
diagonal (F Γβ G) = diagonal F Γ diagonal G
module Derivative where
import Derivative as D
β : U -> U
β F = diagonal (β F)
open Isomorphism
same : (F : U)(X : Set) -> β¦ β F β§ X β
β¦ D.β F β§ X
same (K A) X = refl-β
[0]
same Id X = refl-β
[1]
same (F + G) X = iso[+] (same F X) (same G X)
same (F Γ G) X = iso[+] (iso[Γ] (same F X) (refl-β
_))
(iso[Γ] (refl-β
_) (same G X))
Stack : (F : U) -> Set -> Set -> Set
Stack F C J = List (β¦ β F β§β C J)
NextJoker : U -> Set -> Set -> Set
NextJoker F C J = J [Γ] β¦ β F β§β C J [+] β¦ F β§ C
mutual
into : (F : U){C J : Set} -> β¦ F β§ J -> NextJoker F C J
into (K A) a = inr a
into Id x = inl < x , <> >
into (F + G) (inl f) = (id <Γ> inl <+> inl) (into F f)
into (F + G) (inr g) = (id <Γ> inr <+> inr) (into G g)
into (F Γ G) < fj , gj > = tryL F G (into F fj) gj
next : (F : U){C J : Set} -> β¦ β F β§β C J -> C -> NextJoker F C J
next (K A) () _
next Id <> c = inr c
next (F + G) (inl f') c = (id <Γ> inl <+> inl) (next F f' c)
next (F + G) (inr g') c = (id <Γ> inr <+> inr) (next G g' c)
next (F Γ G) (inl < f' , gj >) c = tryL F G (next F f' c) gj
next (F Γ G) (inr < fc , g' >) c = tryR F G fc (next G g' c)
tryL : (F G : U){C J : Set} ->
NextJoker F C J -> β¦ G β§ J -> NextJoker (F Γ G) C J
tryL F G (inl < j , f' >) gj = inl < j , inl < f' , gj > >
tryL F G (inr fc) gj = tryR F G fc (into G gj)
tryR : (F G : U){C J : Set} ->
β¦ F β§ C -> NextJoker G C J -> NextJoker (F Γ G) C J
tryR F G fc (inl < j , g' >) = inl < j , inr < fc , g' > >
tryR F G fc (inr gc) = inr < fc , gc >
map : (F : U){C J : Set} -> (J -> C) -> β¦ F β§ J -> β¦ F β§ C
map F Ο f = iter (into F f) where
iter : NextJoker F _ _ -> β¦ F β§ _
iter (inl < j , d >) = iter (next F d (Ο j))
iter (inr f) = f
fold : (F : U){T : Set} -> (β¦ F β§ T -> T) -> ΞΌ F -> T
fold F {T} Ο r = inward r [] where
mutual
inward : ΞΌ F -> Stack F T (ΞΌ F) -> T
inward (inn f) Ξ³ = onward (into F f) Ξ³
outward : T -> Stack F T (ΞΌ F) -> T
outward t [] = t
outward t (f' :: Ξ³) = onward (next F f' t) Ξ³
onward : NextJoker F T (ΞΌ F) -> Stack F T (ΞΌ F) -> T
onward (inl < r , f' >) Ξ³ = inward r (f' :: Ξ³)
onward (inr t) Ξ³ = outward (Ο t) Ξ³
-- can we make a non-tail recursive fold?
-- of course, nothing could be simpler: (not structurally recursive though)
fold' : (F : U){T : Set} -> (β¦ F β§ T -> T) -> ΞΌ F -> T
fold' F Ο = Ο β map F (fold' F Ο) β out
-- Fold operators
Ξ¦ : (F : U) -> Set -> Set
Ξ¦ (K A) T = A -> T
Ξ¦ Id T = T -> T
Ξ¦ (F + G) T = Ξ¦ F T [Γ] Ξ¦ G T
Ξ¦ (F Γ G) T = (T -> T -> T) [Γ] (Ξ¦ F T [Γ] Ξ¦ G T)
mkΟ : (F : U){T : Set} -> Ξ¦ F T -> β¦ F β§ T -> T
mkΟ (K A) f a = f a
mkΟ Id f t = f t
mkΟ (F + G) < Οf , Οg > (inl f) = mkΟ F Οf f
mkΟ (F + G) < Οf , Οg > (inr g) = mkΟ G Οg g
mkΟ (F Γ G) < _β_ , < Οf , Οg > > < f , g > = mkΟ F Οf f β mkΟ G Οg g
|
alloy4fun_models/trashltl/models/4/jY9KskdmXF53djf5F.als | Kaixi26/org.alloytools.alloy | 0 | 3858 | open main
pred idjY9KskdmXF53djf5F_prop5 {
no Trash and some f: File | eventually (f in Trash)
}
pred __repair { idjY9KskdmXF53djf5F_prop5 }
check __repair { idjY9KskdmXF53djf5F_prop5 <=> prop5o } |
agda/Itse/Grammar.agda | Riib11/itse | 1 | 15106 | module Itse.Grammar where
open import Relation.Binary.PropositionalEquality
open import Relation.Nullary
open import Relation.Unary
open import Data.List
open import Data.Maybe
open import Data.String
open import Data.Empty
data ExprVari : Set
Prgm : Set
data Stmt : Set
data Expr : ExprVari β Set
data Name : ExprVari β Set
data ExprVari where
s : ExprVari -- sort
k : ExprVari -- kind
p : ExprVari -- type
t : ExprVari -- term
_β-ExprVari_ : β (e : ExprVari) (eβ² : ExprVari) β Dec (e β‘ eβ²)
TypeOf : ExprVari β ExprVari
TypeOf s = s
TypeOf k = s
TypeOf p = k
TypeOf t = p
Kind : Set
Type : Set
Term : Set
Nameβ : Set
Nameβ : Set
Sort = Expr s
Kind = Expr k
Type = Expr p
Term = Expr t
Nameβ = Name p
Nameβ = Name t
Prgm = List Stmt
infixr 10 `defnβ_β¦_β_ `defnβ_β¦_β_
infixr 11 _`β_
infixr 12 `Ξ»ββ[_β¦_]_ `Ξ»ββ[_β¦_]_ `Ξ»ββ[_β¦_]_ `Ξ»ββ[_β¦_]_ `Ξ»ββ[_β¦_]_ `Ξ»ββ[_β¦_]_
infixr 13 _`βββ_ _`βββ_ _`βββ_ _`βββ_
infixr 14 `β_ `β_
data Stmt where
`defnβ_β¦_β_ : Nameβ β Kind β Type β Stmt
`defnβ_β¦_β_ : Nameβ β Type β Term β Stmt
data Expr where
-- sort
`β‘β : Sort
-- kind
`ββ : Kind
`Ξ»ββ[_β¦_]_ : Nameβ β Kind β Kind β Kind
`Ξ»ββ[_β¦_]_ : Nameβ β Type β Kind β Kind
-- p
`β_ : Nameβ β Type
`Ξ»ββ[_β¦_]_ : Nameβ β Kind β Type β Type
`Ξ»ββ[_β¦_]_ : Nameβ β Type β Type β Type
_`βββ_ : Type β Type β Type
_`βββ_ : Type β Term β Type
`ΞΉ[_]_ : Nameβ β Type β Type
-- t
`β_ : Nameβ β Term
`Ξ»ββ[_β¦_]_ : Nameβ β Kind β Term β Term
`Ξ»ββ[_β¦_]_ : Nameβ β Type β Term β Term
_`βββ_ : Term β Type β Term
_`βββ_ : Term β Term β Term
data Name where
nameβ : Maybe String β Nameβ
nameβ : Maybe String β Nameβ
postulate
_β-Name_ : β {e} (n : Name e) β (nβ² : Name e) β Dec (n β‘ nβ²)
s β-ExprVari s = yes refl
s β-ExprVari k = no Ξ» ()
s β-ExprVari p = no Ξ» ()
s β-ExprVari t = no Ξ» ()
k β-ExprVari s = no Ξ» ()
k β-ExprVari k = yes refl
k β-ExprVari p = no Ξ» ()
k β-ExprVari t = no Ξ» ()
p β-ExprVari s = no Ξ» ()
p β-ExprVari k = no Ξ» ()
p β-ExprVari p = yes refl
p β-ExprVari t = no Ξ» ()
t β-ExprVari s = no Ξ» ()
t β-ExprVari k = no Ξ» ()
t β-ExprVari p = no Ξ» ()
t β-ExprVari t = yes refl
_`β_ : Type β Type β Type
Ξ± `β Ξ² = `Ξ»ββ[ nameβ nothing β¦ Ξ± ] Ξ²
|
src/filters/ASM_blur1.asm | ignaciolebrero/Orga2-TP2 | 0 | 6029 | ; ************************************************************************* ;
; Organizacion del Computador II ;
; ;
; Implementacion de la funcion Blur 1 ;
; ;
; ************************************************************************* ;
extern malloc
extern free
%define elimprim 00000000h
; void ASM_blur1( uint32_t w, uint32_t h, uint8_t* data )
; edi , esi , rdx
global ASM_blur1
divs: dd 9.0, 9.0, 9.0, 9.0
shuf: db 0x00,0x04,0x08,0x0C, 0xFF, 0xFF, 0xFF, 0xFF, 0xFF, 0xFF, 0xFF, 0xFF, 0xFF, 0xFF, 0xFF, 0xFF
_floor: dd 0x7F80
ASM_blur1:
push RBP
mov RBP, RSP
push RBX
push R12
push R13
push R14
push R15
sub rsp, 8
ldmxcsr [_floor] ; Algo de redondeo
mov edi, edi ; Extiendo ceros
mov esi, esi
; Malloceo memoria temp (push y pop para no perder cosas importantes)
push rdi
push rsi
push rdx
mov r12d, edi
mov r13d, esi
mov rax, r12
mul r13
shl rax, 2
mov rdi, rax
call malloc
mov r10, rax ; r10 puntero a estructura temporal
pop rdx
pop rsi
pop rdi
mov r8, rdi ; r8 = w Copio tamaΓ±os para calcular direcciones
mov r9, rsi ; r9 = h
mov eax, elimprim ; eax = 0 dword, lo voy a usar para borrar el pixel que agarro de mas
dec rdi ; rdi = w-1 : Limite del loop de pixeles en fila
dec rsi ; rsi = h-1 : Limite del loop de filas
mov rbx, 1 ; rbx = 1 : "iw" itera pixeles en fila
mov rcx, 1 ; rcx = 1 : "ih" itera filas
movdqu xmm9, [divs] ; xmm9 = | 9.0 | 9.0 | 9.0 | 9.0 |
movdqu xmm10, [shuf] ; Shuffle para pasar dword int a byte int
mov r15, rdi
dec r15 ; Limite ultimo pixel w
mov r14, rsi
dec r14 ; Limite ultimo pixel h
; Al cargar los datos para el ultimo pixel, el pixel "de mas" no existe, sino que es espacio de memoria
; que no se supone que puedo acceder. R15 y R14 es para detectar cuando llego a esta posicion
loopw:
movdqu xmm1, [rdx + rbx*4 - 4] ; xmm1 = |d[0][iw+2]|d[0][iw+1]|d[0][iw]|d[0][iw-1]| d son 4 bytes A R G y B
lea r12, [rdx + r8*4]
lea r12, [r12 + rbx*4 - 4] ; r12 apunta a la misma columna de la siguiente fila
movdqu xmm3, [r12] ; xmm3 = |d[1][iw+2]|d[1][iw+1]|d[1][iw]|d[1][iw-1]|
pinsrd xmm1, eax, 03h ; xmm1 = | 0 |d[0][iw+1]|d[0][iw]|d[0][iw-1]|
pinsrd xmm3, eax, 03h ; xmm3 = | 0 |d[1][iw+1]|d[1][iw]|d[1][iw-1]|
movdqu xmm2, xmm1 ; xmm2 = xmm1
movdqu xmm4, xmm3 ; xmm4 = xmm3
pxor xmm8, xmm8 ; xmm8 = |0|
punpcklbw xmm1, xmm8 ; xmm1 = |d[0][iw] |d[0][iw-1]| d ahora son 4 words A R G y B extendidos con ceros
punpckhbw xmm2, xmm8 ; xmm2 = | 0 |d[0][iw+1]|
punpcklbw xmm3, xmm8 ; xmm3 = |d[1][iw] |d[1][iw-1]|
punpckhbw xmm4, xmm8 ; xmm4 = | 0 |d[1][iw+1]|
paddw xmm1, xmm2 ; xmm1 = |d[0][iw]|d[0][iw-1]+d[0][iw+1]|
paddw xmm3, xmm4 ; xmm3 = |d[1][iw]|d[1][iw-1]+d[1][iw+1]|
movdqu xmm2, xmm1 ; xmm2 = xmm1
movdqu xmm4, xmm3 ; xmm4 = xmm3
psrldq xmm2, 8 ; xmm2 = | 0 |d[0][iw]|
psrldq xmm4, 8 ; xmm4 = | 0 |d[1][iw]|
paddw xmm1, xmm2 ; xmm1 = | X |d[0][iw-1]+d[0][iw+1]+d[0][iw]|
paddw xmm3, xmm4 ; xmm3 = | X |d[1][iw-1]+d[1][iw+1]+d[1][iw]|
movdqu xmm2, xmm3 ; xmm2 = xmm3
lea r13, [r10 + r8*4]
lea r13, [r13 + rbx*4] ; posicion del pixel a calcular
lea r12, [r12 + r8*4] ; posicion del pixel de la fila siguiente a procesar
looph:
movdqu xmm0, xmm1 ;xmm0 suma pixeles fila anterior
movdqu xmm1, xmm2 ;xmm1 suma pixeles fila actual
movdqu xmm2, [r12] ; xmm2 = |d[ih+1][iw+2] |d[ih+1][iw+1]|d[ih+1][iw]|d[ih+1][iw -1]|
pinsrd xmm2, eax, 03h ; xmm2 = | 0 |d[ih+1][iw+1]|d[ih+1][iw]|d[ih+1][iw -1]|
contlastpixel:
movdqu xmm3, xmm2 ; xmm3 = xmm2
punpcklbw xmm2, xmm8 ; xmm2 = |d[ih+1][iw] |d[ih+1][iw-1]| d ahora son 4 words A R G y B extendidos con ceros
punpckhbw xmm3, xmm8 ; xmm3 = | 0 |d[ih+1][iw+1]|
paddw xmm2, xmm3 ; xmm2 = |d[ih+1][iw]|d[ih+1][iw-1]+d[ih+1][iw+1]|
movdqu xmm3, xmm2 ; xmm3 = xmm2
psrldq xmm3, 8 ; xmm3 = | 0 |d[ih+1][iw]|
paddw xmm2, xmm3 ; xmm2 = | X |d[ih+1][iw-1]+d[ih+1][iw+1]+d[ih+1][iw]|
paddw xmm0, xmm2
paddw xmm0, xmm1 ; xmm0 = | X |SUMA d[x][y] con x = {ih-1, ih, ih+1} y = {iw-1, iw, iw+1}|
punpcklwd xmm0, xmm8 ; xmm0 = |SUMA d[x][y] con x = {ih-1, ih, ih+1} y = {iw-1, iw, iw+1}| 4 dwords A R G y B extendidos con ceros
CVTDQ2PS xmm3, xmm0 ; xmm3 = | R | A | B | G |
divps xmm3, xmm9 ; xmm3 = | R/9 | A/9 | B/9 | G/9 |
CVTPS2DQ xmm0, xmm3 ; xmm0 = | R' | A' | B' | G' |
pshufb xmm0, xmm10 ; xmm0 = | 0 | 0 | 0 |R|A|G|B|
PEXTRD [r13], xmm0, 00b ; grabo a memoria
lea r13, [r13 + r8*4]
lea r12, [r12 + r8*4]
inc rcx ; incremento ih
cmp rbx, r15 ; Me fijo si llegue a la ultima columna a procesar
jne cont
cmp rcx, r14 ; En caso de estar en ultima columna a procesar, me fijo si llegue a ultima fila a procesar
je lastpixel ; Salto a ultimo caso especial (ultimo pixel)
cont:
cmp rcx, rsi ; Me fijo si llegue a ultima linea, loop normal
jne looph
mov rcx, 1
inc rbx
cmp rbx, rdi
jne loopw
jmp copy
lastpixel:
movdqu xmm0, xmm1 ;xmm0 suma pixeles fila anterior
movdqu xmm1, xmm2 ;xmm1 suma pixeles fila actual
movdqu xmm2, [r12-4] ; xmm2 = |d[ih+1][iw+1] |d[ih+1][iw] |d[ih+1][iw -1] |d[ih+1][iw -2]|
psrldq xmm2, 4 ; xmm2 = | 0 |d[ih+1][iw+1] |d[ih+1][iw] |d[ih+1][iw -1]|
jmp contlastpixel
; Copio todo lo procesado a la imagen original
copy:
lea r12, [r10 + r8*4] ; r12 apunta a data temporal, desde segunda linea
lea r14, [rdx + r8*4] ; r14 apunta a data original, desde segunda linea
xor rcx, rcx ; rcx = 0 countx
mov rbx, 1 ; rbx = 1 county (no paso por borde superior)
mov r15, r8 ; r15 = w
dec r15 ; r15 = w-1 (para ver si llego al borde, los bordes no se cambian)
dec r9 ; r9 = h-1 (idem)
copywhile:
cmp rcx, 0 ; Borde izquierdo
je borde
cmp rcx, r15 ; Borde derecho
je borde
mov r11d, [r12] ; Copy
mov [r14], r11d ; Paste
borde: ; Si vengo aca salteo la copia
inc rcx ; inc x
add r14, 4 ; Avanzo
add r12, 4 ; *
cmp rcx, r8 ; Termino la fila
jne copywhile
mov rcx, 0
inc rbx ; inc y
cmp rbx, r9 ; Borde inferior
jne copywhile
; Freeo la data temporal
mov rdi, r10
call free
add rsp, 8
pop r15
pop r14
pop r13
pop r12
pop rbx
pop rbp
ret |
Transynther/x86/_processed/NONE/_xt_/i7-8650U_0xd2_notsx.log_21829_1307.asm | ljhsiun2/medusa | 9 | 104109 | <reponame>ljhsiun2/medusa
.global s_prepare_buffers
s_prepare_buffers:
push %r12
push %r15
push %r9
push %rbp
push %rcx
push %rdi
push %rsi
lea addresses_normal_ht+0x22, %rsi
lea addresses_UC_ht+0xd2fa, %rdi
clflush (%rsi)
clflush (%rdi)
nop
nop
nop
nop
nop
cmp %r12, %r12
mov $28, %rcx
rep movsl
nop
nop
dec %rsi
lea addresses_D_ht+0xb2c2, %rdi
nop
nop
and $1400, %rbp
movl $0x61626364, (%rdi)
nop
nop
nop
nop
nop
sub $9925, %r12
lea addresses_normal_ht+0x235a, %rsi
lea addresses_UC_ht+0x81c4, %rdi
cmp %r9, %r9
mov $62, %rcx
rep movsb
nop
nop
cmp %r12, %r12
lea addresses_normal_ht+0x1564a, %rcx
nop
sub $6403, %rdi
movb (%rcx), %r15b
nop
sub $37326, %rbp
pop %rsi
pop %rdi
pop %rcx
pop %rbp
pop %r9
pop %r15
pop %r12
ret
.global s_faulty_load
s_faulty_load:
push %r10
push %r11
push %r15
push %r9
push %rbx
push %rcx
// Faulty Load
lea addresses_A+0x18fda, %rbx
nop
nop
nop
nop
inc %rcx
mov (%rbx), %r11
lea oracles, %r15
and $0xff, %r11
shlq $12, %r11
mov (%r15,%r11,1), %r11
pop %rcx
pop %rbx
pop %r9
pop %r15
pop %r11
pop %r10
ret
/*
<gen_faulty_load>
[REF]
{'OP': 'LOAD', 'src': {'type': 'addresses_A', 'size': 4, 'AVXalign': True, 'NT': True, 'congruent': 0, 'same': False}}
[Faulty Load]
{'OP': 'LOAD', 'src': {'type': 'addresses_A', 'size': 8, 'AVXalign': False, 'NT': False, 'congruent': 0, 'same': True}}
<gen_prepare_buffer>
{'OP': 'REPM', 'src': {'type': 'addresses_normal_ht', 'congruent': 1, 'same': False}, 'dst': {'type': 'addresses_UC_ht', 'congruent': 4, 'same': False}}
{'OP': 'STOR', 'dst': {'type': 'addresses_D_ht', 'size': 4, 'AVXalign': False, 'NT': False, 'congruent': 3, 'same': False}}
{'OP': 'REPM', 'src': {'type': 'addresses_normal_ht', 'congruent': 6, 'same': False}, 'dst': {'type': 'addresses_UC_ht', 'congruent': 1, 'same': False}}
{'OP': 'LOAD', 'src': {'type': 'addresses_normal_ht', 'size': 1, 'AVXalign': False, 'NT': False, 'congruent': 3, 'same': False}}
{'35': 21829}
35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35
*/
|
libsrc/_DEVELOPMENT/arch/zxn/esxdos/c/sccz80/esx_ide_bank_free.asm | jpoikela/z88dk | 640 | 95915 | ; unsigned char esx_ide_bank_free(unsigned char banktype, unsigned char page)
SECTION code_esxdos
PUBLIC esx_ide_bank_free
EXTERN asm_esx_ide_bank_free
esx_ide_bank_free:
pop af
pop de
pop hl
push hl
push de
push af
ld h,e
jp asm_esx_ide_bank_free
|
Categories/Support/ZigZag.agda | copumpkin/categories | 98 | 12857 | <filename>Categories/Support/ZigZag.agda
{-# OPTIONS --universe-polymorphism #-}
-- in a lot of cases we have a relation that is already reflexive and symmetric
-- and we want to make it symmetric
module Categories.Support.ZigZag where
open import Level
open import Relation.Binary
open import Relation.Binary.Construct.On using () renaming (isEquivalence to on-preserves-equivalence)
open import Categories.Support.Equivalence using () renaming (Setoid to ISetoid; module Setoid to ISetoid)
data Direction : Set where
β β : Direction
rotate : Direction β Direction
rotate β = β
rotate β = β
data ZigZagβ² {c ββ} {Carrier : Set c} (_βΌ_ : Carrier -> Carrier -> Set ββ) : (x y : Carrier) (begin end : Direction) β Set (c β ββ) where
zig : β {x y z e} (first : x βΌ y) (rest : ZigZagβ² _βΌ_ y z β e) β ZigZagβ² _βΌ_ x z β e
zag : β {x y z e} (first : y βΌ x) (rest : ZigZagβ² _βΌ_ y z β e) β ZigZagβ² _βΌ_ x z β e
slish : β {x y} (last : x βΌ y) β ZigZagβ² _βΌ_ x y β β
slash : β {x y} (last : y βΌ x) β ZigZagβ² _βΌ_ x y β β
ZigZag : β {c ββ ββ} (Base : Preorder c ββ ββ) β (x y : Preorder.Carrier Base) (begin end : Direction) β Set (c β ββ)
ZigZag Base = ZigZagβ² (Preorder._βΌ_ Base)
zz-symβ² : β {c ββ ββ} {Base : Preorder c ββ ββ} {x y z begin middle end} β ZigZag Base y z middle end β ZigZag Base y x middle begin β ZigZag Base z x (rotate end) begin
zz-symβ² {Base = Base} (zig first rest) accum = zz-symβ² {Base = Base} rest (zag first accum)
zz-symβ² {Base = Base} (zag first rest) accum = zz-symβ² {Base = Base} rest (zig first accum)
zz-symβ² (slish last) accum = zag last accum
zz-symβ² (slash last) accum = zig last accum
zz-sym : β {c ββ ββ} {Base : Preorder c ββ ββ} {x y begin end} β ZigZag Base x y begin end β ZigZag Base y x (rotate end) (rotate begin)
zz-sym {Base = Base} (zig first rest) = zz-symβ² {Base = Base} rest (slash first)
zz-sym {Base = Base} (zag first rest) = zz-symβ² {Base = Base} rest (slish first)
zz-sym (slish last) = slash last
zz-sym (slash last) = slish last
zz-trans : β {c ββ ββ} {Base : Preorder c ββ ββ} {x y z begin end beginβ² endβ²} β ZigZag Base x y begin end β ZigZag Base y z beginβ² endβ² β ZigZag Base x z begin endβ²
zz-trans {Base = Base} (zig first rest) yz = zig first (zz-trans {Base = Base} rest yz)
zz-trans {Base = Base} (zag first rest) yz = zag first (zz-trans {Base = Base} rest yz)
zz-trans {Base = Base} (slish last) (zig first rest) = zig (Preorder.trans Base last first) rest
zz-trans (slish last) (zag first rest) = zig last (zag first rest)
zz-trans {Base = Base} (slish last) (slish only) = slish (Preorder.trans Base last only)
zz-trans (slish last) (slash only) = zig last (slash only)
zz-trans (slash last) (zig first rest) = zag last (zig first rest)
zz-trans {Base = Base} (slash last) (zag first rest) = zag (Preorder.trans Base first last) rest
zz-trans (slash last) (slish only) = zag last (slish only)
zz-trans {Base = Base} (slash last) (slash only) = slash (Preorder.trans Base only last)
data Alternatingβ² {c ββ} {Carrier : Set c} (_βΌ_ : Carrier -> Carrier -> Set ββ) (x y : Carrier) : Set (c β ββ) where
disorient : β {begin end} (zz : ZigZagβ² _βΌ_ x y begin end) β Alternatingβ² _βΌ_ x y
Alternating : β {c ββ ββ} (Base : Preorder c ββ ββ) β (x y : Preorder.Carrier Base) β Set (c β ββ)
Alternating Base = Alternatingβ² (Preorder._βΌ_ Base)
is-equivalence : β {c ββ ββ} (Base : Preorder c ββ ββ) β IsEquivalence (Alternating Base)
is-equivalence Base = record
{ refl = disorient (slash (Base.refl))
; sym = my-sym
; trans = my-trans
}
where
module Base = Preorder Base
my-sym : β {i j} β Alternating Base i j β Alternating Base j i
my-sym (disorient zz) = disorient (zz-sym {Base = Base} zz)
my-trans : β {i j k} β Alternating Base i j β Alternating Base j k β Alternating Base i k
my-trans (disorient ij) (disorient jk) = disorient (zz-trans {Base = Base} ij jk)
setoid : β {c ββ ββ} (Base : Preorder c ββ ββ) β Setoid c (c β ββ)
setoid Base = record
{ Carrier = Preorder.Carrier Base
; _β_ = Alternating Base
; isEquivalence = is-equivalence Base }
isetoid : β {c ββ ββ} (Base : Preorder c ββ ββ) β ISetoid c (c β ββ)
isetoid Base = record
{ Carrier = Preorder.Carrier Base
; _β_ = Alternating Base
; isEquivalence = is-equivalence Base }
-- the main eliminators for Alternating -- they prove that any equivalence that
-- respects the base preorder also respects its Alternating completion.
locally-minimal : β {c ββ ββ ββ²} (Base : Preorder c ββ ββ) {_β_ : Rel (Preorder.Carrier Base) ββ²} (β-isEquivalence : IsEquivalence _β_) β (Preorder._βΌ_ Base β _β_) β (Alternating Base β _β_)
locally-minimal Base {_β_} isEq inj (disorient zz) = impl zz
where
open IsEquivalence isEq renaming (trans to _>trans>_)
impl : β {i j b e} β ZigZag Base i j b e β i β j
impl (zig first rest) = inj first >trans> impl rest
impl (zag first rest) = sym (inj first) >trans> impl rest
impl (slish last) = inj last
impl (slash last) = sym (inj last)
minimal : β {c ββ ββ cβ² ββ²} (Base : Preorder c ββ ββ) (Dest : Setoid cβ² ββ²) (f : Preorder.Carrier Base β Setoid.Carrier Dest) β (Preorder._βΌ_ Base =[ f ]β Setoid._β_ Dest) β (Alternating Base =[ f ]β Setoid._β_ Dest)
minimal Base Dest f inj = locally-minimal Base (on-preserves-equivalence f (Setoid.isEquivalence Dest)) inj
.iminimal : β {c ββ ββ cβ² ββ²} (Base : Preorder c ββ ββ) (Dest : ISetoid cβ² ββ²) (f : Preorder.Carrier Base β ISetoid.Carrier Dest) β (Preorder._βΌ_ Base =[ f ]β ISetoid._β_ Dest) β (Alternating Base =[ f ]β ISetoid._β_ Dest)
iminimal Base Dest f inj = locally-minimal Base (on-preserves-equivalence f (ISetoid.isEquivalence Dest)) inj
|
Lambda/Closure/Functional/Non-deterministic/No-workarounds.agda | nad/codata | 1 | 829 | <filename>Lambda/Closure/Functional/Non-deterministic/No-workarounds.agda
------------------------------------------------------------------------
-- Functional semantics for a non-deterministic untyped Ξ»-calculus
-- with constants
------------------------------------------------------------------------
{-# OPTIONS --no-termination-check #-}
module Lambda.Closure.Functional.Non-deterministic.No-workarounds where
open import Category.Monad.Partiality as Pa using (_β₯; now; later)
open import Codata.Musical.Notation
open import Data.Fin using (Fin; zero; suc; #_)
open import Data.List hiding (lookup)
open import Data.Maybe hiding (_>>=_)
open import Data.Nat
open import Data.Vec using ([]; _β·_; lookup)
open import Function
open import Relation.Binary.PropositionalEquality as P using (_β‘_)
open import Relation.Nullary
open import Relation.Nullary.Decidable
open import Lambda.Syntax using (Ty; Ctxt)
open Lambda.Syntax.Closure using (con; Ζ)
open Lambda.Syntax.Ty
open import Lambda.VirtualMachine
hiding (comp; comp-val; comp-env; lookup-hom)
open Functional
private
module VM = Lambda.Syntax.Closure Code
------------------------------------------------------------------------
-- A monad with partiality, failure and non-determinism
-- This is basically the maybe monad transformer applied to the
-- partiality monad transformer applied to the non-determinism monad
-- NΒ A = ΞΌX.Β AΒ βΒ XΒ ΓΒ X. Unfortunately it is somewhat awkward to
-- implement the partiality monad transformer in Agda: the definition
--
-- data Partialityβ² (M : Set β Set) (A : Set) : Set where
-- now-or-later : M (A β Partialityβ² M A) β Partialityβ² M A
--
-- is rejected, because M might use its argument negatively.
infixr 6 _β£_
data D (A : Set) : Set where
fail : D A
return : (x : A) β D A
_β£_ : (x y : D A) β D A
later : (x : β (D A)) β D A
-- The function forceΒ n removes (up to) n layers of later
-- constructors.
force : {A : Set} β β β D A β D A
force (suc n) (later x) = force n (β x)
force n (xβ β£ xβ) = force n xβ β£ force n xβ
force _ x = x
-- Bind.
infixl 5 _>>=_
_>>=_ : {A B : Set} β D A β (A β D B) β D B
fail >>= f = fail
return x >>= f = f x
(xβ β£ xβ) >>= f = (xβ >>= f) β£ (xβ >>= f)
later x >>= f = later (β― (β x >>= f))
-- A deterministic non-terminating computation.
never : {A : Set} β D A
never = later (β― never)
-- Strong bisimilarity.
infix 4 _β
_
data _β
_ {A : Set} : D A β D A β Set where
fail : fail β
fail
return : β {x} β return x β
return x
_β£_ : β {xβ xβ yβ yβ}
(xββ
yβ : xβ β
yβ) (xββ
yβ : xβ β
yβ) β xβ β£ xβ β
yβ β£ yβ
later : β {x y} (xβ
y : β (β x β
β y)) β later x β
later y
-- Strong bisimilarity is reflexive.
infixr 3 _β
_β : {A : Set} (x : D A) β x β
x
fail β = fail
return x β = return
xβ β£ xβ β = (xβ β) β£ (xβ β)
later x β = later (β― (β x β))
-- Strong bisimilarity is symmetric.
sym : {A : Set} {x y : D A} β x β
y β y β
x
sym fail = fail
sym return = return
sym (xββ
yβ β£ xββ
yβ) = sym xββ
yβ β£ sym xββ
yβ
sym (later xβ
y) = later (β― sym (β xβ
y))
-- Strong bisimilarity is transitive.
infixr 2 _β
β¨_β©_
_β
β¨_β©_ : β {A : Set} (x : D A) {y z} β x β
y β y β
z β x β
z
._ β
β¨ fail β© fail = fail
._ β
β¨ return β© return = return
._ β
β¨ xββ
yβ β£ xββ
yβ β© yββ
zβ β£ yββ
zβ = (_ β
β¨ xββ
yβ β© yββ
zβ) β£ (_ β
β¨ xββ
yβ β© yββ
zβ)
._ β
β¨ later xβ
y β© later yβ
z = later (β― (_ β
β¨ β xβ
y β© β yβ
z))
-- The monad laws hold up to strong bisimilarity.
left-identity : {A B : Set} {x : A} {f : A β D B} β
return x >>= f β
f x
left-identity {x = x} {f} = f x β
right-identity : {A : Set} (x : D A) β x >>= return β
x
right-identity fail = fail
right-identity (return x) = return
right-identity (xβ β£ xβ) = right-identity xβ β£ right-identity xβ
right-identity (later x) = later (β― right-identity (β x))
associative : {A B C : Set} (x : D A) {f : A β D B} {g : B β D C} β
x >>= f >>= g β
x >>= Ξ» y β f y >>= g
associative fail = fail
associative (return x) {f} {g} = f x >>= g β
associative (xβ β£ xβ) = associative xβ β£ associative xβ
associative (later x) = later (β― associative (β x))
-- Bind respects strong bisimilarity.
infixl 5 _>>=-cong_
_>>=-cong_ : {A B : Set} {xβ xβ : D A} {fβ fβ : A β D B} β
xβ β
xβ β (β y β fβ y β
fβ y) β xβ >>= fβ β
xβ >>= fβ
fail >>=-cong fββ
fβ = fail
return >>=-cong fββ
fβ = fββ
fβ _
later xβ
y >>=-cong fββ
fβ = later (β― (β xβ
y >>=-cong fββ
fβ))
xββ
xβ β£ yββ
yβ >>=-cong fββ
fβ =
(xββ
xβ >>=-cong fββ
fβ) β£ (yββ
yβ >>=-cong fββ
fβ)
-- More laws.
never-left-zero : {A B : Set} {f : A β D B} β never >>= f β
never
never-left-zero = later (β― never-left-zero)
fail-left-zero : {A B : Set} {f : A β D B} β fail >>= f β
fail
fail-left-zero = fail β
------------------------------------------------------------------------
-- Syntax
infixl 9 _Β·_
data Tm (n : β) : Set where
con : (i : β) β Tm n
var : (x : Fin n) β Tm n
Ζ : (t : Tm (suc n)) β Tm n
_Β·_ : (tβ tβ : Tm n) β Tm n
_β£_ : (tβ tβ : Tm n) β Tm n
-- Convenient helper.
vr : β m {n} {m<n : True (suc m β€? n)} β Tm n
vr _ {m<n = m<n} = var (#_ _ {m<n = m<n})
open Lambda.Syntax.Closure Tm hiding (con; Ζ)
------------------------------------------------------------------------
-- Semantics
infix 9 _β_
mutual
β¦_β§ : β {n} β Tm n β Env n β D Value
β¦ con i β§ Ο = return (con i)
β¦ var x β§ Ο = return (lookup Ο x)
β¦ Ζ t β§ Ο = return (Ζ t Ο)
β¦ tβ Β· tβ β§ Ο = β¦ tβ β§ Ο >>= Ξ» vβ β
β¦ tβ β§ Ο >>= Ξ» vβ β
vβ β vβ
β¦ tβ β£ tβ β§ Ο = β¦ tβ β§ Ο β£ β¦ tβ β§ Ο
_β_ : Value β Value β D Value
con i β vβ = fail
Ζ tβ Ο β vβ = later (β― (β¦ tβ β§ (vβ β· Ο)))
-- An abbreviation.
infix 9 _β¦Β·β§_
_β¦Β·β§_ : D Value β D Value β D Value
vβ β¦Β·β§ vβ = vβ >>= Ξ» vβ β vβ >>= Ξ» vβ β vβ β vβ
------------------------------------------------------------------------
-- Compiler
-- The compiler takes a code continuation.
--
-- Non-determinism is resolved by always picking the left choice.
comp : β {n} β Tm n β Code n β Code n
comp (con i) c = con i β· c
comp (var x) c = var x β· c
comp (Ζ t) c = clo (comp t [ ret ]) β· c
comp (tβ Β· tβ) c = comp tβ (comp tβ (app β· c))
comp (tβ β£ tβ) c = comp tβ c
-- Environments and values can also be compiled.
mutual
comp-env : β {n} β Env n β VM.Env n
comp-env [] = []
comp-env (v β· Ο) = comp-val v β· comp-env Ο
comp-val : Value β VM.Value
comp-val (con i) = con i
comp-val (Ζ t Ο) = Ζ (comp t [ ret ]) (comp-env Ο)
-- lookupΒ x is homomorphic with respect to comp-env/comp-val.
lookup-hom : β {n} (x : Fin n) Ο β
lookup (comp-env Ο) x β‘ comp-val (lookup Ο x)
lookup-hom zero (v β· Ο) = P.refl
lookup-hom (suc x) (v β· Ο) = lookup-hom x Ο
------------------------------------------------------------------------
-- Examples
-- A non-terminating term.
Ξ© : Tm 0
Ξ© = Ο Β· Ο
where Ο = Ζ (vr 0 Β· vr 0)
Ξ©-loops : β¦ Ξ© β§ [] β
never
Ξ©-loops = later (β― Ξ©-loops)
-- A call-by-value fix-point combinator.
Z : {n : β} β Tm n
Z = Ζ (t Β· t)
where t = Ζ (vr 1 Β· Ζ (vr 1 Β· vr 1 Β· vr 0))
-- A non-deterministically non-terminating term.
! : Tm 0
! = Z Β· Ζ (Ζ (vr 1 Β· vr 0 β£ vr 1 Β· vr 0)) Β· con 0
-- Its semantics.
!-sem : D Value
!-sem = later (β― later (β― later (β― later (β― (!-sem β£ !-sem)))))
β¦!β§β
!-sem : β¦ ! β§ [] β
!-sem
β¦!β§β
!-sem = later (β― lem)
where
lem : force 1 (β¦ ! β§ []) β
force 1 !-sem
lem = later (β― later (β― later (β― (later (β― lem) β£ later (β― lem)))))
-- How did I come up with this proof term? Through a manual
-- calculation...
--
-- Let us first define some abbreviations:
--
-- tβ = vr 1 Β· vr 1 Β· vr 0
-- tβ = Ζ tβ
-- tβ = vr 1 Β· tβ
-- tβ = Ζ tβ
--
-- uβ = vr 1 Β· vr 0
-- uβ = uβ β£ uβ
-- uβ = Ζ uβ
-- uβ = Ζ uβ
--
-- cβ = Ζ uβ []
-- cβ = Ζ tβ (cβ β· [])
-- cβ = Ζ tβ (cβ β· cβ β· [])
--
-- Now we can calculate as follows (ignoring β―):
--
-- β¦ Z Β· uβ Β· con 0 β§ []
-- = β¦ Z Β· uβ β§ [] β¦Β·β§ return (con 0)
-- = Ζ (tβ Β· tβ) [] β cβ β¦Β·β§ return (con 0)
-- = later (β¦ tβ Β· tβ β§ (cβ β· []) β¦Β·β§ return (con 0))
-- = later (cβ β cβ β¦Β·β§ return (con 0))
--
-- = cβ β cβ β¦Β·β§ return (con 0)
-- = later (β¦ tβ β§ (cβ β· cβ β· []) β¦Β·β§ return (con 0))
-- = later (cβ β cβ β¦Β·β§ return (con 0))
-- = later (later (β¦ uβ β§ (cβ β· []) β¦Β·β§ return (con 0)))
-- = later (later (Ζ uβ (cβ β· []) β con 0))
-- = later (later (later (β¦ uβ β§ (con 0 β· cβ β· []))))
-- = later (later (later (β¦ uβ β§ (con 0 β· cβ β· []) β£
-- β¦ uβ β§ (con 0 β· cβ β· []))))
-- = later (later (later (cβ β con 0 β£ cβ β con 0)))
-- = later (later (later (β¦ tβ β§ (con 0 β· cβ β· cβ β· []) β£
-- β¦ tβ β§ (con 0 β· cβ β· cβ β· []))))
-- = later (later (later (later (cβ β cβ β¦Β·β§ return (con 0)) β£
-- later (cβ β cβ β¦Β·β§ return (con 0)))))
------------------------------------------------------------------------
-- A relation relating deterministic and non-deterministic
-- computations
-- xΒ ββΒ y means that x implements /one/ possible semantics of y (up to
-- weak bisimilarity).
infix 4 _ββ_
data _ββ_ {A : Set} : Maybe A β₯ β D A β Set where
fail : now nothing ββ fail
return : β {x} β now (just x) ββ return x
β£Λ‘ : β {x yβ yβ} (xββyβ : x ββ yβ) β x ββ yβ β£ yβ
β£Κ³ : β {x yβ yβ} (xββyβ : x ββ yβ) β x ββ yβ β£ yβ
later : β {x y} (xββy : β (β x ββ β y)) β later x ββ later y
laterΛ‘ : β {x y} (xββy : β x ββ y ) β later x ββ y
laterΚ³ : β {x y} (xββy : x ββ β y ) β x ββ later y
-- A transitivity-like result for _β‘_ and _ββ_.
infixr 2 _β‘β¨_β©_
_β‘β¨_β©_ : β {A : Set} (x : Maybe A β₯) {y z} β x β‘ y β y ββ z β x ββ z
_ β‘β¨ P.refl β© yβz = yβz
-- A transitivity-like result for _ββ_ and _β
_.
infixr 2 _βββ¨_β©_
_βββ¨_β©_ : β {A : Set} (x : Maybe A β₯) {y z} β x ββ y β y β
z β x ββ z
._ βββ¨ fail β© fail = fail
._ βββ¨ return β© return = return
_ βββ¨ β£Λ‘ xβββyβ β© yββ
zβ β£ yββ
zβ = β£Λ‘ (_ βββ¨ xβββyβ β© yββ
zβ)
_ βββ¨ β£Κ³ xβββyβ β© yββ
zβ β£ yββ
zβ = β£Κ³ (_ βββ¨ xβββyβ β© yββ
zβ)
._ βββ¨ later xββy β© later yβ
z = later (β― (_ βββ¨ β xββy β© β yβ
z))
._ βββ¨ laterΛ‘ xββy β© yβ
z = laterΛ‘ (_ βββ¨ xββy β© yβ
z)
_ βββ¨ laterΚ³ xββy β© later yβ
z = laterΚ³ (_ βββ¨ xββy β© β yβ
z)
-- An example.
lemma : Pa.never ββ !-sem
lemma = later (β― later (β― later (β― later (β― β£Λ‘ lemma))))
------------------------------------------------------------------------
-- Compiler correctness
module Correctness where
mutual
correct :
β {n} t {Ο : Env n} {c s} {k : Value β D VM.Value} β
(β v β exec β¨ c , val (comp-val v) β· s , comp-env Ο β© ββ k v) β
exec β¨ comp t c , s , comp-env Ο β© ββ (β¦ t β§ Ο >>= k)
correct (con i) {Ο} {c} {s} {k} hyp = laterΛ‘ (
exec β¨ c , val (con i) β· s , comp-env Ο β© βββ¨ hyp (con i) β©
k (con i) β)
correct (var x) {Ο} {c} {s} {k} hyp = laterΛ‘ (
exec β¨ c , val (lookup (comp-env Ο) x) β· s , comp-env Ο β© β‘β¨ P.cong (Ξ» v β exec β¨ c , val v β· s , comp-env Ο β©) (lookup-hom x Ο) β©
exec β¨ c , val (comp-val (lookup Ο x)) β· s , comp-env Ο β© βββ¨ hyp (lookup Ο x) β©
k (lookup Ο x) β)
correct (Ζ t) {Ο} {c} {s} {k} hyp = laterΛ‘ (
exec β¨ c , val (comp-val (Ζ t Ο)) β· s , comp-env Ο β© βββ¨ hyp (Ζ t Ο) β©
k (Ζ t Ο) β)
correct (tβ Β· tβ) {Ο} {c} {s} {k} hyp =
exec β¨ comp tβ (comp tβ (app β· c)) , s , comp-env Ο β© βββ¨ correct tβ (Ξ» vβ β correct tβ (Ξ» vβ β β-correct vβ vβ hyp)) β©
(β¦ tβ β§ Ο >>= Ξ» vβ β β¦ tβ β§ Ο >>= Ξ» vβ β vβ β vβ >>= k) β
β¨ ((β¦ tβ β§ Ο β) >>=-cong Ξ» _ β sym $ associative (β¦ tβ β§ Ο)) β©
(β¦ tβ β§ Ο >>= Ξ» vβ β (β¦ tβ β§ Ο >>= Ξ» vβ β vβ β vβ) >>= k) β
β¨ sym $ associative (β¦ tβ β§ Ο) β©
(β¦ tβ β§ Ο β¦Β·β§ β¦ tβ β§ Ο >>= k) β
β¨ _ β β©
(β¦ tβ Β· tβ β§ Ο >>= k) β
correct (tβ β£ tβ) {Ο} {c} {s} {k} hyp =
exec β¨ comp tβ c , s , comp-env Ο β© βββ¨ β£Λ‘ (correct tβ hyp) β©
(β¦ tβ β§ Ο >>= k) β£ (β¦ tβ β§ Ο >>= k) β
β-correct :
β {n} vβ vβ {Ο : Env n} {c s} {k : Value β D VM.Value} β
(β v β exec β¨ c , val (comp-val v) β· s , comp-env Ο β© ββ k v) β
exec β¨ app β· c , val (comp-val vβ) β· val (comp-val vβ) β· s , comp-env Ο β© ββ
vβ β vβ >>= k
β-correct (con i) vβ _ = fail
β-correct (Ζ tβ Οβ) vβ {Ο} {c} {s} {k} hyp =
exec β¨ app β· c , val (comp-val vβ) β· val (comp-val (Ζ tβ Οβ)) β· s , comp-env Ο β© βββ¨ later (β― (
exec β¨ comp tβ [ ret ] , ret c (comp-env Ο) β· s , comp-env (vβ β· Οβ) β© βββ¨ correct tβ (Ξ» v β laterΛ‘ (hyp v)) β©
(β¦ tβ β§ (vβ β· Οβ) >>= k) β)) β©
(Ζ tβ Οβ β vβ >>= k) β
correct : β t β
exec β¨ comp t [] , [] , [] β© ββ
β¦ t β§ [] >>= Ξ» v β return (comp-val v)
correct t = Correctness.correct t (Ξ» _ β return)
------------------------------------------------------------------------
-- Type system (following Leroy and Grall)
infix 4 _β’_β_
data _β’_β_ {n} (Ξ : Ctxt n) : Tm n β Ty β Set where
con : β {i} β Ξ β’ con i β nat
var : β {x} β Ξ β’ var x β lookup Ξ x
Ζ : β {t Ο Ο} (tβ : β Ο β· Ξ β’ t β β Ο) β Ξ β’ Ζ t β Ο βΎ Ο
_Β·_ : β {tβ tβ Ο Ο} (tββ : Ξ β’ tβ β Ο βΎ Ο) (tββ : Ξ β’ tβ β β Ο) β
Ξ β’ tβ Β· tβ β β Ο
_β£_ : β {tβ tβ Ο} (tββ : Ξ β’ tβ β Ο) (tββ : Ξ β’ tβ β Ο) β
Ξ β’ tβ β£ tβ β Ο
-- Ξ© is well-typed.
Ξ©-well-typed : (Ο : Ty) β [] β’ Ξ© β Ο
Ξ©-well-typed Ο =
_Β·_ {Ο = β― Ο} {Ο = β― Ο} (Ζ (var Β· var)) (Ζ (var Β· var))
where Ο = β― Ο βΎ β― Ο
-- The call-by-value fix-point combinator is also well-typed.
fix-well-typed :
β {Ο Ο} β [] β’ Z β β― (β― (Ο βΎ Ο) βΎ β― (Ο βΎ Ο)) βΎ β― (Ο βΎ Ο)
fix-well-typed =
Ζ (_Β·_ {Ο = Ο
} {Ο = β― _}
(Ζ (var Β· Ζ (var Β· var Β· var)))
(Ζ (var Β· Ζ (var Β· var Β· var))))
where
Ο
: β Ty
Ο
= β― (Ο
βΎ β― _)
------------------------------------------------------------------------
-- Type soundness
-- WF-Value, WF-Env and WF-DV specify when a
-- value/environment/computation is well-formed with respect to a
-- given context (and type).
mutual
data WF-Value : Ty β Value β Set where
con : β {i} β WF-Value nat (con i)
Ζ : β {n Ξ Ο Ο} {t : Tm (1 + n)} {Ο}
(tβ : β Ο β· Ξ β’ t β β Ο) (Ο-wf : WF-Env Ξ Ο) β
WF-Value (Ο βΎ Ο) (Ζ t Ο)
infixr 5 _β·_
data WF-Env : β {n} β Ctxt n β Env n β Set where
[] : WF-Env [] []
_β·_ : β {n} {Ξ : Ctxt n} {Ο Ο v}
(v-wf : WF-Value Ο v) (Ο-wf : WF-Env Ξ Ο) β
WF-Env (Ο β· Ξ) (v β· Ο)
data WF-DV (Ο : Ty) : D Value β Set where
return : β {v} (v-wf : WF-Value Ο v) β WF-DV Ο (return v)
_β£_ : β {x y}
(x-wf : WF-DV Ο x) (y-wf : WF-DV Ο y) β WF-DV Ο (x β£ y)
later : β {x} (x-wf : β (WF-DV Ο (β x))) β WF-DV Ο (later x)
-- Variables pointing into a well-formed environment refer to
-- well-formed values.
lookup-wf : β {n Ξ Ο} (x : Fin n) β WF-Env Ξ Ο β
WF-Value (lookup Ξ x) (lookup Ο x)
lookup-wf zero (v-wf β· Ο-wf) = v-wf
lookup-wf (suc x) (v-wf β· Ο-wf) = lookup-wf x Ο-wf
-- If we can prove WF-DVΒ ΟΒ x, then x does not "go wrong".
does-not-go-wrong : β {Ο x} β WF-DV Ο x β Β¬ now nothing ββ x
does-not-go-wrong (return v-wf) ()
does-not-go-wrong (x-wf β£ y-wf) (β£Λ‘ xβ―) = does-not-go-wrong x-wf xβ―
does-not-go-wrong (x-wf β£ y-wf) (β£Κ³ yβ―) = does-not-go-wrong y-wf yβ―
does-not-go-wrong (later x-wf) (laterΚ³ xβ―) =
does-not-go-wrong (β x-wf) xβ―
-- Bind preserves WF-DV in the following way:
_>>=-cong-WF_ :
β {Ο Ο x f} β
WF-DV Ο x β (β {v} β WF-Value Ο v β WF-DV Ο (f v)) β
WF-DV Ο (x >>= f)
return v-wf >>=-cong-WF f-wf = f-wf v-wf
(x-wf β£ y-wf) >>=-cong-WF f-wf = (x-wf >>=-cong-WF f-wf)
β£ (y-wf >>=-cong-WF f-wf)
later x-wf >>=-cong-WF f-wf = later (β― (β x-wf >>=-cong-WF f-wf))
-- Well-typed programs do not "go wrong".
mutual
β¦β§-wf : β {n Ξ} (t : Tm n) {Ο} β Ξ β’ t β Ο β
β {Ο} β WF-Env Ξ Ο β WF-DV Ο (β¦ t β§ Ο)
β¦β§-wf (con i) con Ο-wf = return con
β¦β§-wf (var x) var Ο-wf = return (lookup-wf x Ο-wf)
β¦β§-wf (Ζ t) (Ζ tβ) Ο-wf = return (Ζ tβ Ο-wf)
β¦β§-wf (tβ β£ tβ) (tββ β£ tββ) Ο-wf = β¦β§-wf tβ tββ Ο-wf
β£ β¦β§-wf tβ tββ Ο-wf
β¦β§-wf (tβ Β· tβ) (tββ Β· tββ) {Ο} Ο-wf =
β¦β§-wf tβ tββ Ο-wf >>=-cong-WF Ξ» f-wf β
β¦β§-wf tβ tββ Ο-wf >>=-cong-WF Ξ» v-wf β
β-wf f-wf v-wf
β-wf : β {Ο Ο f v} β
WF-Value (Ο βΎ Ο) f β WF-Value (β Ο) v β
WF-DV (β Ο) (f β v)
β-wf (Ζ tββ Οβ-wf) vβ-wf = later (β― β¦β§-wf _ tββ (vβ-wf β· Οβ-wf))
type-soundness : β {t : Tm 0} {Ο} β
[] β’ t β Ο β Β¬ now nothing ββ β¦ t β§ []
type-soundness tβ = does-not-go-wrong (β¦β§-wf _ tβ [])
|
src/native/tinype-corkami/tiny.asm | AlexUg/gluegen | 1 | 173619 | <gh_stars>1-10
; a 268-byte PE (as small as possible), XP-W8x64 compatible
; similar with the w7 x64 PE, but larger sizeofimage and IAT required. XP compat also requires Debug Size and TLS VA to be null
; a few extra tricks required for Windows 8 compatibility
;<NAME>, BSD Licence, 2010-2013
%include 'consts.inc'
IMAGEBASE equ 400000h
org IMAGEBASE
DOS_HEADER:
.e_magic dw 'MZ'
align 4, db 0
istruc IMAGE_NT_HEADERS
at IMAGE_NT_HEADERS.Signature, db 'PE',0,0
iend
istruc IMAGE_FILE_HEADER
at IMAGE_FILE_HEADER.Machine, dw IMAGE_FILE_MACHINE_I386
at IMAGE_FILE_HEADER.TimeDateStamp
msvcrt db 'msvcrt.dll', 0 ; keeping the extension in case it'd work under W2K
at IMAGE_FILE_HEADER.Characteristics, dw IMAGE_FILE_EXECUTABLE_IMAGE ; | IMAGE_FILE_32BIT_MACHINE
iend
istruc IMAGE_OPTIONAL_HEADER32
at IMAGE_OPTIONAL_HEADER32.Magic, dw IMAGE_NT_OPTIONAL_HDR32_MAGIC
bits 32
realEntryPoint:
push message
call [__imp__printf]
jmp _2
at IMAGE_OPTIONAL_HEADER32.AddressOfEntryPoint, dd EntryPoint - IMAGEBASE
at IMAGE_OPTIONAL_HEADER32.BaseOfCode, dd 0 ; must be valid for W7
_2:
add esp, 1 * 4
retn
at IMAGE_OPTIONAL_HEADER32.ImageBase, dd IMAGEBASE
at IMAGE_OPTIONAL_HEADER32.SectionAlignment, dd 4 ; also sets e_lfanew
at IMAGE_OPTIONAL_HEADER32.FileAlignment, dd 4
ImportsAddressTable:
msvcrt_iat:
__imp__printf:
dd hnprintf - IMAGEBASE
dd 0
IMPORTSADDRESSTABLESIZE equ $ - ImportsAddressTable
at IMAGE_OPTIONAL_HEADER32.MajorSubsystemVersion, dw 4
at IMAGE_OPTIONAL_HEADER32.SizeOfImage, dd SIZEOFIMAGE
at IMAGE_OPTIONAL_HEADER32.SizeOfHeaders, dd SIZEOFIMAGE - 5 ; W8 enforce SizeOfHeaders <= EntryPoint
at IMAGE_OPTIONAL_HEADER32.Subsystem, db IMAGE_SUBSYSTEM_WINDOWS_CUI
db 0 ; one byte delta to avoid setting DllCharacteristics to AppContainer
hnprintf:
dw 0
db 'printf', 0
at IMAGE_OPTIONAL_HEADER32.NumberOfRvaAndSizes, dd 13
iend
istruc IMAGE_DATA_DIRECTORY_13
at IMAGE_DATA_DIRECTORY_13.ImportsVA, dd Import_Descriptor - IMAGEBASE
Import_Descriptor:
istruc IMAGE_IMPORT_DESCRIPTOR
at IMAGE_IMPORT_DESCRIPTOR.Name1 , dd msvcrt - IMAGEBASE
at IMAGE_IMPORT_DESCRIPTOR.FirstThunk, dd msvcrt_iat - IMAGEBASE
iend
istruc IMAGE_IMPORT_DESCRIPTOR
iend
at IMAGE_DATA_DIRECTORY_13.DebugSize, dd 0 ; required for safety under XP
at IMAGE_DATA_DIRECTORY_13.TLSVA, dd 0 ; required for safety under XP
at IMAGE_DATA_DIRECTORY_13.IATVA, dd ImportsAddressTable - IMAGEBASE ; required under XP
at IMAGE_DATA_DIRECTORY_13.IATSize, dd IMPORTSADDRESSTABLESIZE ; required under XP
iend
message db " * 268b universal tiny PE", 0ah, 0
times 268 - 260 db 0
EntryPoint:
jmp realEntryPoint
SIZEOFIMAGE equ 268
struc IMAGE_DATA_DIRECTORY_13
.ExportsVA resd 1
.ExportsSize resd 1
.ImportsVA resd 1
.ImportsSize resd 1
.ResourceVA resd 1
.ResourceSize resd 1
.Exception resd 2
.Security resd 2
.FixupsVA resd 1
.FixupsSize resd 1
.DebugVA resd 1
.DebugSize resd 1
.Description resd 2
.MIPS resd 2
.TLSVA resd 1
.TLSSize resd 1
.Load resd 2
.BoundImportsVA resd 1
.BoundImportsSize resd 1
.IATVA resd 1
.IATSize resd 1
endstruc |
oeis/264/A264622.asm | neoneye/loda-programs | 11 | 177474 | ; A264622: Number of (n+1) X (1+1) arrays of permutations of 0..n*2+1 with each element having directed index change -2,0 -1,0 0,-1 or 1,1.
; Submitted by <NAME>
; 0,1,2,1,1,4,6,5,7,15,21,23,34,58,80,101,149,230,319,431,629,928,1299,1810,2617,3784,5336,7536,10828,15521,21992,31236,44713,63862,90741,129177,184524,263178,374521,533619,761403,1085401,1545839,2203162,3141826,4478044,6380241,9093989,12964858,18478155,26332515,37533077,53501860,76253683,108676262,154900529,220790480,314685488,448506736,639267800,911166977,1298668192,1850966760,2638209313,3760269946,5359470121,7638811025,10887655332,15518219326,22118021213,31524747503,44932341015,64042115197
add $0,2
lpb $0
sub $0,3
add $3,2
mov $2,$3
bin $2,$0
add $1,$2
lpe
mov $0,$1
|
Subsets and Splits
No community queries yet
The top public SQL queries from the community will appear here once available.