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
oeis/133/A133680.asm
neoneye/loda-programs
11
164060
; A133680: a(n)=8*a(n-1)+72*a(n-2) for n>=3, a(0)=1, a(1)=8, a(2)=128 . ; Submitted by <NAME> ; 1,8,128,1600,22016,291328,3915776,52301824,700350464,9368535040,125373513728,1677522632704,22447074050048,300358221955072,4019055107244032,53778232838717440,719597830431309824,9628815407838134272,128841567053759381504,1724007245794420719616,23068650794226041225216,308677728051006621614080,4130364681592327941128192,55267713872411100285239296,739527968053936414043144192,9895499143245090532882382848,132410006845844146074165444608,1771755993080399686960855121920,23707568437543976013026752987136 mov $2,1 lpb $0 sub $0,1 add $3,$2 add $2,$3 mov $3,$4 mul $3,8 mov $4,$2 add $2,$3 mul $2,4 lpe mov $0,$2
HW4-Ramtin/3Code/MJavaParser.g4
ramtin-ehsani/IUSTCompiler
0
6917
parser grammar MJavaParser; options { tokenVocab=MJavaLex; } @parser::members { temp_counter = 0 goto_counter = 0 def create_goto(self): self.goto_counter += 1 return 'L' + str(self.goto_counter) def create_temp(self): self.temp_counter += 1 return 'T' + str(self.temp_counter) def remove_temp(self): self.temp_counter -= 1 def get_temp(self): return 'T' + str(self.temp_counter) } program : {print('3 Code Address:')} mainClass ( classDeclaration )* EOF ; mainClass : 'class' identifier '{' 'public' 'static' 'void' 'main' '(' 'String' '[' ']' identifier ')' '{' s=statement '}' '}' {print($s.value_attr)} ; classDeclaration : 'class' identifier ( 'extends' identifier )? '{' ( varDeclaration )* ( methodDeclaration )* '}' ; varDeclaration : t=type_ i=identifier ';' ; methodDeclaration : 'public' type_ identifier '(' ( type_ identifier ( ',' type_ identifier )* )? ')' '{' ( varDeclaration )* ( s=statement {print($s.value_attr)} )* 'return' expression ';' '}' ; type_ : 'int' '[' ']' | 'boolean' | 'int' | i=identifier ; statement returns [value_attr = str(), type_attr = str(),old_value_attr = str()] : '{'{$value_attr=''} ( s=statement {$value_attr=$value_attr+$s.value_attr+'\n'} )* '}' | 'if' '(' e=expression ')' s1=statement 'else' s2=statement {goto1 = self.create_goto()} {goto2 = self.create_goto()} {for item in $e.temp_list: $value_attr = $value_attr + item + '\n' } {$value_attr=$value_attr+'\t\t'+'if ('+$e.value_attr+') goto '+goto1+'\n'} {$value_attr = $value_attr + $s2.value_attr} {$value_attr= $value_attr+'\t\t'+'goto '+goto2+'\n'} {$value_attr = $value_attr+goto1+':'+$s1.value_attr} {$value_attr= $value_attr + goto2+':\t\t'} | 'while' '(' e=expression ')' s=statement {goto1 = self.create_goto()} {goto2 = self.create_goto()} {$value_attr= '\t\t'+'goto '+goto1+'\n'} {$value_attr = $value_attr+goto2+':'+$s.value_attr} {$value_attr= $value_attr + goto1+':'} {for item in $e.temp_list: $value_attr = $value_attr + item + '\n' } {$value_attr=$value_attr+'\t\t'+'if ('+$e.value_attr+') goto '+goto2+'\n'} | 'System.out.println' '(' expression ')' ';' | i=identifier '=' e=expression ';' {$value_attr = ''} {for item in $e.temp_list: $value_attr=$value_attr+item+'\n'} {$value_attr=$value_attr+'\t\t'+$i.value_attr +' = '+ $e.value_attr} | i=identifier '[' e1=expression ']' '=' e2=expression ';' {$value_attr = ''} {for item in $e1.temp_list: $value_attr=$value_attr+item+'\n'} {for item in $e2.temp_list: $value_attr=$value_attr+item+'\n'} {temp = self.create_temp()} {$value_attr=$value_attr+'\t\t'+temp+ '='+'sizeOf('+ $i.value_attr+')\n'+'\t\t'+temp+ '='+temp+'*'+$e1.value_attr+'\n'+'\t\t'+temp+ '= &'+$i.value_attr+'+'+temp+'\n'+'\t\t'+'*'+ temp +' = '+ $e2.value_attr} ; expression returns [value_attr = str(), type_attr = str(),old_value_attr = str(),temp_list = []] : '(' e=expression ')' {$type_attr = $e.type_attr} {$value_attr = $e.value_attr} {$old_value_attr = $e.old_value_attr} {$temp_list = $e.temp_list} | e1=expression '<' e2=expression {$temp_list = $e1.temp_list} {$type_attr = 'BOOL'} {if $e1.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e1.old_value_attr) $e1.value_attr = temp} {$temp_list =$temp_list + $e2.temp_list} {if $e2.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e2.old_value_attr) $e2.value_attr = temp} {$value_attr = $e1.value_attr + " < " + $e2.value_attr} {$old_value_attr = $e1.value_attr + " < " + $e2.value_attr} | e1=expression '&&' e2=expression {$type_attr = 'BOOL'} {$temp_list = $e1.temp_list} {if $e1.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e1.old_value_attr) $e1.value_attr = temp} {$temp_list =$temp_list + $e2.temp_list} {if $e2.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e2.old_value_attr) $e2.value_attr = temp} {$value_attr = $e1.value_attr + " && " + $e2.value_attr} {$old_value_attr = $e1.value_attr + " && " + $e2.value_attr} | e1=expression '*' e2=expression {$temp_list = $e1.temp_list} {$type_attr = 'INT'} {if $e1.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e1.old_value_attr) $e1.value_attr = temp} {$temp_list =$temp_list + $e2.temp_list} {if $e2.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e2.old_value_attr) $e2.value_attr = temp} {$value_attr = $e1.value_attr + " * " + $e2.value_attr} {$old_value_attr = $e1.value_attr + " * " + $e2.value_attr} | e1=expression '+' e2=expression {$temp_list = $e1.temp_list} {$type_attr = 'INT'} {if $e1.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e1.old_value_attr) $e1.value_attr = temp} {$temp_list =$temp_list + $e2.temp_list} {if $e2.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e2.old_value_attr) $e2.value_attr = temp} {$value_attr = $e1.value_attr + " + " + $e2.value_attr} {$old_value_attr = $e1.value_attr + " + " + $e2.value_attr} | e1=expression '-' e2=expression {$temp_list = $e1.temp_list} {$type_attr = 'INT'} {if $e1.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e1.old_value_attr) $e1.value_attr = temp} {$temp_list =$temp_list + $e2.temp_list} {if $e2.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e2.old_value_attr) $e2.value_attr = temp} {$value_attr = $e1.value_attr + " - " + $e2.value_attr} {$old_value_attr = $e1.value_attr + " - " + $e2.value_attr} | e1=expression '[' e2=expression ']' {$temp_list = $e1.temp_list} {$temp_list =$temp_list + $e2.temp_list} {$type_attr = 'INT'} {if $e1.old_value_attr is not None: print('\t\t','Error in '+$e1.value_attr)} {if $e2.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e2.old_value_attr) $e2.value_attr = temp} {temp = self.create_temp()} {$temp_list.append('\t\t'+temp+ '='+'sizeOf('+ $e1.value_attr+')')} {$temp_list.append('\t\t'+temp+ '='+temp+'*'+$e2.value_attr)} {$temp_list.append('\t\t'+temp+ '= &'+$e1.value_attr+'+'+temp)} {$value_attr = '*'+temp} {$old_value_attr = '*'+temp} | e=expression '.' 'length' {$temp_list = $e.temp_list} {$type_attr = 'INT'} {if $e.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e.old_value_attr) $e.value_attr = temp} {$value_attr = $e.value_attr + ".length "} {$old_value_attr = $e.value_attr + ".length "} | expression '.' identifier '(' ( expression ( ',' expression )* )? ')' | INTEGER_LITERAL { $type_attr = 'INT' $value_attr = $INTEGER_LITERAL.text $old_value_attr = None } | 'true' { $type_attr = 'BOOL' $value_attr = 'true' $old_value_attr = None } | 'false' { $type_attr = 'BOOL' $value_attr = 'false' $old_value_attr = None } | i=identifier { if $i.type_attr == 'UNKOWN': $type_attr = $i.type_attr $value_attr = $i.value_attr $old_value_attr = None } | 'this' | 'new' 'int' '[' expression ']' | 'new' identifier '(' ')' | '!' e=expression {$temp_list = $e.temp_list} {$type_attr = 'BOOL'} {if $e.old_value_attr is not None: temp = self.create_temp() $temp_list.append('\t\t'+temp+'='+$e.old_value_attr) $e1.value_attr = temp} {$value_attr = '!'+$e.value_attr} {$old_value_attr = '!'+$e.value_attr} ; identifier returns [value_attr = str(), type_attr = str()] : IDENTIFIER { $value_attr = $IDENTIFIER.text $type_attr = 'UNKOWN' } ;
unittests/ASM/X87_F64/D9_E8_F64.asm
Seas0/FEX
0
23129
%ifdef CONFIG { "RegData": { "RAX": ["0x3ff0000000000000"] }, "Env": { "FEX_X87REDUCEDPRECISION" : "1" } } %endif mov rcx, 0xe0000000 fld1 fst qword [rcx] mov rax, [rcx] hlt
248b/aMAZEing/maze.asm
42Bastian/lynx_hacking
12
29926
*************** * Maze249 * 1 byte free. **************** include <includes/hardware.inc> include <macros/suzy.mac> include <macros/help.mac> IFD LNX USE_BKPT equ 0 ELSE USE_BKPT equ 0 ENDIF MACRO HANDY_BRKPT nbkpt set nbkpt+1 IF USE_BKPT = 1 cpx $5aa5 dc.b $ec,0,0 ; CPX $0000 ENDIF ENDM screen0 equ $2000 ; ROM sets this address xstack equ $8000 ; must be "negative" ! ystack equ $5800 BEGIN_ZP x ds 1 y ds 1 sp ds 1 try ds 1 xadd ds 1 yadd ds 1 ptr ds 2 xstackbase ds 2 ystackbase ds 2 END_ZP nbkpt set 0 run $200 IFND LNX ;; Setup needed if loaded via BLL/Handy lda #8 sta $fff9 sei lda #0 sta $fd94 lda #$20 sta $fd95 stz $fd50 ldy #2 stz 0 lda #$e sta $fdae ldx #15 .init txa sta $fda0,x stz $fdb0,x dex bne .init ldy #8192/256 .clr stz $2000,x inx bne .clr inc .clr+2 dey bne .clr ldx #5 .clr1 stz 0,x dex bpl .clr1 inx ldy #2 lda #$fa sta 4+1 stz $fd20 lda #0 ENDIF ;;; ---------------------------------------- Start:: lda #$ff sta $fdaf sta $fdbf stz $fda0 stz $fdb0 stz xstackbase lda #>xstack sta xstackbase+1 stz ystackbase lda #>ystack sta ystackbase+1 HANDY_BRKPT again:: stz try .retry lda $fd02 eor $fd0a ldx #0 ldy #0 and #3 beq .xplus dec beq .xminus dec beq .yplus .yminus: dey dey lda #8-2 .yplus: iny inc ; A = 2-1 bra .cont1 .xminus: dex dex lda #4-1 .xplus: inx .cont1 inc ; A = 1 .cont tsb try bne .outofbounds txa stx xadd asl clc adc x cmp #160 bcs .outofbounds tax cmp #$fe beq .outofbounds tya sty yadd asl clc adc y bmi .outofbounds cmp #102 bcc .ok .outofbounds: lda try cmp #15 bne .retry .pop ldy sp bne .pop1 dec ystackbase+1 dec xstackbase+1 .done bpl .done .pop1 dey sty sp lda (xstackbase),y sta x lda (ystackbase),y sta y .toagain bra again //->.done //-> HANDY_BRKPT //-> bra .done .ok ;; check for wall jsr calcPtr beq .push bcs .loPixel asl bcs .outofbounds dc.b $a9 ; opcode "lda #n" , skip lsr .loPixel lsr bcs .outofbounds .push: ldy sp lda x sta (xstackbase),y lda y sta (ystackbase),y inc sp bne .draw inc xstackbase+1 inc ystackbase+1 .draw jsr drawLine bra .toagain ;;; -------------------- ;;; X - x ;;; A - y ;;; => ptr and A = byte calcPtr:: sta MATHE_E lda #80 sta MATHE_C stz MATHE_E+1 WAITSUZY clc lda MATHE_A sta ptr lda MATHE_A+1 adc #$20 sta ptr+1 txa lsr tay lda (ptr),y rts ;;; -------------------- ;;; X - x ;;; A - y drawLine:: jsr .draw .draw clc lda x adc xadd sta x tax clc lda y adc yadd sta y .drawPixel jsr calcPtr bcs .odd ora #$f0 dc.b $ae ; opcode "ldx nn" => skip next instruction .odd ora #$0f .exit sta (ptr),y rts ;;;------------------------------ End: IFND LNX ;; Lynx rom clears to zero after boot loader! dc.b 0 ENDIF size set End-Start IF USE_BKPT = 1 free set 249-size+(nbkpt*6) ELSE free set 249-size ENDIF IF free > 0 REPT free dc.b 0 ENDR ENDIF echo "Size:%dsize Free:%dfree"
3rdparty/openssl/intel-sgx-ssl/Windows/sgx/libsgx_tsgxssl/_alloca.asm
mrragava/ragava_openenclave_6
0
163009
; ; Copyright (C) 2011-2017 Intel Corporation. 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 Intel Corporation nor the names of its ; contributors may be used to endorse or promote products derived ; from this software without specific prior written permission. ; ; THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS ; "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT ; LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR ; A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT ; OWNER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, ; SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT ; LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, ; DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY ; THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT ; (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE ; OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. ; ; ; ; File: alloca.asm ; Description: ; The file provides __alloca_probe, __alloca_probe_16 functions ; Entry: eax = size of space need to alloca ; Exit: eax = ponit to the space on stack ; ifdef _WIN32 .686P .XMM .model flat EXTERN __chkstk : PROC _TEXT SEGMENT PUBLIC __alloca_probe_16 sgxssl___alloca_probe PROC __alloca16: ;16 bit align alloca __alloca_probe_16 = __alloca16 push eax ;store the eax into stack ;eax = eax - 4 lea eax, [esp + 8] ;the TOP before enter into this function ;[esp + 0 * SE_WORDSIZE] = eax, the memory size need to allocate ;[esp + 1 * SE_WORDSIZE] = the return address of this function sub eax, [esp] ;eax = top of stack after memory allocated and eax, 0FH ;16 bytes align add eax, [esp] ;increase allocation size, ;eax = the final size need to allocate ;check if CF is set jnc _out ;if CF=0 do nothing or eax, 0FFFFFFFFH ;set eax = 0xFFFFFFF if size wrapped around _out: add esp, 4 ;pop eax jmp __chkstk sgxssl___alloca_probe ENDP _TEXT ENDS endif END
grammar/Evans.g4
ivtikhon/wadjet
8
3771
/* * Evans grammar * Copyright (c) 2019 <NAME> */ grammar Evans; codeFile : classDeclaration+ mainDeclaration? ; classDeclaration : CLASS ID '{' classBody '}' ; classBody : attributeList? stateList? goalList? constructorList? functionList? predicateList? operatorList? ; attributeList : ATTR ':' varDeclarationStatement+ ; stateList : STATE ':' varDeclarationStatement+ ; constructorList : INIT ':' constructorDeclaration+ ; functionList : FUNC ':' functionDeclaration+ ; goalList : GOAL ':' goalDeclaration+ ; predicateList : PRED ':' predicateDeclaration+ ; operatorList : OPER ':' operatorDeclaration+ ; functionDeclaration : ID '(' genParameters? ')' (':' returnType )? genCodeBlock ; goalDeclaration : ID '(' genParameters? ')' genCodeBlock ; mainDeclaration : MAIN '(' genParameters? ')' genCodeBlock ; nameList : ID (',' ID)* ; nameWithAttrList : '[' validAttr ']' ID (',' '[' validAttr ']' ID)* ; constructorDeclaration : classType '(' genParameters? ')' genCodeBlock ; genVarDeclaration : primType=( STR | NUM ) nameWithAttrList | genType nameList ; variableInitializer : listInitializer | genExpression ; listInitializer : '(' (variableInitializer (',' variableInitializer)* )? ')' ; genParameters : genType ID (',' genType ID)* ; predicateDeclaration : ID '(' genParameters? ')' genCodeBlock ; operatorDeclaration : ID '(' genParameters? ')' '{' operatorBody '}' ; operatorBody : (WHEN ':' genExpression)? EFF ':' operatorCodeBlock (EXEC ':' operatorCodeBlock)? ; operatorCodeBlock : blockStatement+ ; genCodeBlock : '{' blockStatement* '}' ; blockStatement : varDeclarationStatement | genStatement | assignmentStatement ; varDeclarationStatement : genVarDeclaration ('=' variableInitializer)? ';' ; genStatement : IF '(' genExpression ')' genCodeBlock (ELIF '(' genExpression ')' genCodeBlock)* (ELSE genCodeBlock)? # IfStatement | WHILE '(' genExpression ')' genCodeBlock # WhileStatement | FOR '(' nameList IN genExpression ')' genCodeBlock # ForStatement | RET genExpression? ';' # RetStatement | (BREAK | CONT) ';' # BreakContStatement | genExpression ';' # ExpressionStatement ; assignmentStatement : ID ('.' ID)* ('=' | '+=' | '-=' | '*=' | '/=' | '%=') genExpression ';' ; genExpression : '(' genExpression ')' # ParensExpression | genLiteral # LiteralExpression | ID # VarExpression | genExpression '.' (ID | methodCall ) # AttrExpression | genExpression '[' genExpression ']' # IndexExpression | methodCall # CallExpression | '!' genExpression # NotExpression | prefix=('+'|'-') genExpression # PrefixExpression | genExpression op=('*'|'/'|'%') genExpression # MulDivExpression | genExpression op=('+'|'-') genExpression # AddSubExpression | genExpression op=('<'|'>'|'<='|'>=') genExpression # CompareExpression | genExpression op=('!='|'==') genExpression # EqualExpression | genExpression '&&' genExpression # AndExpression | genExpression '||' genExpression # OrExpression | genExpression '?' genExpression ':' genExpression # TernaryExpression ; methodCall : (ID | genType) '(' expressionList? ')' ; validAttr : attr=( SET | RANGE ) '(' expressionList? ')' ; expressionList : genExpression (',' genExpression)* ; returnType : genType ; genType : embeddedType | classType ; genLiteral : DECIMAL_LITERAL | FLOAT_LITERAL | STRING_LITERAL | BOOL_LITERAL ; classType : ID ; // Embedded types embeddedType : LIST | BOOL | STR | FLOAT | INT | NUM | VAR ; // Literals STRING_LITERAL : '"' ( STRING_ESCAPE | ~('\\'|'"') )* '"' | '\'' ( STRING_ESCAPE | ~('\''|'\\') )* '\'' ; fragment STRING_ESCAPE : '\\' [btnfr"'\\] ; DECIMAL_LITERAL : DIGIT+ ; FLOAT_LITERAL : DIGIT+ '.' DIGIT+ EXPONENT? | '.' DIGIT+ EXPONENT? | DIGIT+ EXPONENT ; BOOL_LITERAL : 'true' | 'false' ; fragment EXPONENT : [eE] [+-]? DIGIT+ ; // Key words CLASS : 'class' ; ATTR : 'attr' ; STATE : 'state' ; FUNC : 'func' ; PRED : 'pred' ; OPER : 'oper' ; IF : 'if' ; ELIF : 'elif' ; ELSE : 'else' ; FOR : 'for' ; WHILE : 'while' ; RET : 'ret' ; BREAK : 'break' ; CONT : 'cont' ; WHEN : 'when' ; EFF : 'eff' ; EXEC : 'exec' ; INIT : 'init' ; GOAL : 'goal' ; MAIN : 'main' ; IN : 'in' ; DOM : 'dom' ; SET : 'set' ; RANGE : 'range' ; // Embedded types LIST : 'list' ; BOOL : 'bool' ; STR : 'str' ; FLOAT : 'float' ; INT : 'int' ; NUM: 'num' ; VAR: 'var' ; // Operations and comparisons MUL: '*' ; DIV: '/' ; MOD: '%' ; ADD: '+' ; SUB: '-' ; LT: '<' ; GT: '>' ; LE: '<=' ; GE: '>=' ; NE: '!=' ; EQ: '=='; // Identifier ID : LETTER (LETTER | '_' | DIGIT)* ; fragment LETTER : [a-zA-Z] ; fragment DIGIT : [0-9] ; // Whitespaces & comments COMMENT : '#' ~[\r\n\f]* -> skip ; WS: [ \t\r\n]+ -> skip ;
llvm-gcc-4.2-2.9/gcc/ada/sem_ch9.ads
vidkidz/crossbridge
1
17172
<reponame>vidkidz/crossbridge<filename>llvm-gcc-4.2-2.9/gcc/ada/sem_ch9.ads<gh_stars>1-10 ------------------------------------------------------------------------------ -- -- -- GNAT COMPILER COMPONENTS -- -- -- -- S E M _ C H 9 -- -- -- -- S p e c -- -- -- -- Copyright (C) 1992-2001 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 2, 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 COPYING. If not, write -- -- to the Free Software Foundation, 51 Franklin Street, Fifth Floor, -- -- Boston, MA 02110-1301, USA. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ with Types; use Types; package Sem_Ch9 is procedure Analyze_Abort_Statement (N : Node_Id); procedure Analyze_Accept_Alternative (N : Node_Id); procedure Analyze_Accept_Statement (N : Node_Id); procedure Analyze_Asynchronous_Select (N : Node_Id); procedure Analyze_Conditional_Entry_Call (N : Node_Id); procedure Analyze_Delay_Alternative (N : Node_Id); procedure Analyze_Delay_Relative (N : Node_Id); procedure Analyze_Delay_Until (N : Node_Id); procedure Analyze_Entry_Body (N : Node_Id); procedure Analyze_Entry_Body_Formal_Part (N : Node_Id); procedure Analyze_Entry_Call_Alternative (N : Node_Id); procedure Analyze_Entry_Declaration (N : Node_Id); procedure Analyze_Entry_Index_Specification (N : Node_Id); procedure Analyze_Protected_Body (N : Node_Id); procedure Analyze_Protected_Definition (N : Node_Id); procedure Analyze_Protected_Type (N : Node_Id); procedure Analyze_Requeue (N : Node_Id); procedure Analyze_Selective_Accept (N : Node_Id); procedure Analyze_Single_Protected (N : Node_Id); procedure Analyze_Single_Task (N : Node_Id); procedure Analyze_Task_Body (N : Node_Id); procedure Analyze_Task_Definition (N : Node_Id); procedure Analyze_Task_Type (N : Node_Id); procedure Analyze_Terminate_Alternative (N : Node_Id); procedure Analyze_Timed_Entry_Call (N : Node_Id); procedure Analyze_Triggering_Alternative (N : Node_Id); end Sem_Ch9;
oeis/113/A113841.asm
neoneye/loda-programs
11
94056
<reponame>neoneye/loda-programs ; A113841: a(n) = a(n-1) + 2^A047240(n) for n>1, a(1)=1. ; 1,3,7,71,199,455,4551,12743,29127,291271,815559,1864135,18641351,52195783,119304647,1193046471,3340530119,7635497415,76354974151,213793927623,488671834567,4886718345671,13682811367879,31274997412295,312749974122951,875699927544263,2001599834386887,20015998343868871,56044795362832839,128102389400760775,1281023894007607751,3586866903221301703,8198552921648689607,81985529216486896071,229559481806163308999,524707386985516134855,5247073869855161348551,14691806835594451775943,33581272767073032630727 add $0,1 seq $0,113867 ; a(n) = a(n-1) + 2^(A047258(n)) for n>1, a(1)=1. div $0,16
programs/oeis/132/A132171.asm
jmorken/loda
1
90460
; A132171: 3^n repeated 3^n times. ; 1,3,3,3,9,9,9,9,9,9,9,9,9,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,27,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,81,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243,243 mul $0,2 mov $1,1 mov $2,$0 lpb $2 mul $1,3 sub $2,$1 lpe
Library/Text/TextStorage/tsEnum.asm
steakknife/pcgeos
504
17013
COMMENT @%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Copyright (c) GeoWorks 1991 -- All Rights Reserved PROJECT: PC GEOS MODULE: FILE: tsEnum.asm AUTHOR: <NAME>, 5/8/92 ROUTINES: Name Description ---- ----------- EnumTextReference Enumerate a text reference REVISION HISTORY: Name Date Description ---- ---- ----------- John 11/20/91 Initial revision DESCRIPTION: Code for accessing and manipulating text references. $Id: tsEnum.asm,v 1.1 97/04/07 11:22:17 newdeal Exp $ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%@ TextFilter segment resource COMMENT @---------------------------------------------------------------------- FUNCTION: EnumDSSI_CX DESCRIPTION: Enumerate characters at ds:si CALLED BY: INTERNAL PASS: ds:si - characters to enumerate cx - count di - callback dxbp - object RETURN: carry - set to end DESTROYED: si - updated REGISTER/STACK USAGE: PSEUDO CODE/STRATEGY: KNOWN BUGS/SIDE EFFECTS/CAVEATS/IDEAS: REVISION HISTORY: Name Date Description ---- ---- ----------- Tony 5/ 8/92 Initial version Chris 10/12/92 Changed to save any changes in cl. Don't hurt me! ------------------------------------------------------------------------------@ EnumDSSI_CX proc near uses ax, cx, bp, ds, es .enter segmov es, ds xchg si, bp ;es:bp = data mov ds, dx ;ds:si = object mov_tr ax, cx ;ax = count enumLoop: SBCS < clr cx > SBCS < mov cl, es:[bp] > DBCS < mov cx, es:[bp] > inc bp DBCS < inc bp > jcxz doneGood ;a hack for the null-terminator call di SBCS < mov es:[bp-1], cl ;save new version in cl, in > DBCS < mov es:[bp-2], cx ;save new version in cl, in > ; case changed (cbh 10/12/92) jc done dec ax jnz enumLoop doneGood: clc done: mov si, bp .leave ret EnumDSSI_CX endp COMMENT @%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% EnumTextFromPointer %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% SYNOPSIS: Copy text from a pointer into a buffer. CALLED BY: EnumTextReference PASS: es:di = Destination for text cx = # of bytes to copy ss:bp = TextReferencePointer cs:di = callback RETURN: carry = set if callback aborted DESTROYED: nothing PSEUDO CODE/STRATEGY: KNOWN BUGS/SIDE EFFECTS/IDEAS: REVISION HISTORY: Name Date Description ---- ---- ----------- jcw 11/20/91 Initial version %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%@ EnumTextFromPointer proc near pushdw dssi movdw dssi, ss:[bp].VTRP_textReference.TR_ref.TRU_pointer.TRP_pointer mov cx, ss:[bp].VTRP_insCount.low popdw dxbp call EnumDSSI_CX movdw dssi, dxbp ret EnumTextFromPointer endp COMMENT @%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% EnumTextFromHugeArray %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% SYNOPSIS: Copy text from a huge-array into a buffer. CALLED BY: EnumTextReference ss:bp = TextReferenceHugeArray dxax = Number of bytes to enum cs:di = callback for filter RETURN: carry = set if callback aborted DESTROYED: ax, bx, cx, dx, bp, es PSEUDO CODE/STRATEGY: Lock first element of huge-array copyLoop: Copy as many bytes as we can (up to cx) If we aren't done yet Release the huge-array and lock the next block of data jmp copy loop KNOWN BUGS/SIDE EFFECTS/IDEAS: REVISION HISTORY: Name Date Description ---- ---- ----------- jcw 11/20/91 Initial version %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%@ EnumTextFromHugeArray proc near pushdw dssi push di ; Save callback mov bx, ss:[bp].VTRP_textReference.TR_ref.TRU_hugeArray.TRHA_file mov di, ss:[bp].VTRP_textReference.TR_ref.TRU_hugeArray.TRHA_array clrdw dxax call HugeArrayLock ; ds:si <- data to copy pop di ; Restore callback popdw dxbp ; dxbp = object enumLoop: mov_tr cx, ax ; cx <- # of valid bytes ; ; Override file = huge array file ; ds:si = data ; di = callback ; cx = Number of bytes available ; call EnumDSSI_CX jc done LocalPrevChar dssi push dx call HugeArrayNext pop dx tst_clc ax jnz enumLoop done: pushf call HugeArrayUnlock popf movdw dssi, dxbp ; restore object ret EnumTextFromHugeArray endp COMMENT @%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% TS_EnumTextReference %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% SYNOPSIS: Copy bytes referenced by a text-reference into a buffer. CALLED BY: EXTERNAL PASS: di = callback ss:bp = VisTextReplaaceParams RETURN: carry - from enum routine DESTROYED: bx, bp PSEUDO CODE/STRATEGY: KNOWN BUGS/SIDE EFFECTS/IDEAS: REVISION HISTORY: Name Date Description ---- ---- ----------- jcw 11/20/91 Initial version %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%@ TS_EnumTextReference proc near uses ax, bx, cx, dx, di, bp, es .enter tstdw ss:[bp].VTRP_insCount clc jz common mov ax, ss:[bp].VTRP_textReference.TR_type cmp ax, TRT_POINTER jnz notPointer call EnumTextFromPointer jmp common notPointer: EC < cmp ax, TRT_HUGE_ARRAY > EC < ERROR_NZ VIS_TEXT_BAD_TEXT_REFERENCE_TYPE > call EnumTextFromHugeArray common: .leave ret TS_EnumTextReference endp TextFilter ends
src/main/antlr4/poussecafe/source/emil/parser/Emil.g4
pousse-cafe/pousse-cafe-source
0
2738
grammar Emil; process : header consumptions ; header : 'process' (NAME | '*') ; NAME : [a-zA-Z] [a-zA-Z0-9]* ; consumptions : consumption* ; consumption : commandConsumption | eventConsumption ; commandConsumption : command '->' messageConsumptions ; command : NAME '?' ; messageConsumptions : singleMessageConsumption | multipleMessageConsumptions ; singleMessageConsumption : factoryConsumption | aggregateRootConsumption | repositoryConsumption | processConsumption | emptyConsumption ; factoryConsumption : factoryListener ( aggregateRoot '[' 'onAdd' ']' ':' eventProductions )? ; factoryListener : 'F' '{' ( simpleFactoryName=NAME | qualifiedFactoryName=qualifiedName ) '}' '[' listenerName=NAME ']' ( optional='#' | serveral='+' )? ; qualifiedName : qualifier=NAME '.' name=NAME ; aggregateRoot : '@' ( simpleRootName=NAME | qualifiedRootName=qualifiedName ) ; eventProductions : eventProduction+ ':.' ; eventProduction : ':' event optional='#'? '->' messageConsumptions ; event : NAME '!' ; aggregateRootConsumption : 'Ru' '{' runnerName=NAME '}' aggregateRoot '[' listenerName=NAME ']' ( ':' eventProductions )? ; repositoryConsumption : 'Re' '{' ( simpleRepositoryName=NAME | qualifiedRepositoryName=qualifiedName ) '}' '[' listenerName=NAME ']' ( optional='#' | serveral='+' )? ( aggregateRoot '[' 'onDelete' ']' ':' eventProductions )? ; processConsumption : 'P' '{' processName=NAME '}'; emptyConsumption : '.' external? ; external : '[' NAME ']' ; multipleMessageConsumptions : multipleMessageConsumptionsItem+ ; multipleMessageConsumptionsItem : '->' singleMessageConsumption ; eventConsumption : external? event '->' messageConsumptions ; WS : [ \t\r\n]+ -> skip ; // skip spaces, tabs, newlines
Cubical/Structures/Monoid.agda
cmester0/cubical
1
6427
<filename>Cubical/Structures/Monoid.agda {-# OPTIONS --cubical --safe #-} module Cubical.Structures.Monoid where open import Cubical.Foundations.Prelude open import Cubical.Foundations.Equiv open import Cubical.Foundations.HLevels open import Cubical.Data.Sigma open import Cubical.Foundations.SIP renaming (SNS-PathP to SNS) open import Cubical.Structures.Pointed open import Cubical.Structures.NAryOp private variable ℓ : Level -- Monoids raw-monoid-structure : Type ℓ → Type ℓ raw-monoid-structure X = X × (X → X → X) -- If we ignore the axioms we get a "raw" monoid raw-monoid-is-SNS : SNS {ℓ} raw-monoid-structure _ raw-monoid-is-SNS = join-SNS pointed-iso pointed-is-SNS (nAryFunIso 2) (nAryFunSNS 2) -- Monoid axioms monoid-axioms : (X : Type ℓ) → raw-monoid-structure X → Type ℓ monoid-axioms X (e , _·_ ) = isSet X × ((x y z : X) → x · (y · z) ≡ (x · y) · z) × ((x : X) → x · e ≡ x) × ((x : X) → e · x ≡ x) monoid-structure : Type ℓ → Type ℓ monoid-structure = add-to-structure raw-monoid-structure monoid-axioms Monoid : Type (ℓ-suc ℓ) Monoid {ℓ} = TypeWithStr ℓ monoid-structure -- Monoid extractors ⟨_⟩ : Monoid {ℓ} → Type ℓ ⟨ G , _ ⟩ = G monoid-id : (M : Monoid {ℓ}) → ⟨ M ⟩ monoid-id (_ , (e , _) , _) = e monoid-operation : (M : Monoid {ℓ}) → ⟨ M ⟩ → ⟨ M ⟩ → ⟨ M ⟩ monoid-operation (_ , (_ , f) , _) = f -- Monoid syntax with explicit monoid module monoid-syntax where id : (M : Monoid {ℓ}) → ⟨ M ⟩ id = monoid-id monoid-operation-syntax : (M : Monoid {ℓ}) → ⟨ M ⟩ → ⟨ M ⟩ → ⟨ M ⟩ monoid-operation-syntax = monoid-operation infixr 18 monoid-operation-syntax syntax monoid-operation-syntax M x y = x ·⟨ M ⟩ y open monoid-syntax -- More Monoid extractors monoid-is-set : (M : Monoid {ℓ}) → isSet (⟨ M ⟩) monoid-is-set (_ , _ , P , _) = P monoid-assoc : (M : Monoid {ℓ}) → (x y z : ⟨ M ⟩) → x ·⟨ M ⟩ (y ·⟨ M ⟩ z) ≡ (x ·⟨ M ⟩ y) ·⟨ M ⟩ z monoid-assoc (_ , _ , _ , P , _) = P monoid-rid : (M : Monoid {ℓ}) → (x : ⟨ M ⟩) → x ·⟨ M ⟩ (id M) ≡ x monoid-rid (_ , _ , _ , _ , P , _) = P monoid-lid : (M : Monoid {ℓ}) → (x : ⟨ M ⟩) → (id M) ·⟨ M ⟩ x ≡ x monoid-lid (_ , _ , _ , _ , _ , P) = P -- Monoid equivalence monoid-iso : StrIso monoid-structure ℓ monoid-iso = add-to-iso (join-iso pointed-iso (nAryFunIso 2)) monoid-axioms -- We have to show that the monoid axioms are indeed propositions monoid-axioms-are-Props : (X : Type ℓ) (s : raw-monoid-structure X) → isProp (monoid-axioms X s) monoid-axioms-are-Props X (e , _·_) s = β s where α = s .fst β = isProp× isPropIsSet (isProp× (isPropΠ3 (λ x y z → α (x · (y · z)) ((x · y) · z))) (isProp× (isPropΠ (λ x → α (x · e) x)) (isPropΠ (λ x → α (e · x) x)))) monoid-is-SNS : SNS {ℓ} monoid-structure monoid-iso monoid-is-SNS = add-axioms-SNS _ monoid-axioms-are-Props raw-monoid-is-SNS MonoidPath : (M N : Monoid {ℓ}) → (M ≃[ monoid-iso ] N) ≃ (M ≡ N) MonoidPath = SIP monoid-is-SNS -- Added for its use in groups -- If there exists a inverse of an element it is unique inv-lemma : (M : Monoid {ℓ}) → (x y z : ⟨ M ⟩) → y ·⟨ M ⟩ x ≡ id M → x ·⟨ M ⟩ z ≡ id M → y ≡ z inv-lemma M x y z left-inverse right-inverse = y ≡⟨ sym (monoid-rid M y) ⟩ y ·⟨ M ⟩ id M ≡⟨ cong (λ - → y ·⟨ M ⟩ -) (sym right-inverse) ⟩ y ·⟨ M ⟩ (x ·⟨ M ⟩ z) ≡⟨ monoid-assoc M y x z ⟩ (y ·⟨ M ⟩ x) ·⟨ M ⟩ z ≡⟨ cong (λ - → - ·⟨ M ⟩ z) left-inverse ⟩ id M ·⟨ M ⟩ z ≡⟨ monoid-lid M z ⟩ z ∎ -- Monoid ·syntax module monoid-·syntax (M : Monoid {ℓ}) where infixr 18 _·_ _·_ : ⟨ M ⟩ → ⟨ M ⟩ → ⟨ M ⟩ _·_ = monoid-operation M ₁ : ⟨ M ⟩ ₁ = monoid-id M
Function/Injective/Base.agda
oisdk/agda-playground
6
1642
<reponame>oisdk/agda-playground {-# OPTIONS --cubical --safe --postfix-projections #-} module Function.Injective.Base where open import Level open import Path open import Data.Sigma Injective : (A → B) → Type _ Injective f = ∀ x y → (f⟨x⟩≡f⟨y⟩ : f x ≡ f y) → x ≡ y infixr 0 _↣_ _↣_ : Type a → Type b → Type (a ℓ⊔ b) A ↣ B = Σ[ f ⦂ (A → B) ] × Injective f refl-↣ : A ↣ A refl-↣ .fst x = x refl-↣ .snd x y x≡y = x≡y
src/shaders/post_processing/gen5_6/Common/PL8x4_Save_IMC3.asm
tizenorg/platform.upstream.libva-intel-driver
0
81576
/* * All Video Processing kernels * Copyright © <2010>, Intel Corporation. * * This program is licensed under the terms and conditions of the * Eclipse Public License (EPL), version 1.0. The full text of the EPL is at * http://www.opensource.org/licenses/eclipse-1.0.php. * */ // Module name: PL8x4_Save_IMC3.asm // // Save planar YUV420 frame data block of size 16x8 #include "PL8x4_Save_IMC3.inc" //Use the mask to determine which pixels shouldn't be over-written and (1) acc0.0<1>:ud udBLOCK_MASK<0;1,0>:ud 0x00FFFFFF:ud cmp.ge.f0.0(1) dNULLREG acc0.0<0;1,0>:ud 0x00FFFFFF:ud //Check if all pixels in the block need to be modified (f0.0) jmpi WritePlanarToDataPort //If mask is not all 1's, then load the entire 16x8 block //so that only those bytes may be modified that need to be (using the mask) // Load 16x8 planar Y ---------------------------------------------------------- mov (2) rMSGSRC.0<1>:d wORIX<2;2,1>:w // Block origin mov (1) rMSGSRC.2<1>:ud nDPW_BLOCK_SIZE_Y:ud // Block width and height (16x8) mov (8) mMSGHDR<1>:ud rMSGSRC<8;8,1>:ud send (8) udSRC_Y(0)<1> mMSGHDR udDUMMY_NULL nDATAPORT_READ nDPMR_MSGDSC+nDPR_MSG_SIZE_Y+nBI_DESTINATION_Y:ud // Load 8x4 planar U and V ----------------------------------------------------- asr (2) rMSGSRC.0<1>:d wORIX<2;2,1>:w 1:w // U/V block origin should be half of Y's mov (1) rMSGSRC.2<1>:ud nDPW_BLOCK_SIZE_UV:ud // Block width and height (8x4) mov (8) mMSGHDR<1>:ud rMSGSRC<8;8,1>:ud send (8) udSRC_U(0)<1> mMSGHDR udDUMMY_NULL nDATAPORT_READ nDPMR_MSGDSC+nDPR_MSG_SIZE_UV+nBI_DESTINATION_U:ud mov (8) mMSGHDR<1>:ud rMSGSRC<8;8,1>:ud send (8) udSRC_V(0)<1> mMSGHDR udDUMMY_NULL nDATAPORT_READ nDPMR_MSGDSC+nDPR_MSG_SIZE_UV+nBI_DESTINATION_V:ud //expand U and V to be aligned on word boundary - Y remains in bytes $for (nUV_NUM_OF_ROWS/2-1; >-1; -1) { mov (16) uwSRC_U(0, %1*16)<1> ubSRC_U(0, %1*16) mov (16) uwSRC_V(0, %1*16)<1> ubSRC_V(0, %1*16) } //Merge the data mov (1) f0.0:uw ubBLOCK_MASK_V:ub //Load the mask on flag reg (f0.0) mov (8) rMASK_TEMP<1>:uw uwBLOCK_MASK_H:uw (-f0.0) mov (8) rMASK_TEMP<1>:uw 0:uw // Destination is Word aligned $for(0; <nY_NUM_OF_ROWS; 2) { mov (1) f0.1:uw uwMASK_TEMP(0,%1)<0;1,0> (-f0.1) mov (16) ub2DEST_Y(0, %1*32)<2> ubSRC_Y(0, %1*16) (-f0.1) mov (16) ub2DEST_U(0, %1*8)<1> ubSRC_U(0, %1*8) //only works for Word aligned Byte data (-f0.1) mov (16) ub2DEST_V(0, %1*8)<1> ubSRC_V(0, %1*8) //only works for Word aligned Byte data mov (1) f0.1:uw uwMASK_TEMP(0,1+%1)<0;1,0> (-f0.1) mov (16) ub2DEST_Y(0, (1+%1)*32)<2> ubSRC_Y(0, (1+%1)*16) } WritePlanarToDataPort: #if !defined(SAVE_UV_ONLY) // Save current planar frame Y block data (16x8) ------------------------------- mov (2) rMSGSRC.0<1>:d wORIX<2;2,1>:w // Block origin mov (1) rMSGSRC.2<1>:ud nDPW_BLOCK_SIZE_Y:ud // Block width and height (16x8) mov (8) mMSGHDR<1>:ud rMSGSRC<8;8,1>:ud $for(0,0; <nY_NUM_OF_ROWS; 2,1) { mov(16) mubMSGPAYLOAD(%2,0)<1> ub2DEST_Y(%1)REGION(16,2) mov(16) mubMSGPAYLOAD(%2,16)<1> ub2DEST_Y(%1+1)REGION(16,2) } send (8) dNULLREG mMSGHDR udDUMMY_NULL nDATAPORT_WRITE nDPMW_MSGDSC+nDPW_MSG_SIZE_Y+nBI_DESTINATION_Y:ud #endif // Save U/V data block in planar format (8x4) ---------------------------------- asr (2) rMSGSRC.0<1>:d wORIX<2;2,1>:w 1:w // U/V block origin should be half of Y's mov (1) rMSGSRC.2<1>:ud nDPW_BLOCK_SIZE_UV:ud // Block width and height (8x4) mov (8) mMSGHDR<1>:ud rMSGSRC<8;8,1>:ud // Save U picture data --------------------------------------------------------- mov (16) mubMSGPAYLOAD(0,0)<1> ub2DEST_U(0)REGION(16,2) // U rows 0,1 mov (16) mubMSGPAYLOAD(0,16)<1> ub2DEST_U(1)REGION(16,2) // U rows 2,3 send (8) dNULLREG mMSGHDR udDUMMY_NULL nDATAPORT_WRITE nDPMW_MSGDSC+nDPW_MSG_SIZE_UV+nBI_DESTINATION_U:ud mov (8) mMSGHDR<1>:ud rMSGSRC<8;8,1>:ud // Save V picture data --------------------------------------------------------- mov (16) mubMSGPAYLOAD(0,0)<1> ub2DEST_V(0)REGION(16,2) // V rows 0,1 mov (16) mubMSGPAYLOAD(0,16)<1> ub2DEST_V(1)REGION(16,2) // V rows 2,3 send (8) dNULLREG mMSGHDR udDUMMY_NULL nDATAPORT_WRITE nDPMW_MSGDSC+nDPW_MSG_SIZE_UV+nBI_DESTINATION_V:ud // End of PL8x4_Save_IMC3
avrsh/bin/Release/test6.asm
andresarmento/avrsim
1
175703
<gh_stars>1-10 .org 0x2000 LDI R20, 0 test: INC R20 RJMP test NOP
dump-windows.applescript
nishiuramakoto/macos-remap.py
0
2168
on original() tell application "System Events" repeat with theProcess in processes if not background only of theProcess then tell theProcess set processName to name set theWindows to windows end tell set windowsCount to count of theWindows if processName is "Google Chrome" then say "Chrome woo hoo" say windowsCount as text else if processName is not "Finder" then say processName say windowsCount as text if windowsCount is greater than 0 then repeat with theWindow in theWindows say "found a window of " & processName tell theProcess set frontmost to true tell theWindow click button 2 end tell end tell end repeat end if end if end if end repeat end tell end original global isDebug set isDebug to true on traceTest(string) display dialog string say string end traceTest on sendKeyToNonActiveWindows(keyCode) local frontMostProcess tell application "System Events" repeat with theProcess in processes if not background only of theProcess then tell theProcess set processName to name set theWindows to windows set isFrontMost to frontmost end tell set windowsCount to count of theWindows if isFrontMost then set frontMostProcess to theProcess say "found frontmost process " & processName else if windowsCount is greater than 0 then say processName say windowsCount as text say isFrontMost as text repeat with theWindow in theWindows say "found a window of " & processName tell theProcess set frontmost to true tell theWindow key code keyCode end tell end tell end repeat end if end if end repeat end tell tell application "System Events" to tell frontMostProcess to set frontmost to true end sendKeyToNonActiveWindows tell script "sendKey" sendKeyToNonActiveWindows(116) end tell -- sendKeyToNonActiveWindows(116)
Arhitectura Sistemelor Calcul (ASC)/MIPS - Probleme/Tutoriat 1/Suma_Gauss_modificata.asm
DLarisa/FMI-Materials-BachelorDegree
4
81284
#Suma 1+2+3+...+n=? #Presupunem acum ca citim n de la tastatura .data #zona pentru declararea datelor s: .word 0 #int s=0 --- unde vom pune suma .text #codul programului main: li $v0, 5 #cin>>int --- int se gaseste in v0 syscall move $t2, $v0 #t2=n=v0=val citita de la consola #Initializam registrii cu datele problemei li $t0, 0 #t0=s=0 li $t1, 1 #t1=i=1 for: bgt $t1, $t2, final add $t0, $t0, $t1 #t0+=t1 i.e. s+=i addi $t1, $t1, 1 #t1++ i.e. i++ j for #jump la eticheta "for" final: #punem suma pe care am gasit-o in "s" (care inca este 0) sw $t0, s #s=t0 #afisam suma pe ecran li $v0, 1 lw $a0, s #a0=s syscall #return 0 li $v0, 10 syscall
test/asset/agda-stdlib-1.0/Relation/Binary/Construct/Add/Extrema/Equality.agda
omega12345/agda-mode
5
10086
<reponame>omega12345/agda-mode<filename>test/asset/agda-stdlib-1.0/Relation/Binary/Construct/Add/Extrema/Equality.agda ------------------------------------------------------------------------ -- The Agda standard library -- -- A pointwise lifting of a relation to incorporate new extrema. ------------------------------------------------------------------------- {-# OPTIONS --without-K --safe #-} -- This module is designed to be used with -- Relation.Nullary.Construct.Add.Extrema open import Relation.Binary module Relation.Binary.Construct.Add.Extrema.Equality {a ℓ} {A : Set a} (_≈_ : Rel A ℓ) where open import Function using (_∘′_) import Relation.Binary.Construct.Add.Infimum.Equality as AddInfimum import Relation.Binary.Construct.Add.Supremum.Equality as AddSupremum open import Relation.Nullary.Construct.Add.Extrema ------------------------------------------------------------------------- -- Definition private module Inf = AddInfimum _≈_ module Sup = AddSupremum (Inf._≈₋_) open Sup using () renaming (_≈⁺_ to _≈±_) public ------------------------------------------------------------------------- -- Useful pattern synonyms pattern ⊥±≈⊥± = Sup.[ Inf.⊥₋≈⊥₋ ] pattern [_] p = Sup.[ Inf.[ p ] ] pattern ⊤±≈⊤± = Sup.⊤⁺≈⊤⁺ ------------------------------------------------------------------------- -- Relational properties [≈]-injective : ∀ {k l} → [ k ] ≈± [ l ] → k ≈ l [≈]-injective = Inf.[≈]-injective ∘′ Sup.[≈]-injective ≈±-refl : Reflexive _≈_ → Reflexive _≈±_ ≈±-refl = Sup.≈⁺-refl ∘′ Inf.≈₋-refl ≈±-sym : Symmetric _≈_ → Symmetric _≈±_ ≈±-sym = Sup.≈⁺-sym ∘′ Inf.≈₋-sym ≈±-trans : Transitive _≈_ → Transitive _≈±_ ≈±-trans = Sup.≈⁺-trans ∘′ Inf.≈₋-trans ≈±-dec : Decidable _≈_ → Decidable _≈±_ ≈±-dec = Sup.≈⁺-dec ∘′ Inf.≈₋-dec ≈±-irrelevant : Irrelevant _≈_ → Irrelevant _≈±_ ≈±-irrelevant = Sup.≈⁺-irrelevant ∘′ Inf.≈₋-irrelevant ≈±-substitutive : ∀ {ℓ} → Substitutive _≈_ ℓ → Substitutive _≈±_ ℓ ≈±-substitutive = Sup.≈⁺-substitutive ∘′ Inf.≈₋-substitutive ------------------------------------------------------------------------- -- Structures ≈±-isEquivalence : IsEquivalence _≈_ → IsEquivalence _≈±_ ≈±-isEquivalence = Sup.≈⁺-isEquivalence ∘′ Inf.≈₋-isEquivalence ≈±-isDecEquivalence : IsDecEquivalence _≈_ → IsDecEquivalence _≈±_ ≈±-isDecEquivalence = Sup.≈⁺-isDecEquivalence ∘′ Inf.≈₋-isDecEquivalence
Transynther/x86/_processed/NONE/_xt_/i9-9900K_12_0xa0.log_21829_1015.asm
ljhsiun2/medusa
9
5922
<reponame>ljhsiun2/medusa<filename>Transynther/x86/_processed/NONE/_xt_/i9-9900K_12_0xa0.log_21829_1015.asm .global s_prepare_buffers s_prepare_buffers: push %r10 push %r13 push %r14 push %rbp push %rcx push %rdi push %rdx push %rsi lea addresses_WT_ht+0x14786, %rsi lea addresses_WT_ht+0x148d4, %rdi nop nop nop dec %r13 mov $11, %rcx rep movsq add $64364, %r10 lea addresses_WT_ht+0x3d86, %r10 dec %r13 mov $0x6162636465666768, %rcx movq %rcx, %xmm7 movups %xmm7, (%r10) nop nop nop nop nop sub %rdi, %rdi lea addresses_normal_ht+0xa786, %rdx inc %rbp movw $0x6162, (%rdx) nop nop nop nop and $62523, %rbp lea addresses_normal_ht+0x188f9, %r13 nop dec %rbp vmovups (%r13), %ymm0 vextracti128 $1, %ymm0, %xmm0 vpextrq $0, %xmm0, %rcx nop nop nop nop nop add $33141, %rdi lea addresses_D_ht+0x18f86, %r10 nop nop nop add %rdx, %rdx movb $0x61, (%r10) nop dec %r13 lea addresses_UC_ht+0xad86, %rcx inc %rdi and $0xffffffffffffffc0, %rcx movaps (%rcx), %xmm7 vpextrq $0, %xmm7, %rdx nop nop nop nop nop sub %rbp, %rbp lea addresses_A_ht+0x16026, %rbp clflush (%rbp) nop nop inc %rdi movw $0x6162, (%rbp) nop inc %rbp lea addresses_D_ht+0x15286, %rsi lea addresses_normal_ht+0x6526, %rdi nop xor %r14, %r14 mov $69, %rcx rep movsb nop nop sub %rcx, %rcx lea addresses_normal_ht+0xe186, %r14 nop nop nop nop add $61763, %rbp movb (%r14), %dl nop nop nop nop sub %rbp, %rbp lea addresses_D_ht+0x15186, %rsi lea addresses_normal_ht+0x1a33b, %rdi and %rbp, %rbp mov $62, %rcx rep movsw nop nop nop nop nop cmp %r14, %r14 pop %rsi pop %rdx pop %rdi pop %rcx pop %rbp pop %r14 pop %r13 pop %r10 ret .global s_faulty_load s_faulty_load: push %r13 push %r14 push %r15 push %r8 push %r9 push %rsi // Faulty Load lea addresses_D+0x3d86, %r14 and %r15, %r15 mov (%r14), %r8d lea oracles, %rsi and $0xff, %r8 shlq $12, %r8 mov (%rsi,%r8,1), %r8 pop %rsi pop %r9 pop %r8 pop %r15 pop %r14 pop %r13 ret /* <gen_faulty_load> [REF] {'src': {'NT': False, 'same': False, 'congruent': 0, 'type': 'addresses_D', 'AVXalign': False, 'size': 2}, 'OP': 'LOAD'} [Faulty Load] {'src': {'NT': False, 'same': True, 'congruent': 0, 'type': 'addresses_D', 'AVXalign': False, 'size': 4}, 'OP': 'LOAD'} <gen_prepare_buffer> {'src': {'same': True, 'congruent': 7, 'type': 'addresses_WT_ht'}, 'OP': 'REPM', 'dst': {'same': False, 'congruent': 1, 'type': 'addresses_WT_ht'}} {'OP': 'STOR', 'dst': {'NT': False, 'same': False, 'congruent': 11, 'type': 'addresses_WT_ht', 'AVXalign': False, 'size': 16}} {'OP': 'STOR', 'dst': {'NT': False, 'same': False, 'congruent': 9, 'type': 'addresses_normal_ht', 'AVXalign': False, 'size': 2}} {'src': {'NT': False, 'same': False, 'congruent': 0, 'type': 'addresses_normal_ht', 'AVXalign': False, 'size': 32}, 'OP': 'LOAD'} {'OP': 'STOR', 'dst': {'NT': False, 'same': False, 'congruent': 6, 'type': 'addresses_D_ht', 'AVXalign': False, 'size': 1}} {'src': {'NT': True, 'same': True, 'congruent': 11, 'type': 'addresses_UC_ht', 'AVXalign': True, 'size': 16}, 'OP': 'LOAD'} {'OP': 'STOR', 'dst': {'NT': False, 'same': True, 'congruent': 5, 'type': 'addresses_A_ht', 'AVXalign': False, 'size': 2}} {'src': {'same': False, 'congruent': 8, 'type': 'addresses_D_ht'}, 'OP': 'REPM', 'dst': {'same': False, 'congruent': 4, 'type': 'addresses_normal_ht'}} {'src': {'NT': False, 'same': False, 'congruent': 10, 'type': 'addresses_normal_ht', 'AVXalign': False, 'size': 1}, 'OP': 'LOAD'} {'src': {'same': False, 'congruent': 10, 'type': 'addresses_D_ht'}, 'OP': 'REPM', 'dst': {'same': False, 'congruent': 0, 'type': 'addresses_normal_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 */
tests/regex_test.adb
skordal/ada-regex
2
23412
<gh_stars>1-10 -- Ada regular expression library -- (c) <NAME> 2020 <<EMAIL>> -- Report bugs and issues on <https://github.com/skordal/ada-regex> with AUnit.Run; with AUnit.Reporter.Text; with Regex_Test_Suite; with Utilities_Test_Suite; procedure Regex_Test is procedure Regex_Test_Runner is new AUnit.Run.Test_Runner (Regex_Test_Suite.Test_Suite); procedure Utilities_Test_Runner is new AUnit.Run.Test_Runner (Utilities_Test_Suite.Test_Suite); Test_Reporter : AUnit.Reporter.Text.Text_Reporter; begin Regex_Test_Runner (Test_Reporter); Utilities_Test_Runner (Test_Reporter); end Regex_Test;
src/grammars/Exp.g4
wilgnne/exp-lang
0
3116
grammar Exp; /*---------------- PARSER INTERNALS ----------------*/ @parser::header { import compileTime, { updateStack } from '../utils/CompileTime.js'; import { programHeader, programFooter } from '../utils/program.js'; import { mainHeader, mainFooter } from '../utils/main.js'; import { defHeader, defFooter, defCall, defParameters, defArgs, defReturn } from '../utils/def.js'; import { attribution, comparasion, expression, term, propty } from '../utils/operators.js'; import { ifHeader, ifElseHeader, ifFooter, elseFooter } from '../utils/ifStatement.js'; import { whileHeader, whileComparasion, whileFooter, whileFlowControl } from '../utils/whileStatemant.js'; import { readInt, readString, getPrint, print, printInt, printStr, println } from '../utils/io.js'; import { number, string, array, name } from '../utils/value.js'; } @parser::members { } /*---------------- LEXER RULES ----------------*/ COMMENT: '#' ~('\n')* -> skip; SPACE: (' ' | '\t' | '\r' | '\n')+ -> skip; EQ: '=='; NE: '!='; GT: '>'; GE: '>='; LT: '<'; LE: '<='; /* OPERATORS */ PLUS: '+'; SUB: '-'; TIMES: '*'; DIV: '/'; MOD: '%'; OP_PAR: '('; CL_PAR: ')'; OP_CUR: '{'; CL_CUR: '}'; OP_BRA: '['; CL_BRA: ']'; ATTRIB: '='; COMMA: ','; DOT: '.'; DDOT: ':'; PRINT: 'print'; READ_INT: 'read_int'; READ_STR: 'read_str'; IF: 'if'; ELSE: 'else'; WHILE: 'while'; BREAK: 'break'; CONTINUE: 'continue'; LENGTH: 'length'; PUSH: 'push'; DEF: 'def'; RETURN: 'return'; NUMBER: '0' ..'9'+; STRING: '"' ~('"')* '"'; NAME: 'a' ..'z'+; /*---------------- PARSER RULES ----------------*/ program: { programHeader(); } (def)* main { programFooter(); }; def: DEF NAME OP_PAR (parameters)? CL_PAR (t = NAME)? OP_CUR { defHeader($NAME.text, $t.text); } ( statement )* CL_CUR { defFooter($t.text); }; parameters: n1 = NAME DDOT t1 = NAME { defParameters($n1.text, $t1.text); } ( COMMA n2 = NAME DDOT t2 = NAME { defParameters($n2.text, $t2.text); } )*; st_return: RETURN (exp = expression)? { defReturn($exp.type); }; main: { mainHeader(); } (statement)* { mainFooter(); }; statement: st_print | st_return | st_if | st_while | st_break | st_continue | st_attrib | exp = expression { if ($exp.type !== 'void') console.log(' pop'); }; st_print: PRINT OP_PAR { getPrint(); } ( exp1 = expression { print($exp1.type); getPrint(); } ( COMMA { console.log(' ldc " "') updateStack(1) printStr(); getPrint(); } exp2 = expression { print($exp2.type); getPrint(); } )* )? CL_PAR { println(); }; st_attrib: attr_direct | attr_index; attr_direct: NAME ATTRIB exp = expression { attribution($exp.type, $NAME, $NAME.line); }; attr_index: f = factor line = OP_BRA index = expression CL_BRA ATTRIB value = expression { propty($f.text, $f.type, 'set_item', { index: $index.type, value: $value.type }, $line.line) }; st_if: IF comparasion {ifHeader();} OP_CUR (statement*) ( CL_CUR {ifFooter();} ELSE IF comparasion {ifElseHeader();} OP_CUR ( statement* ) )* {ifFooter();} (CL_CUR {} ELSE OP_CUR (statement*))? CL_CUR {elseFooter();}; st_while: WHILE { whileHeader(); } comparasion { whileComparasion(); } OP_CUR ( statement* ) CL_CUR { whileFooter(); }; st_break: BREAK { whileFlowControl('END'); }; st_continue: CONTINUE { whileFlowControl('BEGIN'); }; comparasion: exp1 = expression ( op = (EQ | NE | GT | GE | LT | LE) exp2 = expression { comparasion(ExpParser, $op, $exp1.type, $exp2.type, $op.line); } ); expression returns[type]: t1 = term ( op = (PLUS | SUB) t2 = term { expression(ExpParser, $op, $t1.type, $t2.type, $op.line); } )* { $type = $t1.type; }; term returns[type]: f1 = factor ( op = (TIMES | DIV | MOD) f2 = factor { term(ExpParser, $op, $f1.type, $f2.type, $op.line); } )* { $type = $f1.type; }; factor returns[type]: pr = propty { $type = $pr.type; } | f = fac { $type = $f.type; }; fac returns[type, text]: fconst = fa_const { $type = $fconst.type; $text = $fconst.text; } | fvar = fa_var { $type = $fvar.type; $text = $fvar.text; } | io = fa_io { $type = $io.type; $text = $io.text; }; fa_const returns[type, text]: NUMBER { number($NUMBER.text); $type = 'int'; $text = $NUMBER.text } | STRING { string($STRING.text); $type = 'str'; $text = $STRING.text } | OP_BRA CL_BRA { array(); $type = 'array'; $text = '[]'; }; fa_io returns[type, text]: READ_INT OP_PAR CL_PAR { readInt(); $type = 'int'; $text = 'read_int()'; } | READ_STR OP_PAR CL_PAR { readString(); $type = 'str'; $text = 'read_str()'; }; fa_var returns[type, text]: call = st_call { $type = $call.type; $text = $call.text; } | NAME { $type = name($NAME.text, $NAME.line); $text = $NAME.text; } | OP_PAR exp = expression { $type = $exp.type; $text = 'expression result'; } CL_PAR; st_call returns[type, text]: NAME OP_PAR (args)? CL_PAR { $type = defCall($NAME.text); $text = $NAME.text; }; args: exp1 = expression { defArgs($exp1.type); } ( COMMA exp2 = expression { defArgs($exp2.type); } )*; propty returns[type]: f = fac ret = rc_prop[localctx.f] { $type = $ret.type; }; rc_prop[father] returns[type]: push = pr_push[father] ( prop = rc_prop[localctx.push] )? { $type = localctx.prop ? $prop.type : $push.type } | len = pr_length[father] ( prop = rc_prop[localctx.len] )? { $type = localctx.prop ? $prop.type : $len.type } | get = pr_get_item[father] ( prop = rc_prop[localctx.get] )? { $type = localctx.prop ? $prop.type : $get.type }; pr_push[father] returns[type]: line = DOT PUSH OP_PAR exp = expression { $type = propty(father.text, father.type, 'push', { value: $exp.type }, $line.line); } CL_PAR; pr_length[father] returns[type]: line = DOT LENGTH { $type = propty(father.text, father.type, 'length', {}, $line.line); }; pr_get_item[father] returns[type]: line = OP_BRA (exp = expression) CL_BRA { $type = propty(father.text, father.type, 'get_item', { index: $exp.type }, $line.line) };
gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/cc/cc1226b.ada
best08618/asylo
7
4417
-- CC1226B.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, FOR A FORMAL NONLIMITED PRIVATE TYPE, THAT ALL ALLOWABLE -- OPERATIONS ARE IMPLICITLY DECLARED. -- HISTORY: -- BCB 04/04/88 CREATED ORIGINAL TEST. -- RJW 03/28/90 INITIALIZED PREVIOUSLY UNINITIALIZED VARIABLES. -- LDC 09/19/90 INITALIZED NLPVAR & NLPVAR2 TO DIFFERENT VALUES, -- REMOVED USE CLAUSE. -- PWN 01/31/95 REMOVED INCONSISTENCIES WITH ADA 9X. WITH REPORT; USE REPORT; WITH SYSTEM; USE SYSTEM; PROCEDURE CC1226B IS TYPE DISCREC(DISC1 : INTEGER := 1; DISC2 : BOOLEAN := FALSE) IS RECORD NULL; END RECORD; GENERIC TYPE NLP IS PRIVATE; TYPE NLPDISC(DISC1 : INTEGER; DISC2 : BOOLEAN) IS PRIVATE; WITH PROCEDURE INITIALIZE (N : OUT NLPDISC); WITH FUNCTION INITIALIZE RETURN NLP; WITH FUNCTION INITIALIZE_2 RETURN NLP; PACKAGE P IS FUNCTION IDENT(X : NLP) RETURN NLP; FUNCTION IDENT_ADR(Y : ADDRESS) RETURN ADDRESS; END P; PACKAGE BODY P IS TYPE DER_NLP IS NEW NLP; NLPVAR : NLP := INITIALIZE_2; NLPVAR2, NLPVAR3 : NLP := INITIALIZE; DERNLP : DER_NLP := DER_NLP (INITIALIZE); NDVAR : NLPDISC(DISC1 => 5, DISC2 => TRUE); NLPVARADDRESS : ADDRESS; NLPSIZE : INTEGER; NLPBASESIZE : INTEGER; FUNCTION IDENT(X : NLP) RETURN NLP IS Z : NLP := INITIALIZE; BEGIN IF EQUAL(3,3) THEN RETURN X; END IF; RETURN Z; END IDENT; FUNCTION IDENT_ADR(Y : ADDRESS) RETURN ADDRESS IS I : INTEGER; Z : ADDRESS := I'ADDRESS; BEGIN IF EQUAL(3,3) THEN RETURN Y; END IF; RETURN Z; END IDENT_ADR; BEGIN TEST ("CC1226B", "CHECK, FOR A FORMAL NONLIMITED PRIVATE " & "TYPE THAT ALL ALLOWABLE OPERATIONS ARE " & "IMPLICITLY DECLARED"); INITIALIZE (NDVAR); NLPVAR := NLPVAR2; IF NLPVAR /= NLPVAR2 THEN FAILED ("IMPROPER VALUE FROM ASSIGNMENT"); END IF; IF NLPVAR NOT IN NLP THEN FAILED ("IMPROPER RESULT FROM MEMBERSHIP TEST"); END IF; NLPVAR := NLP'(NLPVAR2); IF NLPVAR /= NLPVAR2 THEN FAILED ("IMPROPER RESULT FROM QUALIFICATION"); END IF; NLPVAR := NLP(DERNLP); IF NLPVAR /= IDENT(NLP(DERNLP)) THEN FAILED ("IMPROPER RESULT FROM EXPLICIT CONVERSION"); END IF; NLPSIZE := IDENT_INT(NLP'SIZE); IF NLPSIZE /= INTEGER(NLP'SIZE) THEN FAILED ("IMPROPER VALUE FOR NLP'SIZE"); END IF; NLPVARADDRESS := NLPVAR'ADDRESS; IF NLPVAR'ADDRESS /= IDENT_ADR(NLPVARADDRESS) THEN FAILED ("IMPROPER VALUE FOR NLPVAR'ADDRESS"); END IF; IF NDVAR.DISC1 /= IDENT_INT(5) THEN FAILED ("IMPROPER DISCRIMINANT VALUE - 1"); END IF; IF NOT NDVAR.DISC2 THEN FAILED ("IMPROPER DISCRIMINANT VALUE - 2"); END IF; IF NOT NDVAR'CONSTRAINED THEN FAILED ("IMPROPER VALUE FOR NDVAR'CONSTRAINED"); END IF; NLPVAR := NLPVAR3; IF NOT (NLPVAR = IDENT(NLPVAR3)) THEN FAILED ("IMPROPER VALUE FROM EQUALITY OPERATION"); END IF; IF NLPVAR /= IDENT(NLPVAR3) THEN FAILED ("IMPROPER VALUE FROM INEQUALITY OPERATION"); END IF; RESULT; END P; PROCEDURE INITIALIZE (I : OUT DISCREC) IS BEGIN I := (5, TRUE); END INITIALIZE; FUNCTION INITIALIZE RETURN INTEGER IS BEGIN RETURN 5; END INITIALIZE; FUNCTION INITIALIZE_OTHER RETURN INTEGER IS BEGIN RETURN 3; END INITIALIZE_OTHER; PACKAGE PACK IS NEW P(INTEGER, DISCREC, INITIALIZE, INITIALIZE, INITIALIZE_OTHER); BEGIN NULL; END CC1226B;
programs/oeis/016/A016817.asm
neoneye/loda
22
178913
<filename>programs/oeis/016/A016817.asm ; A016817: a(n) = (4n+1)^5. ; 1,3125,59049,371293,1419857,4084101,9765625,20511149,39135393,69343957,115856201,184528125,282475249,418195493,601692057,844596301,1160290625,1564031349,2073071593,2706784157,3486784401,4437053125,5584059449,6956883693,8587340257 mov $1,4 mul $1,$0 add $1,1 pow $1,5 mov $0,$1
libsrc/nc100/txtwrchar.asm
meesokim/z88dk
0
5582
<reponame>meesokim/z88dk<filename>libsrc/nc100/txtwrchar.asm PUBLIC txtwrchar ; fastcall so in HL! .txtwrchar ld a, l jp 0xB83C
bb-runtimes/src/s-bbbosu__zynqmpr5.adb
JCGobbi/Nucleo-STM32G474RE
0
22388
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME LIBRARY (GNARL) COMPONENTS -- -- -- -- S Y S T E M . B B . B O A R D _ S U P P O R T -- -- -- -- B o d y -- -- -- -- Copyright (C) 1999-2002 Universidad Politecnica de Madrid -- -- Copyright (C) 2003-2006 The European Space Agency -- -- Copyright (C) 2003-2021, AdaCore -- -- -- -- GNARL is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNARL is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- 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/>. -- -- -- -- GNARL was developed by the GNARL team at Florida State University. -- -- Extensive contributions were provided by Ada Core Technologies, Inc. -- -- -- -- The port of GNARL to bare board targets was initially developed by the -- -- Real-Time Systems Group at the Technical University of Madrid. -- -- -- ------------------------------------------------------------------------------ -- This is the Xilinx Ultrascale+ Zynqmp Cortex-R5 version of this package -- This uses the TTC (Triple Timer Clock) peripheral for timing events and -- the PL390 GIC controller for Interrupts support. with System.ARM_GIC; with System.BB.Parameters; with Interfaces; use Interfaces; package body System.BB.Board_Support is use BB.Interrupts, BB.Time, Parameters; use System.Multiprocessors; use Time; ----------- -- GICv2 -- ----------- package GIC renames System.ARM_GIC; ----------- -- Timer -- ----------- -- The zynqmp has 4 Triple Timer counters. We use Timer 0 & 1 from TTC0, -- the first timer being used to retrieve the time, and the second one -- to generate timed events. type TTC_Registers is record Clock_Control : Unsigned_32; Counter_Control : Unsigned_32; Counter_Value : Unsigned_32; Interval_Counter : Unsigned_32; Match_1_Counter : Unsigned_32; Match_2_Counter : Unsigned_32; Match_3_Counter : Unsigned_32; Interrupt_Register : Unsigned_32; Interrupt_Enable : Unsigned_32; Event_Control_Timer : Unsigned_32; Event_Register : Unsigned_32; end record with Volatile; for TTC_Registers use record Clock_Control at 16#00# range 0 .. 31; Counter_Control at 16#0C# range 0 .. 31; Counter_Value at 16#18# range 0 .. 31; Interval_Counter at 16#24# range 0 .. 31; Match_1_Counter at 16#30# range 0 .. 31; Match_2_Counter at 16#3C# range 0 .. 31; Match_3_Counter at 16#48# range 0 .. 31; Interrupt_Register at 16#54# range 0 .. 31; Interrupt_Enable at 16#60# range 0 .. 31; Event_Control_Timer at 16#6C# range 0 .. 31; Event_Register at 16#78# range 0 .. 31; end record; TTC_Clock : aliased TTC_Registers with Address => 16#FF11_0000#; -- TTC0[0]: Used to get current time Clock_Interrupt_ID : constant BB.Interrupts.Interrupt_ID := 68; -- TTC0_0_Interrupt TTC_Alarm : aliased TTC_Registers with Address => 16#FF11_0004#; -- TTC0[1]: Used to handle timed events Alarm_Interrupt_ID : constant BB.Interrupts.Interrupt_ID := 69; -- TTC0_1_Interrupt TTC_Intv_Int : constant Unsigned_32 := 2 ** 0; TTC_Match1_Int : constant Unsigned_32 := 2 ** 1; TTC_Ovf_Int : constant Unsigned_32 := 2 ** 4; Alarm_Ticks_Periods : Unsigned_32 with Volatile; Alarm_Ticks_Match : Unsigned_32 with Volatile; Last_Clock_Time : BB.Time.Time with Volatile; Timer_Handler : BB.Interrupts.Interrupt_Handler := null; procedure Reset_Timer (TTC : access TTC_Registers); procedure LL_Alarm_Handler (Id : Interrupt_ID); procedure LL_Clock_Handler (Id : Interrupt_ID); ----------------- -- Reset_Timer -- ----------------- procedure Reset_Timer (TTC : access TTC_Registers) is begin -- Disable the counter Dis to 1 TTC.Counter_Control := 1; -- Reset the other registers to their default values TTC.Clock_Control := 0; TTC.Interval_Counter := 0; TTC.Match_1_Counter := 0; TTC.Match_2_Counter := 0; TTC.Match_3_Counter := 0; TTC.Interrupt_Enable := 0; -- Clear any pending interrupt TTC.Interrupt_Register := 16#1F#; -- Setup the prescaler pragma Assert (TTC_Prescaler < 16); TTC.Clock_Control := Shift_Left (TTC_Prescaler, 1) or 1; end Reset_Timer; ---------------------- -- LL_Clock_Handler -- ---------------------- procedure LL_Clock_Handler (Id : BB.Interrupts.Interrupt_ID) is pragma Unreferenced (Id); begin if (TTC_Clock.Interrupt_Register and TTC_Ovf_Int) /= 0 then Last_Clock_Time := Last_Clock_Time + 16#1_0000_0000#; end if; end LL_Clock_Handler; ---------------------- -- LL_Alarm_Handler -- ---------------------- procedure LL_Alarm_Handler (Id : BB.Interrupts.Interrupt_ID) is Flags : Unsigned_32; begin -- The alarm is configured to either: -- * send Intv IRQs each time the counter reaches 8FFF_FFFF (half of its -- total period -- * send a Match IRQ when the counter reaches the actual alarm time Flags := TTC_Alarm.Interrupt_Register; if (Flags and TTC_Match1_Int) /= 0 then Alarm_Ticks_Periods := 0; Alarm_Ticks_Match := 0; TTC_Alarm.Interrupt_Enable := 0; -- Disable the alarm counter TTC_Alarm.Counter_Control := 1; -- Now actually call the handler Timer_Handler (Id); else if Alarm_Ticks_Periods > 0 then Alarm_Ticks_Periods := Alarm_Ticks_Periods - 1; end if; if Alarm_Ticks_Periods = 0 then TTC_Alarm.Match_1_Counter := Alarm_Ticks_Match; TTC_Alarm.Interrupt_Enable := TTC_Match1_Int; TTC_Alarm.Counter_Control := 2 ** 3; end if; end if; end LL_Alarm_Handler; ---------------------- -- Initialize_Board -- ---------------------- procedure Initialize_Board is begin GIC.Initialize_GICD; GIC.Initialize_GICC; BB.Interrupts.Attach_Handler (LL_Clock_Handler'Access, Clock_Interrupt_ID, Interrupt_Priority'Last); BB.Interrupts.Attach_Handler (LL_Alarm_Handler'Access, Alarm_Interrupt_ID, Interrupt_Priority'Last); Alarm_Ticks_Match := 0; Alarm_Ticks_Periods := 0; Last_Clock_Time := 0; Reset_Timer (TTC_Clock'Access); Reset_Timer (TTC_Alarm'Access); -- Start the clock TTC_Clock.Interrupt_Enable := TTC_Ovf_Int; TTC_Clock.Counter_Control := 2 ** 4; -- RST bit end Initialize_Board; package body Time is --------------- -- Set_Alarm -- --------------- procedure Set_Alarm (Ticks : BB.Time.Time) is Now : BB.Time.Time; Alarm_Ticks : BB.Time.Time; begin -- Disable the alarm counter TTC_Alarm.Counter_Control := 1; TTC_Alarm.Interrupt_Enable := 0; Alarm_Ticks_Periods := 0; Alarm_Ticks_Match := 0; if Ticks < BB.Time.Time'Last then Now := Read_Clock; if Now >= Ticks then -- Enable the Match1 irq TTC_Alarm.Interrupt_Enable := TTC_Match1_Int; -- Raise IRQ on first count TTC_Alarm.Match_1_Counter := 1; -- Reset the Alarm counter and enable match mode TTC_Alarm.Counter_Control := 2 ** 3 + 2 ** 4; else Alarm_Ticks := Ticks - Now; -- Calculate the value for the Match register Alarm_Ticks_Match := Unsigned_32 (Alarm_Ticks and 16#FFFF_FFFF#); -- Calculate the number of counter periods before setting the -- match register Alarm_Ticks_Periods := Unsigned_32 (Shift_Right (Unsigned_64 (Alarm_Ticks) and 16#8FFF_FFFF_0000_0000#, 32)); -- Calculate the actual period used: 3 cases here -- 1- The alarm is soon enough so that the counter won't -- overflow. We just set the Match register and set the -- alarm in match mode. -- 2- The alarm would be set just after an interval: there's -- then the risk that we don't set the match register soon -- enough after the interval is notified, so miss the actual -- alarm. -- We then use half periods, and make sure the alarm is -- always set with half period + something -- 3- else, we apply the maximum timer period if Alarm_Ticks_Periods = 0 then TTC_Alarm.Interval_Counter := 0; TTC_Alarm.Match_1_Counter := Alarm_Ticks_Match; TTC_Alarm.Interrupt_Enable := TTC_Match1_Int; -- Start the alarm counter in MATCH mode TTC_Alarm.Counter_Control := 2 ** 3 + 2 ** 4; elsif Alarm_Ticks_Match < 16#8000_0000# and then Alarm_Ticks_Periods > 0 then -- Setup the interval used for the alarm clock: it's half -- the overflow interval, so that the actual alarm is always -- set some time before the last overflow, to prevent too -- short notice to the counter. Alarm_Ticks_Periods := Alarm_Ticks_Periods * 2 - 1; Alarm_Ticks_Match := Alarm_Ticks_Match + 16#8000_0000#; TTC_Alarm.Interval_Counter := 16#8000_0000#; TTC_Alarm.Interrupt_Enable := TTC_Intv_Int; -- Start the alarm counter in INT mode TTC_Alarm.Counter_Control := 2 ** 1 + 2 ** 4; else TTC_Alarm.Interval_Counter := 0; TTC_Alarm.Match_1_Counter := 0; TTC_Alarm.Interrupt_Enable := TTC_Ovf_Int; -- Start the alarm counter as free running mode TTC_Alarm.Counter_Control := 2 ** 4; end if; end if; end if; end Set_Alarm; ---------------- -- Read_Clock -- ---------------- function Read_Clock return BB.Time.Time is Count : Unsigned_32; Flag : Boolean; Res : BB.Time.Time; Old_Itf_Value : constant Unsigned_32 := TTC_Clock.Interrupt_Enable; begin -- First ensure that we're not interrupted TTC_Clock.Interrupt_Enable := 0; -- We must read the counter before the flag: if we read the flag -- first, a reload can occur just after the read and the count -- register would wrap around: we'd end up with a Count value close -- to 0 but a flag at 0 and therefore miss the reload and return a -- wrong clock value. Count := TTC_Clock.Counter_Value; Flag := (TTC_Clock.Interrupt_Register and TTC_Ovf_Int) /= 0; if Flag then -- Counter has just reached the ovf value. So just ignore -- Count that may still be close to Interval_Count is the wrap -- occurred between the two read operations Last_Clock_Time := Last_Clock_Time + 16#1_0000_0000#; Res := Last_Clock_Time; else Res := Last_Clock_Time + BB.Time.Time (Count); end if; -- Re-enable the TTC interrupt TTC_Clock.Interrupt_Enable := Old_Itf_Value; return Res; end Read_Clock; --------------------------- -- Install_Alarm_Handler -- --------------------------- procedure Install_Alarm_Handler (Handler : Interrupt_Handler) is begin Timer_Handler := Handler; end Install_Alarm_Handler; --------------------------- -- Clear_Alarm_Interrupt -- --------------------------- procedure Clear_Alarm_Interrupt is Dummy : Unsigned_32 with Volatile; begin -- The Interrupt_Register is "Clear on read" Dummy := TTC_Clock.Interrupt_Register; end Clear_Alarm_Interrupt; end Time; ----------------- -- IRQ_Handler -- ----------------- procedure IRQ_Handler is new GIC.IRQ_Handler (Interrupt_Wrapper => Interrupt_Wrapper); pragma Export (C, IRQ_Handler, "__gnat_irq_handler"); -- Low-level interrupt handler procedure FIQ_Handler is null; pragma Export (C, FIQ_Handler, "__gnat_fiq_handler"); package body Interrupts is ------------------------------- -- Install_Interrupt_Handler -- ------------------------------- procedure Install_Interrupt_Handler (Interrupt : BB.Interrupts.Interrupt_ID; Prio : Interrupt_Priority) renames GIC.Install_Interrupt_Handler; --------------------------- -- Priority_Of_Interrupt -- --------------------------- function Priority_Of_Interrupt (Interrupt : System.BB.Interrupts.Interrupt_ID) return System.Any_Priority renames GIC.Priority_Of_Interrupt; -------------------------- -- Set_Current_Priority -- -------------------------- procedure Set_Current_Priority (Priority : Integer) renames GIC.Set_Current_Priority; ---------------- -- Power_Down -- ---------------- procedure Power_Down renames GIC.Power_Down; end Interrupts; package body Multiprocessors is separate; end System.BB.Board_Support;
oeis/152/A152551.asm
neoneye/loda-programs
11
94636
; A152551: a(n) = (2*n+1)^floor((n-1)/2). ; 1,1,1,7,9,121,169,3375,4913,130321,194481,6436343,9765625,387420489,594823321,27512614111,42618442977,2251875390625,3512479453921,208728361158759,327381934393961,21611482313284249,34050628916015625,2472159215084012303,3909821048582988049,309629344375621415601,491258904256726154641,42141982597572021484375,67046038752496061076057,6193386212891813387462761,9876832533361318095112441,977480813971145474830595007,1562069488955406402587890625,164890958756244164895763202881 mul $0,2 mov $2,$0 add $2,1 mov $1,$2 mul $2,2 sub $2,5 div $2,8 pow $1,$2 mov $0,$1
src/spi.adb
0xA1/pi-spi
0
5674
-- -- -- Copyright (c) 2015, <NAME> -- -- -- -- Permission to use, copy, modify, and/or distribute this software for any -- -- purpose with or without fee is hereby granted, provided that the above -- -- copyright notice and this permission notice appear in all copies. -- -- -- -- THE SOFTWARE IS PROVIDED "AS IS" AND THE AUTHOR DISCLAIMS ALL WARRANTIES -- -- WITH REGARD TO THIS SOFTWARE INCLUDING ALL IMPLIED WARRANTIES OF -- -- MERCHANTABILITY AND FITNESS. IN NO EVENT SHALL THE AUTHOR BE LIABLE FOR -- -- ANY SPECIAL, DIRECT, INDIRECT, OR CONSEQUENTIAL DAMAGES OR ANY DAMAGES -- -- WHATSOEVER RESULTING FROM LOSS OF USE, DATA OR PROFITS, WHETHER IN AN -- -- ACTION OF CONTRACT, NEGLIGENCE OR OTHER TORTIOUS ACTION, ARISING OUT OF -- -- OR IN CONNECTION WITH THE USE OR PERFORMANCE OF THIS SOFTWARE. -- -- -- with Interfaces.C; use Interfaces.C; with stdint_h; use stdint_h; with stddef_h; use stddef_h; with Interfaces.C.Strings; package body SPI is procedure Open(device : access SPI_Device; device_path : Interfaces.C.Strings.chars_ptr; mode : Mode_Type; bits : uint8_t; freq : uint32_t) is result : int; begin result := c_open(device, device_path, uint32_t(mode), bits, freq); case result is when 0 => -- Success -- return; when 1 => -- Invalid mode -- raise Error_Mode; when 2 => -- Invalid number of bits -- raise Error_Bits; when 3 => -- Invalid frequency -- raise Error_Freq; when 4 => -- Device Error -- raise Error_Device; when others => -- Undefined Error -- raise Error_Unknown; end case; end Open; -------------------------------------------------------------------------------- procedure Transfer(device : access SPI_Device; transmit_buffer : access uint8_t; receive_buffer : access uint8_t; c_delay : uint16_t; length : stddef_h.size_t) is result : int; begin result := c_transfer(device, transmit_buffer, receive_buffer, c_delay, length); case result is when 0 => -- Success -- return; when 5 => -- Transfer Error -- raise Error_Xfer; when others => -- Undefined Error -- raise Error_Unknown; end case; end Transfer; -------------------------------------------------------------------------------- procedure Close(device : access SPI_Device) is begin c_close(device); end Close; begin null; end SPI;
oeis/052/A052907.asm
neoneye/loda-programs
11
243623
<reponame>neoneye/loda-programs ; A052907: Expansion of 1/(1 - 2*x^2 - 2*x^3). ; Submitted by <NAME> ; 1,0,2,2,4,8,12,24,40,72,128,224,400,704,1248,2208,3904,6912,12224,21632,38272,67712,119808,211968,375040,663552,1174016,2077184,3675136,6502400,11504640,20355072,36014080,63719424,112738304,199467008,352915456,624410624,1104764928,1954652160,3458351104,6118834176,10826006528,19154370560,33889681408,59960754176,106088103936,187700871168,332097716224,587577950208,1039597174784,1839351332864,3254350249984,5757897015296,10187403165696,18024494530560,31890600361984,56423795392512,99830189785088 mov $4,1 lpb $0 sub $0,1 mov $1,$4 mul $2,2 mov $4,$2 mov $2,$1 add $2,$3 mov $3,$1 lpe mov $0,$4
oeis/293/A293547.asm
neoneye/loda-programs
11
164137
; A293547: a(n) is the integer k that minimizes |k/Fibonacci(n) - 2/3|. ; Submitted by <NAME>(m1) ; 0,1,1,1,2,3,5,9,14,23,37,59,96,155,251,407,658,1065,1723,2787,4510,7297,11807,19105,30912,50017,80929,130945,211874,342819,554693,897513,1452206,2349719,3801925,6151643,9953568,16105211,26058779,42163991,68222770,110386761,178609531,288996291,467605822,756602113,1224207935,1980810049,3205017984,5185828033,8390846017,13576674049,21967520066,35544194115,57511714181,93055908297,150567622478,243623530775,394191153253,637814684027,1032005837280,1669820521307,2701826358587,4371646879895,7073473238482 seq $0,45 ; Fibonacci numbers: F(n) = F(n-1) + F(n-2) with F(0) = 0 and F(1) = 1. mul $0,2 add $0,4 div $0,3 sub $0,1
alloy4fun_models/trashltl/models/17/CcMt7AYPASmTL7FRv.als
Kaixi26/org.alloytools.alloy
0
1852
open main pred idCcMt7AYPASmTL7FRv_prop18 { always (all f : File | f in Protected triggered f in Trash) } pred __repair { idCcMt7AYPASmTL7FRv_prop18 } check __repair { idCcMt7AYPASmTL7FRv_prop18 <=> prop18o }
Examples/ch10/Struct1.asm
satadriver/LiunuxOS_t
0
245170
TITLE Intro to STRUCT (Struct1.asm) ; This program demonstrates the STRUC directive. ; 32-bit version. ; Last update: 8/13/01. INCLUDE Irvine32.inc COORD STRUCT X WORD ? Y WORD ? COORD ENDS typEmployee STRUCT Idnum BYTE 9 DUP(0) Lastname BYTE 30 DUP(0) Years WORD 0 SalaryHistory DWORD 10 DUP(0) typEmployee ENDS .data ; Create instances of the COORD structure, ; assigning values to both X and Y: point1 COORD <5,10> point2 COORD <10,20> worker typEmployee <> ; override all fields. Either angle brackets ; or curly braces can be used: person1 typEmployee {"555223333"} person2 typEmployee <"555223333"> ; override only the second field: person3 typEmployee <,"Jones"> ; skip the first three fields, and ; use DUP to initialize the last field: person4 typEmployee <,,,3 DUP(20000)> ; Create an array of COORD objects: NumPoints = 3 AllPoints COORD NumPoints DUP(<0,0>) .code main PROC ; Get the offset of a field within a structure: mov edx,OFFSET typEmployee.SalaryHistory ; The following generates an "undefined identifier" error: ;mov edx,OFFSET Salary ; The TYPE, LENGTH, and SIZE operators can be applied ; to the structure and its fields: mov eax,TYPE typEmployee ; 82 mov eax,SIZE typEmployee mov eax,SIZE worker mov eax,SIZEOF worker mov eax,TYPE typEmployee.SalaryHistory ; 4 mov eax,LENGTH typEmployee.SalaryHistory ; 10 mov eax,SIZE typEmployee.SalaryHistory ; 40 ; The TYPE, LENGTH and SIZE operators can be applied ; to instances of the structure: mov eax,TYPE worker ; 82 mov eax,TYPE worker.Years ; 2 ; Indirect operands require the PTR operator: mov esi,offset worker mov ax,(typEmployee PTR [esi]).Years ; Loop through the array of points and set their ; X and Y values: mov edi,0 mov ecx,NumPoints mov ax,1 L1: mov (COORD PTR AllPoints[edi]).X,ax mov (COORD PTR AllPoints[edi]).X,ax add edi,TYPE COORD inc ax Loop L1 quit: exit main ENDP END main
Driver/Printer/PScript/Zoomer/pscriptzDriverInfo.asm
steakknife/pcgeos
504
164988
COMMENT @%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Copyright (c) Berkeley Softworks 1990 -- All Rights Reserved PROJECT: PC GEOS MODULE: PostScript printer driver FILE: pscriptzDriverInfo.asm AUTHOR: <NAME>, 15 May 1990 REVISION HISTORY: Name Date Description ---- ---- ----------- Jim 5/15/90 Initial revision DESCRIPTION: Driver info for the PostScript printer driver The file "printerDriver.def" should be included before this one $Id: pscriptzDriverInfo.asm,v 1.1 97/04/18 11:55:48 newdeal Exp $ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%@ COMMENT @%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Driver Info Resource This part of the file contains the information that pertains to all device supported by the driver. It includes device names and a table of the resource handles for the specific device info. A pointer to this info is provided by the DriverInfo function. %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%@ DriverInfo segment lmem LMEM_TYPE_GENERAL ;---------------------------------------------------------------------------- ; Device Enumerations ;---------------------------------------------------------------------------- DefPrinter PD_ALW, "Apple LaserWriter", appleLWf13Info DefPrinter PD_APPLELW2NT, "Apple LaserWriter II NT", appleLW2NTf35Info DefPrinter PD_GENERIC_PS, "PostScript Compatible", generf35Info DefPrinter PD_HPLJ4, "HP LaserJet 4 (PostScript)", hpLJ4psInfo DefPrinter PD_IBM401917, "IBM 4019 (17 Font PostScript)", ibm4019f17Info DefPrinter PD_IBM401939, "IBM 4019 (39 Font PostScript)", ibm4019f39Info DefPrinter PD_NECCMPS40, "NEC Colormate PS/40", necColor40f17Info DefPrinter PD_OKI830, "Oki OL830/PS", generf13Info DefPrinter PD_TANDY_LP410_PS, "Tandy LP 410 (PostScript)", generf13Info DefPrinter PD_TANDY_LP800_PS, "Tandy LP 800 (PostScript)", generf13Info ;---------------------------------------------------------------------------- ; Driver Info Header ;---------------------------------------------------------------------------- DriverExtendedInfoTable < {}, ; lmem header PrintDevice/2, ; #devices offset deviceStrings, ; devices offset deviceInfoTab ; info blocks > PrintDriverInfo < 90, ; timeout (sec) PR_DONT_RESEND, isoShme, ;ISO sub tab. asciiTransTable, PDT_PRINTER, FALSE > ;---------------------------------------------------------------------------- ; Device String Table and Strings ;---------------------------------------------------------------------------- ; Dave says I should have this here isoShme chunk.word 0ffffh ; ASCII Translation list for Foreign Language Versions asciiTransTable chunk.char ";;", 0 ;Create the actual tables here.... PrinterTables DriverInfo ends
arch/ARM/STM32/svd/stm32f46_79x/stm32_svd-quadspi.ads
rocher/Ada_Drivers_Library
192
19569
-- This spec has been automatically generated from STM32F46_79x.svd pragma Restrictions (No_Elaboration_Code); pragma Ada_2012; pragma Style_Checks (Off); with HAL; with System; package STM32_SVD.QUADSPI is pragma Preelaborate; --------------- -- Registers -- --------------- subtype CR_FTHRES_Field is HAL.UInt5; subtype CR_PRESCALER_Field is HAL.UInt8; -- control register type CR_Register is record -- Enable EN : Boolean := False; -- Abort request ABORT_k : Boolean := False; -- DMA enable DMAEN : Boolean := False; -- Timeout counter enable TCEN : Boolean := False; -- Sample shift SSHIFT : Boolean := False; -- unspecified Reserved_5_5 : HAL.Bit := 16#0#; -- Dual-flash mode DFM : Boolean := False; -- FLASH memory selection FSEL : Boolean := False; -- IFO threshold level FTHRES : CR_FTHRES_Field := 16#0#; -- unspecified Reserved_13_15 : HAL.UInt3 := 16#0#; -- Transfer error interrupt enable TEIE : Boolean := False; -- Transfer complete interrupt enable TCIE : Boolean := False; -- FIFO threshold interrupt enable FTIE : Boolean := False; -- Status match interrupt enable SMIE : Boolean := False; -- TimeOut interrupt enable TOIE : Boolean := False; -- unspecified Reserved_21_21 : HAL.Bit := 16#0#; -- Automatic poll mode stop APMS : Boolean := False; -- Polling match mode PMM : Boolean := False; -- Clock prescaler PRESCALER : CR_PRESCALER_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CR_Register use record EN at 0 range 0 .. 0; ABORT_k at 0 range 1 .. 1; DMAEN at 0 range 2 .. 2; TCEN at 0 range 3 .. 3; SSHIFT at 0 range 4 .. 4; Reserved_5_5 at 0 range 5 .. 5; DFM at 0 range 6 .. 6; FSEL at 0 range 7 .. 7; FTHRES at 0 range 8 .. 12; Reserved_13_15 at 0 range 13 .. 15; TEIE at 0 range 16 .. 16; TCIE at 0 range 17 .. 17; FTIE at 0 range 18 .. 18; SMIE at 0 range 19 .. 19; TOIE at 0 range 20 .. 20; Reserved_21_21 at 0 range 21 .. 21; APMS at 0 range 22 .. 22; PMM at 0 range 23 .. 23; PRESCALER at 0 range 24 .. 31; end record; subtype DCR_CSHT_Field is HAL.UInt3; subtype DCR_FSIZE_Field is HAL.UInt5; -- device configuration register type DCR_Register is record -- Mode 0 / mode 3 CKMODE : Boolean := False; -- unspecified Reserved_1_7 : HAL.UInt7 := 16#0#; -- Chip select high time CSHT : DCR_CSHT_Field := 16#0#; -- unspecified Reserved_11_15 : HAL.UInt5 := 16#0#; -- FLASH memory size FSIZE : DCR_FSIZE_Field := 16#0#; -- unspecified Reserved_21_31 : HAL.UInt11 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for DCR_Register use record CKMODE at 0 range 0 .. 0; Reserved_1_7 at 0 range 1 .. 7; CSHT at 0 range 8 .. 10; Reserved_11_15 at 0 range 11 .. 15; FSIZE at 0 range 16 .. 20; Reserved_21_31 at 0 range 21 .. 31; end record; subtype SR_FLEVEL_Field is HAL.UInt7; -- status register type SR_Register is record -- Read-only. Transfer error flag TEF : Boolean; -- Read-only. Transfer complete flag TCF : Boolean; -- Read-only. FIFO threshold flag FTF : Boolean; -- Read-only. Status match flag SMF : Boolean; -- Read-only. Timeout flag TOF : Boolean; -- Read-only. Busy BUSY : Boolean; -- unspecified Reserved_6_7 : HAL.UInt2; -- Read-only. FIFO level FLEVEL : SR_FLEVEL_Field; -- unspecified Reserved_15_31 : HAL.UInt17; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for SR_Register use record TEF at 0 range 0 .. 0; TCF at 0 range 1 .. 1; FTF at 0 range 2 .. 2; SMF at 0 range 3 .. 3; TOF at 0 range 4 .. 4; BUSY at 0 range 5 .. 5; Reserved_6_7 at 0 range 6 .. 7; FLEVEL at 0 range 8 .. 14; Reserved_15_31 at 0 range 15 .. 31; end record; -- flag clear register type FCR_Register is record -- Clear transfer error flag CTEF : Boolean := False; -- Clear transfer complete flag CTCF : Boolean := False; -- unspecified Reserved_2_2 : HAL.Bit := 16#0#; -- Clear status match flag CSMF : Boolean := False; -- Clear timeout flag CTOF : Boolean := False; -- unspecified Reserved_5_31 : HAL.UInt27 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for FCR_Register use record CTEF at 0 range 0 .. 0; CTCF at 0 range 1 .. 1; Reserved_2_2 at 0 range 2 .. 2; CSMF at 0 range 3 .. 3; CTOF at 0 range 4 .. 4; Reserved_5_31 at 0 range 5 .. 31; end record; subtype CCR_INSTRUCTION_Field is HAL.UInt8; subtype CCR_IMODE_Field is HAL.UInt2; subtype CCR_ADMODE_Field is HAL.UInt2; subtype CCR_ADSIZE_Field is HAL.UInt2; subtype CCR_ABMODE_Field is HAL.UInt2; subtype CCR_ABSIZE_Field is HAL.UInt2; subtype CCR_DCYC_Field is HAL.UInt5; subtype CCR_DMODE_Field is HAL.UInt2; subtype CCR_FMODE_Field is HAL.UInt2; -- communication configuration register type CCR_Register is record -- Instruction INSTRUCTION : CCR_INSTRUCTION_Field := 16#0#; -- Instruction mode IMODE : CCR_IMODE_Field := 16#0#; -- Address mode ADMODE : CCR_ADMODE_Field := 16#0#; -- Address size ADSIZE : CCR_ADSIZE_Field := 16#0#; -- Alternate bytes mode ABMODE : CCR_ABMODE_Field := 16#0#; -- Alternate bytes size ABSIZE : CCR_ABSIZE_Field := 16#0#; -- Number of dummy cycles DCYC : CCR_DCYC_Field := 16#0#; -- unspecified Reserved_23_23 : HAL.Bit := 16#0#; -- Data mode DMODE : CCR_DMODE_Field := 16#0#; -- Functional mode FMODE : CCR_FMODE_Field := 16#0#; -- Send instruction only once mode SIOO : Boolean := False; -- unspecified Reserved_29_29 : HAL.Bit := 16#0#; -- DDR hold half cycle DHHC : Boolean := False; -- Double data rate mode DDRM : Boolean := False; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCR_Register use record INSTRUCTION at 0 range 0 .. 7; IMODE at 0 range 8 .. 9; ADMODE at 0 range 10 .. 11; ADSIZE at 0 range 12 .. 13; ABMODE at 0 range 14 .. 15; ABSIZE at 0 range 16 .. 17; DCYC at 0 range 18 .. 22; Reserved_23_23 at 0 range 23 .. 23; DMODE at 0 range 24 .. 25; FMODE at 0 range 26 .. 27; SIOO at 0 range 28 .. 28; Reserved_29_29 at 0 range 29 .. 29; DHHC at 0 range 30 .. 30; DDRM at 0 range 31 .. 31; end record; subtype PIR_INTERVAL_Field is HAL.UInt16; -- polling interval register type PIR_Register is record -- Polling interval INTERVAL : PIR_INTERVAL_Field := 16#0#; -- unspecified Reserved_16_31 : HAL.UInt16 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for PIR_Register use record INTERVAL at 0 range 0 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; subtype LPTR_TIMEOUT_Field is HAL.UInt16; -- low-power timeout register type LPTR_Register is record -- Timeout period TIMEOUT : LPTR_TIMEOUT_Field := 16#0#; -- unspecified Reserved_16_31 : HAL.UInt16 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for LPTR_Register use record TIMEOUT at 0 range 0 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ----------------- -- Peripherals -- ----------------- -- QuadSPI interface type QUADSPI_Peripheral is record -- control register CR : aliased CR_Register; -- device configuration register DCR : aliased DCR_Register; -- status register SR : aliased SR_Register; -- flag clear register FCR : aliased FCR_Register; -- data length register DLR : aliased HAL.UInt32; -- communication configuration register CCR : aliased CCR_Register; -- address register AR : aliased HAL.UInt32; -- ABR ABR : aliased HAL.UInt32; -- data register DR : aliased HAL.UInt32; -- polling status mask register PSMKR : aliased HAL.UInt32; -- polling status match register PSMAR : aliased HAL.UInt32; -- polling interval register PIR : aliased PIR_Register; -- low-power timeout register LPTR : aliased LPTR_Register; end record with Volatile; for QUADSPI_Peripheral use record CR at 16#0# range 0 .. 31; DCR at 16#4# range 0 .. 31; SR at 16#8# range 0 .. 31; FCR at 16#C# range 0 .. 31; DLR at 16#10# range 0 .. 31; CCR at 16#14# range 0 .. 31; AR at 16#18# range 0 .. 31; ABR at 16#1C# range 0 .. 31; DR at 16#20# range 0 .. 31; PSMKR at 16#24# range 0 .. 31; PSMAR at 16#28# range 0 .. 31; PIR at 16#2C# range 0 .. 31; LPTR at 16#30# range 0 .. 31; end record; -- QuadSPI interface QUADSPI_Periph : aliased QUADSPI_Peripheral with Import, Address => System'To_Address (16#A0001000#); end STM32_SVD.QUADSPI;
lib/3d/culling.asm
bitshifters/teletextr
8
2968
;---------------------------------------------------------------------------------------------------------- ; perform hidden surface removal for the current model ;---------------------------------------------------------------------------------------------------------- ; inputs - ; prior to calling this routine, load_next_model has set the opposites lookups to point to the current model's ; opposites array ; oldsurfs, contains copy of previous visible surfs bit array (or &ffff on first render of this model) ; ; outputs - ; surfs contains 16 bit array of visible surfaces [where (bit == 1) ? hidden : visible] ; oldsurfs = surfs ; ;---------------------------------------------------------------------------------------------------------- ; Back face culling can be CPU expensive, due to the need for cross product multiplications for visibility determination ; This routine uses four clever optimization techniques, that take advantage of the following observations: ; 1 - 3D models that are backface culled have a finite number of surfaces (maxvis) that can ever be visible at once ; 2 - visible surfaces tend to be consistently visible over multiple render frames ; 3 - 3D models tend to contain surfaces that are in direct opposition ; 4 - cross product implemented using a factored equation and table lookup based multiplication ; ; For 1, the routine has an early out once the maxvis surface visibility counter is reached, eliminating redundant visibility checks ; For 2, the routine first rechecks only surfaces that were previously visible on the last render frame ; which increases probability of early-out with the minimum number (maxvis) of visibility calcs ; For 3, when calculating a surfaces visibility, the routine eliminates any opposite surfaces from ; further visibility calcs, which further reduces the number of overall visibility calculations that are required. ;---------------------------------------------------------------------------------------------------------- .hiddensurfaceremoval ; set number of visible surfaces to zero LDA#0:STA visible ; oldsurfs = 16 bit array, where set bits mean surface is hidden, clear bits mean surface is visible ; surfs = 16 bit array, where set bits mean surface is hidden, clear bits mean surface is visible ; surfsdone = 16 bit array, where set bits mean surface has been processed this frame ; store inverted version of oldsurfs in surfsdone ; surfsdone = oldsurfs EOR &ffff ; this effectively means any previously visible surfaces are pre-marked as done ; as far as the second phase of surface visibility testing goes. ; we can then deal with these specific cases in just the first phase. LDA oldsurfs:EOR #&FF:STA surfsdone LDA oldsurfs+1:EOR #&FF:STA surfsdone+1 ; setup loop - bring the relevant bits of oldsurfs to the top of oldsurfs ; a=15-nsurfs ; if nsurfs == 15, skip the unused bits shift LDA#&F:SEC:SBC nsurfs:BEQ nloop ; discard unused bits in the oldsurfs bit array by shifting them out ; n = 15-nsurfs ; for y=n; y>0; y--) ; oldsurfs <<= 1 TAY LDA oldsurfs .loop8 ASL A:ROL oldsurfs+1:DEY:BNE loop8 STA oldsurfs ; now, the topmost bits in oldsurfs contains only the relevant bits we want to look at .nloop ; first phase - re-check visibility of previously visible surfaces ; ; 1. loop through all surfaces, and check visibility only of those that were previously visible. ; 2. any that still remain visible have their opposite surface (if any) marked as hidden/done ; 3. maintain a counter of surfaces we know are visible in this render frame ; ; for Y=nsurfs, y>=0, --y LDY nsurfs .loop9 ; grab the next visibility bit from the top of oldsurfs ; oldsurfs << 1, top bit into carry ASL oldsurfs:ROL oldsurfs+1 ; check if this surface was previously hidden ; if C is set, this surface was previously hidden so, ; skip first phase visibility test, as we're only interested in visible surfaces for this phase BCS hidesurface ; else ; test visibility of surface Y, to see if it is still visible JSR clockwisetest:BCS hidesurface ; yep, surface Y is still visible, so mark it's opposite as 'done' (ie. deduced to be not visible) ; fetch the 16-bit opposite data array for this surface ; and mark the opposite surface id as processed ; x=y*2 (word indexing for opposites array) TYA:ASL A:TAX ; surfsdone |= opposites[y] .opposite0 LDA &8000,X:INX ORA surfsdone:STA surfsdone .opposite1 LDA &8000,X ORA surfsdone+1:STA surfsdone+1 ; ++visible INC visible ; carry bit is clear (visible surface) .hidesurface ; if we reached here because a previously visible surface is now hidden, the carry bit will be set ; update surfs bit array ; surfs = (surfs << 1) | (carryset ? 1 : 0) ROL surfs:ROL surfs+1 DEY:BPL loop9 ; now we have the bottom nsurf bits of surfs representing correct visibility status for any previously visible surfaces ; however any previously hidden surfaces may not have correct representation in the surfs bit array at this stage. ; if visible == maxvis however, that wont matter because we've already determined all possible visible surfaces ; and we'll early out of the routine, however if visible != maxvis, we'll correct these bits in the next phase. ; SM: Possible bug here? - since we're not marking the phase 1 visible surfaces as done, ; if visible != maxvis, wont we end up potentially re-calculating the same visible surfaces? ; ------------------------------------------------- ; second phase, loop again through each surface in the model ; if not 'done', check visibility, update surfs bit array and mark it (and it's opposite) as done ; importantly, we early exit once we've counted 'maxvis' visible surfaces ; - thanks to the first phase loop, there's much higher probability of this early exit happening quickly ; for y=nsurfs; y>=0; --y LDY nsurfs ; currentsurfacebit = bits[y] ; (oldsurfs gets reused as a temp var in this section) LDA bits,Y:STA oldsurfs LDA bits+16,Y:STA oldsurfs+1 .loopA ; early out optimization ; if (visible == maxvis) for this model ; - early exit as there's no need to process any more surfaces since we've hit maxvis limit LDX visible:CPX maxvis:BEQ doneit ; check if current surface has already been 'done', and skip the clockwise test if so ; if (surfsdone & currentsurfacebit) ; continue; LDA surfsdone:AND oldsurfs:BNE surfdone LDA surfsdone+1:AND oldsurfs+1:BNE surfdone ; otherwise check if surface is visible JSR clockwisetest:BCS surfdone ; surface is indeed visible, ; so clear the bit for this surface in surfs bit array by masking surfs with inverse currentsurfacebit ; ; surfs = (currentsurfacebit EOR &FFFF) & surfs LDA oldsurfs:EOR #&FF:AND surfs:STA surfs LDA oldsurfs+1:EOR #&FF:AND surfs+1:STA surfs+1 ; X=y*2 for word addressing ; mark the surface opposite this one as done ; surfsdone |= opposite[y] TYA:ASL A:TAX .opposite2 LDA &8000,X:INX ORA surfsdone:STA surfsdone .opposite3 LDA &8000,X ORA surfsdone+1:STA surfsdone+1 ; visible++ INC visible .surfdone ; currentsurfacebit >>= 1 LSR oldsurfs+1:ROR oldsurfs ; continue DEY:BPL loopA ; .doneit ; surfs now contains 16-bit array, where bit clear for visible surface, bit set for hidden surface ; oldsurfs = surfs ; return surfs[] - 16 bit array, where any bit set indicates a hidden surface LDA surfs:STA oldsurfs LDA surfs+1:STA oldsurfs+1 RTS ;---------------------------------------------------------------------------------------------------------- ; perform a clockwise orientation test for a given surface ;---------------------------------------------------------------------------------------------------------- ; ; on entry, Y is the index of the surface being tested ; ; on exit, carry is set if surface is in anti-clockwise presentation (ie. hidden) ; Y is preserved ; ; prior to calling this routine, load_next_model has stored the ; pointers to the surface data for the model into clock0/1/2 ; ; surfaces are represented as 3 points representing a triangle, presented in CW winding order ; culling is determined by detecting CCW presentation of the surface vertices in screen space ; ; cross product method: ; a = 1/2 * sum[0 to (n - 1)] of ( XiY((i+1) mod n) - X((i+1) mod n)Yi ) ; a = x0*y1 - x1*y0 ; a += x1*y2 - x2*y1 ; a += x2*y0 - x0*y2 ; a *= 0.5 ; if a > 0 then CCW ; if a < 0 the CW ; if a == 0 then back facing ; mac = sx0*sy1-sx1*sy0+sx1*sy2-sx2*sy1+sx2*sy0-sx0*sy2 ; SX0*SY1+SX1*SY2+SX2*SY0-SX0*SY2-SX1*SY0-SX2*SY1 ; alternative: ; (y1 - y0) * (x2 - x1) - (x1 - x0) * (y2 - y1) ; (a+b) (a-b) = a x a + a x -b + b x a + b x -b ; sy1*sx2-sx1*sy1-sy0*sx2+sx1*sy0-sx1*sy2-sy1*sx1-sx0*sy2+sy1*sx0 ; if positive, surface is visible ;---------------------------------------------------------------------------------------------------------- .clockwisetest ; store surface id being tested STY ls ; getcoordinates routine returns screen x in A and screen y in Y ; fetch screen coordinate for surface point 0 .clock0 LDX &8000,Y JSR getcoordinates STA x0:STY y0 ; fetch screen coordinate for surface point 1 LDY ls .clock1 LDX &8000,Y JSR getcoordinates STA x1:STY y1 ; fetch screen coordinate for surface point 2 LDY ls .clock2 LDX &8000,Y JSR getcoordinates ; now: ; x0,y0 = point 0 on the surface tri ; y1,y1 = point 1 on the surface tri ; A,Y = point 2 on the surface tri LDX#0 ; abs(x2-x0) SEC SBC x0:BCS x20p ; if x2 > x0, negate result, increment counter X SBC#0:EOR #&FF ; sets carry INX .x20p STA lmul0 ; carry is set ; abs(y1-y0) LDA y1:SBC y0:BCS y10p ; if y1 > y0, negate result, decrement counter X SBC#0:EOR #&FF ; sets carry DEX .y10p STA lmul1 ; ; abs(y2-y0) TYA:LDY#0 SBC y0:BCS y20p SBC#0:EOR #&FF:INY .y20p STA rmul0 ; abs(x1-x0) LDA x1:SBC x0:BCS x10p SBC#0:EOR #&FF:DEY .x10p STA rmul1 ; X contains 1,0, or 255 for the x2-x0 and y1-y0 test ; Y contains 1,0, or 255 for the y2-y0 and x1-x0 test ; 1 or 255 if just one test was less than the other ; 0 if both tests were less than the other ; 0 if both tests were greater than the other ; compare the results from both tests STX cnt CPX#1 ; set carry if X >= 1 (ie. not zero) TYA EOR cnt ; 1 eor 0 = 1, bit 0 set ; 0 eor 255 = 255, bit 0 set ; 1 eor 1 = 0, bit 0 clear ; 1 eor 255 = 254, bit 0 clear ; if bit 0 is clear, compute full outer product AND #1:BEQ compare ; otherwise: ; preserve Y and return ; carry bit is set = surface is hidden/CCW LDY ls RTS ; if X = 0, carry is clear, both terms are positive ; .compare BCC bothpos ; JSR multiply LDY lhs:CPY rhs ; carry set if rhs >= lhs LDA lhs+1:SBC rhs+1 ; preserve Y and return LDY ls RTS .bothpos SEC JSR multiply LDY rhs:CPY lhs LDA rhs+1:SBC lhs+1 ; preserve Y and return LDY ls RTS ;---------------------------------------------------------------------------------------------------------- ; outer/cross product multiplication ;---------------------------------------------------------------------------------------------------------- ; inputs: ; lmul0, lmul1 contain 1st two terms (8-bit values) ; rmul0, rmul1 contain 2nd two terms (8-bit values) ; returns: ; lmul0 * lmul1 in lhs (16-bits) ; rmul0 * rmul1 in rhs (16-bits) ;---------------------------------------------------------------------------------------------------------- .multiply { LDY lmul1:TYA LDX lmul0:STX lmul1 SBC lmul0:BCS mabsl SBC#0:EOR #&FF .mabsl TAX LDA(lmul0),Y:SBC SQUARETABLE1_LSB,X:STA lhs LDA(lmul1),Y:SBC SQUARETABLE1_MSB,X:STA lhs+1 LDY rmul1:TYA LDX rmul0:STX rmul1 SBC rmul0:BCS mabsr SBC#0:EOR #&FF .mabsr TAX LDA(rmul0),Y:SBC SQUARETABLE1_LSB,X:STA rhs LDA(rmul1),Y:SBC SQUARETABLE1_MSB,X:STA rhs+1 RTS } ;---------------------------------------------------------------------------------------------------------- ; Initialise the line visibility array based on culling preference ;---------------------------------------------------------------------------------------------------------- .resetvisibility { ; use culling value to reset the lines array ; if culling is on, they are reset to zero (and line visibility set to surface visibiity) ; if culling is off, they are all set to 255 (and line visibility is forced) LDA culling EOR #&FF TAY ; reset the 64-bit line visibility array STY line STY line+1 STY line+2 STY line+3 STY line+4 STY line+5 STY line+6 STY line+7 RTS } ;---------------------------------------------------------------------------------------------------------- ; Determine the minimum set of lines to be rendered for the current model based on currently visible surfaces ;---------------------------------------------------------------------------------------------------------- ; inputs - ; (lines) points to the lines data block for this model ; surfs contains 16-bit array of visible surfaces ; outputs - ; line[] contains 64-bit array of visible lines to be rendered ; surfs >>= nsurfs ;---------------------------------------------------------------------------------------------------------- ; given the list of visible surfaces ; set a bit in the 64-bit output array (ZP "line") array for each line ; that is associated with the visible surface ; 8 bits x 8 bytes = 64 bits, or 64 lines per object ; in this way, lines are only ever drawn once, even if shared across surfaces ;---------------------------------------------------------------------------------------------------------- .hiddenlineremoval { LDY #0 LDX nsurfs ; for y=0; y<nsurfs; ++y ; if visible ; line[] |= model.lines[surface] ; (OR the 8 byte array of line bits set for this surface) .loopC ; surfs >>= 1 (low bit into carry) ; if low bit was set, surface is not visible LSR surfs+1:ROR surfs:BCS nosurf IF WIREFRAME LDA(lines),Y:ORA line:STA line:INY LDA(lines),Y:ORA line+1:STA line+1:INY LDA(lines),Y:ORA line+2:STA line+2:INY LDA(lines),Y:ORA line+3:STA line+3:INY LDA(lines),Y:ORA line+4:STA line+4:INY LDA(lines),Y:ORA line+5:STA line+5:INY LDA(lines),Y:ORA line+6:STA line+6:INY LDA(lines),Y:ORA line+7:STA line+7:INY ELSE LDA(lines),Y:EOR line:STA line:INY LDA(lines),Y:EOR line+1:STA line+1:INY LDA(lines),Y:EOR line+2:STA line+2:INY LDA(lines),Y:EOR line+3:STA line+3:INY LDA(lines),Y:EOR line+4:STA line+4:INY LDA(lines),Y:EOR line+5:STA line+5:INY LDA(lines),Y:EOR line+6:STA line+6:INY LDA(lines),Y:EOR line+7:STA line+7:INY ENDIF DEX:BPL loopC RTS ; skip to lines entry for the next surface .nosurf TYA:ADC#7:TAY DEX:BPL loopC RTS } ;---------------------------------------------------------------------------------------------------------- ; surface index to 16-bit bitmask ; lookup table ;---------------------------------------------------------------------------------------------------------- ; used by hiddensurfaceremoval routine to convert a surface id to a bitfield for use with surfs array ; supports maximum 16 surfaces ; SM: could ALIGN 32 this table to ensure no page boundary cycle hits, but might waste a few bytes and not sure its worth the memory/speed tradeoff. .bits ; lsb table for surface ID[0-7] EQUB 1,2,4,8,16,32,64,128 EQUD 0:EQUD 0 ; msb table for surface ID[8-15] EQUD 0:EQUD 0 EQUB 1,2,4,8,16,32,64,128
src/stat-interrupt/stat-int-ncmBE.asm
c-sp/age-test-roms
0
97742
; Verified: ; 2021-10-21 pass: CPU CGB E - CPU-CGB-06 ; 2021-10-21 pass: CPU CGB B - CPU-CGB-02 ; 2021-10-21 fail: DMG-CPU C (blob) - DMG-CPU-08 ; INCLUDE "hardware.inc" DEF CART_COMPATIBILITY EQU CART_COMPATIBLE_DMG DEF CART_REQUIRES_NON_CGB_MODE EQU 1 INCLUDE "stat-interrupt/stat-int.inc"
widgets/current-track.applescript
zweck/ubersicht-widgets
5
436
set info to "" -- Set our list of players set apps to {"iTunes", "Spotify"} try set songname to (do shell script "/usr/local/bin/mpc current --format=%title%") set songartist to do shell script "/usr/local/bin/mpc current --format=%artist%" on error e -- end try -- Loop over that list repeat with musicApp in apps -- Check if the app is running. tell application "System Events" to set isRunning to (name of processes) contains musicApp -- If it is, then try to get the data if isRunning is true then try -- This is required to not have AppleScript freak out about missing terms.. using terms from application "iTunes" tell application musicApp if player state is playing then set songname to name of current track set songartist to album artist of current track if (songartist = "") then set songartist to artist of current track end if end if end tell end using terms from on error e -- end try end if end repeat set info to songartist & " - " & songname return info
python_src/other/export/screen_3_3.asm
fjpena/sword-of-ianna-msx2
43
100085
<reponame>fjpena/sword-of-ianna-msx2 org $0000 ; Object types OBJECT_NONE EQU 0 OBJECT_SWITCH EQU 1 OBJECT_DOOR EQU 2 OBJECT_DOOR_DESTROY EQU 3 OBJECT_FLOOR_DESTROY EQU 4 OBJECT_WALL_DESTROY EQU 5 OBJECT_BOX_LEFT EQU 6 OBJECT_BOX_RIGHT EQU 7 OBJECT_JAR EQU 8 OBJECT_TELEPORTER EQU 9 ; Pickable object types OBJECT_KEY_GREEN EQU 11 OBJECT_KEY_BLUE EQU 12 OBJECT_KEY_YELLOW EQU 13 OBJECT_BREAD EQU 14 OBJECT_MEAT EQU 15 OBJECT_HEALTH EQU 16 OBJECT_KEY_RED EQU 17 OBJECT_KEY_WHITE EQU 18 OBJECT_KEY_PURPLE EQU 19 ; Object types for enemies OBJECT_ENEMY_SKELETON EQU 20 OBJECT_ENEMY_ORC EQU 21 OBJECT_ENEMY_MUMMY EQU 22 OBJECT_ENEMY_TROLL EQU 23 OBJECT_ENEMY_ROCK EQU 24 OBJECT_ENEMY_KNIGHT EQU 25 OBJECT_ENEMY_DALGURAK EQU 26 OBJECT_ENEMY_GOLEM EQU 27 OBJECT_ENEMY_OGRE EQU 28 OBJECT_ENEMY_MINOTAUR EQU 29 OBJECT_ENEMY_DEMON EQU 30 OBJECT_ENEMY_SECONDARY EQU 31 Screen_3_3: DB 36, 62, 61, 76, 29, 65, 0, 0, 144, 0, 146, 0, 35, 36, 0, 0 DB 74, 69, 41, 70, 35, 39, 0, 145, 0, 0, 147, 0, 73, 17, 0, 0 DB 76, 49, 50, 49, 73, 132, 33, 146, 0, 0, 0, 0, 66, 65, 0, 0 DB 74, 0, 33, 34, 66, 18, 0, 0, 144, 0, 0, 34, 75, 76, 0, 0 DB 76, 61, 62, 61, 35, 76, 34, 147, 0, 0, 0, 0, 16, 17, 0, 0 DB 74, 69, 41, 70, 73, 74, 33, 0, 146, 0, 145, 33, 39, 18, 0, 0 DB 76, 50, 49, 50, 29, 65, 0, 0, 147, 0, 0, 146, 132, 36, 0, 0 DB 74, 13, 33, 34, 75, 76, 34, 0, 0, 147, 0, 0, 73, 17, 0, 0 DB 76, 0, 12, 13, 16, 17, 163, 142, 162, 37, 142, 142, 29, 65, 10, 11 DB 0, 0, 0, 0, 12, 13, 244, 245, 246, 247, 244, 245, 10, 11, 0, 0 HardScreen_3_3: DB 85, 85, 85, 85 DB 85, 80, 0, 85 DB 85, 80, 0, 85 DB 85, 80, 0, 85 DB 85, 80, 0, 85 DB 85, 80, 0, 85 DB 85, 80, 0, 85 DB 85, 80, 0, 85 DB 85, 80, 0, 85 DB 85, 85, 85, 85 Obj_3_3: DB 1 ; PLAYER DB 0, OBJECT_NONE, 0, 0, 0, 0 ; EMPTY ENEMY DB 0, OBJECT_NONE, 0, 0, 0, 0 ; EMPTY ENEMY DB 48, OBJECT_JAR, 7, 8, 0, 36 DB 49, OBJECT_JAR, 9, 8, 0, 36 DB 0, OBJECT_NONE, 0, 0, 0, 0 ; EMPTY OBJECT DB 0, OBJECT_NONE, 0, 0, 0, 0 ; EMPTY OBJECT DB 0, OBJECT_NONE, 0, 0, 0, 0 ; EMPTY OBJECT
Transynther/x86/_processed/NONE/_xt_/i7-7700_9_0xca_notsx.log_21829_431.asm
ljhsiun2/medusa
9
26245
.global s_prepare_buffers s_prepare_buffers: ret .global s_faulty_load s_faulty_load: push %r11 push %r13 push %r8 push %r9 push %rbx push %rdi push %rdx // Load lea addresses_D+0xa4af, %r9 nop nop and %r13, %r13 movups (%r9), %xmm5 vpextrq $1, %xmm5, %rdx add %r9, %r9 // Faulty Load lea addresses_D+0xa4af, %rbx clflush (%rbx) nop nop nop nop nop xor %r8, %r8 movb (%rbx), %dl lea oracles, %rdi and $0xff, %rdx shlq $12, %rdx mov (%rdi,%rdx,1), %rdx pop %rdx pop %rdi pop %rbx pop %r9 pop %r8 pop %r13 pop %r11 ret /* <gen_faulty_load> [REF] {'src': {'NT': True, 'AVXalign': False, 'size': 2, 'congruent': 0, 'same': False, 'type': 'addresses_D'}, 'OP': 'LOAD'} {'src': {'NT': False, 'AVXalign': False, 'size': 16, 'congruent': 0, 'same': True, 'type': 'addresses_D'}, 'OP': 'LOAD'} [Faulty Load] {'src': {'NT': False, 'AVXalign': False, 'size': 1, 'congruent': 0, 'same': True, 'type': 'addresses_D'}, 'OP': 'LOAD'} <gen_prepare_buffer> {'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 */
IlliParser.g4
benrkia/Illi
0
5301
<reponame>benrkia/Illi parser grammar IlliParser; options { tokenVocab = IlliLexer; } source : declaration* EOF ; // // Statements // declaration : varDeclarations | statement ; varDeclarations : VAR varDeclaration ( COMMA varDeclaration )* ';' ; varDeclaration : Identifier (ASSIGN assignment)? ; statement : block | printStmt | exprStmt ; exprStmt : expression ';' ; printStmt : PRINT expression ';' ; block : LBRACE declaration RBRACE ; // // Expressions // expression : comma ; comma : assignment ( COMMA assignment )* ; assignment : Identifier ASSIGN assignment | conditional ; conditional : equality (QUESTION expression COLON conditional)? ; equality : comparison ( ( NOTEQUAL | EQUAL ) comparison )* ; comparison : term ( ( GE | GT | LE | LT ) term )* ; term : factor ( ( ADD | SUB ) factor )* ; factor : unary ( ( MUL | DIV ) unary )* ; unary : ( BANG | SUB ) unary | primary ; primary : grouping | StringLiteral | NumberLiteral | BooleanLiteral | NilLiteral | Identifier | erroneousBinary ; grouping : LPAREN expression RPAREN ; erroneousBinary // Helps in providing a better error reporting for binary expressions : ( NOTEQUAL | EQUAL ) equality | ( GE | GT | LE | LT ) comparison | ( ADD ) term | ( MUL | DIV ) factor ;
oeis/145/A145563.asm
neoneye/loda-programs
11
172497
; A145563: a(0)=0 and a(n+1) = 3*a(n) + 2^(n+2). ; 0,4,20,76,260,844,2660,8236,25220,76684,232100,700396,2109380,6344524,19066340,57264556,171924740,516036364,1548633380,4646948716,13942943300,41833024204,125507461220,376539160876,1129651037060,3389020220044,10167194877860,30501853069036,91506096078020,274519361975884,823560233411300,2470684995201196,7412063575538180,22236207906483724,66708658079189540,200126042957045356,600378266310089540,1801135073808175564,5403405771180340580,16210218413052649516,48630657438181204100,145891976712590123404 mov $3,1 lpb $0 sub $0,1 add $2,$3 mov $3,$2 mul $2,2 add $1,$2 mul $1,2 lpe mov $0,$1
src/Data/List/At.agda
metaborg/mj.agda
10
3120
<reponame>metaborg/mj.agda module Data.List.At where open import Data.Nat open import Data.List open import Data.List.Relation.Unary.All hiding (map; lookup; _[_]=_) open import Data.List.Relation.Unary.Any hiding (map; lookup) open import Data.List.Membership.Propositional open import Data.List.Relation.Binary.Pointwise hiding (refl; map) open import Data.Fin hiding (_<_) open import Data.Maybe hiding (map) open import Data.Product hiding (map) open import Relation.Binary.PropositionalEquality open import Relation.Nullary maybe-lookup : ∀ {a}{A : Set a} → ℕ → List A → Maybe A maybe-lookup n [] = nothing maybe-lookup zero (x ∷ μ) = just x maybe-lookup (suc n) (x ∷ μ) = maybe-lookup n μ maybe-write : ∀ {a}{A : Set a} → ℕ → A → List A → Maybe (List A) maybe-write n _ [] = nothing maybe-write zero v (x ∷ z) = just (v ∷ z) maybe-write (suc n) v (x ∷ z) = maybe-write n v z _[_]=_ : ∀ {a}{A : Set a} → List A → ℕ → A → Set _ l [ i ]= x = maybe-lookup i l ≡ just x []=-map : ∀ {a b}{A : Set a}{B : Set b}{x} i → (l : List A) → l [ i ]= x → ∀ (f : A → B) → (map f l) [ i ]= (f x) []=-map _ [] () []=-map zero (x ∷ l) refl = λ f → refl []=-map (suc i) (x ∷ l) p = []=-map i l p at-lookup : ∀ {a}{A : Set a} → (l : List A) → (i : Fin (length l)) → l [ toℕ i ]= (lookup l i) at-lookup [] () at-lookup (x ∷ l) zero = refl at-lookup (x ∷ l) (suc i) = at-lookup l i lookup-in : ∀ {a}{A : Set a} → (l : List A) → (i : Fin (length l)) → (lookup l i) ∈ l lookup-in [] () lookup-in (x ∷ l) zero = here refl lookup-in (x ∷ l) (suc i) = there (lookup-in l i) dec-lookup : ∀ {a} {A : Set a} → (i : ℕ) → (l : List A) → Dec (∃ λ x → l [ i ]= x) dec-lookup _ [] = no (λ{ (_ , ())}) dec-lookup zero (x ∷ l) = yes (x , refl) dec-lookup (suc i) (_ ∷ l) = dec-lookup i l all-lookup : ∀ {a} {A : Set a} {l : List A} {i x p P} → l [ i ]= x → All {p = p} P l → P x all-lookup {l = []} () q all-lookup {l = x ∷ l} {zero} refl (px ∷ q) = px all-lookup {l = x ∷ l} {suc i} p (px ∷ q) = all-lookup p q []=-length : ∀ {a} {A : Set a} (L : List A) {i x} → L [ i ]= x → i < length L []=-length [] () []=-length (x ∷ L) {zero} refl = s≤s z≤n []=-length (x ∷ L) {suc i} p = s≤s ([]=-length L p) ∷ʳ[length] : ∀ {a} {A : Set a} (l : List A) x → (l ∷ʳ x) [ length l ]= x ∷ʳ[length] [] y = refl ∷ʳ[length] (x ∷ Σ) y = ∷ʳ[length] Σ y pointwise-lookup : ∀ {a b ℓ A B P l m i x} → Pointwise {a} {b} {ℓ} {A} {B} P l m → l [ i ]= x → ∃ λ y → m [ i ]= y × P x y pointwise-lookup [] () pointwise-lookup {i = zero} (x∼y ∷ q) refl = _ , refl , x∼y pointwise-lookup {i = suc i} (x∼y ∷ q) p = pointwise-lookup q p pointwise-lookup′ : ∀ {a b ℓ A B P l m i x y} → Pointwise {a} {b} {ℓ} {A} {B} P l m → l [ i ]= x → m [ i ]= y → P x y pointwise-lookup′ [] () q pointwise-lookup′ {i = zero} (x∼y ∷ z) refl refl = x∼y pointwise-lookup′ {i = suc i} (x∼y ∷ z) p q = pointwise-lookup′ z p q
runtime/sources/arm/memcmp.asm
wdv4758h/Yeppp-
30
25551
/* * Yeppp! library runtime infrastructure * * This file is part of Yeppp! library and licensed under MIT license. * See runtime/LICENSE.txt for details. * */ .include "common.inc" .syntax unified BEGIN_ARM_FUNCTION memcmp .arch armv5t TST r2, r2 BEQ .return_zero .compare_byte: LDRB r3, [r0], #1 LDRB r12, [r1], #1 SUBS r3, r12 BNE .return_sign SUBS r2, #1 BNE .compare_byte .return_zero: MOV r0, #0 BX lr .return_sign: MOV r0, r3 BX lr END_ARM_FUNCTION memcmp
examples/outdated-and-incorrect/cat/Adjoint.agda
asr/agda-kanso
1
6511
module Adjoint where import Category import Functor open Category open Functor using (Functor) module Adj where open Functor.Projections using (Map; map) data _⊢_ {ℂ ⅅ : Cat}(F : Functor ℂ ⅅ)(G : Functor ⅅ ℂ) : Set1 where adjunction : (_* : {X : Obj ℂ}{Y : Obj ⅅ} -> Map F X ─→ Y -> X ─→ Map G Y) (_# : {X : Obj ℂ}{Y : Obj ⅅ} -> X ─→ Map G Y -> Map F X ─→ Y) (inv₁ : {X : Obj ℂ}{Y : Obj ⅅ}(g : X ─→ Map G Y) -> g # * == g) (inv₂ : {X : Obj ℂ}{Y : Obj ⅅ}(f : Map F X ─→ Y) -> f * # == f) (nat₁ : {X₁ X₂ : Obj ℂ}{Y₁ Y₂ : Obj ⅅ} (f : Y₁ ─→ Y₂)(g : X₂ ─→ X₁)(h : Map F X₁ ─→ Y₁) -> (f ∘ h ∘ map F g) * == map G f ∘ (h *) ∘ g ) (nat₂ : {X₁ X₂ : Obj ℂ}{Y₁ Y₂ : Obj ⅅ} (f : Y₁ ─→ Y₂)(g : X₂ ─→ X₁)(h : X₁ ─→ Map G Y₁) -> (map G f ∘ h ∘ g) # == f ∘ (h #) ∘ map F g ) -> F ⊢ G open Adj public
src/main/antlr4/com/twineworks/tweakflow/grammar/TweakFlowLexer.g4
gitter-badger/tweakflow
1
2792
lexer grammar TweakFlowLexer; @lexer::header { import java.util.Stack; } channels { WS, COMMENTS } @lexer::members { private int stringLevel; private Stack<Integer> curlyLevels = new Stack<Integer>(); } // keywords INTERACTIVE: 'interactive'; IN_SCOPE: 'in_scope'; GLOBAL: 'global'; MODULE: 'module'; IMPORT: 'import'; EXPORT: 'export'; AS : 'as'; FROM: 'from'; ALIAS: 'alias'; META: 'meta'; DOC: 'doc'; VIA: 'via'; NIL: 'nil'; TRUE: 'true'; FALSE: 'false'; NOT: 'not'; IS: 'is'; IF: 'if'; THEN: 'then'; ELSE: 'else'; FOR: 'for'; TRY: 'try'; CATCH: 'catch'; THROW: 'throw'; LET: 'let'; DEBUG: 'debug'; TYPE_OF: 'typeof'; DEFAULT: 'default'; MATCH: 'match'; PROVIDED: 'provided'; // data types FUNCTION: 'function'; STRING: 'string'; BOOLEAN: 'boolean'; LONG: 'long'; DICT: 'dict'; LIST: 'list'; DOUBLE: 'double'; DATETIME: 'datetime'; ANY: 'any'; VOID: 'void'; LIBRARY: 'library'; // parens LP: '('; RP: ')'; LCURLY: '{' { if (stringLevel > 0){ // increase curly level on current string curlyLevels.push(curlyLevels.pop() + 1); } }; RCURLY: '}' { if (stringLevel > 0){ // decrease curly level on current string curlyLevels.push(curlyLevels.pop() - 1); // if initial curly popped, we're back in string mode again if (curlyLevels.peek() == 0){ curlyLevels.pop(); popMode(); } } }; LBLOCK: '['; RBLOCK: ']'; // operators GENERATOR: '<-'; THREAD: '->>'; ZERO_SHIFT_RIGHT: '>>>'; PRESERVING_SHIFT_RIGHT: '>>'; SHIFT_LEFT: '<<'; COMMA: ','; IEQ: '==='; EQ: '=='; DEFEQ: '='; COLON: ':'; EXCL: '!'; PLUS: '+'; MINUS: '-'; LTE: '<='; LT: '<'; GTE: '>='; GT: '>'; INTDIV: '//'; DIV: '/'; MOD: '%'; NIEQ: '!=='; NEQ: '!='; POW: '**'; STAR: '*'; ANDT: 'and'; ORT: 'or'; AND: '&&'; BIT_AND: '&'; OR: '||'; BIT_OR: '|'; BIT_XOR: '^'; RET: '->'; SPLAT: '...'; CONCAT: '..'; DOT: '.'; SQ: '\''; BACKSLASH: '\\'; TILDE: '~'; DOLLAR: '$'; DOUBLE_COLON: '::'; AT: '@'; MODULE_REF: 'module::'; LIBRARY_REF: 'library::'; GLOBAL_REF: 'global::'; DT : DATE'T'(TIME(OFFSET|(OFFSET TZ)|TZ)?)? ; fragment YEAR: ('+'|'-')? DIGIT? DIGIT? DIGIT? DIGIT? DIGIT? DIGIT? DIGIT? DIGIT? DIGIT? DIGIT; fragment DATE: YEAR '-' DIGIT+ '-' DIGIT+; fragment TIME: DIGIT+':'DIGIT+':' DIGIT+('.'DIGIT+)?; fragment OFFSET: (('+'|'-')DIGIT+':'DIGIT+)|'Z'; fragment TZ: '@' (TZ_NAME | ID_ESCAPED | ID); fragment TZ_NAME: [a-zA-Z_]+('/'[a-zA-Z0-9_?]+)+; INT : DIGIT DIGIT* ; HEX : '0x' BYTE BYTE? BYTE? BYTE? BYTE? BYTE? BYTE? BYTE? ; fragment DIGIT: [0-9]; fragment BYTE: HEXDIGIT HEXDIGIT; fragment HEXDIGIT: DIGIT|[a-fA-F]; DBL : INT? '.' INT EXP? | INT ('.'INT)? EXP | NAN | INFINITY ; fragment EXP: ('e'|'E')('+'|'-')? INT; fragment NAN: 'NaN'; fragment INFINITY: 'Infinity'; IDENTIFIER : ID | ID_ESCAPED ; KEY : ':' ID | ':' ID_ESCAPED ; WHITESPACE : [ \t\r\n]+ -> channel(WS) ; END_OF_STATEMENT : ';' ; fragment NEWLINE : '\r'? '\n' ; fragment ID: [a-zA-Z_][a-zA-Z_0-9?]*; fragment ID_ESCAPED: '`'.+?'`'; //----------- // Strings //----------- // heredoc string HEREDOC_STRING : '~~~' NEWLINE '~~~' | '~~~' NEWLINE .*? NEWLINE '~~~' ; // verbatim string // no interpolation // enclosed in single quotes // single quote escaped by another single quote // // VSTRING : '\'' VSTRING_ELEMENT* '\'' ; fragment VSTRING_ELEMENT : (VSTRING_CHAR+|VSTRING_ESCAPE_SEQUENCE) ; fragment VSTRING_CHAR : ~('\'') ; fragment VSTRING_ESCAPE_SEQUENCE : '\'\'' ; // string // enclosed in double quotes // standard escape sequences STRING_BEGIN : '"' { stringLevel++; } -> pushMode(StringMode) ; INLINE_COMMENT : '/*' (INLINE_COMMENT|.)*? '*/' -> channel(COMMENTS) ; LINE_COMMENT : '#' .*? (NEWLINE|EOF) -> channel(COMMENTS) ; mode StringMode; STRING_ESCAPE_SEQUENCE : '\\\\' | '\\"' | '\\t' | '\\#{' | '\\n' | '\\r' | '\\u' BYTE BYTE | '\\U' BYTE BYTE BYTE BYTE ; STRING_INTERPOLATION : '#{' { curlyLevels.push(1); } -> pushMode(DEFAULT_MODE) ; STRING_TEXT : ~('"'|'\\'|'#')+ | '#'~'{' ; STRING_END : '"' { stringLevel--; } -> popMode ; UNRECOGNIZED_STRING_ESCAPE_SEQUENCE : '\\'(.)+? ;
Documentation/Code/echo.asm
geoffthorpe/ant-architecture
0
7075
<reponame>geoffthorpe/ant-architecture<gh_stars>0 # $Id: echo.asm,v 1.2 2000/11/22 00:29:59 ellard Exp $ # # <NAME> - 11/10/96 # # Echos input. # # See cat.asm for the same basic program, coded # in a slightly different style. # # Register usage: # # r2 - holds each character read in. # r3 - address of $print. # lc r3, $print loop: sys r2, 0x6 # r2 = getchar (); beq r3, r1, r0 # if not at EOF, go to $print. jmp $exit # otherwise, go to $exit. print: sys r2, 0x3 # putchar (r2); jmp $loop # iterate, go back to $loop exit: sys r0, 0 # just halt; nothing else to do. # end of echo.asm
pin-3.22-98547-g7a303a835-gcc-linux/source/tools/Mix/assy-support-ia32.asm
ArthasZhang007/15418FinalProject
0
164436
; ; Copyright (C) 2008-2012 Intel Corporation. ; SPDX-License-Identifier: MIT ; .686 .xmm .model flat,c .CODE ALIGN 4 mix_fp_save PROC mov ecx, DWORD PTR[esp+4] fxsave BYTE PTR [ecx] emms ret mix_fp_save ENDP .CODE ALIGN 4 mix_fp_restore PROC mov ecx, DWORD PTR[esp+4] fxrstor BYTE PTR [ecx] ret mix_fp_restore ENDP END
hott/level/closure/core.agda
HoTT/M-types
27
7868
{-# OPTIONS --without-K #-} module hott.level.closure.core where open import level open import decidable open import equality open import function.isomorphism.core -- open import function.isomorphism.properties open import sum open import hott.level.core open import hott.equivalence.core open import hott.univalence open import sets.nat.core -- open import sets.nat.ordering.leq.core -- open import sets.nat.ordering.leq.decide open import sets.empty open import sets.unit Σ-contr : ∀ {i j}{X : Set i}{Y : X → Set j} → contr X → ((x : X) → contr (Y x)) → contr (Σ X Y) Σ-contr {X = X}{Y = Y} (x₀ , cx) hY = (x₀ , proj₁ (hY x₀)) , λ { (x , y) → c x y } where c : (x : X)(y : Y x) → (x₀ , proj₁ (hY x₀)) ≡ (x , y) c x y = ap (λ x → (x , proj₁ (hY x))) (cx x) · ap (_,_ x) (proj₂ (hY x) y) ×-contr : ∀ {i j}{X : Set i}{Y : Set j} → contr X → contr Y → contr (X × Y) ×-contr hX hY = Σ-contr hX (λ _ → hY) unique-contr : ∀ {i}{A B : Set i} → contr A → contr B → A ≡ B unique-contr {i}{A}{B} hA hB = ≈⇒≡ (f , f-we) where f : A → B f _ = proj₁ hB f-we : weak-equiv f f-we b = ×-contr hA (h↑ hB _ _) -- h-≤ : ∀ {i n m}{X : Set i} -- → n ≤ m → h n X → h m X -- h-≤ {m = 0} z≤n hX = hX -- h-≤ {m = suc m} z≤n hX = λ x y -- → h-≤ {m = m} z≤n (h↑ hX x y) -- h-≤ (s≤s p) hX = λ x y -- → h-≤ p (hX x y) -- -- h! : ∀ {i n m}{X : Set i} -- → {p : True (n ≤? m)} -- → h n X → h m X -- h! {p = p} = h-≤ (witness p) abstract -- retractions preserve levels retract-level : ∀ {i j n} {X : Set i}{Y : Set j} → (f : X → Y)(g : Y → X) → ((y : Y) → f (g y) ≡ y) → h n X → h n Y retract-level {n = 0}{X}{Y} f g r (x , c) = (f x , c') where c' : (y : Y) → f x ≡ y c' y = ap f (c (g y)) · r y retract-level {n = suc n}{X}{Y} f g r hX = λ y y' → retract-level f' g' r' (hX (g y) (g y')) where f' : {y y' : Y} → g y ≡ g y' → y ≡ y' f' {y}{y'} p = sym (r y) · ap f p · r y' g' : {y y' : Y} → y ≡ y' → g y ≡ g y' g' = ap g r' : {y y' : Y}(p : y ≡ y') → f' (g' p) ≡ p r' {y}{.y} refl = ap (λ α → α · r y) (left-unit (sym (r y))) · right-inverse (r y) iso-level : ∀ {i j n}{X : Set i}{Y : Set j} → X ≅ Y → h n X → h n Y iso-level (iso f g H K) = retract-level f g K
scripts/switch_input_language.scpt
p-becker/dotfiles
1
1787
<reponame>p-becker/dotfiles<filename>scripts/switch_input_language.scpt tell application "System Events" key code 111 end tell
test/Succeed/Issue1914.agda
shlevy/agda
3
12294
<reponame>shlevy/agda {-# OPTIONS -v tc.size:100 #-} -- {-# OPTIONS -v tc.meta:100 #-} open import Common.Size using (Size; Size<_) postulate A : Set record R (i₀ : Size) (x : A) : Set where coinductive field force : (j : Size< i₀) → R j x postulate P : (A → Set) → Set f : (Q : A → Set) (x : A) {{ c : P Q }} → Q x → Q x g : (i₁ : Size) (x : A) → R i₁ x → R i₁ x instance c : {i₂ : Size} → P (R i₂) accepted rejected : A → (x : A) (i₃ : Size) → R i₃ x → R i₃ x accepted y x i r = g _ _ (f _ _ r) rejected y x i r = g _ _ (f _ x r)
Ada/inc/Problem_38.ads
Tim-Tom/project-euler
0
18141
package Problem_38 is procedure Solve; end Problem_38;
oeis/210/A210497.asm
neoneye/loda-programs
11
96812
; A210497: 2*prime(n+1) - prime(n). ; Submitted by <NAME>(s1) ; 4,7,9,15,15,21,21,27,35,33,43,45,45,51,59,65,63,73,75,75,85,87,95,105,105,105,111,111,117,141,135,143,141,159,153,163,169,171,179,185,183,201,195,201,201,223,235,231,231,237,245,243,261,263,269,275,273,283,285,285,303,321,315,315,321,345,343,357,351,357,365,375,379,385,387,395,405,405,417,429,423,441,435,445,447,455,465,465,465,471,491,495,495,507,507,515,533,525,559,553 add $0,1 seq $0,40 ; The prime numbers. mov $1,$0 div $0,2 mul $0,2 sub $0,1 seq $0,64722 ; a(1) = 0; for n >= 2, a(n) = n - (largest prime <= n). add $1,$0 mov $0,$1 add $0,1
Transynther/x86/_processed/NONE/_xt_/i7-8650U_0xd2_notsx.log_11802_67.asm
ljhsiun2/medusa
9
4429
.global s_prepare_buffers s_prepare_buffers: push %r10 push %r15 push %r8 push %rbx push %rcx push %rdi push %rsi lea addresses_WT_ht+0x10f70, %rsi lea addresses_D_ht+0x1dd70, %rdi cmp %r15, %r15 mov $15, %rcx rep movsw nop nop nop nop cmp %r10, %r10 lea addresses_D_ht+0xec70, %r8 nop nop nop add %rbx, %rbx and $0xffffffffffffffc0, %r8 vmovaps (%r8), %ymm3 vextracti128 $1, %ymm3, %xmm3 vpextrq $0, %xmm3, %rsi nop nop xor $53127, %rbx lea addresses_UC_ht+0x1af8, %r15 clflush (%r15) nop nop nop nop nop add %rbx, %rbx mov $0x6162636465666768, %rdi movq %rdi, %xmm6 movups %xmm6, (%r15) add $6512, %rdi pop %rsi pop %rdi pop %rcx pop %rbx pop %r8 pop %r15 pop %r10 ret .global s_faulty_load s_faulty_load: push %r11 push %r14 push %r8 push %rax push %rbx push %rdi push %rdx // Store lea addresses_PSE+0x192b, %r8 clflush (%r8) nop add $22024, %rdx movl $0x51525354, (%r8) nop nop nop and $8073, %r8 // Faulty Load lea addresses_RW+0xa570, %rdi nop dec %r11 movb (%rdi), %dl lea oracles, %rbx and $0xff, %rdx shlq $12, %rdx mov (%rbx,%rdx,1), %rdx pop %rdx pop %rdi pop %rbx pop %rax pop %r8 pop %r14 pop %r11 ret /* <gen_faulty_load> [REF] {'OP': 'LOAD', 'src': {'type': 'addresses_RW', 'size': 16, 'AVXalign': False, 'NT': False, 'congruent': 0, 'same': False}} {'OP': 'STOR', 'dst': {'type': 'addresses_PSE', 'size': 4, 'AVXalign': False, 'NT': False, 'congruent': 0, 'same': False}} [Faulty Load] {'OP': 'LOAD', 'src': {'type': 'addresses_RW', 'size': 1, 'AVXalign': False, 'NT': False, 'congruent': 0, 'same': True}} <gen_prepare_buffer> {'OP': 'REPM', 'src': {'type': 'addresses_WT_ht', 'congruent': 7, 'same': True}, 'dst': {'type': 'addresses_D_ht', 'congruent': 11, 'same': False}} {'OP': 'LOAD', 'src': {'type': 'addresses_D_ht', 'size': 32, 'AVXalign': True, 'NT': False, 'congruent': 7, 'same': False}} {'OP': 'STOR', 'dst': {'type': 'addresses_UC_ht', 'size': 16, 'AVXalign': False, 'NT': False, 'congruent': 3, 'same': False}} {'32': 11802} 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 32 */
src/ada/src/services/atbb/assignment_tree_branch_bound_communication.ads
VVCAS-Sean/OpenUxAS
88
24696
with Ada.Strings.Unbounded; use Ada.Strings.Unbounded; with Common; use Common; with LMCP_Messages; use LMCP_Messages; private with UxAS.Comms.LMCP_Object_Message_Sender_Pipes; -- Package only concerned with message passing. It defines its own state, -- named Mailbox here, which is not mixed with the state of the service. package Assignment_Tree_Branch_Bound_Communication with SPARK_Mode is type Assignment_Tree_Branch_Bound_Mailbox is limited private; procedure Initialize (This : out Assignment_Tree_Branch_Bound_Mailbox; Source_Group : String; Unique_Id : Int64; Entity_Id : UInt32; Service_Id : UInt32); procedure sendBroadcastMessage (This : in out Assignment_Tree_Branch_Bound_Mailbox; Msg : Message_Root'Class); procedure sendErrorMessage (This : in out Assignment_Tree_Branch_Bound_Mailbox; Error_String : Unbounded_String); private pragma SPARK_Mode (Off); use Ada.Strings.Unbounded; use UxAS.Comms.LMCP_Object_Message_Sender_Pipes; type Assignment_Tree_Branch_Bound_Mailbox is tagged limited record Message_Sender_Pipe : LMCP_Object_Message_Sender_Pipe; Source_Group : Unbounded_String; Unique_Entity_Send_Message_Id : Int64; end record; end Assignment_Tree_Branch_Bound_Communication;
win32/lm32_lcc.asm
ystk/debian-zip
157
2727
<filename>win32/lm32_lcc.asm ;=========================================================================== ; Copyright (c) 1990-1999 Info-ZIP. All rights reserved. ; ; See the accompanying file LICENSE, version 1999-Oct-05 or later ; (the contents of which are also included in zip.h) for terms of use. ; If, for some reason, both of these files are missing, the Info-ZIP license ; also may be found at: ftp://ftp.cdrom.com/pub/infozip/license.html ;=========================================================================== ; match32.asm by <NAME>. ; match32.asm, optimized version of longest_match() in deflate.c ; To be used only with 32 bit flat model. To simplify the code, the option ; -DDYN_ALLOC is not supported. ; This file is only optional. If you don't have an assembler, use the ; C version (add -DNO_ASM to CFLAGS in makefile and remove match.o ; from OBJI). If you have reduced WSIZE in zip.h, then make sure this is ; assembled with an equivalent -DWSIZE=<whatever>. ; ; Win32 (Windows NT) version - 1994/04/13 by <NAME> ; * works with Microsoft MASM 6.1X and Microsoft Visual C++ / 32-bit edition ; ; The code in this file has been copied verbatim from match32.{asm|S}; ; only the assembler syntax and metacommands have been adapted to ; the habits of the free LCC-Win32 C compiler package. ; IMPORTANT NOTE to the Info-ZIP editors: ; The TAB characters in this source file are required by the parser of ; the LCC-Win32 assembler program and MUST NOT be removed!! ; ;============================================================================== ; ; Do NOT assemble this source if external crc32 routine from zlib gets used. ; ;/* This version is for 386 Unix or OS/2 in 32 bit mode. ; * Warning: it uses the AT&T syntax: mov source,dest ; * This file is only optional. If you want to force the C version, ; * add -DNO_ASM to CFLAGS in Makefile and set OBJA to an empty string. ; * If you have reduced WSIZE in (g)zip.h, then make sure this is ; * assembled with an equivalent -DWSIZE=<whatever>. ; * This version assumes static allocation of the arrays (-DDYN_ALLOC not used). ; */ .text .file "match.S" .text .type _match_init,function _match_init: ret _$98: .size _match_init,_$98-_match_init .globl _match_init ;/*----------------------------------------------------------------------- ; * Set match_start to the longest match starting at the given string and ; * return its length. Matches shorter or equal to prev_length are discarded, ; * in which case the result is equal to prev_length and match_start is ; * garbage. ; * IN assertions: cur_match is the head of the hash chain for the current ; * string (strstart) and its distance is <= MAX_DIST, and prev_length >= 1 ; */ .align 4 .type _longest_match,function _longest_match: ;/* int longest_match(cur_match) */ ; cur_match equ 20(%esp) ; /* return address */ /* esp+16 */ push %ebp push %edi ;/* esp+8 */ push %esi ;/* esp+4 */ push %ebx ;/* esp */ ;/* ; * match equ esi ; * scan equ edi ; * chain_length equ ebp ; * best_len equ ebx ; * limit equ edx ; */ mov 20(%esp),%esi mov _strstart,%edx mov _max_chain_length,%ebp mov %edx,%edi sub $(32768-262),%edx cld jae limit_ok sub %edx,%edx limit_ok: add $2+_window,%edi mov _prev_length,%ebx movw -2(%edi),%cx movw -3(%ebx,%edi),%ax cmp _good_match,%ebx jb do_scan shr $2,%ebp jmp do_scan .align 4 long_loop: ;/* at this point, edi == scan+2, esi == cur_match */ movw -3(%ebx,%edi),%ax movw -2(%edi),%cx short_loop: ;/* ; * at this point, di == scan+2, si == cur_match, ; * ax = scan[best_len-1..best_len] and cx = scan[0..1] ; */ and $(32768-1), %esi dec %ebp movw _prev(,%esi,2),%si jz the_end cmp %edx,%esi jbe the_end do_scan: cmpw _window-1(%ebx,%esi),%ax jne short_loop cmpw _window(%esi),%cx jne short_loop add $2+_window,%esi mov $((258>>1)-1),%ecx mov %edi,%eax repe; cmpsw ;/* loop until mismatch */ je maxmatch ;/* match of length MAX_MATCH? */ mismatch: movb -2(%edi),%cl xchg %edi,%eax subb -2(%esi),%cl sub %edi,%eax sub $2+_window,%esi sub %eax,%esi subb $1,%cl adc $0,%eax cmp %ebx,%eax jle long_loop mov %esi,_match_start mov %eax,%ebx cmp _nice_match,%eax ; /* len >= nice_match ? */ jl long_loop the_end: mov %ebx,%eax pop %ebx pop %esi pop %edi pop %ebp ret .align 4 maxmatch: cmpsb jmp mismatch _$99: .size _longest_match,_$99-_longest_match .globl _longest_match .extern _nice_match .extern _good_match .extern _max_chain_length .extern _match_start .extern _strstart .extern _prev_length .extern _prev .extern _window
oeis/207/A207167.asm
neoneye/loda-programs
11
240776
; A207167: Number of n X 6 0..1 arrays avoiding 0 0 0 and 1 0 1 horizontally and 0 0 1 and 1 0 1 vertically. ; Submitted by <NAME>(s2) ; 19,361,1482,3952,8455,15789,26866,42712,64467,93385,130834,178296,237367,309757,397290,501904,625651,770697,939322,1133920,1356999,1611181,1899202,2223912,2588275,2995369,3448386,3950632,4505527,5116605,5787514,6522016,7323987,8197417,9146410,10175184,11288071,12489517,13784082,15176440,16671379,18273801,19988722,21821272,23776695,25860349,28077706,30434352,32935987,35588425,38397594,41369536,44510407,47826477,51324130,55009864,58890291,62972137,67262242,71767560,76495159,81452221,86646042 mov $1,$0 mul $1,$0 add $0,2 mul $1,3 add $1,2 sub $1,$0 mul $1,$0 pow $0,2 bin $0,2 add $0,$1 div $0,2 sub $0,2 mul $0,19
Transynther/x86/_processed/NONE/_st_/i3-7100_9_0x84_notsx.log_21829_1624.asm
ljhsiun2/medusa
9
101208
.global s_prepare_buffers s_prepare_buffers: push %r10 push %r11 push %r8 push %r9 push %rbx push %rcx push %rdi push %rsi lea addresses_WC_ht+0x12e96, %rbx nop nop and %r9, %r9 movl $0x61626364, (%rbx) sub $514, %r8 lea addresses_WT_ht+0x742a, %r10 and $62605, %r8 mov $0x6162636465666768, %r11 movq %r11, %xmm7 vmovups %ymm7, (%r10) nop nop nop nop nop xor %r11, %r11 lea addresses_WT_ht+0x1682a, %rsi lea addresses_WT_ht+0xa45a, %rdi nop nop nop nop nop xor %r9, %r9 mov $43, %rcx rep movsw nop nop nop nop sub %rdi, %rdi lea addresses_A_ht+0x1822a, %rsi lea addresses_WC_ht+0x3d2, %rdi nop nop xor %r9, %r9 mov $57, %rcx rep movsb nop nop nop nop nop xor $51285, %rbx lea addresses_normal_ht+0x12310, %rcx clflush (%rcx) nop nop cmp $47798, %rbx mov $0x6162636465666768, %rsi movq %rsi, (%rcx) dec %r11 lea addresses_WC_ht+0x898a, %r9 nop add %r8, %r8 movb (%r9), %bl cmp %r9, %r9 lea addresses_UC_ht+0x14a8a, %rbx add %r10, %r10 movups (%rbx), %xmm1 vpextrq $0, %xmm1, %rcx nop dec %rcx lea addresses_D_ht+0x1bc9a, %r8 nop nop add %rdi, %rdi movups (%r8), %xmm1 vpextrq $1, %xmm1, %rbx nop nop dec %rbx lea addresses_A_ht+0x18d0, %rcx nop nop nop nop xor $768, %r10 and $0xffffffffffffffc0, %rcx movntdqa (%rcx), %xmm4 vpextrq $0, %xmm4, %rdi nop nop nop add %rbx, %rbx lea addresses_D_ht+0xe825, %rsi lea addresses_WC_ht+0x6a2a, %rdi nop nop nop nop add $22166, %r10 mov $119, %rcx rep movsw nop nop nop nop nop add $9056, %rbx lea addresses_UC_ht+0x1e22a, %r9 nop sub %rsi, %rsi movb (%r9), %cl nop nop nop nop nop and $47988, %rbx lea addresses_WT_ht+0x15808, %rsi lea addresses_WC_ht+0x6b8a, %rdi clflush (%rsi) xor $49684, %r9 mov $77, %rcx rep movsw nop and $63081, %rcx pop %rsi pop %rdi pop %rcx pop %rbx pop %r9 pop %r8 pop %r11 pop %r10 ret .global s_faulty_load s_faulty_load: push %r12 push %r13 push %r14 push %rax push %rcx push %rdi push %rdx push %rsi // Load lea addresses_PSE+0x13b2a, %r13 nop nop nop inc %rax mov (%r13), %rdx nop xor %r13, %r13 // REPMOV lea addresses_PSE+0x16f6, %rsi lea addresses_UC+0x422a, %rdi clflush (%rsi) nop dec %rdx mov $23, %rcx rep movsw nop cmp %rsi, %rsi // Store lea addresses_UC+0x182a2, %r14 nop nop nop inc %rsi mov $0x5152535455565758, %rax movq %rax, %xmm4 movups %xmm4, (%r14) and %rax, %rax // Faulty Load lea addresses_UC+0x422a, %rdx clflush (%rdx) nop sub $17250, %rsi vmovups (%rdx), %ymm2 vextracti128 $0, %ymm2, %xmm2 vpextrq $0, %xmm2, %r14 lea oracles, %rdi and $0xff, %r14 shlq $12, %r14 mov (%rdi,%r14,1), %r14 pop %rsi pop %rdx pop %rdi pop %rcx pop %rax pop %r14 pop %r13 pop %r12 ret /* <gen_faulty_load> [REF] {'src': {'type': 'addresses_UC', 'same': False, 'size': 1, 'congruent': 0, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} {'src': {'type': 'addresses_PSE', 'same': False, 'size': 8, 'congruent': 8, 'NT': False, 'AVXalign': True}, 'OP': 'LOAD'} {'src': {'type': 'addresses_PSE', 'congruent': 2, 'same': False}, 'dst': {'type': 'addresses_UC', 'congruent': 0, 'same': True}, 'OP': 'REPM'} {'dst': {'type': 'addresses_UC', 'same': False, 'size': 16, 'congruent': 2, 'NT': False, 'AVXalign': False}, 'OP': 'STOR'} [Faulty Load] {'src': {'type': 'addresses_UC', 'same': True, 'size': 32, 'congruent': 0, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} <gen_prepare_buffer> {'dst': {'type': 'addresses_WC_ht', 'same': False, 'size': 4, 'congruent': 1, 'NT': False, 'AVXalign': True}, 'OP': 'STOR'} {'dst': {'type': 'addresses_WT_ht', 'same': False, 'size': 32, 'congruent': 9, 'NT': False, 'AVXalign': False}, 'OP': 'STOR'} {'src': {'type': 'addresses_WT_ht', 'congruent': 5, 'same': False}, 'dst': {'type': 'addresses_WT_ht', 'congruent': 0, 'same': False}, 'OP': 'REPM'} {'src': {'type': 'addresses_A_ht', 'congruent': 9, 'same': False}, 'dst': {'type': 'addresses_WC_ht', 'congruent': 2, 'same': False}, 'OP': 'REPM'} {'dst': {'type': 'addresses_normal_ht', 'same': False, 'size': 8, 'congruent': 0, 'NT': False, 'AVXalign': True}, 'OP': 'STOR'} {'src': {'type': 'addresses_WC_ht', 'same': True, 'size': 1, 'congruent': 5, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} {'src': {'type': 'addresses_UC_ht', 'same': True, 'size': 16, 'congruent': 4, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} {'src': {'type': 'addresses_D_ht', 'same': False, 'size': 16, 'congruent': 4, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} {'src': {'type': 'addresses_A_ht', 'same': False, 'size': 16, 'congruent': 1, 'NT': True, 'AVXalign': False}, 'OP': 'LOAD'} {'src': {'type': 'addresses_D_ht', 'congruent': 0, 'same': False}, 'dst': {'type': 'addresses_WC_ht', 'congruent': 11, 'same': False}, 'OP': 'REPM'} {'src': {'type': 'addresses_UC_ht', 'same': False, 'size': 1, 'congruent': 11, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} {'src': {'type': 'addresses_WT_ht', 'congruent': 1, 'same': False}, 'dst': {'type': 'addresses_WC_ht', 'congruent': 4, 'same': True}, 'OP': 'REPM'} {'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 */
Finder/Copy-Path-as-Alias.applescript
boisy/AppleScripts
116
3633
<reponame>boisy/AppleScripts use AppleScript version "2.4" -- Yosemite (10.10) or later use framework "Foundation" use scripting additions -- classes, constants, and enums used property NSString : a reference to current application's NSString tell application "Finder" to set thePath to POSIX path of (selection as alias) set the clipboard to "\"" & my encodePosixtoHFS(thePath) & "\" as alias" display notification (the clipboard) with title "Clipboard Set" on encodePosixtoHFS(theString) if theString contains "~" then set theString to my SearchandReplace(theString, "~", path to home folder as string) if theString starts with "/Users" then set theString to "Macintosh HD" & theString if theString contains "\\" then set theString to my SearchandReplace(theString, "\\", "") if theString contains "\"" then set theString to my SearchandReplace(theString, "\"", "") return my SearchandReplace(theString, "/", ":") end encodePosixtoHFS on SearchandReplace(sourceText, replaceThis, withThat) set theString to NSString's stringWithString:sourceText set theString to theString's stringByReplacingOccurrencesOfString:replaceThis withString:withThat return theString as text end SearchandReplace
MySource/29-jmp grater lerg or 0.asm
mdabdullahibnaharun/Assembly-Language
0
85549
; You may customize this and other start-up templates; ; The location of this template is c:\emu8086\inc\0_com_template.txt org 100h .model small .stack 100h .data msg1 db 10,13,"Enter Number: $" msg2 db 10,13,"Number is Positive$" msg3 db 10,13,"Number Is Negative$" msg4 db 10,13,"Number is Zero $" .code main proc mov ax,@data mov ds,ax mov dx,offset msg1 ; Disply msg mov ah,9 int 21h mov ah,1 int 21h mov bl,al mov cl,30h ; ascii code for < or > cmp bl,cl jg positive jl negative je zero positive: lea dx,msg2 mov ah,9 int 21h mov ah,4ch int 21h negative: lea dx,msg3 mov ah,9 int 21h mov ah,4ch int 21h zero: lea dx,msg4 mov ah,9 int 21h mov ah,4ch int 21h main endp end main ret
prototyping/Examples/Type.agda
Tr4shh/Roblox-Luau
0
5013
module Examples.Type where open import Agda.Builtin.Equality using (_≡_; refl) open import FFI.Data.String using (_++_) open import Luau.Type using (nil; _∪_; _∩_; _⇒_) open import Luau.Type.ToString using (typeToString) ex1 : typeToString(nil) ≡ "nil" ex1 = refl ex2 : typeToString(nil ⇒ nil) ≡ "(nil) -> nil" ex2 = refl ex3 : typeToString(nil ⇒ (nil ⇒ nil)) ≡ "(nil) -> (nil) -> nil" ex3 = refl ex4 : typeToString(nil ∪ (nil ⇒ (nil ⇒ nil))) ≡ "((nil) -> (nil) -> nil)?" ex4 = refl ex5 : typeToString(nil ⇒ ((nil ⇒ nil) ∪ nil)) ≡ "(nil) -> ((nil) -> nil)?" ex5 = refl ex6 : typeToString((nil ⇒ nil) ∪ (nil ⇒ (nil ⇒ nil))) ≡ "((nil) -> nil | (nil) -> (nil) -> nil)" ex6 = refl ex7 : typeToString((nil ⇒ nil) ∪ ((nil ⇒ (nil ⇒ nil)) ∪ nil)) ≡ "((nil) -> nil | (nil) -> (nil) -> nil)?" ex7 = refl
3-mid/physics/interface/source/physics-joint.ads
charlie5/lace
20
8339
with physics.Object, lace.Any; package physics.Joint -- -- Provides an interface for physics joints. -- is type Item is limited interface and lace.Any.limited_item; type View is access all Item'Class; use Math; type Degree_of_freedom is range 1 .. 6; procedure destruct (Self : in out Item) is abstract; function Object_A (Self : in Item) return physics.Object.view is abstract; function Object_B (Self : in Item) return physics.Object.view is abstract; function Frame_A (Self : in Item) return Matrix_4x4 is abstract; function Frame_B (Self : in Item) return Matrix_4x4 is abstract; procedure Frame_A_is (Self : in out Item; Now : in Matrix_4x4) is abstract; procedure Frame_B_is (Self : in out Item; Now : in Matrix_4x4) is abstract; function is_Limited (Self : in Item; DoF : Degree_of_freedom) return Boolean is abstract; procedure Velocity_is (Self : in out Item; Now : in Real; DoF : in Degree_of_freedom) is abstract; -- -- Sets the spatial or angular velocity for the specified DoF. function Extent (Self : in Item; DoF : Degree_of_freedom) return Real is abstract; -- -- Returns the current distance or angle (for a spatial or angular DoF, respectively). procedure desired_Extent_is (Self : in out Item; Now : in Real; DoF : in Degree_of_freedom) is abstract; -- -- Sets the desired spacial or angular extent for a given degree of freedom (DoF). function reaction_Force (Self : in Item) return Vector_3 is abstract; function reaction_Torque (Self : in Item) return Real is abstract; procedure user_Data_is (Self : in out Item; Now : access lace.Any.limited_item'Class) is abstract; function user_Data (Self : in Item) return access lace.Any.limited_item'Class is abstract; end physics.Joint;
alloy4fun_models/trashltl/models/5/8tppbx3iPobJ9C39F.als
Kaixi26/org.alloytools.alloy
0
2601
<filename>alloy4fun_models/trashltl/models/5/8tppbx3iPobJ9C39F.als open main pred id8tppbx3iPobJ9C39F_prop6 { all f: File | always (f in Trash since f in Trash) } pred __repair { id8tppbx3iPobJ9C39F_prop6 } check __repair { id8tppbx3iPobJ9C39F_prop6 <=> prop6o }
src/security-oauth-clients.adb
jquorning/ada-security
19
28871
<filename>src/security-oauth-clients.adb ----------------------------------------------------------------------- -- security-oauth-clients -- OAuth Client Security -- Copyright (C) 2012, 2013, 2017, 2018, 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.Exceptions; with Util.Log.Loggers; with Util.Strings; with Util.Beans.Objects; with Util.Http.Clients; with Util.Properties.JSON; with Util.Properties.Form; with Util.Encoders.HMAC.SHA1; with Security.Random; package body Security.OAuth.Clients is use Ada.Strings.Unbounded; Log : constant Util.Log.Loggers.Logger := Util.Log.Loggers.Create ("Security.OAuth.Clients"); procedure Do_Request_Token (URI : in String; Data : in Util.Http.Clients.Form_Data'Class; Cred : in out Grant_Type'Class); function Get_Expires (Props : in Util.Properties.Manager) return Natural; -- ------------------------------ -- Access Token -- ------------------------------ Random_Generator : Security.Random.Generator; -- ------------------------------ -- Generate a random nonce with at last the number of random bits. -- The number of bits is rounded up to a multiple of 32. -- The random bits are then converted to base64url in the returned string. -- ------------------------------ function Create_Nonce (Bits : in Positive := 256) return String is begin -- Generate the random sequence. return Random_Generator.Generate (Bits); end Create_Nonce; -- ------------------------------ -- Get the principal name. This is the OAuth access token. -- ------------------------------ function Get_Name (From : in Access_Token) return String is begin return From.Access_Id; end Get_Name; -- ------------------------------ -- Get the id_token that was returned by the authentication process. -- ------------------------------ function Get_Id_Token (From : in OpenID_Token) return String is begin return From.Id_Token; end Get_Id_Token; -- ------------------------------ -- Get the principal name. This is the OAuth access token. -- ------------------------------ function Get_Name (From : in Grant_Type) return String is begin return To_String (From.Access_Token); end Get_Name; -- ------------------------------ -- Get the Authorization header to be used for accessing a protected resource. -- (See RFC 6749 7. Accessing Protected Resources) -- ------------------------------ function Get_Authorization (From : in Grant_Type) return String is begin return "Bearer " & To_String (From.Access_Token); end Get_Authorization; -- ------------------------------ -- Set the OAuth authorization server URI that the application must use -- to exchange the OAuth code into an access token. -- ------------------------------ procedure Set_Provider_URI (App : in out Application; URI : in String) is begin App.Request_URI := Ada.Strings.Unbounded.To_Unbounded_String (URI); end Set_Provider_URI; -- ------------------------------ -- Build a unique opaque value used to prevent cross-site request forgery. -- The <b>Nonce</b> parameters is an optional but recommended unique value -- used only once. The state value will be returned back by the OAuth provider. -- This protects the <tt>client_id</tt> and <tt>redirect_uri</tt> parameters. -- ------------------------------ function Get_State (App : in Application; Nonce : in String) return String is Data : constant String := Nonce & To_String (App.Client_Id) & To_String (App.Callback); Hmac : String := Util.Encoders.HMAC.SHA1.Sign_Base64 (Key => To_String (App.Secret), Data => Data, URL => True); begin -- Avoid the '=' at end of HMAC since it could be replaced by %C20 which is annoying... Hmac (Hmac'Last) := '.'; return Hmac; end Get_State; -- ------------------------------ -- Get the authenticate parameters to build the URI to redirect the user to -- the OAuth authorization form. -- ------------------------------ function Get_Auth_Params (App : in Application; State : in String; Scope : in String := "") return String is begin return Security.OAuth.CLIENT_ID & "=" & Ada.Strings.Unbounded.To_String (App.Client_Id) & "&" & Security.OAuth.REDIRECT_URI & "=" & Ada.Strings.Unbounded.To_String (App.Callback) & "&" & Security.OAuth.SCOPE & "=" & Scope & "&" & Security.OAuth.STATE & "=" & State; end Get_Auth_Params; -- ------------------------------ -- Verify that the <b>State</b> opaque value was created by the <b>Get_State</b> -- operation with the given client and redirect URL. -- ------------------------------ function Is_Valid_State (App : in Application; Nonce : in String; State : in String) return Boolean is Hmac : constant String := Application'Class (App).Get_State (Nonce); begin return Hmac = State; end Is_Valid_State; function Get_Expires (Props : in Util.Properties.Manager) return Natural is Value : Util.Beans.Objects.Object; begin Value := Props.Get_Value ("expires_in"); if Util.Beans.Objects.Is_Null (Value) then Value := Props.Get_Value ("refresh_token_expires_in"); if Util.Beans.Objects.Is_Null (Value) then return 3600; end if; end if; return Util.Beans.Objects.To_Integer (Value); end Get_Expires; -- ------------------------------ -- Exchange the OAuth code into an access token. -- ------------------------------ function Request_Access_Token (App : in Application; Code : in String) return Access_Token_Access is Client : Util.Http.Clients.Client; Response : Util.Http.Clients.Response; Data : constant String := Security.OAuth.GRANT_TYPE & "=authorization_code" & "&" & Security.OAuth.CODE & "=" & Code & "&" & Security.OAuth.REDIRECT_URI & "=" & Ada.Strings.Unbounded.To_String (App.Callback) & "&" & Security.OAuth.CLIENT_ID & "=" & Ada.Strings.Unbounded.To_String (App.Client_Id) & "&" & Security.OAuth.CLIENT_SECRET & "=" & Ada.Strings.Unbounded.To_String (App.Secret); URI : constant String := Ada.Strings.Unbounded.To_String (App.Request_URI); begin Log.Info ("Getting access token from {0}", URI); begin Client.Post (URL => URI, Data => Data, Reply => Response); if Response.Get_Status /= Util.Http.SC_OK then Log.Warn ("Cannot get access token from {0}: status is {1} Body {2}", URI, Natural'Image (Response.Get_Status), Response.Get_Body); return null; end if; exception -- Handle a Program_Error exception that could be raised by AWS when SSL -- is not supported. Emit a log error so that we can trouble this kins of -- problem more easily. when E : Program_Error => Log.Error ("Cannot get access token from {0}: program error: {1}", URI, Ada.Exceptions.Exception_Message (E)); raise; end; -- Decode the response. declare Content : constant String := Response.Get_Body; Content_Type : constant String := Response.Get_Header ("Content-Type"); Pos : Natural := Util.Strings.Index (Content_Type, ';'); Last : Natural; Expires : Natural; begin if Pos = 0 then Pos := Content_Type'Last; else Pos := Pos - 1; end if; Log.Debug ("Content type: {0}", Content_Type); Log.Debug ("Data: {0}", Content); -- Facebook sends the access token as a 'text/plain' content. if Content_Type (Content_Type'First .. Pos) = "text/plain" then Pos := Util.Strings.Index (Content, '='); if Pos = 0 then Log.Error ("Invalid access token response: '{0}'", Content); return null; end if; if Content (Content'First .. Pos) /= "access_token=" then Log.Error ("The 'access_token' parameter is missing in response: '{0}'", Content); return null; end if; Last := Util.Strings.Index (Content, '&', Pos + 1); if Last = 0 then Log.Error ("Invalid 'access_token' parameter: '{0}'", Content); return null; end if; if Content (Last .. Last + 8) /= "&expires=" then Log.Error ("Invalid 'expires' parameter: '{0}'", Content); return null; end if; Expires := Natural'Value (Content (Last + 9 .. Content'Last)); return Application'Class (App).Create_Access_Token (Content (Pos + 1 .. Last - 1), "", "", Expires); elsif Content_Type (Content_Type'First .. Pos) = "application/json" then declare P : Util.Properties.Manager; begin Util.Properties.JSON.Parse_JSON (P, Content); Expires := Get_Expires (P); return Application'Class (App).Create_Access_Token (P.Get ("access_token"), P.Get ("refresh_token", ""), P.Get ("id_token", ""), Expires); end; elsif Content_Type (Content_Type'First .. Pos) = "application/x-www-form-urlencoded" then declare P : Util.Properties.Manager; begin Util.Properties.Form.Parse_Form (P, Content); Expires := Get_Expires (P); return Application'Class (App).Create_Access_Token (P.Get ("access_token"), P.Get ("refresh_token", ""), P.Get ("id_token", ""), Expires); end; else Log.Error ("Content type {0} not supported for access token response", Content_Type); Log.Error ("Response: {0}", Content); return null; end if; end; end Request_Access_Token; -- ------------------------------ -- Exchange the OAuth code into an access token. -- ------------------------------ procedure Do_Request_Token (URI : in String; Data : in Util.Http.Clients.Form_Data'Class; Cred : in out Grant_Type'Class) is Client : Util.Http.Clients.Client; Response : Util.Http.Clients.Response; begin Log.Info ("Getting access token from {0}", URI); Client.Post (URL => URI, Data => Data, Reply => Response); if Response.Get_Status /= Util.Http.SC_OK then Log.Warn ("Cannot get access token from {0}: status is {1} Body {2}", URI, Natural'Image (Response.Get_Status), Response.Get_Body); return; end if; -- Decode the response. declare Content : constant String := Response.Get_Body; Content_Type : constant String := Response.Get_Header ("Content-Type"); Pos : Natural := Util.Strings.Index (Content_Type, ';'); Last : Natural; begin if Pos = 0 then Pos := Content_Type'Last; else Pos := Pos - 1; end if; Log.Debug ("Content type: {0}", Content_Type); Log.Debug ("Data: {0}", Content); -- Facebook sends the access token as a 'text/plain' content. if Content_Type (Content_Type'First .. Pos) = "text/plain" then Pos := Util.Strings.Index (Content, '='); if Pos = 0 then Log.Error ("Invalid access token response: '{0}'", Content); return; end if; if Content (Content'First .. Pos) /= "access_token=" then Log.Error ("The 'access_token' parameter is missing in response: '{0}'", Content); return; end if; Last := Util.Strings.Index (Content, '&', Pos + 1); if Last = 0 then Log.Error ("Invalid 'access_token' parameter: '{0}'", Content); return; end if; if Content (Last .. Last + 8) /= "&expires=" then Log.Error ("Invalid 'expires' parameter: '{0}'", Content); return; end if; Cred.Expires := Natural'Value (Content (Last + 9 .. Content'Last)); Cred.Access_Token := To_Unbounded_String (Content (Pos + 1 .. Last - 1)); elsif Content_Type (Content_Type'First .. Pos) = "application/json" then declare P : Util.Properties.Manager; begin Util.Properties.JSON.Parse_JSON (P, Content); Cred.Expires := Natural'Value (P.Get ("expires_in")); Cred.Access_Token := P.Get ("access_token"); Cred.Refresh_Token := To_Unbounded_String (P.Get ("refresh_token", "")); Cred.Id_Token := To_Unbounded_String (P.Get ("id_token", "")); end; else Log.Error ("Content type {0} not supported for access token response", Content_Type); Log.Error ("Response: {0}", Content); return; end if; end; exception -- Handle a Program_Error exception that could be raised by AWS when SSL -- is not supported. Emit a log error so that we can trouble this kins of -- problem more easily. when E : Program_Error => Log.Error ("Cannot get access token from {0}: program error: {1}", URI, Ada.Exceptions.Exception_Message (E)); raise; end Do_Request_Token; -- ------------------------------ -- Get a request token with username and password. -- RFC 6749: 4.3. Resource Owner Password Credentials Grant -- ------------------------------ procedure Request_Token (App : in Application; Username : in String; Password : in String; Scope : in String; Token : in out Grant_Type'Class) is URI : constant String := Ada.Strings.Unbounded.To_String (App.Request_URI); Form : Util.Http.Clients.Form_Data; begin Log.Info ("Getting access token from {0} - resource owner password", URI); Form.Initialize (Size => 1024); Form.Write_Attribute (Security.OAuth.GRANT_TYPE, "password"); Form.Write_Attribute (Security.OAuth.CLIENT_ID, App.Client_Id); Form.Write_Attribute (Security.OAuth.CLIENT_SECRET, App.Secret); Form.Write_Attribute (Security.OAuth.USERNAME, Username); Form.Write_Attribute (Security.OAuth.PASSWORD, Password); Form.Write_Attribute (Security.OAuth.SCOPE, Scope); Do_Request_Token (URI, Form, Token); end Request_Token; -- ------------------------------ -- Refresh the access token. -- RFC 6749: 6. Refreshing an Access Token -- ------------------------------ procedure Refresh_Token (App : in Application; Scope : in String; Token : in out Grant_Type'Class) is URI : constant String := Ada.Strings.Unbounded.To_String (App.Request_URI); Form : Util.Http.Clients.Form_Data; begin Log.Info ("Refresh access token from {0}", URI); Form.Initialize (Size => 1024); Form.Write_Attribute (Security.OAuth.GRANT_TYPE, "refresh_token"); Form.Write_Attribute (Security.OAuth.REFRESH_TOKEN, Token.Refresh_Token); Form.Write_Attribute (Security.OAuth.CLIENT_ID, App.Client_Id); Form.Write_Attribute (Security.OAuth.SCOPE, Scope); Form.Write_Attribute (Security.OAuth.CLIENT_SECRET, App.Secret); Do_Request_Token (URI, Form, Token); end Refresh_Token; -- ------------------------------ -- Create the access token -- ------------------------------ function Create_Access_Token (App : in Application; Token : in String; Refresh : in String; Id_Token : in String; Expires : in Natural) return Access_Token_Access is pragma Unreferenced (App, Expires); begin if Id_Token'Length > 0 then declare Result : constant OpenID_Token_Access := new OpenID_Token '(Len => Token'Length, Id_Len => Id_Token'Length, Refresh_Len => Refresh'Length, Access_Id => Token, Id_Token => Id_Token, Refresh_Token => Refresh); begin return Result.all'Access; end; else return new Access_Token '(Len => Token'Length, Access_Id => Token); end if; end Create_Access_Token; end Security.OAuth.Clients;
src/Text/Printf.agda
lclem/agda-prelude
0
5424
module Text.Printf where open import Prelude hiding (parseNat) open import Builtin.Float private data Padding : Set where noPad : Padding lPad rPad : Nat → Padding record Flags : Set where field padding : Padding padChar : Char alternate : Bool precision : Maybe Nat defaultFlags : Flags Flags.padding defaultFlags = noPad Flags.padChar defaultFlags = ' ' Flags.alternate defaultFlags = false Flags.precision defaultFlags = nothing data Format : Set where natArg : Flags → Format strArg : Flags → Format ustrArg : Flags → Format floatArg : Flags → Format charArg : Format hexArg : Bool → Flags → Format litString : String → Format badFormat : String → Format data BadFormat (s : String) : Set where private BadFormat′ : String → Set BadFormat′ "" = ⊥ BadFormat′ s = BadFormat s private consLit : String → List Format → List Format consLit s (litString s′ ∷ fmt) = litString (s & s′) ∷ fmt consLit s fmt = litString s ∷ fmt private parseFormat : List Char → List Format parseFormatWithFlags : Flags → List Char → List Format parseNat′ : (Nat → Flags) → Nat → List Char → List Format parseNat′ flags n [] = parseFormatWithFlags (flags n) [] parseNat′ flags n (c ∷ s) = if isDigit c then parseNat′ flags (n * 10 + charToNat c - charToNat '0') s else parseFormatWithFlags (flags n) (c ∷ s) parseNat : (Nat → Flags) → List Char → List Format parseNat p s = parseNat′ p 0 s parsePadding : Flags → List Char → List Format parsePadding f [] = parseFormatWithFlags f [] parsePadding f ('-' ∷ c ∷ s) = if isDigit c then parseNat (λ n → record f { padding = rPad n }) (c ∷ s) else badFormat (packString ('-' ∷ c ∷ [])) ∷ parseFormat s parsePadding f ('0' ∷ s) = parsePadding (record f { padChar = '0' }) s parsePadding f ('.' ∷ c ∷ s) = if isDigit c then parseNat (λ n → record f { precision = just n }) (c ∷ s) else badFormat (packString ('.' ∷ c ∷ [])) ∷ parseFormat s parsePadding f (c ∷ s) = if isDigit c then parseNat (λ n → record f { padding = lPad n }) (c ∷ s) else parseFormatWithFlags f (c ∷ s) parseFlags : Flags → List Char → List Format parseFlags f ('#' ∷ s) = parseFlags (record f { alternate = true }) s parseFlags f s = parsePadding f s parseFormatWithFlags f [] = badFormat "" ∷ [] parseFormatWithFlags f ('d' ∷ s) = natArg f ∷ parseFormat s parseFormatWithFlags f ('x' ∷ s) = hexArg false f ∷ parseFormat s parseFormatWithFlags f ('X' ∷ s) = hexArg true f ∷ parseFormat s parseFormatWithFlags f ('c' ∷ s) = charArg ∷ parseFormat s parseFormatWithFlags f ('s' ∷ s) = strArg f ∷ parseFormat s parseFormatWithFlags f ('S' ∷ s) = ustrArg f ∷ parseFormat s parseFormatWithFlags f ('f' ∷ s) = floatArg f ∷ parseFormat s parseFormatWithFlags f ('%' ∷ s) = consLit "%" $ parseFormat s parseFormatWithFlags f ( c ∷ s) = badFormat (packString ('%' ∷ c ∷ [])) ∷ parseFormat s parseFormat [] = [] parseFormat ('%' ∷ fmt) = parseFlags defaultFlags fmt parseFormat (c ∷ fmt) = consLit (packString [ c ]) $ parseFormat fmt private pad : (String → String → String) → Char → Nat → String → String pad _+_ c n s = case n - length (unpackString s) of λ { 0 → s ; d → packString (replicate d c) + s} padLeft padRight : Char → Nat → String → String padLeft = pad _&_ padRight = pad (flip _&_) hexDigit : Char → Nat → String hexDigit a n = if n <? 10 then packString [ natToChar (n + charToNat '0') ] else packString [ natToChar (n - 10 + charToNat a) ] {-# TERMINATING #-} showHex′ : Char → Nat → String showHex′ _ 0 = "" showHex′ a n = showHex′ a (n div 16) & hexDigit a (n mod 16) add0x : Flags → String → String add0x flags s = if Flags.alternate flags then "0x" & s else s pad0 : Flags → String → String pad0 flags s = let c = Flags.padChar flags in ifYes c == ' ' then s else case Flags.padding flags of λ { noPad → s ; (lPad n) → padLeft c (n - 2) s ; (rPad _) → s } showHex : Flags → Bool → Nat → String showHex f _ 0 = add0x f $ pad0 f $ "0" showHex f u n = add0x f $ pad0 f $ showHex′ (if u then 'A' else 'a') n showFrac : Nat → Float → String showFrac 0 _ = "" showFrac 1 x = show (round (10 * x)) showFrac (suc p) x = show n & showFrac p (x′ - intToFloat n) where x′ = 10 * x n = floor x′ showPosFloat : Flags → Float → String showPosFloat f x = case Flags.precision f of λ { nothing → show x ; (just 0) → show (floor x) ; (just p) → show (floor x) & "." & showFrac p (x - intToFloat (floor x)) } showFloat : Flags → Float → String showFloat f x with x <? 0.0 ... | true = "-" & showPosFloat f (negate x) ... | false = showPosFloat f x withPad : Flags → String → ShowS withPad flags s = let c = Flags.padChar flags in case Flags.padding flags of λ { noPad → showString s ; (lPad n) → showString (padLeft c n s) ; (rPad n) → showString (padRight c n s) } private Printf′ : List Format → Set Printf′ [] = String Printf′ (natArg _ ∷ fmt) = Nat → Printf′ fmt Printf′ (hexArg _ _ ∷ fmt) = Nat → Printf′ fmt Printf′ (strArg _ ∷ fmt) = String → Printf′ fmt Printf′ (ustrArg _ ∷ fmt) = List Char → Printf′ fmt Printf′ (charArg ∷ fmt) = Char → Printf′ fmt Printf′ (floatArg _ ∷ fmt) = Float → Printf′ fmt Printf′ (litString _ ∷ fmt) = Printf′ fmt Printf′ (badFormat e ∷ fmt) = BadFormat′ e → Printf′ fmt printf′ : (fmt : List Format) → ShowS → Printf′ fmt printf′ [] acc = acc "" printf′ (natArg p ∷ fmt) acc n = printf′ fmt (acc ∘ withPad p (show n)) printf′ (hexArg u p ∷ fmt) acc n = printf′ fmt (acc ∘ withPad p (showHex p u n)) printf′ (strArg p ∷ fmt) acc s = printf′ fmt (acc ∘ withPad p s) printf′ (ustrArg p ∷ fmt) acc s = printf′ fmt (acc ∘ withPad p (packString s)) printf′ (floatArg p ∷ fmt) acc x = printf′ fmt (acc ∘ withPad p (showFloat p x)) printf′ (charArg ∷ fmt) acc c = printf′ fmt (acc ∘ showString (packString [ c ])) printf′ (litString s ∷ fmt) acc = printf′ fmt (acc ∘ showString s) printf′ (badFormat _ ∷ fmt) acc _ = printf′ fmt acc Printf : String → Set Printf = Printf′ ∘ parseFormat ∘ unpackString printf : (fmt : String) → Printf fmt printf fmt = printf′ (parseFormat $ unpackString fmt) id
1571/64tass/lccfmt1.asm
silverdr/assembly
23
178781
; fmtvar = $620 ; put format vars in jump buffer cnt = fmtvar num = fmtvar+1 trys = fmtvar+3 tral = fmtvar+4 dtrck = fmtvar+6 remdr = fmtvar+7 sect = fmtvar+8 ; ; ; ;* format routine for lcc ;* ;* ;* ; ; ; code formt lda ftnum ; test if formatting begun bpl l213 ; yes ; ldx drive ; no,start up by bumping lda #$60 ; status=stepping sta drvst,x ; lda #1 ; drive track =1 sta drvtrk,x sta ftnum ; start on track 1 ; lda #256-92 ; bump back 45 steps sta steps ; lda dskcnt ; set phase a and #$ff-$03 sta dskcnt ; ; lda #10 ; 10 errors allowed sta cnt ; lda #<4000 ; first guess at track size sta num lda #>4000 sta num+1 ; jmp end ; back to controller ; ; ; l213 ldy #0 ; test if on right track number cmp (hdrpnt),y beq l214 ; sta (hdrpnt),y ; goto right track jmp end ; ; l214 lda dskcnt ; test for write protect and #$10 bne topp ; its ok ; lda #8 ; write protect error jmp fmterr ; topp jsr synclr ; erase track with sync ; jsr wrtnum ; write out num syncs ; lda #$55 ; write out num non sync sta data2 ; jsr wrtnum ; jsr kill ; kill write ; jsr sync ; find sync ; lda #$40 ; set timer mode ora acr1 sta acr1 ; lda #100-2 ; set up 100us timer sta t1ll1 ; cont mode timer lda #0 sta t1hl1 ; hi latch sta t1hc1 ; get attention of '22 ; ; ; ldy #0 ; time the sync and nonsync segments ldx #0 ; fwait bit dskcnt ; wait for sync bmi fwait ; fwait2 bit dskcnt ; wait for no sync bpl fwait2 ; f000 lda t1lc1 ; reset ifr ; f001 bit dskcnt ; time nonsync area bpl f005 ; time until sync found ; lda ifr1 ; test for time out asl a bpl f001 ; not yet ; inx ; .x is lsb bne f000 iny ; .y is msb bne f000 ; lda #tolong ; cant find sync jmp fmterr ; f005 stx t2 ; save time sty t2+1 ; ldx #0 ; time sync area ldy #0 ; f006 lda t1lc1 ; reset ifr ; f007 bit dskcnt ; test for no sync bmi f009 ; lda ifr1 ; test for time out asl a bpl f007 ; inx ; count up another 100us bne f006 iny ; msb bne f006 ; lda #tolong ; cant be this long jmp fmterr ; ; ;* now calc the difference between ;* sync and nonsync and adjust ;* num accordingly ; f009 sec ; t1-t2 txa sbc t2 tax sta t1 ; tya sbc t2+1 tay sta t1+1 ; bpl f013 ; get abs(t1-t2) ; eor #$ff ; make + tay txa eor #$ff tax inx bne f013 iny ; f013 tya ; test if abs(t1-t2)<4, that is close enough bne f014 ; msb must be 0 ; cpx #4 ; test lsb < 4 bcc count ; its there ; f014 asl t1 ; num=num+(diff/2) rol t1+1 ; clc lda t1 adc num sta num ; lda t1+1 adc num+1 sta num+1 ; jmp topp ; try again sam ; ; count ldx #0 ; now count #bytes in data segment ldy #0 clv ; cnt10 lda dskcnt ; test for sync bpl cnt20 ; found sync bvc cnt10 ; test if byte time ; clv ; yes, count it inx bne cnt10 ; keep counting iny bne cnt10 ; to many ? ; lda #tomany ; tomany counts jmp fmterr ; cnt20 txa ; #bytes=count*2 asl a sta tral+1 ; tya rol a sta tral ; lda #$ff-$40 ; clear cont mode and acr1 sta acr1 ; ; ;.end
books_and_notes/professional_courses/Assembly_language_and_programming/sources/汇编语言程序设计教程第四版/codes/6_11.asm
gxw1/review_the_national_post-graduate_entrance_examination
640
167856
STACK SEGMENT PARA STACK 'STACK' DW 64 DUP (?) STACK ENDS DATA SEGMENT N DB 8 FUNCN DW ? DATA ENDS CODE SEGMENT ASSUME CS:CODE,SS:STACK,DS:DATA MAIN PROC FAR START: PUSH DS MOV AX,0 PUSH AX MOV AX,DATA MOV DS,AX PUSH CX MOV AH,0 MOV AL,N CALL FACTOR MOV FUNCN,AX POP CX RET MAIN ENDP FACTOR PROC NEAR PUSH AX SUB AX,1 JNE AGAIN POP AX JMP FIN AGAIN: CALL FACTOR POP CX MUL CL FIN: RET FACTOR ENDP CODE ENDS END START
alloy4fun_models/trainstlt/models/4/3q9sKPwcQxa5oowHX.als
Kaixi26/org.alloytools.alloy
0
4959
<reponame>Kaixi26/org.alloytools.alloy open main pred id3q9sKPwcQxa5oowHX_prop5 { always all t: Train | (t'.pos in t.prox) or (t.pos in Exit implies Train' = Train -t) } pred __repair { id3q9sKPwcQxa5oowHX_prop5 } check __repair { id3q9sKPwcQxa5oowHX_prop5 <=> prop5o }
oeis/111/A111500.asm
neoneye/loda-programs
11
82011
<reponame>neoneye/loda-programs ; A111500: Number of squares in an n X n grid of squares with diagonals. ; 1,10,31,72,137,234,367,544,769,1050,1391,1800,2281,2842,3487,4224,5057,5994,7039,8200,9481,10890,12431,14112,15937,17914,20047,22344,24809,27450,30271,33280,36481,39882,43487,47304,51337,55594,60079,64800,69761,74970,80431,86152,92137,98394,104927,111744,118849,126250,133951,141960,150281,158922,167887,177184,186817,196794,207119,217800,228841,240250,252031,264192,276737,289674,303007,316744,330889,345450,360431,375840,391681,407962,424687,441864,459497,477594,496159,515200,534721,554730,575231 add $0,1 mul $0,2 mov $1,$0 pow $0,3 pow $1,2 add $0,$1 div $0,8
src/posix_to_hfs.applescript
inureyes/copy-paths-to-clipboard
86
195
<filename>src/posix_to_hfs.applescript -- Copy All Paths to Clipboard -- Workflow For Alfred 2 -- <NAME> 2014 -- MIT license. on run(q) set theTargets to {} set oldItemDelimiters to text item delimiters set text item delimiters to ", " set qList to every text item of (q as text) set text item delimiters to oldItemDelimiters repeat with aTarget in qList set aTarget to (POSIX file aTarget as text) set theTargets to theTargets & aTarget end repeat return (theTargets) end run
programs/oeis/164/A164559.asm
karttu/loda
1
28197
<gh_stars>1-10 ; A164559: a(n) = 6^n/3 - 1. ; 1,11,71,431,2591,15551,93311,559871,3359231,20155391,120932351,725594111,4353564671,26121388031,156728328191,940369969151,5642219814911,33853318889471,203119913336831,1218719480020991,7312316880125951 mov $1,6 pow $1,$0 mul $1,2 sub $1,1
test/Succeed/fol-theorems/NestedAxioms/C.agda
asr/apia
10
6875
------------------------------------------------------------------------------ -- Testing nested axioms ------------------------------------------------------------------------------ {-# OPTIONS --exact-split #-} {-# OPTIONS --no-sized-types #-} {-# OPTIONS --no-universe-polymorphism #-} {-# OPTIONS --without-K #-} {- Processing this file should be generate a TPTP file with the following axioms fof(..., axiom, ( a = b )). fof(..., axiom, ( b = c )). fof(..., axiom, ( c = d )). -} module NestedAxioms.C where open import NestedAxioms.A open import NestedAxioms.B ------------------------------------------------------------------------------ postulate d : D c≡d : c ≡ d {-# ATP axiom c≡d #-} postulate foo : d ≡ a {-# ATP prove foo #-}
P6/data_P6_2/MDTest12.asm
alxzzhou/BUAA_CO_2020
1
173229
<reponame>alxzzhou/BUAA_CO_2020<gh_stars>1-10 ori $ra,$ra,0xf div $1,$ra divu $4,$ra div $2,$ra addiu $5,$3,2517 addu $6,$2,$5 srav $4,$1,$5 mthi $3 addu $5,$2,$2 divu $3,$ra addu $4,$4,$4 ori $4,$5,53600 mthi $4 div $0,$ra addu $4,$2,$4 div $4,$ra addiu $0,$4,8215 addiu $2,$4,21658 mthi $3 mtlo $0 ori $4,$4,55876 addiu $4,$5,-31915 lui $0,41801 addu $4,$1,$4 sll $4,$2,7 addiu $3,$0,-21114 mflo $5 div $2,$ra divu $4,$ra mtlo $5 mult $3,$2 addiu $5,$5,-7711 lb $5,11($0) mflo $4 srav $0,$2,$2 lb $1,7($0) mfhi $2 mtlo $0 multu $5,$5 addu $6,$2,$2 divu $1,$ra lb $5,4($0) mfhi $4 multu $1,$2 ori $2,$2,62427 divu $5,$ra ori $4,$2,3719 lb $6,16($0) mfhi $4 sll $1,$4,12 addu $6,$1,$4 mflo $1 lui $1,4675 mfhi $5 lb $4,12($0) lui $0,5315 lb $5,7($0) mtlo $1 mthi $1 lui $5,62361 divu $1,$ra lui $4,40482 mthi $1 ori $4,$4,48736 multu $4,$0 srav $6,$4,$2 srav $4,$6,$3 srav $5,$5,$0 div $4,$ra multu $1,$6 lb $6,16($0) srav $5,$5,$2 multu $4,$4 mthi $0 mtlo $4 lb $5,1($0) ori $4,$4,17891 addu $1,$1,$5 div $4,$ra mfhi $2 mflo $2 mflo $2 srav $1,$4,$4 mult $1,$0 addu $1,$6,$4 mfhi $6 multu $4,$1 lb $1,10($0) mthi $1 divu $6,$ra addiu $1,$3,18317 divu $4,$ra ori $1,$2,28806 mthi $2 addiu $4,$2,-18147 sb $6,4($0) addiu $4,$4,19569 sll $5,$4,31 addu $1,$1,$5 mtlo $1 addu $3,$2,$3 lb $4,14($0) lui $4,5753 lui $6,33096 multu $4,$2 sb $6,7($0) mthi $5 lb $0,16($0) lb $5,5($0) ori $4,$2,25255 mtlo $5 div $1,$ra addu $4,$4,$1 mult $5,$3 lui $4,44644 ori $1,$0,11811 ori $3,$5,60942 mult $4,$2 sll $5,$2,15 lui $4,21975 mflo $0 addiu $5,$0,-3445 ori $4,$4,43277 mfhi $3 lb $1,10($0) mfhi $4 mult $0,$3 divu $5,$ra mtlo $2 div $4,$ra mtlo $1 ori $5,$0,21292 sll $2,$5,23 mthi $2 multu $5,$3 sll $1,$1,3 divu $0,$ra lui $1,4648 srav $1,$0,$4 lui $4,10432 mtlo $1 addiu $4,$4,-28428 multu $4,$3 div $1,$ra multu $5,$6 mflo $4 mult $1,$6 mtlo $4 lui $0,42282 addu $4,$4,$4 srav $4,$2,$4 mult $4,$4 mtlo $4 addiu $5,$5,-23865 sll $2,$2,26 mtlo $4 mthi $1 mthi $0 srav $3,$4,$3 mtlo $1 ori $5,$1,48452 lui $6,45998 addu $3,$2,$3 addu $1,$5,$2 div $6,$ra srav $5,$3,$3 mfhi $5 div $3,$ra mtlo $1 sll $0,$0,5 multu $1,$4 sb $1,12($0) lb $4,8($0) lui $5,3618 lb $5,7($0) ori $6,$5,14106 mthi $0 mtlo $4 mult $4,$4 ori $4,$4,6136 lui $2,21402 addiu $5,$2,29752 divu $6,$ra multu $3,$3 sb $6,16($0) ori $4,$0,62592 srav $4,$4,$3 sll $3,$4,16 multu $5,$1 ori $6,$5,62803 mult $1,$4 multu $4,$1 mult $4,$2 sll $4,$4,17 mult $1,$4 addiu $6,$3,24823 div $4,$ra mult $1,$2 mflo $1 addiu $3,$3,4062 addu $0,$4,$3 mult $1,$4 addu $5,$2,$3 ori $6,$4,10221 mtlo $4 mflo $2 addiu $0,$6,-3348 mfhi $3 mfhi $4 addu $6,$5,$4 addiu $4,$1,-21711 mflo $4 mthi $1 mult $3,$5 lui $4,11638 mfhi $6 lb $5,2($0) addiu $5,$4,22965 mflo $1 sll $4,$4,22 divu $4,$ra mflo $4 lui $4,47568 div $6,$ra mthi $5 mflo $4 lui $5,14597 addiu $4,$2,7539 mthi $5 sll $3,$4,7 ori $4,$5,65244 mthi $0 sll $1,$1,10 multu $1,$0 addiu $4,$4,-28682 lb $6,0($0) lui $2,12270 addiu $0,$1,-12176 multu $1,$0 addu $3,$5,$3 lb $5,4($0) div $0,$ra ori $1,$2,34336 lb $1,5($0) srav $4,$2,$3 addu $4,$2,$5 multu $4,$4 lui $4,21029 mfhi $0 lui $4,43509 mtlo $2 mult $4,$3 mtlo $6 addiu $4,$4,-29550 addu $2,$6,$2 mult $6,$6 div $5,$ra ori $2,$2,38378 multu $4,$1 sb $4,9($0) mflo $4 addiu $5,$0,19061 addiu $4,$5,5775 mthi $5 addiu $5,$5,-24518 sb $5,12($0) div $4,$ra mfhi $4 srav $5,$4,$3 srav $0,$4,$2 mtlo $1 lui $1,37138 sb $0,9($0) addu $1,$5,$3 addiu $0,$5,-27890 mult $5,$5 lui $5,48161 lb $3,15($0) sb $1,14($0) ori $4,$4,18650 sll $1,$1,12 div $1,$ra mflo $1 mfhi $2 sb $4,7($0) sb $5,7($0) lui $4,51149 mtlo $1 lb $4,8($0) sb $6,8($0) divu $5,$ra ori $4,$4,27110 addiu $3,$3,-1351 ori $0,$0,60895 lui $6,59364 mtlo $4 mult $4,$6 sb $4,4($0) mfhi $1 multu $5,$2 mthi $4 mfhi $3 multu $4,$4 sb $4,8($0) addiu $4,$0,-25850 mthi $4 mtlo $4 mthi $3 divu $4,$ra sb $1,4($0) divu $3,$ra lui $4,26437 lb $2,16($0) lui $6,53039 sll $3,$4,2 sb $5,2($0) multu $4,$4 mtlo $0 addu $5,$5,$2 addiu $2,$2,-474 lb $1,9($0) srav $3,$4,$3 sb $3,3($0) sb $2,9($0) mfhi $1 mflo $5 mflo $6 mfhi $4 addu $6,$6,$4 mult $2,$2 mfhi $6 srav $1,$6,$4 ori $1,$0,63250 addu $3,$2,$3 multu $1,$2 mflo $4 multu $5,$1 mthi $5 srav $4,$0,$4 div $4,$ra addu $4,$2,$2 lb $3,12($0) lb $0,6($0) mthi $5 div $4,$ra mfhi $5 addu $4,$6,$5 mthi $5 lui $1,42555 mult $5,$4 div $4,$ra addiu $1,$4,-30122 sb $4,3($0) mtlo $2 sll $1,$1,25 mtlo $4 addiu $5,$6,6350 mtlo $4 addu $0,$2,$4 sll $6,$1,28 lb $5,12($0) srav $5,$5,$5 sb $0,6($0) mthi $1 mthi $2 srav $5,$2,$3 mflo $5 mult $5,$5 mtlo $4 multu $1,$1 sb $1,7($0) mtlo $2 sll $2,$2,15 mult $4,$4 addu $6,$4,$4 lui $2,3234 sb $1,12($0) addiu $4,$4,23842 div $0,$ra sll $3,$0,24 sll $3,$2,25 multu $4,$5 ori $5,$4,30782 multu $4,$2 mtlo $4 lb $0,2($0) mfhi $5 addu $4,$4,$3 mtlo $4 mfhi $6 mflo $5 mult $6,$2 srav $1,$1,$3 mult $6,$2 divu $1,$ra mthi $6 div $4,$ra lb $1,3($0) multu $5,$2 srav $5,$5,$4 divu $5,$ra sll $4,$5,1 divu $0,$ra lui $4,48186 srav $6,$2,$4 mfhi $6 lb $0,5($0) lb $5,14($0) srav $6,$1,$4 sb $6,16($0) mfhi $1 multu $4,$4 mthi $5 addu $2,$1,$2 multu $2,$6 addu $3,$2,$3 divu $1,$ra divu $5,$ra sll $1,$1,2 mfhi $4 mflo $4 mflo $4 addiu $5,$2,16149 multu $4,$6 addiu $4,$5,-7043 srav $4,$2,$5 lui $4,45100 addu $4,$5,$4 mthi $0 divu $6,$ra multu $5,$3 lui $4,63728 mflo $5 multu $0,$2 mfhi $1 srav $5,$1,$1 multu $2,$2 divu $5,$ra lui $4,53853 sb $4,3($0) mthi $1 mflo $4 addu $1,$2,$5 mthi $4 addiu $0,$1,27863 mult $3,$2 sb $1,0($0) multu $3,$6 ori $4,$1,13919 mflo $4 sll $6,$1,9 divu $4,$ra addu $5,$2,$2 mtlo $1 addu $1,$6,$6 multu $6,$6 addu $4,$2,$4 srav $3,$4,$3 sb $0,5($0) divu $6,$ra multu $5,$4 srav $0,$2,$3 multu $4,$5 mfhi $6 lb $5,15($0) addu $2,$2,$6 addiu $4,$4,-31672 lui $4,21565 addiu $1,$1,-25633 mthi $1 divu $4,$ra addiu $4,$5,8780 mthi $5 mflo $4 mult $1,$1 div $1,$ra mflo $4 lui $0,43090 mflo $4 mult $5,$5 srav $5,$2,$6 divu $2,$ra sll $1,$1,30 mfhi $1 ori $4,$5,9453 sb $0,9($0) mfhi $0 lb $5,12($0) sb $1,1($0) mtlo $5 mthi $5 mtlo $1 mthi $0 multu $4,$6 ori $3,$4,134 mtlo $3 multu $1,$5 mfhi $1 addu $0,$4,$0 multu $1,$1 lb $1,5($0) multu $2,$2 addu $1,$1,$1 sb $4,5($0) divu $0,$ra div $3,$ra mflo $5 srav $0,$1,$1 ori $4,$4,24557 addu $4,$5,$4 ori $1,$4,28524 ori $0,$1,4643 mtlo $2 mtlo $5 mfhi $4 div $3,$ra mflo $2 multu $1,$6 ori $1,$1,41971 sb $1,13($0) sll $5,$5,11 sb $0,14($0) ori $0,$0,58936 addu $5,$3,$3 div $0,$ra srav $5,$4,$5 lui $6,14955 ori $6,$1,58573 mflo $4 addu $6,$6,$1 ori $3,$0,21235 srav $2,$2,$2 mthi $2 lui $6,64085 sb $1,5($0) mflo $1 div $6,$ra sll $5,$4,31 ori $1,$2,62120 lui $1,45630 mthi $4 addiu $6,$6,-18219 sb $5,16($0) divu $0,$ra multu $1,$5 mult $4,$4 sb $4,10($0) addu $0,$3,$3 lui $3,37968 divu $4,$ra mflo $1 lb $1,10($0) divu $6,$ra sb $6,5($0) divu $4,$ra lui $5,42579 srav $3,$3,$3 sll $2,$2,24 lui $1,30564 lui $2,1187 div $4,$ra multu $5,$1 lb $3,0($0) div $2,$ra sll $2,$2,4 mult $5,$0 mult $1,$4 ori $5,$4,4684 mfhi $5 mflo $2 addu $0,$2,$2 mthi $4 addu $4,$2,$2 mthi $4 addiu $5,$4,27389 addiu $4,$4,-2461 sb $1,5($0) mfhi $2 sb $4,14($0) multu $6,$5 srav $0,$0,$1 mfhi $0 mflo $1 mflo $6 lb $5,4($0) mtlo $4 mthi $5 sll $5,$2,29 sll $5,$5,12 div $6,$ra lui $6,48700 divu $5,$ra sll $1,$1,3 mthi $1 srav $1,$5,$3 mult $5,$5 ori $0,$5,20443 lui $4,48469 lb $0,7($0) mult $5,$4 addu $4,$3,$3 mflo $5 ori $4,$2,41463 sll $1,$3,27 sb $5,12($0) ori $2,$2,49362 addiu $6,$4,26075 srav $0,$5,$1 mfhi $5 lui $4,16194 lui $4,14045 div $3,$ra mult $5,$5 ori $6,$2,30350 divu $4,$ra mfhi $1 div $1,$ra div $1,$ra sb $4,15($0) lb $0,10($0) srav $0,$0,$0 mthi $2 multu $5,$1 mfhi $0 mflo $5 mthi $5 addu $1,$1,$3 mfhi $4 lui $3,38028 ori $1,$5,40675 sll $2,$2,31 ori $6,$5,3470 divu $0,$ra mtlo $4 lb $1,8($0) mflo $0 lb $2,14($0) addiu $5,$5,-2444 mfhi $0 ori $4,$5,15802 lb $4,7($0) sb $2,5($0) multu $1,$2 sll $3,$1,4 lb $0,16($0) mtlo $4 lui $1,3536 mfhi $5 divu $3,$ra lui $2,11552 addu $4,$4,$4 sb $3,6($0) divu $4,$ra sll $5,$5,23 multu $4,$6 multu $2,$4 ori $3,$6,31403 ori $2,$2,34451 mtlo $5 mthi $5 mthi $2 addu $1,$1,$1 lui $4,3446 ori $5,$2,28173 multu $1,$6 mtlo $1 div $5,$ra mfhi $5 sll $1,$0,28 lb $5,2($0) sb $4,8($0) lui $2,52589 divu $2,$ra lui $3,61636 multu $4,$4 div $0,$ra addiu $2,$2,-9108 mflo $5 mflo $2 sb $4,4($0) srav $1,$4,$3 multu $6,$6 addu $1,$5,$4 mthi $1 divu $0,$ra div $3,$ra mflo $5 multu $5,$3 multu $6,$4 sll $3,$5,4 addu $4,$4,$2 mfhi $5 addiu $4,$4,2293 mult $4,$2 mflo $4 ori $4,$5,36994 mult $4,$0 lui $5,34069 lui $4,10523 sll $0,$0,6 mtlo $0 lb $5,2($0) multu $2,$2 ori $0,$2,51489 addiu $4,$1,-7910 ori $6,$5,41242 srav $2,$4,$2 lui $6,60514 addu $3,$2,$3 addiu $1,$2,10130 sb $4,2($0) lui $4,4858 sb $1,0($0) divu $4,$ra mthi $4 lui $6,25148 multu $5,$1 srav $0,$4,$6 mtlo $5 mflo $4 srav $1,$1,$1 lb $0,11($0) srav $4,$2,$4 mthi $4 lui $5,36179 multu $4,$3 sb $1,16($0) lui $2,58467 lui $5,10148 sll $3,$3,11 mflo $0 multu $1,$1 sll $0,$5,20 lb $1,4($0) sll $3,$3,28 sll $3,$0,18 mflo $5 sb $5,12($0) sll $5,$3,8 div $1,$ra mflo $1 divu $2,$ra mult $4,$6 sb $5,3($0) sb $1,5($0) mthi $0 sll $1,$4,24 sll $2,$2,29 srav $1,$1,$0 mthi $1 mult $5,$2 sb $5,0($0) sb $6,11($0) addiu $2,$2,20249 mtlo $0 lb $4,14($0) div $4,$ra divu $4,$ra mflo $4 div $3,$ra div $0,$ra addu $1,$2,$2 sll $5,$0,19 addiu $6,$1,27235 mult $6,$6 multu $4,$4 mfhi $0 mfhi $5 lb $0,14($0) mfhi $1 mflo $3 multu $1,$1 multu $0,$0 lui $1,30705 div $5,$ra ori $5,$6,58193 lui $0,23857 lui $1,20955 multu $4,$4 divu $6,$ra lb $1,11($0) lb $5,10($0) addiu $4,$2,-16727 lb $5,16($0) sb $4,5($0) mthi $4 srav $4,$5,$3 addu $0,$2,$2 ori $5,$2,9257 mult $5,$2 sll $1,$5,3 multu $3,$2 ori $0,$3,244 sll $5,$5,21 addu $2,$2,$3 addiu $4,$5,-6430 multu $4,$6 ori $1,$2,47595 mtlo $4 addiu $6,$4,16096 lb $4,12($0) mtlo $3 mult $0,$0 div $4,$ra addiu $1,$4,28887 div $0,$ra lb $1,3($0) mthi $6 addiu $4,$4,4892 sll $2,$2,24 sb $5,0($0) mthi $2 srav $2,$2,$2 mfhi $5 srav $2,$1,$2 mtlo $5 mfhi $3 sll $5,$6,26 mflo $2 sb $0,12($0) ori $5,$2,42518 mtlo $4 mflo $4 addu $3,$2,$3 divu $6,$ra mfhi $1 sll $5,$2,31 mflo $5 mult $3,$2 multu $3,$3 mflo $4 mtlo $0 ori $1,$3,38752 mfhi $3 lui $3,41522 mult $3,$2 sll $4,$6,31 addiu $2,$0,-6788 ori $5,$5,14643 lb $6,12($0) lb $4,5($0) divu $0,$ra lui $1,15117 mult $4,$0 div $2,$ra multu $4,$2 mthi $1 addiu $5,$5,19601 ori $3,$0,15106 mfhi $4 sll $2,$2,24 ori $0,$0,41815 sll $5,$2,11 sb $5,2($0) lb $5,0($0) lb $4,12($0) sll $1,$4,14 mflo $4 mthi $2 lb $6,3($0) multu $0,$5 lui $4,48509 div $4,$ra mult $5,$6 mthi $6 mthi $6 multu $5,$6 srav $4,$4,$4 mthi $4 divu $5,$ra addu $1,$0,$2 lb $5,0($0) sb $2,15($0) sll $1,$4,24 multu $5,$2 mthi $5 div $6,$ra lb $0,8($0) lui $0,40185 mthi $4 multu $4,$4 mflo $5 lb $4,6($0) multu $4,$2 mthi $4 mfhi $5 divu $4,$ra ori $0,$2,3895 mtlo $4
benchmark/cwf/Chain.agda
shlevy/agda
1,989
3511
<filename>benchmark/cwf/Chain.agda module Chain {U : Set}(T : U -> Set) (_==_ : {a b : U} -> T a -> T b -> Set) (refl : {a : U}(x : T a) -> x == x) (trans : {a b c : U}(x : T a)(y : T b)(z : T c) -> x == y -> y == z -> x == z) where infix 30 _∼_ infix 3 proof_ infixl 2 _≡_by_ infix 1 _qed data _∼_ {a b : U}(x : T a)(y : T b) : Set where prf : x == y -> x ∼ y proof_ : {a : U}(x : T a) -> x ∼ x proof x = prf (refl x) _≡_by_ : {a b c : U}{x : T a}{y : T b} -> x ∼ y -> (z : T c) -> y == z -> x ∼ z prf p ≡ z by q = prf (trans _ _ _ p q) _qed : {a b : U}{x : T a}{y : T b} -> x ∼ y -> x == y prf p qed = p
GQLParser.g4
cangfengzhs/gql-grammar
0
5658
<filename>GQLParser.g4 parser grammar GQLParser; options { tokenVocab = GQLLexer; } root: requests? EOF; requests: (gqlRequest P_SEMI | emptyRequest)* ( gqlRequest P_SEMI? ) | emptyRequest; emptyRequest: P_SEMI; /* Section 6 */ // Section 6.1 <GQL-request> gqlRequest: requestParameterSet? gqlProgram; // Sectoin 6.2 request parameter set requestParameterSet: requestParameter (P_COMMA requestParameter)*; requestParameter: parameterDefinition; // Section 6.3 <GQL-program> gqlProgram: preamble? mainActivity; mainActivity: sessionActivity | sessionActivity? (transactionActivity sessionActivity?)+ sessionCloseCommand? | sessionCloseCommand; sessionActivity: sessionClearCommand sessionParameterCommand* | sessionParameterCommand+; sessionParameterCommand: sessionSetCommand | sessionRemoveCommand; transactionActivity: startTransactionCommand ( procedureSpecification endTransactionCommand? )? | procedureSpecification endTransactionCommand? | endTransactionCommand; // Section 6.4 <preamble> preamble: preambleOption (P_COMMA preambleOption)*; preambleOption: PROFILE | EXPLAIN | preambleOptionIdentifier (P_EQUAL literal)?; preambleOptionIdentifier: identifier; /* Section 7 Session management */ // Section 7.1 <session set command> sessionSetCommand: SESSION SET ( sessionSetSchemaClause | sessionSetGraphClause | sessionSetTimeZoneClause | sessionSetParameterClause ); sessionSetSchemaClause: schemaResolutionExpression; sessionSetGraphClause: graphResolutionExpression; sessionSetTimeZoneClause: TIME ZONE setTimeZoneValue; setTimeZoneValue: stringValueExpression; sessionSetParameterClause: sessionParameterFlag? sessionParameter (IF NOT EXISTS)?; sessionParameter: PARAMETER parameterDefinition; sessionParameterFlag: MUTABLE | FINAL; // Section 7.2 <session remove command> sessionRemoveCommand: SESSION? REMOVE parameter (IF EXISTS)?; // Section 7.3 <session clear command> sessionClearCommand: SESSION? CLEAR; // Section 7.4 <session close command> sessionCloseCommand: SESSION? CLOSE; /* Section 8 Transaction Management */ // Section 8.1 <start transaction command> startTransactionCommand: START TRANSACTION transactionCharacteristics?; //Section 8.2 <end transaction command> endTransactionCommand: commitCommand | rollbackCommand; //Section 8.3 <transactin characteristics> transactionCharacteristics: transactionMode (P_COMMA transactionMode)*; transactionMode: transactionAccessMode; //| implementationDefinedAccessMode; transactionAccessMode: READ ONLY | READ WRITE; implementationDefinedAccessMode:; //TODO: Syntax Rules // Section 8.4 <rollback command> rollbackCommand: ROLLBACK; // Section 8.5 <commit command> commitCommand: COMMIT; /* Section 9 Procedure */ // Section 9.1 <procedure specification> nestedProcedureSpecification: '(' procedureSpecification ')'; procedureSpecification: catalogModifyingProcedureSpecification | dataModifyingProcedureSpecification | querySpecification | functionSpecification; nestedCatalogModifyingProcedureSpecification: '(' catalogModifyingProcedureSpecification ')'; catalogModifyingProcedureSpecification: procedureBody; // NOTE: Predicative production rule. nestedDataModifyingProcedureSpecification: '(' dataModifyingProcedureSpecification ')'; dataModifyingProcedureSpecification: procedureBody; //NOTE: Predicative production rule. // Section 9.2 <query specification> nestedQuerySpecification: '(' querySpecification ')'; querySpecification: procedureBody; //NOTE: Predicative production rule. // Section 9.3 <function specification> nestedFunctionSpecification: '(' functionSpecification ')'; functionSpecification: procedureBody; //NOTE: Predicative production rule. // Section 9.4 <procedure body> procedureBody: definitionBlock? statementBlock; definitionBlock: staticVariableDefinition+ bindingVariableDefinition+; statementBlock: statement (THEN statement)*; /* Section 10 Variable and parameter declarations and definitions */ // Section 10.1 Static variable definitions staticVariableDefinitionList: staticVariableDefinition (P_COMMA staticVariableDefinition)*; staticVariableDefinition: schemaVariableDefinition | graphTypeVariableDefinition | procedureVariableDefinition | queryVariableDefinition | functionVariableDefinition | pathPatternVariableDefinition; // Section 10.2 Schema variable definition schemaVariableDefinition: SCHEMA staticVariableName schemaInitializer; schemaInitializer: (AS | P_EQUAL) schemaReference | P_COLON catalogSchemaReference; // Section 10.3 Graph type variable definition graphTypeVariableDefinition: PROPERTY? GRAPH TYPE graphTypeVariable graphTypeInitializer; graphTypeVariable: bindingVariableName; graphTypeInitializer: asGraphType | P_COLON catalogGraphTypeReference; // Section 10.4 Procedure variable definition procedureVariableDefinition: CATALOG? PROCEDURE procedureVariable ofTypeSignature procedureInitializer; procedureVariable: staticVariableName; procedureInitializer: (AS | P_EQUAL) procedureReference | AS? nestedProcedureSpecification | P_COLON catalogProcedureReference; // Section 10.5 Query variable definition queryVariableDefinition: QUERY queryVariable ofTypeSignature queryInitializer; queryVariable: staticVariableName; queryInitializer: (AS | P_EQUAL) queryReference | AS? nestedQuerySpecification | P_COLON catalogQueryReference; // Section 10.6 Functin variable definition functionVariableDefinition: FUNCTION functionVariable ofTypeSignature functionInitializer; functionVariable: staticVariableName; functionInitializer: (AS | P_EQUAL) functionReference | AS? nestedFunctionSpecification | P_COLON catalogFunctionReference; // Section 10.7 Path pattern variable definition pathPatternVariableDefinition: PATH PATTERN pathPatternVariable pathPatternInitializer; pathPatternInitializer: (AS | P_EQUAL)? pathPatternDefinition | P_COLON catalogPathPatternReference; pathPatternDefinition: COPY OF pathPatternReference | pathPatternExpression; pathPatternVariable: staticVariableName; // Section 10.8 Binding variable and parameter declarations and definitions compactVariableDeclarationList: compactVariableDeclaration ( P_COMMA compactVariableDeclaration )*; compactVariableDeclaration: bindingVariableDeclaration | valueVariable; bindingVariableDeclaration: graphVariableDeclaration | bindingTableVariableDeclaration | valueVariableDeclaration; compactVariableDefinitionList: compactVariableDefinition (P_COMMA compactVariableDefinition)*; compactVariableDefinition: compactValueVariableDefinition | bindingVariableDefinition; compactValueVariableDefinitionList: compactValueVariableDefinition ( P_COMMA compactValueVariableDefinition )*; compactValueVariableDefinition: valueVariable P_EQUAL valueExpression; bindingVariableDefinitionList: bindingVariableDefinition (P_COMMA bindingVariableDefinition)*; bindingVariableDefinition: graphVariableDefinition | bindingTableVariableDefinition | valueVariableDefinition; optionalBindingVariableDefinition: optionalGraphVariableDefinition | optionalBindingTableVariableDefinition | optionalValueVariableDefinition; parameterDefinition: graphParameterDefinition | bindingTableParameterDefinition | valueParameterDefinition; // Section 10.9 Graph variable and parameter declaration and definition graphVariableDeclaration: PROPERTY? GRAPH graphVariable ofGraphType; optionalGraphVariableDefinition: graphVariableDefinition; graphVariableDefinition: PROPERTY? GRAPH graphVariable ofGraphType graphInitializer; graphParameterDefinition: PROPERTY? GRAPH parameterName IF_NOT_EXISTS? ofGraphType graphInitializer; graphVariable: bindingVariableName; graphInitializer: (AS | P_EQUAL) graphExpression | AS? nestedGraphQuerySpecification | P_COLON catalogGraphTypeReference; // Section 10.10 Binding table variable and parameter declaration and definition bindingTableVariableDeclaration: BINDING? TABLE bindingTableVariable ofBindingTableType; optionalBindingTableVariableDefinition: bindingTableVariableDefinition; bindingTableVariableDefinition: BINDING? TABLE bindingTableVariable ofBindingTableType bindingTableInitializer; bindingTableParameterDefinition: BINDING? TABLE parameter IF_NOT_EXISTS? ofBindingTableType bindingTableInitializer; bindingTableVariable: bindingVariableName; bindingTableInitializer: (AS | P_EQUAL) bindingTableReference | AS? nestedQuerySpecification | P_COLON catalogBindingTableReference; // Section 10.11 Value variable and parameter declaration and definition valueVariableDeclaration: VALUE valueVariable ofValueType; optionalValueVariableDefinition: valueVariableDefinition; valueVariableDefinition: VALUE valueVariable ofValueType? valueInitializer; valueParameterDefinition: VALUE parameter IF_NOT_EXISTS? ofValueType? valueInitializer; valueVariable: bindingVariableName; valueInitializer: (AS | P_EQUAL) valueExpression | AS? nestedQuerySpecification | P_COLON catalogObjectReference; /* Section 11 Object expressions */ //Section 11.2 <primary result object expression> primaryResultObjectExpression: graphExpression | bindingTableReference; // Section 11.3 <graph expression> graphExpression: copyGraphExpression | graphSpecification | graphReference; copyGraphExpression: COPY OF graphExpression; // Section 11.4 <graph type expression> graphTypeExpression: copyGraphTypeExpression | likeGraphExpression | graphTypeSpecification | graphTypeReference; asGraphType: (AS | P_EQUAL) graphTypeExpression | likeGraphExpressionShorthand | AS? nestedGraphTypeSpecification; copyGraphTypeExpression: COPY OF graphTypeReference; likeGraphExpression: PROPERTY? GRAPH TYPE likeGraphExpressionShorthand; ofGraphType: ofTypePrefix? graphTypeExpression | likeGraphExpressionShorthand | ofTypePrefix? nestedGraphTypeSpecification; likeGraphExpressionShorthand: LIKE graphExpression; // Section 11.5 <binding table type expression> ofBindingTableType: ofTypePrefix? bindingTableTypeExpression | likeBindingTableShorthand; bindingTableTypeExpression: bindingTableType | likeBindingTableType; bindingTableType: BINDING? TABLE recordValueType; likeBindingTableType: BINDING? TABLE likeBindingTableShorthand; likeBindingTableShorthand: LIKE bindingTableReference; /* Section 12 statements */ // Section 12.1 <statement> statement: atSchemaClause? ( catalogModifyingStatement | dataModifyingStatement | queryStatement ); catalogModifyingStatement: linearCatalogModifyingStatement; dataModifyingStatement: conditionalDataModifyingStatement | linearDataModifyingStatement; queryStatement: compositeQueryStatement | conditionalQueryStatement | selectStatement; // Section 12.2 <call procedure statement> callProcedureStatement: statementMode? CALL procedureCall; statementMode: OPTIONAL | MANDATORY; // Section 12.3 Statement classes simpleCatalogModifyingStatement: primitiveCatalogModifyingStatement | callCatalogModifyingProcedureStatement; primitiveCatalogModifyingStatement: createGraphStatement | createGraphTypeStatement | createConstantStatement | createProcedureStatement | createQueryStatement | createFunctionStatement | createPathPatternStatement | dropGraphStatement | dropGraphTypeStatement | dropConstantStatement | dropProcedureStatement | dropQueryStatement | dropFunctionStatement | dropPathPatternStatement; simpleDataAccessingStatement: simpleQueryStatement | simpleDataModifyingStatement; simpleDataModifyingStatement: primitiveDataModifyingStatement | doStatement | callDataModifyingProcedureStatement; primitiveDataModifyingStatement: insertStatement | mergeStatement | setStatement | removeStatement | deleteStatement; simpleQueryStatement: simpleDataTransformingStatement | simpleDataReadingStatement; simpleDataReadingStatement: matchGraphStatement | matchStatement | callQueryStatement; simpleDataTransformingStatement: primitiveDataTransformingStatement | callFunctionStatement; primitiveDataTransformingStatement: optionalStatement | mandatoryStatement | letStatement | forStatement | aggregateStatement | filterStatement | orderByAndPageStatement; /* Section 13 Catalog-modifying statements*/ // Section 13.1 <linear catalog-modifying statement> linearCatalogModifyingStatement: simpleCatalogModifyingStatement+; // Section 13.2 <create schema statement> createSchemaStatement: CREATE ( SCHEMA catalogSchemaParentAndName IF_NOT_EXISTS? | OR REPLACE SCHEMA catalogSchemaParentAndName ); // Section 13.3 <drop schema statement> dropSchemaStatement: DROP SCHEMA catalogSchemaParentAndName IF_EXISTS; // Section 13.4 <create graph statement> createGraphStatement: CREATE ( PROPERTY? GRAPH catalogGraphParentAndName IF_NOT_EXISTS? | OR REPLACE PROPERTY? GRAPH catalogGraphParentAndName ) ofGraphType? graphSource?; graphSource: AS copyGraphExpression; // Section 13.5<graph specification> graphSpecification: PROPERTY? GRAPH ( nestedGraphQuerySpecification | nestedAmbientDataModifyingProcedureSpecification ); nestedGraphQuerySpecification: nestedQuerySpecification; nestedAmbientDataModifyingProcedureSpecification: nestedDataModifyingProcedureSpecification; // Section 13.6 <drop graph statement> dropGraphStatement: DROP GRAPH catalogGraphParentAndName IF_EXISTS?; // Section 13.7 <create graph type statement> createGraphTypeStatement: CREATE ( PROPERTY? GRAPH TYPE catalogGraphTypeParentAndName IF_NOT_EXISTS? | OR REPLACE PROPERTY? GRAPH TYPE catalogGraphTypeParentAndName ) graphTypeInitializer; // Section 13.8 <graph type specification> graphTypeSpecification: PROPERTY? GRAPH TYPE nestedGraphTypeSpecification; nestedGraphTypeSpecification: '(' graphTypeSpecificationBody ')'; graphTypeSpecificationBody: elementTypeDefinitionList; elementTypeDefinitionList: elementTypeDefinition (P_COMMA elementTypeDefinition)*; elementTypeDefinition: nodeTypeDefinition | edgeTypeDefinition; // Section 13.9 <node type definition> nodeTypeDefinition: '(' nodeTypeName? nodeTypeFiller? ')' | NODE_SYNONYM TYPE? nodeTypeName nodeTypeFiller; nodeTypeName: elementTypeName; // NOTE: Predicative production rule. nodeTypeFiller: nodeTypeLabelSetDefinition | nodeTypePropertyTypeSetDefinition | nodeTypeLabelSetDefinition nodeTypePropertyTypeSetDefinition; nodeTypeLabelSetDefinition: labelSetDefinition; // NOTE: Predicative production rule. nodeTypePropertyTypeSetDefinition: propertyTypeSetDefinition; // NOTE: Predicative production rule. // Section 13.10 <edge type definition> edgeTypeDefinition: fullEdgeTypePattern | abbreviatedEdgeTypePattern | edgeKind EDGE_SYNONYM TYPE? edgeTypeName edgeTypeFiller endPointDefinition; edgeTypeName: elementTypeName; // NOTE: Predicative production rule. edgeTypeFiller: edgeTypeLabelSetDefinition | edgeTypePropertyTypeSetDefinition | edgeTypeLabelSetDefinition edgeTypePropertyTypeSetDefinition; edgeTypeLabelSetDefinition: labelSetDefinition; // NOTE: Predicative production rule. edgeTypePropertyTypeSetDefinition: propertyTypeSetDefinition; // NOTE: Predicative production rule. fullEdgeTypePattern: fullEdgeTypePatternPointingRight | fullEdgeTypePatternPointingLeft | fullEdgeTypePatternAndDirection; fullEdgeTypePatternPointingRight: sourceNodeTypeReference arcTypePointingRight destinationNodeTypeReference; fullEdgeTypePatternPointingLeft: destinationNodeTypeReference arcTypePointingLeft sourceNodeTypeReference; fullEdgeTypePatternAndDirection: sourceNodeTypeReference arcTypeAnyDirection destinationNodeTypeReference; arcTypePointingRight: MINUS_LEFT_BRACKET arcTypeFiller BRACKET_RIGHT_ARROW; arcTypePointingLeft: LEFT_ARROW_BRACKET arcTypeFiller RIGHT_BRACKET_MINUS; arcTypeAnyDirection: TILDE_LEFT_BRACKET arcTypeFiller RIGHT_BRACKET_TILDE; arcTypeFiller: edgeTypeName? edgeTypeFiller?; abbreviatedEdgeTypePattern: abbreviatedEdgeTypePatternPointingRight | abbreviatedEdgeTypePatternPointingLeft | abbreviatedEdgeTypePatternAnyDirection; abbreviatedEdgeTypePatternPointingRight: sourceNodeTypeReference RIGHT_ARROW destinationNodeTypeReference; abbreviatedEdgeTypePatternPointingLeft: destinationNodeTypeReference LEFT_ARROW sourceNodeTypeReference; abbreviatedEdgeTypePatternAnyDirection: sourceNodeTypeReference P_TILDE destinationNodeTypeReference; sourceNodeTypeReference: '(' sourceNodeTypeName ')' | '(' nodeTypeFiller? ')'; destinationNodeTypeReference: '(' destinationNodeTypeName ')' | '(' nodeTypeFiller? ')'; edgeKind: DIRECTED | UNDIRECTED; endPointDefinition: CONNECTING endpointPairDefinition; endpointPairDefinition: endpointPairDefinitionPointingRight | endpointPairDefinitionPointingLeft | endpointPairDefinitionAndDirection | abbreviatedEdgeTypePattern; endpointPairDefinitionPointingRight: '(' sourceNodeTypeName connectorPointingRight destinationNodeTypeName ')'; endpointPairDefinitionPointingLeft: '(' sourceNodeTypeName LEFT_ARROW destinationNodeTypeName ')'; endpointPairDefinitionAndDirection: '(' sourceNodeTypeName connectorAnyDirection destinationNodeTypeName ')'; connectorPointingRight: TO | RIGHT_ARROW; connectorAnyDirection: TO | P_TILDE; sourceNodeTypeName: elementTypeName; // NOTE: Predicative production rule. destinationNodeTypeName: elementTypeName; // NOTE: Predicative production rule. // Section 13.11 <lable set definition> labelSetDefinition: LABEL label | LABELS labelExpression | isLabelExpression; // Section 13.12 <property type set definition> propertyTypeSetDefinition: '{' propertyTypeDefinitionList? '}'; propertyTypeDefinitionList: propertyTypeDefinition (P_COMMA propertyTypeDefinition)*; propertyTypeDefinition: propertyName typeName; // Section 13.13 <drop graph type statement> dropGraphTypeStatement: DROP PROPERTY? GRAPH TYPE catalogGraphTypeParentAndName IF_EXISTS?; // Section 13.14 <create constant statement> createConstantStatement: CREATE ( CONSTANT VALUE? catalogValueParentAndName IF_NOT_EXISTS? | OR REPLACE CONSTANT VALUE? catalogValueParentAndName ) valueInitializer; // Section 13.15 <drop constant statement> dropConstantStatement: DROP CONSTANT VALUE? catalogValueParentAndName IF_EXISTS?; // Section 13.16 <create procedure statement> createProcedureStatement: CREATE ( PROCEDURE catalogProcedureParentAndName ofTypeSignature IF_NOT_EXISTS? | OR REPLACE PROCEDURE catalogProcedureParentAndName ofTypeSignature ) procedureInitializer; // Section 13.17 <drop procedure statement> dropProcedureStatement: DROP PROCEDURE catalogProcedureParentAndName IF_EXISTS?; // Section 13.18 <create query statement> createQueryStatement: CREATE ( QUERY catalogQueryParentAndName ofTypeSignature IF_NOT_EXISTS? | OR REPLACE QUERY catalogQueryParentAndName ofTypeSignature ) queryInitializer; // Section 13.19 <drop query statement> dropQueryStatement: DROP QUERY catalogQueryParentAndName IF_EXISTS?; // Section 13.20 <create function statement> createFunctionStatement: CREATE ( FUNCTION catalogFunctionParentAndName ofTypeSignature IF_NOT_EXISTS? | OR REPLACE FUNCTION catalogFunctionParentAndName ofTypeSignature ) functionInitializer; // Section 13.21 <drop function statement> dropFunctionStatement: DROP FUNCTION catalogFunctionParentAndName IF_EXISTS?; // Section 13.22 <create path pattern statement> createPathPatternStatement: CREATE ( PATH PATTERN catalogPathPatternParentAndName IF_NOT_EXISTS? | OR REPLACE PATH PATTERN catalogPathPatternParentAndName ) pathPatternInitializer; // Section 13.23 <drop path pattern statement> dropPathPatternStatement: DROP PATH PATTERN catalogPathPatternParentAndName IF_EXISTS?; // Sectoin 13.24 <call catalog-modifying procedure statement> callCatalogModifyingProcedureStatement: callProcedureStatement; /* Section 14 Data-modifying statements */ // Section 14.1 <linear data-modifying statement> linearDataModifyingStatement: focusedLinearDataModifyingStatement | ambientLinearDataModifyingStatement; focusedLinearDataModifyingStatement: useGraphClause focusedLinearDataModifyingStatementBody+; focusedLinearDataModifyingStatementBody: simpleLinearQueryStatement? ( useGraphClause simpleLinearQueryStatement )* simpleDataModifyingStatement simpleDataAccessingStatement* ( useGraphClause simpleDataAccessingStatement )* primitiveResultStatement? | nestedDataModifyingProcedureSpecification; ambientLinearDataModifyingStatement: simpleLinearQueryStatement? simpleDataModifyingStatement simpleDataAccessingStatement* primitiveResultStatement? | nestedDataModifyingProcedureSpecification; // Section 14.2 <conditional data-modiyfing statement> conditionalDataModifyingStatement: whenThenLinearDataModifyingStatementBranch+ elseLinearDataModifyingStatementBranch?; whenThenLinearDataModifyingStatementBranch: whenClause THEN linearDataModifyingStatement | whenClause nestedDataModifyingProcedureSpecification; elseLinearDataModifyingStatementBranch: ELSE linearDataModifyingStatement; whenClause: WHEN searchCondition; // Section 14.3 <do statement> doStatement: DO nestedDataModifyingProcedureSpecification; // Section 14.4 <insert statement> insertStatement: INSERT simpleGraphPattern | OPTIONAL INSERT simpleGraphPattern whenClause?; // Section 14.5 <merge statement> mergeStatement: MERGE simpleGraphPattern; // Section 14.6 <set statement> setStatement: SET setItemList whenClause?; setItemList: setItem (P_COMMA setItem)*; setItem: setPropertyItem | setAllPropertiesItem | setLabelItem; setPropertyItem: bindingVariable P_DOT propertyName P_EQUAL valueExpression; setAllPropertiesItem: bindingVariable P_EQUAL valueExpression; setLabelItem: labelSetExpression; labelSetExpression: P_AMPERSAND label+ (P_AMPERSAND label+); // grammar error? // Section 14.7 <remove statement> removeStatement: REMOVE removeItemList whenClause?; removeItemList: removeItem (P_COMMA removeItem)*; removeItem: removePropertyItem | removeLabelItem; removePropertyItem: bindingVariable P_DOT propertyName; removeLabelItem: bindingVariable P_COLON labelSetExpression; // Section 14.8 <delete statement> deleteStatement: DETACH? DELETE deleteItemList whenClause?; deleteItemList: deleteItem (P_COMMA deleteItem)*; deleteItem: valueExpression; // Section 14.9 <call data-moidifying procedure statement> callDataModifyingProcedureStatement: callProcedureStatement; /* Section 15 Querty statements*/ // Section 15.1 <composite query statement> compositeQueryStatement: compositeQueryExpression; // Section 15.2 <conditional query statement> conditionalQueryStatement: whenThenLinearQueryBranch+ elseLinearQueryBranch?; whenThenLinearQueryBranch: whenClause THEN linearQueryExpression | whenClause nestedQuerySpecification; elseLinearQueryBranch: ELSE linearQueryExpression; // Session 15.3 <composite query expression> compositeQueryExpression: linearQueryExpression ( queryConjunction linearQueryExpression )*; queryConjunction: setOperator | OTHERWISE; setOperator: (UNION | EXCEPT | INTERSECT) setOperatorQuantifier?; setOperatorQuantifier: setQuantifier | MAX; // Session 15.4 <linear query expression> linearQueryExpression: linearQueryStatement; // Session 15.5 <linear query statement> linearQueryStatement: focusedLinearQueryStatement | ambientLinearQueryStatement; focusedLinearQueryStatement: fromGraphClause focusedLinearQueryStatementBody; focusedLinearQueryStatementBody: simpleLinearQueryStatement ( fromGraphClause simpleLinearQueryStatement )* primitiveResultStatement | nestedQuerySpecification; ambientLinearQueryStatement: simpleLinearQueryStatement primitiveResultStatement | nestedQuerySpecification; simpleLinearQueryStatement: simpleQueryStatement; /* Section 15.6 Data-Reading statments */ // Section 15.6.1 <match graph statement> matchGraphStatement: statementMode? MATCH graphKeywords graphObjectPattern; graphKeywords: PROPERTY? (GRAPH | GRAPHS); // Section 15.6.2 <match statement> matchStatement: statementMode? MATCH graphPattern; // Section 15.6.3 <call query statement> callQueryStatement: callProcedureStatement; /* Section 15.7 Data-transforming statements */ // Section 15.7.1 <mandatory statement> mandatoryStatement: MANDATORY procedureCall; // Section 15.7.2 <optional statement> optionalStatement: OPTIONAL procedureCall; // Section 15.7.3 <filter statement> filterStatement: FILTER (whereClause | searchCondition); // Section 15.7.4 <let statement> letStatement: LET compactVariableDefinitionList | statementMode LET compactVariableDefinitionList whereClause; // Section 15.7.5 <aggregate statement> aggregateStatement: AGGREGATE compactValueVariableDefinitionList whereClause; // Section 15.7.6 <for statement> forStatement: statementMode? FOR forItemList forOrdinalityOrIndex? whereClause?; forItemList: forItem (AND forItem)*; forItem: forItemAlias collectionValueExpression; forItemAlias: <identifier> IN; forOrdinalityOrIndex: WITH (ORDINALITY | INDEX) identifier?; // Section 15.7.7 <order by and page statement> orderByAndPageStatement: orderingAndPagingClauses; // Section 15.7.8 <call function statement> callFunctionStatement: callProcedureStatement; /* Section 15.8 Result projection statements */ // Section 15.8.1 <primitive result statement> primitiveResultStatement: returnStatement | projectStatement | END; // Section 15.8.2 <return statement> returnStatement: RETURN returnStatementBody; returnStatementBody: setQuantifier? (P_STAR | returnItemList) groupByClause? orderingAndPagingClauses?; returnItemList: returnItem (P_COMMA returnItem)*; returnItem: valueExpression returnItemAlias?; returnItemAlias: AS identifier; // Section 15.8.3 <select statement> selectStatement: SELECT setQuantifier? selectItemList selectStatementBody whereClause? groupByClause? havingClause? orderByClause? offsetClause? limitClause?; selectItemList: selectItem (P_COMMA selectItem)*; selectItem: valueExpression selectItemAlias?; selectItemAlias: AS identifier; havingClause: HAVING searchCondition; selectStatementBody: selectGraphMatches+ | selectQuerySpecification; selectGraphMatches: fromGraphClause matchStatement+; selectQuerySpecification: FROM nestedQuerySpecification | fromGraphClause nestedQuerySpecification; // Section 15.8.4 <project statement> projectStatement: PROJECT valueExpression; /* Section 16 Common elements */ // Section 16.1 <from graph clause> fromGraphClause: FROM graphExpression; // Section 16.2 <use graph clause> useGraphClause: USE graphExpression; // Section 16.3 <at schema clause> atSchemaClause: AT schemaReference; // Section 16.4 Named elements staticVariable: staticVariableName; bindingVariable: bindingVariableName; label: labelName; parameter: parameterName; // Section 16.5 <type signature> ofTypeSignature: ofTypePrefix? typeSignature; typeSignature: parenthesizedFormalParameterList ofTypePrefix? procedureResultType; parenthesizedFormalParameterList: '(' formalParameterList? ')'; formalParameterList: mandatoryFormalParameterList ( P_COMMA optionalFormalParameterList )? | optionalFormalParameterList; mandatoryFormalParameterList: formalParameterDeclarationList; optionalFormalParameterList: OPTIONAL formalParameterDefinitionList; formalParameterDeclarationList: formalParameterDeclaration ( P_COMMA formalParameterDeclaration )*; formalParameterDefinitionList: formalParameterDefinition (P_COMMA formalParameterDefinition)*; formalParameterDeclaration: parameterCardinality compactVariableDeclaration; formalParameterDefinition: parameterCardinality compactVariableDefinition; optionalParameterCardinality: parameterCardinality?; parameterCardinality: SINGLE | MULTI | MULTIPLE; procedureResultType: valueType; // Section 16.6 <graph object pattern> graphObjectPattern: graphObjectPatternVariableList whereClause? yieldClause?; graphObjectPatternVariableList: graphObjectPatternVariable ( P_COMMA graphObjectPatternVariable )*; graphObjectPatternVariable: graphVariable labelExpression?; // Section 16.7 <graph pattern> graphPattern: pathPatternList keepClause? graphPatternWhereClause? yieldClause?; pathPatternList: pathPattern (P_COMMA pathPattern)*; pathPattern: (pathVariable P_EQUAL)? pathPatternPrefix? pathPatternExpression; keepClause: KEEP pathPatternPrefix; graphPatternWhereClause: WHERE searchCondition; // Section 16.8 <path pattern expression> pathPatternExpression: pathTerm | pathMultisetAlternation | pathPatternUnion; pathMultisetAlternation: pathTerm P_MULTISET_ALTERNATION pathTerm ( P_MULTISET_ALTERNATION pathTerm )*; pathPatternUnion: pathTerm P_V_BAR pathTerm (P_V_BAR pathTerm)*; pathTerm: pathFactor+; pathFactor: pathPrimary | quantifiedPathPrimary | questionedPathPrimary; quantifiedPathPrimary: pathPrimary graphPatternQuantifier; questionedPathPrimary: pathPrimary P_QUESTION; pathPrimary: elementPattern | parenthesizedPathPatternExpression | simplifiedPathPatternExpression; elementPattern: nodePattern | edgePattern; nodePattern: '(' elementPatternFiller ')'; elementPatternFiller: elementVariableDeclaration? isLabelExpression? elementPatternPredicate? elementPatternCostClause ?; elementVariableDeclaration: elementVariable; isLabelExpression: (IS | P_COLON) labelExpression; elementPatternPredicate: elementPatternWhereClause | elementPropertySpecification; elementPatternWhereClause: WHERE searchCondition; elementPropertySpecification: '{' propertyKeyValuePairList '}'; propertyKeyValuePairList: propertyKeyValuePair (P_COMMA propertyKeyValuePair)*; propertyKeyValuePair: propertyName P_COLON valueExpression; elementPatternCostClause: costClause; costClause: COST valueExpression (DEFAULT valueExpression)?; edgePattern: fullEdgePattern | abbreviatedEdgePattern; fullEdgePattern: fullEdgePointingLeft | fullEdgePointingRight | fullEdgeUndirected | fullEdgeLeftOrUndirected | fullEdgeUndirectedOrRight | fullEdgeLeftOrRight | fullEdgeAnyDirection; fullEdgePointingLeft: LEFT_ARROW_BRACKET elementPatternFiller RIGHT_BRACKET_MINUS; fullEdgePointingRight: MINUS_LEFT_BRACKET elementPatternFiller BRACKET_RIGHT_ARROW; fullEdgeUndirected: TILDE_LEFT_BRACKET elementPatternFiller RIGHT_BRACKET_TILDE; fullEdgeLeftOrUndirected: LEFT_ARROW_TILDE_BRACKET elementPatternFiller RIGHT_BRACKET_TILDE; fullEdgeUndirectedOrRight: TILDE_LEFT_BRACKET elementPatternFiller BRACKET_TILDE_RIGHT_ARROW; fullEdgeLeftOrRight: LEFT_ARROW_BRACKET elementPatternFiller BRACKET_RIGHT_ARROW; fullEdgeAnyDirection: MINUS_LEFT_BRACKET elementPatternFiller RIGHT_BRACKET_MINUS; abbreviatedEdgePattern: LEFT_ARROW | P_TILDE | RIGHT_ARROW | LEFT_ARROW_TILDE | TILDE_RIGHT_ARROW | LEFT_MINUS_RIGHT | P_MINUS; graphPatternQuantifier: P_STAR | P_PLUS | fixedQuantifier | generalQuantifier; fixedQuantifier: '{' unsignedInteger '}'; generalQuantifier: '{' lowerBound = unsignedInteger? P_COMMA upperBound = unsignedInteger? '}'; parenthesizedPathPatternExpression: '(' subpathVariableDeclaration? pathModePrefix? pathPatternExpression parenthesizedPathPatternWhereClause? parenthesizedPathPatternCostClause? ')' | '[' subpathVariableDeclaration? pathModePrefix? pathPatternExpression parenthesizedPathPatternWhereClause? parenthesizedPathPatternCostClause? ']'; subpathVariableDeclaration: subpathVariable P_EQUAL; parenthesizedPathPatternWhereClause: WHERE searchCondition; parenthesizedPathPatternCostClause: costClause; // Section 16.9 <path pattern prefix> pathPatternPrefix: pathModePrefix | pathSearchPrefix; pathModePrefix: pathMode pathOrPaths?; pathMode: WALK | TRAIL | SIMPLE | ACYCLIC; pathSearchPrefix: allPathSearch | anyPathSearch | shortestPathSearch; allPathSearch: ALL pathMode? pathOrPaths?; pathOrPaths: (PATH | PATHS); anyPathSearch: ANY numberOfPaths? pathMode? pathOrPaths?; numberOfPaths: simpleValueSpecification; shortestPathSearch: allShortestPathSearch | anyShortestPathSearch | countedShortestPathSearch | countedShortestGroupSearch; allShortestPathSearch: ALL SHORTEST pathMode? pathOrPaths?; anyShortestPathSearch: ANY SHORTEST pathMode? pathOrPaths?; countedShortestPathSearch: SHORTEST numberOfPaths pathMode? pathOrPaths?; countedShortestGroupSearch: SHORTEST numberOfgroups pathMode? pathOrPaths? ( GROUP | GROUPS ); numberOfgroups: simpleValueSpecification; // Section 16.10<simple graph pattern> simpleGraphPattern: simplePathPatternList; simplePathPatternList: simplePathPattern (P_COMMA simplePathPattern)*; simplePathPattern: pathPattern; // NOTE: Predicative production rule. //Section 16.11<label expression> labelExpression: labelTerm ( P_V_BAR labelTerm)*; labelTerm: labelFactor (P_AMPERSAND labelFactor)*; labelFactor: labelPrimary | labelNegation; labelNegation: P_EXCLAMATION labelPrimary; labelPrimary: label | wildcardLabel | parenthesizedLabelExpression; wildcardLabel: P_PERCENT; parenthesizedLabelExpression: '(' labelExpression ')' | '[' labelExpression ']'; //Section 16.12<simplified path pattern expression> simplifiedPathPatternExpression: simplifiedDefaultingLeft | simplifiedDefaultingUndirected | simplifiedDefaultingRight | simplifiedDefaultingLeftOrUndirected | simplifiedDefaultingUndirectedOrRight | simplifiedDefaultingLeftOrRight | simplifiedDefaultingAnyDirection; simplifiedDefaultingLeft: LEFT_MINUS_SLASH simplifiedContents SLASH_MINUS; simplifiedDefaultingUndirected: TILDE_SLASH simplifiedContents SLASH_TILDE; simplifiedDefaultingRight: MINUS_SLASH simplifiedContents SLASH_MINUS_RIGHT; simplifiedDefaultingLeftOrUndirected: LEFT_TILDE_SLASH simplifiedContents SLASH_TILDE; simplifiedDefaultingUndirectedOrRight: TILDE_SLASH simplifiedContents SLASH_TILDE_RIGTH; simplifiedDefaultingLeftOrRight: LEFT_MINUS_SLASH simplifiedContents SLASH_MINUS_RIGHT; simplifiedDefaultingAnyDirection: MINUS_SLASH simplifiedContents SLASH_MINUS; simplifiedContents: simplifiedTerm | simplifiedPathUnion | simplifiedMultisetAlternation; simplifiedPathUnion: simplifiedTerm (P_V_BAR simplifiedTerm)+; simplifiedMultisetAlternation: simplifiedTerm (P_MULTISET_ALTERNATION simplifiedTerm)+; simplifiedTerm: simplifiedFactorLow+; simplifiedFactorLow: simplifiedFactorHigh (P_AMPERSAND simplifiedFactorHigh)*; simplifiedFactorHigh: simplifiedTertiary | simplifiedQuantified | simplifiedQuestioned; simplifiedQuantified: simplifiedTertiary graphPatternQuantifier; simplifiedQuestioned: simplifiedTertiary P_QUESTION; simplifiedTertiary: simplifiedDirectionOverride | simplifiedSecondary; simplifiedDirectionOverride: simplifiedDirectionOverrideLeft | simplifiedDirectionOverrideUndirected | simplifiedDirectionOverrideRight | simplifiedDirectionOverrideLeftOrUndirected | simplifiedDirectionOverrideUndirectedOrRight | simplifiedDirectionOverrideLeftOrRight | simplifiedDirectionOverrideAnyDirection; simplifiedDirectionOverrideLeft: P_L_ANGLE_BRACKET simplifiedSecondary; simplifiedDirectionOverrideUndirected: P_TILDE simplifiedSecondary; simplifiedDirectionOverrideRight: simplifiedSecondary P_R_ANGLE_BRACKET; simplifiedDirectionOverrideLeftOrUndirected: LEFT_ARROW_TILDE simplifiedSecondary; simplifiedDirectionOverrideUndirectedOrRight: P_TILDE simplifiedSecondary P_R_ANGLE_BRACKET; simplifiedDirectionOverrideLeftOrRight: P_L_ANGLE_BRACKET simplifiedSecondary P_R_ANGLE_BRACKET; simplifiedDirectionOverrideAnyDirection: P_MINUS simplifiedSecondary; simplifiedSecondary: simplifiedPrimary | simplifiedNegation; simplifiedNegation: P_EXCLAMATION simplifiedPrimary; simplifiedPrimary: label | '(' simplifiedContents ')' | '[' simplifiedContents ']'; //Section 16.13<where clause> whereClause: WHERE searchCondition; //Section 16.14<procedure call> procedureCall: inlineProcedureCall | namedProcedureCall; //Section 16.15<inline procedure call> inlineProcedureCall: nestedProcedureSpecification; //Section 16.16<named procedure call> namedProcedureCall: procedureReference '(' procedureArgumentList? ')' yieldClause?; procedureArgumentList: procedureArgument (P_COMMA procedureArgument)*; procedureArgument: valueExpression; //Section 16.17<yield clause> yieldClause: YIELD yieldItemList; yieldItemList: yieldItem (P_COMMA yieldItem)*; yieldItem: yieldItemName yieldItemAlias?; yieldItemName: identifier; yieldItemAlias: AS identifier; //Section 16.18<group by clause> groupByClause: GROUP BY groupingElementList; groupingElementList: groupingElement (P_COMMA groupingElement)* | emptyGroupingSet; groupingElement: bindingVariable; emptyGroupingSet: '(' ')'; //Section 16.19<ordering and paging clauses> orderingAndPagingClauses: singleOrderingAndPagingClause+; singleOrderingAndPagingClause: orderByClause | offsetClause | limitClause; //Section 16.20<order by clause> orderByClause: ORDER BY sortSpecificationList orderByOrdinalityOrIndex?; orderByOrdinalityOrIndex: WITH (ORDINALITY | INDEX) identifier?; //Section 16.21<aggregate function> aggregateFunction: COUNT '(' P_STAR ')' | generalSetFunction | binarySetFunction; generalSetFunction: generalSetFunctionType '(' setQuantifier valueExpression ')'; binarySetFunction: binarySetFunctionType '(' dependentValueExpression P_COMMA independentValueExpression ')'; generalSetFunctionType: AVG | COUNT | MAX | MIN | SUM | PRODUCT | COLLECT | ST_Dev | ST_Dev_P; setQuantifier: (DISTINCT | ALL); binarySetFunctionType: PERCENTILE_CONT | PERCENTILE_DIST; dependentValueExpression: setQuantifier? numericValueExpression; independentValueExpression: numericValueExpression; //Section 16.22<sort specification list> sortSpecificationList: sortSpecification (P_COMMA sortSpecification)*; sortSpecification: sortKey orderingSpecification?; sortKey: valueExpression; orderingSpecification: (ASC | DESC); //Section 16.23<limit clause> limitClause: LIMIT numericValueExpression; //Section 16.24<offset clause> offsetClause: OFFSET numericValueExpression; /* Section 17 Object references */ //Section 17.1 Schema references schemaReference: schemaResolutionExpression | localSchemaReference; schemaResolutionExpression: SCHEMA catalogSchemaReference; catalogSchemaReference: catalogSchemaParentAndName | predefinedSchemaParameter | externalObjectReference; catalogSchemaParentAndName: schemaParentSpecification schemaName | urlPathParameter; schemaParentSpecification: parentCatalogObjectReference?; localSchemaReference: schemaName; //Section 17.2 Graph references graphReference: graphResolutionExpression | localGraphReference; graphResolutionExpression: PROPERTY? GRAPH catalogGraphReference; catalogGraphReference: catalogGraphParentAndName | predefinedGraphParameter | externalObjectReference; catalogGraphParentAndName: graphParentSpecification graphName | urlPathParameter; graphParentSpecification: parentCatalogObjectReference? (qualifiedObjectName P_DOT)?; localGraphReference: qualifiedGraphName; qualifiedGraphName: (qualifiedObjectName P_DOT)? graphName; //Section 17.3 Graph type references graphTypeReference: graphTypeResolutionExpression | localGraphTypeReference; graphTypeResolutionExpression: PROPERTY? GRAPH TYPE catalogGraphTypeReference; catalogGraphTypeReference: catalogGraphTypeParentAndName | externalObjectReference; catalogGraphTypeParentAndName: graphTypeParentSpecification graphTypeName | urlPathParameter; graphTypeParentSpecification: (parentCatalogObjectReference)? (qualifiedObjectName P_DOT)?; localGraphTypeReference: qualifiedGraphTypeName; qualifiedGraphTypeName: (qualifiedObjectName P_DOT)? graphTypeName; //Section 17.4 Binding table references bindingTableReference: bindingTableResolutionExpression | localBindingTableReference; bindingTableResolutionExpression: BINDING? TABLE catalogBindingTableReference; catalogBindingTableReference: catalogBindingTableParentAndName | predefinedTableParameter | externalObjectReference; catalogBindingTableParentAndName: bindingTableParentSpecification bindingTableName | urlPathParameter; bindingTableParentSpecification: parentCatalogObjectReference? (qualifiedObjectName P_DOT)?; localBindingTableReference: qualifiedBindingTableName; qualifiedBindingTableName: (qualifiedObjectName P_DOT)? bindingTableName; //Section 17.5 Value references valueReference: valueResolutionExpression | localValueReference; valueResolutionExpression: VALUE catalogValueReference; catalogValueReference: catalogValueParentAndName | externalObjectReference; catalogValueParentAndName: valueParentSpecification valueName | urlPathParameter; valueParentSpecification: parentCatalogObjectReference? (qualifiedObjectName P_DOT)?; localValueReference: qualifiedValueName; qualifiedValueName: (qualifiedObjectName P_DOT)? valueName; //Section 17.6 Procedure references procedureReference: procedureResolutionExpression | localProcedureReference; procedureResolutionExpression: PROCEDURE catalogProcedureReference; catalogProcedureReference: catalogProcedureParentAndName | externalObjectReference; catalogProcedureParentAndName: procedureParentSpecification procedureName | urlPathParameter; procedureParentSpecification: parentCatalogObjectReference? (qualifiedObjectName P_DOT)?; localProcedureReference: qualifiedProcedureName; qualifiedProcedureName: (qualifiedObjectName P_DOT)? procedureName; // Section 17.7 Query references queryReference: queryResolutionExpression | localQueryReference; queryResolutionExpression: QUERY catalogQueryReference; catalogQueryReference: catalogQueryParentAndName | externalObjectReference; catalogQueryParentAndName: queryParentSpecification queryName | urlPathParameter; queryParentSpecification: parentCatalogObjectReference? (qualifiedObjectName P_DOT)?; localQueryReference: qualifiedQueryName; qualifiedQueryName: (qualifiedObjectName P_DOT)? queryName; // Section 17.8 Function references functionReference: functionResolutionExpression | localFunctionReference; functionResolutionExpression: FUNCTION catalogFunctionReference; catalogFunctionReference: catalogFunctionParentAndName | externalObjectReference; catalogFunctionParentAndName: functionParentSpecification functionName | urlPathParameter; functionParentSpecification: parentCatalogObjectReference? (qualifiedObjectName P_DOT)?; localFunctionReference: qualifiedFunctionName; qualifiedFunctionName: (qualifiedObjectName P_DOT)? functionName; // Section 17.9 Path pattern references pathPatternReference: pathPatternResolutionExpression | localPathPatternReference; pathPatternResolutionExpression: PATH PATTERN catalogPathPatternReference; catalogPathPatternReference: catalogPathPatternParentAndName | externalObjectReference; catalogPathPatternParentAndName: pathPatternParentSpecification pathPatternName | urlPathParameter; pathPatternParentSpecification: parentCatalogObjectReference? (qualifiedObjectName P_DOT)?; localPathPatternReference: qualifiedPathPatternName; qualifiedPathPatternName: (qualifiedObjectName P_DOT)? pathPatternName; // Section 17.10<catalog object reference> catalogObjectReference: catalogUrlPath; parentCatalogObjectReference: catalogObjectReference P_SOLIDUS?; catalogUrlPath: absoluteUrlPath | relativeUrlPath | parameterizedUrlPath; absoluteUrlPath: P_SOLIDUS simpleUrlPath?; relativeUrlPath: parentObjectRelativeUrlPath | simpleRelativeUrlPath | P_DOT; parentObjectRelativeUrlPath: predefinedParentObjectParameter (P_SOLIDUS simpleUrlPath)?; simpleRelativeUrlPath: P_DOUBLE_DOT (P_SOLIDUS P_DOUBLE_DOT)* ( P_SOLIDUS simpleUrlPath )? | simpleUrlPath; parameterizedUrlPath: urlPathParameter (P_SOLIDUS simpleUrlPath)?; simpleUrlPath: urlSegment (P_SOLIDUS urlSegment)*; urlSegment: identifier; // Section 17.11<qualified object name> qualifiedObjectName: qualifiedNamePerfix objectName; qualifiedNamePerfix: (objectName P_DOT)*; // Section 17.12<url path parameter> urlPathParameter: parameter; // Section 17.13<external object reference> externalObjectReference: externalObjectUrl; /* TODO 1) Let EOR be the <external object reference>. 2) Let EOU be the <external object url> immediately contained in EOR 3) EOU shall either be an absolute-URL string or an absolute-URL-with-fragment string as specified by URL or it alternatively shall be an URI with a mandatory scheme as specified by RFC 3986 and RFC 3978. 4) EOU shall not conform to the Format for a <catalog url path>. */ externalObjectUrl:; /* Section 19 Predicates */ // Section 19.1 <search condition> searchCondition: booleanValueExpression; // Section 19.2 <predicate> predicate: comparisonPredicate | existsPredicate //| betweenPredicate | nullPredicate | normalizedPredicate; //Section 19.3 <comparison predicate> comparisonPredicate: valueExpressionPrimary compOp valueExpressionPrimary; compOp: ( P_EQUAL | P_NOT_EQUAL | P_LESS_THAN | P_GREATE_THAN | P_LESS_EQUAL | P_GREATE_EQUAL ); //Section 19.4 <exists predicate> existsPredicate: EXISTS ('(' graphPattern ')' | nestedQuerySpecification); //Section 19.5 <between predicate> /* This Subclause is a placeholder. Syntax for the TigerGraph variant is a subset of SQL’s. It is apparently absent from Cypher. Discussion is needed as to whether to adopt the TigerGraph or the SQL variant. It is in any case just a syntactic shorthand for a <search condition> involving <comparison predicate>s). See Possible Problem GQL-195 . */ betweenPredicate:; //TODO(hs.zhang) //Section 19.6 <null predicate> nullPredicate: valueExpressionPrimary IS NOT? NULL; //Section 19.7 <normalized predicate> normalizedPredicate: stringValueExpression IS NOT? normalForm? NORMALIZED; /* Section 20 Value expression */ // Section 20.1 <value specification> valueSpecification: literal | parameterValueSpecification; unsignedValueSpecification: unsignedLiteral | parameterValueSpecification; simpleValueSpecification: unsignedLiteral | parameter; parameterValueSpecification: parameter | predefinedParameter; predefinedParameter: predefinedParentObjectParameter | predefinedTableParameter | CURRENT_ROLE | CURRENT_USER; predefinedParentObjectParameter: predefinedSchemaParameter | predefinedGraphParameter; predefinedSchemaParameter: HOME_SCHEMA | CURRENT_SCHEMA; predefinedGraphParameter: EMPTY_PROPERTY_GRAPH | EMPTY_GRAPH | HOME_PROPERTY_GRAPH | HOME_GRAPH | CURRENT_PROPERTY_GRAPH | CURRENT_GRAPH; predefinedTableParameter: EMPTY_BINDING_TABLE | EMPTY_TABLE | UNIT_BINDING_TABLE | UNIT_TABLE; // Section 20.2 <value expression> valueExpression: untypedValueExpression ofValueType?; untypedValueExpression: commonValueExpression | booleanValueExpression; commonValueExpression: numericValueExpression | stringValueExpression | datetimeValueExpression | durationValueExpression | collectionValueExpression | mapValueExpression | recordValueExpression | referenceValueExpression; referenceValueExpression: primaryResultObjectExpression | graphElementValueExpression; collectionValueExpression: listValueExpression | multisetValueExpression | setValueExpression | orderedSetValueExpression; setValueExpression: valueExpressionPrimary; orderedSetValueExpression: valueExpressionPrimary; mapValueExpression: valueExpressionPrimary; recordValueExpression: valueExpressionPrimary; // Section 20.3 <boolean value expression> booleanValueExpression: booleanTerm | booleanValueExpression OR booleanTerm | booleanValueExpression XOR booleanTerm; booleanTerm: booleanFactor | booleanTerm AND booleanTerm; booleanFactor: NOT? booleanTest; booleanTest: booleanPrimary ( ((IS NOT?) | P_EQUAL | P_NOT_EQUAL) truthValue )?; truthValue: TRUE | FALSE | UNKNOWN | NULL; booleanPrimary: predicate | booleanPredicand; booleanPredicand: parenthesizedBooleanValueExpression | valueExpressionPrimary; parenthesizedBooleanValueExpression: '(' booleanValueExpression ')'; // Section 20.4 <numeric value expression> numericValueExpression: term | numericValueExpression P_PLUS term | numericValueExpression P_MINUS term; term: factor | term P_STAR factor | term P_SOLIDUS factor; factor: (P_MINUS | P_PLUS)? numericPrimary; numericPrimary: valueExpressionPrimary | numericValueFunction; // Section 20.5 <value expression primary> valueExpressionPrimary: ( '(' valueExpression ')' | graphElementFunction P_DOT propertyName | bindingVariable | parameterValueSpecification | unsignedValueSpecification | aggregateFunction | collectionValueConstructor | valueQueryExpression | caseExpression //| castSpecification ) (P_DOT propertyName)*; // Section 20.6 <numeric value function> numericValueFunction: lengthExpression | absoluteValueExpression | modulusExpression | trigonometricFunction | generalLogarithmFunction | commonLogarithm | naturalLogarithm | exponentialFunction | squareRoot | floorFunction | ceilingFunction | inDegreeFunction | outDegreeFunction; lengthExpression: charLengthExpression | octetLengthExpression | pathLengthExpression; charLengthExpression: CHARACTER_LENGTH '(' characterValueExpression ')'; octetLengthExpression: OCTET_LENGTH '(' stringValueExpression ')'; pathLengthExpression: LENGTH '(' bindingVariable ')'; absoluteValueExpression: ABS '(' numericValueExpression ')'; modulusExpression: MOD '(' numericValueExpressionDividend P_COMMA numericValueExpressionDivisor ')'; numericValueExpressionDividend: numericValueExpression; numericValueExpressionDivisor: numericValueExpression; trigonometricFunction: trigonometricFunctionName '(' numericValueExpression ')'; trigonometricFunctionName: SIN | COS | TAN | COT | SINH | COSH | TANH | ASIN | ACOS | ATAN | DEGREES | RADIANS; generalLogarithmFunction: LOG '(' generalLogarithmBase P_COMMA generalLogarithmArgument ')'; generalLogarithmBase: numericValueExpression; generalLogarithmArgument: numericValueExpression; commonLogarithm: LOG10 '(' numericValueExpression ')'; naturalLogarithm: LN '(' numericValueExpression ')'; exponentialFunction: EXP '(' numericValueExpression ')'; powerFunction: POWER '(' base = numericValueExpression P_COMMA exp = numericValueExpression ')'; squareRoot: SQRT '(' numericValueExpression ')'; floorFunction: FLOOR '(' numericValueExpression ')'; ceilingFunction: (CEIL | CEILING) '(' numericValueExpression ')'; inDegreeFunction: IN_DEGREE '(' bindingVariable ')'; outDegreeFunction: OUT_DEGREE '(' bindingVariable ')'; // Section 20.7 <string value expression> stringValueExpression: characterValueExpression | binaryValueExpression; characterValueExpression: characterFactor (P_CONCATENATION characterFactor)*; characterFactor: characterPrimary; characterPrimary: valueExpressionPrimary | stringValueFunction; binaryValueExpression: binaryFactor (P_CONCATENATION binaryFactor)*; binaryFactor: binaryPrimary; binaryPrimary: valueExpressionPrimary | stringValueFunction; // Section 20.8 <string value function> stringValueFunction: characterValueFunction | binaryValueFunction; characterValueFunction: characterSubstringFunction | fold | trimFunction | normalizeFunction; characterSubstringFunction: SUBSTRING '(' characterValueExpression P_COMMA startPosition ( P_COMMA stringLength )? ')' | LEFT '(' characterValueExpression P_COMMA stringLength ')' | RIGHT '(' characterValueExpression P_COMMA stringLength ')'; fold: (UPPER | TO_UPPER | LOWER | TO_LOWER) '(' characterValueExpression ')'; trimFunction: TRIM '(' trimSource ( P_COMMA trimSpecification trimCharacter? )? ')' | L_TRIM '(' trimSource ')' | R_TRIM '(' trimSource ')'; trimSource: characterValueExpression; trimSpecification: LEADING | TRAILING | BOTH; trimCharacter: characterValueExpression; normalizeFunction: NORMALIZE '(' characterValueExpression (P_COMMA normalForm) ')'; normalForm: NFC | NFD | NFKC | NFKD; binaryValueFunction: binarySubstringFunction | binaryTrimFunction; binarySubstringFunction: SUBSTRING '(' binaryValueExpression P_COMMA startPosition ( P_COMMA stringLength )? ')' | LEFT '(' binaryValueExpression P_COMMA stringLength ')' | RIGHT '(' binaryValueExpression P_COMMA stringLength ')'; binaryTrimFunction: TRIM '(' binaryTrimSource ( P_COMMA trimSpecification trimOctet? )? ')' | L_TRIM '(' binaryTrimSource ')' | R_TRIM '(' binaryTrimSource ')'; binaryTrimSource: binaryValueExpression; trimOctet: binaryValueExpression; startPosition: numericValueExpression; stringLength: numericValueExpression; // Section 20.9 <datetime value expression> datetimeValueExpression: datetimeTerm | durationValueExpression P_PLUS datetimeTerm | datetimeTerm (P_PLUS | P_MINUS) durationValueExpression; datetimeTerm: datetimeFactor; datetimeFactor: datetimePrimary; datetimePrimary: valueExpressionPrimary | datetimeValueFunction; // Section 20.10<datetime value function> datetimeValueFunction: dateFunction | timeFunction | datetimeFunction | localTimeFunction | localDatetimeFunction; dateFunction: CURRENT_DATE | DATE '(' dateFunctionParameters? ')'; timeFunction: CURRENT_TIME | TIME '(' timeFunctionParameters? ')'; localTimeFunction: LOCALTIME | LOCALTIME '(' timeFunctionParameters? ')'; datetimeFunction: CURRENT_TIMESTAMP | DATETIME '(' datetimeFunctionParameters? ')'; localDatetimeFunction: LOCALTIMESTAMP | LOCALDATETIME '(' datetimeFunctionParameters? ')'; dateFunctionParameters: dateString | mapValueConstructor; timeFunctionParameters: timeString | mapValueConstructor; datetimeFunctionParameters: datetimeString | mapValueConstructor; // Section 20.11<duration value expression> durationValueExpression: durationTerm | durationValueExpression (P_PLUS | P_MINUS) durationTerm | '(' datetimeValueExpression P_MINUS datetimeValueExpression ')'; durationTerm: durationFactor | durationTerm P_STAR factor | durationTerm P_SOLIDUS factor | term P_STAR durationFactor; durationFactor: (P_PLUS | P_MINUS)? durationPrimary; durationPrimary: valueExpressionPrimary | durationValueFunction; // Section 20.12<duration value function> durationValueFunction: durationFunction durationAbsoluteValueFunction; durationFunction: DURATION '(' durationFunctionParameters ')'; durationFunctionParameters: durationString = STRING_LITERAL | mapValueConstructor; durationAbsoluteValueFunction: ABS '(' durationValueExpression ')'; // Section 20.13<graph element value expression> graphElementValueExpression: ( graphElementFunction | valueExpressionPrimary ); // Section 20.14<graph element function> graphElementFunction: startNodeFunction | endNodeFunction; startNodeFunction: START_NODE '(' bindingVariable ')'; endNodeFunction: END_NODE '(' bindingVariable ')'; // Section 20.15<collection value constructor> collectionValueConstructor: listValueConstructor | setValueConstructor | multisetValueConstructor | orderedSetValueConstructor | mapValueConstructor | recordValueConstructor; // Section 20.16<list value expression> listValueExpression: listPrimary (P_CONCATENATION listPrimary)*; listPrimary: listValueFunction | valueExpressionPrimary; // Section 20.17<list value function> listValueFunction: tailListFunction | trimListFunction; tailListFunction: TAIL '(' listValueExpression ')'; trimListFunction: TRIM '(' listValueExpression P_COMMA numericValueExpression ')'; // Section 20.18<list value constructor> listValueConstructor: listValueConstructorByEnumeration; listValueConstructorByEnumeration: (ARRAY | LIST) '[' listElementList ']'; listElementList: listElement (P_COMMA listElement)*; listElement: valueExpression; // Section 20.19<multiset value expression> multisetValueExpression: multisetTerm | multisetValueExpression MULTISET (UNION | EXCEPT) ( ALL | DISTINCT )? multisetTerm; multisetTerm: multisetPrimary | multisetTerm MULTISET INTERSECT (ALL | DISTINCT)? multisetPrimary; multisetPrimary: multisetValueFunction | valueExpressionPrimary; // Section 20.20<multiset value function> multisetValueFunction: multisetSetFunction; multisetSetFunction: SET '(' multisetValueExpression ')'; // Section 20.21<multiset value constructor> multisetValueConstructor: multisetValueConstructorByEnumeration; multisetValueConstructorByEnumeration: MULTISET '{' multisetElementList '}'; multisetElementList: multisetElement (P_COMMA multisetElement)*; multisetElement: valueExpression; // Section 20.22<set value constructor> setValueConstructor: setValueConstructorByEnumeration; setValueConstructorByEnumeration: SET '{' setElementList '}'; setElementList: setElement (P_COMMA setElement)*; setElement: valueExpression; // Section 20.23<ordered set value constructor> orderedSetValueConstructor: orderedSetValueConstructorByEnumeration; orderedSetValueConstructorByEnumeration: ORDERED SET ( '{' orderedSetElementList '}' | '[' orderedSetElementList ']' ); orderedSetElementList: orderedSetElement (P_COMMA orderedSetElement)*; orderedSetElement: valueExpression; // Section 20.24<map value constructor> mapValueConstructor: mapValueConstructorByEnumeration; mapValueConstructorByEnumeration: MAP '{' mapElementList '}'; mapElementList: mapElement (P_COMMA mapElement)*; mapElement: mapKey mapValue; mapKey: valueExpression P_COLON; mapValue: valueExpression; // Section 20.25<record value constructor> recordValueConstructor: recordValueConstructorByEnumeration | UNIT; recordValueConstructorByEnumeration: RECORD? '{' fieldList '}'; fieldList: field (P_COMMA field)*; field: fieldName fieldValue; fieldValue: valueExpression; // Section 20.26<property reference> // Section 20.27<value query expression> valueQueryExpression: VALUE nestedQuerySpecification; // Section 20.28<case expression> caseExpression: caseAbbreviation | caseSpecification; caseAbbreviation: NULLIF '(' valueExpression P_COMMA valueExpression ')' | COALESCE '(' valueExpression (P_COMMA valueExpression)* ')'; caseSpecification: simpleCase | searchedCase; simpleCase: CASE caseOperand simpleWhenClause+ elseClause? END; searchedCase: CASE searchedWhenClause* elseClause? END; simpleWhenClause: WHEN whenOperandList THEN result; searchedWhenClause: WHEN searchCondition THEN result; elseClause: ELSE result; caseOperand: valueExpressionPrimary; whenOperandList: whenOperand (P_COMMA whenOperand)*; whenOperand: valueExpressionPrimary | compOp valueExpressionPrimary | IS NOT? NULL; result: resultExpression | NULL; resultExpression: valueExpression; // Section 20.29<cast specification> /* This Subclause is a placeholder. Syntax for SQL & Cypher variants are very different. SQL has a single <case specification> whereas Cypher has a set on individual functions: toBoolean, toInteger, toFloat, and toString. Cloning the SQL <case specification> since that is available in SQL/PGQ is probably preferable with the Cypher functions defined as syntactic shorthands. See Possible Problem GQL-195 . */ castSpecification:; //TODO /* Section Lexical elements */ literal: signedNumericLiteral | generalLiteral; generalLiteral: predefinedTypeLiteral | listLiteral | setLiteral | multisetLiteral | orderedSetLiteral | mapLiteral | recordLiteral; predefinedTypeLiteral: booleanLiteral | characterStringLiteral | binaryStringLiteral | temporalLiteral | durationLiteral | nullLiteral; unsignedLiteral: unsignedNumericLiteral | generalLiteral; booleanLiteral: TRUE | FALSE | UNKNOWN; characterStringLiteral: unbrokenCharacterStringLiteral ( (SPACE | P_COMMA)* unbrokenCharacterStringLiteral )*; unbrokenCharacterStringLiteral: STRING_LITERAL; binaryStringLiteral: BINARY_STRING_LITERAL; numericLiteral: signedNumericLiteral | unsignedNumericLiteral; signedNumericLiteral: ('+' | '-')? unsignedNumericLiteral; unsignedNumericLiteral: exactNumericLiteral | approximateNumericLiteral; exactNumericLiteral: unsignedInteger | unsignedDecimalInteger (P_DOT unsignedDecimalInteger?)? | P_DOT unsignedDecimalInteger; unsignedInteger: unsignedDecimalInteger | unsignedHexadecimalInteger | unsignedOctalInteger | unsignedBinaryInteger; unsignedDecimalInteger: UNSIGNED_DECIMAL_INTEGER; unsignedHexadecimalInteger: UNSIGNED_HEX_INTEGER; unsignedOctalInteger: UNSIGNED_OCT_INTEGER; unsignedBinaryInteger: UNSIGNED_BIN_INTEGER; signedDecimalInteger: ('+' | '-')? unsignedDecimalInteger; approximateNumericLiteral: mantissa P_EXP exponent; mantissa: exactNumericLiteral; exponent: signedDecimalInteger; temporalLiteral: dateLiteral | timeLiteral | datetimeLiteral; dateLiteral: DATE dateString; dateString: STRING_LITERAL; timeLiteral: TIME timeString; timeString: STRING_LITERAL; datetimeLiteral: (DATETIME | TIMESTAMP) datetimeString; datetimeString: STRING_LITERAL; durationLiteral: STRING_LITERAL; nullLiteral: NULL; listLiteral: listValueConstructorByEnumeration; setLiteral: setValueConstructorByEnumeration; multisetLiteral: multisetValueConstructorByEnumeration; orderedSetLiteral: orderedSetValueConstructorByEnumeration; mapLiteral: mapValueConstructorByEnumeration; recordLiteral: recordValueConstructorByEnumeration; // Section 21.2 <value type> valueType: ( ANY | predefinedType | graphElementType | mapValueType | recordValueType | graphTypeExpression | bindingTableTypeExpression | NOTHING ) collectionType*; collectionType: ARRAY | LIST | SET | MULTISET | ORDERED SET; ofValueType: ofTypePrefix? valueType; ofTypePrefix: P_COLON P_COLON | OF; predefinedType: booleanType | stringType | binaryStringType | numericType | temporalType; booleanType: BOOLEAN; stringType: CHARACTER? STRING; binaryStringType: BINARY STRING; numericType: exactNumericType | approximateNumericType; exactNumericType: binaryExactNumericType | decimalExactNumericType; binaryExactNumericType: INTEGER | INTEGER32 | INTEGER64; decimalExactNumericType: DECIMAL '(' precision (P_COMMA scale)? ')'; precision: unsignedDecimalInteger; scale: unsignedDecimalInteger; approximateNumericType: FLOAT | FLOAT32 | FLOAT64 | FLOAT128; temporalType: DATETIME | LOCALDATETIME | DATE | TIME | LOCALTIME | DURATION; graphElementType: NODE | VERTEX | EDGE | RELATIONSHIP | PATH; mapValueType: MAP '<' mapKeyType P_COMMA valueType '>'; mapKeyType: predefinedType; recordValueType: RECORD? '{' fieldTypeList? '}'; fieldTypeList: fieldType (P_COMMA fieldType)*; fieldType: fieldName ofTypePrefix? valueType; //Section 21.3 Names and identifiers objectName: identifier; schemaName: identifier; graphName: identifier; elementTypeName: typeName; typeName: identifier; graphTypeName: identifier; bindingTableName: identifier; valueName: identifier; procedureName: identifier; queryName: identifier; functionName: identifier; labelName: identifier; propertyName: identifier; fieldName: identifier; pathPatternName: identifier; parameterName: P_DOLLAR identifier; elementVariable: identifier; pathVariable: identifier; subpathVariable: identifier; staticVariableName: identifier; bindingVariableName: identifier; identifier: regularIdentifier | delimitedIdentifier; regularIdentifier: IDENTIFIER; delimitedIdentifier: DELIMITED_IDENTIFIER; //Section 21.4 <token> and <separator> other
Practicas/Practica_08/codigoFuente/P8.asm
CodeRevenge/Proyecto-seminario-traductores-i
0
167120
<filename>Practicas/Practica_08/codigoFuente/P8.asm<gh_stars>0 E1 EQU 50 ORG $4000 E5 EQU 15 JMP E1 JMP $E1 JMP ,X JMP 10,Y JMP -10,Y JMP 16,SP JMP -16,SP JMP 255,SP JMP 65535,SP E4 END
oeis/343/A343785.asm
neoneye/loda-programs
11
162555
<filename>oeis/343/A343785.asm<gh_stars>10-100 ; A343785: a(n) is completely multiplicative with a(p^e) = (-1)^e if p == 2 (mod 3) and a(p^e) = 1 otherwise. ; Submitted by <NAME>(s3) ; 1,-1,1,1,-1,-1,1,-1,1,1,-1,1,1,-1,-1,1,-1,-1,1,-1,1,1,-1,-1,1,-1,1,1,-1,1,1,-1,-1,1,-1,1,1,-1,1,1,-1,-1,1,-1,-1,1,-1,1,1,-1,-1,1,-1,-1,1,-1,1,1,-1,-1,1,-1,1,1,-1,1,1,-1,-1,1,-1,-1,1,-1,1,1,-1,-1,1,-1,1,1,-1,1,1,-1,-1,1,-1,1,1,-1,1,1,-1,-1,1,-1,-1,1 add $0,5 lpb $0 sub $0,1 dif $0,3 add $0,3 lpe mod $0,3 sub $0,1
music/Refresh.applescript
casey/local
18
2000
<gh_stars>10-100 property my_title : "Refresh" tell application "Music" repeat with aTrack in selection try refresh aTrack end try end repeat end tell
winxp_sp3/trun/pop_calc/winexec/calc_winexec.nasm
danf42/vulnserver
0
2125
[BITS 32] global _start section .text _start: xor edx, edx ; zero out edx push edx ; push null byte onto stack push 0x6578652e ; push '.exe' onto stack push 0x636c6163 ; push 'calc' onto stack mov ebx, esp ; save stack pointer inc edx ; add 1 for SW_SHOWNORMAL push edx ; push SW_SHOWNORMAL onto stack push ebx ; push pointer to 'calc.exe' mov edx, 0x7c8623ad ; mov address of WinExec call edx
Transynther/x86/_processed/NONE/_xt_/i7-7700_9_0xca_notsx.log_21829_44.asm
ljhsiun2/medusa
9
241249
.global s_prepare_buffers s_prepare_buffers: push %r11 push %r12 push %r8 push %r9 push %rbp push %rcx push %rdi push %rsi lea addresses_normal_ht+0x1290a, %r9 nop nop nop cmp $3989, %r11 mov (%r9), %rcx nop nop sub $64682, %rsi lea addresses_WC_ht+0xed2a, %rcx and $39205, %rbp movw $0x6162, (%rcx) cmp %rcx, %rcx lea addresses_normal_ht+0x169aa, %rdi nop nop nop nop nop inc %r8 mov (%rdi), %esi nop nop xor %rsi, %rsi lea addresses_WC_ht+0x1c496, %rbp nop nop sub $55765, %r8 mov $0x6162636465666768, %rcx movq %rcx, %xmm5 vmovups %ymm5, (%rbp) nop nop nop xor $37969, %rcx lea addresses_D_ht+0xfb7a, %r8 nop nop nop sub %r9, %r9 mov (%r8), %ecx nop xor %rbp, %rbp lea addresses_UC_ht+0x1870a, %rsi and $1780, %rcx mov (%rsi), %rdi inc %r8 lea addresses_WT_ht+0x998a, %rsi lea addresses_normal_ht+0x382a, %rdi nop nop nop nop cmp %r12, %r12 mov $76, %rcx rep movsw nop nop nop nop cmp %rsi, %rsi lea addresses_WT_ht+0x1eb8a, %r11 nop nop nop sub $20370, %r12 mov (%r11), %r8w nop nop nop nop inc %rbp lea addresses_WT_ht+0xf58a, %rsi lea addresses_UC_ht+0x1eb8a, %rdi nop xor $23929, %rbp mov $69, %rcx rep movsw nop nop nop nop nop mfence lea addresses_D_ht+0xa882, %rsi lea addresses_normal_ht+0x16f8a, %rdi nop nop nop nop nop and $53865, %r11 mov $7, %rcx rep movsl nop nop nop xor %r9, %r9 lea addresses_WC_ht+0x1354a, %rsi lea addresses_A_ht+0xe98a, %rdi cmp $586, %rbp mov $99, %rcx rep movsl inc %rcx lea addresses_UC_ht+0x1b18a, %rdi nop nop nop nop nop xor $61304, %r8 vmovups (%rdi), %ymm1 vextracti128 $0, %ymm1, %xmm1 vpextrq $0, %xmm1, %r9 add $51652, %rsi lea addresses_normal_ht+0x570a, %rbp nop and %r9, %r9 movw $0x6162, (%rbp) nop nop and %rdi, %rdi pop %rsi pop %rdi pop %rcx pop %rbp pop %r9 pop %r8 pop %r12 pop %r11 ret .global s_faulty_load s_faulty_load: push %r10 push %r11 push %r12 push %r13 push %rax push %rbx push %rsi // Store lea addresses_WC+0x12b3e, %rsi nop nop nop dec %r10 movb $0x51, (%rsi) // Exception!!! nop nop mov (0), %r12 nop nop nop nop nop and $16914, %r11 // Faulty Load lea addresses_normal+0x1f98a, %r10 nop nop nop nop sub $45307, %rbx mov (%r10), %rsi lea oracles, %r10 and $0xff, %rsi shlq $12, %rsi mov (%r10,%rsi,1), %rsi pop %rsi pop %rbx pop %rax pop %r13 pop %r12 pop %r11 pop %r10 ret /* <gen_faulty_load> [REF] {'src': {'NT': False, 'AVXalign': False, 'size': 32, 'congruent': 0, 'same': False, 'type': 'addresses_normal'}, 'OP': 'LOAD'} {'dst': {'NT': False, 'AVXalign': False, 'size': 1, 'congruent': 2, 'same': False, 'type': 'addresses_WC'}, 'OP': 'STOR'} [Faulty Load] {'src': {'NT': False, 'AVXalign': False, 'size': 8, 'congruent': 0, 'same': True, 'type': 'addresses_normal'}, 'OP': 'LOAD'} <gen_prepare_buffer> {'src': {'NT': False, 'AVXalign': False, 'size': 8, 'congruent': 6, 'same': False, 'type': 'addresses_normal_ht'}, 'OP': 'LOAD'} {'dst': {'NT': False, 'AVXalign': True, 'size': 2, 'congruent': 5, 'same': False, 'type': 'addresses_WC_ht'}, 'OP': 'STOR'} {'src': {'NT': False, 'AVXalign': True, 'size': 4, 'congruent': 5, 'same': False, 'type': 'addresses_normal_ht'}, 'OP': 'LOAD'} {'dst': {'NT': False, 'AVXalign': False, 'size': 32, 'congruent': 0, 'same': False, 'type': 'addresses_WC_ht'}, 'OP': 'STOR'} {'src': {'NT': False, 'AVXalign': False, 'size': 4, 'congruent': 3, 'same': False, 'type': 'addresses_D_ht'}, 'OP': 'LOAD'} {'src': {'NT': False, 'AVXalign': False, 'size': 8, 'congruent': 4, 'same': False, 'type': 'addresses_UC_ht'}, 'OP': 'LOAD'} {'src': {'congruent': 8, 'same': False, 'type': 'addresses_WT_ht'}, 'dst': {'congruent': 5, 'same': False, 'type': 'addresses_normal_ht'}, 'OP': 'REPM'} {'src': {'NT': True, 'AVXalign': False, 'size': 2, 'congruent': 8, 'same': False, 'type': 'addresses_WT_ht'}, 'OP': 'LOAD'} {'src': {'congruent': 10, 'same': False, 'type': 'addresses_WT_ht'}, 'dst': {'congruent': 9, 'same': False, 'type': 'addresses_UC_ht'}, 'OP': 'REPM'} {'src': {'congruent': 2, 'same': False, 'type': 'addresses_D_ht'}, 'dst': {'congruent': 9, 'same': False, 'type': 'addresses_normal_ht'}, 'OP': 'REPM'} {'src': {'congruent': 5, 'same': False, 'type': 'addresses_WC_ht'}, 'dst': {'congruent': 9, 'same': False, 'type': 'addresses_A_ht'}, 'OP': 'REPM'} {'src': {'NT': False, 'AVXalign': False, 'size': 32, 'congruent': 9, 'same': False, 'type': 'addresses_UC_ht'}, 'OP': 'LOAD'} {'dst': {'NT': True, 'AVXalign': True, 'size': 2, 'congruent': 7, 'same': False, 'type': 'addresses_normal_ht'}, 'OP': 'STOR'} {'34': 21829} 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 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 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 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 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 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 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 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 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 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 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 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 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 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 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 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 34 34 34 34 34 34 34 34 */
Definition/Typed/Consequences/TypeUnicity.agda
CoqHott/logrel-mltt
2
4695
{-# OPTIONS --safe #-} module Definition.Typed.Consequences.TypeUnicity where open import Definition.Untyped hiding (U≢ℕ; U≢Π; U≢ne; ℕ≢Π; ℕ≢ne; Π≢ne; U≢Empty; ℕ≢Empty; Empty≢Π; Empty≢ne) open import Definition.Untyped.Properties using (subst-Univ-either) open import Definition.Typed open import Definition.Typed.Properties open import Definition.Typed.Weakening open import Definition.Typed.Consequences.Equality import Definition.Typed.Consequences.Inequality as Ineq open import Definition.Typed.Consequences.Inversion open import Definition.Typed.Consequences.Injectivity open import Definition.Typed.Consequences.NeTypeEq open import Definition.Typed.Consequences.Syntactic open import Definition.Typed.Consequences.PiNorm open import Definition.Typed.Consequences.Substitution open import Definition.Conversion.Stability open import Tools.Product open import Tools.Empty open import Tools.Sum using (_⊎_; inj₁; inj₂) import Tools.PropositionalEquality as PE type-uniq : ∀ {Γ t T₁ T₂ r₁ r₂ l₁ l₂} → Γ ⊢ t ∷ T₁ ^ [ r₁ , l₁ ] → Γ ⊢ t ∷ T₂ ^ [ r₂ , l₂ ] → r₁ PE.≡ r₂ × l₁ PE.≡ l₂ × Γ ⊢ T₁ ≡ T₂ ^ [ r₁ , l₁ ] type-uniq (univ 0<1 x) (univ 0<1 x') = PE.refl , PE.refl , refl (Ugenⱼ x) type-uniq (ℕⱼ x) (ℕⱼ x₁) = PE.refl , PE.refl , refl (Ugenⱼ x) type-uniq (Emptyⱼ x) (Emptyⱼ x₁) = PE.refl , PE.refl , refl (Ugenⱼ x) type-uniq (Πⱼ x ▹ x₁ ▹ X ▹ X₁) (Πⱼ x₂ ▹ x₃ ▹ Y ▹ Y₁) = let _ , _ , eU = type-uniq X₁ Y₁ er , el = Uinjectivity eU in PE.refl , PE.refl , PE.subst (λ r → _ ⊢ _ ≡ Univ r _ ^ _ ) er (refl ((Ugenⱼ (wfTerm Y))) ) type-uniq (∃ⱼ X ▹ X₁) (∃ⱼ Y ▹ Y₁) = let _ , enextl , eU = type-uniq X Y el = next-inj enextl in PE.refl , enextl , PE.subst (λ l → _ ⊢ _ ≡ SProp l ^ _ ) el (refl ((Ugenⱼ (wfTerm Y))) ) type-uniq (var xx x) (var _ y) = let T≡T , e = varTypeEq′ x y er , el = typelevel-injectivity e in er , el , PE.subst (λ A → _ ⊢ _ ≡ A ^ _ ) T≡T (refl (syntacticTerm (var xx x))) type-uniq (lamⱼ x x₁ x₂ X) (lamⱼ y y₁ y₂ Y) = let _ , _ , F≡F = type-uniq (un-univ x₂) (un-univ y₂) erF , elF = Uinjectivity F≡F erG , elG , G≡G = type-uniq X (PE.subst₂ (λ r l → _ ∙ _ ^ [ r , ι l ] ⊢ _ ∷ _ ^ _) (PE.sym erF) (PE.sym elF) Y) in erG , PE.refl , PE.subst₃ (λ rF lF lG → _ ⊢ _ ≡ Π _ ^ rF ° lF ▹ _ ° lG ° _ ^ _) erF elF (ιinj elG) (univ (Π-cong x x₁ x₂ (refl (un-univ x₂)) (un-univ≡ G≡G))) type-uniq (X ∘ⱼ X₁) (Y ∘ⱼ Y₁) = let er , _ , Π≡Π = type-uniq X Y F≡F , erF , elF , elG , G≡G = injectivity Π≡Π in er , PE.cong _ elG , (substitutionEq G≡G (substRefl (singleSubst X₁)) (wfTerm X₁)) type-uniq {Γ} ⦅ x , x₁ , X , X₁ ⦆ⱼ (⦅_,_,_,_⦆ⱼ {F = F} {G = G} y y₁ Y Y₁) = let _ , el , F≡F = type-uniq X Y _ , el' , G≡G = type-uniq (un-univ x₁) (un-univ (stability (reflConEq (wf x) ∙ sym F≡F) (PE.subst (λ l → Γ ∙ F ^ [ % , l ] ⊢ G ^ [ % , l ]) (PE.sym el) y₁))) in PE.refl , el , univ (∃-cong x (un-univ≡ F≡F) (un-univ≡ (refl x₁))) type-uniq (fstⱼ X X₁ X₂) (fstⱼ Y Y₁ Y₂) = let er , el , ∃≡∃ = type-uniq X₂ Y₂ F≡F , _ = ∃injectivity ∃≡∃ in PE.refl , el , F≡F type-uniq (sndⱼ X X₁ X₂) (sndⱼ Y Y₁ Y₂) = let er , el , ∃≡∃ = type-uniq X₂ Y₂ F≡F , G≡G = ∃injectivity ∃≡∃ in PE.refl , el , substitutionEq G≡G (substRefl (singleSubst (fstⱼ X X₁ X₂))) (wfTerm X) type-uniq (zeroⱼ x) (zeroⱼ x₁) = PE.refl , PE.refl , refl (univ (ℕⱼ x)) type-uniq (sucⱼ X) (sucⱼ Y) = PE.refl , PE.refl , refl (univ (ℕⱼ (wfTerm X))) type-uniq (natrecⱼ x X X₁ X₂) (natrecⱼ y Y Y₁ Y₂) = let _ , _ , U≡U = type-uniq (un-univ x) (un-univ y) er , _ = Uinjectivity U≡U in er , PE.refl , refl (substitution x (singleSubst X₂) (wfTerm X) ) type-uniq (Emptyrecⱼ x X) (Emptyrecⱼ y Y) = let _ , _ , U≡U = type-uniq (un-univ x) (un-univ y) er , _ = Uinjectivity U≡U in er , PE.refl , refl x type-uniq (Idⱼ X X₁ X₂) (Idⱼ Y Y₁ Y₂) = let _ , enl , U≡U = type-uniq X Y el = next-inj enl in PE.refl , enl , PE.subst (λ l → _ ⊢ _ ≡ SProp l ^ _) el (refl (Ugenⱼ (wfTerm X))) type-uniq (Idreflⱼ X) (Idreflⱼ Y) = let _ , el , _ = type-uniq X Y in PE.refl , el , refl (syntacticTerm (Idreflⱼ X)) type-uniq (transpⱼ x x₁ X X₁ X₂ X₃) (transpⱼ x₂ x₃ Y Y₁ Y₂ Y₃) = let _ , el , _ = type-uniq X Y in PE.refl , el , refl (substitution x₁ (singleSubst X₂) (wfTerm X)) type-uniq (castⱼ X X₁ X₂ X₃) (castⱼ Y Y₁ Y₂ Y₃) = let er , _ , _ = type-uniq X₃ Y₃ in er , PE.refl , refl (univ X₁) type-uniq (castreflⱼ X X₁) (castreflⱼ Y Y₁) = PE.refl , PE.refl , refl (syntacticTerm (castreflⱼ X X₁)) type-uniq (conv X x) Y = let er , el , eA = type-uniq X Y in er , el , trans (sym x) eA type-uniq X (conv Y y) = let er , el , eA = type-uniq X Y in er , el , trans eA (PE.subst₂ (λ r l → _ ⊢ _ ≡ _ ^ [ r , l ]) (PE.sym er) (PE.sym el) y)
examples/powers-of-two/powers-of-two.r.asm
sdsmdg/RISC-processor
43
164658
<gh_stars>10-100 ; (C) 2017, <NAME> ; This content is licensed under 'MIT License' ; Simple program for RISC-Processor ; This program display powers of two starting from 2^0 ; ; Technical details ; > Display buffer starts from 0x000003F7 and ends at 0x000003FF (inclusive) ; > DB(Display buffer) is 4x4 bytes (32x4 = 128 bits) wide ; > Contents will be start displaying as soon as value is written to ; 0x000003FF ; > Memory location 0x000003F8 is used as a counter ; > Buffer content is displayed as hexadecimal representation . = 0 ; Start from 0 ; Implementation specific details ; Jump to 8x00000000 on reset ; Jump to 8x00000004 on Illegal Instruction ; Jump to 8x0000000c on interrupts ; RESET BR Start ; RESET BR IllInst ; Illegal instruction BR IRQ ; IRQ ; Reset on execution of illegal instruction IllInst: BR Start ; Handles softare interrupts IRQ: CMPEQC %r26, 0x1, %r25 BNE 25, PrintRout, %r31 ; Branch to Print Routine if value at ; r26 is 1 BR Start ; Print routine passes contents of r25 to ; display buffer. PrintRout: STV %r24, 0x0, %r31 JMP %r30, %r31 ; Main execution part of program Start: ;ADDC %r31, 0x1, %r24 ; Initialize r24 with 1 ADDC %r31, 0x1, %r26 ; Store 1 in r24 for print call loop: ADD %r24, %r24, %r24 ; Calculate next power of 2 BR IRQ, r30 ; Print current number BNE %r24, loop, %r31 ; If %r24 is 0, change it to 1 ADDC %r31, 1, %r24 ; by adding 1 to it BRloop ; loop again ;-) LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0 LONG 0
iod/nul/cnam.asm
olifink/smsqe
0
26314
<reponame>olifink/smsqe<gh_stars>0 ; Setup name of NUL Channel V2.00  1996 <NAME> section nul xdef nul_cnam xref nul_name xref nul_parm include 'dev8_keys_err' include 'dev8_iod_nul_data' include 'dev8_mac_assert' ;+++ ; Set up nul channel name in (a1) ;--- nul_cnam move.w d2,d4 subq.w #5,d4 ; space for name ble.s ncn_ipar ; none clr.w (a1)+ ; no name move.l a1,a2 move.l nul_name,(a2)+ subq.l #1,a2 move.w nlc_parm(a0),d0 ; parameter beq.s ncn_done ; ... none move.b nul_parm-1(pc,d0.w),(a2)+ ; set it ncn_done sub.l a1,a2 ; set length of name move.w a2,-(a1) moveq #0,d0 rts ncn_ipar moveq #err.ipar,d0 rts end
misc/project-backup.asm
TAbdiukov/AVR-monorail
0
101984
<reponame>TAbdiukov/AVR-monorail ;FINAL .include "m2560def.inc" .def temp =r21 .def row =r17 .def col =r18 .def mask =r19 .def temp2 =r20 .def count_letter =r22 ;multiple times .def push_flag=r23 ;whether any button has pushed .def letter_num = r24 ;maximum number .def finish_input_flag =r25 ;0 is pushed, input finish .def temp_count_for_question =r2 .def keypad_version = r3 ;char - 0 num - 1 .def input10 = r4 .equ PORTLDIR = 0xF0 .equ INITCOLMASK = 0xEF .equ INITROWMASK = 0x01 .equ ROWMASK = 0x0F .equ second_line = 0b10101000 .macro do_lcd_command ldi r16, @0 rcall lcd_command rcall lcd_wait .endmacro .macro do_lcd_command_imme mov r16, @0 rcall lcd_command rcall lcd_wait .endmacro .macro do_lcd_data ldi r16, @0 rcall lcd_data rcall lcd_wait .endmacro .macro do_lcd_data_imme mov r16, @0 rcall lcd_data rcall lcd_wait .endmacro .macro stop_time_head do_lcd_data 'T' do_lcd_data 'i' do_lcd_data 'm' do_lcd_data 'e' do_lcd_data ' ' do_lcd_data_imme @0 do_lcd_data ' ' do_lcd_data 't' do_lcd_data 'o' do_lcd_data ' ' do_lcd_data '1' do_lcd_data ':' do_lcd_command 0b11000000 .endmacro .macro train_stop do_lcd_data 'T' do_lcd_data 'r' do_lcd_data 'a' do_lcd_data 'i' do_lcd_data 'n' do_lcd_data ' ' do_lcd_data 's' do_lcd_data 't' do_lcd_data 'o' do_lcd_data 'p' do_lcd_data ' ' do_lcd_data 'f' do_lcd_data 'o' do_lcd_data 'r' do_lcd_data ':' .endmacro // .macro station_name do_lcd_data 'T' do_lcd_data 'y' do_lcd_data 'p' do_lcd_data 'e' do_lcd_data ' ' do_lcd_data 's' do_lcd_data 't' do_lcd_data 'o' do_lcd_data 'p' do_lcd_data_imme @0 do_lcd_data ' ' do_lcd_data 'n' do_lcd_data 'a' do_lcd_data 'm' do_lcd_data 'e' do_lcd_data ':' .endmacro .macro stop_maximum do_lcd_data 'M' do_lcd_data 'a' do_lcd_data 'x' do_lcd_data ' ' do_lcd_data 's' do_lcd_data 't' do_lcd_data 'o' do_lcd_data 'p' do_lcd_data ' ' do_lcd_data 'n' do_lcd_data 'u' do_lcd_data 'm' do_lcd_data ':' do_lcd_command 0b11000000 .endmacro .macro stop_time do_lcd_data 'T' do_lcd_data 'i' do_lcd_data 'm' do_lcd_data 'e' do_lcd_data ' ' do_lcd_data_imme @0 inc @0 do_lcd_data ' ' do_lcd_data 't' do_lcd_data 'o' do_lcd_data ' ' do_lcd_data_imme @0 do_lcd_data ':' do_lcd_command 0b11000000 .endmacro .macro finish_info do_lcd_data 'A' do_lcd_data 'l' do_lcd_data 'l' do_lcd_data ' ' do_lcd_data 'd' do_lcd_data 'o' do_lcd_data 'n' do_lcd_data 'e' do_lcd_command 0b11000000 do_lcd_data 'W' do_lcd_data 'a' do_lcd_data 'i' do_lcd_data 't' do_lcd_data ' ' do_lcd_data 'f' do_lcd_data 'o' do_lcd_data 'r' do_lcd_data ' ' do_lcd_data '5' do_lcd_data 's' .endmacro .macro wrong do_lcd_data 'E' do_lcd_data 'r' do_lcd_data 'r' do_lcd_data '!' .endmacro .macro clear ldi YL, low(@0) ldi YH, high(@0) clr temp st Y+,temp st Y,temp .endmacro .macro clearonebyte ldi YL, low(@0) ldi YH, high(@0) clr temp st Y,temp .endmacro .macro timeten lsl @0 mov r16, @0 lsl @0 lsl @0 add @0, r16 .endmacro .dseg ////////////////////////////// ;++++++ variable +++++++++ ////////////////////////////// SecondCounter: .byte 2 TempCounter: .byte 2 Status: .byte 1 Position: .byte 1 count_question:.byte 1 Maximum: .byte 1 TempNumInfo: .byte 1 current_name_pointer: .byte 2 station_stop_time: .byte 1 current_time_pointer: .byte 2 pb_flag: .byte 1 led: .byte 1 stop_flag: .byte 1 hash_flag: .byte 1 //////////////////////////// ;station storage //////////////////////////// station1: .byte 10 station2: .byte 10 station3: .byte 10 station4: .byte 10 station5: .byte 10 station6: .byte 10 station7: .byte 10 station8: .byte 10 station9: .byte 10 station10: .byte 10 time_data: .byte 10 .cseg .org 0x0 jmp RESET .org INT0addr ; INT0addr is the address of EXT_INT0 jmp EXT_INT0 .org INT1addr ; INT1addr is the address of EXT_INT1 jmp EXT_INT1 jmp DEFAULT .org OVF0addr jmp Timer0OVF DEFAULT:reti RESET: ldi temp, low(RAMEND) out SPL, temp ldi temp, high(RAMEND) out SPH, temp ldi temp, PORTLDIR ; columns are outputs, rows are inputs STS DDRL, temp ; cannot use out ser temp out DDRC, temp ; Make PORTC all outputs clr temp out PORTC, temp ser temp out DDRF, temp out DDRA, temp clr temp out PORTF, temp out PORTA, temp ;clr station ldi yl,low(station1) ldi yh,high(station2) ldi temp,99 clr r16 clear_stations: cpi temp,0 breq time_setup st y+,r16 dec temp rjmp clear_stations ;clear time time_setup: ;timer0 setup clear TempCounter clear SecondCounter ldi temp,0b00000000 out TCCR0A,temp ;set mode 000- normal mode ldi temp,0b00000010 out TCCR0B,temp ;set prescaler - 8 ldi temp, 1<<TOIE0 ;time overflow from 3 kinds of overflow cmpA,cmpB,time overflow sts TIMSK0,temp ;apply to mask sei ;every timer overflow trigger an interrupt, when the times of interrupt is equal ;to 7812(that is the times should happen in a second) add 1s //////////////////////////// //set lcd start position//// //////////////////////////// ldi r24, second_line sts Position, r24 //////////////////////////// //set letter counter//////// //////////////////////////// ldi push_flag,1 clr letter_num ldi count_letter, 0b00000000 clearonebyte count_question do_lcd_command 0b00111000 ; 2x5x7 rcall sleep_5ms do_lcd_command 0b00111000 ; 2x5x7 rcall sleep_1ms do_lcd_command 0b00111000 ; 2x5x7 do_lcd_command 0b00111000 ; 2x5x7 do_lcd_command 0b00001000 ; display off? do_lcd_command 0b00000001 ; clear display do_lcd_command 0b00000110 ; increment, no display shift do_lcd_command 0b00001110 ; Cursor on, bar, no blink ;clr line // jmp main EXT_INT0: ;(PB0) push temp in temp, SREG push temp ldi temp,1 sts pb_flag,temp pop temp out SREG, temp pop temp reti EXT_INT1: ;(PB1) push temp in temp, SREG push temp ldi temp,1 sts pb_flag,temp pop temp out SREG, temp pop temp reti /* EXT_INT1: ; PB1 rcall sleep_350ms push temp in temp, SREG push temp lds temp,hash_flag cpi temp,1 breq close_motor cpi temp,0 breq open_motor close_motor: ldi temp,1 sts stop_flag,temp ldi temp,0 sts hash_flag,temp sei close_motor_loop: lds temp2,hash_flag cpi temp2,1 breq hash_end rjmp close_motor_loop open_motor: ldi temp2,1 sts hash_flag,temp2 ldi temp, 0b00111100 out DDRE, temp ldi temp, 0xff sts OCR3BL,temp clr temp sts OCR3BH, temp ldi temp, (1 << CS30) ; CS31=1: no prescaling sts TCCR3B, temp ldi temp, (1<< WGM30)|(1<<COM3B1) ; WGM30=1: phase correct PWM, 8 bits ; COM3B1=1: make OC3B override the normal port functionality of the I/O pin PL3 sts TCCR3A, temp */ hash_end: cli clearonebyte stop_flag pop temp out SREG, temp pop temp reti Timer0OVF: in temp, SREG push temp push YH push YL push r25 push r24 lds r24,TempCounter lds r25,TempCounter+1 adiw r25:r24,1 cpi r24,low(7812) ldi temp,high(7812) cpc r25,temp brne NotSecond clear TempCounter lds r24,SecondCounter lds r25,SecondCounter+1 adiw r25:r24,1 sts SecondCounter, r24 sts SecondCounter+1,r25 lds r24, Status ;? cpi r24,0 breq input_wait rcall partc_timer rjmp EndIF NotSecond: sts TempCounter, r24 sts TempCounter+1,r25 lds r24, Status ;? cpi r24,0 breq EndIF rcall partc_timer EndIF: pop r24 pop r25 pop YL pop YH pop temp out SREG,temp reti input_wait: lds r24,SecondCounter cpi r24, 1 brsh restart go_EndIF: rjmp EndIF restart: cli clear TempCounter clear SecondCounter sbrc push_flag,0 ;if 0, then there is a char pressed rjmp noAction lds r24,Position inc r24 sts Position,r24 ldi push_flag,1 inc letter_num lds yl,current_name_pointer lds yh,current_name_pointer+1 st y+,row sts current_name_pointer,yl sts current_name_pointer+1,yh do_lcd_data_imme row noAction: sei ldi count_letter,0b00000000 rjmp go_EndIF /////////////////////////// //do motor and led at here partc_timer: push temp push temp2 push r24 push r25 //dont use r17 lds temp,stop_flag cpi temp,1 breq rail_stop partc_timer_end: pop r25 pop r24 pop temp2 pop temp ret rail_stop: //test lds r24,TempCounter lds r25,TempCounter+1 cpi r24,low(2604) ldi temp,high(2604) cpc r25,temp brsh change_led do_motor: ldi temp, 0b00111100 out DDRE, temp ; set PL3 (OC5A) as output. ldi temp, 0x00 ; this value and the operation mode determine the PWM duty cycle sts OCR5AL, temp sts OCR3BL,temp clr temp sts OCR3BH, temp ldi temp, (1 << CS30) sts TCCR3B, temp ldi temp, (1<< WGM30)|(1<<COM3B1) sts TCCR3A, temp rjmp partc_timer_end //havenot done this part let it stop change_led: lds temp2,led cpi temp2,0 breq light cpi temp2,1 breq dark light: ldi temp2,0b11111111 out PORTC,temp2 ldi temp2,1 sts led,temp2 rjmp change_end dark: ldi temp2,0b00000000 out PORTC,temp2 ldi temp2,0 sts led,temp2 rjmp change_end change_end: clear TempCounter rjmp do_motor main: /////////////////////////////////// ; part a ;get and store information /////////////////////////////////// stop_maximum ldi temp,1 ;1 is for num pad mov keypad_version , temp rcall keypad_part lds temp, TempNumInfo cpi temp, 11 brsh wrong_info_max sts Maximum,temp rjmp ask_stop_name wrong_info_max: do_lcd_command 0b00000001 wrong clearonebyte TempNumInfo rjmp main ask_stop_name: do_lcd_command 0b00000001 ; clear display clr keypad_version lds temp, count_question ;start from 0 lds r16, Maximum cp temp, r16 brsh stop_time_start ldi r16, 0b00110000 mov temp_count_for_question, temp add r16, temp mov r1, r16 inc r1 rcall store_name ;store name store station_name r1 rcall keypad_part mov r1, temp_count_for_question inc r1 sts count_question, r1 rjmp ask_stop_name stop_time_start: clearonebyte count_question clearonebyte tempNumInfo ask_stop_time: lds r1, count_question mov temp_count_for_question, r1 lds r16, Maximum dec r16 cp r1, r16 brsh back_to_head inc r1 ldi r16, 0b00110000 add r1,r16 stop_time r1 ldi temp,1 ;1 is for num pad mov keypad_version , temp rcall keypad_part rjmp back_to_time ;check overflow for station time back_to_head: lds r1, count_question mov r16, r1 cpi r16, 1 breq ask_for_waiting_time ldi r16, 0b00110000 add r1,r16 inc r1 stop_time_head r1 rcall keypad_part // rjmp time_head ask_for_waiting_time: ;new block train_stop rcall keypad_part lds temp, TempNumInfo cpi temp, 6 brsh wrong_stop cpi temp, 2 brlo wrong_stop sts station_stop_time,temp rjmp finish wrong_stop: do_lcd_command 0b00000001 wrong do_lcd_command 0b11000000 clearonebyte TempNumInfo rjmp ask_for_waiting_time //wrong handler finish: do_lcd_command 0b00000001 finish_info rcall sleep_350ms rjmp partc back_to_time: lds temp, TempNumInfo cpi temp, 11 brsh wrong_station_info rcall store_time lds temp,tempNumInfo lds xl,current_time_pointer lds xh,current_time_pointer+1 st x+,temp inc temp_count_for_question mov r1, temp_count_for_question sts count_question,r1 clearonebyte tempNumInfo do_lcd_command 0b00000001 rjmp ask_stop_time time_head: lds temp, TempNumInfo cpi temp, 11 brsh wrong_station_info rcall store_time lds temp,tempNumInfo lds xl,current_time_pointer lds xh,current_time_pointer+1 st x+,temp inc temp_count_for_question mov r1, temp_count_for_question sts count_question,r1 clearonebyte tempNumInfo // do_lcd_command 0b00000001 rjmp ask_for_waiting_time wrong_station_info: do_lcd_command 0b00000001 wrong clearonebyte TempNumInfo rjmp ask_stop_time ////////////////////////////////// ;part c ;show stored information ///////////////////////////////////// // partc: ldi temp, (2 << ISC10) | (2 << ISC00) ;enable external interrupt sts EICRA, temp in temp, EIMSK ori temp, (1<<INT0) | (1<<INT1) out EIMSK, temp sei ldi temp, 0b00111100 out DDRE, temp ldi temp, 0x00 sts OCR3BL,temp clr temp sts OCR3BH, temp ldi temp, (1 << CS30) sts TCCR3B, temp ldi temp, (1<< WGM30)|(1<<COM3B1) sts TCCR3A, temp rcall sleep_1000ms rcall sleep_1000ms rcall sleep_1000ms rcall sleep_1000ms rcall sleep_1000ms do_lcd_command 0b00000001 clearonebyte count_question ldi temp, 1 sts Status, temp ldi temp,2 mov keypad_version, temp ldi temp, 1 sts hash_flag, temp clr temp sts pb_flag,temp clearonebyte led clearonebyte stop_flag print_data: ldi temp, 0b00111100 out DDRE, temp ldi temp, 0xff sts OCR3BL,temp clr temp sts OCR3BH, temp ldi temp, (1 << CS30) sts TCCR3B, temp ldi temp, (1<< WGM30)|(1<<COM3B1) sts TCCR3A, temp rcall store_time /////////////////////////// // check if overflow /////////////////////////// lds r18,Maximum lds r19,count_question sub r18,r19 cpi r18,0 breq time_back_to_1 rjmp print_go_on time_back_to_1: ldi yl,low(time_data) ldi yh,high(time_data) sts current_time_pointer,yl sts current_time_pointer+1,yh print_go_on: lds yl,current_time_pointer lds yh,current_time_pointer+1 ld r18,y // do_lcd_command 0b00000001 do_lcd_data 'n' do_lcd_data 'e' do_lcd_data 'x' do_lcd_data 't' do_lcd_data ':' do_lcd_command 0b11000000 rcall sleep_5ms rcall print_all on_way_loop: cpi r18,0 breq check_stop do_lcd_data '>' rcall sleep_1000ms dec r18 rjmp on_way_loop check_stop: lds temp,pb_flag cpi temp,1 breq Station_stop rjmp print_data_end Station_stop: ldi r17,1 sts stop_flag,r17 clear TempCounter do_lcd_command 0b00000001 do_lcd_data 'w' do_lcd_data 'a' do_lcd_data 'i' do_lcd_data 't' do_lcd_data ' ' do_lcd_data 'f' do_lcd_data 'o' do_lcd_data 'r' do_lcd_data ':' do_lcd_command 0b11000000 lds r17,count_question dec r17 sts count_question,r17 rcall print_all inc r17 sts count_question,r17 lds r17,station_stop_time ;out PORTC,r17 Station_stop_loop: do_lcd_data '>' rcall sleep_1000ms cpi r17,0 breq print_data_end dec r17 rjmp Station_stop_loop print_data_end: clearonebyte stop_flag clearonebyte pb_flag ldi temp2,0b00000000 out PORTC,temp2 rjmp print_data print_all: //cli push temp push temp2 push r16 push yl push yh ldi yl,low(station1) ldi yh,high(station1) sts current_name_pointer, yl sts current_name_pointer+1,yh show_station: lds temp2,Maximum lds temp,count_question sub temp2,temp cpi temp2,0 breq back_to_one /////////////////////// //get next station lds r16,count_question lds temp,count_question lds temp2,Maximum inc temp sub temp2,temp cpi temp2,0 breq next_first sts count_question,temp rjmp print_first // back_to_one: clr temp sts count_question,temp ldi yl,low(station1) ldi yh,high(station1) rjmp show_station next_first: clr temp sts count_question,temp // print_first: rcall store_name sts count_question,r16 lds yl,current_name_pointer lds yh,current_name_pointer+1 ldi temp2,9 //print next name print_name: ld temp,y+ cpi temp,0 breq show_station_end cpi temp2,0 breq show_station_end do_lcd_data_imme temp dec temp2 rjmp print_name show_station_end: lds temp,count_question inc temp sts count_question,temp ldi temp2,0b00000000 out PORTC,temp2 pop yh pop yl pop r16 pop temp2 pop temp //sei ret loop: rjmp loop //// ; keypad input //// keypad_part: ldi mask, INITCOLMASK ; initial column mask clr col ; initial column colloop: STS PORTL, mask ; set column to mask value ; (sets column 0 off) ldi temp, 0xFF ; implement a delay so the ; hardware can stabilize delay: dec temp brne delay LDS temp, PINL ; read PORTL. Cannot use in andi temp, ROWMASK ; read only the row bits cpi temp, 0xF ; check if any rows are grounded breq nextcol ; if not go to the next column ldi mask, INITROWMASK ; initialise row check clr row ; initial row rowloop: mov temp2, temp and temp2, mask ; check masked bit brne skipconv mov temp, keypad_version cpi temp, 1 breq call_num cpi temp, 2 breq call_working rcall convert_char ; if bit is clear, convert the bitcode back: cpi finish_input_flag, 1 breq question jmp keypad_part ; and start again skipconv: inc row ; else move to the next row lsl mask ; shift the mask to the next bit jmp rowloop nextcol: cpi col, 3 ; check if we^re on the last column breq keypad_part ; if so, no buttons were pushed, ; so start again. sec ; else shift the column mask: ; We must set the carry bit rol mask ; and then rotate left by a bit, inc col ; increment column value jmp colloop ; and check the next column call_num: rcall convert_num rjmp back call_working: rjmp keypad_part question: ldi r16, second_line ;restart all things for keypad sts Position, r16 ldi push_flag,1 clr letter_num clr finish_input_flag clr count_letter sei ret //////////////////////////////// ////convert result to character /////////////////////////////// convert_char: rcall sleep_350ms ;add a debouncing here, at first it's not stable,when we detect a key pushed ;wait until disturbing signal disappear then convert cpi col, 3 breq letters cpi col, 2 mov temp, row lsl temp add temp, row add temp, col mov r16, temp lsl temp add temp, r16 ldi r16,0b01000000 add temp,r16 inc temp jmp convert_end letters: cpi row, 0 breq delete cpi row, 2 breq c_for_finish ;C for confirm jmp ending c_for_finish: ldi finish_input_flag,1 rjmp ending convert_end: add temp, count_letter inc count_letter cpi count_letter,0b00000011 breq remain final: cpi letter_num, 11 brsh no_num clr push_flag cpi temp,0b01011011 brne go_on ldi temp, 0b10100000 normal: mov row,temp ;row is useless now ,so treat it as another temp lds r16, Position do_lcd_command_imme r16 do_lcd_data_imme row clear TempCounter clear SecondCounter ending: ret ; return to caller go_on: rjmp normal remain: ldi count_letter,0b00000000 rjmp final delete: lds r16, Position cpi r16, 1 dec r16 sts Position,r16 do_lcd_data ' ' rcall sleep_350ms rjmp ending no_num: rjmp ending ;normal convert_num: cli rcall sleep_350ms ;add a debouncing here, at first it's not stable,when we detect a key pushed cpi col, 3 ;wait until disturbing signal disappear then convert breq num_letter mov temp, row lsl temp add temp, row add temp, col inc temp cpi push_flag,0 breq time10 update_tempnum: lds temp2,TempNumInfo add temp2, temp ;push = 0, has pressed sts TempNumInfo, temp2 ldi r16,48 add temp,r16 clr push_flag jmp convert_num_end num_letter: cpi row, 1 breq zero_num cpi row, 2 breq c_for_finish_num jmp ending c_for_finish_num: ldi finish_input_flag,1 rjmp num_end zero_num: ldi temp, 0b00110000 lds temp2,TempNumInfo timeten temp2 sts TempNumInfo, temp2 convert_num_end: do_lcd_data_imme temp num_end: ret ; return to caller time10: lds temp2,TempNumInfo timeten temp2 sts TempNumInfo, temp2 rjmp update_tempnum /// ;store operation /// store_name: cli push temp push temp2 lds temp,count_question ldi temp2,10 //move y to current station point_station: load1: cpi temp,0 brne load2 ldi yl,low(station1) ldi yh,high(station1) rjmp clear_10 load2: cpi temp,1 brne load3 ldi yl,low(station2) ldi yh,high(station2) rjmp clear_10 load3: cpi temp,2 brne load4 ldi yl,low(station3) ldi yh,high(station3) rjmp clear_10 load4: cpi temp,3 brne load5 ldi yl,low(station4) ldi yh,high(station4) rjmp clear_10 load5: cpi temp,4 brne load6 ldi yl,low(station5) ldi yh,high(station5) rjmp clear_10 load6: cpi temp,5 brne load7 ldi yl,low(station6) ldi yh,high(station6) rjmp clear_10 load7: cpi temp,6 brne load8 ldi yl,low(station7) ldi yh,high(station7) rjmp clear_10 load8: cpi temp,7 brne load9 ldi yl,low(station8) ldi yh,high(station8) rjmp clear_10 load9: cpi temp,8 brne load10 ldi yl,low(station9) ldi yh,high(station9) rjmp clear_10 load10: ldi yl,low(station10) ldi yh,high(station10) rjmp clear_10 //clear 10 byte clear_10: sts current_name_pointer, yl sts current_name_pointer+1,yh clr r6 clear_10_loop: cpi temp2,10 breq store_name_end st y+,r6 st y+,r6 st y+,r6 st y+,r6 st y+,r6 st y+,r6 st y+,r6 st y+,r6 st y+,r6 st y+,r6 dec temp2 rjmp clear_10_loop store_name_end: pop temp2 pop temp sei ret //storetime store_time: cli push temp push yl push yh lds temp,count_question ldi yl,low(time_data) ldi yh,high(time_data) store_time_loop: cpi temp,0 breq store_time_end ld r7,y+ dec temp rjmp store_time_loop store_time_end: sts current_time_pointer,yl sts current_time_pointer+1,yh pop yh pop yl pop temp sei ret //// ;lcd operation //// .equ LCD_RS = 7 .equ LCD_E = 6 .equ LCD_RW = 5 .equ LCD_BE = 4 .macro lcd_set sbi PORTA, @0 .endmacro .macro lcd_clr cbi PORTA, @0 .endmacro ; ; Send a command to the LCD (r16) ; lcd_command: out PORTF, r16 nop lcd_set LCD_E nop nop nop lcd_clr LCD_E nop nop nop ret lcd_data: out PORTF, r16 lcd_set LCD_RS nop nop nop lcd_set LCD_E nop nop nop lcd_clr LCD_E nop nop nop lcd_clr LCD_RS ret lcd_wait: push r16 clr r16 out DDRF, r16 out PORTF, r16 lcd_set LCD_RW lcd_wait_loop: nop lcd_set LCD_E nop nop nop in r16, PINF lcd_clr LCD_E sbrc r16, 7 rjmp lcd_wait_loop lcd_clr LCD_RW ser r16 out DDRF, r16 pop r16 ret .equ F_CPU = 16000000 .equ DELAY_1MS = F_CPU / 4 / 1000 - 4 ; 4 cycles per iteration - setup/call-return overhead sleep_1ms: push r24 push r25 ldi r25, high(DELAY_1MS) ldi r24, low(DELAY_1MS) delayloop_1ms: sbiw r25:r24, 1 brne delayloop_1ms pop r25 pop r24 ret sleep_5ms: rcall sleep_1ms rcall sleep_1ms rcall sleep_1ms rcall sleep_1ms rcall sleep_1ms ret sleep_1000ms: clr r16 d_loop: cpi r16, 200 brne increase ret increase: inc r16 rcall sleep_5ms rjmp d_loop sleep_350ms: clr r16 d_loop1: cpi r16, 70 brne increase1 ret increase1: inc r16 rcall sleep_5ms rjmp d_loop1
oeis/137/A137693.asm
neoneye/loda-programs
11
179334
<reponame>neoneye/loda-programs ; A137693: Numbers n such that 3n^2-n = 6k^2-2k for some integer k>0. ; 7,7887,9101399,10503006367,12120460245927,13987000620793199,16140986595935105527,18626684544708490984767,21495177823607002661315399,24805416581757936362666985487,28625429240170834955515039936407,33033720537740561780727993419627999,38120884875123368124125148891210774247,43991468112171829074678641092463813852847,50766116080561415628811027695554349975410999,58584053965499761463818851282028627407810439807,67605947510070644167831325568433340474263272126087 add $0,1 mul $0,4 sub $0,2 mov $1,2 mov $2,4 lpb $0 sub $0,1 add $2,$1 add $1,$2 add $1,$2 add $2,$1 lpe sub $1,82 div $1,12 add $1,7 mov $0,$1
programs/oeis/258/A258588.asm
karttu/loda
0
89619
<reponame>karttu/loda ; A258588: Minimal most likely sum for a roll of n 10-sided dice. ; 1,11,16,22,27,33,38,44,49,55,60,66,71,77,82,88,93,99,104,110,115,121,126,132,137,143,148,154,159,165,170,176,181,187,192,198,203,209,214,220,225,231,236,242,247,253,258,264,269,275 mul $0,11 sub $0,1 div $0,2 lpb $0,1 add $0,5 mov $1,$0 sub $0,$0 lpe add $1,1
code/4/t1.asm
GeekHades1/AssemblyCode
1
81427
assume cs:codesg codesg segment mov ax, 2000H ; 这里注意要加H,不然就会被认为是十进制的数 ; 与debug底下不大相同 mov ss, ax mov sp, 0 add sp, 10 pop ax pop bx push ax push bx pop ax pop bx mov ax, 4c00H int 21H codesg ends end
startup.asm
tpo/one_million_hellos
0
14818
;; exit immediately section .text global _start ;must be declared for linker (ld) _start: ;tell linker entry point _exit: mov eax,1 ;system call number (sys_exit) mov ebx,0 ;exit value int 0x80 ;call kernel
test/link/section-union/split-data.asm
orbea/rgbds
522
175905
<filename>test/link/section-union/split-data.asm<gh_stars>100-1000 IF !DEF(SECOND) DATA equs "ds 1\ndb $aa" ELSE DATA equs "db $bb\nds 1" ENDC SECTION UNION "mutually-overlaid data", ROM0 DATA PURGE DATA
flame32-bios-banks.asm
drako0812/flame32
2
243321
<filename>flame32-bios-banks.asm #include "flame32.asm" #bankdef "bios" { #addr 0x000000 #size 0x100000 #outp 0x000000 #fill } #bankdef "stack" { #addr 0x100000 #size 0x100000 #outp 0x100000 #fill } #bankdef "gfx" { #addr 0x200000 #size 0x100000 #outp 0x200000 #fill } #bankdef "hw" { #addr 0x300000 #size 0x100000 #outp 0x300000 #fill } #bankdef "os" { #addr 0x400000 #size 0x200000 #outp 0x400000 #fill } #bankdef "user" { #addr 0x600000 #size 0x400000 }
Part 8 - How To Do Magic With Hypervisor!/Hypervisor From Scratch/MyHypervisorDriver/AsmVmexitHandler.asm
avboy1337/Hypervisor-From-Scratch
808
240242
PUBLIC AsmVmexitHandler EXTERN VmxVmexitHandler:PROC EXTERN VmxVmresume:PROC EXTERN HvReturnStackPointerForVmxoff:PROC EXTERN HvReturnInstructionPointerForVmxoff:PROC .code _text ;------------------------------------------------------------------------ AsmVmexitHandler PROC push 0 ; we might be in an unaligned stack state, so the memory before stack might cause ; irql less or equal as it doesn't exist, so we just put some extra space avoid ; these kind of erros pushfq push r15 push r14 push r13 push r12 push r11 push r10 push r9 push r8 push rdi push rsi push rbp push rbp ; rsp push rbx push rdx push rcx push rax mov rcx, rsp ; Fast call argument to PGUEST_REGS sub rsp, 28h ; Free some space for Shadow Section call VmxVmexitHandler add rsp, 28h ; Restore the state cmp al, 1 ; Check whether we have to turn off VMX or Not (the result is in RAX) je AsmVmxoffHandler RestoreState: pop rax pop rcx pop rdx pop rbx pop rbp ; rsp pop rbp pop rsi pop rdi pop r8 pop r9 pop r10 pop r11 pop r12 pop r13 pop r14 pop r15 popfq sub rsp, 0100h ; to avoid error in future functions jmp VmxVmresume AsmVmexitHandler ENDP ;------------------------------------------------------------------------ AsmVmxoffHandler PROC sub rsp, 020h ; shadow space call HvReturnStackPointerForVmxoff add rsp, 020h ; remove for shadow space mov [rsp+088h], rax ; now, rax contains rsp sub rsp, 020h ; shadow space call HvReturnInstructionPointerForVmxoff add rsp, 020h ; remove for shadow space mov rdx, rsp ; save current rsp mov rbx, [rsp+088h] ; read rsp again mov rsp, rbx push rax ; push the return address as we changed the stack, we push ; it to the new stack mov rsp, rdx ; restore previous rsp sub rbx,08h ; we push sth, so we have to add (sub) +8 from previous stack ; also rbx already contains the rsp mov [rsp+088h], rbx ; move the new pointer to the current stack RestoreState: pop rax pop rcx pop rdx pop rbx pop rbp ; rsp pop rbp pop rsi pop rdi pop r8 pop r9 pop r10 pop r11 pop r12 pop r13 pop r14 pop r15 popfq pop rsp ; restore rsp ret ; jump back to where we called Vmcall AsmVmxoffHandler ENDP ;------------------------------------------------------------------------ END
src/latin_utils/latin_utils-strings_package.ads
spr93/whitakers-words
204
3033
-- WORDS, a Latin dictionary, by <NAME> (USAF, Retired) -- -- Copyright <NAME> (1936–2010) -- -- This is a free program, which means it is proper to copy it and pass -- it on to your friends. Consider it a developmental item for which -- there is no charge. However, just for form, it is Copyrighted -- (c). Permission is hereby freely given for any and all use of program -- and data. You can sell it as your own, but at least tell me. -- -- This version is distributed without obligation, but the developer -- would appreciate comments and suggestions. -- -- All parts of the WORDS system, source code and data files, are made freely -- available to anyone who wishes to use them, for whatever purpose. --------------------------------------------------------------------------- -- This package contains basic subprograms operating on Strings and -- Characters. --------------------------------------------------------------------------- -- TODO: Write testbenches for every subprogram in this package. with Ada.Strings; with Ada.Text_IO; package Latin_Utils.Strings_Package is --------------------------------------------------------------------------- -- Correct values: Left, Right, Both type Trim_End is new Ada.Strings.Trim_End; Null_String : constant String (2 .. 1) := (others => ' '); --------------------------------------------------------------------------- function Lower_Case (C : Character) return Character; function Lower_Case (S : String) return String; function Upper_Case (C : Character) return Character; function Upper_Case (S : String) return String; --------------------------------------------------------------------------- -- Removes leading and/or trailing blanks and returns a STRING starting at 1 -- For a String of all blanks as Input it returns NULL_STRING function Trim (Source : in String; Side : in Trim_End := Both ) return String; -- Truncates or fills a String to exactly N in Length function Head (Source : in String; Count : in Natural ) return String; -- Reads a text file and outs a String that is as much of the -- first line encountered that is not a comment -- FIXME: Will raise exception if file is not open. procedure Get_Non_Comment_Line (File : in Ada.Text_IO.File_Type; Item : out String; Last : out Integer ); --------------------------------------------------------------------------- end Latin_Utils.Strings_Package;
src/interrupts.asm
JL2210/ramdump
0
4593
<filename>src/interrupts.asm ; Copyright 2020 <NAME> ; ; This file is part of RAMDump. ; ; RAMDump is licensed under the MIT license; for more details, ; see the file LICENSE in the root of this repository. INCLUDE "addrs.inc" SECTION "interrupts", ROM0[$0040] vblank: reti ds 8 - (@ - vblank) lcd_stat: reti ds 8 - (@ - lcd_stat) timer: reti ds 8 - (@ - timer) serial: reti ds 8 - (@ - serial) joypad: reti
programs/oeis/283/A283394.asm
karttu/loda
1
176801
<gh_stars>1-10 ; A283394: a(n) = 3*n*(3*n + 7)/2 + 4. ; 4,19,43,76,118,169,229,298,376,463,559,664,778,901,1033,1174,1324,1483,1651,1828,2014,2209,2413,2626,2848,3079,3319,3568,3826,4093,4369,4654,4948,5251,5563,5884,6214,6553,6901,7258,7624,7999,8383,8776,9178,9589,10009,10438,10876,11323,11779,12244,12718,13201,13693,14194,14704,15223,15751,16288,16834,17389,17953,18526,19108,19699,20299,20908,21526,22153,22789,23434,24088,24751,25423,26104,26794,27493,28201,28918,29644,30379,31123,31876,32638,33409,34189,34978,35776,36583,37399,38224,39058,39901,40753,41614,42484,43363,44251,45148,46054,46969,47893,48826,49768,50719,51679,52648,53626,54613,55609,56614,57628,58651,59683,60724,61774,62833,63901,64978,66064,67159,68263,69376,70498,71629,72769,73918,75076,76243,77419,78604,79798,81001,82213,83434,84664,85903,87151,88408,89674,90949,92233,93526,94828,96139,97459,98788,100126,101473,102829,104194,105568,106951,108343,109744,111154,112573,114001,115438,116884,118339,119803,121276,122758,124249,125749,127258,128776,130303,131839,133384,134938,136501,138073,139654,141244,142843,144451,146068,147694,149329,150973,152626,154288,155959,157639,159328,161026,162733,164449,166174,167908,169651,171403,173164,174934,176713,178501,180298,182104,183919,185743,187576,189418,191269,193129,194998,196876,198763,200659,202564,204478,206401,208333,210274,212224,214183,216151,218128,220114,222109,224113,226126,228148,230179,232219,234268,236326,238393,240469,242554,244648,246751,248863,250984,253114,255253,257401,259558,261724,263899,266083,268276,270478,272689,274909,277138,279376,281623 mul $0,3 add $0,4 bin $0,2 sub $0,2 mov $1,$0
oeis/290/A290442.asm
neoneye/loda-programs
11
170081
; A290442: a(n) = Catalan(n-1)*Motzkin(n). ; Submitted by <NAME> ; 1,2,8,45,294,2142,16764,138567,1194050,10638056,97383208,911829646,8702182020,84418698600,830606179680,8274230277615,83330214144930,847407871749780,8692682350690800,89868901315880610,935699342853054780,9805180025713805460,103353379063190310600,1095295964528435629050 mov $2,$0 seq $0,108 ; Catalan numbers: C(n) = binomial(2n,n)/(n+1) = (2n)!/(n!(n+1)!). add $2,1 seq $2,1006 ; Motzkin numbers: number of ways of drawing any number of nonintersecting chords joining n (labeled) points on a circle. mul $0,$2
Keyboard-Maestro/Renumber-Macro-Prefix-Numbers.applescript
boisy/AppleScripts
116
3529
use AppleScript version "2.4" -- Yosemite (10.10) or later use scripting additions try tell application "Keyboard Maestro" set dialogResult to display dialog ¬ "Enter the starting number or click clear to remove number prefix." default answer 0 ¬ with title "Renumber Macro Prefix Numbers" buttons {"Cancel", "Clear", "OK"} ¬ default button "OK" with icon ¬ POSIX file "/System/Volumes/Data/Applications/Keyboard Maestro.app/Contents/Resources/kmicon.icns" set startNum to dialogResult's text returned as number set sel to selection if class of item 1 of sel ≠ macro then error "Invalid selection, please select macro(s)" set n to startNum repeat with m in sel set oldname to m's name if dialogResult's button returned = "Clear" then if character 3 of oldname = ")" then -- 2 digit number prefix set newname to characters 4 thru -1 of oldname as text else if character 2 of oldname = ")" then -- 1 digit number prefix set newname to characters 3 thru -1 of oldname as text else -- doesn't have a number prefix set newname to oldname end if else if n < 10 then set n to "0" & n if character 3 of oldname is ")" then set newname to n & (characters 3 thru -1 of oldname) as text else if character 2 of oldname is ")" then -- 1 digit number prefix set newname to n & (characters 2 thru -1 of oldname) as text else -- doesn't have a number prefix set newname to (n & ")" & oldname) as text end if set n to n + 1 end if set m's name to newname end repeat end tell on error errMsg number errNum if errNum ≠ -128 then display dialog errMsg & return & return & errNum buttons {"Cancel", "OK"} ¬ default button "OK" with icon caution end if end try
patches/screaming_wings/disasm/patched_screaming_wings_block_4.asm
fcatrin/a8tools
3
18745
<filename>patches/screaming_wings/disasm/patched_screaming_wings_block_4.asm<gh_stars>1-10 ; BLOCK 4 patched_screaming_wings.xex org $1500 L_1500 lda ENEMY_MOV_TYPE bne L_153C lda #$28 sta ENEMY_Y sta $0625 lda $0683 bmi L_1516 lda #$D0 bne L_1518 L_1516 lda #$28 L_1518 sta ENEMY_X sta HPOSP2 sta HPOSP3 lda #$00 sta $06AE sta BIGPLANE_FIRE_TYPE+3 lda #$0F sta PCOLR3 lda #$42 sta PCOLR2 lda #$0E sta L_542E+1 inc ENEMY_MOV_TYPE rts L_153C lda $0625 bne L_155B lda ENEMY_X+7 bne L_1579 lda $0624 beq L_154C rts L_154C sta ENEMY_MOV_TYPE sta ENEMY_TYPE sta ENEMY_X+6 lda #$11 sta L_542E+1 rts L_155B lda $06AE cmp #$18 bcc L_156E lda #$00 sta $0625 sta ENEMY_X+2 inc ENEMY_X+7 rts L_156E inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$02 bcs L_157B rts L_1579 bne L_15E4 L_157B lda #$00 sta ENEMY_MOV_TYPE+1 inc $06C9 lda $06C9 cmp #$02 bcc L_15A0 lda #$00 sta $06C9 lda BIGPLANE_FIRE_TYPE beq L_159B lda #$00 sta BIGPLANE_FIRE_TYPE beq L_15A0 L_159B lda #$01 L_159D sta BIGPLANE_FIRE_TYPE L_15A0 lda ENEMY_X cmp PLANE_X beq L_15B4 bcc L_15B1 dec ENEMY_X lda #$00 beq L_15B4 L_15B1 inc ENEMY_X L_15B4 lda ENEMY_X sta HPOSP2 sta HPOSP3 lda ENEMY_MOV_TYPE cmp #$02 bne L_15D5 dec ENEMY_Y lda ENEMY_Y cmp #$30 bcs L_15E4 lda #$03 sta ENEMY_MOV_TYPE bne L_15E4 L_15D5 inc ENEMY_Y lda ENEMY_Y cmp #$60 bcc L_15E4 lda #$02 sta ENEMY_MOV_TYPE L_15E4 lda $0625 bne L_15FC ldx #$00 ldy ENEMY_Y txa L_15EF sta L_3605+7,y sta L_370C,y iny inx cpx #$06 bne L_15EF rts L_15FC ldx ENEMY_Y ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_1619 L_1606 lda L_2EFC+4,y sta PMGFX0+3,x lda L_2F1C+6,y sta PMGFX1,x inx iny cpy #$11 bne L_1606 rts L_1619 lda L_2EFC+4,y sta PMGFX0+3,x lda L_2F0C+5,y sta PMGFX1,x inx iny cpy #$11 bne L_1619 rts .word LNFLG .word LNFLG L_1630 lda BIGPLANE_FIRE_TYPE+3 bne L_1657 lda #$28 sta ENEMY_MOV_TYPE+7 sta $0624 lda M2PF bmi L_1646 lda #$D0 bne L_1648 L_1646 lda #$28 L_1648 sta BIGPLANE_FIRE_TYPE+1 sta BIGPLANE_FIRE_TYPE+2 lda #$00 sta $06C5 inc BIGPLANE_FIRE_TYPE+3 rts L_1657 lda $0624 beq L_16AA lda $06C5 bne L_1671 dec BIGPLANE_FIRE_TYPE+1 dec BIGPLANE_FIRE_TYPE+2 lda BIGPLANE_FIRE_TYPE+1 cmp #$30 bcs L_1683 inc $06C5 L_1671 inc BIGPLANE_FIRE_TYPE+1 inc BIGPLANE_FIRE_TYPE+2 lda BIGPLANE_FIRE_TYPE+2 cmp #$C0 bcc L_1683 lda #$00 sta $06C5 L_1683 lda BIGPLANE_FIRE_TYPE+3 cmp #$02 bne L_169B dec ENEMY_MOV_TYPE+7 lda ENEMY_MOV_TYPE+7 cmp #$30 bcs L_16AA lda #$03 sta BIGPLANE_FIRE_TYPE+3 bne L_16AA L_169B inc ENEMY_MOV_TYPE+7 lda ENEMY_MOV_TYPE+7 cmp #$60 bcc L_16AA lda #$02 sta BIGPLANE_FIRE_TYPE+3 L_16AA lda $0624 L_16AD bne L_16C2 ldx #$00 ldy ENEMY_MOV_TYPE+7 txa L_16B5 sta L_340C,y sta L_350C,y iny inx cpx #$06 bne L_16B5 rts L_16C2 ldx ENEMY_MOV_TYPE+7 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_16DF L_16CC lda L_2F1C+6,y sta L_33FE+2,x lda L_2EFC+4,y sta L_3500,x inx iny cpy #$11 bne L_16CC rts L_16DF lda L_2F0C+5,y sta L_33FE+2,x lda L_2EFC+4,y sta L_3500,x inx iny cpy #$11 bne L_16DF rts .word LNFLG .word LNFLG .word LNFLG .word LNFLG .word LNFLG .word LNFLG .word LNFLG L_1700 lda ENEMY_MOV_TYPE bne L_173B lda #$50 sta ENEMY_MOV_TYPE+7 sta $0624 lda #$00 sta HPOSP2 sta HPOSP3 lda #$C0 sta BIGPLANE_FIRE_TYPE+1 sta BIGPLANE_FIRE_TYPE+2 lda #$94 sta PCOLR1 lda #$0F sta PCOLR0 lda #$00 sta BIGPLANE_FIRE_TYPE sta ENEMY_MOV_TYPE+1 sta BIGPLANE_FIRE_TYPE+3 lda #$0E sta L_542E+1 inc ENEMY_MOV_TYPE rts L_173B inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$03 bcc L_1759 lda #$00 sta ENEMY_MOV_TYPE+1 lda BIGPLANE_FIRE_TYPE bne L_1754 inc BIGPLANE_FIRE_TYPE bpl L_1759 L_1754 lda #$00 sta BIGPLANE_FIRE_TYPE L_1759 ldy ENEMY_MOV_TYPE+7 ldx #$00 lda ENEMY_MOV_TYPE cmp #$02 bcc L_1766 rts L_1766 lda BIGPLANE_FIRE_TYPE+1 cmp #$28 bcs L_1783 lda #$00 sta $0624 txa L_1773 sta L_33FE+2,y sta L_3500,y iny inx cpx #$0D bne L_1773 inc ENEMY_MOV_TYPE rts L_1783 dec BIGPLANE_FIRE_TYPE+1 dec BIGPLANE_FIRE_TYPE+2 lda $0624 bne L_178F rts L_178F lda BIGPLANE_FIRE_TYPE bne L_17A7 L_1794 lda L_3E0A+6,x sta L_33FE+2,y lda L_3E1A+3,x sta L_3500,y iny inx cpx #$0D bne L_1794 rts L_17A7 lda L_3E0A+6,x sta L_33FE+2,y lda L_3E2A,x sta L_3500,y iny inx cpx #$0D bne L_17A7 rts brk cpx #$12 beq L_17C0 rts L_17C0 inc $06BB rts dec $06BC lda $06BC sta AUDC3 cmp #$E0 beq L_17D2 rts L_17D2 lda #$00 sta $06BB rts .byte $40, $3C, $40, $48, $51, $48, $40, $3C .byte $40, $48, $40, $3C, $35, $3C, $40, $48 .byte $51, $48, $51, $48, $00, $00, $00, $00 .byte $00, $00, $D2 lda L_19AA,y bne L_1800 ldy #$00 sty $0673 lda L_19AA,y L_1800 ldx $06BF cpx #$00 bne L_181D lda $0658 sta $06C1 stx $0658 stx AUDC1 stx AUDC2 stx $06CE inc $06BF rts L_181D inc $06C0 lda $06C0 cmp #$09 bcs L_1828 rts L_1828 lda #$00 sta $06C0 sta AUDC3 cpx #$01 bne L_1851 lda #$EF sta $06CD sta AUDC4 ldx $06CE lda L_186E,x sta AUDF4 inc $06CE cpx #$11 bcs L_184D rts L_184D inc $06BF rts L_1851 cpx #$02 beq L_1856 rts L_1856 dec $06CD lda $06CD sta AUDC4 cmp #$E0 bcc L_1864 rts L_1864 inc $06BF lda $06C1 sta $0658 rts L_186E rts adc L_606B+1,y rts jmp (L_6C79) rts adc L_6C79,y rts rts jmp (L_6C79) rts L_1880 ldx $06BB bne L_1886 rts L_1886 inc $06BE lda $06BE cmp #$03 bcs L_1891 rts L_1891 lda #$00 L_1893 sta $06BE cpx #$01 bne L_18AB lda #$EF sta $06BC sta AUDC3 lda #$00 sta $06BD inc $06BB rts L_18AB cpx #$02 bne L_18C4 ldx $06BD lda L_18D8,x sta AUDF3 inc $06BD cpx #$12 beq L_18C0 rts L_18C0 inc $06BB rts L_18C4 dec $06BC lda $06BC sta AUDC3 cmp #$E0 beq L_18D2 rts L_18D2 lda #$00 sta $06BB rts L_18D8 rti .byte $3C, $40, $48, $51, $48, $40, $3C, $40 .byte $48, $40, $3C, $35, $3C, $40, $48, $51 .byte $48, $51, $48, $00, $00, $00, $00, $00 .byte $00, $D2 lda L_19AA,y bne L_1900 ldy #$00 sty $0673 lda L_19AA,y L_1900 lda #$00 sta $0670 sta $0674 sta $0672 sta $0673 sta $0675 lda #$07 sta $0671 rts .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00 L_1920 lda $0658 bne L_1926 rts L_1926 dec $0670 bne L_1939 inc $0674 lda $0674 cmp #$10 bcc L_1939 jsr L_1900 rts L_1939 lda $0670 and #$07 sta $0675 ldx $0674 lda L_198A,x ora $0675 sta AUDC1 lda $0675 ora #$A0 sta AUDC2 lda $0670 and $0671 bne L_1989 ldx $0672 ldy $0673 lda L_199A,x bne L_1970 ldx #$00 stx $0672 lda L_199A,x L_1970 sta AUDF1 lda L_19AA,y bne L_1980 ldy #$00 sty $0673 lda L_19AA,y L_1980 sta AUDF2 inc $0672 inc $0673 L_1989 rts L_198A .byte $9E, $9E, $9E, $9F, $DF, $DE, $DF, $9F .byte $9E, $9E, $9F, $DF, $9F, $9E, $9E, $9F L_199A .byte $2A, $28, $2A, $28, $1F, $2A, $01, $2A .byte $28, $2A, $35, $2F, $00, $00, $00, $00 L_19AA .byte $40, $01, $80, $01, $40, $01, $90, $01 .byte $40, $01, $80, $01, $40, $01, $90, $01 .byte $40, $01, $80, $01, $40, $01, $90, $01 L_19C2 .byte $40, $01, $80, $01, $40, $01, $90, $01 .byte $40, $2F, $80, $23, $40, $28, $90, $35 .byte $40, $2F, $80, $23, $40, $28, $90, $35 .byte $40, $23, $80, $2F, $40, $35, $90, $28 .byte $40, $2F, $80, $2F, $40, $35, $90, $35 .byte $40, $35, $80, $2A, $40, $2F, $90, $23 .byte $40, $1F, $80, $28, $40, $23, $90, $2F .byte $40, $2F, $80, $1F, $40, $1F, $90, $28 .byte $40, $1F, $80, $2F, $40, $23, $90, $2F .byte $00, $40, $23, $90, $2F, $40, $2F, $80 .byte $1F, $40, $1F, $90, $28, $40, $1F, $80 L_1A1A .byte $2F, $40, $23, $90, $2F, $00, $6F sta L_975D+3,x inx cpx #$08 bne L_1A1A+4 rts lda #$00 sta $0641 ldx #$00 lda L_6F91+4,x sta L_34AC+1,x asl PTABW .byte $FF beq L_1A44 lda ENEMY_TYPE bne L_1A44 jsr L_5E5F+1 L_1A44 lda ENEMY_TYPE cmp #$01 bne L_1A52 jsr L_47FE+2 jsr L_47FE+2 rts L_1A52 cmp #$02 bne L_1A5A jsr L_574F+1 rts L_1A5A cmp #$03 bne L_1A65 jsr L_6360 jsr L_6500 rts L_1A65 cmp #$04 bne L_1A70 jsr L_6360 jsr L_61BF+1 rts L_1A70 cmp #$05 bne L_1A78 jsr L_5C40 rts L_1A78 cmp #$06 bne L_1A80 jsr L_1F1F+1 rts L_1A80 cmp #$07 bne L_1A88 jsr L_1DBF+1 rts L_1A88 cmp #$08 bne L_1A90 jsr L_47FE+2 rts L_1A90 cmp #$FF bne L_1A98 jsr L_6680 rts L_1A98 .byte $60, $00, $20, $20, $4C, $44, $41, $20 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_1B00 lda #$EF sta AUDC4 ldx $066C lda $066B bne L_1B15 dex bmi L_1B16 inc $066B bne L_1B16 L_1B15 inx L_1B16 stx AUDF4 stx $066C lda PLANE_X+5 cmp #$01 bpl L_1B4C lda #$01 sta $060E lda PLANE_X+2 cmp #$10 bcc L_1B36 dec PLANE_X+2 jsr L_4B80 rts L_1B36 inc PLANE_X+5 lda #$00 sta $066B lda #$B0 sta AUDF4 sta $066C lda #$EC sta AUDC4 rts L_1B4C ldx #$00 ldy PLANE_X+2 inc PLANE_X+5 lda PLANE_X+5 cmp #$08 bcs L_1B6B L_1B5B lda L_3C4A+4,x sta L_3470,y sta L_356D+3,y iny inx cpx #$0D bne L_1B5B rts L_1B6B cmp #$10 bcs L_1B7F L_1B6F lda L_3C5A+1,x sta L_3470,y sta L_356D+3,y iny inx cpx #$0D bne L_1B6F rts L_1B7F cmp #$18 bcs L_1B93 L_1B83 lda L_3C62+6,x sta L_3470,y sta L_356D+3,y iny inx cpx #$0D bne L_1B83 rts L_1B93 cmp #$20 bcs L_1BA7 L_1B97 lda L_3C72+3,x sta L_3470,y sta L_356D+3,y iny inx cpx #$0D bne L_1B97 rts L_1BA7 cmp #$48 bcs L_1BBE inc PLANE_X+2 L_1BAE lda L_3C82,x sta L_3470,y sta L_356D+3,y iny inx cpx #$0D bne L_1BAE rts L_1BBE cmp #$50 bcs L_1BD2 L_1BC2 lda L_3C8A+5,x sta L_3470,y sta L_356D+3,y iny inx cpx #$0D bne L_1BC2 rts L_1BD2 cmp #$58 bcs L_1BE6 L_1BD6 lda L_3C9A+2,x sta L_3470,y sta L_356D+3,y iny inx cpx #$0D bne L_1BD6 rts L_1BE6 lda #$00 sta PLANE_X+4 sta AUDC4 rts .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $9B, $52, $17, $10, $20, $20 .byte $42 L_1C00 lda $06BB bne L_1C3F lda $06BF bne L_1C3F lda $0665 bne L_1C1F lda #$B0 sta AUDF3 sta $0666 lda #$E3 sta AUDC3 sta $0665 L_1C1F ldx $0666 lda $0683 bmi L_1C34 inx bmi L_1C39 L_1C2A lda #$00 sta AUDC3 sta $0665 beq L_1C3F L_1C34 dex bmi L_1C39 bpl L_1C2A L_1C39 stx $0666 stx AUDF3 L_1C3F lda $0634 cmp #$FF beq L_1C4E lda ENEMY_TYPE bne L_1C4E jsr L_5E38 L_1C4E lda ENEMY_TYPE cmp #$01 bne L_1C5C jsr L_47FE+2 jsr L_47FE+2 rts L_1C5C cmp #$02 bne L_1C64 jsr L_574F+1 rts L_1C64 cmp #$03 bne L_1C7A lda $06C2 bne L_1C73 jsr L_6360 jmp L_1C76 L_1C73 jsr L_1700 L_1C76 jsr L_6500 rts L_1C7A cmp #$04 bne L_1C90 lda $06C2 bne L_1C89 jsr L_6360 jmp L_1C8C L_1C89 jsr L_1700 L_1C8C jsr L_61BF+1 rts L_1C90 cmp #$05 bne L_1CA0 lda STAGE_NO beq L_1C9C jsr L_5C40 L_1C9C jsr L_5C40 rts L_1CA0 cmp #$06 bne L_1CA8 jsr L_1F1F+1 rts L_1CA8 cmp #$07 bne L_1CB0 jsr L_1DBF+1 rts L_1CB0 cmp #$08 bne L_1CB8 jsr L_1500 rts L_1CB8 cmp #$09 bne L_1CC3 jsr L_1500 jsr L_1630 rts L_1CC3 cmp #$0A bne L_1CCB jsr L_6AFE+2 rts L_1CCB cmp #$0B bne L_1CD3 jsr BIGPLANE_CHECK2 rts L_1CD3 cmp #$FF bne L_1CDB jsr L_6680 rts L_1CDB rts asl STARP+1 .byte $02 sta B0_ICBAL,x lda #$19 sta B0_ICBAH,x lda #$06 sta B0_ICBLL,x lda #$00 sta B0_ICBLH,x bit L_159D+1 bpl L_1D05 lda #$04 sta B0_ICBLL,x lda #$C3 sta B0_ICBAL,x lda #$19 sta B0_ICBAH,x L_1D05 jsr L_31E4+5 ldx #$10 lda #$F9 sta B0_ICBLL,x lda #$13 sta B0_ICBLH,x inc B0_ICBLL,x bne L_1D1C inc B0_ICBLH,x L_1D1C lda L_19C2+1 sta B0_ICBAL,x lda L_19C2+2 sta B0_ICBAH,x jmp L_1893 .byte $53 eor (COLCRS+1,x) eor ICSPRZ+1 L_1D30 ldy ENEMY_Y cpy #$B0 bcc L_1D61 ldx #$00 txa L_1D3A sta PMGFX0+3,y sta PMGFX1,y iny inx cpx #$10 bne L_1D3A lda #$00 sta ENEMY_TYPE sta ENEMY_MOV_TYPE lda #$11 sta L_542E+1 inc $06CC lda $06CC cmp #$05 bcs L_1D60 dec $06AF L_1D60 rts L_1D61 lda PLANE_X cmp ENEMY_X beq L_1D75 bcs L_1D72 dec ENEMY_X lda #$01 bne L_1D75 L_1D72 inc ENEMY_X L_1D75 lda ENEMY_X sta HPOSP2 sta HPOSP3 lda $0625 bne L_1D84 rts L_1D84 ldx #$00 lda BIGPLANE_FIRE_TYPE bne L_1D9E L_1D8B lda L_2EFC+3,x sta PMGFX0+3,y lda L_2F0C+4,x sta PMGFX1,y iny inx cpx #$10 bne L_1D8B rts L_1D9E lda L_2FBC+4,x sta PMGFX0+3,y lda #$00 sta PMGFX1,y iny inx cpx #$10 bne L_1D9E rts .byte $00, $00, $99, $00, $37, $C8, $E8, $E0 .byte $10, $D0, $EF, $60, $00, $00, $36 L_1DBF lda #$AD asl TRAMSZ,x bne L_1DDD lda #$B0 sta ENEMY_Y lda #$20 sta ENEMY_X lda #$0C sta L_542E+1 lda #$00 sta $0669 inc ENEMY_MOV_TYPE rts L_1DDD cmp #$02 bne L_1DF2 dec ENEMY_Y ldy ENEMY_Y cpy #$90 bcs L_1E01 lda #$01 sta ENEMY_MOV_TYPE bne L_1E01 L_1DF2 inc ENEMY_Y ldy ENEMY_Y cpy #$B8 bcc L_1E01 lda #$02 sta ENEMY_MOV_TYPE L_1E01 inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$03 bcc L_1E1F lda #$00 sta ENEMY_MOV_TYPE+1 inc BIGPLANE_FIRE_TYPE lda BIGPLANE_FIRE_TYPE cmp #$03 bmi L_1E1F lda #$01 sta BIGPLANE_FIRE_TYPE L_1E1F lda #$04 sta $0668 lda $0669 beq L_1E2B bne L_1E9F L_1E2B inc ENEMY_X lda ENEMY_X cmp #$D0 beq L_1E3D sec sbc #$30 cmp PLANE_X bne L_1E4D L_1E3D ldx #$00 txa L_1E40 sta PMGFX0+3,x sta PMGFX1,x inx bne L_1E40 inc $0669 rts L_1E4D lda ENEMY_X sta HPOSP2 sta HPOSP3 lda BIGPLANE_FIRE_TYPE cmp #$02 beq L_1E7E L_1E5D ldx #$0E L_1E5F lda L_2F54+6,x sta PMGFX0+3,y lda L_2F64+5,x sta PMGFX1,y dey dex cpx #$FF bne L_1E5F dey dey dey dey dec $0668 lda $0668 bne L_1E5D rts L_1E7E ldx #$0E L_1E80 lda L_2F54+6,x sta PMGFX0+3,y lda L_2F74+4,x sta PMGFX1,y dey dex cpx #$FF bne L_1E80 dey dey dey dey dec $0668 lda $0668 bne L_1E7E rts L_1E9F dec ENEMY_X lda ENEMY_X cmp #$20 bcs L_1EC1 ldx #$00 txa L_1EAC sta PMGFX0+3,x sta PMGFX1,x inx bne L_1EAC sta ENEMY_TYPE sta ENEMY_MOV_TYPE lda #$11 sta L_542E+1 rts L_1EC1 sta HPOSP2 sta HPOSP3 lda BIGPLANE_FIRE_TYPE cmp #$02 beq L_1EEF L_1ECE ldx #$0E L_1ED0 lda L_2F84+3,x sta PMGFX0+3,y lda L_2F94+2,x sta PMGFX1,y dey dex cpx #$FF bne L_1ED0 dey dey dey dey dec $0668 lda $0668 bne L_1ECE rts L_1EEF ldx #$0E L_1EF1 lda L_2F84+3,x sta PMGFX0+3,y lda L_2FA4+1,x sta PMGFX1,y dey dex cpx #$FF L_1F01 bne L_1EF1 dey dey dey dey dec $0668 lda $0668 bne L_1EEF rts .word LNFLG bne L_1F01+1 rts cmp #$03 bcs L_1F3A inc ENEMY_X inc ENEMY_MOV_TYPE+7 L_1F1F stx L_16AD asl $D0 .byte $13 lda #$B0 sta ENEMY_Y lda #$D8 sta ENEMY_X lda #$0A sta L_542E+1 inc ENEMY_MOV_TYPE rts cmp #$02 L_1F3A bne L_1F4D dec ENEMY_Y ldy ENEMY_Y cpy #$9C bcs L_1F5C lda #$01 sta ENEMY_MOV_TYPE bne L_1F5C L_1F4D inc ENEMY_Y ldy ENEMY_Y cpy #$B4 bcc L_1F5C lda #$02 sta ENEMY_MOV_TYPE L_1F5C inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$03 bcc L_1F7A lda #$00 sta ENEMY_MOV_TYPE+1 inc BIGPLANE_FIRE_TYPE lda BIGPLANE_FIRE_TYPE cmp #$03 bmi L_1F7A lda #$01 sta BIGPLANE_FIRE_TYPE L_1F7A lda #$06 sta $0668 dec ENEMY_X lda ENEMY_X cmp #$20 bcs L_1FA1 ldx #$00 txa L_1F8C sta PMGFX0+3,x sta PMGFX1,x inx bne L_1F8C sta ENEMY_TYPE sta ENEMY_MOV_TYPE lda #$11 sta L_542E+1 rts L_1FA1 sta HPOSP2 sta HPOSP3 lda BIGPLANE_FIRE_TYPE cmp #$02 beq L_1FCE L_1FAE ldx #$0C L_1FB0 lda L_3E0A+5,x sta PMGFX0+3,y lda L_3E1A+2,x sta PMGFX1,y dey dex cpx #$FF bne L_1FB0 dey dey dey dec $0668 lda $0668 bne L_1FAE rts L_1FCE ldx #$0C L_1FD0 lda L_3E0A+5,x sta PMGFX0+3,y lda L_3E22+7,x sta PMGFX1,y dey dex cpx #$FF bne L_1FD0 dey dey dey dec $0668 lda $0668 bne L_1FCE lda #$00 rts .byte $00, $00, $60, $00, $05, $06, $20, $3B .byte $9B, $82, $05, $06, $20, $3B, $9B, $8C L_2000 .byte $AD, $5C, $06, $F0, $03, $4C, $63, $20 inc $065C lda #$21 sta RUNSTK+1 lda #$21 sta RUNSTK lda #$83 sta TOPSTK+1 lda #$21 sta TOPSTK ldy #$00 L_201D lda (RUNSTK),y sta (TOPSTK),y cpy #$A0 bne L_202B lda TOPSTK+1 cmp #$8F beq L_2035 L_202B iny bne L_201D inc RUNSTK+1 inc TOPSTK+1 jmp L_201D L_2035 ldx #$00 L_2037 lda L_2A54+5,x sta L_8FDD,x lda L_2B1C+5,x sta L_90A5,x lda L_2BE4+5,x sta L_916D,x inx cpx #$C8 bne L_2037 rts .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00 L_2063 lda #$00 sta $065C lda #$A0 sta RUNSTK+1 lda #$61 sta RUNSTK lda #$83 sta TOPSTK+1 lda #$21 sta TOPSTK ldy #$00 L_207A lda (RUNSTK),y sta (TOPSTK),y cpy #$A0 bne L_2088 lda TOPSTK+1 cmp #$8F beq L_2092 L_2088 iny bne L_207A inc RUNSTK+1 inc TOPSTK+1 jmp L_207A L_2092 ldx #$00 L_2094 lda L_A998+1,x sta L_8FDD,x lda L_AA60+1,x sta L_90A5,x lda L_AB28+1,x sta L_916D,x inx cpx #$C8 bne L_2094 rts .byte $00, $00, $00, $00, $00, $30, $2C, $58 .byte $9B, $56, $0E, $11, $20, $20, $53, $54 .byte $41, $20, $33, $36, $38, $32, $39, $2C .byte $58, $9B, $60, $0E, $11, $20, $20, $4C .byte $44, $41, $20, $31, $31, $30, $38, $30 .byte $2C, $58, $9B, $6A, $0E, $11, $20, $20 .byte $53, $54, $41, $20, $33, $37, $30, $32 .byte $39, $2C, $58, $9B, $74, $0E, $11, $20 .byte $20, $4C, $44, $41, $20, $31, $31, $32 .byte $38, $30, $2C, $58, $9B, $7E, $0E, $11 .byte $20, $20, $53, $54, $41, $20, $33, $37 .byte $32, $32, $39, $2C, $58, $9B, $88, $0E .byte $11, $20, $20, $4C, $44, $41, $20, $31 .byte $31, $34, $38, $30, $2C, $58, $9B, $92 .byte $0E, $11, $20, $20, $53, $39, $39, $3A .byte $39, $39, $49, $4A, $0C, $4A, $4B, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $3A .byte $3A, $3A, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $49, $15, $3A, $49, $4A .byte $0C, $4A, $4A, $14, $15, $14, $19, $0C .byte $4A, $4B, $3A, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $49, $4A, $4A .byte $4A, $4B, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $49, $4A, $0C, $15, $49, $0C, $19 .byte $15, $14, $15, $14, $15, $14, $15, $19 .byte $0C, $50, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $49, $4A, $4A, $0C, $0C, $0C, $14 .byte $19, $0C, $4B, $3A, $39, $3A, $49, $4A .byte $4A, $0C, $14, $15, $15, $14, $15, $14 .byte $15, $14, $15, $14, $16, $16, $15, $15 .byte $19, $4A, $4B, $39, $3A, $39, $49, $4A .byte $4A, $0C, $14, $15, $14, $15, $14, $15 .byte $14, $19, $0C, $4A, $4A, $4A, $0C, $15 .byte $14, $15, $14, $15, $15, $14, $15, $14 .byte $15, $16, $16, $15, $14, $14, $16, $15 .byte $15, $19, $0C, $4A, $0C, $4A, $0C, $0C .byte $14, $15, $16, $14, $15, $14, $16, $14 .byte $15, $14, $19, $0C, $0C, $14, $16, $14 .byte $15, $14, $16, $15, $15, $15, $14, $15 .byte $16, $15, $15, $14, $16, $16, $15, $14 .byte $14, $18, $19, $19, $0C, $0C, $14, $14 .byte $15, $14, $15, $15, $15, $14, $15, $14 .byte $15, $14, $15, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $15, $15, $15, $14 .byte $16, $16, $15, $14, $19, $64, $65, $16 .byte $15, $14, $15, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $15, $14, $15, $16 .byte $16, $15, $14, $15, $16, $76, $15, $14 .byte $16, $19, $66, $67, $14, $16, $14, $15 .byte $16, $14, $19, $14, $15, $16, $14, $15 .byte $14, $16, $19, $14, $15, $16, $14, $15 .byte $14, $16, $14, $15, $15, $15, $14, $15 .byte $14, $16, $14, $15, $16, $68, $69, $14 .byte $15, $14, $77, $15, $15, $15, $15, $14 .byte $16, $15, $15, $16, $14, $15, $14, $15 L_227C .byte $14, $14, $14, $15, $16, $15, $19, $64 .byte $65, $16, $14, $14, $15, $16, $16, $16 .byte $16, $16, $14, $15, $15, $14, $15, $14 .byte $6A, $6B, $15, $15, $14, $14, $14, $15 .byte $6C, $6F, $14, $15, $14, $15, $14, $16 .byte $14, $15, $14, $16, $16, $14, $15, $14 .byte $16, $66, $67, $14, $15, $14, $15, $16 .byte $14, $16, $14, $15, $14, $15, $14, $16 .byte $14, $15, $14, $16, $14, $15, $14, $19 .byte $6C, $3A, $6F, $14, $15, $14, $16, $14 .byte $15, $14, $16, $14, $16, $16, $16, $15 .byte $14, $16, $14, $15, $15, $15, $64, $14 .byte $16, $66, $67, $14, $14, $15, $16, $14 .byte $15, $16, $15, $14, $15, $14, $19, $6C .byte $39, $3A, $39, $6F, $14, $15, $15, $14 .byte $15, $14, $15, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $15, $14, $68, $69 .byte $16, $15, $6B, $15, $16, $14, $15, $14 .byte $15, $16, $16, $15, $14, $19, $6C, $3A .byte $39, $39, $3A, $39, $72, $14, $14, $15 .byte $14, $16, $19, $14, $15, $16, $14, $15 .byte $14, $16, $14, $15, $15, $16, $15, $14 .byte $14, $14, $15, $16, $15, $16, $15, $15 .byte $16, $15, $14, $15, $19, $70, $39, $3A .byte $39, $3A, $39, $3A, $6E, $6D, $6E, $6D .byte $6E, $6F, $14, $15, $16, $14, $15, $16 .byte $16, $15, $14, $16, $15, $15, $16, $18 .byte $15, $16, $14, $15, $16, $14, $16, $14 .byte $15, $16, $15, $14, $70, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $39, $71, $14, $15, $16, $15, $16, $15 .byte $14, $15, $14, $15, $15, $19, $14, $15 .byte $16, $16, $15, $14, $65, $67, $16, $15 .byte $16, $14, $15, $19, $72, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $75, $14, $15, $16, $14, $15, $14, $16 .byte $14, $15, $15, $14, $15, $18, $19, $15 .byte $19, $64, $65, $66, $14, $15, $16, $15 .byte $14, $15, $19, $6C, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $3A .byte $6F, $16, $14, $16, $15, $16, $14, $14 .byte $15, $16, $15, $18, $15, $15, $16, $18 .byte $15, $14, $15, $14, $16, $14, $15, $14 .byte $15, $16, $15, $18, $72, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $75 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $16, $14, $14, $15, $15, $19, $14, $15 .byte $16, $16, $15, $14, $14, $15, $16, $15 .byte $16, $14, $15, $16, $19, $72, $3A, $39 .byte $3A, $39, $75, $72, $3A, $39, $75, $15 .byte $16, $14, $15, $14, $16, $14, $15, $16 .byte $16, $16, $15, $14, $15, $18, $19, $15 .byte $14, $16, $16, $15, $14, $15, $16, $15 .byte $14, $15, $16, $15, $14, $15, $72, $73 .byte $74, $75, $14, $19, $72, $75, $15, $14 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $16, $14, $15, $16, $15, $14, $15, $16 .byte $14, $15, $14, $16, $14, $15, $14, $16 .byte $19, $18, $14, $15, $16, $14, $15, $14 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $16, $14, $15, $14, $15, $15, $15, $16 .byte $16, $14, $15, $14, $16, $16, $15, $14 .byte $14, $14, $14, $18, $19, $14, $15, $16 .byte $14, $15, $14, $16, $14, $15, $16, $14 .byte $15, $15, $15, $14, $16, $15, $14, $16 .byte $15, $14, $16, $14, $15, $14, $14, $14 .byte $15, $16, $18, $18, $19, $14, $15, $16 .byte $14, $15, $14, $16, $14, $15, $14, $16 .byte $14, $15, $14, $16, $14, $15, $14, $16 .byte $14, $15, $14, $16, $14, $15, $14, $16 .byte $14, $15, $14, $15, $15, $14, $15, $14 .byte $15, $14, $15, $14, $16, $16, $15, $15 .byte $14, $15, $14, $15, $16, $14, $15, $14 .byte $14, $15, $15, $14, $15, $16, $14, $15 .byte $14, $1C, $64, $65, $66, $1C, $65, $67 .byte $14, $15, $14, $15, $15, $14, $15, $14 .byte $15, $16, $16, $15, $14, $14, $16, $15 .byte $15, $14, $15, $14, $15, $16, $14, $15 .byte $14, $15, $16, $14, $15, $14, $16, $14 .byte $15, $14, $76, $14, $15, $16, $19, $14 .byte $15, $14, $16, $15, $15, $15, $14, $15 .byte $16, $15, $15, $14, $16, $16, $15, $14 .byte $14, $18, $14, $14, $15, $16, $14, $15 .byte $15, $14, $15, $15, $15, $14, $15, $14 .byte $15, $14, $76, $1C, $1B, $1A, $1B, $77 .byte $15, $14, $15, $14, $15, $15, $15, $14 .byte $16, $16, $15, $14, $14, $15, $6C, $6D .byte $6D, $6E, $6F, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $15, $14, $15, $14 .byte $15, $14, $19, $76, $14, $15, $19, $14 .byte $15, $14, $15, $14, $15, $14, $15, $16 .byte $16, $15, $6C, $6D, $6D, $6E, $3A, $39 .byte $3A, $39, $3A, $6D, $6E, $6F, $14, $15 .byte $16, $14, $19, $14, $15, $16, $14, $15 .byte $14, $16, $19, $68, $1A, $6A, $6B, $15 .byte $14, $16, $14, $15, $15, $15, $14, $15 .byte $6C, $6E, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $6D, $6E .byte $6F, $15, $15, $16, $14, $15, $14, $15 .byte $14, $14, $14, $15, $16, $15, $16, $14 .byte $15, $16, $14, $14, $15, $16, $16, $16 .byte $72, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $71, $15, $14, $15, $14, $15, $14, $16 .byte $14, $15, $14, $16, $16, $14, $15, $14 .byte $16, $15, $14, $14, $15, $14, $15, $16 .byte $6C, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $6C, $6D, $6E, $6F, $14, $16, $14 .byte $15, $14, $16, $14, $16, $16, $16, $15 .byte $14, $16, $14, $15, $15, $15, $15, $14 .byte $72, $73, $74, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $6C, $6D, $6F .byte $15, $14, $15, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $15, $14, $15, $16 .byte $16, $15, $14, $72, $73, $3A, $39, $3A .byte $39, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $6E, $6F, $19, $14, $15, $16, $14, $15 .byte $14, $16, $14, $15, $15, $16, $15, $14 .byte $14, $14, $15, $16, $15, $72, $73, $75 .byte $14, $15, $72, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $73, $74, $75, $73, $74 .byte $75, $14, $15, $16, $15, $14, $15, $16 .byte $16, $15, $14, $16, $15, $15, $16, $18 .byte $15, $16, $14, $15, $16, $14, $16, $14 .byte $15, $16, $15, $72, $73, $74, $6F, $6C .byte $74, $75, $14, $15, $16, $14, $15, $16 .byte $14, $15, $14, $16, $64, $65, $1C, $66 .byte $67, $15, $14, $15, $15, $19, $14, $15 .byte $16, $16, $15, $14, $14, $15, $16, $15 .byte $16, $14, $15, $14, $15, $16, $14, $15 .byte $14, $16, $14, $15, $14, $16, $14, $15 .byte $14, $16, $15, $16, $76, $14, $15, $1B .byte $77, $15, $15, $14, $15, $18, $19, $15 .byte $14, $16, $16, $15, $14, $15, $16, $15 .byte $14, $15, $14, $15, $16, $14, $15, $14 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $15, $16, $14, $15, $15, $16, $14, $14 .byte $15, $16, $15, $18, $15, $15, $16, $18 .byte $15, $16, $14, $15, $16, $14, $16, $14 .byte $15, $16, $15, $14, $15, $16, $14, $15 .byte $14, $16, $14, $15, $14, $16, $14, $15 .byte $16, $14, $15, $14, $16, $68, $69, $14 .byte $6B, $14, $14, $15, $15, $19, $14, $15 .byte $16, $16, $15, $14, $14, $15, $16, $15 .byte $16, $14, $15, $16, $19, $14, $15, $16 .byte $14, $15, $14, $16, $14, $15, $14, $15 .byte $16, $14, $15, $14, $16, $14, $15, $16 .byte $16, $16, $15, $14, $15, $18, $19, $15 .byte $14, $16, $16, $15, $14, $15, $16, $15 .byte $14, $15, $16, $15, $14, $15, $16, $19 .byte $15, $14, $16, $14, $15, $14, $15, $14 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $16, $14, $15, $16, $15, $14, $15, $16 .byte $14, $15, $14, $16, $14, $15, $14, $16 .byte $19, $18, $14, $15, $16, $14, $15, $14 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $16, $14, $15, $14, $14, $15, $15, $16 .byte $16, $14, $15, $14, $16, $16, $15, $14 .byte $14, $14, $14, $18, $19, $14, $15, $16 .byte $14, $15, $14, $16, $14, $15, $16, $14 .byte $15, $15, $15, $14, $16, $15, $14, $16 .byte $15, $14, $16, $14, $14, $14, $14, $14 .byte $15, $16, $18, $18, $19, $14, $15, $16 .byte $14, $15, $14, $16, $14, $15, $14, $16 .byte $14, $15, $14, $16, $14, $15, $14, $16 .byte $14, $15, $14, $16, $14, $15, $14, $16 .byte $14, $15, $14, $15, $14, $14, $15, $14 .byte $15, $14, $15, $14, $16, $16, $15, $15 .byte $14, $15, $14, $15, $16, $14, $15, $14 .byte $14, $15, $15, $14, $15, $16, $14, $15 .byte $14, $1C, $14, $15, $16, $14, $15, $15 .byte $14, $15, $14, $15, $14, $14, $15, $14 .byte $15, $16, $16, $15, $14, $14, $16, $15 .byte $15, $14, $15, $14, $15, $16, $14, $15 .byte $14, $15, $16, $14, $15, $14, $16, $14 .byte $15, $14, $14, $15, $16, $14, $16, $14 .byte $15, $14, $16, $15, $14, $15, $14, $15 .byte $16, $15, $15, $14, $16, $16, $15, $14 .byte $14, $18, $14, $15, $14, $15, $14, $14 .byte $15, $14, $15, $15, $15, $14, $15, $14 .byte $15, $14, $15, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $14, $15, $15, $14 .byte $16, $16, $15, $14, $14, $15, $6C, $6D .byte $6D, $6E, $6F, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $14, $14, $15, $16 .byte $16, $15, $6C, $6D, $6D, $6E, $3A, $39 .byte $3A, $39, $3A, $6D, $6E, $6F, $14, $15 .byte $16, $14, $19, $14, $15, $16, $14, $15 .byte $14, $16, $19, $14, $15, $16, $14, $15 .byte $14, $16, $14, $15, $14, $15, $14, $15 .byte $6C, $6E, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $6D, $6E .byte $6F, $15, $15, $16, $14, $15, $14, $15 .byte $14, $14, $14, $15, $16, $15, $16, $14 .byte $15, $16, $14, $14, $14, $16, $16, $16 .byte $72, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $71, $15, $14, $15, $14, $15, $14, $16 .byte $14, $15, $14, $16, $16, $14, $15, $14 .byte $16, $15, $14, $14, $14, $14, $15, $16 .byte $6C, $39, $3A, $39, $3A, $39, $3A, $39 .byte $72, $73, $74, $39, $3A, $39, $74, $75 .byte $14, $15, $16, $14, $15, $16, $14, $15 .byte $15, $14, $16, $14, $16, $16, $16, $15 .byte $14, $16, $14, $15, $14, $15, $15, $14 .byte $72, $73, $3A, $39, $3A, $73, $74, $73 .byte $14, $15, $16, $14, $15, $14, $14, $15 .byte $16, $14, $15, $14, $15, $16, $14, $15 .byte $14, $14, $15, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $14, $14, $15, $16 .byte $16, $15, $72, $73, $75, $16, $14, $15 .byte $14, $15, $16, $14, $15, $14, $16, $14 .byte $15, $14, $16, $14, $15, $16, $14, $15 .byte $14, $16, $19, $14, $15, $16, $14, $15 .byte $14, $16, $14, $15, $14, $16, $15, $14 .byte $14, $14, $15, $16, $15, $14, $15, $14 .byte $16, $14, $15, $14, $15, $14, $15, $14 .byte $16, $14, $15, $14, $16, $15, $14, $16 .byte $14, $15, $15, $16, $15, $14, $15, $16 .byte $16, $15, $14, $16, $14, $15, $16, $18 .byte $15, $16, $14, $15, $16, $14, $16, $14 .byte $15, $16, $15, $14, $15, $16, $14, $15 .byte $14, $16, $14, $15, $16, $14, $15, $16 .byte $14, $15, $14, $16, $16, $15, $16, $15 .byte $14, $15, $14, $15, $14, $19, $14, $15 .byte $16, $16, $15, $14, $14, $15, $16, $15 .byte $16, $14, $15, $14, $15, $16, $14, $15 .byte $14, $16, $14, $15, $14, $16, $14, $15 .byte $14, $16, $15, $16, $14, $15, $14, $16 .byte $14, $15, $15, $14, $14, $18, $19, $15 .byte $14, $16, $16, $15, $14, $15, $16, $15 .byte $14, $15, $14, $15, $16, $14, $15, $14 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $15, $16, $14, $17, $15, $16, $14, $14 .byte $15, $16, $15, $18, $14, $15, $16, $18 .byte $15, $16, $14, $15, $16, $14, $16, $14 .byte $15, $16, $15, $14, $15, $16, $14, $15 .byte $14, $16, $14, $15, $14, $16, $14, $15 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $16, $14, $14, $15, $14, $19, $14, $15 .byte $16, $16, $15, $14, $14, $15, $16, $15 .byte $16, $14, $15, $16, $19, $14, $15, $16 .byte $14, $15, $14, $16, $14, $15, $14, $15 .byte $16, $14, $15, $14, $16, $14, $15, $16 L_2A54 .byte $16, $16, $15, $14, $14, $18, $19, $15 .byte $14, $16, $16, $15, $14, $15, $16, $15 .byte $14, $15, $16, $15, $14, $15, $16, $19 .byte $15, $14, $16, $14, $15, $14, $15, $14 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $16, $14, $15, $16, $14, $14, $15, $16 .byte $14, $16, $14, $15, $14, $15, $14, $16 .byte $14, $15, $14, $16, $14, $15, $14, $19 .byte $0C, $0C, $0C, $14, $15, $14, $16, $14 .byte $15, $14, $16, $14, $16, $16, $16, $15 .byte $14, $16, $14, $15, $15, $15, $15, $14 .byte $16, $16, $15, $14, $14, $15, $16, $16 .byte $15, $14, $15, $14, $15, $19, $1C, $0C .byte $0C, $0C, $0C, $0C, $0C, $1B, $14, $14 .byte $15, $14, $15, $14, $15, $14, $15, $14 .byte $15, $14, $15, $14, $15, $14, $15, $16 .byte $16, $15, $14, $15, $16, $14, $15, $14 .byte $16, $14, $16, $15, $19, $0C, $0C, $0C .byte $1A, $14, $15, $19, $0C, $0C, $0C, $14 .byte $14, $16, $19, $14, $15, $16, $14, $15 .byte $14, $16, $14, $15, $15, $16, $15, $14 .byte $14, $14, $15, $16, $15, $16, $15, $15 .byte $16, $15, $14, $15, $19, $0C, $0C, $1B .byte $14, $15, $16, $14, $19, $0C, $0C, $0C .byte $14, $15, $16, $15, $16, $14, $15, $16 L_2B1C .byte $16, $15, $14, $16, $15, $18, $19, $15 .byte $14, $16, $16, $15, $14, $15, $16, $15 .byte $14, $15, $14, $19, $0C, $0C, $0C, $1B .byte $14, $15, $16, $1C, $0C, $0C, $0C, $14 .byte $15, $16, $14, $16, $15, $16, $14, $14 .byte $15, $16, $14, $15, $15, $15, $16, $18 .byte $15, $16, $14, $15, $16, $14, $16, $14 .byte $15, $16, $15, $18, $0C, $0C, $0C, $0C .byte $1B, $14, $1C, $0C, $0C, $0C, $14, $15 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $16, $14, $14, $15, $15, $19, $14, $15 .byte $16, $16, $15, $14, $14, $15, $16, $15 .byte $16, $14, $15, $16, $19, $0C, $0C, $0C .byte $0C, $0C, $0C, $0C, $0C, $14, $14, $15 .byte $16, $14, $15, $14, $16, $14, $15, $16 .byte $16, $16, $15, $14, $15, $18, $19, $15 .byte $14, $16, $16, $15, $14, $15, $16, $15 .byte $14, $15, $16, $15, $14, $15, $1C, $0C .byte $0C, $0C, $0C, $14, $16, $14, $15, $14 .byte $16, $14, $15, $16, $14, $15, $14, $16 .byte $14, $15, $16, $16, $15, $15, $16, $18 .byte $15, $16, $14, $15, $16, $14, $16, $14 .byte $15, $16, $15, $14, $14, $1C, $0C, $15 .byte $16, $14, $15, $16, $14, $15, $14, $16 .byte $14, $15, $14, $16, $14, $15, $16, $15 L_2BE4 .byte $14, $15, $14, $15, $15, $19, $14, $15 .byte $16, $16, $15, $14, $14, $15, $16, $15 .byte $16, $14, $15, $14, $1C, $0C, $15, $16 .byte $14, $15, $14, $16, $14, $15, $14, $16 .byte $14, $15, $15, $16, $14, $15, $14, $16 .byte $14, $15, $15, $14, $15, $4E, $4F, $4F .byte $4F, $0C, $14, $15, $14, $15, $16, $15 .byte $19, $0C, $0C, $0C, $0C, $14, $15, $14 .byte $16, $14, $15, $14, $16, $14, $15, $14 .byte $19, $0C, $0C, $14, $15, $16, $14, $14 .byte $15, $16, $15, $18, $15, $3A, $39, $3A .byte $39, $4E, $4F, $4F, $4F, $0C, $14, $19 .byte $0C, $0C, $4F, $4F, $4F, $0C, $0C, $14 .byte $16, $14, $15, $14, $19, $0C, $0C, $0C .byte $0C, $4F, $4F, $0C, $14, $14, $15, $14 .byte $16, $14, $14, $15, $15, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $4E, $4F, $4F .byte $4F, $4D, $3A, $39, $3A, $4E, $4F, $4F .byte $0C, $14, $19, $0C, $0C, $4F, $4F, $4F .byte $4D, $39, $3A, $4E, $4F, $4F, $0C, $14 .byte $16, $16, $15, $14, $15, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $4E, $4F, $4F, $4F, $4D, $39, $3A, $39 .byte $39, $3A, $39, $3A, $39, $3A, $4E, $4F .byte $4F, $4F, $4F, $4F, $15, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $15, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_2EFC .byte $00, $00, $00, $00, $00, $38, $6C, $38 .byte $54, $38, $10, $7C, $BA, $BA, $6C, $92 L_2F0C .byte $6C, $10, $10, $00, $00, $00, $00, $10 .byte $00, $28, $00, $00, $00, $44, $44, $10 L_2F1C .byte $00, $10, $00, $00, $70, $00, $00, $00 .byte $10, $00, $28, $00, $00, $00, $44, $44 .byte $10, $00, $10, $00, $00, $1C, $00, $24 .byte $FF, $BD, $FF, $66, $24, $18, $00, $00 .byte $00, $00, $18, $00, $00, $81, $00, $00 .byte $42, $00, $18, $18, $00, $00, $1C, $00 .byte $00, $18, $00, $00, $42, $00, $00, $42 L_2F54 .byte $00, $18, $18, $00, $00, $20, $00, $00 .byte $18, $18, $98, $98, $94, $6A, $6A, $94 L_2F64 .byte $98, $98, $18, $18, $00, $00, $00, $00 .byte $00, $00, $01, $09, $95, $94, $08, $00 L_2F74 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $08, $94, $95, $09, $01, $00 L_2F84 .byte $00, $00, $00, $00, $00, $18, $18, $19 .byte $19, $29, $56, $56, $29, $19, $19, $18 L_2F94 .byte $18, $00, $00, $00, $00, $00, $00, $80 .byte $90, $A9, $29, $10, $00, $00, $00, $00 L_2FA4 .byte $00, $00, $00, $00, $00, $00, $00, $10 .byte $29, $A9, $90, $80, $00, $00, $00, $00 .byte $00, $20, $5C, $3A, $35, $CB, $87, $46 L_2FBC .byte $29, $10, $08, $00, $00, $00, $10, $10 .byte $10, $10, $10, $10, $10, $10, $10, $10 .byte $10, $10, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $10, $00 .byte $00, $00, $00, $00, $00, $00, $08, $10 .byte $29, $46, $87, $CB, $35, $3A, $5C, $20 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_2FFC .byte $00, $00, $00, $00, $00, $00, $00, $00 L_3004 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_300C .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_30BC .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_31E4 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00 MISSILE_GFX lda ENEMY_MOV_TYPE bne L_3345 sta $06D3 ; intialize big plane sta $06D4 sta $06D8 sta $0625 lda #$28 sta ENEMY_Y sta $06D0 lda #$D0 ; set big plane intial position sta ENEMY_X sta HPOSP2 clc adc #$1E sta HPOSP3 lda #$00 sta $06AC lda #$90 sta PCOLR3 sta PCOLR2 lda #$03 ; set quadruple size players sta SIZEP2 sta SIZEP3 lda #$0F sta L_542E+1 inc ENEMY_MOV_TYPE rts L_3345 jsr L_B550 lda $06D0 beq L_33B2 lda $06D8 bne L_3383 lda BIGPLANE_FIRE_TYPE bne BIGPLANE_NARROW BIGPLANE_WIDE lda ENEMY_X ; big plane fire wide clc adc #$14 sta HPOSM0 adc #$14 sta HPOSM1 cmp #$00 bne L_3377 BIGPLANE_NARROW lda ENEMY_X ; big plane fire narrow clc adc #$1A sta HPOSM0 adc #$07 sta HPOSM1 L_3377 lda ENEMY_Y clc adc #$1E sta ENEMY_BULLET_Y inc $06D8 L_3383 ldx #$00 ldy ENEMY_BULLET_Y BP_MISSILE_DEL lda MISSILE_GFX,y and #$FA sta MISSILE_GFX,y iny inx cpx #$03 bne BP_MISSILE_DEL cpy #$B0 bcc L_33A1 lda #$00 sta $06D8 beq L_33B2 L_33A1 sty ENEMY_BULLET_Y BP_MISSILE_ADD lda MISSILE_GFX,y ora #$05 sta MISSILE_GFX,y iny inx cpx #$06 bne BP_MISSILE_ADD L_33B2 lda $06D0 beq L_33FC inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$03 bcc L_33FC lda #$00 sta ENEMY_MOV_TYPE+1 lda BIGPLANE_FIRE_TYPE beq L_33D4 lda #$00 sta BIGPLANE_FIRE_TYPE cmp #$00 beq L_33D7 L_33D4 inc BIGPLANE_FIRE_TYPE L_33D7 lda ENEMY_X clc adc #$1C cmp PLANE_X beq L_33F0 bcc L_33ED dec ENEMY_X lda #$00 cmp #$00 beq L_33F0 L_33ED inc ENEMY_X L_33F0 lda ENEMY_X ; set big plane X position sta HPOSP2 clc adc #$1E sta HPOSP3 L_33FC ldx #$00 L_33FE ldy ENEMY_Y L_3401 lda $06D0 bne L_345A L_3406 inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 L_340C cmp #$06 bcs L_3411 rts L_3411 stx ENEMY_MOV_TYPE+1 inc $06D1 L_3417 lda $06D1 cmp #$10 bcs L_3421 jmp L_B424 L_3421 cmp #$18 bcs L_3438 L_3425 lda L_B50D+6,x sta PMGFX0+3,y L_342B lda L_B52D+3,x sta PMGFX1,y iny inx cpx #$1D L_3435 bne L_3425 L_3437 rts L_3438 txa L_3439 sta PMGFX0+3,y sta PMGFX1,y iny inx cpx #$1D bne L_3439 sta ENEMY_MOV_TYPE sta AUDC4 sta ENEMY_TYPE lda #$11 sta L_542E+1 jsr L_67E6 jsr L_67E6 rts L_345A lda M0PL and #$0C bne L_3468 lda M3PL and #$0C beq L_34C0 L_3468 ldy ENEMY_MOV_TYPE+3 ldx #$00 L_346D lda MISSILE_GFX,y L_3470 and #$AF sta MISSILE_GFX,y dey inx cpx #$0C bne L_346D lda #$00 L_347D sta ENEMY_MOV_TYPE+5 sta ENEMY_MOV_TYPE+6 L_3483 inc $06AC lda $06AC cmp #$50 bcc L_34A9 lda #$00 L_348F sta $06D0 sta $06D1 ldx #$00 ldy ENEMY_BULLET_Y L_349A lda MISSILE_GFX,y and #$FA sta MISSILE_GFX,y iny inx L_34A4 cpx #$03 bne L_349A rts L_34A9 jsr L_67B8 L_34AC lda $06D3 bne L_34B8 inc $06D3 lda #$00 beq L_34C0 L_34B8 lda $06D4 bne L_34C0 L_34BD inc $06D4 L_34C0 lda ENEMY_MOV_TYPE+1 bne L_34F0 lda ENEMY_MOV_TYPE cmp #$01 bne BP_CHECK_Y_UP BP_CHECK_Y_DOWN lda ENEMY_Y cmp #$68 ; check big plane bottom Y bcc L_34D9 lda #$02 sta ENEMY_MOV_TYPE rts L_34D9 inc ENEMY_Y lda #$00 beq L_34F0 BP_CHECK_Y_UP lda ENEMY_Y cmp #$28 ; check big plane top Y bcs L_34ED L_34E7 lda #$01 L_34E9 sta ENEMY_MOV_TYPE rts L_34ED dec ENEMY_Y L_34F0 ldx #$00 ldy ENEMY_Y lda BIGPLANE_FIRE_TYPE bne BP_GFX_2_DRAW BP_GFX_1_DRAW lda BIG_PLANE_GFX1C,x sta PMGFX0+3,y L_3500 lda BIG_PLANE_GFX2C+5,x sta PMGFX1,y iny inx cpx #$1D bne BP_GFX_1_DRAW L_350C rts BP_GFX_2_DRAW lda BIG_PLANE_GFX3C+2,x sta PMGFX0+3,y lda BIG_PLANE_GFX4C+7,x sta PMGFX1,y iny inx L_351B cpx #$1D bne BP_GFX_2_DRAW rts nop nop nop nop stx ENEMY_MOV_TYPE+1 lda #$0F sta AUDC4 lda $06D1 sta AUDF4 L_3532 lda $06D2 bne L_354D L_3537 lda L_B4D5+4,x sta PMGFX0+3,y lda L_B4F5+1,x sta PMGFX1,y iny inx cpx #$1D bne L_3537 inc $06D2 rts L_354D lda BIG_PLANE_GFX1C,x sta PMGFX0+3,y lda BIG_PLANE_GFX2C+5,x sta PMGFX1,y iny inx cpx #$1D bne L_354D lda #$00 sta $06D2 rts BIG_PLANE_GFX1 .byte $00, $0F, $1F, $1F, $1F, $0E, $01, $01 L_356D .byte $01, $01, $01, $01, $13, $7F, $FF, $FF .byte $EE, $FE, $EF, $7F, $32, $03, $62, $03 .byte $01, $01, $00, $06, $00, $00, $F0, $F8 .byte $F8, $F8, $70, $80, $80, $80, $80, $80 BIG_PLANE_GFX2 .byte $80, $C8, $FE, $FF, $FF, $77, $7F, $F7 .byte $FE, $4C, $C0, $46, $C0, $80, $80, $00 .byte $60, $00, $00, $0F, $1F, $1F, $1F, $0E L_35A5 .byte $01, $01, $01, $01, $01, $01, $13, $7F L_35AD .byte $FF, $FF, $EE, $FE, $EF, $7F, $32, $03 .byte $1A, $03, $01, $01, $00, $01, $00, $00 .byte $F0, $F8, $F8, $F8, $70, $80, $80, $80 .byte $80, $80, $80, $C8, $FE, $FF, $FF, $77 .byte $7F, $F7, $FE, $4C, $C0, $58, $C0, $80 .byte $80, $00, $80, $00, $00, $0F, $10, $10 .byte $10, $0E, $01, $01, $01, $01, $01, $01 .byte $02, $7F, $80, $80, $80, $80, $80, $7F .byte $02, $02, $02, $02, $01, $01, $00, $00 .byte $00, $00, $F0, $08, $08, $08, $70, $80 PMGFX0 .byte $80, $80, $80, $80, $80, $40, $FE, $01 L_3605 .byte $01, $01, $01, $01, $FE, $40, $40, $40 .byte $40, $80, $80, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $44, $AA, $AA, $2A, $4A, $8A L_3625 .byte $8A, $AA, $E4, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $44 .byte $AA, $AA, $AA, $AA, $AA, $AA, $AA, $44 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00 lda $06D7 beq L_365C lda #$00 sta $06D7 beq L_365F L_365C inc $06D7 L_365F lda $06D3 beq L_36C1 cmp #$01 bne L_3680 lda #$ED sta PCOLR0 lda PLANE_X sec sbc #$01 sta BIGPLANE_FIRE_TYPE+1 inc $06D3 lda #$00 sta $06D5 beq L_36C1 L_3680 ldx #$00 lda ENEMY_Y clc adc #$10 tay inc $06D5 lda $06D5 cmp #$04 bcc L_36A2 txa L_3694 sta L_33FE+2,y iny inx cpx #$08 bne L_3694 sta $06D3 beq L_36C1 L_36A2 lda $06D7 bne L_36B5 L_36A7 lda L_B620,x sta L_33FE+2,y iny inx cpx #$08 bne L_36A7 beq L_36C1 L_36B5 lda L_B628,x sta L_33FE+2,y iny inx cpx #$08 bne L_36B5 L_36C1 lda $06D4 bne L_36C7 rts L_36C7 cmp #$01 bne L_36E0 sta $06D6 lda #$ED sta PCOLR1 lda PLANE_X clc adc #$0A sta BIGPLANE_FIRE_TYPE+2 inc $06D4 rts L_36E0 ldx #$00 lda ENEMY_Y clc adc #$10 tay inc $06D6 lda $06D6 cmp #$05 bcc L_3701 txa L_36F4 sta L_3500,y iny inx cpx #$08 bne L_36F4 L_36FD sta $06D4 PMGFX1 rts L_3701 lda $06D7 bne L_3713 L_3706 lda L_B620,x sta L_3500,y L_370C iny inx cpx #$08 bne L_3706 rts L_3713 lda L_B628,x sta L_3500,y iny inx cpx #$08 bne L_3713 rts L_3720 .byte $00, $00, $0E, $1B, $1F, $1B, $0E, $00 .byte $00, $10, $44, $82, $82, $44, $10, $00 .byte $00, $77, $60, $74, $74, $60, $60, $60 .byte $28, $44, $44, $40, $4C, $44, $44, $28 .byte $44, $44, $44, $6C, $6C, $44, $44, $44 .byte $7C, $54, $10, $10, $10, $10, $54, $7C .byte $63, $63, $36, $14, $14, $36, $63, $63 .byte $63, $63, $76, $70, $76, $63, $63, $63 .byte $60, $60, $60, $60, $60, $63, $77, $77 .byte $77, $6B, $6B, $6B, $6B, $63, $63, $63 .byte $36, $77, $63, $63, $63, $63, $63, $63 .byte $36, $77, $63, $63, $63, $63, $77, $36 L_3780 .byte $68, $44, $44, $44, $68, $40, $40, $40 .byte $36, $77, $63, $63, $63, $67, $77, $37 .byte $68, $44, $44, $44, $68, $68, $48, $44 .byte $37, $77, $60, $76, $37, $03, $77, $76 .byte $77, $77, $55, $14, $14, $14, $14, $14 .byte $44, $44, $44, $44, $44, $44, $44, $28 .byte $63, $63, $63, $63, $63, $36, $36, $1C .byte $63, $63, $63, $6B, $6B, $6B, $6B, $77 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $63, $63, $63, $36, $36, $1C, $1C, $1C lda ENEMY_TYPE bne L_37D6 rts L_37D6 .byte $20, $50, $49, $20, $03, $49, $AD, $16 .byte $06, $D0, $09, $20, $CE, $55, $20, $B7 .byte $55, $20, $B7, $55, $20, $60, $57, $AD .byte $0B, $D4, $C9, $58, $90, $F9, $A2, $26 .byte $BD, $08, $9D, $9D, $09, $9D, $BD, $30 L_37FE .byte $9D, $9D, $00, $00, $00, $00, $00, $00 .byte $00, $00, $9A, $9A, $9A, $9A, $9A, $9A .byte $9A, $9A, $9A, $9A, $9A, $55, $55, $9A .byte $9A, $9A, $AA, $AA, $AA, $55, $55, $AA .byte $AA, $AA, $A0, $A3, $A0, $A8, $A8, $AC .byte $A8, $A8, $8A, $8A, $8A, $0A, $8A, $AA .byte $AA, $AA, $63, $63, $06, $0C, $18, $30 .byte $63, $63, $00, $00, $00, $08, $08, $00 .byte $00, $00, $FF, $FF, $FE, $F8, $E2, $E2 .byte $EA, $0A, $AA, $EA, $EA, $FA, $FA, $0E .byte $C3, $C3, $AA, $EA, $EA, $FA, $FA, $FE .byte $FF, $FF, $AA, $EA, $FA, $FE, $FE, $FA .byte $EA, $EA, $AA, $AA, $AA, $AA, $AA, $AA .byte $AA, $AA, $AA, $AA, $AA, $AA, $AA, $AA .byte $AA, $AE, $FF, $FF, $FF, $FF, $FF, $FF .byte $FF, $FF, $55, $6A, $6A, $6A, $6A, $6A .byte $6A, $6A, $55, $A9, $A9, $A9, $A9, $A9 .byte $A9, $A9, $6A, $6A, $6A, $6A, $6A, $6A .byte $6A, $55, $A9, $A9, $A9, $A9, $A9, $A9 .byte $A9, $55, $3C, $FE, $E3, $03, $8B, $23 .byte $03, $8A, $FA, $FA, $FA, $BE, $BE, $BF .byte $AF, $FB, $BF, $EF, $FF, $FF, $AF, $AF .byte $FB, $FE, $FE, $FE, $FE, $FB, $BF, $EF .byte $FB, $FF, $FF, $FF, $FF, $BF, $BA, $EE .byte $9A, $57, $FE, $FE, $FE, $FA, $BE, $EE .byte $FA, $EA, $FA, $FE, $FE, $FA, $BF, $EF .byte $FB, $FF, $AA, $AA, $AA, $AE, $BE, $BF .byte $AF, $BB, $BF, $EF, $FF, $FF, $AF, $AF .byte $BB, $AE, $FA, $FA, $EA, $EA, $AA, $FA .byte $FA, $EA, $EA, $AA, $FA, $FA, $86, $86 L_38EE .byte $FA, $FE, $2A, $95, $9A, $9A, $9A, $9A .byte $9A, $9A, $AA, $A5, $95, $9A, $9A, $9A .byte $9A, $A5, $AA, $6A, $5A, $9A, $9A, $9A .byte $9A, $6A, $FF, $57, $A7, $A7, $A7, $A7 .byte $A7, $A7, $99, $99, $99, $9A, $9A, $9A .byte $99, $99, $A9, $A9, $A9, $A9, $AA, $AA .byte $A9, $A9, $A7, $A7, $A7, $AB, $AB, $AB L_3926 .byte $A7, $A7, $AB, $AF, $B5, $F5, $D7, $DF .byte $DF, $DF, $EA, $FA, $5E, $5F, $D7, $F7 .byte $F7, $F7, $DF, $DF, $DF, $DF, $DF, $DF .byte $DF, $DF, $F7, $F7, $F7, $F7, $F7, $F7 .byte $F7, $F7, $DF, $DF, $DF, $D7, $F5, $B5 .byte $AF, $AB, $F7, $F7, $F7, $D7, $5F, $5E .byte $FA, $EA, $E2, $C8, $F0, $BE, $BC, $AC .byte $AF, $AB, $AB, $AF, $AE, $BC, $BE, $F8 .byte $E2, $C8, $A5, $9A, $9A, $9A, $9A, $95 .byte $A5, $AA, $6A, $9A, $9A, $9A, $9A, $5A L_3976 .byte $6A, $AA, $AA, $55, $AA, $AA, $AA, $AA .byte $AA, $AA, $AA, $95, $9A, $99, $99, $99 .byte $9A, $9A, $AA, $56, $A6, $A6, $A6, $A6 .byte $A6, $A6, $9A, $9A, $99, $99, $99, $9A .byte $95, $AA, $89, $25, $FF, $85, $FF, $85 .byte $21, $88, $9A, $9A, $9A, $9A, $9A, $9A .byte $95, $AA, $AA, $AA, $AA, $AA, $AA, $AA L_39AE .byte $55, $AA, $A7, $A7, $A7, $A7, $A7, $A7 .byte $57, $BF, $62, $58, $FF, $50, $FF, $58 .byte $62, $08, $CE, $CC, $DC, $56, $54, $54 .byte $58, $62, $02, $00, $00, $00, $00, $20 .byte $00, $00, $00, $00, $80, $00, $00, $00 .byte $02, $00, $AA, $AA, $AA, $AA, $A8, $A8 .byte $AC, $A8, $AA, $AA, $AA, $AA, $AA, $AA .byte $8A, $0A, $A2, $A2, $A2, $A0, $A2, $AA .byte $AA, $AA, $02, $32, $02, $2A, $2A, $3A .byte $2A, $2A, $AA, $AA, $AA, $AA, $AA, $AA .byte $A2, $A0, $AA, $AA, $AA, $AA, $2A, $2A .byte $3A, $2A, $AA, $AA, $AA, $AA, $AB, $AF .byte $AF, $AB, $A8, $A8, $A8, $A8, $A8, $E8 .byte $E8, $A8, $03, $0E, $0E, $3A, $3A, $EA .byte $EA, $C0, $AA, $AA, $AA, $AA, $AA, $AA .byte $AA, $00, $C0, $B0, $B0, $AC, $AC, $AB .byte $AB, $03, $03, $0E, $0E, $3A, $3A, $EA .byte $EA, $EA, $FF, $AA, $AA, $AA, $AA, $AA .byte $AA, $AA, $C0, $B0, $B0, $AC, $AC, $AB .byte $AB, $AB, $85, $15, $56, $5A, $9A, $1A .byte $5A, $6A, $61, $96, $AA, $AA, $AA, $AA .byte $AA, $AA, $62, $98, $A4, $A6, $90, $98 .byte $A6, $A4, $A9, $A9, $A6, $A4, $A6, $A9 .byte $A9, $A6, $96, $4A, $4A, $16, $96, $16 .byte $5A, $5A, $6A, $5A, $9A, $1A, $4A, $46 L_3A76 .byte $15, $85, $AA, $AA, $AA, $AA, $AA, $AA .byte $96, $41, $A6, $A4, $98, $92, $A4, $A4 .byte $C0, $62, $FF, $AB, $AB, $AB, $AB, $AB .byte $AB, $AB, $89, $25, $85, $14, $91, $55 .byte $14, $45, $45, $54, $45, $51, $45, $51 .byte $15, $51, $62, $58, $52, $14, $44, $55 .byte $14, $51, $A0, $3A ldx #$95 lda #$02 jsr L_38EE+2 lda #$15 sta MVLNG+1 ldy #$8A ldx #$1D lda #$7C jsr L_39AE lda #$02 jsr L_3926+1 rts asl RTCLOK+2 jmp L_3AC9 L_3AC9 jmp L_3AD6 .byte $09, $44, $3A, $44, $55, $50, $2E, $53 .byte $59, $53 L_3AD6 lda #$04 sta MVLNG+1 lda #$00 sta ECSIZE ldy #$3A ldx #$CC lda #$01 jsr L_38EE+2 lda #$01 jsr L_3A76+2 lda TSLNUM cmp #$80 bcs L_3AF5 jmp L_3AFB L_3AF5 lda #$01 jsr L_3926+1 rts L_3AFB lda #$FF sta MVLNG+1 ldy #$FF ldx L_37FE+3 lda L_37FE+2 jsr L_227C+4 .byte $00, $28, $02, $00, $08, $02, $02, $00 .byte $02, $08, $20, $02, $88, $22, $01, $02 .byte $08, $00, $02, $28, $82, $00, $FB, $FE .byte $BE, $BE, $EE, $E8, $A0, $80, $FF, $FB .byte $EA, $A2, $80, $00, $00, $00, $AF, $FE .byte $EA, $8A, $02, $00, $00, $00, $FB, $BE .byte $BF, $AF, $2B, $0A, $02, $02, $80, $A0 .byte $A8, $AA, $AA, $AB, $BF, $EE, $00, $00 .byte $00, $80, $A2, $AA, $AF, $BB, $00, $00 .byte $00, $02, $8A, $AB, $BF, $EE, $02, $02 .byte $0A, $2B, $BB, $AE, $BF, $EB, $FF, $FE .byte $F8, $E0, $E2, $C0, $A8, $80, $FF, $38 .byte $00, $80, $22, $00, $28, $00, $EF, $BE .byte $28, $20, $02, $00, $28, $00, $BF, $2F .byte $0B, $0A, $23, $02, $0B, $02, $80, $E0 .byte $F8, $F2, $C0, $C8, $A2, $80, $03, $0E .byte $3E, $8F, $03, $22, $88, $00, $80, $A8 .byte $80, $A2, $A0, $A8, $AA, $AA, $00, $28 .byte $00, $22, $80, $00, $3C, $FB, $00, $28 .byte $00, $02, $20, $38, $AF, $FE, $03, $0A .byte $03, $22, $0B, $0B, $2F, $FF, $80, $A0 .byte $E8, $E8, $B8, $B8, $A0, $80, $02, $0A .byte $2E, $3B, $2B, $2A, $0A, $02, $20, $20 .byte $20, $20, $20, $20, $20, $A0, $F0, $EC .byte $E5, $E1, $F3, $E5, $A0, $F7, $E1, $E9 .byte $F4, $A2, $3B, $A9, $B5, $20, $2D, $39 .byte $AD, $0A, $07, $09, $80, $8D, $0A, $07 .byte $20, $E0, $07, $A9, $00, $85, $A3, $A9 .byte $00, $85, $A4, $4C, $F4, $3B, $03, $44 .byte $38, $3A, $A9, $3B, $85, $A6, $A9, $F0 L_3BFA .byte $85, $A5, $A0, $FE, $A2, $00, $00, $00 .byte $18, $66, $FF, $5A, $24, $24, $24, $24 L_3C0A .byte $66, $3C, $00, $00, $00, $18, $66, $FF .byte $5A, $24, $24, $24, $24, $66, $3C, $00 L_3C1A .byte $00, $00, $1A, $2F, $7F, $36, $14, $14 L_3C22 .byte $14, $1E, $2E, $1C, $00, $00, $00, $1A .byte $2F, $7F, $36, $14, $14, $14, $1E, $2E L_3C32 .byte $1C, $00, $00, $00, $58, $F4, $FE, $6C L_3C3A .byte $28, $28, $28, $78, $74, $38, $00, $00 .byte $00, $58, $F4, $FE, $6C, $28, $28, $28 L_3C4A .byte $78, $74, $38, $00, $00, $00, $00, $7E .byte $DB, $24, $24, $24, $3C, $7E, $3C, $00 L_3C5A .byte $00, $00, $00, $00, $00, $DB, $24, $3C L_3C62 .byte $7E, $3C, $00, $00, $00, $00, $00, $00 .byte $00, $00, $7E, $FF, $7E, $00, $00, $00 L_3C72 .byte $00, $00, $00, $00, $00, $00, $00, $3C .byte $7E, $3C, $24, $DB, $3C, $00, $00, $00 L_3C82 .byte $00, $00, $00, $00, $00, $18, $3C, $24 L_3C8A .byte $5A, $3C, $18, $00, $00, $00, $00, $00 .byte $00, $00, $00, $18, $66, $FF, $5A, $00 L_3C9A .byte $00, $00, $00, $00, $00, $00, $00, $99 L_3CA2 .byte $66, $FF, $5A, $24, $24, $3C, $00, $00 .byte $00, $42, $18, $00, $24, $00, $00, $00 L_3CB2 .byte $00, $18, $00, $00, $00, $00, $81, $18 .byte $00, $24, $00, $00, $00, $00, $18, $00 L_3CC2 .byte $00, $00, $01, $40, $10, $00, $08, $00 L_3CCA .byte $00, $00, $00, $10, $00, $00, $00, $02 .byte $20, $10, $00, $08, $00, $00, $00, $00 L_3CDA .byte $10, $00, $00, $00, $80, $02, $08, $00 .byte $10, $00, $00, $00, $00, $08, $00, $00 L_3CEA .byte $00, $40, $04, $08, $00, $10, $00, $00 L_3CF2 .byte $00, $00, $08, $00, $00, $00, $3C, $24 .byte $18, $18, $18, $7E, $BD, $66, $18, $18 L_3D02 .byte $00, $00, $00, $3C, $24, $18, $18, $18 L_3D0A .byte $7E, $BD, $66, $18, $18, $00, $00, $00 .byte $00, $18, $00, $00, $00, $00, $5A, $18 L_3D1A .byte $00, $00, $00, $0C, $00, $00, $18, $00 .byte $00, $00, $00, $5A, $18, $00, $00, $00 L_3D2A .byte $30, $00, $7E, $FF, $7E, $00, $00, $00 .byte $18, $18, $66, $BD, $7E, $18, $18, $18 L_3D3A .byte $24, $3C, $00, $00, $00, $18, $18, $66 .byte $BD, $7E, $18, $18, $18, $24, $3C, $00 L_3D4A .byte $0C, $00, $00, $00, $18, $5A, $00, $00 L_3D52 .byte $00, $00, $18, $00, $00, $30, $00, $00 .byte $00, $18, $5A, $00, $00, $00, $00, $18 L_3D62 .byte $00, $00, $00, $30, $58, $30, $30, $3C .byte $76, $D6, $5E, $3C, $30, $00, $00, $46 L_3D72 .byte $00, $0C, $1A, $0C, $0C, $3C, $6E, $6B L_3D7A .byte $7A, $3C, $0C, $00, $00, $54, $00, $00 .byte $20, $00, $00, $00, $08, $2C, $28, $00 L_3D8A .byte $00, $00, $18, $00, $00, $20, $00, $00 .byte $00, $08, $2C, $28, $00, $00, $00, $60 L_3D9A .byte $00, $00, $04, $00, $00, $00, $10, $34 L_3DA2 .byte $14, $00, $00, $00, $18, $29, $00, $00 .byte $04, $00, $00, $00, $10, $34, $14, $00 L_3DB2 .byte $00, $00, $06, $30, $30, $B0, $B8, $64 .byte $64, $B8, $B0, $30, $30, $00, $00, $00 L_3DC2 .byte $00, $00, $00, $98, $99, $01, $01, $00 L_3DCA .byte $00, $00, $00, $00, $00, $00, $00, $01 .byte $99, $99, $00, $00, $00, $00, $00, $00 L_3DDA .byte $00, $00, $22, $47, $BE, $EC, $24, $34 L_3DE2 .byte $78, $E0, $C0, $00, $00, $00, $00, $00 .byte $40, $40, $10, $18, $09, $02, $00, $00 L_3DF2 .byte $00, $00, $00, $00, $44, $E2, $7D, $37 .byte $24, $2C, $1E, $07, $03, $00, $00, $00 L_3E02 .byte $00, $00, $02, $02, $08, $18, $90, $40 L_3E0A .byte $00, $00, $00, $00, $00, $00, $0C, $0C .byte $0D, $1D, $26, $26, $1D, $0D, $0C, $0C L_3E1A .byte $00, $00, $00, $00, $00, $00, $19, $99 L_3E22 .byte $80, $80, $00, $00, $00, $00, $00, $00 L_3E2A .byte $00, $00, $80, $99, $99, $00, $00, $00 L_3E32 .byte $00, $00, $00, $00, $00, $00, $03, $07 .byte $1E, $2C, $24, $37, $7D, $E2, $44, $00 L_3E42 .byte $00, $00, $00, $00, $40, $90, $18, $08 .byte $02, $02, $00, $00, $00, $00, $00, $1A .byte $B1, $18, $85, $1B, $A0, $01, $B1, $1A .byte $AA, $88, $B1, $1A, $20, $B0, $31, $20 L_3E62 .byte $B6, $31, $00, $38, $7C, $BA, $BA, $57 L_3E6A .byte $EF, $56, $BB, $BB, $7E, $3C, $00, $00 .byte $00, $44, $44, $28, $10, $28, $44, $44 L_3E7A .byte $00, $00, $00, $00, $38, $6C, $CE, $EE .byte $47, $FF, $AA, $AB, $FF, $7E, $3C, $00 L_3E8A .byte $00, $00, $10, $30, $10, $38, $00, $54 L_3E92 .byte $54, $00, $00, $00, $00, $00, $00, $78 .byte $24, $24, $24, $24, $24, $24, $24, $78 L_3EA2 .byte $00, $00, $00, $F8, $84, $5A, $5A, $5A L_3EAA .byte $5A, $5A, $5A, $5A, $84, $F8, $00, $00 .byte $20, $00, $10, $18, $08, $02, $02, $00 .byte $00, $00, $00, $00, $00, $3B, $00, $C7 .byte $3E, $D0, $3E, $3B, $00, $CF, $3E, $DA .byte $3E, $52, $54, $53, $00, $D5, $3E, $E4 .byte $3E, $3B, $00, $DB, $3E, $EE, $3E, $3B .byte $00, $E1, $3E, $F8, $3E, $3B, $00, $EA .byte $3E, $02, $3F, $47, $4F, $48, $31, $00 .byte $F7, $3E, $0C, $3F, $43, $4D, $50, $20 .byte $23, $24, $33, $30, $00, $04, $3F, $16 L_3EFA .byte $3F, $42, $50, $4C, $20, $47, $00, $10 .byte $1C, $62, $42, $A3, $95, $92, $4A, $56 L_3F0A .byte $64, $3C, $88, $08, $05, $5C, $7E, $7E .byte $FF, $FF, $FE, $7E, $7E, $7C, $BC, $10 L_3F1A .byte $00, $00, $00, $00, $1E, $33, $21, $41 L_3F22 .byte $63, $22, $1C, $00, $00, $00, $00, $12 .byte $40, $1E, $3F, $7F, $7F, $7F, $3E, $9C L_3F32 .byte $01, $24, $00, $00, $00, $04, $20, $0C L_3F3A .byte $12, $54, $09, $28, $00, $00, $00, $00 .byte $00, $00, $08, $01, $0C, $5E, $1C, $2A L_3F4A .byte $14, $00, $00, $00, $00, $00, $00, $1E .byte $33, $21, $41, $22, $1C, $00, $00, $00 L_3F5A .byte $00, $00, $00, $09, $5E, $3F, $7F, $7F .byte $3E, $8C, $01, $08, $00, $00, $49, $00 L_3F6A .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $08, $08, $08, $3E, $77, $55, $7F .byte $3E, $08, $08, $08, $14, $14, $1C, $00 L_3F82 .byte $00, $00, $0C, $00, $00, $63, $00, $00 .byte $7F, $7F, $7F, $36, $00, $00, $00, $08 L_3F92 .byte $08, $00, $00, $00, $00, $18, $00, $00 .byte $14, $00, $00, $7F, $7F, $7F, $36, $00 .byte $00, $00, $08, $08, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $01, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $14 .byte $00, $00, $40, $4C, $4C, $80, $00, $00 .byte $00, $00, $00, $00, $00, $80, $00, $00 .byte $00, $00, $00, $00, $00, $00 L_4000 lda VCOUNT cmp #$7A bcc L_4000 lda #$40 sta NMIEN lda #$20 sta VDSLST lda #$40 sta VDSLST+1 lda #$C0 sta NMIEN rts .byte $3F, $9D, $F4, $1D DLI_1 pha ; set playfield color at the top of the screen txa pha tya pha lda #$FC ldx #$96 L_4029 ldy #$05 pha lda #$08 sta WSYNC stx COLBK sty COLPF2 sta COLPF1 pla sta COLPF0 lda #$75 sta VDSLST pla tay pla tax pla rti .byte $23, $4C, $8A, $22, $20, $3B, $23, $4C .byte $0F, $21, $A2, $10, $A9, $0C, $9D, $42 .byte $03, $4C, $E9, $31, $54, $59, $50, $45 .byte $20, $22, $59, $22, $20, $54, $4F, $20 .byte $44, $45, $4C, $45, $54, $45, $2E, $2E .byte $2E, $9B, $44, $45 DLI_2 pha ; set plane position and size txa pha tya pha lda PLANE_X L_407D ldx #$75 ldy #$0E sta WSYNC sta HPOSP0 sta HPOSP1 stx COLPM0 sty COLPM1 lda #$00 sta SIZEP0 sta SIZEP1 lda #$B5 sta VDSLST pla tay pla tax pla rti .byte $57, $45, $44, $9B, $00, $04, $04, $36 .byte $39, $37, $20, $46, $52, $45, $45, $20 .byte $53, $45 DLI_3 pha ; reset charbase and color for score panel txa pha lda #$02 ldx #$46 sta WSYNC stx CHBASE sta COLBK lda #$E0 sta VDSLST pla tax pla rti .byte $4F, $50, $59, $33, $32, $2E, $43, $4F .byte $4D, $9B, $9B, $00, $00, $00, $00, $00 .byte $6C, $23 DLI_4 pha ; set color for score line lda #$2F sta WSYNC sta COLPF0 lda #$F2 sta VDSLST pla rti ldx #$00 DLI_5 pha ; reset everything at the end of the screen txa pha tya pha lda #$20 ldx #$00 ldy BIGPLANE_FIRE_TYPE+1 sta WSYNC stx COLPF2 stx COLBK stx COLPF1 sty HPOSP0 sty HPOSP1 sta VDSLST lda $0657 sta SIZEP0 sta SIZEP1 pla tay pla tax pla rti lda #$AD and MVTA+1 cmp #$90 bne L_4137 lda #$81 sta L_9C1D+7 lda #$8C sta L_9C25 jmp L_4169+1 L_4137 lda L_9C1D+7 cmp #$01 bne L_4152 L_413E lda L_AD20+5 .byte $52, $06 cmp #$01 bne L_4153 lda #$00 sta $065B sta $065A inc $0652 L_4152 rts L_4153 cmp #$02 bne L_4181 lda #$AC sta AUDC3 lda $065A clc adc #$1E cmp #$DA bcs L_416D sta $065A L_4169 sta AUDF3 rts L_416D inc $065B lda $065B cmp #$03 bcs L_417D lda #$00 sta $065A rts L_417D inc $0652 rts L_4181 lda $065A sec sbc #$0A cmp #$0A bcc L_4192 sta $065A sta AUDF3 rts L_4192 lda #$00 sta $0652 sta AUDC3 rts L_419B .byte $E0, $00, $85, $CF, $BD, $00, $00, $00 .byte $10, $3C, $56, $7A, $3E, $1C, $10, $08 L_41AB .byte $34, $18, $00, $00, $1C, $00, $00, $00 .byte $28, $04, $00, $00, $00, $10, $08, $00 L_41BB .byte $00, $3A, $00, $08, $00, $00, $00, $28 .byte $04, $00, $00, $00, $10, $08, $00, $00 L_41CB .byte $00, $00, $00, $00, $10, $78, $D4, $BC .byte $F8, $70, $10, $20, $58, $30, $00, $04 L_41DB .byte $00, $70, $00, $00, $00, $28, $40, $00 L_41E3 .byte $00, $00, $10, $20, $00, $00, $08, $00 .byte $20, $00, $00, $00, $28, $40, $00, $00 .byte $00, $10, $20, $00, $00, $3A, $29, $01 .byte $F0, $08, $BD, $D8, $3A lda $06AD beq L_4208 jmp L_42DC L_4208 inc ENEMY_MOV_TYPE+2 lda ENEMY_MOV_TYPE+2 cmp #$02 bcs L_4215 jmp L_42DC L_4215 lda #$00 sta ENEMY_MOV_TYPE+2 lda $0680 cmp #$01 bmi L_4224 jmp L_42D9 L_4224 lda #$07 sta $0680 lda L_9C1D+7 cmp #$35 bne L_424C lda L_9C25 cmp #$92 bne L_424C inc $0681 lda $0681 cmp #$20 beq L_4244 jmp L_42DC L_4244 lda #$D4 sta L_4029+1 jmp L_426F L_424C lda L_9C1D+7 cmp #$B7 bne L_426F lda L_9C25 cmp #$7C bne L_426F inc $0681 lda $0681 cmp #$22 beq L_4267 jmp L_42DC L_4267 lda #$05 sta L_4029+1 jmp L_426F L_426F lda #$00 sta $0681 lda L_9C1D+7 cmp #$05 bne L_428F lda L_9C25 cmp #$90 bne L_428F lda #$81 sta L_9C1D+7 lda #$8C sta L_9C25 jmp L_42C5 L_428F lda L_9C1D+7 cmp #$01 bne L_42AA lda L_9C25 cmp #$80 bne L_42AA lda #$DF sta L_9C1D+7 lda #$7C sta L_9C25 jmp L_42C5 L_42AA lda L_9C1D+7 cmp #$BF bne L_42C5 lda L_9C25 cmp #$79 bne L_42C5 inc $06AB lda #$75 sta L_9C1D+7 lda #$98 sta L_9C25 L_42C5 lda L_9C1D+7 sec sbc #$28 sta L_9C1D+7 bcc L_42D3 jmp L_42DC L_42D3 dec L_9C25 jmp L_42DC L_42D9 dec $0680 L_42DC lda $0680 sta VSCROL jsr L_1920 lda #$20 sta VDSLST L_42EA lda $063A sta VNTP lda $063B sta VNTP+1 ldy #$00 jmp (VNTP) .byte $20, $00, $00, $00, $00, $00, $00 L_4300 txa pha lda $0631 bne L_4317 lda #$2A sta AUDC1 sta $0631 lda #$10 sta AUDF1 jmp L_431F L_4317 lda #$00 sta AUDC1 sta $0631 L_431F lda COLOR0 cmp #$7A beq L_432E lda #$7A sta COLOR0 jmp L_4333 L_432E lda #$3A sta COLOR0 L_4333 ldx #$00 ldy #$00 L_4337 inx bne L_4337 iny cpy #$40 bne L_4337 pla tax rts .byte $AE, $FF, $00, $00, $00, $00, $00, $00 pha lda #$E0 sta WSYNC sta CHBASE lda #$FF sta COLPF1 pla rti L_435A bvs L_43CC bvs L_43A0 rti .byte $9C, $02, $02, $02, $02, $02, $02, $02 .byte $02, $02, $02, $02, $02, $02, $02, $02 .byte $02, $02, $02, $02, $02, $02, $02, $02 .byte $41, $20, $9C, $A9, $0C, $9D, $42, $03 .byte $20 lda #$00 sta AUDCTL lda #$03 sta SKCTL sta $0658 lda #$FF sta PORTB sta CH lda $06CF cmp #$99 beq L_43E7 lda #$83 sta VNTD+1 L_43A0 lda #$21 sta VNTD lda #$A0 sta TOPSTK+1 lda #$61 sta TOPSTK ldy #$00 L_43AE lda (VNTD),y sta (TOPSTK),y cpy #$A0 bne L_43BC lda VNTD+1 cmp #$8F beq L_43C6 L_43BC iny bne L_43AE inc VNTD+1 inc TOPSTK+1 jmp L_43AE L_43C6 lda #$33 sta VNTD+1 lda #$00 L_43CC sta VNTD sta TOPSTK lda #$B2 sta TOPSTK+1 L_43D4 ldy #$00 L_43D6 lda (VNTD),y sta (TOPSTK),y iny bne L_43D6 inc TOPSTK+1 inc VNTD+1 lda VNTD+1 cmp #$38 bne L_43D4 L_43E7 lda VVBLKI sta $063A lda VVBLKI+1 sta $063B tax lda #$10 L_43F6 sta $0606,x inx cpx #$06 bne L_43F6 lda #$0E ldx #$00 L_4402 sta $065E,x inx cpx #$05 bne L_4402 L_440A lda #$99 sta $06CF jsr L_1900 sei lda #$F2 sta VVBLKI lda #$47 sta VVBLKI+1 cli lda #$01 sta CRSINH jsr L_5380 lda #$70 sta CHBAS lda #$42 sta COLOR0 sta COLOR3 lda #$00 sta COLOR2 sta COLOR4 ldx #$00 L_443D lda $065E,x sta L_7659+2,x inx cpx #$05 bne L_443D ldx #$05 L_444A lda $0606,x sta L_7671+5,x dex cpx #$FF bne L_444A lda #$08 sta COLOR1 ldx #$00 L_445C lda L_73F9+7,x sta L_9C3D+3,x lda L_74F9+7,x sta L_9D3D+3,x lda L_75F9+7,x sta L_9E3D+3,x lda L_76F9+7,x sta L_9F3D+3,x inx bne L_445C lda #$40 sta NMIEN lda #$4A sta VDSLST lda #$43 sta VDSLST+1 lda #$06 sta L_9C25+2 sta L_9C25+3 sta L_9C35 sta L_9C35+1 lda #$82 sta L_9C25+6 lda #$07 sta L_9C2D+3 sta L_9C2D+4 lda #$C0 sta NMIEN lda #$00 sta $064C sta $064D sta $064E jsr L_2063 L_44B4 lda STRIG0 beq L_452C lda CH cmp #$3E bne L_450A inc $0659 lda $0659 cmp #$0A bcs L_4505 lda #$00 sta $0659 lda $0658 bne L_44EC sta L_7641+1 sta L_9E7D+5 lda #$01 sta $0658 lda #$2E sta L_7641 sta L_9E7D+4 jsr L_1900 bne L_4505 L_44EC lda #$00 sta $0658 sta AUDC1 sta AUDF2 lda #$26 sta L_7641 sta L_9E7D+4 sta L_7641+1 sta L_9E7D+5 L_4505 lda #$FF sta CH L_450A inc $064C lda $064C bne L_44B4 inc $064D lda $064D bne L_44B4 inc $064E lda $064E cmp #$18 bne L_44B4 lda #$01 sta $066E jmp L_4531 L_452C lda #$00 sta $066E L_4531 ldx #$00 stx $064A stx $0627 stx $0632 stx $0636 stx $064F stx $0637 stx $0698 stx $0635 stx $0653 stx STAGE_NO+3 stx STAGE_NO stx STAGE_NO+4 txa L_4558 sta L_9B9D+3,x sta L_9C9D+3,x sta L_9D9D+3,x inx bne L_4558 ldx #$00 txa L_4567 sta L_9F5D+3,x inx cpx #$50 bne L_4567 ldx #$00 L_4571 lda #$10 sta L_9F95+7,x sta $0600,x sta $069C,x lda $0606,x sta L_9FA5+3,x inx cpx #$06 bne L_4571 lda #$10 sta L_9F9D+5 sta L_9FAD+1 sta $069A lda #$11 sta $069B lda #$13 sta L_9FA5 sta $062E ldx #$00 L_45A1 lda L_45ED,x sta L_9F75+1,x inx cpx #$0F bne L_45A1 lda #$30 sta PMBASE lda #$3E sta SDMCTL lda #$03 sta GRACTL sta $0656 jsr L_6CFF+1 lda #$38 sta CHBAS jsr L_5000 jsr L_5C00 lda $065D beq L_45D4 jsr L_7800 L_45D4 jsr L_5380 ldx #$00 txa L_45DA sta HPOSP0,x inx cpx #$08 bne L_45DA lda $066E beq L_45EA jmp L_452C L_45EA jmp L_440A L_45ED .byte $02, $11, $02, $00, $00, $00, $01, $01 .byte $01, $00, $00, $28, $29, $27, $28, $28 .byte $29, $27, $28, $00, $00, $00, $00, $00 .byte $00, $00, $00, $80, $80, $80, $80, $80 .byte $80, $88, $D8, $28, $28, $28, $28, $28 .byte $EE, $6C, $28, $42, $40, $9C, $02, $02 .byte $02, $02, $02, $02, $02, $02, $02, $02 .byte $02, $02, $02, $63, $63, $06, $0C, $18 .byte $30, $63, $63, $02, $02, $41, $20, $9C .byte $20, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $38, $38, $38, $00, $00, $00, $00, $00 .byte $00, $00, $00, $36, $63, $63, $63, $63 .byte $63, $63, $36, $0C, $3C, $0C, $0C, $0C .byte $0C, $0C, $0C, $36, $63, $03, $37, $76 .byte $60, $63, $77, $36, $63, $03, $17, $16 .byte $03, $63, $36, $18, $30, $60, $6C, $7F .byte $7F, $0C, $0C, $77, $63, $60, $76, $37 .byte $03, $63, $36, $0C, $18, $30, $36, $77 .byte $63, $63, $36, $77, $63, $03, $03, $06 .byte $06, $0C, $0C, $36, $63, $63, $77, $36 .byte $63, $63, $36, $36, $63, $63, $77, $36 .byte $06, $0C, $18, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $14, $36, $63, $77, $77 .byte $63, $63, $63, $76, $63, $63, $77, $76 .byte $63, $63, $76, $36, $77, $63, $60, $60 .byte $63, $77, $36, $76, $77, $63, $63, $63 .byte $63, $77, $76, $37, $77, $60, $74, $74 .byte $60, $77, $37, $37, $77, $60, $74, $74 .byte $60, $60, $60, $28, $44, $44, $40, $4C .byte $44, $44, $28, $44, $44, $44, $6C, $6C .byte $44, $44, $44, $7C, $54, $10, $10, $10 .byte $10, $54, $7C, $63, $63, $36, $14, $14 .byte $36, $63, $63, $63, $63, $76, $70, $76 .byte $63, $63, $63, $60, $60, $60, $60, $60 .byte $63, $77, $77, $77, $6B, $6B, $6B, $6B .byte $63, $63, $63, $36, $77, $63, $63, $63 .byte $63, $63, $63, $36, $77, $63, $63, $63 .byte $63, $77, $36, $68, $44, $44, $44, $68 .byte $40, $40, $40, $36, $77, $63, $63, $63 .byte $67, $77, $37, $68, $44, $44, $44, $68 .byte $68, $48, $44, $37, $77, $60, $76, $37 .byte $03, $77, $76, $77, $77, $55, $14, $14 .byte $14, $14, $14, $44, $44, $44, $44, $44 .byte $44, $44, $28, $63, $63, $63, $63, $63 .byte $36, $36, $1C, $63, $63, $63, $6B, $6B .byte $6B, $6B, $77, $00, $00, $00, $00, $00 .byte $00, $00, $00, $63, $63, $63, $36, $36 .byte $1C, $1C, $1C lda ENEMY_TYPE bne L_47D6 rts L_47D6 jsr L_4950 jsr L_4902+1 lda ENEMY_MOV_TYPE bne L_47EA jsr L_55CC+2 jsr L_55B7 jsr L_55B7 L_47EA jsr L_5760 lda VCOUNT cmp #$58 jsr L_1920 jmp L_42EA sta $099D,x sta L_30BC+1,x L_47FE sta L_AD98+5,x asl TRAMSZ,x bne L_4847 lda #$20 sta ENEMY_MOV_TYPE+7 lda $0683 bpl L_4812 lda PLANE_X L_4812 sta HPOSP2 sta HPOSP3 sta BIGPLANE_FIRE_TYPE+1 sta BIGPLANE_FIRE_TYPE+2 sta ENEMY_X lda #$34 sta PCOLR0 lda #$0E sta PCOLR1 sta PCOLR3 sta $0624 lda #$82 sta PCOLR2 lda #$00 sta BIGPLANE_FIRE_TYPE sta BIGPLANE_FIRE_TYPE+3 lda #$0E sta L_542E+1 inc ENEMY_MOV_TYPE rts L_4847 inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$03 bcc L_4864 ldx #$00 stx ENEMY_MOV_TYPE+1 lda BIGPLANE_FIRE_TYPE bne L_4861 inc BIGPLANE_FIRE_TYPE jmp L_4864 L_4861 stx BIGPLANE_FIRE_TYPE L_4864 lda ENEMY_MOV_TYPE cmp #$06 bcc L_486E jmp L_4945 L_486E cmp #$03 bpl L_48C8 inc ENEMY_MOV_TYPE+7 lda ENEMY_MOV_TYPE+7 cmp #$30 bne L_487F inc ENEMY_MOV_TYPE L_487F cmp #$6A bcc L_488C jsr L_4950 inc ENEMY_MOV_TYPE jmp L_4945 L_488C lda $0624 bne L_4894 jmp L_4945 L_4894 ldx ENEMY_MOV_TYPE+7 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_48B3 L_489E lda L_3CF2+5,y sta PMGFX0+3,x lda L_3D0A+7,y sta PMGFX1,x inx iny cpy #$0D bne L_489E jmp L_4945 L_48B3 lda L_3D02+2,y sta PMGFX0+3,x lda L_3D1A+4,y sta PMGFX1,x inx iny cpy #$0D bne L_48B3 jmp L_4945 L_48C8 cmp #$05 bpl L_48E8 lda $0624 beq L_48E2 ldx ENEMY_MOV_TYPE+7 ldy #$00 L_48D6 lda L_3D2A+1,y sta L_3406+1,x inx iny cpy #$04 bne L_48D6 L_48E2 inc ENEMY_MOV_TYPE jmp L_4945 L_48E8 dec ENEMY_MOV_TYPE+7 lda ENEMY_MOV_TYPE+7 cmp #$25 bcs L_490D ldx ENEMY_MOV_TYPE+7 ldy #$00 tya L_48F8 sta L_33FE+2,x sta L_3500,x inx iny cpy #$0D L_4902 bne L_48F8 inc ENEMY_MOV_TYPE sta $0624 jmp L_4945 L_490D lda $0624 bne L_4914 beq L_4945 L_4914 ldx ENEMY_MOV_TYPE+7 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_4933 L_491E lda L_3D2A+6,y sta L_33FE+2,x lda L_3D4A,y sta L_3500,x inx iny cpy #$0D bne L_491E jmp L_4945 L_4933 lda L_3D3A+3,y sta L_33FE+2,x lda L_3D52+5,y sta L_3500,x inx iny cpy #$0D bne L_4933 L_4945 lda ENEMY_MOV_TYPE cmp #$02 bpl L_494D rts L_494D jmp L_4C80 L_4950 ldx ENEMY_MOV_TYPE+7 ldy #$00 tya L_4956 sta PMGFX0+3,x sta PMGFX1,x inx iny cpy #$0D bne L_4956 rts .byte $1F, $60, $4C, $80, $4C, $54 jsr L_4000 sei lda #$00 sta VVBLKI lda #$42 sta VVBLKI+1 cli rts .byte $45, $00, $00, $00, $00, $00, $00 L_4980 ldx #$00 L_4982 lda L_49BC,x sta L_9C1D+3,x inx cpx #$22 bne L_4982 lda #$00 sta DINDEX lda #$40 sta SAVMSC lda #$9C sta SAVMSC+1 lda #$20 sta SDLSTL lda #$9C sta SDLSTH lda #$38 sta CHBAS lda #$00 sta COLOR0 sta COLOR1 sta COLOR2 sta COLOR4 lda #$FF sta COLOR3 rts L_49BC .byte $70 ; DL 8 scanlines .byte $70 ; DL 8 scanlines .byte $70 ; DL 8 scanlines .byte $C2 ; DL LMS DLI Antic Mode 2 .word L_9875 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $A4 ; DL DLI Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $24 ; DL Horizontal Scroll Antic Mode 4 .byte $84 ; DL DLI Antic Mode 4 .byte $46 ; DL LMS Antic Mode 6 .word L_9F5D+3 .byte $06 ; DL Antic Mode 6 .byte $86 ; DL DLI Antic Mode 6 .byte $06 ; DL Antic Mode 6 .byte $86 ; DL DLI Antic Mode 6 .byte $41 ; DL JMP .word L_9C1D+3 .byte $AD, $9C, $1E, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00 lda ENEMY_MOV_TYPE+1 bne L_4A23 lda #$2A sta HPOSP1 sta $061F ldx #$00 L_4A0F lda L_4A6D,x sta L_954D+6,x inx cpx #$0B bne L_4A0F lda #$0E sta PCOLR1 inc ENEMY_MOV_TYPE+1 rts L_4A23 inc $061F lda $061F sta HPOSP1 cmp #$D8 bcc L_4A36 lda #$00 sta ENEMY_MOV_TYPE+1 rts L_4A36 cmp #$50 bne L_4A48 ldx #$00 L_4A3C lda L_4A75+3,x sta L_954D+6,x inx cpx #$0B bne L_4A3C rts L_4A48 cmp #$78 bne L_4A5A ldx #$00 L_4A4E lda L_4A7D+6,x sta L_954D+6,x inx cpx #$0B bne L_4A4E rts L_4A5A cmp #$A0 beq L_4A5F rts L_4A5F ldx #$00 L_4A61 lda L_4A8D+1,x sta L_954D+6,x inx cpx #$0B bne L_4A61 rts L_4A6D .byte $14, $3E, $77, $BE, $6A, $47, $BB, $66 L_4A75 .byte $D3, $6E, $34, $00, $00, $2C, $BE, $6A L_4A7D .byte $44, $BA, $66, $D4, $6E, $04, $00, $00 .byte $0C, $36, $2A, $44, $3A, $66, $50, $00 L_4A8D .byte $00, $00, $00, $00, $14, $2A, $14, $1A .byte $04, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00 L_4AC0 jsr L_4980 jsr L_4000 jsr L_1900 lda #$00 sta NMIEN sei lda #$00 sta VVBLKI lda #$42 sta VVBLKI+1 cli lda #$C0 sta NMIEN lda #$A2 sta L_407D+1 lda #$01 sta GPRIOR sta $060E sta ENEMY_TYPE ldx #$00 txa L_4AF2 sta MISSILE_GFX,x sta L_33FE+2,x sta L_3500,x sta PMGFX0+3,x sta PMGFX1,x inx bne L_4AF2 tax L_4B05 sta HPOSP0,x sta SIZEP0,x sta ENEMY_X+6,x inx cpx #$04 bne L_4B05 sta $060C sta $060D sta ENEMY_MOV_TYPE+5 sta ENEMY_MOV_TYPE+6 sta ENEMY_MOV_TYPE sta ENEMY_Y+5 sta $0698 sta $0620 sta $0621 sta $0624 sta $0625 sta $06AA lda #$74 sta HPOSP0 sta HPOSP1 sta PLANE_X sta PLANE_X+1 lda #$20 sta PLANE_X+2 lda GPRIOR ora #$10 sta GPRIOR lda #$05 sta L_4029+1 lda #$30 sta $0683 jsr L_4B80 lda #$0F sta COLOR3 jmp L_6CA0 .byte $50, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00 L_4B80 inc $060C lda $060C cmp #$02 bcc L_4B9F lda #$00 sta $060C lda $060D bne L_4B9A inc $060D jmp L_4B9F L_4B9A lda #$00 sta $060D L_4B9F ldx #$00 ldy PLANE_X+2 lda $060E bne L_4BD4 lda $060D bne L_4BC1 L_4BAE lda L_3C1A,x sta L_3470,y lda L_3CC2+1,x sta L_356D+3,y iny inx cpx #$0D bne L_4BAE rts L_4BC1 lda L_3C22+5,x sta L_3470,y lda L_3CCA+6,x sta L_356D+3,y iny inx cpx #$0D bne L_4BC1 rts L_4BD4 cmp #$01 bne L_4C03 lda $060D bne L_4BF0 L_4BDD lda L_3BFA+6,x sta L_3470,y lda L_3CA2+7,x sta L_356D+3,y iny inx cpx #$0D bne L_4BDD rts L_4BF0 lda L_3C0A+3,x sta L_3470,y lda L_3CB2+4,x sta L_356D+3,y iny inx cpx #$0D bne L_4BF0 rts L_4C03 lda $060D bne L_4C1B L_4C08 lda L_3C32+2,x sta L_3470,y lda L_3CDA+3,x sta L_356D+3,y iny inx cpx #$0D bne L_4C08 rts L_4C1B lda L_3C3A+7,x sta L_3470,y lda L_3CEA,x sta L_356D+3,y iny inx cpx #$0D bne L_4C1B rts .byte $4F, $00 L_4C30 lda #$28 sta AUDC1 sta AUDC2 ldx #$01 L_4C3A stx AUDF1 inx stx AUDF2 jsr L_561C cpx #$09 bmi L_4C3A lda #$00 sta AUDC1 sta AUDC2 rts .byte $48, $00, $00, $00, $00, $00, $00, $00 .byte $00 L_4C5A lda #$28 sta AUDC1 sta AUDC2 ldx #$0D L_4C64 stx AUDF1 dex stx AUDF2 jsr L_561C cpx #$03 bpl L_4C64 lda #$00 sta AUDC1 sta AUDC2 rts .byte $ED, $00, $00, $00, $00 L_4C80 lda BIGPLANE_FIRE_TYPE+3 bne L_4C99 lda #$20 sta ENEMY_Y sta $0625 lda #$00 sta BIGPLANE_FIRE_TYPE+4 jsr L_4CCD inc BIGPLANE_FIRE_TYPE+3 rts L_4C99 cmp #$06 bcc L_4CA0 jmp L_4D74 L_4CA0 cmp #$03 bpl L_4D09 inc ENEMY_Y lda ENEMY_Y cmp #$30 bne L_4CB1 inc BIGPLANE_FIRE_TYPE+3 L_4CB1 cmp #$6A bcc L_4CCD L_4CB5 ldx ENEMY_Y ldy #$00 tya L_4CBB sta PMGFX0+3,x sta PMGFX1,x inx iny cpy #$0D bne L_4CBB inc BIGPLANE_FIRE_TYPE+3 jmp L_4D74 L_4CCD lda $0625 bne L_4CD5 jmp L_4D74 L_4CD5 ldx ENEMY_Y ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_4CF4 L_4CDF lda L_3CF2+5,y sta PMGFX0+3,x lda L_3D0A+7,y sta PMGFX1,x inx iny cpy #$0D bne L_4CDF jmp L_4D74 L_4CF4 lda L_3D02+2,y sta PMGFX0+3,x lda L_3D1A+4,y sta PMGFX1,x inx iny cpy #$0D bne L_4CF4 jmp L_4D74 L_4D09 cmp #$05 bpl L_4D29 lda $0625 beq L_4D23 ldx ENEMY_Y ldy #$00 L_4D17 lda L_3D2A+1,y sta L_3406+1,x inx iny cpy #$04 bne L_4D17 L_4D23 inc BIGPLANE_FIRE_TYPE+3 jmp L_4D74 L_4D29 dec ENEMY_Y lda ENEMY_Y cmp #$25 bcs L_4D3B lda #$00 sta $0625 jmp L_4CB5 L_4D3B lda $0625 bne L_4D43 jmp L_4D74 L_4D43 ldx ENEMY_Y ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_4D62 L_4D4D lda L_3D2A+6,y sta L_33FE+2,x lda L_3D4A,y sta L_3500,x inx iny cpy #$0D bne L_4D4D jmp L_4D74 L_4D62 lda L_3D3A+3,y sta L_33FE+2,x lda L_3D52+5,y sta L_3500,x inx iny cpy #$0D bne L_4D62 L_4D74 lda BIGPLANE_FIRE_TYPE+3 cmp #$02 bpl L_4D7C rts L_4D7C jmp L_4DA0 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00 L_4DA0 lda BIGPLANE_FIRE_TYPE+4 bne L_4DB9 lda #$20 sta ENEMY_Y+1 sta $0627 lda #$00 sta BIGPLANE_FIRE_TYPE+5 jsr L_4DED inc BIGPLANE_FIRE_TYPE+4 rts L_4DB9 cmp #$06 bcc L_4DC0 jmp L_4EA7 L_4DC0 cmp #$03 bpl L_4E29 inc ENEMY_Y+1 lda ENEMY_Y+1 cmp #$30 bne L_4DD1 inc BIGPLANE_FIRE_TYPE+4 L_4DD1 cmp #$6A bcc L_4DED ldx ENEMY_Y+1 ldy #$00 tya L_4DDB sta PMGFX0+3,x sta PMGFX1,x inx iny cpy #$0D bne L_4DDB inc BIGPLANE_FIRE_TYPE+4 jmp L_4EA7 L_4DED lda $0627 bne L_4DF5 jmp L_4EA7 L_4DF5 ldx ENEMY_Y+1 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_4E14 L_4DFF lda L_3CF2+5,y sta PMGFX0+3,x lda L_3D0A+7,y sta PMGFX1,x inx iny cpy #$0D bne L_4DFF jmp L_4EA7 L_4E14 lda L_3D02+2,y sta PMGFX0+3,x lda L_3D1A+4,y sta PMGFX1,x inx iny cpy #$0D bne L_4E14 jmp L_4EA7 L_4E29 cmp #$05 bpl L_4E49 lda $0627 beq L_4E43 ldx ENEMY_Y+1 ldy #$00 L_4E37 lda L_3D2A+1,y sta L_3406+1,x inx iny cpy #$04 bne L_4E37 L_4E43 inc BIGPLANE_FIRE_TYPE+4 jmp L_4EA7 L_4E49 dec ENEMY_Y+1 lda ENEMY_Y+1 cmp #$25 bcs L_4E6E ldx ENEMY_Y+1 ldy #$00 sty $0627 tya L_4E5C sta L_33FE+2,x sta L_3500,x inx iny cpy #$0D bne L_4E5C inc BIGPLANE_FIRE_TYPE+4 jmp L_4EA7 L_4E6E lda $0627 bne L_4E76 jmp L_4EA7 L_4E76 ldx ENEMY_Y+1 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_4E95 L_4E80 lda L_3D2A+6,y sta L_33FE+2,x lda L_3D4A,y sta L_3500,x inx iny cpy #$0D bne L_4E80 jmp L_4EA7 L_4E95 lda L_3D3A+3,y sta L_33FE+2,x lda L_3D52+5,y sta L_3500,x inx iny cpy #$0D bne L_4E95 L_4EA7 lda BIGPLANE_FIRE_TYPE+4 cmp #$02 bpl L_4EAF rts L_4EAF jmp L_4EC0 .byte $4F, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00 L_4EC0 lda BIGPLANE_FIRE_TYPE+5 bne L_4ED9 lda #$20 sta ENEMY_Y+2 sta $06B0 lda #$00 sta BIGPLANE_FIRE_TYPE+6 jsr L_4F0D inc BIGPLANE_FIRE_TYPE+5 rts L_4ED9 cmp #$06 bcc L_4EE0 jmp L_4FCA L_4EE0 cmp #$03 bpl L_4F49 inc ENEMY_Y+2 lda ENEMY_Y+2 cmp #$30 bne L_4EF1 inc BIGPLANE_FIRE_TYPE+5 L_4EF1 cmp #$6A bcc L_4F0D ldx ENEMY_Y+2 ldy #$00 tya L_4EFB sta PMGFX0+3,x sta PMGFX1,x inx iny cpy #$0D bne L_4EFB inc BIGPLANE_FIRE_TYPE+5 jmp L_4FCA L_4F0D lda $06B0 bne L_4F15 jmp L_4FCA L_4F15 ldx ENEMY_Y+2 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_4F34 L_4F1F lda L_3CF2+5,y sta PMGFX0+3,x lda L_3D0A+7,y sta PMGFX1,x inx iny cpy #$0D bne L_4F1F jmp L_4FCA L_4F34 lda L_3D02+2,y sta PMGFX0+3,x lda L_3D1A+4,y sta PMGFX1,x inx iny cpy #$0D bne L_4F34 jmp L_4FCA L_4F49 cmp #$05 bpl L_4F6C inc BIGPLANE_FIRE_TYPE+5 lda $06B0 bne L_4F58 jmp L_4FCA L_4F58 ldx ENEMY_Y+2 ldy #$00 L_4F5D lda L_3D2A+1,y sta L_3406+1,x inx iny cpy #$04 bne L_4F5D jmp L_4FCA L_4F6C dec ENEMY_Y+2 lda ENEMY_Y+2 cmp #$25 bcs L_4F91 ldx ENEMY_Y+2 ldy #$00 tya L_4F7C sta L_33FE+2,x sta L_3500,x inx iny cpy #$0D bne L_4F7C sta $06B0 inc BIGPLANE_FIRE_TYPE+5 jmp L_4FCA L_4F91 lda $06B0 bne L_4F99 jmp L_4FCA L_4F99 ldx ENEMY_Y+2 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_4FB8 L_4FA3 lda L_3D2A+6,y sta L_33FE+2,x lda L_3D4A,y sta L_3500,x inx iny cpy #$0D bne L_4FA3 jmp L_4FCA L_4FB8 lda L_3D3A+3,y sta L_33FE+2,x lda L_3D52+5,y sta L_3500,x inx iny cpy #$0D bne L_4FB8 L_4FCA lda BIGPLANE_FIRE_TYPE+5 cmp #$02 bpl L_4FD2 rts L_4FD2 jmp L_5440 .byte $27, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00 L_4FE0 lda $062E cmp #$15 bcc L_4FE8 rts L_4FE8 inc $062E lda $062E sta L_9FA5 rts .byte $2C, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00 L_5000 lda $062E cmp #$10 bpl L_5008 rts L_5008 jsr L_4AC0 lda $0653 beq L_5017 lda #$24 sta L_9F85+1 bne L_501C L_5017 lda #$00 sta L_9F85+1 L_501C lda $0635 beq L_5028 lda #$2A sta L_9F6D+7 bne L_502D L_5028 lda #$00 sta L_9F6D+7 L_502D jsr L_1880 lda $0652 beq L_5038 jsr L_413E+2 L_5038 jsr L_6900 lda ENEMY_Y+5 beq L_504B jsr L_6840 lda $0698 bne L_5000 jmp L_51A4 L_504B lda PLANE_X+4 beq L_5056 jsr L_1B00 jmp L_5162 L_5056 lda $06AB beq L_508F jsr L_1800 lda PLANE_X cmp #$74 bne L_5077 lda #$01 ldx $06BF cpx #$03 bcc L_5086 jsr L_6700 inc STAGE_NO jmp L_5008 L_5077 bmi L_5081 lda #$00 dec PLANE_X jmp L_5086 L_5081 lda #$02 inc PLANE_X L_5086 sta $060E jsr L_4B80 jmp L_51A4 L_508F jsr L_52CF+1 lda $0633 beq L_509D lda STRIG0 bne L_509D rts L_509D lda STICK0 cmp #$0B bne L_50AA jsr L_5212 jmp L_5113 L_50AA lda STICK0 cmp #$07 bne L_50B7 jsr L_5222 jmp L_5113 L_50B7 lda STICK0 cmp #$0E bne L_50C4 jsr L_5232 jmp L_5113 L_50C4 lda STICK0 cmp #$0D bne L_50CE jsr L_5243 L_50CE lda STICK0 cmp #$06 bne L_50DE jsr L_5232 jsr L_5222 jmp L_5113 L_50DE lda STICK0 cmp #$0A bne L_50EE jsr L_5232 jsr L_5212 jmp L_5113 L_50EE lda STICK0 cmp #$05 bne L_50FE jsr L_5243 jsr L_5222 jmp L_5113 L_50FE lda STICK0 cmp #$09 bne L_510E jsr L_5243 jsr L_5212 jmp L_5113 L_510E lda #$01 sta $060E L_5113 jsr L_4B80 jsr L_526E jsr L_6900 lda CH cmp #$21 bne L_5145 lda #$FF sta CH lda STAGE_NO+1 bne L_5145 ldx $062A bmi L_5145 lda #$00 sta L_9F75+7,x dec $062A jsr L_6C79+7 lda #$FF sta CH jmp L_5162 L_5145 lda STRIG0 bne L_5162 lda ENEMY_MOV_TYPE+5 bne L_5162 lda #$4E sta AUDC4 lda #$01 sta AUDF4 sta $0630 sta $062F jsr L_5253 L_5162 lda CH cmp #$0A bne L_516C jsr L_6C00 L_516C lda CH cmp #$3A bne L_5195 lda $0653 beq L_5190 lda ENEMY_TYPE cmp #$06 bne L_5181 beq L_5185 L_5181 cmp #$07 bne L_518D L_5185 lda #$28 sta PCOLR2 jsr L_53C8 L_518D jsr L_6000 L_5190 lda #$FF sta CH L_5195 inc $0683 lda $0683 cmp #$C4 bcc L_51A4 lda #$30 sta $0683 L_51A4 jsr L_6A80 jsr L_6090 lda $0663 cmp #$02 bcc L_51B4 jsr L_5D60 L_51B4 jsr L_6B80 sta HITCLR jsr L_6D3F+1 jsr L_5420 jsr L_1C00 jsr L_526E lda STAGE_NO+1 beq L_51D1 jsr L_6E50 jmp L_51D4 L_51D1 jsr L_53DF+1 L_51D4 lda $062F beq L_5206 lda $0630 clc adc #$08 sta $0630 sta AUDF4 cmp #$28 bcc L_5206 inc $062F lda $062F cmp $0656 beq L_51FE lda #$01 sta $0630 sta AUDF4 bne L_5206 L_51FE lda #$00 sta AUDC4 sta $062F L_5206 jmp L_502D jsr L_6700 inc $0632 jmp L_5008 L_5212 lda PLANE_X cmp #$2B bcc L_5221 lda #$00 sta $060E dec PLANE_X L_5221 rts L_5222 lda PLANE_X cmp #$C8 bcs L_5231 lda #$02 sta $060E inc PLANE_X L_5231 rts L_5232 lda PLANE_X+2 cmp STAGE_NO+2 bmi L_523D dec PLANE_X+2 L_523D lda #$01 sta $060E rts L_5243 lda PLANE_X+2 cmp #$3A bcs L_524D inc PLANE_X+2 L_524D lda #$01 sta $060E rts L_5253 inc ENEMY_MOV_TYPE+5 ldx PLANE_X inx stx HPOSM2 inx inx inx inx stx HPOSM3 lda PLANE_X+2 clc adc #$70 sta ENEMY_MOV_TYPE+3 rts L_526E lda ENEMY_MOV_TYPE+5 bne L_5274 rts L_5274 ldx ENEMY_MOV_TYPE+3 ldy #$00 L_5279 lda MISSILE_GFX,x and #$AF sta MISSILE_GFX,x dex iny cpy #$0A bne L_5279 inx inx inx inx inx inx inx cpx #$30 bcc L_52BB stx ENEMY_MOV_TYPE+3 ldy #$00 L_5297 lda MISSILE_GFX,x ora #$50 sta MISSILE_GFX,x dex iny cpy #$04 bne L_5297 lda $0635 beq L_52BA dex dex L_52AC lda MISSILE_GFX,x ora #$50 sta MISSILE_GFX,x dex iny cpy #$08 bne L_52AC L_52BA rts L_52BB lda #$00 sta ENEMY_MOV_TYPE+5 L_52C0 rts .byte $00, $00, $8D, $1B, $06, $60, $00, $00 .byte $00 cpy #$08 bne L_52C0 rts L_52CF lda #$AD sta TRAMSZ,x beq L_52D6 rts L_52D6 lda M0PL and #$01 beq L_52EF ldy $061E bpl L_52EF lda #$FE sta STAGE_NO+5 jsr L_5364 sta $0620 beq L_533E L_52EF lda M1PL and #$01 beq L_5308 ldy $061F bpl L_5308 lda #$FB sta STAGE_NO+5 jsr L_5364 sta $0621 beq L_533E L_5308 lda P0PL and #$0C bne L_5310 rts L_5310 lda ENEMY_Y bpl L_533D ldx $0634 cpx #$01 bmi L_533E stx $0652 inx stx $0634 lda PCOLR2 cmp #$26 bne L_532E sta $0650 rts L_532E cmp #$F2 bne L_5336 sta $0651 rts L_5336 cmp #$96 bne L_533D sta $0635 L_533D rts L_533E lda STAGE_NO+1 beq L_534B lda $0634 cmp #$FF beq L_534B rts L_534B lda #$00 sta ENEMY_Y+6 sta $0635 sta $0653 inc ENEMY_Y+5 lda #$02 sta $062F lda #$03 sta $0656 rts L_5364 ldx #$00 L_5366 lda MISSILE_GFX,y and STAGE_NO+5 L_536C sta MISSILE_GFX,y iny inx cpx #$03 bne L_5366 lda #$00 rts brk bne L_536C lda #$00 rts bne L_5380 L_5380 ldx #$00 txa L_5383 sta AUDC1,x inx inx cpx #$08 bmi L_5383 ldx #$00 L_538E lda L_435A,x sta L_9C1D+3,x inx cpx #$20 bne L_538E lda #$00 tax L_539C sta L_9C3D+3,x sta L_9D3D+3,x sta L_9E3D+3,x sta L_9F3D+3,x inx bne L_539C lda #$00 sta DINDEX lda #$40 sta SAVMSC lda #$9C L_53B5 sta SAVMSC+1 lda #$20 sta SDLSTL lda #$9C sta SDLSTH lda #$E0 sta CHBAS rts brk L_53C8 ldx #$00 txa L_53CB sta PMGFX0+3,x sta PMGFX1,x inx bne L_53CB lda #$FF sta ENEMY_TYPE lda #$00 sta $066A rts L_53DF ora L_B6A8+5 asl PTABW bpl L_53B5+1 and $D0 rol L_ABA8+5 asl $D0 and #$AD ora (TRAMSZ),y cmp #$22 bcc L_5417 ldx #$01 stx STAGE_NO+1 lda $06BB bne L_5402 stx $06BB L_5402 dex stx STAGE_NO+4 lda #$20 sta STAGE_NO+2 rts inc STAGE_NO+3 lda STAGE_NO+3 bne L_5417 inc STAGE_NO+4 L_5417 rts .byte $00, $00, $00, $00, $00, $00, $00, $00 L_5420 tya pha txa pha ldy #$00 sty ATRACT L_5428 ldx #$10 L_542A inx bne L_542A iny L_542E cpy #$0E bne L_5428 pla tax pla tay rts .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00 L_5440 lda BIGPLANE_FIRE_TYPE+6 bne L_5454 lda #$20 sta ENEMY_Y+3 sta $06B1 jsr L_5486 inc BIGPLANE_FIRE_TYPE+6 rts L_5454 cmp #$06 bcc L_545B jmp L_5543 L_545B cmp #$03 bpl L_54BC inc ENEMY_Y+3 lda ENEMY_Y+3 cmp #$30 bne L_546C inc BIGPLANE_FIRE_TYPE+6 L_546C cmp #$6A bcc L_5486 ldx ENEMY_Y+3 ldy #$00 tya L_5476 sta PMGFX0+3,x sta PMGFX1,x inx iny cpy #$0D bne L_5476 inc BIGPLANE_FIRE_TYPE+6 rts L_5486 lda $06B1 bne L_548C rts L_548C ldx ENEMY_Y+3 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_54A9 L_5496 lda L_3CF2+5,y sta PMGFX0+3,x lda L_3D0A+7,y sta PMGFX1,x inx iny cpy #$0D bne L_5496 rts L_54A9 lda L_3D02+2,y sta PMGFX0+3,x lda L_3D1A+4,y sta PMGFX1,x inx iny cpy #$0D bne L_54A9 rts L_54BC cmp #$05 bpl L_54DD inc BIGPLANE_FIRE_TYPE+6 lda $06B1 bne L_54C9 rts L_54C9 ldx ENEMY_Y+3 ldy #$00 L_54CE lda L_3D2A+1,y sta L_3406+1,x inx iny cpy #$04 bne L_54CE jmp L_5543 L_54DD dec ENEMY_Y+3 lda ENEMY_Y+3 cmp #$25 bcs L_550C ldx ENEMY_Y+3 ldy #$00 tya L_54ED sta L_33FE+2,x sta L_3500,x inx iny cpy #$0D bne L_54ED inc BIGPLANE_FIRE_TYPE+6 lda #$00 sta ENEMY_MOV_TYPE nop nop sta ENEMY_TYPE lda #$11 sta L_542E+1 rts L_550C lda $06B1 bne L_5512 rts L_5512 ldx ENEMY_Y+3 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_5531 L_551C lda L_3D2A+6,y sta L_33FE+2,x lda L_3D4A,y sta L_3500,x inx iny cpy #$0D bne L_551C jmp L_5543 L_5531 lda L_3D3A+3,y sta L_33FE+2,x lda L_3D52+5,y sta L_3500,x inx iny cpy #$0D bne L_5531 L_5543 rts brk ldx #$00 stx $0621 lda #$2F sta L_9CE5+4,x inc $0646 rts lda L_3976+4 and #$01 beq L_5577+1 ldx $0621 cpx #$0E L_555F beq L_5581 bcc L_55B7+2 ldx #$00 L_5565 lda L_5641,x sta L_3401+2,x lda #$3F sta L_3417,x inx cpx #$0E bne L_5565 ldx #$00 L_5577 lda L_5649+6,x sta L_34A4,x jsr L_4300 inx L_5581 cpx #$0C bne L_5577 ldx #$00 L_5587 lda $069C,x sta L_34BD+1,x jsr L_4300 inx cpx #$04 bne L_5587 ldx #$00 L_5597 lda L_5659+2,x sta L_351B+1,x jsr L_4300 L_55A0 inx cpx #$05 bne L_5597 ldx #$00 L_55A7 lda $0600,x sta L_3532+1,x jsr L_4300 inx cpx #$06 bne L_55A7 lda #$10 L_55B7 sta L_3537+2 ldx #$00 L_55BC lda L_5659+7,x sta BIG_PLANE_GFX2+7,x jsr L_4300 inx cpx #$0B bne L_55BC ldx #$00 L_55CC lda $0606,x sta L_35A5+6,x jsr L_4300 inx cpx #$06 bne L_55CC lda #$10 sta L_35AD+4 ldx #$00 L_55E1 lda L_5671+4,x sta L_3605+7,x jsr L_4300 inx cpx #$0D bne L_55E1 lda $069A sta L_3625+3 lda $069B sta L_3625+4 ldx #$00 L_55FD lda L_5669+2,x sta L_3720+5,x jsr L_4300 inx cpx #$0A bne L_55FD L_560B jsr L_4C30 L_560E jsr L_4C5A ldx #$00 L_5613 jsr L_561C inx cpx #$10 bne L_5613 rts L_561C txa pha lda COLOR0 cmp #$7A beq L_562D lda #$7A sta COLOR0 jmp L_5632 L_562D lda #$3A sta COLOR0 L_5632 ldx #$00 ldy #$00 L_5636 inx bne L_5636 iny cpy #$30 bne L_5636 pla tax rts L_5641 .byte $30, $29, $2C, $2F, $34, $07, $33, $00 L_5649 .byte $32, $25, $30, $2F, $32, $34, $21, $29 .byte $32, $23, $32, $21, $26, $34, $00, $28 L_5659 .byte $29, $34, $33, $23, $2F, $32, $25, $34 .byte $2F, $24, $21, $39, $07, $33, $00, $34 L_5669 .byte $2F, $30, $27, $21, $2D, $25, $00, $00 L_5671 .byte $2F, $36, $25, $32, $33, $34, $21, $27 .byte $25, $00, $32, $25, $21, $23, $28, $25 .byte $24, $00, $24, $00, $06, $8D, $29, $36 ldx #$00 jsr L_5692+2 inx L_568F cpx #$A9 brk L_5692 sta NMIEN sei lda $063A sta VVBLKI lda $063B sta VVBLKI+1 cli lda #$40 sta NMIEN ldx #$00 txa L_56AB sta HPOSP0,x inx cpx #$08 bne L_56AB ldx #$00 txa L_56B6 sta AUDC1,x inx inx cpx #$08 bmi L_56B6 ldx #$00 L_56C1 lda L_5709,x sta L_2FFC+4,x inx cpx #$20 bne L_56C1 lda #$00 tax L_56CF sta L_33FE+2,x sta L_3500,x sta PMGFX0+3,x sta PMGFX1,x inx bne L_56CF lda #$00 sta DINDEX lda #$00 sta SAVMSC lda #$34 sta SAVMSC+1 lda #$00 sta SDLSTL lda #$30 sta SDLSTH lda #$78 sta COLOR2 lda #$00 sta COLOR4 lda #$0F sta COLOR1 lda #$E0 sta CHBAS rts L_5709 .byte $70 ; DL 8 scanlines .byte $70 ; DL 8 scanlines .byte $70 ; DL 8 scanlines .byte $46 ; DL LMS Antic Mode 6 .word L_33FE+2 .byte $06 ; DL Antic Mode 6 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $02 ; DL Antic Mode 2 .byte $07 ; DL Antic Mode 7 .byte $07 ; DL Antic Mode 7 .byte $07 ; DL Antic Mode 7 .byte $07 ; DL Antic Mode 7 .byte $41 ; DL JMP .word L_2FFC+4 .byte $00, $02, $D0, $08 lda #$19 sta L_9FA5 dec L_9F9D+7 lda L_9F9D+7 cmp #$10 bne L_5753+1 lda L_9FA5 cmp #$10 bne L_5753+1 lda L_9FA5+1 cmp #$10 bne L_5753+1 lda #$10 sta L_9F9D+7 L_574F lda #$AD asl TRAMSZ,x L_5753 bne L_57A5 inc $066F inc $066F lda $066F cmp #$20 L_5760 bcc L_5767 lda #$00 sta $066F L_5767 clc adc #$70 sta ENEMY_X sta HPOSP2 sta HPOSP3 sta BIGPLANE_FIRE_TYPE+1 sta BIGPLANE_FIRE_TYPE+2 lda #$0F sta PCOLR1 sta PCOLR3 lda #$82 sta PCOLR0 sta PCOLR2 lda #$20 sta ENEMY_MOV_TYPE+7 sta $0624 lda #$00 sta BIGPLANE_FIRE_TYPE sta ENEMY_MOV_TYPE+1 sta BIGPLANE_FIRE_TYPE+3 lda #$0E sta L_542E+1 inc ENEMY_MOV_TYPE rts L_57A5 inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$01 bcs L_57B8 lda ENEMY_MOV_TYPE+7 cmp #$69 bcc L_57CD rts rts L_57B8 lda #$00 sta ENEMY_MOV_TYPE+1 lda BIGPLANE_FIRE_TYPE bne L_57C8 inc BIGPLANE_FIRE_TYPE jmp L_57CD L_57C8 lda #$00 sta BIGPLANE_FIRE_TYPE L_57CD lda ENEMY_MOV_TYPE cmp #$03 bcc L_57D7 jmp L_582A L_57D7 inc ENEMY_MOV_TYPE+7 lda ENEMY_MOV_TYPE+7 cmp #$30 bne L_57E4 inc ENEMY_MOV_TYPE L_57E4 cmp #$6A bcc L_57EE inc ENEMY_MOV_TYPE jmp L_588B L_57EE lda $0624 bne L_57F6 jmp L_588B L_57F6 ldx ENEMY_MOV_TYPE+7 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_5815 L_5800 lda L_3CF2+5,y sta L_33FE+2,x lda L_3D0A+7,y sta L_3500,x inx iny cpy #$0D bne L_5800 jmp L_588B L_5815 lda L_3D02+2,y sta L_33FE+2,x lda L_3D1A+4,y sta L_3500,x inx iny cpy #$0D bne L_5815 jmp L_588B L_582A inc BIGPLANE_FIRE_TYPE+1 inc BIGPLANE_FIRE_TYPE+2 lda BIGPLANE_FIRE_TYPE+2 cmp #$E0 bcc L_5852 ldx ENEMY_MOV_TYPE+7 ldy #$00 tya L_583D sta L_33FE+2,x sta L_3500,x inx iny cpy #$0D bne L_583D sta $0624 inc ENEMY_MOV_TYPE jmp L_588B L_5852 lda $0624 bne L_585A jmp L_588B L_585A ldx ENEMY_MOV_TYPE+7 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_5879 L_5864 lda L_3D72,y sta L_33FE+2,x lda L_3D9A,y sta L_3500,x inx iny cpy #$0D bne L_5864 jmp L_588B L_5879 lda L_3D72,y sta L_33FE+2,x lda L_3DA2+6,y sta L_3500,x inx iny cpy #$0D bne L_5879 L_588B lda ENEMY_MOV_TYPE cmp #$02 bpl L_5893 rts L_5893 jmp L_58B0 brk asl FKDEF cmp #$04 bne L_58BA+2 ldx #$00 lda #$00 sta L_9C65+3,x sta L_9C1D,x lda #$06 sta L_9C8D+3,x sta L_9C45,x txa L_58B0 lda BIGPLANE_FIRE_TYPE+3 bne L_58C9 lda #$20 sta ENEMY_Y L_58BA sta $0625 lda #$00 sta BIGPLANE_FIRE_TYPE+4 jsr L_58F2 inc BIGPLANE_FIRE_TYPE+3 rts L_58C9 lda $0634 beq L_58D1 jmp L_59F1 L_58D1 lda BIGPLANE_FIRE_TYPE+3 cmp #$03 bcc L_58DB jmp L_592E L_58DB inc ENEMY_Y lda ENEMY_Y cmp #$30 bne L_58E8 inc BIGPLANE_FIRE_TYPE+3 L_58E8 cmp #$5A bcc L_58F2 inc BIGPLANE_FIRE_TYPE+3 jmp L_59F1 L_58F2 lda $0625 bne L_58FA jmp L_59F1 L_58FA ldx ENEMY_Y ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_5919 L_5904 lda L_3CF2+5,y sta PMGFX0+3,x lda L_3D0A+7,y sta PMGFX1,x inx iny cpy #$0D bne L_5904 jmp L_59F1 L_5919 lda L_3D02+2,y sta PMGFX0+3,x lda L_3D1A+4,y sta PMGFX1,x inx iny cpy #$0D bne L_5919 jmp L_59F1 L_592E cmp #$03 bne L_5987 dec ENEMY_X lda ENEMY_X sta HPOSP2 sta HPOSP3 cmp #$40 bcs L_594B jsr L_59FC inc BIGPLANE_FIRE_TYPE+3 jmp L_59F1 L_594B lda $0625 bne L_5953 jmp L_59F1 L_5953 ldx ENEMY_Y ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_5972 L_595D lda L_3D62+2,y sta PMGFX0+3,x lda L_3D7A+6,y sta PMGFX1,x inx iny cpy #$0D bne L_595D jmp L_59F1 L_5972 lda L_3D62+2,y sta PMGFX0+3,x lda L_3D8A+3,y sta PMGFX1,x inx iny cpy #$0D bne L_5972 jmp L_59F1 L_5987 inc ENEMY_X lda ENEMY_X sta HPOSP2 sta HPOSP3 inc ENEMY_Y lda ENEMY_Y cmp #$B0 bcc L_59B5 lda #$00 sta ENEMY_MOV_TYPE sta $0625 lda #$11 sta L_542E+1 lda #$00 sta ENEMY_TYPE jsr L_59FC jmp L_59F1 L_59B5 lda $0625 bne L_59BD jmp L_59F1 L_59BD ldx ENEMY_Y ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_59DC L_59C7 lda L_3D72,y sta PMGFX0+3,x lda L_3D9A,y sta PMGFX1,x inx iny cpy #$0D bne L_59C7 jmp L_59F1 L_59DC lda L_3D72,y sta PMGFX0+3,x lda L_3DA2+6,y sta PMGFX1,x inx iny cpy #$0D bne L_59DC jmp L_59F1 L_59F1 lda BIGPLANE_FIRE_TYPE+3 cmp #$02 bpl L_59F9 rts L_59F9 jmp L_5A1E+2 L_59FC ldx ENEMY_Y ldy #$00 tya L_5A02 sta PMGFX0+3,x sta PMGFX1,x inx iny cpy #$0D bne L_5A02 rts brk .byte $D2 lda PLANE_X+3 cmp #$02 bne L_5A3D jsr L_55A0 lda PLANE_X L_5A1E sta L_AD50+2 dey asl $D0 .byte $14 lda #$20 sta ENEMY_Y+1 sta $0627 lda #$00 sta BIGPLANE_FIRE_TYPE+5 jsr L_5A57 inc BIGPLANE_FIRE_TYPE+4 rts cmp #$03 bcc L_5A40 L_5A3D jmp L_5A93 L_5A40 inc ENEMY_Y+1 lda ENEMY_Y+1 cmp #$30 bne L_5A4D inc BIGPLANE_FIRE_TYPE+4 L_5A4D cmp #$4A bcc L_5A57 inc BIGPLANE_FIRE_TYPE+4 jmp L_5AEE L_5A57 lda $0627 bne L_5A5F jmp L_5AEE L_5A5F ldx ENEMY_Y+1 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_5A7E L_5A69 lda L_3CF2+5,y sta L_33FE+2,x lda L_3D0A+7,y sta L_3500,x inx iny cpy #$0D bne L_5A69 jmp L_5AEE L_5A7E lda L_3D02+2,y sta L_33FE+2,x lda L_3D1A+4,y sta L_3500,x inx iny cpy #$0D bne L_5A7E jmp L_5AEE L_5A93 lda BIGPLANE_FIRE_TYPE+1 cmp #$E0 bcc L_5AB5 ldx ENEMY_Y+1 ldy #$00 sty $0627 tya L_5AA3 sta L_33FE+2,x sta L_3500,x inx iny cpy #$0D bne L_5AA3 inc BIGPLANE_FIRE_TYPE+4 jmp L_5AEE L_5AB5 lda $0627 bne L_5ABD jmp L_5AEE L_5ABD ldx ENEMY_Y+1 ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_5ADC L_5AC7 lda L_3D72,y sta L_33FE+2,x lda L_3D9A,y sta L_3500,x inx iny cpy #$0D bne L_5AC7 jmp L_5AEE L_5ADC lda L_3D72,y sta L_33FE+2,x lda L_3DA2+6,y sta L_3500,x inx iny cpy #$0D bne L_5ADC L_5AEE rts lda BIGPLANE_FIRE_TYPE+4 cmp #$02 bpl L_5AF7 rts L_5AF7 jmp L_4EC0 brk bne L_5B0A lda L_6800,y L_5B00 ldx PLANE_X lda ENEMY_MOV_TYPE+3 cmp #$9C bne L_5B1E L_5B0A cpx #$70 bne L_5B1E lda #$0A ldx $060E bne L_5B16 rts L_5B16 dec $060E dex sta L_9F65+7,x rts L_5B1E jsr L_5B2B ldx $060E sta L_9F65+7,x inc $060E rts L_5B2B lda ENEMY_MOV_TYPE+3 cmp #$1C bne L_5B35 jmp L_5B5B L_5B35 cmp #$3C bne L_5B3C jmp L_5B81 L_5B3C cmp #$5C bne L_5B43 jmp L_5BA7 L_5B43 cmp #$7C bne L_5B4A jmp L_5BCD L_5B4A cpx #$50 bne L_5B51 lda #$39 rts L_5B51 cpx #$60 bne L_5B58 lda #$3A rts L_5B58 lda #$0E rts L_5B5B cpx #$50 bne L_5B62 lda #$21 rts L_5B62 cpx #$60 bne L_5B69 lda #$22 rts L_5B69 cpx #$70 bne L_5B70 lda #$23 rts L_5B70 cpx #$80 bne L_5B77 lda #$24 rts L_5B77 cpx #$90 bne L_5B7E lda #$25 rts L_5B7E lda #$26 rts L_5B81 cpx #$50 bne L_5B88 lda #$27 rts L_5B88 cpx #$60 bne L_5B8F lda #$28 rts L_5B8F cpx #$70 bne L_5B96 lda #$29 rts L_5B96 cpx #$80 bne L_5B9D lda #$2A rts L_5B9D cpx #$90 bne L_5BA4 lda #$2B rts L_5BA4 lda #$2C rts L_5BA7 cpx #$50 bne L_5BAE lda #$2D rts L_5BAE cpx #$60 bne L_5BB5 lda #$2E rts L_5BB5 cpx #$70 bne L_5BBC lda #$2F rts L_5BBC cpx #$80 bne L_5BC3 lda #$30 rts L_5BC3 cpx #$90 bne L_5BCA lda #$31 rts L_5BCA lda #$32 rts L_5BCD cpx #$50 bne L_5BD4 lda #$33 rts L_5BD4 cpx #$60 bne L_5BDB lda #$34 rts L_5BDB cpx #$70 bne L_5BE2 lda #$35 rts L_5BE2 cpx #$80 bne L_5BE9 lda #$36 rts L_5BE9 cpx #$90 bne L_5BF0 lda #$37 rts L_5BF0 lda #$38 rts .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00 L_5C00 ldx #$00 stx $065D L_5C05 lda $0606,x cmp $0600,x bmi L_5C13 inx cpx #$05 bne L_5C05 L_5C12 rts L_5C13 lda $0600,x cmp $0606,x bmi L_5C12 dex cpx #$FF bne L_5C13 ldx #$00 L_5C22 lda $0600,x sta $0606,x inx cpx #$06 bne L_5C22 inc $065D rts .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00 L_5C40 lda ENEMY_MOV_TYPE bne L_5C78 lda #$0F sta L_542E+1 lda PLANE_X sta HPOSP2 sta HPOSP3 sta ENEMY_X lda #$28 sta ENEMY_Y sta $0625 lda PCOLR2 cmp #$82 beq L_5C6A lda #$74 jmp L_5C6C L_5C6A lda #$44 L_5C6C sta PCOLR2 lda #$0F sta PCOLR3 inc ENEMY_MOV_TYPE rts L_5C78 lda $0634 beq L_5C7E rts L_5C7E inc ENEMY_Y lda ENEMY_Y cmp #$B0 bcc L_5C8B jmp L_5D0C L_5C8B lda $0625 bne L_5C91 rts L_5C91 inc BIGPLANE_FIRE_TYPE+3 lda BIGPLANE_FIRE_TYPE+3 cmp #$02 bcc L_5CBE lda PLANE_X cmp ENEMY_X bne L_5CA5 beq L_5CB0 L_5CA5 bmi L_5CAD inc ENEMY_X jmp L_5CB0 L_5CAD dec ENEMY_X L_5CB0 lda ENEMY_X sta HPOSP2 sta HPOSP3 lda #$00 sta BIGPLANE_FIRE_TYPE+3 L_5CBE inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$02 bcc L_5CDC lda #$00 sta ENEMY_MOV_TYPE+1 lda BIGPLANE_FIRE_TYPE beq L_5CD9 lda #$00 sta BIGPLANE_FIRE_TYPE beq L_5CDC L_5CD9 inc BIGPLANE_FIRE_TYPE L_5CDC ldx ENEMY_Y ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_5CF9 L_5CE6 lda L_3CF2+5,y sta PMGFX0+3,x lda L_3D0A+7,y sta PMGFX1,x inx iny cpy #$0D bne L_5CE6 rts L_5CF9 lda L_3D02+2,y sta PMGFX0+3,x lda L_3D1A+4,y sta PMGFX1,x inx iny cpy #$0D bne L_5CF9 rts L_5D0C ldx ENEMY_Y ldy #$00 tya L_5D12 sta PMGFX0+2,x sta L_36FD+2,x inx iny cpy #$0E bne L_5D12 sta ENEMY_TYPE L_5D21 sta $0625 sta ENEMY_MOV_TYPE lda #$11 sta L_542E+1 rts asl LTEMP+1,x inx iny cpy #$0D bne L_5D21+2 rts lda #$01 sta ENEMY_MOV_TYPE ldx ENEMY_Y ldy #$00 tya L_5D41 sta PMGFX0+2,x sta L_36FD+2,x inx iny cpy #$0E L_5D4B bne L_5D41 rts brk cpy #$30 bcc L_5D4B+1 sty AUDF2 iny iny sty AUDF3 ldy #$00 ldx #$00 inx L_5D60 lda #$FF sta $0634 lda #$CA sta AUDC3 lda ENEMY_Y sta AUDF3 lda ENEMY_X cmp PLANE_X bcc L_5D7E dec ENEMY_X jmp L_5D81 L_5D7E inc ENEMY_X L_5D81 lda ENEMY_X sta HPOSP2 sta HPOSP3 lda PLANE_X+2 clc adc #$70 sta $0664 lda ENEMY_Y cmp $0664 bcc L_5DC1 cmp #$30 bcs L_5DBB ldx #$00 tay txa L_5DA3 sta PMGFX0+3,y sta PMGFX1,y iny inx cpx #$0F bne L_5DA3 lda #$00 sta $0634 sta $0663 sta AUDC3 rts L_5DBB dec ENEMY_Y jmp L_5DC4 L_5DC1 inc ENEMY_Y L_5DC4 ldx #$00 ldy ENEMY_Y inc ENEMY_X+2 lda ENEMY_X+2 cmp #$01 beq L_5DEB L_5DD3 lda L_5E16+6,x sta PMGFX1,y lda L_5DFE,x sta PMGFX0+3,y iny inx cpx #$0F bne L_5DD3 lda #$00 sta ENEMY_X+2 rts L_5DEB lda L_5E06+7,x sta PMGFX0+3,y lda L_5E16+6,x sta PMGFX1,y iny inx cpx #$0F bne L_5DEB rts L_5DFE .byte $00, $18, $3C, $34, $7A, $5A, $E3, $FF L_5E06 .byte $E7, $70, $78, $3C, $3C, $18, $00, $00 .byte $18, $3C, $2C, $5E, $5A, $C7, $FF, $E7 L_5E16 .byte $0E, $1E, $3C, $3C, $18, $00, $00, $18 .byte $3C, $3C, $7E, $7E, $FF, $FF, $FF, $7E .byte $7E, $3C, $3C, $18, $00, $00, $70 bne L_5E38 lda #$40 sta HPOSP2 sta $0640 rts L_5E38 lda #$00 sta $0624 sta $0625 sta $0627 sta ENEMY_MOV_TYPE sta SIZEP2 sta SIZEP3 sta $0634 ldx $06AB beq L_5E55 rts L_5E55 tax L_5E56 sta L_33FE+2,x sta L_3500,x sta PMGFX0+3,x L_5E5F sta PMGFX1,x sta L_3680,x sta L_3780,x inx cpx #$80 bcc L_5E56 ldx $06C2 bne L_5E74 lda #$01 L_5E74 sta $06C2 inc $06AF ldx $06AF cpx #$10 bcc L_5E86 ldx #$00 stx $06AF L_5E86 lda STAGE_NO cmp #$03 bcc ENEMY_SETS1 lda #$00 sta STAGE_NO ENEMY_SETS1 cmp #$00 bne ENEMY_SETS2 lda ENEMY_TBLS1,x sta ENEMY_TYPE rts ENEMY_SETS2 cmp #$01 bne ENEMY_SETS3 lda ENEMY_TBLS2+1,x sta ENEMY_TYPE rts ENEMY_SETS3 cmp #$02 bne ENEMY_SETS4 lda ENEMY_TBLS3+2,x sta ENEMY_TYPE rts ENEMY_SETS4 lda ENEMY_TBLS4+3,x sta ENEMY_TYPE rts ENEMY_TBLS1 .byte $01, $02, $03, $01, $03, $02, $04, $05 .byte $05, $01, $01, $02, $04, $03, $04, $01 ENEMY_TBLS2 .byte $03, $01, $05, $05, $06, $04, $07, $05 .byte $05, $01, $08, $09, $01, $02, $06, $0B ENEMY_TBLS3 .byte $02, $04, $01, $0A, $0B, $02, $01, $0B .byte $08, $09, $05, $05, $03, $0A, $02, $07 ENEMY_TBLS4 .byte $08, $07, $03, $06, $07, $08, $09, $0A .byte $0B, $05, $05, $08, $09, $02, $03, $0A .byte $0A, $0A, $0A, $0A, $01, $02 L_5F00 ldx ENEMY_Y ldy #$00 lda #$0F sta AUDC4 inc ENEMY_X+2 lda ENEMY_X+2 sta AUDF4 cmp #$08 bcs L_5F2A L_5F17 lda L_6F89+7,y sta PMGFX0+3,x lda L_6F99+4,y sta PMGFX1,x inx iny cpy #$0D bne L_5F17 rts L_5F2A cmp #$10 bcs L_5F41 L_5F2E lda L_6FA9+1,y sta PMGFX0+3,x lda L_6FB1+6,y sta PMGFX1,x inx iny cpy #$0D bne L_5F2E rts L_5F41 cmp #$18 bcs L_5F48 jmp L_5F17 L_5F48 cmp #$20 bcs L_5F4F jmp L_5F2E L_5F4F cmp #$28 bcs L_5F65 L_5F53 lda L_6FC1+3,y sta PMGFX0+3,x lda #$00 sta PMGFX1,x inx iny cpy #$0D bne L_5F53 rts L_5F65 cmp #$30 bcs L_5F76 L_5F69 lda L_6FD1,y sta PMGFX0+3,x inx iny cpy #$0D bne L_5F69 rts L_5F76 cmp #$38 bcs L_5F87 L_5F7A lda L_6FD9+5,y sta PMGFX0+3,x inx iny cpy #$0D bne L_5F7A rts L_5F87 cmp #$40 bcs L_5F9D L_5F8B lda #$00 sta PMGFX0+3,x lda L_5FE3,y sta PMGFX1,x inx iny cpy #$0D bne L_5F8B rts L_5F9D cmp #$48 bcs L_5FAE L_5FA1 lda L_5FEB+5,y sta PMGFX1,x inx iny cpy #$0D bne L_5FA1 rts L_5FAE cmp #$50 bcs L_5FB5 jmp L_5F8B L_5FB5 lda #$00 sta $0637 sta $06AE sta AUDC4 lda $0683 bpl L_5FCB lda #$01 sta $0634 rts L_5FCB lda #$00 sta ENEMY_X+7 sta AUDC4 sta $062F sta $0637 jsr L_6650 jsr L_67CF jsr L_67CF rts L_5FE3 .byte $00, $00, $00, $00, $20, $00, $08, $40 L_5FEB .byte $00, $10, $00, $00, $00, $00, $00, $00 .byte $20, $14, $40, $82, $00, $82, $80, $28 .byte $00, $00, $00, $BD, $33 L_6000 ldx #$00 lda $0624 beq L_6010 stx $0624 stx ENEMY_X+1 inc ENEMY_X+6 L_6010 lda $0625 beq L_601E stx $0625 stx ENEMY_X+2 inc ENEMY_X+7 L_601E lda $0627 beq L_602C stx $0627 stx ENEMY_X+3 inc $06A8 L_602C ldy ENEMY_Y+2 ldx #$00 txa sta $06B0 sta $06B1 L_6038 sta L_33FE+2,y sta L_3500,y sta PMGFX0+3,y sta PMGFX1,y iny inx cpx #$0D bne L_6038 ldy ENEMY_Y+3 ldx #$00 L_604F sta L_33FE+2,y sta L_3500,y sta PMGFX0+3,y sta PMGFX1,y iny inx cpx #$0D bne L_604F sta $0653 sta L_9F85+1 rts .byte $00 ldx #$06 L_606B inc ENEMY_X+7 lda $0627 beq L_607C stx $0627 stx ENEMY_X+3 inc $06A8 L_607C stx $0653 stx L_9F85+1 rts .word LNFLG ldx #$00 L_6087 inx bne L_6087 iny cpy #$50 bne L_6087 pla L_6090 lda ENEMY_X+7 bne L_6096 rts L_6096 lda $0637 beq L_609E jmp L_5F00 L_609E ldx ENEMY_Y ldy #$00 lda $0634 beq L_60AB jmp L_6111 L_60AB lda #$0F sta AUDC4 inc ENEMY_X+2 lda ENEMY_X+2 sta AUDF4 cmp #$08 bcs L_60D0 L_60BD lda L_3F4A+4,y sta PMGFX0+3,x lda L_3F5A+1,y sta PMGFX1,x inx iny cpy #$0D bne L_60BD rts L_60D0 cmp #$18 bcs L_60E7 L_60D4 lda L_3F32+2,y sta PMGFX0+3,x lda L_3F3A+7,y sta PMGFX1,x inx iny cpy #$0D bne L_60D4 rts L_60E7 cmp #$20 bcs L_60EE jmp L_60BD L_60EE jsr L_6186 lda #$00 sta AUDC4 sta $062F jsr L_67B8 jsr L_67CF lda ENEMY_TYPE cmp #$01 beq L_616E lda $0683 bpl L_616E lda #$01 sta $0634 rts L_6111 cmp #$02 beq L_6140 cpx #$B0 bcs L_616B lda PCOLR2 cmp #$38 beq L_612A cmp #$26 beq L_6127 jmp L_6195 L_6127 jmp L_61A9 L_612A lda L_3E7A+3,y sta PMGFX0+3,x lda L_3E8A,y sta PMGFX1,x inx iny cpy #$0D bne L_612A inc ENEMY_Y rts L_6140 lda $0651 beq L_614E jsr L_67E6 jsr L_6650 jmp L_616E L_614E lda $0650 beq L_615F lda #$01 sta $0653 lda #$24 sta L_9F85+1 bne L_616E L_615F lda #$2A sta L_9F6D+7 lda #$05 sta $0656 bne L_616E L_616B inc $0663 L_616E lda #$00 sta ENEMY_X+7 sta $0634 sta $0651 sta $0650 lda PCOLR2 cmp #$38 bne L_6186 jmp L_6650 L_6186 lda #$00 L_6188 sta PMGFX0+3,x sta PMGFX1,x inx iny cpy #$0E bne L_6188 rts L_6195 lda L_3E62+2,y sta PMGFX0+3,x L_619B lda L_3E6A+6,y sta PMGFX1,x inx iny cpy #$0D bne L_6195 beq L_61BB L_61A9 lda L_3E92+5,y sta PMGFX0+3,x lda L_3EA2+2,y sta PMGFX1,x inx iny cpy #$0D bne L_61A9 L_61BB inc ENEMY_Y rts L_61BF asl LELNUM .byte $87 asl $D0 and #$AD sta TRAMSZ cmp #$38 bcs L_61CD rts L_61CD lda #$70 sta ENEMY_Y sta $0625 lda #$28 sta HPOSP2 sta HPOSP3 sta ENEMY_X lda #$0F sta PCOLR3 lda #$44 sta PCOLR2 inc BIGPLANE_FIRE_TYPE+3 rts lda $0634 beq L_61F4 rts L_61F4 ldy ENEMY_Y ldx #$00 lda BIGPLANE_FIRE_TYPE+3 cmp #$03 bcc L_6203 jmp L_624F L_6203 inc ENEMY_X lda ENEMY_X sta HPOSP2 sta HPOSP3 cmp #$30 bne L_6216 inc BIGPLANE_FIRE_TYPE+3 L_6216 cmp #$8A bcc L_621E inc BIGPLANE_FIRE_TYPE+3 rts L_621E lda $0625 bne L_6224 rts L_6224 lda BIGPLANE_FIRE_TYPE bne L_623C L_6229 lda L_3DB2+3,x sta PMGFX0+3,y lda L_3DC2,x sta PMGFX1,y iny inx cpx #$0D bne L_6229 rts L_623C lda L_3DB2+3,x sta PMGFX0+3,y lda L_3DCA+5,x sta PMGFX1,y iny inx cpx #$0D bne L_623C rts L_624F cmp #$05 bcs L_626D inc BIGPLANE_FIRE_TYPE+3 lda $0625 bne L_625C rts L_625C lda L_3DDA+2,x sta PMGFX0+3,y lda L_3DE2+7,x sta PMGFX1,y iny inx cpx #$0D rts L_626D cmp #$06 bcs L_62B3 inc ENEMY_Y lda ENEMY_Y cmp #$80 bcc L_6282 inc BIGPLANE_FIRE_TYPE+3 jsr L_62EC rts L_6282 lda $0625 bne L_6288 rts L_6288 lda BIGPLANE_FIRE_TYPE bne L_62A0 L_628D lda L_3CF2+5,x sta PMGFX0+3,y lda L_3D0A+7,x sta PMGFX1,y iny inx cpx #$0D bne L_628D rts L_62A0 lda L_3CF2+5,x sta PMGFX0+3,y lda L_3D1A+4,x sta PMGFX1,y iny inx cpx #$0D bne L_62A0 rts L_62B3 cmp #$09 bcs L_62D3 inc BIGPLANE_FIRE_TYPE+3 lda $0625 bne L_62C0 rts L_62C0 lda L_3DF2+4,x sta PMGFX0+3,y lda L_3E02+1,x sta PMGFX1,y iny inx cpx #$0D bne L_62C0 rts L_62D3 lda ENEMY_X cmp #$28 bcs L_62FA lda #$00 sta $0625 sta ENEMY_MOV_TYPE lda #$00 sta ENEMY_TYPE lda #$11 sta L_542E+1 L_62EC txa L_62ED sta PMGFX0+3,y sta PMGFX1,y iny inx cpx #$0D bne L_62ED rts L_62FA dec ENEMY_Y dec ENEMY_X lda ENEMY_X sta HPOSP2 sta HPOSP3 lda $0625 bne L_630F rts L_630F lda BIGPLANE_FIRE_TYPE bne L_6327 L_6314 lda L_3E32+5,x sta PMGFX0+3,y lda L_3E42+2,x sta PMGFX1,y iny inx cpx #$0D bne L_6314 rts L_6327 lda L_3E32+5,x sta PMGFX0+3,y lda L_3EAA+7,x sta PMGFX1,y iny inx cpx #$0D bne L_6327 rts .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00 L_6360 lda ENEMY_MOV_TYPE bne L_639B lda #$50 sta ENEMY_MOV_TYPE+7 sta $0624 lda #$00 sta HPOSP2 sta HPOSP3 lda #$28 sta BIGPLANE_FIRE_TYPE+1 sta BIGPLANE_FIRE_TYPE+2 lda #$0E sta PCOLR1 lda #$64 sta PCOLR0 lda #$00 sta BIGPLANE_FIRE_TYPE sta ENEMY_MOV_TYPE+1 sta BIGPLANE_FIRE_TYPE+3 lda #$0E sta L_542E+1 inc ENEMY_MOV_TYPE rts L_639B inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$03 bcc L_63BA lda #$00 sta ENEMY_MOV_TYPE+1 lda BIGPLANE_FIRE_TYPE bne L_63B5 inc BIGPLANE_FIRE_TYPE jmp L_63BA L_63B5 lda #$00 sta BIGPLANE_FIRE_TYPE L_63BA ldy ENEMY_MOV_TYPE+7 ldx #$00 lda ENEMY_MOV_TYPE cmp #$03 bcc L_63C9 jmp L_6412 L_63C9 inc BIGPLANE_FIRE_TYPE+1 inc BIGPLANE_FIRE_TYPE+2 lda BIGPLANE_FIRE_TYPE+1 cmp #$30 bne L_63D9 inc ENEMY_MOV_TYPE L_63D9 cmp #$8A bcc L_63E1 inc ENEMY_MOV_TYPE rts L_63E1 lda $0624 bne L_63E7 rts L_63E7 lda BIGPLANE_FIRE_TYPE bne L_63FF L_63EC lda L_3DB2+3,x sta L_33FE+2,y lda L_3DC2,x sta L_3500,y iny inx cpx #$0D bne L_63EC rts L_63FF lda L_3DB2+3,x sta L_33FE+2,y lda L_3DCA+5,x sta L_3500,y iny inx cpx #$0D bne L_63FF rts L_6412 cmp #$04 bcs L_6430 lda $0624 bne L_641C rts L_641C lda L_3DDA+2,x sta L_33FE+2,y lda L_3DE2+7,x sta L_3500,y iny inx cpx #$0D inc ENEMY_MOV_TYPE rts L_6430 cmp #$05 bcs L_6476 inc ENEMY_MOV_TYPE+7 lda ENEMY_MOV_TYPE+7 cmp #$60 bcc L_6445 inc ENEMY_MOV_TYPE jsr L_64A2 rts L_6445 lda $0624 bne L_644B rts L_644B lda BIGPLANE_FIRE_TYPE bne L_6463 L_6450 lda L_3CF2+5,x sta L_33FE+2,y lda L_3D0A+7,x sta L_3500,y iny inx cpx #$0D bne L_6450 rts L_6463 lda L_3CF2+5,x sta L_33FE+2,y lda L_3D1A+4,x sta L_3500,y iny inx cpx #$0D bne L_6463 rts L_6476 cmp #$07 bcs L_6496 inc ENEMY_MOV_TYPE lda $0624 bne L_6483 rts L_6483 lda L_3DF2+4,x sta L_33FE+2,y lda L_3E02+1,x sta L_3500,y iny inx cpx #$0D bne L_6483 rts L_6496 lda BIGPLANE_FIRE_TYPE+1 cmp #$28 bcs L_64B0 lda #$00 sta $0624 L_64A2 txa L_64A3 sta L_33FE+2,y sta L_3500,y iny inx cpx #$0D bne L_64A3 rts L_64B0 dec BIGPLANE_FIRE_TYPE+1 dec BIGPLANE_FIRE_TYPE+2 lda $0624 bne L_64BC rts L_64BC lda BIGPLANE_FIRE_TYPE bne L_64D4 L_64C1 lda L_3E0A+6,x sta L_33FE+2,y lda L_3E1A+3,x sta L_3500,y iny inx cpx #$0D bne L_64C1 rts L_64D4 lda L_3E0A+6,x sta L_33FE+2,y lda L_3E2A,x sta L_3500,y iny inx cpx #$0D bne L_64D4 rts .byte $00, $3C, $3C, $3C, $3C, $3C, $3C, $3C .byte $3C, $3C, $3C, $3C, $3C, $3C, $3C, $3C .byte $3C, $3D, $00, $3B, $3C, $3C, $3C, $3C .byte $3C L_6500 lda BIGPLANE_FIRE_TYPE+3 bne L_653F lda #$98 sta ENEMY_Y sta $0625 lda $0683 bmi L_6516 lda #$D0 bne L_6518 L_6516 lda #$28 L_6518 sta ENEMY_X sta HPOSP2 sta HPOSP3 lda #$00 sta $06AE lda #$2F sta PCOLR3 lda #$38 sta PCOLR2 lda #$01 sta SIZEP2 sta SIZEP3 jsr L_6592 inc BIGPLANE_FIRE_TYPE+3 rts L_653F lda $0625 bne L_6547 jmp L_6592 L_6547 lda ENEMY_MOV_TYPE+1 cmp #$02 beq L_654F rts L_654F lda ENEMY_X cmp PLANE_X beq L_6562 bcc L_655F dec ENEMY_X jmp L_6562 L_655F inc ENEMY_X L_6562 lda ENEMY_X sta HPOSP2 sta HPOSP3 lda BIGPLANE_FIRE_TYPE+3 cmp #$02 bne L_6583 dec ENEMY_Y lda ENEMY_Y cmp #$40 bcs L_6592 lda #$03 sta BIGPLANE_FIRE_TYPE+3 bne L_6592 L_6583 inc ENEMY_Y lda ENEMY_Y cmp #$80 bcc L_6592 lda #$02 sta BIGPLANE_FIRE_TYPE+3 L_6592 lda $0625 bne L_65AA ldx #$00 ldy ENEMY_Y txa L_659D sta L_3605+7,y sta L_370C,y iny inx cpx #$07 bne L_659D rts L_65AA ldx ENEMY_Y ldy #$00 lda BIGPLANE_FIRE_TYPE bne L_65C7 L_65B4 lda L_3F6A+6,y sta PMGFX0+3,x lda L_3F82+1,y sta PMGFX1,x inx iny cpy #$13 bne L_65B4 rts L_65C7 lda L_3F6A+6,y sta PMGFX0+3,x lda L_3F92+4,y sta PMGFX1,x inx iny cpy #$13 bne L_65C7 rts .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00 lda #$00 sta ENEMY_MOV_TYPE sta $0625 sta SIZEP2 sta SIZEP3 lda #$00 L_6650 lda #$00 sta ENEMY_MOV_TYPE sta $0625 sta SIZEP2 sta SIZEP3 sta $06AE sta ENEMY_TYPE lda #$11 sta L_542E+1 ldy ENEMY_Y ldx #$00 txa L_666F sta PMGFX0+3,y sta PMGFX1,y iny inx cpx #$13 bne L_666F rts brk eor L_4D4D L_6680 lda #$0F sta AUDC4 ldy #$A8 lda #$05 sta $066B inc $066A lda $066A sta AUDF4 cmp #$10 bcs L_66B8 L_6699 ldx #$0C L_669B lda L_3F32+2,x sta PMGFX0+3,y lda L_3F3A+7,x sta PMGFX1,y dey dex cpx #$FF bne L_669B dey dey dec $066B lda $066B bne L_6699 rts L_66B8 cmp #$30 bcs L_66DB L_66BC ldx #$0C L_66BE lda L_3F4A+4,x sta PMGFX0+3,y lda L_3F5A+1,x sta PMGFX1,y dey dex cpx #$FF bne L_66BE dey dey dec $066B lda $066B bne L_66BC rts L_66DB cmp #$40 bcs L_66E2 jmp L_6699 L_66E2 ldx #$00 txa L_66E5 sta PMGFX0+3,x sta PMGFX1,x inx bne L_66E5 lda #$00 sta ENEMY_X+6 sta ENEMY_TYPE sta AUDC4 sta $062F jsr L_67E6 rts L_6700 jsr L_568F+1 ldx #$00 lda #$06 L_6707 sta L_3004+3,x inx cpx #$12 bne L_6707 lda #$07 sta L_300C+4 sta L_300C+5 ldx #$00 L_6719 lda L_6791,x sta L_342B+1,x jsr L_4300 inx cpx #$0A bne L_6719 lda $069A sta L_3435+1 lda $069B sta L_3437 inc $069B lda $069B cmp #$1A bmi L_6745 lda #$10 sta $069B inc $069A L_6745 ldx #$00 L_6747 lda L_6799+2,x sta L_348F,x jsr L_4300 inx cpx #$0D bne L_6747 lda $062A clc adc #$11 sta L_349A+2 cmp #$11 bmi L_676F L_6762 jsr L_67E6 dec $062A lda $062A cmp #$FF bpl L_6762 L_676F ldx #$00 L_6771 lda L_67A1+7,x sta BP_CHECK_Y_UP+1,x jsr L_4300 inx cpx #$05 bne L_6771 lda $069A sta L_34E7+1 lda $069B sta L_34E9 jsr L_2000 jmp L_560B L_6791 .byte $2C, $21, $33, $34, $00, $33, $34, $21 L_6799 .byte $27, $25, $22, $2F, $2E, $35, $33, $00 L_67A1 .byte $2C, $0A, $11, $10, $10, $10, $1D, $33 .byte $34, $21, $27, $25, $00, $58, $5B, $59 .byte $5A, $58, $5B, $59, $5A, $58, $5B L_67B8 ldy $0605 iny cpy #$1A beq L_67C7 sty L_9F9D+4 sty $0605 rts L_67C7 ldy #$10 sty L_9F9D+4 sty $0605 L_67CF ldy $0604 iny cpy #$1A beq L_67DE sty L_9F9D+3 sty $0604 rts L_67DE ldy #$10 sty L_9F9D+3 sty $0604 L_67E6 ldy $0603 iny cpy #$1A beq L_67F5 sty L_9F9D+2 sty $0603 rts L_67F5 ldy #$10 sty L_9F9D+2 sty $0603 jsr L_4FE0 L_6800 ldy $0602 iny cpy #$1A beq L_680F sty L_9F9D+1 sty $0602 rts L_680F ldy #$10 sty L_9F9D+1 sty $0602 ldy $0601 iny cpy #$1A beq L_6826 sty $0601 sty L_9F9D rts L_6826 ldy #$10 sty $0601 sty L_9F9D ldy $0600 iny cpy #$1A beq L_683C sty L_9F95+7 sty $0600 L_683C rts brk dec LOGCOL L_6840 ldx PLANE_X+2 ldy #$00 lda #$0F sta AUDC4 inc ENEMY_Y+6 lda ENEMY_Y+6 sta AUDF4 cmp #$10 bcs L_686F lda #$26 sta L_407D+1 L_685C lda L_3F32+2,y sta L_3470,x lda L_3F3A+7,y sta L_356D+3,x inx iny cpy #$0D bne L_685C rts L_686F cmp #$20 bcs L_6886 L_6873 lda L_3F1A,y sta L_3470,x lda L_3F22+5,y sta L_356D+3,x inx iny cpy #$0D bne L_6873 rts L_6886 cmp #$30 bcs L_689D L_688A lda L_3EFA+6,y sta L_3470,x lda L_3F0A+3,y sta L_356D+3,x inx iny cpy #$0D bne L_688A rts L_689D cmp #$40 bcs L_68B4 L_68A1 lda L_3F1A,y sta L_3470,x lda L_3F22+5,y sta L_356D+3,x inx iny cpy #$0D bne L_68A1 rts L_68B4 cmp #$50 bcs L_68BB jmp L_685C L_68BB cmp #$80 bcs L_68CE lda #$00 L_68C1 sta L_3470,x sta L_356D+3,x inx iny cpy #$0D bne L_68C1 rts L_68CE lda #$00 sta ENEMY_Y+5 sta AUDC4 dec $062E dec L_9FA5 inc $0698 lda $062E cmp #$10 bpl L_68EC jsr L_555F+1 jmp L_68EF L_68EC jsr L_6CFF+1 L_68EF lda #$75 sta L_407D+1 rts brk adc L_75A9 sta L_407D+1 rts .byte $00, $00, $00 L_6900 lda ENEMY_MOV_TYPE+3 sta $0628 lda M2PL and #$05 bne L_6915 lda M3PL and #$05 bne L_691F rts L_6915 cmp #$02 bpl L_6929 lda ENEMY_MOV_TYPE+3 bpl L_692C rts L_691F cmp #$02 bpl L_6929 lda ENEMY_MOV_TYPE+4 bpl L_692C rts L_6929 jmp L_6A21 L_692C lda ENEMY_MOV_TYPE+7 clc adc #$03 sta $0629 ldy #$07 L_6937 lda $0628 cmp $0629 beq L_6948 inc $0629 dey bne L_6937 jmp L_695F L_6948 lda $0624 bne L_694E rts L_694E lda #$00 sta $0624 sta ENEMY_X+1 inc ENEMY_X+6 ldy ENEMY_MOV_TYPE+7 jmp L_698D L_695F lda ENEMY_Y+1 clc adc #$03 sta $0629 ldy #$07 L_696A lda $0628 cmp $0629 beq L_6979 inc $0629 dey bne L_696A rts L_6979 lda $0627 bne L_697F rts L_697F lda #$00 sta $0627 sta ENEMY_X+3 inc $06A8 ldy ENEMY_Y+1 L_698D dey ldx #$00 L_6990 sta L_33FE+2,y sta L_3500,y sta PMGFX0+3,y sta PMGFX1,y iny inx cpx #$0F bne L_6990 inc $069F lda $069F cmp #$1A bpl L_69AF jmp L_69DB L_69AF lda #$10 sta $069F inc $069E lda $069E cmp #$1A bpl L_69C1 jmp L_69DB L_69C1 lda #$10 sta $069E inc $069D lda $069D cmp #$1A bpl L_69D3 jmp L_69DB L_69D3 lda #$1A sta $069D inc $069C L_69DB ldy ENEMY_MOV_TYPE+3 ldx #$00 L_69E0 lda MISSILE_GFX,y and #$AF sta MISSILE_GFX,y dey inx cpx #$0C bne L_69E0 lda #$00 sta ENEMY_MOV_TYPE+5 sta ENEMY_MOV_TYPE+6 rts L_69F7 lda ENEMY_Y clc adc #$0A tay inc $066D lda $066D cmp #$01 bne L_6A13 lda #$1A sta PMGFX0+3,y lda #$6B sta PMGFX0+2,y rts L_6A13 lda #$34 sta PMGFX0+1,y sta PMGFX0,y lda #$00 sta $066D rts L_6A21 lda ENEMY_Y clc adc #$03 sta $0629 ldy #$07 L_6A2C lda $0628 cmp $0629 beq L_6A3B inc $0629 dey bne L_6A2C rts L_6A3B lda $0625 bne L_6A41 rts L_6A41 lda ENEMY_TYPE cmp #$03 beq L_6A50 cmp #$08 beq L_6A50 cmp #$09 bne L_6A65 L_6A50 inc $06AE lda $06AE cmp #$20 bcs L_6A60 jsr L_69F7 jmp L_69DB L_6A60 lda #$01 sta $0637 L_6A65 lda #$00 sta $0625 sta ENEMY_X+2 sta $06AE inc ENEMY_X+7 lda #$00 ldy ENEMY_Y jmp L_698D .byte $00, $00, $00, $00, $00 L_6A80 lda ENEMY_X+6 bne L_6A86 rts L_6A86 lda #$0F sta AUDC4 ldx ENEMY_MOV_TYPE+7 ldy #$00 inc ENEMY_X+1 lda ENEMY_X+1 sta AUDF4 cmp #$06 bcs L_6AB0 L_6A9D lda L_3F32+2,y sta L_33FE+2,x lda L_3F3A+7,y sta L_3500,x inx iny cpy #$0D bne L_6A9D rts L_6AB0 cmp #$18 bcs L_6AC7 L_6AB4 lda L_3F4A+4,y sta L_33FE+2,x lda L_3F5A+1,y sta L_3500,x inx iny cpy #$0D bne L_6AB4 rts L_6AC7 cmp #$20 bcs L_6ACE jmp L_6A9D L_6ACE lda #$00 L_6AD0 sta L_33FE+2,x sta L_3500,x inx iny cpy #$0D bne L_6AD0 lda #$00 sta ENEMY_X+6 sta AUDC4 sta $062F jsr L_67B8 jsr L_67CF rts .byte $8D, $00, $00, $00, $00, $00, $00 ldx $06BF cpx #$00 bne L_6B0D lda #$EF L_6AFE sta L_ADB8+4 asl TRAMSZ,x bne L_6B34 lda #$28 sta ENEMY_Y sta $0625 L_6B0D lda $0683 sta HPOSP2 sta HPOSP3 sta ENEMY_X lda #$34 sta PCOLR3 lda #$0F sta PCOLR2 lda #$00 sta BIGPLANE_FIRE_TYPE sta ENEMY_MOV_TYPE+1 lda #$0E sta L_542E+1 inc ENEMY_MOV_TYPE rts L_6B34 inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$04 bcc L_6B53 lda #$00 sta ENEMY_MOV_TYPE+1 lda BIGPLANE_FIRE_TYPE bne L_6B4E inc BIGPLANE_FIRE_TYPE jmp L_6B53 L_6B4E lda #$00 sta BIGPLANE_FIRE_TYPE L_6B53 lda $0634 beq L_6B59 rts L_6B59 inc ENEMY_Y lda $0625 beq L_6B64 inc ENEMY_Y L_6B64 jmp L_1D30 .byte $00, $B8, $67 jsr L_67B8 jsr L_67CF rts .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00 L_6B80 lda $06A8 bne L_6B86 rts L_6B86 ldx ENEMY_Y+1 ldy #$00 lda #$0F sta AUDC4 inc ENEMY_X+3 lda ENEMY_X+3 sta AUDF4 cmp #$18 bcs L_6BB0 L_6B9D lda L_3F4A+4,y sta L_33FE+2,x lda L_3F5A+1,y sta L_3500,x inx iny cpy #$0D bne L_6B9D rts L_6BB0 lda #$00 L_6BB2 sta L_33FE+2,x sta L_3500,x inx iny cpy #$0D bne L_6BB2 lda #$00 sta $06A8 sta AUDC4 sta $062F jsr L_67B8 jsr L_67CF rts .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_6C00 lda #$00 sta $0678 sta AUDC3 sta AUDC4 L_6C0B lda #$00 sta CH inc $06AD L_6C13 ldx #$00 L_6C15 lda L_6C61,x sta L_9F7D+4,x inx cpx #$05 bne L_6C15 jsr L_6C52 ldx #$00 L_6C25 lda L_6C61+5,x sta L_9F7D+4,x inx cpx #$05 bne L_6C25 jsr L_6C52 lda $0678 bne L_6C42 lda CH cmp #$0A beq L_6C0B inc $0678 L_6C42 lda CH cmp #$0A bne L_6C13 lda #$00 sta $06AD sta CH rts L_6C52 txa pha ldx #$00 ldy #$00 L_6C58 inx bne L_6C58 iny bne L_6C58 pla tax rts L_6C61 .byte $30, $21, $35, $33, $25, $28, $29, $27 .byte $28, $00, $00, $13, $AD, $3C, $06, $C9 .byte $07, $90, $06, $EE, $3F, $06, $4C, $92 L_6C79 .byte $6C, $EE, $3C, $06, $4C, $92, $6C, $EE .byte $13, $06, $A9, $00, $8D, $14, $06, $60 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00 L_6CA0 lda #$00 sta VSCROL sta $0680 sta $062F sta $06AB sta $06AD sta $0634 sta $0650 sta $0651 sta $0652 sta $0637 sta $0657 sta $0663 sta STAGE_NO+1 sta $06BB sta $06BF sta $06CC lda #$11 sta STAGE_NO+2 jsr L_6C79+7 lda #$FF sta CH ldx #$00 lda #$01 L_6CE3 sta L_9F75+7,x inx cpx #$03 bne L_6CE3 dex stx $062A L_6CEF rts brk adc L_619B+2 stx FR2+2,y cpx #$07 bcc L_6CEF lda $0641 bne L_6D11+1 L_6CFF lda L_901D+3 lsr MVLNG,x brk lda #$07 L_6D07 sta L_3004+3,x inx cpx #$12 bne L_6D07 ldx #$00 L_6D11 lda L_6D2E,x sta L_347D+1,x jsr L_4300 inx cpx #$05 bne L_6D11 lda $069A sta L_3483+1 lda $069B sta L_3483+2 jmp L_560E L_6D2E .byte $33, $34, $21, $27, $25, $00, $3E, $06 .byte $D0, $F5, $BD, $44, $6D sta L_975D+4,x inx L_6D3F cpx #$AD jsr P2PF and (LELNUM),y bit TRAMSZ bne L_6D52 lda $0625 bne L_6D5A jmp L_6DC5 L_6D52 lda ENEMY_MOV_TYPE+7 ldx BIGPLANE_FIRE_TYPE+1 bne L_6D60 L_6D5A lda ENEMY_Y ldx ENEMY_X L_6D60 clc adc #$0D sta $061E txa clc adc #$03 sta HPOSM0 sta $0622 sta $0620 jmp L_6DC5 ldy $061E ldx #$00 L_6D7B lda MISSILE_GFX,y and #$FE sta MISSILE_GFX,y iny inx cpx #$03 bne L_6D7B inc $061E inc $061E lda $061E cmp #$B0 bcc L_6D9D lda #$00 sta $0620 beq L_6DC5 L_6D9D jsr L_6E1E inc $0626 lda $0626 cmp #$06 bcc L_6DC5 lda #$00 sta $0626 lda PLANE_X cmp $0622 bcs L_6DBC dec $0622 bne L_6DBF L_6DBC inc $0622 L_6DBF lda $0622 sta HPOSM0 L_6DC5 lda $0621 bne L_6DF4 lda $0625 bne L_6DD5 lda $0627 bne L_6DDD rts L_6DD5 lda ENEMY_Y ldx ENEMY_X bne L_6DE3 L_6DDD lda ENEMY_Y+1 ldx ENEMY_X+1 L_6DE3 clc adc #$0D sta $061F inx stx HPOSM1 stx $0623 stx $0621 rts L_6DF4 ldy $061F ldx #$00 L_6DF9 lda MISSILE_GFX,y and #$FB sta MISSILE_GFX,y iny inx cpx #$03 bne L_6DF9 inc $061F inc $061F lda $061F cmp #$B0 bcc L_6E1A lda #$00 sta $0621 rts L_6E1A jsr L_6E30 rts L_6E1E tax ldy #$00 L_6E21 lda MISSILE_GFX,x ora #$01 sta MISSILE_GFX,x inx iny cpy #$03 bne L_6E21 rts L_6E30 tax ldy #$00 L_6E33 lda MISSILE_GFX,x ora #$04 sta MISSILE_GFX,x inx iny cpy #$03 bne L_6E33 rts brk lda $0620 cmp #$02 bcs L_6E4B rts L_6E4B lda $0643 bne L_6E68+1 L_6E50 lda STAGE_NO+1 cmp #$01 bne L_6E66 sta STAGE_NO+6 sta STAGE_NO+7 lda #$B0 sta $06BA inc STAGE_NO+1 rts L_6E66 cmp #$02 L_6E68 bne L_6E78 dec $06BA lda $06BA cmp #$81 bcs L_6EC2 inc STAGE_NO+1 rts L_6E78 cmp #$03 bne L_6E9A inc STAGE_NO+6 lda STAGE_NO+6 beq L_6E87 jmp L_6EC2 L_6E87 inc STAGE_NO+7 lda STAGE_NO+7 cmp #$05 bcc L_6EC2 lda #$00 sta STAGE_NO+7 inc STAGE_NO+1 rts L_6E9A inc $06BA lda $06BA cmp #$B0 bcc L_6EC2 lda #$11 sta STAGE_NO+2 lda #$00 sta STAGE_NO+1 sta STAGE_NO+4 ldy $06BA tax L_6EB5 sta L_33FE+2,y sta L_3500,y iny inx cpx #$0E bne L_6EB5 rts L_6EC2 ldy $06BA ldx #$00 lda $060E bne L_6EF7 lda $060D bne L_6EE4 L_6ED1 lda L_419B+5,x sta L_33FE+2,y lda L_41AB+3,x sta L_3500,y iny inx cpx #$0E bne L_6ED1 rts L_6EE4 lda L_419B+5,x sta L_33FE+2,y lda L_41BB+2,x sta L_3500,y iny inx cpx #$0E bne L_6EE4 rts L_6EF7 cmp #$01 bne L_6F26 lda $060D bne L_6F13 L_6F00 lda L_6F51,x sta L_33FE+2,y lda L_6F59+6,x sta L_3500,y iny inx cpx #$0E bne L_6F00 rts L_6F13 lda L_6F51,x sta L_33FE+2,y lda L_6F69+4,x sta L_3500,y iny inx cpx #$0E bne L_6F13 rts L_6F26 lda $060D bne L_6F3E L_6F2B lda L_41CB+1,x sta L_33FE+2,y lda L_41DB,x sta L_3500,y iny inx cpx #$0E bne L_6F2B rts L_6F3E lda L_41CB+1,x sta L_33FE+2,y lda L_41E3+7,x sta L_3500,y iny inx cpx #$0E bne L_6F3E rts L_6F51 .byte $00, $00, $00, $10, $7C, $D6, $BA, $7C L_6F59 .byte $10, $10, $28, $54, $38, $00, $00, $38 .byte $00, $00, $00, $28, $44, $00, $00, $00 L_6F69 .byte $10, $28, $00, $00, $00, $10, $00, $00 .byte $00, $28, $44, $00, $00, $00, $10, $28 .byte $00, $00, $00, $00, $28, $44, $00, $00 .byte $00, $10, $28, $00, $00, $00, $E8, $E0 L_6F89 .byte $08, $D0, $F5, $60, $0A, $05, $05, $08 L_6F91 .byte $2A, $30, $51, $79, $3E, $08, $08, $08 L_6F99 .byte $14, $36, $1C, $00, $41, $00, $0E, $2E .byte $06, $00, $00, $00, $00, $08, $08, $00 L_6FA9 .byte $00, $3E, $08, $2A, $16, $15, $4F, $3E L_6FB1 .byte $08, $08, $08, $14, $36, $1C, $44, $00 .byte $68, $EA, $20, $00, $00, $00, $00, $08 L_6FC1 .byte $08, $00, $00, $08, $08, $36, $55, $3E .byte $08, $08, $08, $1C, $00, $00, $00, $00 L_6FD1 .byte $00, $08, $14, $36, $1C, $08, $08, $1C L_6FD9 .byte $00, $00, $00, $00, $00, $00, $00, $08 .byte $14, $08, $08, $08, $00, $00, $00, $00 .byte $00, $00, $00, $14, $48, $12, $48, $00 .byte $12, $24, $10, $00, $00, $00, $00, $D0 .byte $F5, $60, $C9, $78, $D0, $0E, $A2, $00 .byte $00, $00, $00, $00, $00, $00, $00, $FF .byte $7F, $39, $38, $38, $38, $39, $3F, $C0 .byte $E0, $F0, $F0, $F0, $F0, $F0, $E0, $00 .byte $00, $00, $00, $00, $00, $1E, $3F, $3F .byte $3B, $39, $38, $38, $38, $7C, $FE, $C0 .byte $C0, $E0, $F0, $78, $7E, $7E, $3C, $67 .byte $E3, $FE, $FC, $E0, $73, $3F, $1E, $00 .byte $03, $01, $01, $01, $01, $1D, $3F, $E0 .byte $C0, $C0, $C0, $C0, $C0, $C0, $C0, $79 .byte $70, $70, $70, $70, $39, $3F, $1E, $C0 .byte $C0, $C0, $C0, $C0, $C0, $E0, $F0, $00 .byte $00, $00, $00, $00, $00, $1F, $7F, $00 .byte $00, $01, $03, $03, $07, $0F, $83, $00 .byte $00, $C0, $C0, $C0, $F0, $E0, $C0, $61 .byte $0F, $3F, $7D, $71, $71, $3F, $1E, $C3 .byte $C3, $C3, $C3, $C3, $C1, $F0, $E0, $C0 .byte $C0, $C0, $C0, $E0, $F0, $FE, $3C, $3E .byte $7E, $E6, $C2, $C0, $C0, $7C, $3E, $00 .byte $00, $00, $00, $1E, $3F, $73, $E1, $07 .byte $0F, $1C, $1C, $7F, $1C, $9C, $DC, $0E .byte $06, $86, $CE, $FC, $F8, $00, $00, $E1 .byte $E1, $E1, $73, $3F, $1E, $00, $00, $DC .byte $DC, $DC, $9C, $1C, $3E, $00, $00, $C0 .byte $E0, $6E, $1F, $3F, $0E, $0E, $0E, $00 .byte $00, $00, $80, $00, $3D, $1C, $1C, $00 .byte $00, $00, $00, $00, $F7, $E6, $E6, $0E .byte $0E, $0E, $0F, $07, $03, $00, $00, $0E .byte $0E, $0E, $0E, $E7, $C7, $00, $00, $66 .byte $66, $66, $6C, $9C, $98, $00, $00, $00 .byte $00, $00, $00, $00, $7C, $FF, $C7, $00 .byte $00, $00, $00, $00, $1B, $3F, $0E, $00 .byte $00, $00, $00, $00, $E0, $F1, $3B, $0F .byte $37, $67, $C7, $C7, $7B, $00, $00, $0E .byte $0E, $0E, $0E, $CE, $9F, $00, $00, $03 .byte $03, $03, $03, $01, $00, $00, $00, $00 .byte $00, $00, $00, $00, $F8, $FC, $0C, $FC .byte $78, $00, $0C, $FC, $F8, $00, $00, $01 .byte $00, $00, $00, $00, $00, $00, $00, $FC .byte $F8, $70, $70, $70, $70, $70, $70, $00 .byte $06, $0F, $1F, $0E, $0E, $0E, $0E, $05 .byte $05, $05, $05, $05, $01, $00, $00, $70 .byte $70, $70, $71, $FF, $FF, $00, $00, $0E .byte $0E, $EF, $E7, $E7, $E3, $00, $00, $00 .byte $00, $80, $00, $00, $01, $03, $07, $03 .byte $0F, $03, $03, $7B, $FF, $8F, $07, $C0 .byte $00, $00, $00, $00, $00, $00, $00, $07 .byte $07, $07, $87, $E3, $C1, $00, $00, $07 .byte $07, $07, $07, $CF, $FB, $00, $00, $00 .byte $00, $00, $00, $C0, $80, $00, $00, $FB .byte $22, $22, $22, $22, $00, $00, $00, $60 .byte $A0, $A0, $20, $20, $00, $00, $00, $03 .byte $07, $03, $01, $0F, $1F, $F0, $7F, $E0 .byte $F0, $E0, $C1, $FF, $FF, $00, $FF, $00 .byte $00, $E0, $F0, $FF, $FF, $00, $FF, $3F .byte $3F, $1F, $0F, $3F, $2C, $FC, $FF, $FF .byte $87, $78, $8D, $F0, $FD, $78, $FF, $FF .byte $0E, $F1, $FB, $00, $FB, $F1, $FF, $00 .byte $00, $18, $3D, $FF, $FF, $00, $FF, $00 .byte $7F, $7F, $F1, $F1, $F1, $71, $7F, $00 .byte $85, $17, $7F, $7F, $7F, $60, $7F, $FF .byte $1F, $E7, $F3, $30, $F0, $E0, $FF, $7F .byte $BF, $C1, $FF, $FC, $D8, $70, $FF, $7F .byte $7F, $60, $3F, $1F, $1B, $0E, $FF, $00 .byte $99, $66, $FF, $FF, $FF, $00, $FF, $00 .byte $10, $A8, $FC, $FC, $FF, $01, $FC, $00 .byte $01, $03, $07, $06, $C6, $C6, $46, $FF .byte $FF, $00, $FF, $7D, $6D, $38, $FF, $FF .byte $FF, $00, $FF, $F7, $B6, $E3, $FF, $46 .byte $46, $57, $FF, $D1, $C1, $80, $FF, $00 .byte $FF, $55, $FF, $1F, $18, $18, $18, $00 .byte $FF, $55, $FF, $FF, $18, $18, $18, $00 .byte $FF, $55, $FF, $FF, $18, $18, $18, $1F .byte $1F, $1F, $FF, $F7, $B6, $E3, $FF, $FF .byte $FF, $F3, $FC, $C7, $C0, $80, $FF, $FF .byte $FF, $FF, $00, $FF, $00, $00, $FF, $00 .byte $FF, $55, $FF, $FF, $18, $18, $18, $FF .byte $FF, $FF, $00, $FF, $00, $00, $FF, $00 .byte $FF, $AA, $FF, $FF, $18, $18, $18, $00 .byte $FF, $AA, $FF, $FF, $1F, $1F, $1F, $00 .byte $C0, $A0, $F0, $16, $16, $16, $16, $FF .byte $FF, $CF, $3F, $E3, $03, $01, $FF, $FF .byte $FF, $FF, $FF, $EF, $6D, $C7, $FF, $16 .byte $10, $FA, $FF, $82, $80, $00, $FF, $00 .byte $3F, $55, $FF, $8F, $8C, $8C, $8C, $00 .byte $FF, $55, $FF, $FF, $18, $18, $18, $00 .byte $FF, $55, $FF, $FF, $18, $18, $18, $8F .byte $8F, $8F, $FF, $7D, $6D, $38, $FF, $FF .byte $FF, $F3, $FC, $F7, $B0, $E0, $FF, $FF .byte $FF, $FF, $00, $FF, $00, $00, $FF, $00 .byte $00, $00, $00, $00, $00, $00, $FF, $00 .byte $00, $00, $00, $00, $00, $00, $01, $00 .byte $00, $00, $00, $15, $AA, $90, $40, $00 .byte $00, $00, $A4, $52, $20, $94, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $1F, $1F, $0F, $0F, $1F .byte $3F, $3F, $3F, $FF, $E1, $ED, $E1, $EB .byte $ED, $FF, $FF, $FC, $F8, $F0, $E0, $E0 .byte $E0, $C0, $80, $1F, $0F, $0F, $B7, $D7 .byte $0D, $11, $25, $BF, $5E, $5E, $6C, $4E .byte $0D, $07, $02, $00, $00, $00, $00, $00 .byte $00, $40, $A0, $5A, $74, $01, $0A, $20 .byte $00, $00, $00, $21, $81, $00, $0A, $10 .byte $00, $00, $00, $50, $50, $00, $00, $00 .byte $00, $00, $00, $00, $00, $01, $00, $01 .byte $02, $05, $05, $00, $80, $A4, $75, $7A .byte $80, $00, $00, $04, $02, $00, $00, $00 .byte $00, $00, $00, $A0, $D0, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_73F9 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $01, $02, $03, $07 .byte $08, $01, $02, $0B, $0C, $0D, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $04, $05, $06, $09, $0A, $04, $05, $0E .byte $0F, $10, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $11, $12, $13, $17, $18, $19, $1D .byte $1E, $1F, $23, $5F, $60, $61, $25, $26 .byte $27, $2B, $2C, $2D, $31, $32, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $14, $15, $16, $1A, $1B, $1C, $20 .byte $21, $22, $24, $62, $63, $64, $00, $29 .byte $2A, $2E, $2F, $30, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_74F9 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $30, $00, $32, $00, $25 .byte $00, $33, $00, $25, $00, $2E, $00, $34 .byte $00, $33, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $02, $33, $23, $32, $25, $21, $2D .byte $29, $2E, $27, $00, $37, $29, $2E, $27 .byte $33, $02, $00, $00, $00, $00, $00, $00 L_75A9 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $08, $23, $09 .byte $32, $25, $24, $00, $32, $21, $34, $00 .byte $33, $2F, $26, $34, $37, $21, $32, $25 L_75F9 .byte $00, $2C, $34, $24, $08, $11, $19, $18 .byte $16, $09, $00, $00, $00, $00, $00, $00 .byte $00, $51, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $45, $00, $00 .byte $00, $34, $28, $25, $2D, $25, $00, $00 .byte $2D, $35, $33, $29, $23, $00, $00, $2F L_7641 .byte $2E, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_7659 .byte $00, $00, $0E, $0E, $0E, $0E, $0E, $00 .byte $28, $21, $33, $00, $34, $2F, $24, $21 .byte $39, $33, $00, $34, $2F, $30, $00, $33 L_7671 .byte $23, $2F, $32, $25, $1A, $10, $10, $10 .byte $10, $10, $10, $10, $00, $00, $00, $00 .byte $00, $5A, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $43, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $30, $32, $2F, $27, $32, $21, $2D .byte $00, $22, $39, $00, $30, $21, $35, $2C .byte $00, $23, $32, $21, $36, $25, $2E, $00 .byte $00, $00, $12, $10, $12, $10, $00, $36 .byte $25, $32, $33, $29, $2F, $2E, $00, $00 L_76F9 .byte $00, $2D, $35, $33, $29, $23, $00, $22 .byte $39, $00, $24, $21, $36, $25, $00, $26 .byte $2F, $32, $37, $21, $32, $24, $00, $00 .byte $00, $26, $32, $21, $2E, $23, $2F, $00 .byte $23, $21, $34, $32, $29, $2E, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00 lda LOADFLG bne L_77C8 lda WARMST bne L_780D L_77C8 ldx #$FF txs cld ldx L_02E2+5 ldy L_02E2+6 stx LOMEM sty LOMEM+1 lda #$00 sta MEOLFLG sta LOADFLG iny txa ldx #$82 L_77E0 sta LNFLG,x inx sty LNFLG,x inx cpx #$92 bcc L_77E0 ldx #$86 ldy #$01 jsr L_A878+2 ldx #$8C ldy #$03 jsr L_A878+2 lda #$00 tay sta (VNTD),y sta (STMCUR),y iny L_7800 lda #$00 sta SDMCTL sta $060E lda #$FF sta PCOLR0 L_780D jsr L_7954 ldx #$00 txa L_7813 sta L_9E6D+3,x sta L_9EAD+3,x inx bne L_7813 L_781C sta HPOSP0,x inx cpx #$08 bne L_781C lda #$70 sta SAVMSC lda #$9E sta SAVMSC+1 sta COLOR0 sta SDLSTH lda #$58 sta SDLSTL ldx #$00 L_7839 lda L_7985,x sta L_9E55+3,x inx cpx #$18 bne L_7839 ldx #$04 ldy #$21 L_7848 lda #$00 sta ENEMY_MOV_TYPE+1 L_784D tya sta L_9E6D+3,x inx inx iny cpy #$3B beq L_786A inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$06 bne L_784D txa clc adc #$1C tax jmp L_7848 L_786A lda #$0A sta L_9E6D+3,x ldy #$00 lda #$0E L_7873 inx inx sta L_9E6D+3,x iny cpy #$03 bne L_7873 ldx #$00 L_787F lda $0600,x sta L_9F5D+6,x inx cpx #$06 bne L_787F ldx #$00 L_788C lda L_797D,x sta L_9F65+4,x inx cpx #$08 bne L_788C lda #$3A sta SDMCTL lda #$50 sta HPOSP0 sta PLANE_X ldy #$1C sty ENEMY_MOV_TYPE+3 jsr L_795E L_78AC lda $060E cmp #$05 bmi L_78C6 ldx #$00 L_78B5 lda L_9F65+7,x sta $065E,x inx cpx #$05 bne L_78B5 L_78C0 lda STRIG0 beq L_78C0 rts L_78C6 lda STICK0 cmp #$07 beq L_7903 cmp #$0B beq L_78E7 cmp #$0E beq L_791C cmp #$0D beq L_7938 lda STRIG0 bne L_78AC jsr L_5B00 jsr L_796F jmp L_78AC L_78E7 lda PLANE_X cmp #$60 bcs L_78F1 jmp L_78AC L_78F1 lda PLANE_X sec sbc #$10 sta PLANE_X sta HPOSP0 jsr L_796F jmp L_78AC L_7903 lda PLANE_X cmp #$9F bcc L_790D jmp L_78AC L_790D clc adc #$10 sta PLANE_X sta HPOSP0 jsr L_796F jmp L_78AC L_791C lda ENEMY_MOV_TYPE+3 cmp #$20 bcs L_7926 jmp L_78AC L_7926 jsr L_7954 lda ENEMY_MOV_TYPE+3 sec sbc #$20 sta ENEMY_MOV_TYPE+3 jsr L_795E jmp L_78AC L_7938 lda ENEMY_MOV_TYPE+3 cmp #$9C bcc L_7942 jmp L_78AC L_7942 jsr L_7954 lda ENEMY_MOV_TYPE+3 clc adc #$20 sta ENEMY_MOV_TYPE+3 jsr L_795E jmp L_78AC L_7954 ldx #$00 txa L_7957 sta L_33FE+2,x inx bne L_7957 rts L_795E ldx #$00 ldy ENEMY_MOV_TYPE+3 L_7963 lda L_7995+7,x sta L_33FE+2,y iny inx cpx #$19 bne L_7963 L_796F jsr L_561C ldy #$00 ldx #$00 L_7976 inx bne L_7976 iny bne L_7976 rts L_797D .byte $10, $0E, $0E, $0A, $0A, $0A, $0A, $0A L_7985 .byte $70, $70, $70, $47, $70, $9E, $07, $07 .byte $07, $07, $07, $07, $07, $07, $07, $06 L_7995 .byte $06, $06, $06, $06, $41, $58, $9E, $18 .byte $18, $7E, $3C, $18, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $18, $3C, $7E, $18, $18 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $22, $0C .byte $0C, $0C, $01, $0F, $10, $01, $0C, $3B .byte $3C, $24, $2B, $3A, $39, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $39, $3A, $3A, $3A, $39, $3A, $39, $39 .byte $3A, $3A, $39, $3A, $3A, $33, $22, $3F .byte $40, $0C, $01, $11, $12, $01, $0C, $04 .byte $05, $24, $0C, $2B, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $3A, $3A .byte $39, $39, $3A, $39, $39, $3A, $22, $3D .byte $3E, $0C, $01, $23, $0C, $01, $3B, $3C .byte $0C, $24, $25, $26, $39, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $39, $3A, $3A, $3A, $39, $3A, $39, $39 .byte $3A, $3A, $39, $3A, $3A, $39, $22, $0C .byte $0C, $0C, $01, $23, $0C, $01, $04, $05 .byte $0C, $24, $27, $28, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $3A, $3A .byte $39, $39, $3A, $39, $39, $3A, $22, $03 .byte $03, $03, $02, $03, $03, $02, $03, $03 .byte $03, $24, $27, $28, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $39, $3A, $39, $39 .byte $3A, $3A, $39, $3A, $3A, $13, $22, $3F .byte $40, $0C, $01, $23, $0C, $01, $0C, $0C .byte $0C, $24, $27, $28, $39, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $22, $3D .byte $3E, $0C, $01, $23, $0C, $01, $0C, $3B .byte $3C, $24, $27, $28, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $39, $3A, $39, $39 .byte $3A, $3A, $39, $3A, $3A, $13, $22, $3F .byte $40, $0C, $01, $23, $0C, $01, $0C, $04 .byte $05, $24, $29, $2A, $39, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $22, $3D .byte $3E, $0C, $01, $23, $0C, $01, $0C, $3B .byte $3C, $24, $0C, $2C, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $39, $3A, $39, $39 .byte $3A, $3A, $39, $3A, $3A, $39, $22, $3F .byte $40, $0C, $01, $23, $0C, $01, $0C, $04 .byte $05, $24, $2C, $3A, $39, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $22, $3D .byte $3E, $0C, $01, $0F, $10, $01, $0C, $3B .byte $3C, $24, $3A, $39, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $39, $3A, $39, $39 .byte $3A, $3A, $39, $3A, $3A, $39, $22, $0C .byte $0C, $0C, $01, $11, $12, $01, $0C, $04 .byte $05, $24, $39, $3A, $39, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $3A .byte $39, $39, $3A, $39, $39, $3A, $22, $03 .byte $03, $03, $02, $03, $03, $02, $03, $03 .byte $03, $24, $37, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $39, $3A, $39, $39 .byte $3A, $3A, $39, $3A, $3A, $39, $22, $3F .byte $40, $0C, $01, $23, $0C, $01, $0C, $0C .byte $0C, $24, $3A, $39, $39, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $22, $3D .byte $3E, $0C, $01, $30, $31, $01, $0C, $3B .byte $3C, $24, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $39, $3A, $39, $39 .byte $3A, $3A, $39, $3A, $3A, $39, $22, $3F .byte $40, $0C, $01, $32, $36, $01, $0C, $04 .byte $05, $24, $3A, $39, $39, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $22, $3D .byte $3E, $0C, $01, $23, $0C, $01, $0C, $0C .byte $0C, $24, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $39, $3A, $39, $39 .byte $3A, $3A, $39, $3A, $3A, $39, $34, $35 .byte $35, $35, $35, $35, $35, $35, $35, $35 .byte $35, $36, $38, $39, $39, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $39, $3A, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $00, $00, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $49, $4A .byte $4B, $3A, $39, $3A, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $4E, $4F .byte $50, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $49, $4A, $14, $4A, $4B, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $49 .byte $4A, $14, $15, $14, $15, $19, $4A, $4B .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $49, $14 .byte $14, $15, $16, $14, $15, $14, $18, $0C .byte $50, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $4D, $0C .byte $14, $15, $14, $16, $16, $15, $15, $19 .byte $4A, $4B, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $49, $14, $15 .byte $16, $16, $15, $14, $14, $16, $15, $15 .byte $19, $4A, $4B, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $4D, $14, $15, $16 .byte $15, $15, $14, $16, $16, $15, $14, $14 .byte $18, $0C, $50, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $15, $15, $14, $16 .byte $16, $15, $14, $14, $15, $16, $16, $15 .byte $19, $0C, $4A, $4B, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $16, $14, $15, $15 .byte $14, $15, $14, $15, $14, $15, $16, $14 .byte $15, $19, $0C, $0C, $4A, $4B, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $16, $15, $14, $14 .byte $14, $15, $16, $15, $16, $15, $15, $16 .byte $15, $14, $19, $0C, $0C, $50, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $15, $16, $18, $15 .byte $16, $14, $15, $16, $14, $16, $14, $15 .byte $16, $15, $14, $18, $0C, $4B, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $19, $14, $15, $16 .byte $16, $15, $14, $14, $15, $16, $15, $16 .byte $14, $15, $16, $19, $4F, $50, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $18, $19, $15, $14 .byte $16, $16, $15, $14, $15, $16, $15, $14 .byte $15, $16, $15, $18, $4B, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $14, $15, $16, $15 .byte $16, $15, $16, $16, $15, $15, $16, $14 .byte $15, $15, $16, $16, $19, $4B, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $39 .byte $3A, $39, $3A, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $15, $14, $15, $16 .byte $15, $16, $15, $15, $16, $16, $15, $16 .byte $14, $14, $15, $17, $18, $50, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $14, $14, $16, $15 .byte $16, $14, $14, $14, $14, $16, $15, $16 .byte $15, $16, $18, $4F, $50, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $18, $18, $15, $15 .byte $15, $14, $15, $14, $15, $16, $14, $18 .byte $18, $15, $50, $3A, $39, $39, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $15, $16, $14, $18 .byte $15, $16, $18, $15, $16, $18, $14, $15 .byte $16, $4C, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $15, $16, $14, $14 .byte $15, $16, $14, $14, $16, $14, $18, $14 .byte $16, $15, $4A, $4B, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $18, $14, $16, $15 .byte $14, $16, $14, $15, $16, $16, $14, $15 .byte $14, $16, $15, $19, $4A, $4B, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $16, $15, $14, $18 .byte $16, $15, $14, $18, $16, $15, $14, $18 .byte $16, $15, $14, $16, $18, $4C, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $14, $15, $16, $14 .byte $15, $16, $14, $15, $16, $14, $15, $16 .byte $14, $15, $16, $18, $4F, $50, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $15, $14, $16, $15 .byte $14, $16, $15, $14, $16, $15, $14, $16 .byte $15, $14, $18, $4C, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $16, $15, $14, $16 .byte $15, $14, $16, $15, $14, $16, $15, $14 .byte $16, $18, $4F, $50, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $18, $14, $15, $16 .byte $16, $15, $14, $14, $15, $16, $16, $14 .byte $18, $4B, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $14, $18, $16, $15 .byte $14, $18, $16, $15, $14, $18, $15, $18 .byte $4F, $50, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $16, $15, $14, $16 .byte $15, $14, $16, $15, $14, $17, $18, $4C .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $39, $3A, $15, $14, $16, $15 .byte $14, $16, $15, $17, $18, $0C, $0C, $50 .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $14, $15, $16, $15 .byte $14, $15, $18, $0C, $0C, $4F, $50, $39 .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $15, $14, $16, $16 .byte $17, $18, $0C, $0C, $4F, $4B, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $16, $16, $15, $18 .byte $0C, $0C, $4F, $50, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $17, $17, $18, $0C .byte $4F, $50, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $4F, $4F, $4F, $50 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $49, $4A .byte $4B, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $49, $0C, $15 .byte $19, $49, $4A, $4B, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $49, $16, $17, $15 .byte $15, $19, $14, $19, $4B, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $49, $14, $16, $15, $15 .byte $14, $15, $14, $18, $19, $4B, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $4E, $16, $15, $14, $16 .byte $16, $19, $18, $14, $15, $19, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $4E, $17, $15, $14 .byte $16, $18, $16, $15, $16, $50, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $4E, $17, $19 .byte $15, $19, $14, $19, $50, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $4E, $17 .byte $16, $49, $4F, $50, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $39, $3A, $39, $3A, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $39 .byte $3A, $39, $3A, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $3A, $3A .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $3A, $3A, $39, $3A .byte $39, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A L_8FDD .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A L_901D .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A L_90A5 .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $49, $4A, $4B, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $49, $0C, $15, $19, $49, $4A, $4B .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $49, $16, $17, $15, $15, $19, $14, $19 .byte $4B, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $49 .byte $14, $16, $15, $15, $14, $15, $14, $18 .byte $19, $4B, $39, $3A, $39, $3A, $39, $3A L_916D .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $4E .byte $16, $15, $14, $16, $16, $19, $18, $14 .byte $15, $19, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $4E, $17, $15, $14, $16, $18, $16, $15 .byte $16, $50, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $4E, $17, $19, $15, $19, $14, $19 .byte $50, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $4E, $17, $16, $49, $4F, $50 .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $39, $3A, $39, $3A .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A L_954D .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $39, $3A, $46, $47 .byte $47, $47, $47, $47, $47, $48, $3A, $39 .byte $3A, $39, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $43, $44, $44 .byte $44, $44, $44, $44, $44, $44, $45, $39 .byte $3A, $39, $3A, $39, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $1E, $0C, $0C, $0C .byte $0C, $0C, $0C, $0C, $0C, $0C, $0C, $21 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $3F, $40, $0C .byte $01, $1F, $20, $01, $0C, $0C, $0C, $24 .byte $3A, $39, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $3D, $3E, $0C .byte $01, $2D, $2E, $01, $0C, $3B, $3C, $24 .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $0C, $3F, $40 .byte $01, $23, $0C, $01, $0C, $04, $05, $24 .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A L_975D .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $0C, $3D, $3E .byte $01, $23, $0C, $01, $0C, $3B, $3C, $24 .byte $3A, $39, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $3F, $40, $0C .byte $01, $23, $0C, $01, $0C, $04, $05, $24 .byte $3A, $39, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $3D, $3E, $0C .byte $01, $23, $0C, $01, $0C, $3B, $3C, $24 .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $0C, $3F, $40 .byte $01, $23, $0C, $01, $0C, $04, $05, $24 .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $0C, $3D, $3E .byte $01, $23, $0C, $01, $0C, $3B, $3C, $24 .byte $3A, $39, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $22, $0C, $0C, $0C .byte $01, $23, $0C, $01, $0C, $04, $05, $24 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $3A, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $03, $03, $03 .byte $02, $03, $03, $02, $03, $03, $03, $24 .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A L_9875 .byte $39, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $22, $0C, $0C, $0C .byte $01, $0F, $10, $01, $0C, $3B, $3C, $24 .byte $2B, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $33, $22, $3F, $40, $0C .byte $01, $11, $12, $01, $0C, $04, $05, $24 .byte $0C, $2B, $3A, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $3A, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $3D, $3E, $0C .byte $01, $23, $0C, $01, $3B, $3C, $0C, $24 .byte $25, $26, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $22, $0C, $0C, $0C .byte $01, $23, $0C, $01, $04, $05, $0C, $24 .byte $27, $28, $3A, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $39, $3A, $39, $3A, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $03, $03, $03 .byte $02, $03, $03, $02, $03, $03, $03, $24 .byte $27, $28, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $13, $22, $3F, $40, $0C .byte $01, $23, $0C, $01, $0C, $0C, $0C, $24 .byte $27, $28, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $3D, $3E, $0C .byte $01, $23, $0C, $01, $0C, $3B, $3C, $24 .byte $27, $28, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $13, $22, $3F, $40, $0C .byte $01, $23, $0C, $01, $0C, $04, $05, $24 .byte $29, $2A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $3D, $3E, $0C .byte $01, $23, $0C, $01, $0C, $3B, $3C, $24 .byte $0C, $2C, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $22, $3F, $40, $0C .byte $01, $23, $0C, $01, $0C, $04, $05, $24 .byte $2C, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $3D, $3E, $0C .byte $01, $0F, $10, $01, $0C, $3B, $3C, $24 .byte $3A, $39, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $22, $0C, $0C, $0C .byte $01, $11, $12, $01, $0C, $04, $05, $24 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $3A, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $03, $03, $03 .byte $02, $03, $03, $02, $03, $03, $03, $24 .byte $37, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $22, $3F, $40, $0C .byte $01, $23, $0C, $01, $0C, $0C, $0C, $24 .byte $3A, $39, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $3D, $3E, $0C .byte $01, $30, $31, $01, $0C, $3B, $3C, $24 .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $22, $3F, $40, $0C .byte $01, $32, $36, $01, $0C, $04, $05, $24 .byte $3A, $39, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $22, $3D, $3E, $0C .byte $01, $23, $0C, $01, $0C, $0C, $0C, $24 .byte $39, $3A, $3A, $3A, $3A, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $3A, $39, $3A, $39, $39, $3A, $3A .byte $39, $3A, $3A, $39, $34, $35, $35, $35 .byte $35, $35, $35, $35, $35, $35, $35, $36 .byte $38, $39, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $70, $70, $70, $44, $A0, $9B, $04 .byte $04, $04, $04, $04, $04, $04, $04, $04 .byte $04, $04, $04, $04, $04, $04, $04, $04 .byte $04, $04, $42, $60, $9F, $02, $02, $02 L_9B9D .byte $41, $7E, $9B, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9C1D .byte $00, $00, $00, $70, $70, $70, $42, $40 L_9C25 .byte $9C, $02, $06, $06, $02, $02, $82, $02 L_9C2D .byte $02, $02, $02, $07, $07, $02, $02, $02 L_9C35 .byte $06, $06, $02, $02, $02, $02, $02, $02 L_9C3D .byte $41, $20, $9C, $00, $00, $00, $00, $00 L_9C45 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9C65 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9C8D .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $01, $02, $03, $07, $08, $01, $02, $0B L_9C9D .byte $0C, $0D, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $04, $05, $06, $09 .byte $0A, $04, $05, $0E, $0F, $10, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9CE5 .byte $00, $00, $00, $00, $00, $11, $12, $13 .byte $17, $18, $19, $1D, $1E, $1F, $23, $5F .byte $60, $61, $25, $26, $27, $2B, $2C, $2D .byte $31, $32, $00, $00, $00, $00, $00, $00 L_9D05 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $14, $15, $16 .byte $1A, $1B, $1C, $20, $21, $22, $24, $62 .byte $63, $64, $00, $29, $2A, $2E, $2F, $30 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9D2D .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9D3D .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $30 .byte $00, $32, $00, $25, $00, $33, $00, $25 .byte $00, $2E, $00, $34, $00, $33, $00, $00 L_9D9D .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $02, $33, $23 .byte $32, $25, $21, $2D, $29, $2E, $27, $00 .byte $37, $29, $2E, $27, $33, $02, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $08, $23, $09, $32, $25, $24, $00 .byte $32, $21, $34, $00, $33, $2F, $26, $34 .byte $37, $21, $32, $25, $00, $2C, $34, $24 L_9E3D .byte $08, $11, $19, $18, $16, $09, $00, $00 .byte $00, $00, $00, $00, $00, $51, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 L_9E55 .byte $52, $52, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 L_9E6D .byte $52, $45, $00, $00, $00, $34, $28, $25 .byte $2D, $25, $00, $00, $2D, $35, $33, $29 L_9E7D .byte $23, $00, $00, $2F, $2E, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $0E, $0E .byte $0E, $0E, $0E, $00, $28, $21, $33, $00 .byte $34, $2F, $24, $21, $39, $33, $00, $34 L_9EAD .byte $2F, $30, $00, $33, $23, $2F, $32, $25 .byte $1A, $10, $10, $10, $10, $10, $10, $10 .byte $00, $00, $00, $00, $00, $5A, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 .byte $52, $52, $52, $52, $52, $52, $52, $52 .byte $52, $43, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $30, $32, $2F .byte $27, $32, $21, $2D, $00, $22, $39, $00 .byte $30, $21, $35, $2C, $00, $23, $32, $21 .byte $36, $25, $2E, $00, $00, $00, $12, $10 .byte $12, $10, $00, $36, $25, $32, $33, $29 .byte $2F, $2E, $00, $00, $00, $2D, $35, $33 L_9F3D .byte $29, $23, $00, $22, $39, $00, $24, $21 .byte $36, $25, $00, $26, $2F, $32, $37, $21 .byte $32, $24, $00, $00, $00, $26, $32, $21 .byte $2E, $23, $2F, $00, $23, $21, $34, $32 L_9F5D .byte $29, $2E, $00, $00, $00, $00, $00, $00 L_9F65 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9F6D .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9F75 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9F7D .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9F85 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9F95 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9F9D .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9FA5 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_9FAD .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00 lda LOADFLG bne L_A008 lda WARMST bne L_A048+5 L_A008 ldx #$FF txs cld ldx L_02E2+5 ldy L_02E2+6 stx LOMEM sty LOMEM+1 lda #$00 sta MEOLFLG sta LOADFLG iny txa ldx #$82 L_A020 sta LNFLG,x inx sty LNFLG,x inx cpx #$92 bcc L_A020 ldx #$86 ldy #$01 jsr L_A878+2 ldx #$8C ldy #$03 jsr L_A878+2 lda #$00 tay sta (VNTD),y sta (STMCUR),y iny .byte $00, $00, $00, $00, $00, $00, $00, $00 L_A048 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $49, $4A, $4B, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $4E, $4F, $50, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $39, $49, $4A .byte $14, $4A, $4B, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $39, $49, $4A, $14, $15 .byte $14, $15, $19, $4A, $4B, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $49, $14, $14, $15, $16 .byte $14, $15, $14, $18, $0C, $50, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $4D, $0C, $14, $15, $14 .byte $16, $16, $15, $15, $19, $4A, $4B, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $49, $14, $15, $16, $16, $15 .byte $14, $14, $16, $15, $15, $19, $4A, $4B .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $4D, $14, $15, $16, $15, $15, $14 .byte $16, $16, $15, $14, $14, $18, $0C, $50 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $15, $15, $14, $16, $16, $15, $14 .byte $14, $15, $16, $16, $15, $19, $0C, $4A .byte $4B, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $16, $14, $15, $15, $14, $15, $14 .byte $15, $14, $15, $16, $14, $15, $19, $0C .byte $0C, $4A, $4B, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $16, $15, $14, $14, $14, $15, $16 .byte $15, $16, $15, $15, $16, $15, $14, $19 .byte $0C, $0C, $50, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $15, $16, $18, $15, $16, $14, $15 .byte $16, $14, $16, $14, $15, $16, $15, $14 .byte $18, $0C, $4B, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $19, $14, $15, $16, $16, $15, $14 .byte $14, $15, $16, $15, $16, $14, $15, $16 .byte $19, $4F, $50, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $18, $19, $15, $14, $16, $16, $15 .byte $14, $15, $16, $15, $14, $15, $16, $15 .byte $18, $4B, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $14, $15, $16, $15, $16, $15, $16 .byte $16, $15, $15, $16, $14, $15, $15, $16 .byte $16, $19, $4B, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $39, $3A, $39, $3A .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $15, $14, $15, $16, $15, $16, $15 .byte $15, $16, $16, $15, $16, $14, $14, $15 .byte $17, $18, $50, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $14, $14, $16, $15, $16, $14, $14 .byte $14, $14, $16, $15, $16, $15, $16, $18 .byte $4F, $50, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $18, $18, $15, $15, $15, $14, $15 .byte $14, $15, $16, $14, $18, $18, $15, $50 .byte $3A, $39, $39, $3A, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $15, $16, $14, $18, $15, $16, $18 .byte $15, $16, $18, $14, $15, $16, $4C, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $15, $16, $14, $14, $15, $16, $14 .byte $14, $16, $14, $18, $14, $16, $15, $4A .byte $4B, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $18, $14, $16, $15, $14, $16, $14 .byte $15, $16, $16, $14, $15, $14, $16, $15 .byte $19, $4A, $4B, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $16, $15, $14, $18, $16, $15, $14 .byte $18, $16, $15, $14, $18, $16, $15, $14 .byte $16, $18, $4C, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $14, $15, $16, $14, $15, $16, $14 .byte $15, $16, $14, $15, $16, $14, $15, $16 .byte $18, $4F, $50, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $15, $14, $16, $15, $14, $16, $15 .byte $14, $16, $15, $14, $16, $15, $14, $18 .byte $4C, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $16, $15, $14, $16, $15, $14, $16 .byte $15, $14, $16, $15, $14, $16, $18, $4F .byte $50, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $18, $14, $15, $16, $16, $15, $14 .byte $14, $15, $16, $16, $14, $18, $4B, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $14, $18, $16, $15, $14, $18, $16 .byte $15, $14, $18, $15, $18, $4F, $50, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $16, $15, $14, $16, $15, $14, $16 .byte $15, $14, $17, $18, $4C, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $39, $3A, $39, $39 .byte $3A, $15, $14, $16, $15, $14, $16, $15 .byte $17, $18, $0C, $0C, $50, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $14, $15, $16, $15, $14, $15, $18 .byte $0C, $0C, $4F, $50, $39, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $15, $14, $16, $16, $17, $18, $0C .byte $0C, $4F, $4B, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $16, $16, $15, $18, $0C, $0C, $4F .byte $50, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $17, $17, $18, $0C, $4F, $50, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $4F, $4F, $4F, $50, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 L_A878 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 L_A998 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 L_AA60 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $49, $4A, $4B, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $49, $0C, $15, $19, $49, $4A .byte $4B, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $49, $16, $17, $15, $15, $19, $14 .byte $19, $4B, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $49, $14, $16, $15, $15, $14, $15, $14 .byte $18, $19, $4B, $39, $3A, $39, $3A, $39 L_AB28 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $4E, $16, $15, $14, $16, $16, $19, $18 .byte $14, $15, $19, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $4E, $17, $15, $14, $16, $18, $16 .byte $15, $16, $50, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $4E, $17, $19, $15, $19, $14 .byte $19, $50, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 L_ABA8 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $4E, $17, $16, $49, $4F .byte $50, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $39, $3A, $39 .byte $3A, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $39, $3A, $39, $3A .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $39, $3A, $39, $39, $3A, $39 .byte $39, $3A, $39, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $3A, $3A, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $3A, $3A, $39, $3A, $39, $39, $3A .byte $3A, $39, $3A, $3A, $39, $3A, $3A, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $3A, $39, $3A, $39, $39, $3A, $39, $3A .byte $39, $3A, $39, $3A, $39, $3A, $39, $39 .byte $3A, $39, $3A, $39, $3A, $39, $3A, $39 .byte $39, $3A, $39, $3A, $39, $3A, $39, $3A .byte $39, $3A, $39, $39, $3A, $39, $39, $3A .byte $39, $39, $3A, $39, $39, $3A, $39, $39 .byte $3A, $39, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_AD20 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_AD50 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_AD98 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 L_ADB8 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 BIGPLANE_CHECK2 lda ENEMY_MOV_TYPE bne L_B245 BIGPLANE_ON2 sta $06D3 sta $06D4 sta $06D8 sta $0625 lda #$28 sta ENEMY_Y sta $06D0 lda #$D0 sta ENEMY_X sta HPOSP2 clc adc #$1E sta HPOSP3 lda #$00 sta $06AC lda #$90 sta PCOLR3 sta PCOLR2 lda #$03 sta SIZEP2 sta SIZEP3 lda #$0F sta L_542E+1 inc ENEMY_MOV_TYPE rts L_B245 jsr L_B550 lda $06D0 beq L_B2B2 lda $06D8 bne L_B283 lda BIGPLANE_FIRE_TYPE bne L_B269 lda ENEMY_X clc adc #$14 sta HPOSM0 adc #$14 sta HPOSM1 cmp #$00 bne L_B277 L_B269 lda ENEMY_X clc adc #$1A sta HPOSM0 adc #$07 sta HPOSM1 L_B277 lda ENEMY_Y clc adc #$1E sta ENEMY_BULLET_Y inc $06D8 L_B283 ldx #$00 ldy ENEMY_BULLET_Y L_B288 lda MISSILE_GFX,y and #$FA sta MISSILE_GFX,y iny inx cpx #$03 bne L_B288 cpy #$B0 bcc L_B2A1 lda #$00 sta $06D8 beq L_B2B2 L_B2A1 sty ENEMY_BULLET_Y L_B2A4 lda MISSILE_GFX,y ora #$05 sta MISSILE_GFX,y iny inx cpx #$06 bne L_B2A4 L_B2B2 lda $06D0 beq L_B2FC inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$03 bcc L_B2FC lda #$00 sta ENEMY_MOV_TYPE+1 lda BIGPLANE_FIRE_TYPE beq L_B2D4 lda #$00 sta BIGPLANE_FIRE_TYPE cmp #$00 beq L_B2D7 L_B2D4 inc BIGPLANE_FIRE_TYPE L_B2D7 lda ENEMY_X clc adc #$1C cmp PLANE_X beq L_B2F0 bcc L_B2ED dec ENEMY_X lda #$00 cmp #$00 beq L_B2F0 L_B2ED inc ENEMY_X L_B2F0 lda ENEMY_X sta HPOSP2 clc adc #$1E sta HPOSP3 L_B2FC ldx #$00 ldy ENEMY_Y lda $06D0 bne L_B35A inc ENEMY_MOV_TYPE+1 lda ENEMY_MOV_TYPE+1 cmp #$06 bcs L_B311 rts L_B311 stx ENEMY_MOV_TYPE+1 inc $06D1 lda $06D1 cmp #$10 bcs L_B321 jmp L_B424 L_B321 cmp #$18 bcs L_B338 L_B325 lda L_B50D+6,x sta PMGFX0+3,y lda L_B52D+3,x sta PMGFX1,y iny inx cpx #$1D bne L_B325 rts L_B338 txa L_B339 sta PMGFX0+3,y sta PMGFX1,y iny inx cpx #$1D bne L_B339 sta ENEMY_MOV_TYPE sta AUDC4 sta ENEMY_TYPE lda #$11 sta L_542E+1 jsr L_67E6 jsr L_67E6 rts L_B35A lda M0PL and #$0C bne L_B368 lda M3PL and #$0C beq L_B3C0 L_B368 ldy ENEMY_MOV_TYPE+3 ldx #$00 L_B36D lda MISSILE_GFX,y and #$AF sta MISSILE_GFX,y dey inx cpx #$0C bne L_B36D lda #$00 sta ENEMY_MOV_TYPE+5 sta ENEMY_MOV_TYPE+6 inc $06AC lda $06AC cmp #$50 bcc L_B3A9 lda #$00 sta $06D0 sta $06D1 ldx #$00 ldy ENEMY_BULLET_Y L_B39A lda MISSILE_GFX,y and #$FA sta MISSILE_GFX,y iny inx cpx #$03 bne L_B39A rts L_B3A9 jsr L_67B8 lda $06D3 bne L_B3B8 inc $06D3 lda #$00 beq L_B3C0 L_B3B8 lda $06D4 bne L_B3C0 inc $06D4 L_B3C0 lda ENEMY_MOV_TYPE+1 bne L_B3F0 lda ENEMY_MOV_TYPE cmp #$01 bne L_B3E0 lda ENEMY_Y cmp #$68 bcc L_B3D9 lda #$02 sta ENEMY_MOV_TYPE rts L_B3D9 inc ENEMY_Y lda #$00 beq L_B3F0 L_B3E0 lda ENEMY_Y cmp #$28 bcs L_B3ED lda #$01 sta ENEMY_MOV_TYPE rts L_B3ED dec ENEMY_Y L_B3F0 ldx #$00 ldy ENEMY_Y lda BIGPLANE_FIRE_TYPE bne L_B40D L_B3FA lda BIG_PLANE_GFX1C,x sta PMGFX0+3,y lda BIG_PLANE_GFX2C+5,x sta PMGFX1,y iny inx cpx #$1D bne L_B3FA rts L_B40D lda BIG_PLANE_GFX3C+2,x sta PMGFX0+3,y lda BIG_PLANE_GFX4C+7,x sta PMGFX1,y iny inx cpx #$1D bne L_B40D rts nop nop nop nop L_B424 stx ENEMY_MOV_TYPE+1 lda #$0F sta AUDC4 lda $06D1 sta AUDF4 lda $06D2 bne L_B44D L_B437 lda L_B4D5+4,x sta PMGFX0+3,y lda L_B4F5+1,x sta PMGFX1,y iny inx cpx #$1D bne L_B437 inc $06D2 rts L_B44D lda BIG_PLANE_GFX1C,x sta PMGFX0+3,y lda BIG_PLANE_GFX2C+5,x sta PMGFX1,y iny inx cpx #$1D bne L_B44D lda #$00 sta $06D2 rts BIG_PLANE_GFX1C .byte $00, $0F, $1F, $1F, $1F, $0E, $01, $01 .byte $01, $01, $01, $01, $13, $7F, $FF, $FF .byte $EE, $FE, $EF, $7F, $32, $03, $62, $03 BIG_PLANE_GFX2C .byte $01, $01, $00, $06, $00, $00, $F0, $F8 .byte $F8, $F8, $70, $80, $80, $80, $80, $80 .byte $80, $C8, $FE, $FF, $FF, $77, $7F, $F7 .byte $FE, $4C, $C0, $46, $C0, $80, $80, $00 BIG_PLANE_GFX3C .byte $60, $00, $00, $0F, $1F, $1F, $1F, $0E .byte $01, $01, $01, $01, $01, $01, $13, $7F .byte $FF, $FF, $EE, $FE, $EF, $7F, $32, $03 BIG_PLANE_GFX4C .byte $1A, $03, $01, $01, $00, $01, $00, $00 .byte $F0, $F8, $F8, $F8, $70, $80, $80, $80 .byte $80, $80, $80, $C8, $FE, $FF, $FF, $77 .byte $7F, $F7, $FE, $4C, $C0, $58, $C0, $80 L_B4D5 .byte $80, $00, $80, $00, $00, $0F, $10, $10 .byte $10, $0E, $01, $01, $01, $01, $01, $01 .byte $02, $7F, $80, $80, $80, $80, $80, $7F .byte $02, $02, $02, $02, $01, $01, $00, $00 L_B4F5 .byte $00, $00, $F0, $08, $08, $08, $70, $80 .byte $80, $80, $80, $80, $80, $40, $FE, $01 .byte $01, $01, $01, $01, $FE, $40, $40, $40 L_B50D .byte $40, $80, $80, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $44, $AA, $AA, $2A, $4A, $8A .byte $8A, $AA, $E4, $00, $00, $00, $00, $00 L_B52D .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00, $00, $00, $00, $00, $44 .byte $AA, $AA, $AA, $AA, $AA, $AA, $AA, $44 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $00, $00, $00 L_B550 lda $06D7 beq L_B55C lda #$00 sta $06D7 beq L_B55F L_B55C inc $06D7 L_B55F lda $06D3 beq L_B5C1 cmp #$01 bne L_B580 lda #$ED sta PCOLR0 lda PLANE_X sec sbc #$01 sta BIGPLANE_FIRE_TYPE+1 inc $06D3 lda #$00 sta $06D5 beq L_B5C1 L_B580 ldx #$00 lda ENEMY_Y clc adc #$10 tay inc $06D5 lda $06D5 cmp #$04 bcc L_B5A2 txa L_B594 sta L_33FE+2,y iny inx cpx #$08 bne L_B594 sta $06D3 beq L_B5C1 L_B5A2 lda $06D7 bne L_B5B5 L_B5A7 lda L_B620,x sta L_33FE+2,y iny inx cpx #$08 bne L_B5A7 beq L_B5C1 L_B5B5 lda L_B628,x sta L_33FE+2,y iny inx cpx #$08 bne L_B5B5 L_B5C1 lda $06D4 bne L_B5C7 rts L_B5C7 cmp #$01 bne L_B5E0 sta $06D6 lda #$ED sta PCOLR1 lda PLANE_X clc adc #$0A sta BIGPLANE_FIRE_TYPE+2 inc $06D4 rts L_B5E0 ldx #$00 lda ENEMY_Y clc adc #$10 tay inc $06D6 lda $06D6 cmp #$05 bcc L_B601 txa L_B5F4 sta L_3500,y iny inx cpx #$08 bne L_B5F4 sta $06D4 rts L_B601 lda $06D7 bne L_B613 L_B606 lda L_B620,x sta L_3500,y iny inx cpx #$08 bne L_B606 rts L_B613 lda L_B628,x sta L_3500,y iny inx cpx #$08 bne L_B613 rts L_B620 .byte $00, $00, $0E, $1B, $1F, $1B, $0E, $00 L_B628 .byte $00, $10, $44, $82, $82, $44, $10, $00 .byte $00, $77, $60, $74, $74, $60, $60, $60 .byte $28, $44, $44, $40, $4C, $44, $44, $28 .byte $44, $44, $44, $6C, $6C, $44, $44, $44 .byte $7C, $54, $10, $10, $10, $10, $54, $7C .byte $63, $63, $36, $14, $14, $36, $63, $63 .byte $63, $63, $76, $70, $76, $63, $63, $63 .byte $60, $60, $60, $60, $60, $63, $77, $77 .byte $77, $6B, $6B, $6B, $6B, $63, $63, $63 .byte $36, $77, $63, $63, $63, $63, $63, $63 .byte $36, $77, $63, $63, $63, $63, $77, $36 .byte $68, $44, $44, $44, $68, $40, $40, $40 .byte $36, $77, $63, $63, $63, $67, $77, $37 .byte $68, $44, $44, $44, $68, $68, $48, $44 .byte $37, $77, $60, $76, $37, $03, $77, $76 .byte $77, $77, $55, $14, $14, $14, $14, $14 L_B6A8 .byte $44, $44, $44, $44, $44, $44, $44, $28 .byte $63, $63, $63, $63, $63, $36, $36, $1C .byte $63, $63, $63, $6B, $6B, $6B, $6B, $77 .byte $00, $00, $00, $00, $00, $00, $00, $00 .byte $63, $63, $63, $36, $36, $1C, $1C, $1C lda ENEMY_TYPE bne L_B6D6 rts L_B6D6 jsr L_4950 jsr L_4902+1 lda ENEMY_MOV_TYPE bne L_B6EA jsr L_55CC+2 jsr L_55B7 jsr L_55B7 L_B6EA jsr L_5760 L_B6ED lda VCOUNT cmp #$58 bcc L_B6ED ldx #$26 lda L_9D05+3,x sta L_9D05+4,x lda L_9D2D+3,x sta TSLNUM,x
smsq/gold/ser/rx.asm
olifink/smsqe
0
161585
<reponame>olifink/smsqe ; Gold Card SER receive V2.03  1994 <NAME> section ser xdef ser_rx xref iob_room xref iob_eof xref iob_pbyt xref ql_hcmdn xref ql_hcmdr include 'dev8_keys_par' include 'dev8_keys_k' include 'dev8_mac_assert' include 'dev8_smsq_smsq_base_keys' ;+++ ; SER receive ; ; d0 c s 0 = port 1, 1 = port 2 ; d1 s ; d2 s ; d3 s ; d4 c s IPC command nibble ; a2 s ; a3 s ; a4 s ; a5 s ; ;--- ser_rx move.l sms.qlser,a3 tst.w d0 ; 1 or 2? beq.s srx_ckbuff ; ... 1 add.w #prd_ser2-prd_ser1,a3 ; ... 2 srx_ckbuff move.l prd_ibuf(a3),a2 ; any input buffer? move.l a2,d0 ble.s srx_do jsr iob_room move.l d0,d3 moveq #$32,d0 ; allow up to 32 byte transfer cmp.l d0,d3 blt.l srx_nroom ; ... no room srx_do move.b d4,d0 jsr ql_hcmdn ; 1 nibble command moveq #8,d2 jsr ql_hcmdr ; read 1 byte moveq #$3f,d4 and.b d1,d4 ; number of bytes to read sub.l d4,d3 ; space left bra.s srx_eloop srx_loop moveq #8,d2 jsr ql_hcmdr ; read 1 byte move.l a2,d0 ; any buffer? ble.s srx_eloop ; ... no tst.b prd_hand(a3) ; xoff? ble.s srx_ibuf ; ... no assert k.xon-$11,k.xoff-$13,0 moveq #$7d,d0 and.b d1,d0 cmp.b #k.xon,d0 ; xon or xoff? bne.s srx_ibuf ; ... no btst #1,d1 ; on or off sne prd_xoff(a3) ; ... yes bra.s srx_eloop srx_ibuf move.b prb_fz(a2),d0 ; <FF> or CTRL Z subq.b #1,d0 ble.s srx_ckcr ; ... not CTRL Z move.b d1,d0 tst.b prb_prty(a2) ; parity? beq.s srx_ckcz ; ... no bclr #7,d0 ; ... ignore it srx_ckcz cmp.b #26,d0 ; is it CTRL Z? bne.s srx_ckcr jsr iob_eof ; mark end of file st prd_ibuf(a3) ; no input buffer pointer now bra.s srx_eloop srx_ckcr move.b prb_cr(a2),d0 ; cr to lf? beq.s srx_pbyt ; ... no cmp.b d0,d1 ; cr? bne.s srx_pbyt ; ... no move.b prb_lf(a2),d1 ; ... yes beq.s srx_eloop ; cr ignored srx_pbyt jsr iob_pbyt ; put byte in buffer srx_eloop dbra d4,srx_loop cmp.l prd_room(a3),d3 ; enough room left? bgt.s srx_exit ; ... plenty tst.b prd_hand(a3) ; handshake? ble.s srx_exit ; not XON/XOFF move.b #k.xoff,prd_xonf(a3) ; xoff to be sent srx_exit rts srx_nroom tst.b prd_hand(a3) ; no room - is it XON XOFF? ble.s srx_exit ; ... no tst.b prd_iact(a3) ; alredy inactive? beq.s srx_exit move.b #k.xoff,prd_xonf(a3) ; send xoff (this is called from poll) bra.s srx_exit ; xoff will be sent on next sched end
src/iter/fibonacci.adb
shintakezou/adaplayground
0
15856
<filename>src/iter/fibonacci.adb<gh_stars>0 with Ada.Text_IO; package body Fibonacci is function Has_Element (Pos : Fibo_Cur) return Boolean is (Pos.Cur <= Natural'Last - Pos.Prev and Pos.Prev > 0); overriding function First (O : Fibo_Forward) return Fibo_Cur is ((Cur => 1, Prev => 1)); overriding function Next (O : Fibo_Forward; Pos : Fibo_Cur) return Fibo_Cur is ((Cur => Pos.Cur + Pos.Prev, Prev => Pos.Cur)); overriding function First (O : Fibo_Reversible) return Fibo_Cur is ((Cur => 1, Prev => 1)); overriding function Next (O : Fibo_Reversible; Pos : Fibo_Cur) return Fibo_Cur is ((Cur => Pos.Cur + Pos.Prev, Prev => Pos.Cur)); overriding function Last (O : Fibo_Reversible) return Fibo_Cur is ((Cur => 1134903170, Prev => 701408733)); overriding function Previous (O : Fibo_Reversible; Pos : Fibo_Cur) return Fibo_Cur is ((Cur => Pos.Prev, Prev => Pos.Cur - Pos.Prev)); function Element (C : Fibo_Cur) return Natural is (C.Cur); function Element (V : Fibo_Type'Class) return Natural is (V.Value); function Element_Value (C : Fibo_List; P : Fibo_Cur) return Fibo_Type'Class is (Fibo_Type'(Value => P.Cur, Cursor => P)); function Iterate (C : Fibo_List) return Fibo.Forward_Iterator'Class is (Fibo_Forward'(Value => 1, Cursor => (Cur => 1, Prev => 1))); procedure Put_Line (O : Fibo_Type'Class) is begin Ada.Text_IO.Put_Line (Natural'Image (Element (O))); end; end Fibonacci;
oeis/033/A033893.asm
neoneye/loda-programs
11
29899
; A033893: Sort then Add!. ; Submitted by <NAME> ; 3,6,12,24,48,96,165,321,444,888,1776,3453,6798,13587,27165,39732,63111,74247,98724,123513,235848,470436,504903,508362,531930,545289,790878,868767,1536555,2892111,4004400,4004844,4049292,4273791,5508570,5564148 mov $1,3 lpb $0 sub $0,1 seq $1,70196 ; a(n)=n plus the sorted version of the base-10 digits of n. lpe mov $0,$1
oeis/163/A163403.asm
neoneye/loda-programs
11
166880
; A163403: a(n) = 2*a(n-2) for n > 2; a(1) = 1, a(2) = 2. ; 1,2,2,4,4,8,8,16,16,32,32,64,64,128,128,256,256,512,512,1024,1024,2048,2048,4096,4096,8192,8192,16384,16384,32768,32768,65536,65536,131072,131072,262144,262144,524288,524288,1048576,1048576,2097152,2097152,4194304,4194304,8388608,8388608,16777216,16777216,33554432,33554432,67108864,67108864,134217728,134217728,268435456,268435456,536870912,536870912,1073741824,1073741824,2147483648,2147483648,4294967296,4294967296,8589934592,8589934592,17179869184,17179869184,34359738368,34359738368,68719476736 add $0,1 div $0,2 mov $1,2 pow $1,$0 mov $0,$1
programs/oeis/071/A071991.asm
neoneye/loda
22
14863
<reponame>neoneye/loda ; A071991: a(1) = a(2) = 1; a(n) = a(floor(n/3)) + a(n - floor(n/3)). ; 1,1,2,3,4,4,5,5,6,7,7,8,9,10,11,11,12,12,13,14,15,16,16,16,17,17,18,19,20,21,22,23,23,23,23,24,25,25,26,27,28,29,30,31,32,33,34,34,34,34,35,35,36,36,37,37,38,39,40,41,42,43,44,45,46,47,48,49,49,50,50,50,50 mov $1,$0 seq $1,71996 ; a(1) = 0, a(2) = 1, a(n) = a(floor(n/3)) + a(n - floor(n/3)). sub $1,$0 mov $3,$1 mov $1,1 add $2,$3 sub $1,$2 mov $0,$1