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
src/Auto/Example/TypeClasses.agda
wenkokke/AutoInAgda
22
8606
<gh_stars>10-100 open import Auto open import Function using (const) open import Data.Bool using (Bool; true; false) open import Data.Bool.Show as Bool using () open import Data.List using (_∷_; []) open import Data.Maybe open import Data.Nat using (ℕ; suc; zero) open import Data.Nat.Show as Nat using () open import Data.String using (String; _++_) open import Data.Sum renaming (_⊎_ to Either; inj₁ to left; inj₂ to right) open import Relation.Binary.PropositionalEquality using (_≡_; refl) module Auto.Example.TypeClasses where -------------------------------------------------------------------------------- -- * We can construct a class for the Show function (as a dependent record) * -- -------------------------------------------------------------------------------- record Show (A : Set) : Set where constructor mkShow field show : A → String open Show {{...}} -------------------------------------------------------------------------------- -- * And set up a list of rules which guide the instance resolution * -- -------------------------------------------------------------------------------- rules : HintDB rules = [] << quote instShowEither << quote instShowBool << quote instShowNat where instShowBool : Show Bool instShowBool = mkShow Bool.show instShowNat : Show ℕ instShowNat = mkShow Nat.show instShowEither : {A B : Set} → Show A → Show B → Show (Either A B) instShowEither {A} {B} instShowA instShowB = mkShow showEither where showEither : Either A B → String showEither (left x) = "left " ++ show x showEither (right y) = "right " ++ show y -------------------------------------------------------------------------------- -- * Using these rules and `auto` we can easily and robustly compute the * -- -- * instances we need. * -- -------------------------------------------------------------------------------- example₁ : String example₁ = show (left true) ++ show (right 4) where instance inst : Show (Either Bool ℕ) inst = tactic (auto 5 rules) -------------------------------------------------------------------------------- -- * This fails due to normalisation from the non-dependent pair _×_ to the * -- -- * dependent pair Σ (as `A × B` is defined as `Σ A (λ _ → B)`). * -- -------------------------------------------------------------------------------- module DefaultPair where open import Data.Product using (_×_; _,_) instShowPair : {A B : Set} → Show A → Show B → Show (A × B) instShowPair {A} {B} showA showB = record { show = showPair } where showPair : A × B → String showPair (proj₁ , proj₂) = show proj₁ ++ "," ++ show proj₂ inst : Exception unsupportedSyntax inst = unquote (auto 5 (rules << quote instShowPair) g) where g = quoteTerm (Show (Bool × ℕ)) -------------------------------------------------------------------------------- -- * So we're forced to use a custom pair, which isn't derived from * -- -- * a dependent pair * -- -------------------------------------------------------------------------------- module CustomPair where data _×_ (A B : Set) : Set where _,_ : A → B → A × B instShowPair : ∀ {A B} → Show A → Show B → Show (A × B) instShowPair {A} {B} showA showB = record { show = showPair } where showPair : A × B → String showPair (proj₁ , proj₂) = show proj₁ ++ "," ++ show proj₂ example₂ : String example₂ = show (true , 1) where instance inst : Show (Bool × ℕ) inst = tactic (auto 5 (rules << quote instShowPair)) -------------------------------------------------------------------------------- -- * This fails due to something super weird which I haven't encountered * -- -- * before at all... * -- -------------------------------------------------------------------------------- module AbstractPair where open import Data.Product as Σ using (Σ) abstract _×_ : (A B : Set) → Set A × B = Σ A (const B) instShowPair : ∀ {A B} → Show A → Show B → Show (A × B) instShowPair {A} {B} showA showB = record { show = showPair } where showPair : A × B → String showPair (proj₁ Σ., proj₂) = show proj₁ ++ "," ++ show proj₂ _,_ : {A B : Set} (x : A) (y : B) → A × B _,_ = Σ._,_ --inst : Show (Bool × ℕ) --inst = tactic (auto 5 (rules << quote instShowPair))
project.asm
itaybnv/FINAL-MISSION
0
83960
;------------------------------------------ ; PURPOSE : assembly project FINAL MISSION ; SYSTEM : Turbo Assembler Ideal Mode ; AUTHOR : <NAME> ;------------------------------------------ IDEAL MODEL small MACRO HORIZONTAL_LINE x1,y1,x2,y2,color local L1 mov cx,[x2] sub cx,[x1] ; get the length of the line mov ax,[x1] mov [x],ax mov ax,[y1] mov [y],ax L1: push cx DRAWPIXEL x,y,color inc [x] pop cx loop L1 ENDM HORIZONTAL_LINE MACRO VERTICAL_LINE x1,y1,x2,y2,color local L1 mov cx,[y2] sub cx,[y1] mov ax,[x1] mov [x],ax mov ax,[y1] mov [y],ax L1: push cx DRAWPIXEL x,y,color inc [y] pop cx loop l1 ENDM VERTICAL_LINE MACRO DRAWPIXEL x,y,color mov bh,0 mov cx, [x] mov dx, [y] mov al, [color] mov ah,0ch int 10h ENDM DRAWPIXEL STACK 256 p386 ;-----------------=constant variables=----------------; ESC_KEY equ 1 NUMBER_ONE equ 2 NUMBER_TWO equ 3 NUMBER_THREE equ 4 NUMBER_FOUR equ 5 LEFT_ARROW equ 4bh UP_ARROW equ 48h RIGHT_ARROW equ 4dh DOWN_ARROW equ 50h ENTER_KEY equ 1ch ;---------------------------------------- scan codes screen_RAM_text equ 0B800h graphic_mode_offset equ 0A000h ;---------------------------------------- screen offsets cursor_width equ 5 cursor_height equ 5 FreeFallChar_width equ 8 FreeFallChar_height equ 12 cube_width equ 80 cube_height equ 50 ;---------------------------------------- width and heights difficultyX1 equ 60 difficultyY1 equ 26 difficultyX2 equ 60 difficultyY2 equ 90 difficultyX3 equ 60 difficultyY3 equ 154 ;---------------------------------------- difficulty bitmap x and y redWireX equ 30 WireY equ 128 redWireWidth equ 26 redWireHeight equ 67 greenWireX equ 74 greenWireWidth equ 35 greenWireHeight equ 66 yellowWireX equ 110 yellowWireWidth equ 37 yellowWireHeight equ 68 blueWireX equ 172 blueWireWidth equ 38 blueWireHeight equ 66 whiteWireX equ 230 whiteWireWidth equ 28 whiteWireHeight equ 65 ;---------------------------------------- wires x,y width,heights DATASEG ;---------------------=variables=---------------------; x1 dw ? ; starting x y1 dw ? ; starting y x2 dw ? ; ending x (x1 < x2) y2 dw ? ; ending y (y2 = y1) h_times db 3 v_times db 3 clear_screen dw 320*200 column_number dw ? row_number dw ? cancelled dw 0000000000000000b ; each bit is a cube (1 if cancelled 0 if not) letters db "abcdefghijklmnopqrstuvwsyz" rndrange db ? rnd dw ? ; rnd is word size because of some calculation error caused by si (refer to proc CLICKER_GAME) counter db ? cube db ? bomb db ? temp db ? tempWord dw ? width db ? height db ? win db 2 ;----------------------=difficulty=---------------------; difficulty db 1 tries db ? clickerCountOffset db ? freeFallSpeed dw ? freeFallCounter db ? bombtries db ? ;-----------------------=bitmaps=-----------------------; cursor db 000,004,004,004,000 db 004,043,095,043,004 db 004,095,095,095,004 db 004,043,095,043,004 db 000,004,004,004,000 freeFallChar db 000,000,000,000,022,000,000,000 db 000,000,000,000,000,022,000,000 db 000,000,000,000,000,022,000,000 db 000,000,000,000,022,000,000,000 db 000,000,004,004,004,004,040,000 db 000,000,004,004,004,040,040,000 db 000,000,004,004,040,040,040,000 db 000,000,004,040,000,040,040,000 db 000,000,040,000,040,000,040,000 db 000,000,040,040,000,040,004,000 db 000,000,040,040,040,004,004,000 db 000,000,040,040,040,004,004,000 bottomX dw ? bottomY dw ? rightX dw ? rightY dw ? leftX dw ? pic_width dw ? pic_height dw ? bitmapcopy db 12*8 dup (?) ;---------------=variables for PCX usage=-------------; File2 db "defus.pcx" File4 db "loses.pcx" File5 db "maze1.pcx" File6 db "maze2.pcx" File7 db "maze3.pcx" File8 db "maze4.pcx" File9 db "maze5.pcx" File11 db "menus.pcx" File13 db "start.pcx" File14 db "guide.pcx" File15 db "nplay.pcx" File16 db "mazet.pcx" File17 db "bombg.pcx" File18 db "bomb1.pcx" File19 db "level.pcx" File20 db "click.pcx" ;---------------------------------------------- deleted 1,3,10 and 12 x dw ? ; the x at the moment y dw ? ; the y at the moment FileName db 10 dup (?) FileHandle dw ? FileSize dw ? PCXErrorMSG db "PCX ERROR$" ImageWidth dw ? ImageHeight dw ? StartX dw ? StartY dw ? color db ? CODESEG Start: mov ax, @data mov ds, ax mov [rndrange], 16 call rndgen mov bx, [rnd] mov [bomb], 1 ;---------------------------------------- put the BOMB in a random cube start2: mov ax,13h int 10h ;---------------------------------------- graphic mode mov ax,00h int 33h ;---------------------------------------- initiate mouse mov [win], 2 call MAIN_MENU ; the menu of the game gameloop: call GAMESCREEN mov ax, 01 int 33h ;---------------------------------------- draw the cubes and the cancelled cubes checkmouse: mov ax, 5h int 33h cmp bx, 1b jne checkmouse shr cx,1 ; bug with the interrupt, the x value comes doubled mov [x],cx mov [y],dx ;---------------------------------------- get the x and y of the mouse press mov ax, [x] xor dx, dx ; div with word values uses dx mov cx, 80 div cx mov [column_number], ax ;---------------------------------------- move to row_number the row of the button press mov ax, [y] xor dx, dx mov cx, 50 div cx mov [row_number], ax ;---------------------------------------- move to column_number the column of the button press mov bx, [column_number] shl [row_number], 2 ; [rown_number] * 4 add bx, [row_number] mov [cube], bl ; in [cube] -> a number (0 - 15) that resembels a cube: ;---------------------------------------- find the area the mouse pressed in accordingly by y * length + x: ;---------------------------------------- ========================== ;---------------------------------------- = 0 1 2 3 = ;---------------------------------------- = 4 5 6 7 = ;---------------------------------------- = 8 9 10 11 = ;---------------------------------------- = 12 13 14 15 = ;---------------------------------------- ========================== mov bx, [cancelled] mov cl, [cube] inc cl shr bx, cl jc checkmouse ;---------------------------------------- check if the [cube] is cancelled mov ax, 02 int 33h ;---------------------------------------- hide cursor cmp [tries], 0 jne NotLastTry mov cl, [cube] cmp cl, [bomb] jne Exit ;---------------------------------------- check for the last try if the cube is the bomb, if not the player failed NotLastTry: call GAMECHOOSER dec [tries] cmp [win], 0 je start cmp [win], 1 je start jmp gameloop ;---------------------------------------- call a random minigame, after done dec tries and loop to the top Exit: mov ax, 4C00h int 21h PROC GAMESCREEN mov [color], 02 mov [x],0 mov [y],0 mov [clear_screen], 320*200 call FILL_SCREEN call DETECTCANCELLEDCUBE ;---------------------------------------- fill the screen with green and cancel the cubes mov [x1], 0 mov [y1], 50d mov [x2], 320d mov [color], 0 mov [h_times], 3 mov [v_times], 3 Lh2: HORIZONTAL_LINE x1,y1,x2,y1, color add [y1], 50d dec [h_times] cmp [h_times], 0 jne Lh2 ;---------------------------------------- draw the horizontal lines seperating the cubes mov [x1], 80d mov [y1],0d mov [y2],200d lv2: VERTICAL_LINE x1,y1,x1,y2,color add [x1], 80d dec [v_times] cmp [v_times], 0 jne Lv2 ;---------------------------------------- draw the vertical line seperating the cubes mov ax,01h int 33h ;---------------------------------------- show mouse ret ENDP GAMESCREEN PROC FILL_SCREEN clear: DRAWPIXEL x,y,color inc [x] cmp [x], 320 jne x_not_320 mov [x], 0 inc [y] x_not_320: dec [clear_screen] cmp [clear_screen], 0 jne clear ret ENDP FILL_SCREEN PROC CLICKER_GAME mov [StartX], 0 mov [StartY], 0 mov cx, 9 mov si, 0 @@loop1: mov ah, [File20 + si] mov [FileName + si], ah inc si loop @@Loop1 call DrawPCX ;---------------------------------------- draw the click.pcx mov [rndrange], 20 call rndgen mov bl, [clickerCountOffset] xor bh,bh add [rnd], bx ; get a rndnum between [clickerCountOffset] -- [clickerCountOffset] + 20 mov bx, [rnd] mov [counter], bl ; reset counter @@retry: mov [rndrange],26 call rndgen ;---------------------------------------- get a random letter mov ah, 02h mov dl, (40/2) - 1 ; row mov dh, 24/2 + 2 ; column xor bx, bx int 10h ;---------------------------------------- set cursor position cmp [rnd], 17 je @@retry lea si, [letters] add si, [rnd] mov al, [byte si] ; get a random letter mov ah, 09h ; interrupt entry xor bh,bh ; page number 0 mov bl, 15 mov cx, 1 int 10h ;---------------------------------------- print the letter @@loop: cmp [counter], 0 je @@end mov ah, 8h int 21h mov cl, [byte rnd] add cl, 61h cmp al, cl jne @@loop dec [counter] jmp @@loop ;---------------------------------------- check if letter was clicked the required amount of times @@end: ret ENDP CLICKER_GAME PROC MAZE_GAME ;------------------------------------------------------------- ; maze_game - a maze game ;------------------------------------------------------------- ; Input: ; n/a ; Output: ; the maze screen, cx <- the amount of cubes to cancel ; Registers ; AX(restored) , bl ;------------------------------------------------------------ mov [StartX], 0 mov [StartY], 0 mov cx, 9 mov si, 0 @@loop1: mov ah, [File16 + si] mov [FileName + si], ah inc si loop @@Loop1 call DrawPCX xor ah, ah int 16h ;----------------------------------- print the maze guide and wait for keyboard press mov [rndrange], 5 call rndgen mov [startx], 0 mov [starty], 0 mov cx, 9 mov si, 0 mov [rndrange], 5 call rndgen @@again: cmp [rnd], 0 jne @@n1 mov ah, [file5 + si] mov [FileName + si], ah inc si @@n1: cmp [rnd], 1 jne @@n2 mov ah, [file6 + si] mov [FileName + si], ah inc si @@n2: cmp [rnd], 2 jne @@n3 mov ah, [file7 + si] mov [FileName + si], ah inc si @@n3: cmp [rnd], 3 jne @@n4 mov ah, [file8 + si] mov [FileName + si], ah inc si @@n4: cmp [rnd], 4 jne @@n5 mov ah, [file9 + si] mov [FileName + si], ah inc si @@n5: loop @@again call DrawPCX ;---------------------------------------- randomize a maze and draw it on the screen mov ax, 0004h xor cx,cx xor dx,dx int 33h mov ax, 1h int 33h ;---------------------------------------- show mouse and set position to 0,0 @@checkMouse: mov ax, 3h int 33h ; get cursor position (dx = row, cx = column) shr cx, 1 ; bug with the cursor x value, it is doubled dec cx ; the cursor postion is actually ON the tip of the cursor, dec dx ; so i'll use the top left one above the cursor read mov bx, graphic_mode_offset mov es, bx ; graphic_mode_offset mov si, dx shl dx, 8 shl si, 6 add si, dx add si, cx ; si <- offset es:si <- point mov bl, [byte es:si] mov [color], bl ; color <- the color of the mouse position cmp [color], 4d je @@win cmp [color], 15d je @@fail jmp @@checkMouse ;------------------- find the mouse position color and check for collision @@fail: mov cx, 0 mov ax, 2 int 33h ;---------------------------------------- hide mouse and set cx to cube count to cancel ret @@win: mov cx, 3 mov ax, 2 int 33h ;---------------------------------------- hide mouse and set cx to cube count to cancel ret ENDP MAZE_GAME PROC FREEFALL_GAME mov [color], 0 mov [x], 0 mov [y],0 mov [clear_screen], 320*200 call FILL_SCREEN ;---------------------------------------- clear the screen mov al, [freeFallCounter] push ax ; save the amount of lines if this minigame appears again mov [startx], 320 / 2 - FreeFallChar_width / 2 mov [starty], 0 ;---------------------------------------- starting coordinats (x middle of the screen, y 0) mov [pic_width], FreeFallChar_width mov [pic_height], FreeFallChar_height xor si,si mov cx, FreeFallChar_width * FreeFallChar_height CopyFreeFallChar: mov dl, [freeFallChar + si] mov [bitmapcopy + si], dl inc si loop CopyFreeFallChar call bitmap ;---------------------------------------- draw the bitmap in the starting location mov [bottomX], 320 / 2 mov [bottomY], FreeFallChar_height + 1 mov [rightX], 320 / 2 + FreeFallChar_width / 2 + 1 mov [rightY], FreeFallChar_height / 2 mov [leftX], 320 / 2 - FreeFallChar_width / 2 - 1 ;mov [leftY], FreeFallChar_height / 2 no need leftY = rightY ;------------------------------- set the starting locations for the pixels that are checked for collision @@newLine: mov [y], 200d mov [rndrange], 100d call rndgen add [rnd], 100d mov dx, [rnd] ;---------------------------------------- random (100 - 200) is the place the hole starts mov [rndrange], 50 call rndgen add [rnd],30 ;---------------------------------------- random (30 - 80) this is the width of the hole @@start: mov [color], 15d ; white mov [x],0 ;---------------------------------------- setup @@Cycle: cmp dx, [x] jne @@noSkip mov cx, [rnd] ;---------------------------------------- check if the hole starts now @@skip: inc [x] call checkcollision cmp [temp], 1 je @@end ; collision with white loop @@skip ;---------------------------------------- skip the width of the hole @@noSkip: call PutPixel call checkcollision cmp [temp], 1 je @@end ; collision with white inc [x] cmp [x], 319d jne @@cycle ;---------------------------------------- draw the white line with the hole mov cx, [freeFallSpeed] @@wait: loop @@wait ;---------------------------------------- delay (without it its too fast) mov [color], 0d ; black mov [x], 0 ;---------------------------------------- setup @@cycle2: call PutPixel call checkcollision cmp [temp], 1 je @@end inc [x] cmp [x],319d jne @@cycle2 ;---------------------------------------- draw the black line to delete the white call CHECKFORKEYBOARDINPUT dec [y] jnz @@start dec [freeFallCounter] jnz @@newLine ;---------------------------------------- mov the line y one. if [y] = 0 then start another line mov cx, 3 ;for cube cancel @@end: pop ax mov [freeFallCounter], al ret ENDP FREEFALL_GAME PROC CHECKCOLLISION push ax mov di, [bottomY] mov ax, [bottomY] shl di, 8 shl ax, 6 add di, ax add di, [bottomX] mov bx, graphic_mode_offset mov es, bx mov al, [es:di] cmp al, 15d je @@collisionWithWhite ;---------------------------------------- check the bottom pixel mov di, [rightY] mov ax, [rightY] shl di, 8 shl ax, 6 add di, ax add di, [rightX] mov al, [es:di] cmp al, 15d je @@collisionWithWhite ;---------------------------------------- check the right pixel mov di, [rightY] mov ax, [rightY] ; rightY = leftY so no need for anoter variable shl di, 8 shl ax, 6 add di, ax add di, [leftX] mov al, [es:di] cmp al, 15d je @@collisionWithWhite ;---------------------------------------- check the left pixel mov [temp], 0 pop ax ret ;---------------------------------------- no collision, return normally @@collisionWithWhite: mov [temp], 1 mov cx, 0 ; for cube cancel pop ax ;---------------------------------------- collision, return [temp] = 1 means game over ret ENDP CHECKCOLLISION PROC CHECKFORKEYBOARDINPUT mov ax, [x] mov bx, [y] push ax push bx ;---------------------------------------- save the [x] and [y] in al, 60h cmp al, LEFT_ARROW jne @@n1 mov ax, [startX] add ax, FreeFallChar_width xor bx,bx mov cx, FreeFallChar_height mov [color], 0 ;black call retracebitmap ;---------------------------------------- calculate the x,y of the point dec [bottomX] dec [leftX] dec [rightX] ;---------------------------------------- move the CollisionCheckPoints with the bitmap dec [startx] call bitmap ;---------------------------------------- move the bitmap one pixel to the right @@n1: cmp al,RIGHT_ARROW jne @@n2 mov ax, [startX] xor bx,bx mov cx, FreeFallChar_height mov [color], 0 ;black call retracebitmap ;---------------------------------------- calculate the x,y of the point inc [bottomX] inc [leftX] inc [rightX] ;---------------------------------------- move the CollisionCheckPoints with the bitmap inc [startx] call bitmap ;---------------------------------------- move the bitmap one pixel to the right @@n2: pop bx pop ax mov [x], ax mov [y], bx ret ENDP CHECKFORKEYBOARDINPUT PROC RETRACEBITMAP ;------------------------------------------------------------- ; retracebitmap - put a black line to move a bitmap ;------------------------------------------------------------- ; Input: ; ax <- starting x, bx <- starting y, cx <- amount of pixels ; Output: ; ; Registers ; ax , bx, cx ;---------------------------------------------------------- @@cycle: mov [x],ax mov [y], bx call PutPixel inc [y] loop @@cycle ;---------------------------------------- draw a black line to delete the edge of the bitmap ret ENDP RETRACEBITMAP PROC rndgen ;------------------------------------------------------------- ; rndgen - gets a random number betweeen 0- [rndrange] ;------------------------------------------------------------- ; Input: ; rndrange <- the range of numbers you want to randomize ; Output: ; rnd <- a random number between 0- [rndrange] ; Registers ; AX(restored) , bl ;---------------------------------------------------------- push ax in al, 40h ; get a random number 0-255 into al xor ah, ah ; div uses ax mov bl, [rndrange] div bl mov [byte rnd], ah ; ah <- remainder pop ax ret ENDP rndgen PROC GAMECHOOSER ;------------------------------------------------------------- ; gamechooser - checks if the bomb is in the pressed cube ; true - goes into the bomb defuse game ; false - goes into a random game between the 4 available ;------------------------------------------------------------- ; Input: ; rndrange <- the range of numbers you want to randomize ; bomb <- the cube that the bomb is in ; cube <- the cube that the player clicked on ; Output: ; calls the cooresponding game ; Registers: ; bl, cx, ;------------------------------------------------------------ mov bl, [bomb] cmp bl, [cube] jne @@NotBomb call BOMB_GAME cmp [win], 1 jne @@lost mov [StartX], 0 mov [StartY], 0 mov cx, 9 mov si, 0 @@loop1: mov ah, [File2 + si] mov [FileName + si], ah inc si loop @@Loop1 call DrawPCX xor ah,ah int 16h ret ;---------------------------------------- win pcx @@lost: mov [StartX], 0 mov [StartY], 0 mov cx, 9 mov si, 0 @@loop2: mov ah, [File4 + si] mov [FileName + si], ah inc si loop @@loop2 call DrawPCX xor ah,ah int 16h ret ;---------------------------------------- checks if the pressed cube has the bomb @@NotBomb: mov [rndrange], 3 call rndgen ;---------------------------------------- get a random game cmp [rnd], 0 jne @@l1 call CLICKER_GAME mov cx, 3 ;---------------------------------------- you can't fail clicker, so in cx goes 3 cubes to cancel jmp @@afterGame @@L1: cmp [rnd], 1 jne @@l2 call MAZE_GAME jmp @@afterGame @@l2: call FREEFALL_GAME ;only option left @@afterGame: mov bl,[cube] call CANCELCUBE cmp cx, 0 je @@end ;---------------------------------------- first cancelling the chosen cube(need to cancel [cube]) @@cubeCancel: mov [rndrange],16 call rndgen ; get a number between 0 - 15 (will be the cube to cancel) mov bx, [rnd] cmp bl, [cube] ; rnd can't be cube, it is already cancelled je @@cubecancel cmp bl, [bomb] ; cancelling the bomb isn't wanted je @@cubeCancel call cancelcube dec cx cmp cx, 0 jne @@cubeCancel ;---------------------------------------- cancel cx amount of cubes @@end: ret ENDP GAMECHOOSER PROC CANCELCUBE ;------------------------------------------------------------- ; cancelcube - disables the cube in bl ;------------------------------------------------------------- ; Input: ; bl ; Output: ; calls the cooresponding game ; Registers: ; bl, cx, ;------------------------------------------------------------ push cx mov dx, [cancelled] mov cl,bl ;bl = [rnd] inc cl ; because if the cube chosen is the first one, cl will be 0 and shr dx,cl will do nothing shr dx, cl jc @@end ;---------------------------------------- check if the cube has already been cancelled mov dx, 1 mov cl, bl ; bl = [rnd] shl dx, cl add [cancelled], dx ;---------------------------------------- goes by the equation: [cancelled] <- [cancelled] + (shr 1, [rnd]) @@end: pop cx ret ENDP CANCELCUBE PROC DETECTCANCELLEDCUBE mov dx, [cancelled] shr dx,1 jc @@cube1 @@n1: shr dx,1 jc @@cube2 @@n2: shr dx,1 jc @@cube3 @@n3: shr dx,1 jc @@cube4 @@n4: shr dx,1 jc @@cube5 @@n5: shr dx,1 jc @@cube6 @@n6: shr dx,1 jc @@cube7 @@n7: shr dx,1 jc @@cube8 @@n8: shr dx,1 jc @@cube9 @@n9: shr dx,1 jc @@cube10 @@n10: shr dx,1 jc @@cube11 @@n11: shr dx,1 jc @@cube12 @@n12: shr dx,1 jc @@cube13 @@n13: shr dx,1 jc @@cube14 @@n14: shr dx,1 jc @@cube15 @@n15: shr dx,1 jc @@cube16 ret @@cube1: mov [x], 0 mov [y], 0 call FILLCUBE jmp @@n1 @@cube2: mov [x], 80 mov [y], 0 call FILLCUBE jmp @@n2 @@cube3: mov [x], 160 mov [y], 0 call FILLCUBE jmp @@n3 @@cube4: mov [x], 240 mov [y], 0 call FILLCUBE jmp @@n4 @@cube5: mov [x], 0 mov [y], 50 call FILLCUBE jmp @@n5 @@cube6: mov [x], 80 mov [y], 50 call FILLCUBE jmp @@n6 @@cube7: mov [x], 160 mov [y], 50 call FILLCUBE jmp @@n7 @@cube8: mov [x], 240 mov [y], 50 call FILLCUBE jmp @@n8 @@cube9: mov [x], 0 mov [y], 100 call FILLCUBE jmp @@n9 @@cube10: mov [x], 80 mov [y], 100 call FILLCUBE jmp @@n10 @@cube11: mov [x], 160 mov [y], 100 call FILLCUBE jmp @@n11 @@cube12: mov [x], 240 mov [y], 100 call FILLCUBE jmp @@n12 @@cube13: mov [x], 0 mov [y], 150 call FILLCUBE jmp @@n13 @@cube14: mov [x], 80 mov [y], 150 call FILLCUBE jmp @@n14 @@cube15: mov [x], 160 mov [y], 150 call FILLCUBE jmp @@n15 @@cube16: mov [x], 240 mov [y], 150 call FILLCUBE ret ENDP DETECTCANCELLEDCUBE PROC FILLCUBE mov bx, [x] mov [tempWord], bx ;---------------------------------------- so i could return to the start of the cube mov [color], 4 ;red mov cx, cube_height @@cycle: push cx ; save cube_height so i could use cx for two loops mov cx, cube_width @@cycle1: call PutPixel inc [X] loop @@cycle1 ;---------------------------------------- paint one line red pop cx inc [y] mov bx, [tempWord] mov [X], bx ;---------------------------------------- go down one line loop @@cycle ret ENDP FILLCUBE PROC MAIN_MENU mov [StartX], 0 mov [StartY], 0 mov cx, 9 mov si, 0 @@loop1: mov ah, [File13 + si] mov [FileName + si], ah inc si loop @@Loop1 call DrawPCX mov ah, 8h int 21h ;---------------------------------------- the first starting screen mainloop: mov [StartX], 0 mov [StartY], 0 mov cx, 9 mov si, 0 @@loop2: mov ah, [File11 + si] mov [FileName + si], ah inc si loop @@Loop2 mov ax, 13h int 10h ; make sure graphic mode is enabled call DrawPCX ;---------------------------------------- the main menu screen mov ah, 8h int 21h in al,060h ; read scan code from keyboard port cmp al, NUMBER_ONE je @@game cmp al, NUMBER_TWO je @@instructions cmp al, NUMBER_THREE je @@credits cmp al, NUMBER_FOUR je @@quit dec al jnz mainloop ; the scan code of ESC is 1, so 1-1=0 ;---------------------------------------- check which key was pressed and jmp accordingly @@quit: mov [StartX], 0 mov [StartY], 0 mov cx, 9 mov si, 0 @@loop3: mov ah, [File15 + si] mov [FileName + si], ah inc si loop @@Loop3 call DrawPCX mov ah, 8h int 21h ;---------------------------------------- draw the thanks for playing pcx mov ax, 4C00h int 21h ; terminates the program @@instructions: call instructions jmp mainloop @@credits: ;call credits jmp mainloop @@game: mov [StartX], 0 mov [StartY], 0 mov cx, 9 mov si, 0 @@loop4: mov ah, [File19 + si] mov [FileName + si], ah inc si loop @@Loop4 call DrawPCX ;---------------------------------------- draw the difficulty chooser mov [startx], difficultyX1 mov [starty], difficultyY1 mov [pic_width], cursor_width mov [pic_height], cursor_height mov cx, cursor_width * cursor_height xor si,si ;---------------------------------------- setup for the bitmap @@CopyCursor: mov dl, [cursor + si] mov [bitmapcopy + si], dl inc si loop @@CopyCursor ;---------------------------------------- copy pixel by pixel call bitmap ;---------------------------------------- copy the bitmap so i could use more than one bitmap @@chooseDifficulty: xor ah, ah int 16h cmp ah, DOWN_ARROW jne @@n1 cmp [difficulty], 3 je @@chooseDifficulty ; check if the cursor is at the bottom because you can't go any lower inc [difficulty] call deletebitmap ;---------------------------------------- inc [difficulty] and delete the bitmap @@n1: cmp ah, UP_ARROW jne @@n2 cmp [difficulty], 1 je @@chooseDifficulty ; check if the cursor is at the top because you can't go any higher dec [difficulty] call deletebitmap ;---------------------------------------- dec [difficulty] and delete the bitmap @@n2: cmp ah, ENTER_KEY jne @@n3 jmp @@gotDifficulty @@n3: push ax call MOVEDIFFICULTYBITMAP pop ax dec al jnz @@chooseDifficulty ; the scan code of ESC is 1, so 1-1=0 jmp mainloop @@gotDifficulty: call setDifficulty ret ; the game will start ENDP MAIN_MENU PROC MOVEDIFFICULTYBITMAP cmp [difficulty],1 jne @@n1 mov [StartY], difficultyY1 ;---------------------------------------- change the y of the bitmap @@n1: cmp [difficulty],2 jne @@n2 mov [StartY], difficultyY2 ;---------------------------------------- change the y of the bitmap @@n2: cmp [difficulty],3 jne @@n3 mov [StartY], difficultyY3 ;---------------------------------------- change the y of the bitmap @@n3: mov cx, cursor_width * cursor_height xor si,si @@CopyCursor1: mov dl, [cursor + si] mov [bitmapcopy + si], dl inc si loop @@CopyCursor1 call bitmap ret ENDP MOVEDIFFICULTYBITMAP PROC DELETEBITMAP mov cx, cursor_width * cursor_height xor si,si @@CopyCursor: mov dl, 0 ; black mov [bitmapcopy + si], dl inc si loop @@CopyCursor ;---------------------------------------- change the y of the bitmap fill [bitmapcopy] with black call bitmap ret ENDP DELETEBITMAP PROC setDifficulty mov [tries], 6 mov [clickerCountOffset], 10 mov [freeFallSpeed],40000d mov [freeFallCounter], 3 mov [bombtries], 3 ;---------------------------------------- the default (also the easy difficulty) @@n1: cmp [difficulty], 2 ;medium jne @@n2 mov [tries], 5 mov [clickerCountOffset], 20 mov [freeFallSpeed], 20000 mov [freeFallCounter], 4 mov [bombtries], 2 @@n2: cmp [difficulty], 3 ; hard jne @@end mov [tries], 3 mov [clickerCountOffset], 40 mov [freeFallSpeed], 5000 mov [freeFallCounter], 5 mov [bombtries], 1 @@end: ret ENDP setDifficulty PROC INSTRUCTIONS mov [StartX], 0 mov [StartY], 0 mov cx, 9 mov si, 0 @@loop1: mov ah, [File14 + si] mov [FileName + si], ah inc si loop @@Loop1 call DrawPCX ;---------------------------------------- draw the instructions screen mov ax, 0c0ah int 21h xor ah,ah int 16h ;---------------------------------------- wait for keyboard input ret ENDP INSTRUCTIONS PROC BOMB_GAME mov [win], 0 mov [StartX], 0 mov [StartY], 0 mov cx, 9 mov si, 0 @@loop1: mov ah, [File17 + si] mov [FileName + si], ah inc si loop @@Loop1 call DrawPCX xor ah,ah int 16h ;---------------------------------------- draw the bomb guide pcx mov [StartX], 0 mov [StartY], 0 mov cx, 9 mov si, 0 @@loop2: mov ah, [File18 + si] mov [FileName + si], ah inc si loop @@Loop2 call DrawPCX ;---------------------------------------- draw the bomb game mov ax, 01 int 33h ;---------------------------------------- show mouse mov [rndrange], 5 call rndgen ; get a random defuse wire mov al, [bombtries] ; so bombtries is saved for next tries push ax xor bx,bx ;reset bx for click detection add [bombtries], 48 mov ah, 02h mov dl, (40/2) - 1 ; row mov dh, 4 ; column xor bx, bx int 10h ; set cursor position mov ah, 09h mov al, [bombtries] xor bh,bh mov bl, 5 mov cx, 1 int 10h sub [bombtries], 48 ;---------------------------------------- print the first number @@checkmouse: mov ax, 5h int 33h cmp bx, 1b jne @@checkmouse ;---------------------------------------- get the x and y of the mouse press shr cx, 1 dec cx dec dx mov si, dx shl dx, 8 shl si, 6 add si, dx add si, cx ; si <- offset es:si <- point mov bl, [byte es:si] xor bh,bh ;---------------------------------------- check color of the click cmp bl, 40 ; red jne @@n1 mov [startX], redWireX mov [StartY], WireY mov [width], redWireWidth mov [height], redWireHeight mov [tempWord], 0 jmp @@n6 @@n1: cmp bl, 119 ; green jne @@n2 mov [startX], greenWireX mov [StartY], WireY mov [width], greenWireWidth mov [height], greenWireHeight mov [tempWord], 1 jmp @@n6 @@n2: cmp bl, 44 ; yellow jne @@n3 mov [startX], yellowWireX mov [StartY], WireY mov [width], yellowWireWidth mov [height], yellowWireHeight mov [tempWord], 2 jmp @@n6 @@n3: cmp bl, 32 ;blue jne @@n4 mov [startX], blueWireX mov [StartY], WireY mov [width], blueWireWidth mov [height], blueWireHeight mov [tempWord], 3 jmp @@n6 @@n4: cmp bl, 15 ;white je @@n5 jmp @@checkMouse @@n5: mov [startX], whiteWireX mov [StartY], WireY mov [width], whiteWireWidth mov [height], whiteWireHeight mov [tempWord],4 jmp @@n6 ;---------------------------------------- set the wire x,y,width,height @@n6: mov [color], bl ; the number color = the wire color mov bx, [tempWord] cmp [rnd], bx jne @@n7 mov [win], 1 @@n7: mov ax, 02 int 33h call fillarea mov ax, 01 int 33h ;---------------------------------------- fill the wire area cmp [win], 1 je @@end dec [bombtries] add [bombtries], 48 mov ah, 02h mov dl, (40/2) - 1 ; row mov dh, 4 ; column xor bx, bx int 10h ; set cursor position mov ah, 09h mov al, [bombtries] xor bh,bh mov bl, 5 ; attribute mov cx, 1 ; amount of times to print the char int 10h sub [bombtries], 48 cmp [bombtries], 0 je @@end ;---------------------------------------- print the amount of tries left on the screen jmp @@checkMouse @@end: pop ax mov [bombtries], al ret ENDP BOMB_GAME PROC FILLAREA mov bl, [width] mov dl, [height] mov ax, [startX] mov [X], ax mov ax, [startY] mov [Y], ax ;---------------------------------------- setup @@loop1: mov [color], 0 ;black push bx call PutPixel pop bx inc [X] dec bl jnz @@loop1 inc [Y] mov ax, [startX] mov [X], ax mov bl, [width] dec dl jnz @@loop1 ret ENDP FILLAREA PROC BITMAP ;------------------------------------------------------------- ; bitmap - draw a bitmap ;------------------------------------------------------------- ; Input: ; startx, starty, bitmap, pic_width, pic_height ; Output: ; a bitmap ; Registers: ; ax,bx,si,cl (all restored) ;------------------------------------------------------------ pusha mov ax, [StartX] mov bx, [StartY] mov [x], ax mov [y], bx mov ax, [pic_width] mov bx, [pic_height] xor si,si ;---------------------------------------- setup @@cycle: mov cl, [bitmapcopy + si] inc si ;---------------------------------------- take a color from bitmapcopy and inc offset mov [color], cl pusha ;DRAWPIXEL x, y, color call PutPixel popa inc [x] dec ax jnz @@cycle ;---------------------------------------- loop ax (pic_width) -> a line @@endOfRow: inc [y] mov ax, [startx] mov [x], ax mov ax, [pic_width] dec bx jz @@end jmp @@cycle ;---------------------------------------- go down a line and reset [x] @@end: popa ret ENDP BITMAP include "draw.dat" END start
alloy4fun_models/trashltl/models/0/25NYYDNszY6rMrnrt.als
Kaixi26/org.alloytools.alloy
0
1959
<gh_stars>0 open main pred id25NYYDNszY6rMrnrt_prop1 { before all f:File | f in Protected } pred __repair { id25NYYDNszY6rMrnrt_prop1 } check __repair { id25NYYDNszY6rMrnrt_prop1 <=> prop1o }
programs/oeis/021/A021070.asm
neoneye/loda
22
99069
; A021070: Decimal expansion of 1/66. ; 0,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5,1,5 sub $0,1 mod $0,2 mov $1,5 pow $1,$0 mov $0,$1
13_01_Random/Libs/Constants.asm
phaze101/C64-Bedtime-Coding-Public
0
177977
<reponame>phaze101/C64-Bedtime-Coding-Public<gh_stars>0 ;============================================================================ ; C64 Bedtime Coding ; Copyright (c) by Phaze101 ; eMail - <EMAIL> ; website - https://www.phaze101.com ; MIT License - https://choosealicense.com/licenses/mit/ ;============================================================================ ;============================================================================== ; Constants V1.0 ;============================================================================== ;Base Addresses ScrBase = $0400 ScrCol = $d800 ZeroPtr1Low = $03 ZeroPtr1High = $04 ZeroPtr2Low = $05 ZeroPtr2High = $06 ZeroPtr3Low = $fb ; Always FREE to use ZeroPtr3High = $fc ; Always FREE to use ZeroPtr4Low = $fd ; Always FREE to use ZeroPtr4High = $fe ; Always FREE to use ;Temp Memory Locations in Page Zero ZeroTmpMem01 = $02 ZeroTmpMem02 = $2A ZeroTmpMem03 = $52 ;C64 colours Definitions Black = 0 White = 1 Red = 2 Cyan = 3 Purple = 4 Green = 5 Blue = 6 Yellow = 7 Orange = 8 Brown = 9 LightRed = 10 DarkGray = 11 MediumGray = 12 LightGreen = 13 LightBlue = 14 LightGray = 15 ;Character Values SpaceCharacter = 32 ;Logic constants False = 0 True = 1
alloy4fun_models/trashltl/models/1/nCkQNqnDXWGsjKn9G.als
Kaixi26/org.alloytools.alloy
0
3321
<reponame>Kaixi26/org.alloytools.alloy open main pred idnCkQNqnDXWGsjKn9G_prop2 { some File } pred __repair { idnCkQNqnDXWGsjKn9G_prop2 } check __repair { idnCkQNqnDXWGsjKn9G_prop2 <=> prop2o }
src/boot/stage2/real.asm
Nax/Fragments
2
103331
<filename>src/boot/stage2/real.asm ; ; Copyright (c) 2019, <NAME> ; All rights reserved. ; ; Redistribution and use in source and binary forms, with or without ; modification, are permitted provided that the following conditions are met: ; ; 1. Redistributions of source code must retain the above copyright notice, this ; list of conditions and the following disclaimer. ; 2. Redistributions in binary form must reproduce the above copyright notice, ; this list of conditions and the following disclaimer in the documentation ; and/or other materials provided with the distribution. ; ; 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. ; BITS 32 SECTION .text GLOBAL enter_mode_real enter_mode_real: ; Load a 16 bit temporary GDT lgdt [GDT16.Descriptor] ;Jump into 16 bit pmode jmp 0x08:_protected16_thunk BITS 16 SECTION .data16 ALIGN 16 GDT16: .Null: dw 0x0000 dw 0x0000 db 0x00 db 0x00 db 0x00 db 0x00 .Code: dw 0xffff dw 0x0000 db 0x00 db 0x9a db 0x0f db 0x00 .Data: dw 0xffff dw 0x0000 db 0x00 db 0x92 db 0x0f db 0x00 .Descriptor: dw $ - GDT16 - 1 dd GDT16 SECTION .text16 ALIGN 4 _protected16_thunk: ; Load descriptors mov ax, 0x10 mov ss, ax mov ds, ax mov es, ax mov fs, ax mov gs, ax ; Disable protected mode mov eax, cr0 and ax, 0xfffe mov cr0, eax ; Jump into real mode jmp 0x00:_real_thunk _real_thunk: ; Load real descriptors xor ax, ax mov ss, ax mov ds, ax mov es, ax mov fs, ax mov gs, ax ; jmp to the target ret
agda-stdlib/src/Codata/Cowriter.agda
DreamLinuxer/popl21-artifact
5
13664
<filename>agda-stdlib/src/Codata/Cowriter.agda ------------------------------------------------------------------------ -- The Agda standard library -- -- The Cowriter type and some operations ------------------------------------------------------------------------ {-# OPTIONS --without-K --safe --sized-types #-} -- Disabled to prevent warnings from BoundedVec {-# OPTIONS --warn=noUserWarning #-} module Codata.Cowriter where open import Size open import Level as L using (Level) open import Codata.Thunk using (Thunk; force) open import Codata.Conat open import Codata.Delay using (Delay; later; now) open import Codata.Stream as Stream using (Stream; _∷_) open import Data.Unit open import Data.List.Base using (List; []; _∷_) open import Data.List.NonEmpty using (List⁺; _∷_) open import Data.Nat.Base as Nat using (ℕ; zero; suc) open import Data.Product as Prod using (_×_; _,_) open import Data.Sum.Base as Sum using (_⊎_; inj₁; inj₂) open import Data.Vec.Base using (Vec; []; _∷_) open import Data.Vec.Bounded as Vec≤ using (Vec≤; _,_) open import Function private variable a b w x : Level A : Set a B : Set b W : Set w X : Set x ------------------------------------------------------------------------ -- Definition data Cowriter (W : Set w) (A : Set a) (i : Size) : Set (a L.⊔ w) where [_] : A → Cowriter W A i _∷_ : W → Thunk (Cowriter W A) i → Cowriter W A i ------------------------------------------------------------------------ -- Relationship to Delay. fromDelay : ∀ {i} → Delay A i → Cowriter ⊤ A i fromDelay (now a) = [ a ] fromDelay (later da) = _ ∷ λ where .force → fromDelay (da .force) toDelay : ∀ {i} → Cowriter W A i → Delay A i toDelay [ a ] = now a toDelay (_ ∷ ca) = later λ where .force → toDelay (ca .force) ------------------------------------------------------------------------ -- Basic functions. fromStream : ∀ {i} → Stream W i → Cowriter W A i fromStream (w ∷ ws) = w ∷ λ where .force → fromStream (ws .force) repeat : W → Cowriter W A ∞ repeat = fromStream ∘′ Stream.repeat length : ∀ {i} → Cowriter W A i → Conat i length [ _ ] = zero length (w ∷ cw) = suc λ where .force → length (cw .force) splitAt : ∀ (n : ℕ) → Cowriter W A ∞ → (Vec W n × Cowriter W A ∞) ⊎ (Vec≤ W n × A) splitAt zero cw = inj₁ ([] , cw) splitAt (suc n) [ a ] = inj₂ (Vec≤.[] , a) splitAt (suc n) (w ∷ cw) = Sum.map (Prod.map₁ (w ∷_)) (Prod.map₁ (w Vec≤.∷_)) $ splitAt n (cw .force) take : ∀ (n : ℕ) → Cowriter W A ∞ → Vec W n ⊎ (Vec≤ W n × A) take n = Sum.map₁ Prod.proj₁ ∘′ splitAt n infixr 5 _++_ _⁺++_ _++_ : ∀ {i} → List W → Cowriter W A i → Cowriter W A i [] ++ ca = ca (w ∷ ws) ++ ca = w ∷ λ where .force → ws ++ ca _⁺++_ : ∀ {i} → List⁺ W → Thunk (Cowriter W A) i → Cowriter W A i (w ∷ ws) ⁺++ ca = w ∷ λ where .force → ws ++ ca .force concat : ∀ {i} → Cowriter (List⁺ W) A i → Cowriter W A i concat [ a ] = [ a ] concat (w ∷ ca) = w ⁺++ λ where .force → concat (ca .force) ------------------------------------------------------------------------ -- Functor, Applicative and Monad map : ∀ {i} → (W → X) → (A → B) → Cowriter W A i → Cowriter X B i map f g [ a ] = [ g a ] map f g (w ∷ cw) = f w ∷ λ where .force → map f g (cw .force) map₁ : ∀ {i} → (W → X) → Cowriter W A i → Cowriter X A i map₁ f = map f id map₂ : ∀ {i} → (A → X) → Cowriter W A i → Cowriter W X i map₂ = map id ap : ∀ {i} → Cowriter W (A → X) i → Cowriter W A i → Cowriter W X i ap [ f ] ca = map₂ f ca ap (w ∷ cf) ca = w ∷ λ where .force → ap (cf .force) ca _>>=_ : ∀ {i} → Cowriter W A i → (A → Cowriter W X i) → Cowriter W X i [ a ] >>= f = f a (w ∷ ca) >>= f = w ∷ λ where .force → ca .force >>= f ------------------------------------------------------------------------ -- Construction. unfold : ∀ {i} → (X → (W × X) ⊎ A) → X → Cowriter W A i unfold next seed with next seed ... | inj₁ (w , seed') = w ∷ λ where .force → unfold next seed' ... | inj₂ a = [ a ] ------------------------------------------------------------------------ -- DEPRECATED NAMES ------------------------------------------------------------------------ -- Please use the new names as continuing support for the old names is -- not guaranteed. -- Version 1.3 open import Data.BoundedVec as BVec using (BoundedVec) splitAt′ : ∀ (n : ℕ) → Cowriter W A ∞ → (Vec W n × Cowriter W A ∞) ⊎ (BoundedVec W n × A) splitAt′ zero cw = inj₁ ([] , cw) splitAt′ (suc n) [ a ] = inj₂ (BVec.[] , a) splitAt′ (suc n) (w ∷ cw) = Sum.map (Prod.map₁ (w ∷_)) (Prod.map₁ (w BVec.∷_)) $ splitAt′ n (cw .force) {-# WARNING_ON_USAGE splitAt′ "Warning: splitAt′ (and Data.BoundedVec) was deprecated in v1.3. Please use splitAt (and Data.Vec.Bounded) instead." #-} take′ : ∀ (n : ℕ) → Cowriter W A ∞ → Vec W n ⊎ (BoundedVec W n × A) take′ n = Sum.map₁ Prod.proj₁ ∘′ splitAt′ n {-# WARNING_ON_USAGE take′ "Warning: take′ (and Data.BoundedVec) was deprecated in v1.3. Please use take (and Data.Vec.Bounded) instead." #-}
data/pokemon/base_stats/carnivine.asm
TastySnax12/pokecrystal16-493-plus
2
164144
db 0 ; species ID placeholder db 74, 100, 72, 46, 90, 72 ; hp atk def spd sat sdf db GRASS, GRASS ; type db 200 ; catch rate db 159 ; base exp db NO_ITEM, NO_ITEM ; items db GENDER_F50 ; gender ratio db 100 ; unknown 1 db 25 ; step cycles to hatch db 5 ; unknown 2 INCBIN "gfx/pokemon/carnivine/front.dimensions" db 0, 0, 0, 0 ; padding db GROWTH_SLOW ; growth rate dn EGG_PLANT, EGG_PLANT ; egg groups ; tm/hm learnset tmhm CURSE, TOXIC, HIDDEN_POWER, SUNNY_DAY, SWEET_SCENT, SNORE, HYPER_BEAM, PROTECT, GIGA_DRAIN, ENDURE, FRUSTRATION, SOLARBEAM, RETURN, MUD_SLAP, DOUBLE_TEAM, SWAGGER, SLUDGE_BOMB, SLEEP_TALK, REST, ATTRACT, THIEF, FURY_CUTTER, CUT, FLASH ; end
libsrc/graphics/p2000/clsgraph.asm
meesokim/z88dk
0
86957
; ; Philips P2000 Graphics Functions ; ; cls () -- clear screen ; ; <NAME> - Apr 2014 ; ; ; $Id: clsgraph.asm,v 1.2 2015/01/19 01:32:50 pauloscustodio Exp $ ; PUBLIC cleargraphics EXTERN base_graphics .cleargraphics ; ld a,12 ; call $60C0 ; cls ld hl,(base_graphics) ld c,23 gfxset: ld (hl),23 ; Set graph mode modifier at the beginning of the text rows inc hl ld b,79 gfxrow: ld (hl),32 inc hl djnz gfxrow dec c jr nz,gfxset ret
Categories/CoProducts.agda
jmchapman/Relative-Monads
21
14012
module Categories.CoProducts where open import Data.Sum hiding ([_,_]) open import Library hiding (_+_ ; _,_) open import Categories record CoProd {l m}(C : Cat {l}{m}) : Set (m ⊔ l) where open Cat C field _+_ : Obj -> Obj -> Obj inl : ∀{A B} -> Hom A (A + B) inr : ∀{A B} -> Hom B (A + B) [_,_] : ∀{A B C} -> Hom A C -> Hom B C -> Hom (A + B) C law1 : ∀{A B C}(f : Hom A C)(g : Hom B C) → comp [ f , g ] inl ≅ f law2 : ∀{A B C}(f : Hom A C)(g : Hom B C) → comp [ f , g ] inr ≅ g law3 : ∀{A B C}(f : Hom A C)(g : Hom B C) (h : Hom (A + B) C) → comp h inl ≅ f → comp h inr ≅ g → h ≅ [ f , g ]
programs/oeis/058/A058919.asm
karttu/loda
1
169431
<gh_stars>1-10 ; A058919: a(n) = n^4/2 - n^3 + 3n^2/2 - n + 1. ; 1,1,5,25,85,221,481,925,1625,2665,4141,6161,8845,12325,16745,22261,29041,37265,47125,58825,72581,88621,107185,128525,152905,180601,211901,247105,286525,330485,379321,433381,493025,558625,630565,709241,795061,888445,989825,1099645,1218361,1346441,1484365,1632625,1791725,1962181,2144521,2339285,2547025,2768305,3003701,3253801,3519205,3800525,4098385,4413421,4746281,5097625,5468125,5858465,6269341,6701461,7155545,7632325,8132545,8656961,9206341,9781465,10383125,11012125,11669281,12355421,13071385,13818025,14596205,15406801,16250701,17128805,18042025,18991285,19977521,21001681,22064725,23167625,24311365,25496941,26725361,27997645,29314825,30677945,32088061,33546241,35053565,36611125,38220025,39881381,41596321,43365985,45191525,47074105,49014901,51015101,53075905,55198525,57384185,59634121,61949581,64331825,66782125,69301765,71892041,74554261,77289745,80099825,82985845,85949161,88991141,92113165,95316625,98602925,101973481,105429721,108973085,112605025,116327005,120140501,124047001,128048005,132145025,136339585,140633221,145027481,149523925,154124125,158829665,163642141,168563161,173594345,178737325,183993745,189365261,194853541,200460265,206187125,212035825,218008081,224105621,230330185,236683525,243167405,249783601,256533901,263420105,270444025,277607485,284912321,292360381,299953525,307693625,315582565,323622241,331814561,340161445,348664825,357326645,366148861,375133441,384282365,393597625,403081225,412735181,422561521,432562285,442739525,453095305,463631701,474350801,485254705,496345525,507625385,519096421,530760781,542620625,554678125,566935465,579394841,592058461,604928545,618007325,631297045,644799961,658518341,672454465,686610625,700989125,715592281,730422421,745481885,760773025,776298205,792059801,808060201,824301805,840787025,857518285,874498021,891728681,909212725,926952625,944950865,963209941,981732361,1000520645,1019577325,1038904945,1058506061,1078383241,1098539065,1118976125,1139697025,1160704381,1182000821,1203588985,1225471525,1247651105,1270130401,1292912101,1315998905,1339393525,1363098685,1387117121,1411451581,1436104825,1461079625,1486378765,1512005041,1537961261,1564250245,1590874825,1617837845,1645142161,1672790641,1700786165,1729131625,1757829925,1786883981,1816296721,1846071085,1876210025,1906716505 bin $0,2 add $0,1 bin $0,2 mov $1,$0 mul $1,4 add $1,1
HlslDecompiler.Tests/ShaderAssembly/ps_float4_construct2.asm
TBirdSoars/HlslDecompiler
0
170100
ps_3_0 def c0, 1, 0, 2, 0 dcl_texcoord v0.xy dcl_texcoord1 v1.zw mad oC0, v0.xxxy, c0.xyyx, c0.yyxy mad oC1, v0.xxxy, c0.yyxx, c0.yxyy mad oC2, v0.x, c0.yyyx, c0.yxzy mov oC3.xy, v0.xy mov oC3.zw, v1.xy
suokif/SUOKIF.g4
augustand/grammars-v4
0
3560
/* [The "BSD licence"] Copyright (c) 2014 <NAME> All rights reserved. Redistribution and use in source and binary forms, with or without modification, are permitted provided that the following conditions are met: 1. Redistributions of source code must retain the above copyright notice, this list of conditions and the following disclaimer. 2. Redistributions in binary form must reproduce the above copyright notice, this list of conditions and the following disclaimer in the documentation and/or other materials provided with the distribution. 3. The name of the author may not be used to endorse or promote products derived from this software without specific prior written permission. THIS SOFTWARE IS PROVIDED BY THE AUTHOR ``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 AUTHOR 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. */ /* Derived from http://sigmakee.cvs.sourceforge.net/viewvc/sigmakee/sigma/suo-kif.pdf */ grammar SUOKIF; top_level : sentence* ; term : VARIABLE | WORD | STRING | funterm | NUMBER | sentence ; argument : sentence | term ; funterm : '(' WORD argument+ ')' ; sentence : WORD | equation | relsent | logsent | quantsent | VARIABLE ; equation : '(' '=' term term ')' ; relsent : '(' ( WORD | VARIABLE ) argument+ ')' ; logsent : '(' NOT sentence ')' | '(' AND sentence+ ')' | '(' OR sentence+ ')' | '(' '=' '>' sentence sentence ')' | '(' '<' '=' '>' sentence sentence ')' ; quantsent : '(' FORALL '(' VARIABLE+ ')' sentence ')' | '(' EXISTS '(' VARIABLE+ ')' sentence ')' ; NOT : 'not' ; AND : 'and' ; OR : 'or' ; FORALL : 'forall' ; EXISTS : 'exists' ; fragment UPPER : [A-Z] ; fragment LOWER : [a-z] ; fragment DIGIT : [0-9] ; fragment INITIALCHAR : UPPER | LOWER ; fragment WORDCHAR : UPPER | LOWER | DIGIT | '-' | '_' ; WORD : INITIALCHAR WORDCHAR* ; STRING : '"' ~ ["\\]* '"' ; VARIABLE : '?' WORD | '@' WORD ; NUMBER : '-'? DIGIT+ ( '.' DIGIT+ )? EXPONENT? ; fragment EXPONENT : 'e' '-'? DIGIT+ ; WHITE : [ \t\n\r\v] -> skip ; COMMENT : ';' ~ [\r\n]* -> skip ; LPAREN : '(' ; RPAREN : ')' ; ASSIGN : '=' ; GT : '>' ; LT : '<' ; QUESTION : '?' ;
PRG/objects/D320.asm
narfman0/smb3_pp1
0
247404
.byte $00 ; Unknown purpose .byte OBJ_THWOMP, $3E, $12 .byte OBJ_ROTODISCCLOCKWISE, $45, $15 .byte OBJ_THWOMP, $4B, $12 .byte $FF ; Terminator
libs/CPC_V1_SimplePalette.asm
CurlyPaul/cpc-z80-twisting-tower
2
244291
<reponame>CurlyPaul/cpc-z80-twisting-tower ;;******************************************************************************************** ;; Originally based an example at http://www.cpcwiki.eu/index.php/Programming An_example_loader ;;******************************************************************************************** ColourPalette: ; hardware colours defb &44 ;; #0 Darkest Blue defb &55 ;; #1 Blue defb &57 ;; #2 Blue defb &5B ;; #3 Brightest Blue defb &4B ;; #4 White defb &5B ;; #5 defb &53 ;; #6 defb &5E ;; #7 defb &58 ;; #8 Darkest Purple defb &5D ;; #9 Purple defb &5F ;; #10 Purple defb &5B ;; #11 Brightest Purple (actually blue looks best here) defb &4B ;; #12 Another white defb &4C ;; #13 defb &54 ;; #14 Black defb &46 ;; #15 Background defb &46 ;; Border Palette_Init: ;; CPC has some quirks here as well, seems to be caused by the ability to flash each colour ;; ;; http://www.cpcwiki.eu/forum/programming/screen-scrolling-and-ink-commands/ ;; https://www.cpcwiki.eu/forum/programming/bios-call-scr_set_ink-and-interrupts/ ld hl,ColourPalette call SetupColours ret Palette_AllBackground: ld b,17 ;; 16 colours + 1 border xor a ;; start with pen 0 ld e,&46 DoColours_AllBlack: push bc ;; need to stash b as we are using it for our loop and need it ;; below to write to the port ld bc,&7F00 out (c),a ;; PENR:&7F{pp} - where pp is the palette/pen number out (c),e ;; INKR:&7F{hc} - where hc is the hardware colour number pop bc inc a ;; increment pen number djnz DoColours_AllBlack ret SetupColours: ;; Inputs: HL Address the palette values are stored ld b,17 ;; 16 colours + 1 border xor a ;; start with pen 0 DoColours: push bc ;; need to stash b as we are using it for our loop and need it ;; below to write to the port ld e,(hl) ;; read the value of the colour we want into e inc hl ;; move along ready for next time ld bc,&7F00 out (c),a ;; PENR:&7F{pp} - where pp is the palette/pen number out (c),e ;; INKR:&7F{hc} - where hc is the hardware colour number pop bc inc a ;; increment pen number djnz DoColours ret
Library/Kernel/Win/winManager.asm
steakknife/pcgeos
504
179760
COMMENT }------------------------------------------------------------------- Copyright (c) GeoWorks 1988 -- All Rights Reserved PROJECT: PC GEOS MODULE: Windowing system FILE: winManager.asm REVISION HISTORY: Name Date Description ---- ---- ----------- Jim 5/88... Initial version Doug 10/12/88 Changed files to win* from user* DESCRIPTION: This file assembles the windowing system code $Id: winManager.asm,v 1.1 97/04/05 01:16:21 newdeal Exp $ ----------------------------------------------------------------------------} include kernelGeode.def ;-------------------------------------- ; Include files ;-------------------------------------- include graphics.def include win.def ;includes: graphics.def include lmem.def include timer.def include sem.def include timedate.def include Objects/processC.def ;includes: object.def, metaClass.def include Objects/winC.def include Internal/gstate.def include Internal/grWinInt.def include Internal/window.def ;inclides: tmatrix.def include Internal/interrup.def include Internal/geodeStr.def ;includes: geode.def include Internal/im.def UseDriver Internal/videoDr.def ;-------------------------------------- include winMacro.def ;WIN macros include winConstant.def ;WIN constants ;------------------------------------- include winVariable.def ;------------------------------------- kcode segment include winCreDest.asm include winWindows.asm include winIndividual.asm include winState.asm include winUtils.asm include winTrans.asm include winNotification.asm include winGeode.asm kcode ends include winC.asm ;------------------------------------- kinit segment include winInit.asm kinit ends end
libsrc/_DEVELOPMENT/adt/b_vector/c/sdcc_iy/b_vector_pop_back_fastcall.asm
jpoikela/z88dk
640
95269
; int b_vector_pop_back_fastcall(b_vector_t *v) SECTION code_clib SECTION code_adt_b_vector PUBLIC _b_vector_pop_back_fastcall EXTERN _b_array_pop_back_fastcall defc _b_vector_pop_back_fastcall = _b_array_pop_back_fastcall
programs/oeis/209/A209646.asm
neoneye/loda
22
84936
<reponame>neoneye/loda ; A209646: Number of n X 4 0..1 arrays avoiding 0 0 1 and 1 0 0 horizontally and 0 0 1 and 1 0 1 vertically. ; 9,81,270,630,1215,2079,3276,4860,6885,9405,12474,16146,20475,25515,31320,37944,45441,53865,63270,73710,85239,97911,111780,126900,143325,161109,180306,200970,223155,246915,272304,299376,328185,358785,391230,425574,461871,500175,540540,583020,627669,674541,723690,775170,829035,885339,944136,1005480,1069425,1136025,1205334,1277406,1352295,1430055,1510740,1594404,1681101,1770885,1863810,1959930,2059299,2161971,2268000,2377440,2490345,2606769,2726766,2850390,2977695,3108735,3243564,3382236,3524805,3671325,3821850,3976434,4135131,4297995,4465080,4636440,4812129,4992201,5176710,5365710,5559255,5757399,5960196,6167700,6379965,6597045,6818994,7045866,7277715,7514595,7756560,8003664,8255961,8513505,8776350,9044550 mov $1,$0 sub $0,1 add $1,2 add $0,$1 bin $1,2 mul $0,$1 mul $0,9
src/Circle.agda
nad/equality
3
4436
<filename>src/Circle.agda ------------------------------------------------------------------------ -- The "circle" ------------------------------------------------------------------------ {-# OPTIONS --erased-cubical --safe #-} -- Partly following the HoTT book. -- The module is parametrised by a notion of equality. The higher -- constructor of the HIT defining the circle uses path equality, but -- the supplied notion of equality is used for many other things. import Equality.Path as P module Circle {e⁺} (eq : ∀ {a p} → P.Equality-with-paths a p e⁺) where open P.Derived-definitions-and-properties eq hiding (elim) open import Logical-equivalence using (_⇔_) open import Prelude open import Bijection equality-with-J as Bijection using (_↔_) import Bijection P.equality-with-J as PB open import Equality.Groupoid equality-with-J open import Equality.Path.Isomorphisms eq open import Equality.Path.Isomorphisms.Univalence eq import Equality.Path.Isomorphisms P.equality-with-paths as PI open import Equality.Tactic equality-with-J hiding (module Eq) open import Equivalence equality-with-J as Eq using (_≃_) import Equivalence P.equality-with-J as PE import Erased.Cubical eq as E open import Function-universe equality-with-J as F hiding (id; _∘_) open import Group equality-with-J as G using (_≃ᴳ_) import Group.Cyclic eq as C open import Groupoid equality-with-J open import H-level equality-with-J as H-level open import H-level.Closure equality-with-J open import H-level.Truncation eq as T using (∥_∥[1+_]) open import H-level.Truncation.Propositional eq as Trunc using (∥_∥; ∣_∣) open import H-level.Truncation.Propositional.One-step eq as O using (∥_∥¹) open import Integer equality-with-J as Int using (ℤ; +_; -[1+_]; ℤ-group) open import Nat equality-with-J open import Pointed-type equality-with-J as PT using (_≃ᴮ_) open import Pointed-type.Homotopy-group eq open import Sphere eq as Sphere using (𝕊) open import Suspension eq as Suspension using (Susp; north; south; meridian) open import Univalence-axiom equality-with-J as Univ using (Univalence) private variable a p : Level A : Type p P : A → Type p f : (x : A) → P x b ℓ x : A ------------------------------------------------------------------------ -- The type and some eliminators -- The circle. data 𝕊¹ : Type where base : 𝕊¹ loopᴾ : base P.≡ base loop : base ≡ base loop = _↔_.from ≡↔≡ loopᴾ -- A dependent eliminator, expressed using paths. elimᴾ : (P : 𝕊¹ → Type p) (b : P base) → P.[ (λ i → P (loopᴾ i)) ] b ≡ b → (x : 𝕊¹) → P x elimᴾ P b ℓ base = b elimᴾ P b ℓ (loopᴾ i) = ℓ i -- A non-dependent eliminator, expressed using paths. recᴾ : (b : A) → b P.≡ b → 𝕊¹ → A recᴾ = elimᴾ _ -- A dependent eliminator. elim : (P : 𝕊¹ → Type p) (b : P base) → subst P loop b ≡ b → (x : 𝕊¹) → P x elim P b ℓ = elimᴾ P b (subst≡→[]≡ ℓ) -- A "computation" rule. elim-loop : dcong (elim P b ℓ) loop ≡ ℓ elim-loop = dcong-subst≡→[]≡ (refl _) -- Every dependent function of type (x : 𝕊¹) → P x can be expressed -- using elim. η-elim : {f : (x : 𝕊¹) → P x} → f ≡ elim P (f base) (dcong f loop) η-elim {P = P} {f = f} = ⟨ext⟩ $ elim _ (refl _) (subst (λ x → f x ≡ elim P (f base) (dcong f loop) x) loop (refl _) ≡⟨ subst-in-terms-of-trans-and-dcong ⟩ trans (sym (dcong f loop)) (trans (cong (subst P loop) (refl _)) (dcong (elim P (f base) (dcong f loop)) loop)) ≡⟨ cong (trans (sym (dcong f loop))) $ trans (cong (flip trans _) $ cong-refl _) $ trans-reflˡ _ ⟩ trans (sym (dcong f loop)) (dcong (elim P (f base) (dcong f loop)) loop) ≡⟨ cong (trans (sym (dcong f loop))) elim-loop ⟩ trans (sym (dcong f loop)) (dcong f loop) ≡⟨ trans-symˡ _ ⟩∎ refl _ ∎) -- A non-dependent eliminator. rec : (b : A) → b ≡ b → 𝕊¹ → A rec b ℓ = recᴾ b (_↔_.to ≡↔≡ ℓ) -- A "computation" rule. rec-loop : cong (rec b ℓ) loop ≡ ℓ rec-loop = cong-≡↔≡ (refl _) -- Every function from 𝕊¹ to A can be expressed using rec. η-rec : {f : 𝕊¹ → A} → f ≡ rec (f base) (cong f loop) η-rec {f = f} = ⟨ext⟩ $ elim _ (refl _) (subst (λ x → f x ≡ rec (f base) (cong f loop) x) loop (refl _) ≡⟨ subst-in-terms-of-trans-and-cong ⟩ trans (sym (cong f loop)) (trans (refl _) (cong (rec (f base) (cong f loop)) loop)) ≡⟨ cong (trans (sym (cong f loop))) $ trans-reflˡ _ ⟩ trans (sym (cong f loop)) (cong (rec (f base) (cong f loop)) loop) ≡⟨ cong (trans (sym (cong f loop))) rec-loop ⟩ trans (sym (cong f loop)) (cong f loop) ≡⟨ trans-symˡ _ ⟩∎ refl _ ∎) -- An alternative non-dependent eliminator. rec′ : (b : A) → b ≡ b → 𝕊¹ → A rec′ {A = A} b ℓ = elim (const A) b (subst (const A) loop b ≡⟨ subst-const _ ⟩ b ≡⟨ ℓ ⟩∎ b ∎) -- A "computation" rule. rec′-loop : cong (rec′ b ℓ) loop ≡ ℓ rec′-loop = dcong≡→cong≡ elim-loop ------------------------------------------------------------------------ -- Some equivalences -- The circle can be expressed as a suspension. 𝕊¹≃Susp-Bool : 𝕊¹ ≃ Susp Bool 𝕊¹≃Susp-Bool = Eq.↔→≃ to from to∘from from∘to where north≡north = north ≡⟨ meridian false ⟩ south ≡⟨ sym $ meridian true ⟩∎ north ∎ to : 𝕊¹ → Susp Bool to = rec north north≡north module From = Suspension.Rec base base (if_then refl base else loop) from : Susp Bool → 𝕊¹ from = From.rec to∘from : ∀ x → to (from x) ≡ x to∘from = Suspension.elim _ (to (from north) ≡⟨⟩ north ∎) (to (from south) ≡⟨⟩ north ≡⟨ meridian true ⟩∎ south ∎) (λ b → subst (λ x → to (from x) ≡ x) (meridian b) (refl north) ≡⟨ subst-in-terms-of-trans-and-cong ⟩ trans (sym (cong (to ∘ from) (meridian b))) (trans (refl _) (cong id (meridian b))) ≡⟨ cong₂ (trans ∘ sym) (trans (sym $ cong-∘ _ _ _) $ cong (cong to) From.rec-meridian) (trans (trans-reflˡ _) $ sym $ cong-id _) ⟩ trans (sym (cong to (if b then refl base else loop))) (meridian b) ≡⟨ lemma b ⟩∎ meridian true ∎) where lemma : (b : Bool) → _ ≡ _ lemma true = trans (sym (cong to (if true ⦂ Bool then refl base else loop))) (meridian true) ≡⟨⟩ trans (sym (cong to (refl base))) (meridian true) ≡⟨ prove (Trans (Sym (Cong _ Refl)) (Lift _)) (Lift _) (refl _) ⟩∎ meridian true ∎ lemma false = trans (sym (cong to (if false ⦂ Bool then refl base else loop))) (meridian false) ≡⟨⟩ trans (sym (cong to loop)) (meridian false) ≡⟨ cong (λ p → trans (sym p) (meridian false)) rec-loop ⟩ trans (sym north≡north) (meridian false) ≡⟨ prove (Trans (Sym (Trans (Lift _) (Sym (Lift _)))) (Lift _)) (Trans (Trans (Lift _) (Sym (Lift _))) (Lift _)) (refl _) ⟩ trans (trans (meridian true) (sym $ meridian false)) (meridian false) ≡⟨ trans-[trans-sym]- _ _ ⟩∎ meridian true ∎ from∘to : ∀ x → from (to x) ≡ x from∘to = elim _ (from (to base) ≡⟨⟩ base ∎) (subst (λ x → from (to x) ≡ x) loop (refl base) ≡⟨ subst-in-terms-of-trans-and-cong ⟩ trans (sym (cong (from ∘ to) loop)) (trans (refl base) (cong id loop)) ≡⟨ cong₂ (trans ∘ sym) (trans (sym $ cong-∘ _ to _) $ cong (cong from) rec-loop) (trans (trans-reflˡ _) $ sym $ cong-id _) ⟩ trans (sym (cong from north≡north)) loop ≡⟨ prove (Trans (Sym (Cong _ (Trans (Lift _) (Sym (Lift _))))) (Lift _)) (Trans (Trans (Cong from (Lift (meridian true))) (Sym (Cong from (Lift (meridian false))))) (Lift _)) (refl _) ⟩ trans (trans (cong from (meridian true)) (sym $ cong from (meridian false))) loop ≡⟨ cong₂ (λ p q → trans (trans p (sym q)) loop) From.rec-meridian From.rec-meridian ⟩ trans (trans (if true ⦂ Bool then refl base else loop) (sym $ if false ⦂ Bool then refl base else loop)) loop ≡⟨⟩ trans (trans (refl base) (sym loop)) loop ≡⟨ trans-[trans-sym]- _ _ ⟩∎ refl base ∎) -- The circle is equivalent to the 1-dimensional sphere. 𝕊¹≃𝕊¹ : 𝕊¹ ≃ 𝕊 1 𝕊¹≃𝕊¹ = 𝕊¹ ↝⟨ 𝕊¹≃Susp-Bool ⟩ Susp Bool ↔⟨ Suspension.cong-↔ Sphere.Bool↔𝕊⁰ ⟩ Susp (𝕊 0) ↔⟨⟩ 𝕊 1 □ ------------------------------------------------------------------------ -- The loop space of the circle -- The function trans is commutative for the loop space of the circle. trans-commutative : (p q : base ≡ base) → trans p q ≡ trans q p trans-commutative = flip $ Transitivity-commutative.commutative base _∙_ ∙-base base-∙ where _∙_ : 𝕊¹ → 𝕊¹ → 𝕊¹ x ∙ y = rec x (elim (λ x → x ≡ x) loop lemma x) y where lemma : subst (λ x → x ≡ x) loop loop ≡ loop lemma = ≡⇒↝ _ (sym [subst≡]≡[trans≡trans]) (refl _) base-∙ : ∀ x → x ∙ base ≡ x base-∙ _ = refl _ ∙-base : ∀ y → base ∙ y ≡ y ∙-base = elim _ (refl _) (subst (λ x → rec base loop x ≡ x) loop (refl _) ≡⟨ subst-in-terms-of-trans-and-cong ⟩ trans (sym (cong (rec base loop) loop)) (trans (refl _) (cong id loop)) ≡⟨ cong (trans _) $ trans-reflˡ _ ⟩ trans (sym (cong (rec base loop) loop)) (cong id loop) ≡⟨ cong₂ (trans ∘ sym) rec-loop (sym $ cong-id _) ⟩ trans (sym loop) loop ≡⟨ trans-symˡ _ ⟩∎ refl _ ∎) -- The loop space is equivalent to x ≡ x, for any x : 𝕊¹. base≡base≃≡ : {x : 𝕊¹} → (base ≡ base) ≃ (x ≡ x) base≡base≃≡ = elim (λ x → (base ≡ base) ≃ (x ≡ x)) Eq.id (Eq.lift-equality ext $ ⟨ext⟩ λ eq → _≃_.to (subst (λ x → (base ≡ base) ≃ (x ≡ x)) loop Eq.id) eq ≡⟨ cong (_$ eq) Eq.to-subst ⟩ subst (λ x → base ≡ base → x ≡ x) loop id eq ≡⟨ subst-→ ⟩ subst (λ x → x ≡ x) loop (subst (λ _ → base ≡ base) (sym loop) eq) ≡⟨ cong (subst (λ x → x ≡ x) loop) $ subst-const _ ⟩ subst (λ x → x ≡ x) loop eq ≡⟨ ≡⇒↝ _ (sym [subst≡]≡[trans≡trans]) ( trans eq loop ≡⟨ trans-commutative _ _ ⟩∎ trans loop eq ∎) ⟩∎ eq ∎) _ private -- Definitions used to define base≡base≃ℤ and Fundamental-group≃ℤ. module base≡base≃ℤ (univ : Univalence lzero) where -- The universal cover of the circle. Cover : 𝕊¹ → Type Cover = rec ℤ (Univ.≃⇒≡ univ Int.successor) to : base ≡ x → Cover x to = flip (subst Cover) (+ 0) ≡⇒≃-cong-Cover-loop : Univ.≡⇒≃ (cong Cover loop) ≡ Int.successor ≡⇒≃-cong-Cover-loop = Univ.≡⇒≃ (cong Cover loop) ≡⟨ cong Univ.≡⇒≃ rec-loop ⟩ Univ.≡⇒≃ (Univ.≃⇒≡ univ Int.successor) ≡⟨ _≃_.right-inverse-of (Univ.≡≃≃ univ) _ ⟩∎ Int.successor ∎ subst-Cover-loop : ∀ i → subst Cover loop i ≡ Int.suc i subst-Cover-loop i = subst Cover loop i ≡⟨ subst-in-terms-of-≡⇒↝ equivalence _ _ _ ⟩ Univ.≡⇒→ (cong Cover loop) i ≡⟨ cong (λ eq → _≃_.to eq _) ≡⇒≃-cong-Cover-loop ⟩∎ _≃_.to Int.successor i ∎ subst-Cover-sym-loop : ∀ i → subst Cover (sym loop) i ≡ Int.pred i subst-Cover-sym-loop i = subst Cover (sym loop) i ≡⟨ subst-in-terms-of-inverse∘≡⇒↝ equivalence _ _ _ ⟩ _≃_.from (Univ.≡⇒≃ (cong Cover loop)) i ≡⟨ cong (λ eq → _≃_.from eq _) ≡⇒≃-cong-Cover-loop ⟩∎ _≃_.from Int.successor i ∎ module 𝕊¹-G = Groupoid (groupoid 𝕊¹) loops : ℤ → base ≡ base loops = loop 𝕊¹-G.^_ to-loops : ∀ i → to (loops i) ≡ i to-loops (+ zero) = subst Cover (refl _) (+ 0) ≡⟨ subst-refl _ _ ⟩∎ + zero ∎ to-loops (+ suc n) = subst Cover (trans (loops (+ n)) loop) (+ 0) ≡⟨ sym $ subst-subst _ _ _ _ ⟩ subst Cover loop (subst Cover (loops (+ n)) (+ 0)) ≡⟨⟩ subst Cover loop (to (loops (+ n))) ≡⟨ cong (subst Cover loop) $ to-loops (+ n) ⟩ subst Cover loop (+ n) ≡⟨ subst-Cover-loop _ ⟩∎ + suc n ∎ to-loops -[1+ zero ] = subst Cover (trans (refl _) (sym loop)) (+ 0) ≡⟨ cong (flip (subst Cover) _) $ trans-reflˡ _ ⟩ subst Cover (sym loop) (+ 0) ≡⟨ subst-Cover-sym-loop _ ⟩∎ -[1+ zero ] ∎ to-loops -[1+ suc n ] = subst Cover (trans (loops -[1+ n ]) (sym loop)) (+ 0) ≡⟨ sym $ subst-subst _ _ _ _ ⟩ subst Cover (sym loop) (subst Cover (loops -[1+ n ]) (+ 0)) ≡⟨⟩ subst Cover (sym loop) (to (loops -[1+ n ])) ≡⟨ cong (subst Cover (sym loop)) $ to-loops -[1+ n ] ⟩ subst Cover (sym loop) -[1+ n ] ≡⟨ subst-Cover-sym-loop _ ⟩∎ -[1+ suc n ] ∎ loops-pred-loop : ∀ i → trans (loops (Int.pred i)) loop ≡ loops i loops-pred-loop i = trans (loops (Int.pred i)) loop ≡⟨ cong (flip trans _ ∘ loops) $ Int.pred≡-1+ i ⟩ trans (loops (Int.-[ 1 ] Int.+ i)) loop ≡⟨ cong (flip trans _) $ sym $ 𝕊¹-G.^∘^ {j = i} Int.-[ 1 ] ⟩ trans (trans (loops i) (loops (Int.-[ 1 ]))) loop ≡⟨⟩ trans (trans (loops i) (trans (refl _) (sym loop))) loop ≡⟨ cong (flip trans _) $ cong (trans _) $ trans-reflˡ _ ⟩ trans (trans (loops i) (sym loop)) loop ≡⟨ trans-[trans-sym]- _ _ ⟩∎ loops i ∎ from : ∀ x → Cover x → base ≡ x from = elim _ loops (⟨ext⟩ λ i → subst (λ x → Cover x → base ≡ x) loop loops i ≡⟨ subst-→ ⟩ subst (base ≡_) loop (loops (subst Cover (sym loop) i)) ≡⟨ sym trans-subst ⟩ trans (loops (subst Cover (sym loop) i)) loop ≡⟨ cong (flip trans _ ∘ loops) $ subst-Cover-sym-loop _ ⟩ trans (loops (Int.pred i)) loop ≡⟨ loops-pred-loop i ⟩∎ loops i ∎) from-to : (eq : base ≡ x) → from x (to eq) ≡ eq from-to = elim¹ (λ {x} eq → from x (to eq) ≡ eq) (from base (to (refl base)) ≡⟨⟩ loops (subst Cover (refl base) (+ 0)) ≡⟨ cong loops $ subst-refl _ _ ⟩ loops (+ 0) ≡⟨⟩ refl base ∎) loops-+ : ∀ i j → loops (i Int.+ j) ≡ trans (loops i) (loops j) loops-+ i j = loops (i Int.+ j) ≡⟨ cong loops $ Int.+-comm i ⟩ loops (j Int.+ i) ≡⟨ sym $ 𝕊¹-G.^∘^ j ⟩∎ trans (loops i) (loops j) ∎ -- The loop space of the circle is equivalent to the type of integers -- (assuming univalence). -- -- The proof is based on the one presented by Licata and Shulman in -- "Calculating the Fundamental Group of the Circle in Homotopy Type -- Theory". base≡base≃ℤ : Univalence lzero → (base ≡ base) ≃ ℤ base≡base≃ℤ univ = Eq.↔→≃ to loops to-loops from-to where open base≡base≃ℤ univ -- The circle's fundamental group is equivalent to the group of -- integers (assuming univalence). Fundamental-group≃ℤ : Univalence lzero → Fundamental-group (𝕊¹ , base) ≃ᴳ ℤ-group Fundamental-group≃ℤ univ = G.≃ᴳ-sym λ where .G.Homomorphic.related → inverse (∥ base ≡ base ∥[1+ 1 ] ↝⟨ T.∥∥-cong $ base≡base≃ℤ univ ⟩ ∥ ℤ ∥[1+ 1 ] ↔⟨ _⇔_.to (T.+⇔∥∥↔ {n = 1}) Int.ℤ-set ⟩□ ℤ □) .G.Homomorphic.homomorphic i j → cong T.∣_∣ (loops-+ i j) where open base≡base≃ℤ univ -- The circle is a groupoid (assuming univalence). 𝕊¹-groupoid : Univalence lzero → H-level 3 𝕊¹ 𝕊¹-groupoid univ {x = x} {y = y} = $⟨ (λ {_ _} → Int.ℤ-set) ⟩ Is-set ℤ ↝⟨ H-level-cong _ 2 (inverse $ base≡base≃ℤ univ) ⦂ (_ → _) ⟩ Is-set (base ≡ base) ↝⟨ (λ s → elim (λ x → ∀ y → Is-set (x ≡ y)) (elim _ s (H-level-propositional ext 2 _ _)) ((Π-closure ext 1 λ _ → H-level-propositional ext 2) _ _) x y) ⟩□ Is-set (x ≡ y) □ -- The type of endofunctions on 𝕊¹ is equivalent to -- ∃ λ (x : 𝕊¹) → x ≡ x. 𝕊¹→𝕊¹≃Σ𝕊¹≡ : (𝕊¹ → 𝕊¹) ≃ ∃ λ (x : 𝕊¹) → x ≡ x 𝕊¹→𝕊¹≃Σ𝕊¹≡ = Eq.↔→≃ to from to-from from-to where to : (𝕊¹ → 𝕊¹) → ∃ λ (x : 𝕊¹) → x ≡ x to f = f base , cong f loop from : (∃ λ (x : 𝕊¹) → x ≡ x) → (𝕊¹ → 𝕊¹) from = uncurry rec to-from : ∀ p → to (from p) ≡ p to-from (x , eq) = cong (x ,_) (cong (rec x eq) loop ≡⟨ rec-loop ⟩∎ eq ∎) from-to : ∀ f → from (to f) ≡ f from-to f = rec (f base) (cong f loop) ≡⟨ sym η-rec ⟩∎ f ∎ -- The type of endofunctions on 𝕊¹ is equivalent to 𝕊¹ × ℤ (assuming -- univalence). -- -- This result was pointed out to me by <NAME>. 𝕊¹→𝕊¹≃𝕊¹×ℤ : Univalence lzero → (𝕊¹ → 𝕊¹) ≃ (𝕊¹ × ℤ) 𝕊¹→𝕊¹≃𝕊¹×ℤ univ = (𝕊¹ → 𝕊¹) ↝⟨ 𝕊¹→𝕊¹≃Σ𝕊¹≡ ⟩ (∃ λ (x : 𝕊¹) → x ≡ x) ↝⟨ (∃-cong λ _ → inverse base≡base≃≡) ⟩ 𝕊¹ × base ≡ base ↝⟨ (∃-cong λ _ → base≡base≃ℤ univ) ⟩□ 𝕊¹ × ℤ □ -- The forward direction of 𝕊¹→𝕊¹≃𝕊¹×ℤ maps the identity function to -- base , + 1. 𝕊¹→𝕊¹≃𝕊¹×ℤ-id : (univ : Univalence lzero) → _≃_.to (𝕊¹→𝕊¹≃𝕊¹×ℤ univ) id ≡ (base , + 1) 𝕊¹→𝕊¹≃𝕊¹×ℤ-id univ = _≃_.from-to (𝕊¹→𝕊¹≃𝕊¹×ℤ univ) (rec base (trans (refl base) loop) ≡⟨ cong (rec base) $ trans-reflˡ _ ⟩ rec base loop ≡⟨ cong (rec base) $ cong-id _ ⟩ rec base (cong id loop) ≡⟨ sym η-rec ⟩∎ id ∎) -- The forward direction of 𝕊¹→𝕊¹≃𝕊¹×ℤ maps the constant function -- returning base to base , + 0. 𝕊¹→𝕊¹≃𝕊¹×ℤ-const : (univ : Univalence lzero) → _≃_.to (𝕊¹→𝕊¹≃𝕊¹×ℤ univ) (const base) ≡ (base , + 0) 𝕊¹→𝕊¹≃𝕊¹×ℤ-const univ = _≃_.from-to (𝕊¹→𝕊¹≃𝕊¹×ℤ univ) (rec base (refl base) ≡⟨ cong (rec base) $ sym $ cong-const _ ⟩ rec base (cong (const base) loop) ≡⟨ sym η-rec ⟩∎ const base ∎) ------------------------------------------------------------------------ -- A conversion function -- The one-step truncation of the unit type is equivalent to the -- circle. -- -- <NAME> informed me about this result. ∥⊤∥¹≃𝕊¹ : ∥ ⊤ ∥¹ ≃ 𝕊¹ ∥⊤∥¹≃𝕊¹ = _↔_.from ≃↔≃ $ PE.↔→≃ (O.recᴾ λ where .O.∣∣ʳ _ → base .O.∣∣-constantʳ _ _ → loopᴾ) (recᴾ O.∣ _ ∣ (O.∣∣-constantᴾ _ _)) (elimᴾ _ P.refl (λ _ → P.refl)) (O.elimᴾ λ where .O.∣∣ʳ _ → P.refl .O.∣∣-constantʳ _ _ _ → P.refl) ------------------------------------------------------------------------ -- Some negative results -- The equality loop is not equal to refl base. loop≢refl : loop ≢ refl base loop≢refl = E.Stable-¬ E.[ loop ≡ refl base →⟨ Type-set ⟩ Is-set Type →⟨ Univ.¬-Type-set univ ⟩□ ⊥ □ ] where module _ (loop≡refl : loop ≡ refl base) where refl≡ : (A : Type) (A≡A : A ≡ A) → refl A ≡ A≡A refl≡ A A≡A = refl A ≡⟨⟩ refl (rec A A≡A base) ≡⟨ sym $ cong-refl _ ⟩ cong (rec A A≡A) (refl base) ≡⟨ cong (cong (rec A A≡A)) $ sym loop≡refl ⟩ cong (rec A A≡A) loop ≡⟨ rec-loop ⟩∎ A≡A ∎ Type-set : Is-set Type Type-set {x = A} {y = B} = elim¹ (λ p → ∀ q → p ≡ q) (refl≡ A) -- Thus the circle is not a set. ¬-𝕊¹-set : ¬ Is-set 𝕊¹ ¬-𝕊¹-set = Is-set 𝕊¹ ↝⟨ (λ h → h) ⟩ Is-proposition (base ≡ base) ↝⟨ (λ h → h _ _) ⟩ loop ≡ refl base ↝⟨ loop≢refl ⟩□ ⊥ □ -- It is not necessarily the case that the one-step truncation of a -- proposition is a proposition. ¬-Is-proposition-∥∥¹ : ¬ ({A : Type a} → Is-proposition A → Is-proposition ∥ A ∥¹) ¬-Is-proposition-∥∥¹ {a = a} = ({A : Type a} → Is-proposition A → Is-proposition ∥ A ∥¹) ↝⟨ _$ H-level.mono₁ 0 (↑-closure 0 ⊤-contractible) ⟩ Is-proposition ∥ ↑ a ⊤ ∥¹ ↝⟨ H-level-cong _ 1 (O.∥∥¹-cong-↔ Bijection.↑↔) ⟩ Is-proposition ∥ ⊤ ∥¹ ↝⟨ H-level-cong _ 1 ∥⊤∥¹≃𝕊¹ ⟩ Is-proposition 𝕊¹ ↝⟨ ¬-𝕊¹-set ∘ H-level.mono₁ 1 ⟩□ ⊥ □ -- A function with the type of refl (for 𝕊¹) that is not equal to -- refl. not-refl : (x : 𝕊¹) → x ≡ x not-refl = elim _ loop (subst (λ z → z ≡ z) loop loop ≡⟨ ≡⇒↝ _ (sym [subst≡]≡[trans≡trans]) (refl _) ⟩∎ loop ∎) -- The function not-refl is not equal to refl. not-refl≢refl : not-refl ≢ refl not-refl≢refl = not-refl ≡ refl ↝⟨ cong (_$ _) ⟩ loop ≡ refl base ↝⟨ loop≢refl ⟩□ ⊥ □ -- There is a value with the type of refl that is not equal to refl. ∃≢refl : ∃ λ (f : (x : 𝕊¹) → x ≡ x) → f ≢ refl ∃≢refl = not-refl , not-refl≢refl -- For every universe level there is a type A such that -- (x : A) → x ≡ x is not a proposition. ¬-type-of-refl-propositional : ∃ λ (A : Type a) → ¬ Is-proposition ((x : A) → x ≡ x) ¬-type-of-refl-propositional {a = a} = ↑ _ 𝕊¹ , (Is-proposition (∀ x → x ≡ x) ↝⟨ (λ prop → prop _ _) ⟩ cong lift ∘ proj₁ ∃≢refl ∘ lower ≡ cong lift ∘ refl ∘ lower ↝⟨ cong (_∘ lift) ⟩ cong lift ∘ proj₁ ∃≢refl ≡ cong lift ∘ refl ↝⟨ cong (cong lower ∘_) ⟩ cong lower ∘ cong lift ∘ proj₁ ∃≢refl ≡ cong lower ∘ cong lift ∘ refl ↝⟨ ≡⇒↝ _ (cong₂ _≡_ (⟨ext⟩ λ _ → cong-∘ _ _ _) (⟨ext⟩ λ _ → cong-∘ _ _ _)) ⟩ cong id ∘ proj₁ ∃≢refl ≡ cong id ∘ refl ↝⟨ ≡⇒↝ _ (sym $ cong₂ _≡_ (⟨ext⟩ λ _ → cong-id _) (⟨ext⟩ λ _ → cong-id _)) ⟩ proj₁ ∃≢refl ≡ refl ↝⟨ proj₂ ∃≢refl ⟩□ ⊥ □) -- Every element of the circle is /merely/ equal to the base point. -- -- This lemma was mentioned by <NAME> in a blog post -- (http://homotopytypetheory.org/2013/07/24/cohomology/). all-points-on-the-circle-are-merely-equal : (x : 𝕊¹) → ∥ x ≡ base ∥ all-points-on-the-circle-are-merely-equal = elim _ ∣ refl base ∣ (Trunc.truncation-is-proposition _ _) -- Thus every element of the circle is not not equal to the base -- point. all-points-on-the-circle-are-¬¬-equal : (x : 𝕊¹) → ¬ ¬ x ≡ base all-points-on-the-circle-are-¬¬-equal x = x ≢ base ↝⟨ Trunc.rec ⊥-propositional ⟩ ¬ ∥ x ≡ base ∥ ↝⟨ _$ all-points-on-the-circle-are-merely-equal x ⟩□ ⊥ □ -- It is not the case that every point on the circle is equal to the -- base point. ¬-all-points-on-the-circle-are-equal : ¬ ((x : 𝕊¹) → x ≡ base) ¬-all-points-on-the-circle-are-equal = ((x : 𝕊¹) → x ≡ base) ↝⟨ (λ hyp x y → x ≡⟨ hyp x ⟩ base ≡⟨ sym (hyp y) ⟩∎ y ∎) ⟩ Is-proposition 𝕊¹ ↝⟨ mono₁ 1 ⟩ Is-set 𝕊¹ ↝⟨ ¬-𝕊¹-set ⟩□ ⊥ □ -- Thus double-negation shift for Type-valued predicates over 𝕊¹ does -- not hold in general. ¬-double-negation-shift : ¬ ({P : 𝕊¹ → Type} → ((x : 𝕊¹) → ¬ ¬ P x) → ¬ ¬ ((x : 𝕊¹) → P x)) ¬-double-negation-shift = ({P : 𝕊¹ → Type} → ((x : 𝕊¹) → ¬ ¬ P x) → ¬ ¬ ((x : 𝕊¹) → P x)) ↝⟨ _$ all-points-on-the-circle-are-¬¬-equal ⟩ ¬ ¬ ((x : 𝕊¹) → x ≡ base) ↝⟨ _$ ¬-all-points-on-the-circle-are-equal ⟩□ ⊥ □ -- Furthermore excluded middle for arbitrary types (in Type) does not -- hold. ¬-excluded-middle : ¬ ({A : Type} → Dec A) ¬-excluded-middle = ({A : Type} → Dec A) ↝⟨ (λ em ¬¬a → [ id , ⊥-elim ∘ ¬¬a ] em) ⟩ ({A : Type} → ¬ ¬ A → A) ↝⟨ (λ dne → flip _$_ ∘ (dne ∘_)) ⟩ ({P : 𝕊¹ → Type} → ((x : 𝕊¹) → ¬ ¬ P x) → ¬ ¬ ((x : 𝕊¹) → P x)) ↝⟨ ¬-double-negation-shift ⟩□ ⊥ □ -- H-level.Closure.proj₁-closure cannot be generalised by replacing -- the assumption ∀ a → B a with ∀ a → ∥ B a ∥. -- -- This observation is due to <NAME>. ¬-generalised-proj₁-closure : ¬ ({A : Type} {B : A → Type} → (∀ a → ∥ B a ∥) → ∀ n → H-level n (Σ A B) → H-level n A) ¬-generalised-proj₁-closure generalised-proj₁-closure = $⟨ singleton-contractible _ ⟩ Contractible (Σ 𝕊¹ (_≡ base)) ↝⟨ generalised-proj₁-closure all-points-on-the-circle-are-merely-equal 0 ⟩ Contractible 𝕊¹ ↝⟨ mono (zero≤ 2) ⟩ Is-set 𝕊¹ ↝⟨ ¬-𝕊¹-set ⟩□ ⊥ □ -- There is no based equivalence between the circle and the product of -- the circle with itself. -- -- This result was pointed out to me by <NAME>. 𝕊¹≄ᴮ𝕊¹×𝕊¹ : ¬ (𝕊¹ , base) ≃ᴮ ((𝕊¹ , base) PT.× (𝕊¹ , base)) 𝕊¹≄ᴮ𝕊¹×𝕊¹ = E.Stable-¬ E.[ (𝕊¹ , base) ≃ᴮ ((𝕊¹ , base) PT.× (𝕊¹ , base)) ↝⟨ ≃ᴮ→≃ᴳ (𝕊¹ , base) ((𝕊¹ , base) PT.× (𝕊¹ , base)) 0 ⟩ Fundamental-group (𝕊¹ , base) ≃ᴳ Fundamental-group ((𝕊¹ , base) PT.× (𝕊¹ , base)) ↝⟨ flip G.↝ᴳ-trans (Homotopy-group-[1+ 0 ]-× (𝕊¹ , base) (𝕊¹ , base)) ⟩ Fundamental-group (𝕊¹ , base) ≃ᴳ (Fundamental-group (𝕊¹ , base) G.× Fundamental-group (𝕊¹ , base)) ↝⟨ flip G.↝ᴳ-trans (G.↝-× (Fundamental-group≃ℤ univ) (Fundamental-group≃ℤ univ)) ∘ G.↝ᴳ-trans (G.≃ᴳ-sym (Fundamental-group≃ℤ univ)) ⟩ ℤ-group ≃ᴳ (ℤ-group G.× ℤ-group) ↝⟨ C.ℤ≄ᴳℤ×ℤ ⟩□ ⊥ □ ] -- 𝕊¹ is not equivalent to 𝕊¹ × 𝕊¹. -- -- This result was pointed out to me by <NAME>. 𝕊¹≄𝕊¹×𝕊¹ : ¬ 𝕊¹ ≃ (𝕊¹ × 𝕊¹) 𝕊¹≄𝕊¹×𝕊¹ hyp = let x , y = _≃_.to hyp base in all-points-on-the-circle-are-¬¬-equal x λ x≡base → all-points-on-the-circle-are-¬¬-equal y λ y≡base → 𝕊¹≄ᴮ𝕊¹×𝕊¹ (hyp , cong₂ _,_ x≡base y≡base) ------------------------------------------------------------------------ -- An alternative approach to defining eliminators and proving -- computation rules for arbitrary notions of equality, based on an -- anonymous reviewer's suggestion -- Circle eq p is an axiomatisation of the circle, for the given -- notion of equality eq, eliminating into Type p. -- -- Note that the statement of the computation rule for "loop" is more -- complicated than above (elim-loop). The reason is that the -- computation rule for "base" does not hold definitionally. Circle : ∀ {e⁺} → (∀ {a p} → P.Equality-with-paths a p e⁺) → (p : Level) → Type (lsuc p) Circle eq p = ∃ λ (𝕊¹ : Type) → ∃ λ (base : 𝕊¹) → ∃ λ (loop : base ≡.≡ base) → (P : 𝕊¹ → Type p) (b : P base) (ℓ : ≡.subst P loop b ≡.≡ b) → ∃ λ (elim : (x : 𝕊¹) → P x) → ∃ λ (elim-base : elim base ≡.≡ b) → ≡.subst (λ b → ≡.subst P loop b ≡.≡ b) elim-base (≡.dcong elim loop) ≡.≡ ℓ where module ≡ = P.Derived-definitions-and-properties eq -- A circle defined for paths (P.equality-with-J) is equivalent to one -- defined for eq. Circle≃Circle : Circle P.equality-with-paths p ≃ Circle eq p Circle≃Circle = ∃-cong λ _ → ∃-cong λ _ → Σ-cong (inverse ≡↔≡) λ loop → ∀-cong ext λ P → ∀-cong ext λ b → Π-cong-contra ext subst≡↔subst≡ λ ℓ → ∃-cong λ f → Σ-cong (inverse ≡↔≡) λ f-base → let lemma = P.elim¹ (λ eq → _↔_.from subst≡↔subst≡ (P.subst (λ b → P.subst P loop b P.≡ b) eq (P.dcong f loop)) ≡ P.subst (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) eq (_↔_.from subst≡↔subst≡ (P.dcong f loop))) (_↔_.from subst≡↔subst≡ (P.subst (λ b → P.subst P loop b P.≡ b) P.refl (P.dcong f loop)) ≡⟨ cong (_↔_.from subst≡↔subst≡) $ _↔_.from ≡↔≡ $ P.subst-refl (λ b → P.subst P loop b P.≡ b) _ ⟩ _↔_.from subst≡↔subst≡ (P.dcong f loop) ≡⟨ sym $ _↔_.from ≡↔≡ $ P.subst-refl (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) _ ⟩∎ P.subst (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) P.refl (_↔_.from subst≡↔subst≡ (P.dcong f loop)) ∎) _ in P.subst (λ b → P.subst P loop b P.≡ b) f-base (P.dcong f loop) P.≡ _↔_.to subst≡↔subst≡ ℓ ↔⟨ ≡↔≡ F.∘ inverse (from≡↔≡to (Eq.↔⇒≃ subst≡↔subst≡)) F.∘ inverse ≡↔≡ ⟩ _↔_.from subst≡↔subst≡ (P.subst (λ b → P.subst P loop b P.≡ b) f-base (P.dcong f loop)) P.≡ ℓ ↝⟨ ≡⇒↝ _ (cong (P._≡ _) lemma) ⟩ P.subst (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) f-base (_↔_.from subst≡↔subst≡ (P.dcong f loop)) P.≡ ℓ ↝⟨ ≡⇒↝ _ $ cong (λ eq → P.subst (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) f-base eq P.≡ ℓ) $ _↔_.from-to (inverse subst≡↔subst≡) dcong≡dcong ⟩ P.subst (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) f-base (dcong f (_↔_.from ≡↔≡ loop)) P.≡ ℓ ↔⟨ inverse subst≡↔subst≡ ⟩□ subst (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) (_↔_.from ≡↔≡ f-base) (dcong f (_↔_.from ≡↔≡ loop)) ≡ ℓ □ -- An implemention of the circle for paths (P.equality-with-paths). circleᴾ : Circle P.equality-with-paths p circleᴾ = 𝕊¹ , base , loopᴾ , λ P b ℓ → let elim = elimᴾ P b (PI.subst≡→[]≡ {B = P} ℓ) in elim , P.refl , (P.subst (λ b → P.subst P loopᴾ b P.≡ b) P.refl (P.dcong elim loopᴾ) P.≡⟨ P.subst-refl (λ b → P.subst P loopᴾ b P.≡ b) _ ⟩ P.dcong elim loopᴾ P.≡⟨ PI.dcong-subst≡→[]≡ {f = elim} {eq₂ = ℓ} P.refl ⟩∎ ℓ ∎) -- An implementation of the circle for eq. circle : Circle eq p circle = _≃_.to Circle≃Circle circleᴾ -- The latter implementation computes in the right way for "base". _ : let _ , base′ , _ , elim′ = circle {p = p} in ∀ {P b ℓ} → proj₁ (elim′ P b ℓ) base′ ≡ b _ = refl _ -- The usual computation rule for "loop" can be derived. elim-loop-circle : let _ , _ , loop′ , elim′ = circle {p = p} in ∀ {P b ℓ} → dcong (proj₁ (elim′ P b ℓ)) loop′ ≡ ℓ elim-loop-circle {P = P} {b = b} {ℓ = ℓ} = let _ , _ , loop′ , elim′ = circle elim″ , elim″-base , elim″-loop = elim′ P b ℓ lemma = refl _ ≡⟨ sym from-≡↔≡-refl ⟩ _↔_.from ≡↔≡ P.refl ≡⟨⟩ elim″-base ∎ in dcong elim″ loop′ ≡⟨ sym $ subst-refl _ _ ⟩ subst (λ b → subst P loop′ b ≡ b) (refl _) (dcong elim″ loop′) ≡⟨ cong (λ eq → subst (λ b → subst P loop′ b ≡ b) eq (dcong elim″ loop′)) lemma ⟩ subst (λ b → subst P loop′ b ≡ b) elim″-base (dcong elim″ loop′) ≡⟨ elim″-loop ⟩∎ ℓ ∎ -- An alternative to Circle≃Circle that does not give the "right" -- computational behaviour for circle′ below. Circle≃Circle′ : Circle P.equality-with-paths p ≃ Circle eq p Circle≃Circle′ = ∃-cong λ _ → ∃-cong λ _ → Σ-cong (inverse ≡↔≡) λ loop → ∀-cong ext λ P → ∀-cong ext λ b → Π-cong ext (inverse subst≡↔subst≡) λ ℓ → ∃-cong λ f → Σ-cong (inverse ≡↔≡) λ f-base → let lemma = P.elim¹ (λ eq → _↔_.from subst≡↔subst≡ (P.subst (λ b → P.subst P loop b P.≡ b) eq (P.dcong f loop)) ≡ P.subst (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) eq (_↔_.from subst≡↔subst≡ (P.dcong f loop))) (_↔_.from subst≡↔subst≡ (P.subst (λ b → P.subst P loop b P.≡ b) P.refl (P.dcong f loop)) ≡⟨ cong (_↔_.from subst≡↔subst≡) $ _↔_.from ≡↔≡ $ P.subst-refl (λ b → P.subst P loop b P.≡ b) _ ⟩ _↔_.from subst≡↔subst≡ (P.dcong f loop) ≡⟨ sym $ _↔_.from ≡↔≡ $ P.subst-refl (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) _ ⟩∎ P.subst (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) P.refl (_↔_.from subst≡↔subst≡ (P.dcong f loop)) ∎) _ in P.subst (λ b → P.subst P loop b P.≡ b) f-base (P.dcong f loop) P.≡ ℓ ↔⟨ ≡↔≡ F.∘ from-isomorphism (inverse $ Eq.≃-≡ $ Eq.↔⇒≃ $ inverse subst≡↔subst≡) F.∘ inverse ≡↔≡ ⟩ _↔_.from subst≡↔subst≡ (P.subst (λ b → P.subst P loop b P.≡ b) f-base (P.dcong f loop)) P.≡ _↔_.from subst≡↔subst≡ ℓ ↝⟨ ≡⇒↝ _ (cong (P._≡ _↔_.from subst≡↔subst≡ ℓ) lemma) ⟩ P.subst (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) f-base (_↔_.from subst≡↔subst≡ (P.dcong f loop)) P.≡ _↔_.from subst≡↔subst≡ ℓ ↝⟨ ≡⇒↝ _ $ cong (λ eq → P.subst (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) f-base eq P.≡ _↔_.from subst≡↔subst≡ ℓ) $ _↔_.from-to (inverse subst≡↔subst≡) dcong≡dcong ⟩ P.subst (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) f-base (dcong f (_↔_.from ≡↔≡ loop)) P.≡ _↔_.from subst≡↔subst≡ ℓ ↔⟨ inverse subst≡↔subst≡ ⟩□ subst (λ b → subst P (_↔_.from ≡↔≡ loop) b ≡ b) (_↔_.from ≡↔≡ f-base) (dcong f (_↔_.from ≡↔≡ loop)) ≡ _↔_.from subst≡↔subst≡ ℓ □ -- An alternative implementation of the circle for eq. circle′ : Circle eq p circle′ = _≃_.to Circle≃Circle′ circleᴾ -- This implementation does not compute in the right way for "base". -- The following code is (at the time of writing) rejected by Agda. -- _ : -- let _ , base′ , _ , elim′ = circle′ {p = p} in -- ∀ {P b ℓ} → -- proj₁ (elim′ P b ℓ) base′ ≡ b -- _ = refl _
test/src/test_keyboard_window.ads
Fabien-Chouteau/Giza
7
17255
with Basic_Test_Window; use Basic_Test_Window; with Giza.Widget.Keyboards; package Test_Keyboard_Window is type Keyboard_Window is new Test_Window with private; type Keyboard_Window_Ref is access all Keyboard_Window; overriding procedure On_Init (This : in out Keyboard_Window); overriding procedure On_Displayed (This : in out Keyboard_Window) is null; overriding procedure On_Hidden (This : in out Keyboard_Window) is null; private type Keyboard_Window is new Test_Window with record Keyboard : aliased Giza.Widget.Keyboards.Instance; end record; end Test_Keyboard_Window;
programs/oeis/135/A135668.asm
neoneye/loda
22
19723
; A135668: a(n) = ceiling(n + sqrt(n)). ; 2,4,5,6,8,9,10,11,12,14,15,16,17,18,19,20,22,23,24,25,26,27,28,29,30,32,33,34,35,36,37,38,39,40,41,42,44,45,46,47,48,49,50,51,52,53,54,55,56,58,59,60,61,62,63,64,65,66,67,68,69,70,71,72,74,75,76,77,78,79,80,81,82,83,84,85,86,87,88,89,90,92,93,94,95,96,97,98,99,100,101,102,103,104,105,106,107,108,109,110 mov $1,$0 add $0,2 lpb $1 add $0,1 sub $1,3 trn $1,$2 add $2,2 lpe
gcc-gcc-7_3_0-release/gcc/testsuite/gnat.dg/renaming7_pkg.ads
best08618/asylo
7
28048
<gh_stars>1-10 package Renaming7_Pkg is A : Integer; end Renaming7_Pkg;
Sources/Globe_3d/glut_2d.ads
ForYouEyesOnly/Space-Convoy
1
26583
-- Some 2D GL utility functions based on GL, GLUT with GL; package GLUT_2D is ---------- -- Text -- ---------- type Font_type is ( Screen_9_by_15, Screen_8_by_13, Times_Roman_10, Times_Roman_24, Helvetica_10, Helvetica_12, Helvetica_18 ); procedure Text_Output ( s : String; font : Font_type ); -- Text output from 2D, screen coordinates procedure Text_output ( x, y : GL.Int; main_size_x, main_size_y : GL.Sizei; s : String; font : Font_type ); -- Text output from 3D coordinates procedure Text_output ( p : GL.Double_Vector_3D; s : String; font : Font_type ); ----------- -- Image -- ----------- procedure Put_Image ( Image_ID : Integer; x, y : GL.Int; size_x, size_y : GL.Int; main_size_x, main_size_y : GL.Sizei ); end GLUT_2D;
zombie.asm
vishal-pathare/xv6-public
0
101638
<reponame>vishal-pathare/xv6-public _zombie: file format elf32-i386 Disassembly of section .text: 00000000 <main>: #include "stat.h" #include "user.h" int main(void) { 0: 8d 4c 24 04 lea 0x4(%esp),%ecx 4: 83 e4 f0 and $0xfffffff0,%esp 7: ff 71 fc pushl -0x4(%ecx) a: 55 push %ebp b: 89 e5 mov %esp,%ebp d: 51 push %ecx e: 83 ec 04 sub $0x4,%esp if(fork() > 0) 11: e8 65 02 00 00 call 27b <fork> 16: 85 c0 test %eax,%eax 18: 7e 0d jle 27 <main+0x27> sleep(5); // Let child exit before parent. 1a: 83 ec 0c sub $0xc,%esp 1d: 6a 05 push $0x5 1f: e8 ef 02 00 00 call 313 <sleep> 24: 83 c4 10 add $0x10,%esp exit(); 27: e8 57 02 00 00 call 283 <exit> 2c: 66 90 xchg %ax,%ax 2e: 66 90 xchg %ax,%ax 00000030 <strcpy>: #include "user.h" #include "x86.h" char* strcpy(char *s, const char *t) { 30: 55 push %ebp char *os; os = s; while((*s++ = *t++) != 0) 31: 31 c0 xor %eax,%eax { 33: 89 e5 mov %esp,%ebp 35: 53 push %ebx 36: 8b 4d 08 mov 0x8(%ebp),%ecx 39: 8b 5d 0c mov 0xc(%ebp),%ebx 3c: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi while((*s++ = *t++) != 0) 40: 0f b6 14 03 movzbl (%ebx,%eax,1),%edx 44: 88 14 01 mov %dl,(%ecx,%eax,1) 47: 83 c0 01 add $0x1,%eax 4a: 84 d2 test %dl,%dl 4c: 75 f2 jne 40 <strcpy+0x10> ; return os; } 4e: 8b 5d fc mov -0x4(%ebp),%ebx 51: 89 c8 mov %ecx,%eax 53: c9 leave 54: c3 ret 55: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 5c: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi 00000060 <strcmp>: int strcmp(const char *p, const char *q) { 60: 55 push %ebp 61: 89 e5 mov %esp,%ebp 63: 53 push %ebx 64: 8b 4d 08 mov 0x8(%ebp),%ecx 67: 8b 55 0c mov 0xc(%ebp),%edx while(*p && *p == *q) 6a: 0f b6 01 movzbl (%ecx),%eax 6d: 0f b6 1a movzbl (%edx),%ebx 70: 84 c0 test %al,%al 72: 75 1d jne 91 <strcmp+0x31> 74: eb 2a jmp a0 <strcmp+0x40> 76: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 7d: 8d 76 00 lea 0x0(%esi),%esi 80: 0f b6 41 01 movzbl 0x1(%ecx),%eax p++, q++; 84: 83 c1 01 add $0x1,%ecx 87: 83 c2 01 add $0x1,%edx return (uchar)*p - (uchar)*q; 8a: 0f b6 1a movzbl (%edx),%ebx while(*p && *p == *q) 8d: 84 c0 test %al,%al 8f: 74 0f je a0 <strcmp+0x40> 91: 38 d8 cmp %bl,%al 93: 74 eb je 80 <strcmp+0x20> return (uchar)*p - (uchar)*q; 95: 29 d8 sub %ebx,%eax } 97: 8b 5d fc mov -0x4(%ebp),%ebx 9a: c9 leave 9b: c3 ret 9c: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi a0: 31 c0 xor %eax,%eax return (uchar)*p - (uchar)*q; a2: 29 d8 sub %ebx,%eax } a4: 8b 5d fc mov -0x4(%ebp),%ebx a7: c9 leave a8: c3 ret a9: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 000000b0 <strlen>: uint strlen(const char *s) { b0: 55 push %ebp b1: 89 e5 mov %esp,%ebp b3: 8b 55 08 mov 0x8(%ebp),%edx int n; for(n = 0; s[n]; n++) b6: 80 3a 00 cmpb $0x0,(%edx) b9: 74 15 je d0 <strlen+0x20> bb: 31 c0 xor %eax,%eax bd: 8d 76 00 lea 0x0(%esi),%esi c0: 83 c0 01 add $0x1,%eax c3: 80 3c 02 00 cmpb $0x0,(%edx,%eax,1) c7: 89 c1 mov %eax,%ecx c9: 75 f5 jne c0 <strlen+0x10> ; return n; } cb: 89 c8 mov %ecx,%eax cd: 5d pop %ebp ce: c3 ret cf: 90 nop for(n = 0; s[n]; n++) d0: 31 c9 xor %ecx,%ecx } d2: 5d pop %ebp d3: 89 c8 mov %ecx,%eax d5: c3 ret d6: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi dd: 8d 76 00 lea 0x0(%esi),%esi 000000e0 <memset>: void* memset(void *dst, int c, uint n) { e0: 55 push %ebp e1: 89 e5 mov %esp,%ebp e3: 57 push %edi e4: 8b 55 08 mov 0x8(%ebp),%edx } static inline void stosb(void *addr, int data, int cnt) { asm volatile("cld; rep stosb" : e7: 8b 4d 10 mov 0x10(%ebp),%ecx ea: 8b 45 0c mov 0xc(%ebp),%eax ed: 89 d7 mov %edx,%edi ef: fc cld f0: f3 aa rep stos %al,%es:(%edi) stosb(dst, c, n); return dst; } f2: 8b 7d fc mov -0x4(%ebp),%edi f5: 89 d0 mov %edx,%eax f7: c9 leave f8: c3 ret f9: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 00000100 <strchr>: char* strchr(const char *s, char c) { 100: 55 push %ebp 101: 89 e5 mov %esp,%ebp 103: 8b 45 08 mov 0x8(%ebp),%eax 106: 0f b6 4d 0c movzbl 0xc(%ebp),%ecx for(; *s; s++) 10a: 0f b6 10 movzbl (%eax),%edx 10d: 84 d2 test %dl,%dl 10f: 75 12 jne 123 <strchr+0x23> 111: eb 1d jmp 130 <strchr+0x30> 113: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi 117: 90 nop 118: 0f b6 50 01 movzbl 0x1(%eax),%edx 11c: 83 c0 01 add $0x1,%eax 11f: 84 d2 test %dl,%dl 121: 74 0d je 130 <strchr+0x30> if(*s == c) 123: 38 d1 cmp %dl,%cl 125: 75 f1 jne 118 <strchr+0x18> return (char*)s; return 0; } 127: 5d pop %ebp 128: c3 ret 129: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi return 0; 130: 31 c0 xor %eax,%eax } 132: 5d pop %ebp 133: c3 ret 134: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 13b: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi 13f: 90 nop 00000140 <gets>: char* gets(char *buf, int max) { 140: 55 push %ebp 141: 89 e5 mov %esp,%ebp 143: 57 push %edi 144: 56 push %esi int i, cc; char c; for(i=0; i+1 < max; ){ 145: 31 f6 xor %esi,%esi { 147: 53 push %ebx 148: 89 f3 mov %esi,%ebx 14a: 83 ec 1c sub $0x1c,%esp 14d: 8b 7d 08 mov 0x8(%ebp),%edi for(i=0; i+1 < max; ){ 150: eb 2f jmp 181 <gets+0x41> 152: 8d b6 00 00 00 00 lea 0x0(%esi),%esi cc = read(0, &c, 1); 158: 83 ec 04 sub $0x4,%esp 15b: 8d 45 e7 lea -0x19(%ebp),%eax 15e: 6a 01 push $0x1 160: 50 push %eax 161: 6a 00 push $0x0 163: e8 33 01 00 00 call 29b <read> if(cc < 1) 168: 83 c4 10 add $0x10,%esp 16b: 85 c0 test %eax,%eax 16d: 7e 1c jle 18b <gets+0x4b> break; buf[i++] = c; 16f: 0f b6 45 e7 movzbl -0x19(%ebp),%eax if(c == '\n' || c == '\r') 173: 83 c7 01 add $0x1,%edi buf[i++] = c; 176: 88 47 ff mov %al,-0x1(%edi) if(c == '\n' || c == '\r') 179: 3c 0a cmp $0xa,%al 17b: 74 23 je 1a0 <gets+0x60> 17d: 3c 0d cmp $0xd,%al 17f: 74 1f je 1a0 <gets+0x60> for(i=0; i+1 < max; ){ 181: 83 c3 01 add $0x1,%ebx buf[i++] = c; 184: 89 fe mov %edi,%esi for(i=0; i+1 < max; ){ 186: 3b 5d 0c cmp 0xc(%ebp),%ebx 189: 7c cd jl 158 <gets+0x18> 18b: 89 f3 mov %esi,%ebx break; } buf[i] = '\0'; return buf; } 18d: 8b 45 08 mov 0x8(%ebp),%eax buf[i] = '\0'; 190: c6 03 00 movb $0x0,(%ebx) } 193: 8d 65 f4 lea -0xc(%ebp),%esp 196: 5b pop %ebx 197: 5e pop %esi 198: 5f pop %edi 199: 5d pop %ebp 19a: c3 ret 19b: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi 19f: 90 nop buf[i] = '\0'; 1a0: 8b 75 08 mov 0x8(%ebp),%esi } 1a3: 8b 45 08 mov 0x8(%ebp),%eax buf[i] = '\0'; 1a6: 01 de add %ebx,%esi 1a8: 89 f3 mov %esi,%ebx 1aa: c6 03 00 movb $0x0,(%ebx) } 1ad: 8d 65 f4 lea -0xc(%ebp),%esp 1b0: 5b pop %ebx 1b1: 5e pop %esi 1b2: 5f pop %edi 1b3: 5d pop %ebp 1b4: c3 ret 1b5: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 1bc: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi 000001c0 <stat>: int stat(const char *n, struct stat *st) { 1c0: 55 push %ebp 1c1: 89 e5 mov %esp,%ebp 1c3: 56 push %esi 1c4: 53 push %ebx int fd; int r; fd = open(n, O_RDONLY); 1c5: 83 ec 08 sub $0x8,%esp 1c8: 6a 00 push $0x0 1ca: ff 75 08 pushl 0x8(%ebp) 1cd: e8 f1 00 00 00 call 2c3 <open> if(fd < 0) 1d2: 83 c4 10 add $0x10,%esp 1d5: 85 c0 test %eax,%eax 1d7: 78 27 js 200 <stat+0x40> return -1; r = fstat(fd, st); 1d9: 83 ec 08 sub $0x8,%esp 1dc: ff 75 0c pushl 0xc(%ebp) 1df: 89 c3 mov %eax,%ebx 1e1: 50 push %eax 1e2: e8 f4 00 00 00 call 2db <fstat> close(fd); 1e7: 89 1c 24 mov %ebx,(%esp) r = fstat(fd, st); 1ea: 89 c6 mov %eax,%esi close(fd); 1ec: e8 ba 00 00 00 call 2ab <close> return r; 1f1: 83 c4 10 add $0x10,%esp } 1f4: 8d 65 f8 lea -0x8(%ebp),%esp 1f7: 89 f0 mov %esi,%eax 1f9: 5b pop %ebx 1fa: 5e pop %esi 1fb: 5d pop %ebp 1fc: c3 ret 1fd: 8d 76 00 lea 0x0(%esi),%esi return -1; 200: be ff ff ff ff mov $0xffffffff,%esi 205: eb ed jmp 1f4 <stat+0x34> 207: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 20e: 66 90 xchg %ax,%ax 00000210 <atoi>: int atoi(const char *s) { 210: 55 push %ebp 211: 89 e5 mov %esp,%ebp 213: 53 push %ebx 214: 8b 55 08 mov 0x8(%ebp),%edx int n; n = 0; while('0' <= *s && *s <= '9') 217: 0f be 02 movsbl (%edx),%eax 21a: 8d 48 d0 lea -0x30(%eax),%ecx 21d: 80 f9 09 cmp $0x9,%cl n = 0; 220: b9 00 00 00 00 mov $0x0,%ecx while('0' <= *s && *s <= '9') 225: 77 1e ja 245 <atoi+0x35> 227: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 22e: 66 90 xchg %ax,%ax n = n*10 + *s++ - '0'; 230: 83 c2 01 add $0x1,%edx 233: 8d 0c 89 lea (%ecx,%ecx,4),%ecx 236: 8d 4c 48 d0 lea -0x30(%eax,%ecx,2),%ecx while('0' <= *s && *s <= '9') 23a: 0f be 02 movsbl (%edx),%eax 23d: 8d 58 d0 lea -0x30(%eax),%ebx 240: 80 fb 09 cmp $0x9,%bl 243: 76 eb jbe 230 <atoi+0x20> return n; } 245: 8b 5d fc mov -0x4(%ebp),%ebx 248: 89 c8 mov %ecx,%eax 24a: c9 leave 24b: c3 ret 24c: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi 00000250 <memmove>: void* memmove(void *vdst, const void *vsrc, int n) { 250: 55 push %ebp 251: 89 e5 mov %esp,%ebp 253: 57 push %edi 254: 8b 45 10 mov 0x10(%ebp),%eax 257: 8b 55 08 mov 0x8(%ebp),%edx 25a: 56 push %esi 25b: 8b 75 0c mov 0xc(%ebp),%esi char *dst; const char *src; dst = vdst; src = vsrc; while(n-- > 0) 25e: 85 c0 test %eax,%eax 260: 7e 13 jle 275 <memmove+0x25> 262: 01 d0 add %edx,%eax dst = vdst; 264: 89 d7 mov %edx,%edi 266: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 26d: 8d 76 00 lea 0x0(%esi),%esi *dst++ = *src++; 270: a4 movsb %ds:(%esi),%es:(%edi) while(n-- > 0) 271: 39 f8 cmp %edi,%eax 273: 75 fb jne 270 <memmove+0x20> return vdst; } 275: 5e pop %esi 276: 89 d0 mov %edx,%eax 278: 5f pop %edi 279: 5d pop %ebp 27a: c3 ret 0000027b <fork>: name: \ movl $SYS_ ## name, %eax; \ int $T_SYSCALL; \ ret SYSCALL(fork) 27b: b8 01 00 00 00 mov $0x1,%eax 280: cd 40 int $0x40 282: c3 ret 00000283 <exit>: SYSCALL(exit) 283: b8 02 00 00 00 mov $0x2,%eax 288: cd 40 int $0x40 28a: c3 ret 0000028b <wait>: SYSCALL(wait) 28b: b8 03 00 00 00 mov $0x3,%eax 290: cd 40 int $0x40 292: c3 ret 00000293 <pipe>: SYSCALL(pipe) 293: b8 04 00 00 00 mov $0x4,%eax 298: cd 40 int $0x40 29a: c3 ret 0000029b <read>: SYSCALL(read) 29b: b8 05 00 00 00 mov $0x5,%eax 2a0: cd 40 int $0x40 2a2: c3 ret 000002a3 <write>: SYSCALL(write) 2a3: b8 10 00 00 00 mov $0x10,%eax 2a8: cd 40 int $0x40 2aa: c3 ret 000002ab <close>: SYSCALL(close) 2ab: b8 15 00 00 00 mov $0x15,%eax 2b0: cd 40 int $0x40 2b2: c3 ret 000002b3 <kill>: SYSCALL(kill) 2b3: b8 06 00 00 00 mov $0x6,%eax 2b8: cd 40 int $0x40 2ba: c3 ret 000002bb <exec>: SYSCALL(exec) 2bb: b8 07 00 00 00 mov $0x7,%eax 2c0: cd 40 int $0x40 2c2: c3 ret 000002c3 <open>: SYSCALL(open) 2c3: b8 0f 00 00 00 mov $0xf,%eax 2c8: cd 40 int $0x40 2ca: c3 ret 000002cb <mknod>: SYSCALL(mknod) 2cb: b8 11 00 00 00 mov $0x11,%eax 2d0: cd 40 int $0x40 2d2: c3 ret 000002d3 <unlink>: SYSCALL(unlink) 2d3: b8 12 00 00 00 mov $0x12,%eax 2d8: cd 40 int $0x40 2da: c3 ret 000002db <fstat>: SYSCALL(fstat) 2db: b8 08 00 00 00 mov $0x8,%eax 2e0: cd 40 int $0x40 2e2: c3 ret 000002e3 <link>: SYSCALL(link) 2e3: b8 13 00 00 00 mov $0x13,%eax 2e8: cd 40 int $0x40 2ea: c3 ret 000002eb <mkdir>: SYSCALL(mkdir) 2eb: b8 14 00 00 00 mov $0x14,%eax 2f0: cd 40 int $0x40 2f2: c3 ret 000002f3 <chdir>: SYSCALL(chdir) 2f3: b8 09 00 00 00 mov $0x9,%eax 2f8: cd 40 int $0x40 2fa: c3 ret 000002fb <dup>: SYSCALL(dup) 2fb: b8 0a 00 00 00 mov $0xa,%eax 300: cd 40 int $0x40 302: c3 ret 00000303 <getpid>: SYSCALL(getpid) 303: b8 0b 00 00 00 mov $0xb,%eax 308: cd 40 int $0x40 30a: c3 ret 0000030b <sbrk>: SYSCALL(sbrk) 30b: b8 0c 00 00 00 mov $0xc,%eax 310: cd 40 int $0x40 312: c3 ret 00000313 <sleep>: SYSCALL(sleep) 313: b8 0d 00 00 00 mov $0xd,%eax 318: cd 40 int $0x40 31a: c3 ret 0000031b <uptime>: SYSCALL(uptime) 31b: b8 0e 00 00 00 mov $0xe,%eax 320: cd 40 int $0x40 322: c3 ret 00000323 <getyear>: SYSCALL(getyear) 323: b8 16 00 00 00 mov $0x16,%eax 328: cd 40 int $0x40 32a: c3 ret 0000032b <lseek>: 32b: b8 17 00 00 00 mov $0x17,%eax 330: cd 40 int $0x40 332: c3 ret 333: 66 90 xchg %ax,%ax 335: 66 90 xchg %ax,%ax 337: 66 90 xchg %ax,%ax 339: 66 90 xchg %ax,%ax 33b: 66 90 xchg %ax,%ax 33d: 66 90 xchg %ax,%ax 33f: 90 nop 00000340 <printint>: write(fd, &c, 1); } static void printint(int fd, int xx, int base, int sgn) { 340: 55 push %ebp 341: 89 e5 mov %esp,%ebp 343: 57 push %edi 344: 56 push %esi 345: 53 push %ebx 346: 83 ec 3c sub $0x3c,%esp 349: 89 4d c4 mov %ecx,-0x3c(%ebp) uint x; neg = 0; if(sgn && xx < 0){ neg = 1; x = -xx; 34c: 89 d1 mov %edx,%ecx { 34e: 89 45 b8 mov %eax,-0x48(%ebp) if(sgn && xx < 0){ 351: 85 d2 test %edx,%edx 353: 0f 89 7f 00 00 00 jns 3d8 <printint+0x98> 359: f6 45 08 01 testb $0x1,0x8(%ebp) 35d: 74 79 je 3d8 <printint+0x98> neg = 1; 35f: c7 45 bc 01 00 00 00 movl $0x1,-0x44(%ebp) x = -xx; 366: f7 d9 neg %ecx } else { x = xx; } i = 0; 368: 31 db xor %ebx,%ebx 36a: 8d 75 d7 lea -0x29(%ebp),%esi 36d: 8d 76 00 lea 0x0(%esi),%esi do{ buf[i++] = digits[x % base]; 370: 89 c8 mov %ecx,%eax 372: 31 d2 xor %edx,%edx 374: 89 cf mov %ecx,%edi 376: f7 75 c4 divl -0x3c(%ebp) 379: 0f b6 92 60 07 00 00 movzbl 0x760(%edx),%edx 380: 89 45 c0 mov %eax,-0x40(%ebp) 383: 89 d8 mov %ebx,%eax 385: 8d 5b 01 lea 0x1(%ebx),%ebx }while((x /= base) != 0); 388: 8b 4d c0 mov -0x40(%ebp),%ecx buf[i++] = digits[x % base]; 38b: 88 14 1e mov %dl,(%esi,%ebx,1) }while((x /= base) != 0); 38e: 39 7d c4 cmp %edi,-0x3c(%ebp) 391: 76 dd jbe 370 <printint+0x30> if(neg) 393: 8b 4d bc mov -0x44(%ebp),%ecx 396: 85 c9 test %ecx,%ecx 398: 74 0c je 3a6 <printint+0x66> buf[i++] = '-'; 39a: c6 44 1d d8 2d movb $0x2d,-0x28(%ebp,%ebx,1) buf[i++] = digits[x % base]; 39f: 89 d8 mov %ebx,%eax buf[i++] = '-'; 3a1: ba 2d 00 00 00 mov $0x2d,%edx while(--i >= 0) 3a6: 8b 7d b8 mov -0x48(%ebp),%edi 3a9: 8d 5c 05 d7 lea -0x29(%ebp,%eax,1),%ebx 3ad: eb 07 jmp 3b6 <printint+0x76> 3af: 90 nop putc(fd, buf[i]); 3b0: 0f b6 13 movzbl (%ebx),%edx 3b3: 83 eb 01 sub $0x1,%ebx write(fd, &c, 1); 3b6: 83 ec 04 sub $0x4,%esp 3b9: 88 55 d7 mov %dl,-0x29(%ebp) 3bc: 6a 01 push $0x1 3be: 56 push %esi 3bf: 57 push %edi 3c0: e8 de fe ff ff call 2a3 <write> while(--i >= 0) 3c5: 83 c4 10 add $0x10,%esp 3c8: 39 de cmp %ebx,%esi 3ca: 75 e4 jne 3b0 <printint+0x70> } 3cc: 8d 65 f4 lea -0xc(%ebp),%esp 3cf: 5b pop %ebx 3d0: 5e pop %esi 3d1: 5f pop %edi 3d2: 5d pop %ebp 3d3: c3 ret 3d4: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi neg = 0; 3d8: c7 45 bc 00 00 00 00 movl $0x0,-0x44(%ebp) 3df: eb 87 jmp 368 <printint+0x28> 3e1: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 3e8: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 3ef: 90 nop 000003f0 <printf>: // Print to the given fd. Only understands %d, %x, %p, %s. void printf(int fd, const char *fmt, ...) { 3f0: 55 push %ebp 3f1: 89 e5 mov %esp,%ebp 3f3: 57 push %edi 3f4: 56 push %esi 3f5: 53 push %ebx 3f6: 83 ec 2c sub $0x2c,%esp int c, i, state; uint *ap; state = 0; ap = (uint*)(void*)&fmt + 1; for(i = 0; fmt[i]; i++){ 3f9: 8b 75 0c mov 0xc(%ebp),%esi 3fc: 0f b6 1e movzbl (%esi),%ebx 3ff: 84 db test %bl,%bl 401: 0f 84 b8 00 00 00 je 4bf <printf+0xcf> ap = (uint*)(void*)&fmt + 1; 407: 8d 45 10 lea 0x10(%ebp),%eax 40a: 83 c6 01 add $0x1,%esi write(fd, &c, 1); 40d: 8d 7d e7 lea -0x19(%ebp),%edi state = 0; 410: 31 d2 xor %edx,%edx ap = (uint*)(void*)&fmt + 1; 412: 89 45 d0 mov %eax,-0x30(%ebp) 415: eb 37 jmp 44e <printf+0x5e> 417: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 41e: 66 90 xchg %ax,%ax 420: 89 55 d4 mov %edx,-0x2c(%ebp) c = fmt[i] & 0xff; if(state == 0){ if(c == '%'){ state = '%'; 423: ba 25 00 00 00 mov $0x25,%edx if(c == '%'){ 428: 83 f8 25 cmp $0x25,%eax 42b: 74 17 je 444 <printf+0x54> write(fd, &c, 1); 42d: 83 ec 04 sub $0x4,%esp 430: 88 5d e7 mov %bl,-0x19(%ebp) 433: 6a 01 push $0x1 435: 57 push %edi 436: ff 75 08 pushl 0x8(%ebp) 439: e8 65 fe ff ff call 2a3 <write> 43e: 8b 55 d4 mov -0x2c(%ebp),%edx } else { putc(fd, c); 441: 83 c4 10 add $0x10,%esp for(i = 0; fmt[i]; i++){ 444: 0f b6 1e movzbl (%esi),%ebx 447: 83 c6 01 add $0x1,%esi 44a: 84 db test %bl,%bl 44c: 74 71 je 4bf <printf+0xcf> c = fmt[i] & 0xff; 44e: 0f be cb movsbl %bl,%ecx 451: 0f b6 c3 movzbl %bl,%eax if(state == 0){ 454: 85 d2 test %edx,%edx 456: 74 c8 je 420 <printf+0x30> } } else if(state == '%'){ 458: 83 fa 25 cmp $0x25,%edx 45b: 75 e7 jne 444 <printf+0x54> if(c == 'd'){ 45d: 83 f8 64 cmp $0x64,%eax 460: 0f 84 9a 00 00 00 je 500 <printf+0x110> printint(fd, *ap, 10, 1); ap++; } else if(c == 'x' || c == 'p'){ 466: 81 e1 f7 00 00 00 and $0xf7,%ecx 46c: 83 f9 70 cmp $0x70,%ecx 46f: 74 5f je 4d0 <printf+0xe0> printint(fd, *ap, 16, 0); ap++; } else if(c == 's'){ 471: 83 f8 73 cmp $0x73,%eax 474: 0f 84 d6 00 00 00 je 550 <printf+0x160> s = "(null)"; while(*s != 0){ putc(fd, *s); s++; } } else if(c == 'c'){ 47a: 83 f8 63 cmp $0x63,%eax 47d: 0f 84 8d 00 00 00 je 510 <printf+0x120> putc(fd, *ap); ap++; } else if(c == '%'){ 483: 83 f8 25 cmp $0x25,%eax 486: 0f 84 b4 00 00 00 je 540 <printf+0x150> write(fd, &c, 1); 48c: 83 ec 04 sub $0x4,%esp 48f: c6 45 e7 25 movb $0x25,-0x19(%ebp) 493: 6a 01 push $0x1 495: 57 push %edi 496: ff 75 08 pushl 0x8(%ebp) 499: e8 05 fe ff ff call 2a3 <write> putc(fd, c); } else { // Unknown % sequence. Print it to draw attention. putc(fd, '%'); putc(fd, c); 49e: 88 5d e7 mov %bl,-0x19(%ebp) write(fd, &c, 1); 4a1: 83 c4 0c add $0xc,%esp 4a4: 6a 01 push $0x1 for(i = 0; fmt[i]; i++){ 4a6: 83 c6 01 add $0x1,%esi write(fd, &c, 1); 4a9: 57 push %edi 4aa: ff 75 08 pushl 0x8(%ebp) 4ad: e8 f1 fd ff ff call 2a3 <write> for(i = 0; fmt[i]; i++){ 4b2: 0f b6 5e ff movzbl -0x1(%esi),%ebx putc(fd, c); 4b6: 83 c4 10 add $0x10,%esp } state = 0; 4b9: 31 d2 xor %edx,%edx for(i = 0; fmt[i]; i++){ 4bb: 84 db test %bl,%bl 4bd: 75 8f jne 44e <printf+0x5e> } } } 4bf: 8d 65 f4 lea -0xc(%ebp),%esp 4c2: 5b pop %ebx 4c3: 5e pop %esi 4c4: 5f pop %edi 4c5: 5d pop %ebp 4c6: c3 ret 4c7: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 4ce: 66 90 xchg %ax,%ax printint(fd, *ap, 16, 0); 4d0: 83 ec 0c sub $0xc,%esp 4d3: b9 10 00 00 00 mov $0x10,%ecx 4d8: 6a 00 push $0x0 4da: 8b 5d d0 mov -0x30(%ebp),%ebx 4dd: 8b 45 08 mov 0x8(%ebp),%eax 4e0: 8b 13 mov (%ebx),%edx 4e2: e8 59 fe ff ff call 340 <printint> ap++; 4e7: 89 d8 mov %ebx,%eax 4e9: 83 c4 10 add $0x10,%esp state = 0; 4ec: 31 d2 xor %edx,%edx ap++; 4ee: 83 c0 04 add $0x4,%eax 4f1: 89 45 d0 mov %eax,-0x30(%ebp) 4f4: e9 4b ff ff ff jmp 444 <printf+0x54> 4f9: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi printint(fd, *ap, 10, 1); 500: 83 ec 0c sub $0xc,%esp 503: b9 0a 00 00 00 mov $0xa,%ecx 508: 6a 01 push $0x1 50a: eb ce jmp 4da <printf+0xea> 50c: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi putc(fd, *ap); 510: 8b 5d d0 mov -0x30(%ebp),%ebx write(fd, &c, 1); 513: 83 ec 04 sub $0x4,%esp putc(fd, *ap); 516: 8b 03 mov (%ebx),%eax write(fd, &c, 1); 518: 6a 01 push $0x1 ap++; 51a: 83 c3 04 add $0x4,%ebx write(fd, &c, 1); 51d: 57 push %edi 51e: ff 75 08 pushl 0x8(%ebp) putc(fd, *ap); 521: 88 45 e7 mov %al,-0x19(%ebp) write(fd, &c, 1); 524: e8 7a fd ff ff call 2a3 <write> ap++; 529: 89 5d d0 mov %ebx,-0x30(%ebp) 52c: 83 c4 10 add $0x10,%esp state = 0; 52f: 31 d2 xor %edx,%edx 531: e9 0e ff ff ff jmp 444 <printf+0x54> 536: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 53d: 8d 76 00 lea 0x0(%esi),%esi putc(fd, c); 540: 88 5d e7 mov %bl,-0x19(%ebp) write(fd, &c, 1); 543: 83 ec 04 sub $0x4,%esp 546: e9 59 ff ff ff jmp 4a4 <printf+0xb4> 54b: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi 54f: 90 nop s = (char*)*ap; 550: 8b 45 d0 mov -0x30(%ebp),%eax 553: 8b 18 mov (%eax),%ebx ap++; 555: 83 c0 04 add $0x4,%eax 558: 89 45 d0 mov %eax,-0x30(%ebp) if(s == 0) 55b: 85 db test %ebx,%ebx 55d: 74 17 je 576 <printf+0x186> while(*s != 0){ 55f: 0f b6 03 movzbl (%ebx),%eax state = 0; 562: 31 d2 xor %edx,%edx while(*s != 0){ 564: 84 c0 test %al,%al 566: 0f 84 d8 fe ff ff je 444 <printf+0x54> 56c: 89 75 d4 mov %esi,-0x2c(%ebp) 56f: 89 de mov %ebx,%esi 571: 8b 5d 08 mov 0x8(%ebp),%ebx 574: eb 1a jmp 590 <printf+0x1a0> s = "(null)"; 576: bb 58 07 00 00 mov $0x758,%ebx while(*s != 0){ 57b: 89 75 d4 mov %esi,-0x2c(%ebp) 57e: b8 28 00 00 00 mov $0x28,%eax 583: 89 de mov %ebx,%esi 585: 8b 5d 08 mov 0x8(%ebp),%ebx 588: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 58f: 90 nop write(fd, &c, 1); 590: 83 ec 04 sub $0x4,%esp s++; 593: 83 c6 01 add $0x1,%esi 596: 88 45 e7 mov %al,-0x19(%ebp) write(fd, &c, 1); 599: 6a 01 push $0x1 59b: 57 push %edi 59c: 53 push %ebx 59d: e8 01 fd ff ff call 2a3 <write> while(*s != 0){ 5a2: 0f b6 06 movzbl (%esi),%eax 5a5: 83 c4 10 add $0x10,%esp 5a8: 84 c0 test %al,%al 5aa: 75 e4 jne 590 <printf+0x1a0> state = 0; 5ac: 8b 75 d4 mov -0x2c(%ebp),%esi 5af: 31 d2 xor %edx,%edx 5b1: e9 8e fe ff ff jmp 444 <printf+0x54> 5b6: 66 90 xchg %ax,%ax 5b8: 66 90 xchg %ax,%ax 5ba: 66 90 xchg %ax,%ax 5bc: 66 90 xchg %ax,%ax 5be: 66 90 xchg %ax,%ax 000005c0 <free>: static Header base; static Header *freep; void free(void *ap) { 5c0: 55 push %ebp Header *bp, *p; bp = (Header*)ap - 1; for(p = freep; !(bp > p && bp < p->s.ptr); p = p->s.ptr) 5c1: a1 04 0a 00 00 mov 0xa04,%eax { 5c6: 89 e5 mov %esp,%ebp 5c8: 57 push %edi 5c9: 56 push %esi 5ca: 53 push %ebx 5cb: 8b 5d 08 mov 0x8(%ebp),%ebx bp = (Header*)ap - 1; 5ce: 8d 4b f8 lea -0x8(%ebx),%ecx for(p = freep; !(bp > p && bp < p->s.ptr); p = p->s.ptr) 5d1: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 5d8: 89 c2 mov %eax,%edx 5da: 8b 00 mov (%eax),%eax 5dc: 39 ca cmp %ecx,%edx 5de: 73 30 jae 610 <free+0x50> 5e0: 39 c1 cmp %eax,%ecx 5e2: 72 04 jb 5e8 <free+0x28> if(p >= p->s.ptr && (bp > p || bp < p->s.ptr)) 5e4: 39 c2 cmp %eax,%edx 5e6: 72 f0 jb 5d8 <free+0x18> break; if(bp + bp->s.size == p->s.ptr){ 5e8: 8b 73 fc mov -0x4(%ebx),%esi 5eb: 8d 3c f1 lea (%ecx,%esi,8),%edi 5ee: 39 f8 cmp %edi,%eax 5f0: 74 30 je 622 <free+0x62> bp->s.size += p->s.ptr->s.size; bp->s.ptr = p->s.ptr->s.ptr; } else bp->s.ptr = p->s.ptr; 5f2: 89 43 f8 mov %eax,-0x8(%ebx) if(p + p->s.size == bp){ 5f5: 8b 42 04 mov 0x4(%edx),%eax 5f8: 8d 34 c2 lea (%edx,%eax,8),%esi 5fb: 39 f1 cmp %esi,%ecx 5fd: 74 3a je 639 <free+0x79> p->s.size += bp->s.size; p->s.ptr = bp->s.ptr; } else p->s.ptr = bp; 5ff: 89 0a mov %ecx,(%edx) freep = p; } 601: 5b pop %ebx freep = p; 602: 89 15 04 0a 00 00 mov %edx,0xa04 } 608: 5e pop %esi 609: 5f pop %edi 60a: 5d pop %ebp 60b: c3 ret 60c: 8d 74 26 00 lea 0x0(%esi,%eiz,1),%esi if(p >= p->s.ptr && (bp > p || bp < p->s.ptr)) 610: 39 c2 cmp %eax,%edx 612: 72 c4 jb 5d8 <free+0x18> 614: 39 c1 cmp %eax,%ecx 616: 73 c0 jae 5d8 <free+0x18> if(bp + bp->s.size == p->s.ptr){ 618: 8b 73 fc mov -0x4(%ebx),%esi 61b: 8d 3c f1 lea (%ecx,%esi,8),%edi 61e: 39 f8 cmp %edi,%eax 620: 75 d0 jne 5f2 <free+0x32> bp->s.size += p->s.ptr->s.size; 622: 03 70 04 add 0x4(%eax),%esi 625: 89 73 fc mov %esi,-0x4(%ebx) bp->s.ptr = p->s.ptr->s.ptr; 628: 8b 02 mov (%edx),%eax 62a: 8b 00 mov (%eax),%eax 62c: 89 43 f8 mov %eax,-0x8(%ebx) if(p + p->s.size == bp){ 62f: 8b 42 04 mov 0x4(%edx),%eax 632: 8d 34 c2 lea (%edx,%eax,8),%esi 635: 39 f1 cmp %esi,%ecx 637: 75 c6 jne 5ff <free+0x3f> p->s.size += bp->s.size; 639: 03 43 fc add -0x4(%ebx),%eax freep = p; 63c: 89 15 04 0a 00 00 mov %edx,0xa04 p->s.size += bp->s.size; 642: 89 42 04 mov %eax,0x4(%edx) p->s.ptr = bp->s.ptr; 645: 8b 43 f8 mov -0x8(%ebx),%eax 648: 89 02 mov %eax,(%edx) } 64a: 5b pop %ebx 64b: 5e pop %esi 64c: 5f pop %edi 64d: 5d pop %ebp 64e: c3 ret 64f: 90 nop 00000650 <malloc>: return freep; } void* malloc(uint nbytes) { 650: 55 push %ebp 651: 89 e5 mov %esp,%ebp 653: 57 push %edi 654: 56 push %esi 655: 53 push %ebx 656: 83 ec 1c sub $0x1c,%esp Header *p, *prevp; uint nunits; nunits = (nbytes + sizeof(Header) - 1)/sizeof(Header) + 1; 659: 8b 45 08 mov 0x8(%ebp),%eax if((prevp = freep) == 0){ 65c: 8b 3d 04 0a 00 00 mov 0xa04,%edi nunits = (nbytes + sizeof(Header) - 1)/sizeof(Header) + 1; 662: 8d 70 07 lea 0x7(%eax),%esi 665: c1 ee 03 shr $0x3,%esi 668: 83 c6 01 add $0x1,%esi if((prevp = freep) == 0){ 66b: 85 ff test %edi,%edi 66d: 0f 84 ad 00 00 00 je 720 <malloc+0xd0> base.s.ptr = freep = prevp = &base; base.s.size = 0; } for(p = prevp->s.ptr; ; prevp = p, p = p->s.ptr){ 673: 8b 07 mov (%edi),%eax if(p->s.size >= nunits){ 675: 8b 48 04 mov 0x4(%eax),%ecx 678: 39 f1 cmp %esi,%ecx 67a: 73 71 jae 6ed <malloc+0x9d> 67c: 81 fe 00 10 00 00 cmp $0x1000,%esi 682: bb 00 10 00 00 mov $0x1000,%ebx 687: 0f 43 de cmovae %esi,%ebx p = sbrk(nu * sizeof(Header)); 68a: 8d 0c dd 00 00 00 00 lea 0x0(,%ebx,8),%ecx 691: 89 4d e4 mov %ecx,-0x1c(%ebp) 694: eb 1b jmp 6b1 <malloc+0x61> 696: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 69d: 8d 76 00 lea 0x0(%esi),%esi for(p = prevp->s.ptr; ; prevp = p, p = p->s.ptr){ 6a0: 8b 10 mov (%eax),%edx if(p->s.size >= nunits){ 6a2: 8b 4a 04 mov 0x4(%edx),%ecx 6a5: 39 f1 cmp %esi,%ecx 6a7: 73 4f jae 6f8 <malloc+0xa8> p->s.size = nunits; } freep = prevp; return (void*)(p + 1); } if(p == freep) 6a9: 8b 3d 04 0a 00 00 mov 0xa04,%edi 6af: 89 d0 mov %edx,%eax 6b1: 39 c7 cmp %eax,%edi 6b3: 75 eb jne 6a0 <malloc+0x50> p = sbrk(nu * sizeof(Header)); 6b5: 83 ec 0c sub $0xc,%esp 6b8: ff 75 e4 pushl -0x1c(%ebp) 6bb: e8 4b fc ff ff call 30b <sbrk> if(p == (char*)-1) 6c0: 83 c4 10 add $0x10,%esp 6c3: 83 f8 ff cmp $0xffffffff,%eax 6c6: 74 1b je 6e3 <malloc+0x93> hp->s.size = nu; 6c8: 89 58 04 mov %ebx,0x4(%eax) free((void*)(hp + 1)); 6cb: 83 ec 0c sub $0xc,%esp 6ce: 83 c0 08 add $0x8,%eax 6d1: 50 push %eax 6d2: e8 e9 fe ff ff call 5c0 <free> return freep; 6d7: a1 04 0a 00 00 mov 0xa04,%eax if((p = morecore(nunits)) == 0) 6dc: 83 c4 10 add $0x10,%esp 6df: 85 c0 test %eax,%eax 6e1: 75 bd jne 6a0 <malloc+0x50> return 0; } } 6e3: 8d 65 f4 lea -0xc(%ebp),%esp return 0; 6e6: 31 c0 xor %eax,%eax } 6e8: 5b pop %ebx 6e9: 5e pop %esi 6ea: 5f pop %edi 6eb: 5d pop %ebp 6ec: c3 ret if(p->s.size >= nunits){ 6ed: 89 c2 mov %eax,%edx 6ef: 89 f8 mov %edi,%eax 6f1: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi if(p->s.size == nunits) 6f8: 39 ce cmp %ecx,%esi 6fa: 74 54 je 750 <malloc+0x100> p->s.size -= nunits; 6fc: 29 f1 sub %esi,%ecx 6fe: 89 4a 04 mov %ecx,0x4(%edx) p += p->s.size; 701: 8d 14 ca lea (%edx,%ecx,8),%edx p->s.size = nunits; 704: 89 72 04 mov %esi,0x4(%edx) freep = prevp; 707: a3 04 0a 00 00 mov %eax,0xa04 } 70c: 8d 65 f4 lea -0xc(%ebp),%esp return (void*)(p + 1); 70f: 8d 42 08 lea 0x8(%edx),%eax } 712: 5b pop %ebx 713: 5e pop %esi 714: 5f pop %edi 715: 5d pop %ebp 716: c3 ret 717: 8d b4 26 00 00 00 00 lea 0x0(%esi,%eiz,1),%esi 71e: 66 90 xchg %ax,%ax base.s.ptr = freep = prevp = &base; 720: c7 05 04 0a 00 00 08 movl $0xa08,0xa04 727: 0a 00 00 base.s.size = 0; 72a: bf 08 0a 00 00 mov $0xa08,%edi base.s.ptr = freep = prevp = &base; 72f: c7 05 08 0a 00 00 08 movl $0xa08,0xa08 736: 0a 00 00 for(p = prevp->s.ptr; ; prevp = p, p = p->s.ptr){ 739: 89 f8 mov %edi,%eax base.s.size = 0; 73b: c7 05 0c 0a 00 00 00 movl $0x0,0xa0c 742: 00 00 00 if(p->s.size >= nunits){ 745: e9 32 ff ff ff jmp 67c <malloc+0x2c> 74a: 8d b6 00 00 00 00 lea 0x0(%esi),%esi prevp->s.ptr = p->s.ptr; 750: 8b 0a mov (%edx),%ecx 752: 89 08 mov %ecx,(%eax) 754: eb b1 jmp 707 <malloc+0xb7>
src/CategoryTheory/Monad.agda
DimaSamoz/temporal-type-systems
4
9051
<gh_stars>1-10 {- Type class for monads. -} module CategoryTheory.Monad where open import CategoryTheory.Categories open import CategoryTheory.Functor open import CategoryTheory.NatTrans -- A monad on a category record Monad {n} (ℂ : Category n) : Set (lsuc n) where open Category ℂ field -- Underlying endofunctor T : Endofunctor ℂ open Functor T field -- || Definitions -- Unit / return η : I ⟹ T -- Multiplication / join μ : (T ²) ⟹ T module η = _⟹_ η module μ = _⟹_ μ field -- || Laws -- Unit on both sides is cancelled by multiplication (unit) η-unit1 : ∀ {A : obj} -> (μ.at A) ∘ (η.at (omap A)) ≈ id η-unit2 : ∀ {A : obj} -> (μ.at A) ∘ (fmap (η.at A)) ≈ id -- Multiplication can be performed on both sides (associativity) μ-assoc : ∀ {A : obj} -> (μ.at A) ∘ (μ.at (omap A)) ≈ (μ.at A) ∘ (fmap (μ.at A))
ada/src/afrl/cmasi/afrl-cmasi-keepinzone.adb
joffreyhuguet/LmcpGen
0
16071
package body afrl.cmasi.keepInZone is function getFullLmcpTypeName(this : KeepInZone) return String is ("afrl.cmasi.keepInZone.KeepInZone"); function getLmcpTypeName(this : KeepInZone) return String is ("KeepInZone"); function getLmcpType (this : KeepInZone) return UInt32_t is (CmasiEnum'Pos(KEEPINZONE_ENUM)); end afrl.cmasi.keepInZone;
models/tests/test61.als
transclosure/Amalgam
4
3035
<reponame>transclosure/Amalgam module tests/test open util/ordering[A] as ao open util/ordering[B] as bo open util/seqrel[A] as ro sig A, B {} run {C.next} // this line should complain about "C not found", and should complain only once (rather than 4 times!)
source/runtime/pb_support-internal.ads
mgrojo/protobuf
12
1802
<reponame>mgrojo/protobuf<filename>source/runtime/pb_support-internal.ads<gh_stars>10-100 -- MIT License -- -- Copyright (c) 2020 <NAME> -- -- Permission is hereby granted, free of charge, to any person obtaining a -- copy of this software and associated documentation files (the "Software"), -- to deal in the Software without restriction, including without limitation -- the rights to use, copy, modify, merge, publish, distribute, sublicense, -- and/or sell copies of the Software, and to permit persons to whom the -- Software is furnished to do so, subject to the following conditions: -- -- The above copyright notice and this permission notice shall be included in -- all copies or substantial portions of the Software. -- -- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS OR -- IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF MERCHANTABILITY, -- FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. IN NO EVENT SHALL -- THE AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER -- LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, ARISING -- FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE USE OR OTHER -- DEALINGS IN THE SOFTWARE. -- This is internal unit, don't use it in an application. with Ada.Streams; with Ada.Containers.Vectors; with Interfaces; with League.Stream_Element_Vectors; with League.String_Vectors; with League.Strings; with PB_Support.Boolean_Vectors; with PB_Support.IEEE_Float_32_Vectors; with PB_Support.IEEE_Float_64_Vectors; with PB_Support.Integer_32_Vectors; with PB_Support.Integer_64_Vectors; with PB_Support.Stream_Element_Vector_Vectors; with PB_Support.Unsigned_32_Vectors; with PB_Support.Unsigned_64_Vectors; package PB_Support.Internal is pragma Preelaborate; type Stream (Parent : not null access Ada.Streams.Root_Stream_Type'Class) is new Ada.Streams.Root_Stream_Type with private; -- This is internal type, don't use it in an application. -- -- This stream works in two passes. During the first pass (riffling) -- the stream ignores all written data and just calculate total size -- of messages. During the second pass (writting) actuall data is written -- to Parent. pragma Preelaborable_Initialization (Stream); not overriding procedure Start_Message (Self : in out Stream) with Inline; -- Increment nested depth. In writting pass emit message length. not overriding function End_Message (Self : in out Stream) return Boolean with Inline; -- Decrement nested depth. In riffling pass calculate and remember -- message size. It returns True after completion of riffling pass. not overriding procedure Write (Self : in out Stream; Field : Field_Number; Value : Boolean) with Inline; not overriding procedure Write (Self : in out Stream; Field : Field_Number; Value : PB_Support.Boolean_Vectors.Vector); not overriding procedure Write_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Boolean_Vectors.Vector); not overriding procedure Write_Option (Self : in out Stream; Field : Field_Number; Value : Boolean; Default : Boolean) with Inline; not overriding procedure Write (Self : in out Stream; Field : Field_Number; Value : Interfaces.IEEE_Float_32) with Inline; not overriding procedure Write (Self : in out Stream; Field : Field_Number; Value : PB_Support.IEEE_Float_32_Vectors.Vector) with Inline; not overriding procedure Write_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.IEEE_Float_32_Vectors.Vector); not overriding procedure Write_Option (Self : in out Stream; Field : Field_Number; Value : Interfaces.IEEE_Float_32; Default : Interfaces.IEEE_Float_32) with Inline; not overriding procedure Write (Self : in out Stream; Field : Field_Number; Value : Interfaces.IEEE_Float_64) with Inline; not overriding procedure Write (Self : in out Stream; Field : Field_Number; Value : PB_Support.IEEE_Float_64_Vectors.Vector) with Inline; not overriding procedure Write_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.IEEE_Float_64_Vectors.Vector); not overriding procedure Write_Option (Self : in out Stream; Field : Field_Number; Value : Interfaces.IEEE_Float_64; Default : Interfaces.IEEE_Float_64) with Inline; not overriding procedure Write (Self : in out Stream; Field : Field_Number; Value : League.Strings.Universal_String) with Inline; not overriding procedure Write (Self : in out Stream; Field : Field_Number; Value : League.String_Vectors.Universal_String_Vector) with Inline; not overriding procedure Write_Option (Self : in out Stream; Field : Field_Number; Value : League.Strings.Universal_String; Default : League.Strings.Universal_String := League.Strings.Empty_Universal_String) with Inline; not overriding procedure Write (Self : in out Stream; Field : Field_Number; Value : League.Stream_Element_Vectors.Stream_Element_Vector) with Inline; not overriding procedure Write (Self : in out Stream; Field : Field_Number; Value : PB_Support.Stream_Element_Vector_Vectors.Vector) with Inline; not overriding procedure Write_Option (Self : in out Stream; Field : Field_Number; Value : League.Stream_Element_Vectors.Stream_Element_Vector; Default : League.Stream_Element_Vectors.Stream_Element_Vector := League.Stream_Element_Vectors.Empty_Stream_Element_Vector) with Inline; not overriding procedure Write_Varint (Self : in out Stream; Field : Field_Number; Value : Interfaces.Unsigned_32) with Inline; not overriding procedure Write_Varint (Self : in out Stream; Field : Field_Number; Value : PB_Support.Unsigned_32_Vectors.Vector) with Inline; not overriding procedure Write_Varint_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Unsigned_32_Vectors.Vector); not overriding procedure Write_Varint (Self : in out Stream; Field : Field_Number; Value : Interfaces.Unsigned_64) with Inline; not overriding procedure Write_Varint (Self : in out Stream; Field : Field_Number; Value : PB_Support.Unsigned_64_Vectors.Vector) with Inline; not overriding procedure Write_Varint_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Unsigned_64_Vectors.Vector); not overriding procedure Write_Varint (Self : in out Stream; Field : Field_Number; Value : Interfaces.Integer_32) with Inline; not overriding procedure Write_Varint (Self : in out Stream; Value : Interfaces.Integer_32) with Inline; not overriding procedure Write_Varint (Self : in out Stream; Field : Field_Number; Value : PB_Support.Integer_32_Vectors.Vector) with Inline; not overriding procedure Write_Varint_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Integer_32_Vectors.Vector); not overriding procedure Write_Varint (Self : in out Stream; Field : Field_Number; Value : Interfaces.Integer_64) with Inline; not overriding procedure Write_Varint (Self : in out Stream; Field : Field_Number; Value : PB_Support.Integer_64_Vectors.Vector) with Inline; not overriding procedure Write_Varint_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Integer_64_Vectors.Vector); not overriding procedure Write_Varint_Option (Self : in out Stream; Field : Field_Number; Value : Interfaces.Unsigned_32; Default : Interfaces.Unsigned_32) with Inline; not overriding procedure Write_Varint_Option (Self : in out Stream; Field : Field_Number; Value : Interfaces.Unsigned_64; Default : Interfaces.Unsigned_64) with Inline; not overriding procedure Write_Varint_Option (Self : in out Stream; Field : Field_Number; Value : Interfaces.Integer_32; Default : Interfaces.Integer_32) with Inline; not overriding procedure Write_Varint_Option (Self : in out Stream; Field : Field_Number; Value : Interfaces.Integer_64; Default : Interfaces.Integer_64) with Inline; not overriding procedure Write_Zigzag (Self : in out Stream; Field : Field_Number; Value : Interfaces.Integer_32) with Inline; not overriding procedure Write_Zigzag (Self : in out Stream; Field : Field_Number; Value : Interfaces.Integer_64) with Inline; not overriding procedure Write_Zigzag (Self : in out Stream; Field : Field_Number; Value : PB_Support.Integer_32_Vectors.Vector) with Inline; not overriding procedure Write_Zigzag (Self : in out Stream; Field : Field_Number; Value : PB_Support.Integer_64_Vectors.Vector) with Inline; not overriding procedure Write_Zigzag_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Integer_32_Vectors.Vector); not overriding procedure Write_Zigzag_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Integer_64_Vectors.Vector); not overriding procedure Write_Zigzag_Option (Self : in out Stream; Field : Field_Number; Value : Interfaces.Integer_32; Default : Interfaces.Integer_32) with Inline; not overriding procedure Write_Zigzag_Option (Self : in out Stream; Field : Field_Number; Value : Interfaces.Integer_64; Default : Interfaces.Integer_64) with Inline; not overriding procedure Write_Fixed (Self : in out Stream; Field : Field_Number; Value : Interfaces.Integer_32) with Inline; not overriding procedure Write_Fixed (Self : in out Stream; Field : Field_Number; Value : Interfaces.Integer_64) with Inline; not overriding procedure Write_Fixed (Self : in out Stream; Field : Field_Number; Value : Interfaces.Unsigned_32) with Inline; not overriding procedure Write_Fixed (Self : in out Stream; Field : Field_Number; Value : Interfaces.Unsigned_64) with Inline; not overriding procedure Write_Fixed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Integer_32_Vectors.Vector) with Inline; not overriding procedure Write_Fixed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Integer_64_Vectors.Vector) with Inline; not overriding procedure Write_Fixed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Unsigned_32_Vectors.Vector) with Inline; not overriding procedure Write_Fixed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Unsigned_64_Vectors.Vector) with Inline; not overriding procedure Write_Fixed_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Integer_32_Vectors.Vector); not overriding procedure Write_Fixed_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Integer_64_Vectors.Vector); not overriding procedure Write_Fixed_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Unsigned_32_Vectors.Vector); not overriding procedure Write_Fixed_Packed (Self : in out Stream; Field : Field_Number; Value : PB_Support.Unsigned_64_Vectors.Vector); not overriding procedure Write_Fixed_Option (Self : in out Stream; Field : Field_Number; Value : Interfaces.Unsigned_32; Default : Interfaces.Unsigned_32) with Inline; not overriding procedure Write_Fixed_Option (Self : in out Stream; Field : Field_Number; Value : Interfaces.Unsigned_64; Default : Interfaces.Unsigned_64) with Inline; not overriding procedure Write_Fixed_Option (Self : in out Stream; Field : Field_Number; Value : Interfaces.Integer_32; Default : Interfaces.Integer_32) with Inline; not overriding procedure Write_Fixed_Option (Self : in out Stream; Field : Field_Number; Value : Interfaces.Integer_64; Default : Interfaces.Integer_64) with Inline; not overriding procedure Write_Key (Self : in out Stream; Value : Key) with Inline; procedure Write (Self : in out Stream; Value : Ada.Streams.Stream_Element_Count) with Inline; function Size (Value : Interfaces.Unsigned_32) return Ada.Streams.Stream_Element_Count; function Size (Value : Interfaces.Unsigned_64) return Ada.Streams.Stream_Element_Count; function Size (Value : Interfaces.Integer_32) return Ada.Streams.Stream_Element_Count; function Size (Value : Interfaces.Integer_64) return Ada.Streams.Stream_Element_Count; private type Message_Id is new Positive; package Size_Vectors is new Ada.Containers.Vectors (Index_Type => Message_Id, Element_Type => Ada.Streams.Stream_Element_Count, "=" => Ada.Streams."="); package Message_Id_Vectors is new Ada.Containers.Vectors (Index_Type => Positive, Element_Type => Message_Id); type Stream (Parent : not null access Ada.Streams.Root_Stream_Type'Class) is new Ada.Streams.Root_Stream_Type with record Level : Natural := 0; -- Current depth of writting message Index : Message_Id := 1; Stack : Message_Id_Vectors.Vector; Size : Size_Vectors.Vector; -- Memorized message sizes Riffling : Boolean := False; -- In riffling mode the stream ignores all written data and just -- calculate total size of messages Written : Ada.Streams.Stream_Element_Count := 0; -- Total amount of written data during riffling mode end record; overriding procedure Read (Stream : in out Internal.Stream; Item : out Ada.Streams.Stream_Element_Array; Last : out Ada.Streams.Stream_Element_Offset) is null; overriding procedure Write (Stream : in out Internal.Stream; Item : Ada.Streams.Stream_Element_Array); end PB_Support.Internal;
Transynther/x86/_processed/AVXALIGN/_ht_zr_un_/i3-7100_9_0xca_notsx.log_21829_82.asm
ljhsiun2/medusa
9
2762
.global s_prepare_buffers s_prepare_buffers: push %r11 push %r15 push %r9 push %rbp push %rcx push %rdi push %rsi lea addresses_normal_ht+0x1927b, %rsi lea addresses_A_ht+0x93bb, %rdi nop nop add %r11, %r11 mov $42, %rcx rep movsq nop nop nop nop nop lfence lea addresses_WT_ht+0x16aab, %rsi lea addresses_WT_ht+0x1c42b, %rdi nop dec %r11 mov $126, %rcx rep movsb inc %r11 lea addresses_UC_ht+0x118ab, %rsi lea addresses_normal_ht+0x142ab, %rdi clflush (%rsi) nop cmp %r9, %r9 mov $2, %rcx rep movsb nop nop nop nop xor %r9, %r9 lea addresses_A_ht+0x16c6b, %rcx nop nop cmp $5586, %rbp vmovups (%rcx), %ymm6 vextracti128 $0, %ymm6, %xmm6 vpextrq $1, %xmm6, %r9 nop nop nop xor $38643, %r15 lea addresses_UC_ht+0x72fb, %rsi lea addresses_normal_ht+0x1ccab, %rdi and %rbp, %rbp mov $54, %rcx rep movsq nop cmp $9789, %rsi pop %rsi pop %rdi pop %rcx pop %rbp pop %r9 pop %r15 pop %r11 ret .global s_faulty_load s_faulty_load: push %r12 push %r8 push %r9 push %rbx push %rdi push %rdx push %rsi // Store lea addresses_US+0x1d0ab, %r12 clflush (%r12) nop nop add %rbx, %rbx movw $0x5152, (%r12) nop nop xor $34319, %rsi // Store lea addresses_UC+0x15e0b, %rbx nop nop cmp %r9, %r9 movw $0x5152, (%rbx) cmp $31545, %r9 // Store mov $0xab, %r12 nop xor $16117, %rbx mov $0x5152535455565758, %r9 movq %r9, (%r12) nop nop nop nop nop xor $30777, %rsi // Load lea addresses_RW+0xe8ab, %r9 nop nop nop nop nop sub $32776, %rsi mov (%r9), %edi nop dec %r9 // Store lea addresses_WT+0xbda5, %rsi nop nop nop nop cmp $13162, %rdi movw $0x5152, (%rsi) nop nop add $57016, %rsi // Store lea addresses_normal+0x5f2b, %rbx nop nop nop nop nop and $8352, %r12 movl $0x51525354, (%rbx) nop nop nop nop nop and %r9, %r9 // Store lea addresses_UC+0x1960b, %rsi nop nop nop add $19503, %r12 movb $0x51, (%rsi) cmp %rsi, %rsi // Store mov $0x32aaba00000004ab, %r12 clflush (%r12) nop nop nop sub $44487, %r8 mov $0x5152535455565758, %r9 movq %r9, (%r12) nop add %r8, %r8 // Faulty Load mov $0xab, %r12 nop nop nop nop nop cmp %rbx, %rbx vmovaps (%r12), %ymm2 vextracti128 $1, %ymm2, %xmm2 vpextrq $0, %xmm2, %rdx lea oracles, %r8 and $0xff, %rdx shlq $12, %rdx mov (%r8,%rdx,1), %rdx pop %rsi pop %rdx pop %rdi pop %rbx pop %r9 pop %r8 pop %r12 ret /* <gen_faulty_load> [REF] {'src': {'same': True, 'congruent': 0, 'NT': False, 'type': 'addresses_P', 'size': 8, 'AVXalign': False}, 'OP': 'LOAD'} {'OP': 'STOR', 'dst': {'same': False, 'congruent': 10, 'NT': False, 'type': 'addresses_US', 'size': 2, 'AVXalign': False}} {'OP': 'STOR', 'dst': {'same': False, 'congruent': 3, 'NT': False, 'type': 'addresses_UC', 'size': 2, 'AVXalign': False}} {'OP': 'STOR', 'dst': {'same': True, 'congruent': 0, 'NT': False, 'type': 'addresses_P', 'size': 8, 'AVXalign': False}} {'src': {'same': False, 'congruent': 11, 'NT': False, 'type': 'addresses_RW', 'size': 4, 'AVXalign': True}, 'OP': 'LOAD'} {'OP': 'STOR', 'dst': {'same': False, 'congruent': 1, 'NT': False, 'type': 'addresses_WT', 'size': 2, 'AVXalign': False}} {'OP': 'STOR', 'dst': {'same': False, 'congruent': 7, 'NT': False, 'type': 'addresses_normal', 'size': 4, 'AVXalign': False}} {'OP': 'STOR', 'dst': {'same': False, 'congruent': 5, 'NT': False, 'type': 'addresses_UC', 'size': 1, 'AVXalign': False}} {'OP': 'STOR', 'dst': {'same': False, 'congruent': 10, 'NT': False, 'type': 'addresses_NC', 'size': 8, 'AVXalign': True}} [Faulty Load] {'src': {'same': True, 'congruent': 0, 'NT': True, 'type': 'addresses_P', 'size': 32, 'AVXalign': True}, 'OP': 'LOAD'} <gen_prepare_buffer> {'src': {'type': 'addresses_normal_ht', 'congruent': 4, 'same': False}, 'OP': 'REPM', 'dst': {'type': 'addresses_A_ht', 'congruent': 3, 'same': False}} {'src': {'type': 'addresses_WT_ht', 'congruent': 9, 'same': False}, 'OP': 'REPM', 'dst': {'type': 'addresses_WT_ht', 'congruent': 5, 'same': False}} {'src': {'type': 'addresses_UC_ht', 'congruent': 11, 'same': False}, 'OP': 'REPM', 'dst': {'type': 'addresses_normal_ht', 'congruent': 9, 'same': False}} {'src': {'same': False, 'congruent': 6, 'NT': False, 'type': 'addresses_A_ht', 'size': 32, 'AVXalign': False}, 'OP': 'LOAD'} {'src': {'type': 'addresses_UC_ht', 'congruent': 2, 'same': False}, 'OP': 'REPM', 'dst': {'type': 'addresses_normal_ht', 'congruent': 10, 'same': True}} {'8a': 1, '45': 4414, '00': 17289, '49': 51, 'fb': 1, 'af': 1, '44': 70, 'c8': 1, '60': 1} 00 00 00 00 00 00 00 00 00 45 00 00 00 45 45 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 45 45 00 45 00 00 00 00 00 45 45 00 45 00 45 00 00 00 00 00 00 45 00 00 45 45 00 00 45 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 45 00 45 00 45 00 45 00 00 45 00 00 00 45 00 00 00 00 00 45 00 45 00 00 00 00 00 00 00 00 00 00 45 00 45 45 00 00 45 00 00 00 00 00 45 00 00 00 00 00 00 00 44 00 00 00 00 00 00 00 00 00 00 45 00 00 00 00 00 00 00 00 45 00 00 00 00 00 00 00 00 45 00 00 00 00 00 00 00 00 00 45 00 00 00 00 00 45 00 00 00 00 00 00 00 00 45 00 45 00 00 00 00 00 00 00 00 00 00 00 00 00 45 45 00 00 45 00 00 00 45 45 00 00 00 00 00 00 00 00 45 00 00 00 00 00 00 00 45 00 45 00 00 45 00 00 00 00 00 00 45 00 00 00 00 45 00 00 45 00 45 00 00 00 00 00 00 00 00 00 00 00 00 00 00 45 00 00 00 00 00 00 00 45 00 00 45 00 00 00 00 00 00 45 00 00 45 00 00 00 00 00 45 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 45 00 00 00 00 00 00 45 00 00 00 00 00 00 00 00 00 00 00 00 00 45 00 00 00 00 00 45 00 00 00 45 45 00 45 45 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 45 00 00 00 00 45 00 00 00 00 00 00 45 00 45 00 45 00 45 00 45 00 00 45 00 00 00 45 00 00 00 00 45 00 00 00 00 00 45 00 00 00 00 00 45 00 00 00 00 00 00 45 45 00 00 45 45 00 00 00 00 00 45 00 00 00 00 00 00 00 00 00 00 45 00 00 00 00 45 00 00 00 00 00 00 00 00 00 00 45 00 00 00 00 00 45 00 45 00 45 00 00 00 45 00 00 45 00 00 00 00 45 00 00 00 00 00 00 00 00 00 00 00 44 00 00 45 00 00 00 00 00 00 00 00 45 45 00 45 00 45 00 00 00 00 00 00 00 00 45 00 00 45 45 00 00 00 45 00 45 00 00 00 00 00 00 00 00 45 45 45 00 00 00 00 45 00 00 00 45 45 45 00 00 00 00 45 00 45 00 00 00 00 00 00 00 00 00 45 00 00 00 45 00 00 00 00 00 00 00 00 00 00 45 00 00 00 00 45 45 00 00 00 00 00 00 00 00 00 00 00 00 00 45 00 00 00 00 00 45 00 00 00 00 00 00 00 45 45 00 00 00 00 00 45 00 00 00 00 45 00 45 00 00 45 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 45 00 45 00 45 00 00 00 00 00 00 00 00 00 00 00 45 00 00 00 00 00 00 00 00 00 00 00 00 45 45 00 00 00 00 45 00 00 00 00 00 00 45 45 00 00 00 00 00 45 00 00 00 00 00 00 00 00 45 00 00 00 00 00 00 00 45 00 00 00 45 45 45 45 00 00 00 00 45 45 00 00 00 45 00 00 00 00 00 00 00 45 45 00 00 45 45 00 00 00 45 00 00 00 00 00 00 00 00 00 45 00 00 00 45 00 45 00 00 00 00 00 45 45 45 00 00 00 00 00 00 00 00 00 00 00 00 45 00 45 00 00 00 00 00 00 45 45 00 00 00 45 00 45 00 00 45 00 00 00 00 45 00 45 00 00 00 00 00 45 45 00 00 00 45 00 00 00 45 00 00 00 00 00 00 00 00 00 00 00 00 00 00 44 00 00 00 00 00 00 00 00 00 00 00 00 00 45 45 45 00 00 00 00 00 00 00 00 45 00 45 00 00 45 00 00 00 00 00 00 00 00 00 45 00 00 00 00 00 00 00 00 00 00 45 00 00 00 00 00 00 00 00 45 45 00 00 00 00 00 00 00 00 45 00 00 00 45 00 00 45 00 00 00 00 00 00 00 00 45 00 00 00 00 00 00 45 00 00 00 00 45 00 00 00 00 45 00 45 00 00 00 45 00 45 00 00 00 00 45 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 45 00 45 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 */
source/calendar/machine-w64-mingw32/s-nareti.adb
ytomino/drake
33
19728
<filename>source/calendar/machine-w64-mingw32/s-nareti.adb with System.Native_Time; with C.winbase; with C.windef; package body System.Native_Real_Time is use type C.windef.WINBOOL; use type C.winnt.LONGLONG; subtype Positive_LONGLONG is C.winnt.LONGLONG range 1 .. C.winnt.LONGLONG'Last; Performance_Counter_Enabled : Boolean; Frequency : Positive_LONGLONG; procedure Initialize; procedure Initialize is Freq : aliased C.winnt.LARGE_INTEGER; begin Performance_Counter_Enabled := C.winbase.QueryPerformanceFrequency (Freq'Access) /= C.windef.FALSE; Frequency := Freq.QuadPart; end Initialize; -- implementation function To_Native_Time (T : Duration) return Native_Time is begin return C.winnt.LONGLONG ( System.Native_Time.Nanosecond_Number'Integer_Value (T)); end To_Native_Time; function To_Duration (T : Native_Time) return Duration is begin return Duration'Fixed_Value (System.Native_Time.Nanosecond_Number (T)); end To_Duration; function Clock return Native_Time is begin if Performance_Counter_Enabled then declare Count : aliased C.winnt.LARGE_INTEGER; begin if C.winbase.QueryPerformanceCounter (Count'Access) = C.windef.FALSE then raise Program_Error; -- ??? else return Count.QuadPart * 1_000_000_000 / Frequency; end if; end; else raise Program_Error; -- ??? end if; end Clock; procedure Delay_Until (T : Native_Time) is Timeout_T : constant Duration := To_Duration (T); Current_T : constant Duration := To_Duration (Clock); D : Duration; begin if Timeout_T > Current_T then D := Timeout_T - Current_T; else D := 0.0; -- always calling Delay_For for abort checking end if; System.Native_Time.Delay_For (D); end Delay_Until; begin Initialize; end System.Native_Real_Time;
oeis/258/A258278.asm
neoneye/loda-programs
11
86314
; A258278: Expansion of f(-x, -x^5)^2 in powers of x where f(,) is Ramanujan's general theta function. ; Submitted by <NAME> ; 1,-2,1,0,0,-2,2,0,2,-2,1,0,0,-2,0,0,3,-2,0,0,0,-4,2,0,2,0,2,0,0,-2,0,0,1,-2,2,0,0,-2,2,0,2,-4,1,0,0,-2,0,0,2,-2,0,0,0,0,2,0,4,-2,0,0,0,-4,0,0,2,-2,3,0,0,0,2,0,2,-4,0,0,0,-2,0,0,1,-2,0,0,0,-2,4,0,0,-2,2,0,0,-2,0,0,4,-2,2,0 mov $2,-1 pow $2,$0 seq $0,122856 ; Expansion of f(x, x^5)^2 in powers of x where f(, ) is Ramanujan's general theta function. mul $0,$2
support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/a-envvar.adb
orb-zhuchen/Orb
0
19956
<reponame>orb-zhuchen/Orb<filename>support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/a-envvar.adb ------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- A D A . E N V I R O N M E N T _ V A R I A B L E S -- -- -- -- B o d y -- -- -- -- Copyright (C) 2009-2019, Free Software Foundation, Inc. -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ with System.CRTL; with Interfaces.C.Strings; with Ada.Unchecked_Deallocation; package body Ada.Environment_Variables is ----------- -- Clear -- ----------- procedure Clear (Name : String) is procedure Clear_Env_Var (Name : System.Address); pragma Import (C, Clear_Env_Var, "__gnat_unsetenv"); F_Name : String (1 .. Name'Length + 1); begin F_Name (1 .. Name'Length) := Name; F_Name (F_Name'Last) := ASCII.NUL; Clear_Env_Var (F_Name'Address); end Clear; ----------- -- Clear -- ----------- procedure Clear is procedure Clear_Env; pragma Import (C, Clear_Env, "__gnat_clearenv"); begin Clear_Env; end Clear; ------------ -- Exists -- ------------ function Exists (Name : String) return Boolean is use System; procedure Get_Env_Value_Ptr (Name, Length, Ptr : Address); pragma Import (C, Get_Env_Value_Ptr, "__gnat_getenv"); Env_Value_Ptr : aliased Address; Env_Value_Length : aliased Integer; F_Name : aliased String (1 .. Name'Length + 1); begin F_Name (1 .. Name'Length) := Name; F_Name (F_Name'Last) := ASCII.NUL; Get_Env_Value_Ptr (F_Name'Address, Env_Value_Length'Address, Env_Value_Ptr'Address); if Env_Value_Ptr = System.Null_Address then return False; end if; return True; end Exists; ------------- -- Iterate -- ------------- procedure Iterate (Process : not null access procedure (Name, Value : String)) is use Interfaces.C.Strings; type C_String_Array is array (Natural) of aliased chars_ptr; type C_String_Array_Access is access C_String_Array; function Get_Env return C_String_Array_Access; pragma Import (C, Get_Env, "__gnat_environ"); type String_Access is access all String; procedure Free is new Ada.Unchecked_Deallocation (String, String_Access); Env_Length : Natural := 0; Env : constant C_String_Array_Access := Get_Env; begin -- If the environment is null return directly if Env = null then return; end if; -- First get the number of environment variables loop exit when Env (Env_Length) = Null_Ptr; Env_Length := Env_Length + 1; end loop; declare Env_Copy : array (1 .. Env_Length) of String_Access; begin -- Copy the environment for Iterator in 1 .. Env_Length loop Env_Copy (Iterator) := new String'(Value (Env (Iterator - 1))); end loop; -- Iterate on the environment copy for Iterator in 1 .. Env_Length loop declare Current_Var : constant String := Env_Copy (Iterator).all; Value_Index : Natural := Env_Copy (Iterator)'First; begin loop exit when Current_Var (Value_Index) = '='; Value_Index := Value_Index + 1; end loop; Process (Current_Var (Current_Var'First .. Value_Index - 1), Current_Var (Value_Index + 1 .. Current_Var'Last)); end; end loop; -- Free the copy of the environment for Iterator in 1 .. Env_Length loop Free (Env_Copy (Iterator)); end loop; end; end Iterate; --------- -- Set -- --------- procedure Set (Name : String; Value : String) is F_Name : String (1 .. Name'Length + 1); F_Value : String (1 .. Value'Length + 1); procedure Set_Env_Value (Name, Value : System.Address); pragma Import (C, Set_Env_Value, "__gnat_setenv"); begin F_Name (1 .. Name'Length) := Name; F_Name (F_Name'Last) := ASCII.NUL; F_Value (1 .. Value'Length) := Value; F_Value (F_Value'Last) := ASCII.NUL; Set_Env_Value (F_Name'Address, F_Value'Address); end Set; ----------- -- Value -- ----------- function Value (Name : String) return String is use System, System.CRTL; procedure Get_Env_Value_Ptr (Name, Length, Ptr : Address); pragma Import (C, Get_Env_Value_Ptr, "__gnat_getenv"); Env_Value_Ptr : aliased Address; Env_Value_Length : aliased Integer; F_Name : aliased String (1 .. Name'Length + 1); begin F_Name (1 .. Name'Length) := Name; F_Name (F_Name'Last) := ASCII.NUL; Get_Env_Value_Ptr (F_Name'Address, Env_Value_Length'Address, Env_Value_Ptr'Address); if Env_Value_Ptr = System.Null_Address then raise Constraint_Error; end if; if Env_Value_Length > 0 then declare Result : aliased String (1 .. Env_Value_Length); begin strncpy (Result'Address, Env_Value_Ptr, size_t (Env_Value_Length)); return Result; end; else return ""; end if; end Value; function Value (Name : String; Default : String) return String is begin return (if Exists (Name) then Value (Name) else Default); end Value; end Ada.Environment_Variables;
programs/oeis/213/A213510.asm
karttu/loda
0
102546
<filename>programs/oeis/213/A213510.asm ; A213510: The sequence N(n) arising in the enumeration of balanced ternary trees. ; 1,3,5,7,10,13,16,19,22,25,28,31,34,38,42,46,50,54,58,62,66,70,74,78,82,86,90,94,98,102,106,110,114,118,122,126,130,134,138,142,147,152,157,162,167,172,177,182,187,192 mov $6,$0 lpb $0,1 add $1,$0 add $2,2 add $3,4 add $5,$3 add $0,$5 add $2,$5 add $2,9 sub $0,$2 trn $0,1 lpe add $0,3 trn $1,3 mov $2,$0 add $2,2 mov $4,$2 sub $4,2 add $1,$4 add $1,6 lpb $6,1 add $1,2 sub $6,1 lpe sub $1,8
src/midi.adb
JeremyGrosser/the_grid
0
2575
with Ada.Unchecked_Conversion; with USB.Device.MIDI; with USB.Device; with RP.Device; with Sound; with HAL; package body MIDI is USB_Stack : USB.Device.USB_Device_Stack (Max_Classes => 1); USB_MIDI : aliased USB.Device.MIDI.Default_MIDI_Class (TX_Buffer_Size => 64, RX_Buffer_Size => 64); type Command_Kind is (Note_Off, Note_On, Aftertouch, Continous_Controller, Patch_Change, Channel_Pressure, Pitch_Bend) with Size => 4; for Command_Kind use (Note_Off => 16#8#, Note_On => 16#9#, Aftertouch => 16#A#, Continous_Controller => 16#B#, Patch_Change => 16#C#, Channel_Pressure => 16#D#, Pitch_Bend => 16#E#); subtype MIDI_Data is HAL.UInt8 range 2#0000_0000# .. 2#0111_1111#; subtype MIDI_Key is MIDI_Data; type MIDI_Channel is mod 2**4 with Size => 4; type Message (Kind : Command_Kind := Note_On) is record Chan : MIDI_Channel; case Kind is when Note_On | Note_Off | Aftertouch => Key : MIDI_Key; Velocity : MIDI_Data; when Continous_Controller => Controller : MIDI_Data; Controller_Value : MIDI_Data; when Patch_Change => Instrument : MIDI_Data; when Channel_Pressure => Pressure : MIDI_Data; when Pitch_Bend => Bend : MIDI_Data; end case; end record with Size => 32; for Message use record Kind at 1 range 4 .. 7; Chan at 1 range 0 .. 3; Key at 2 range 0 .. 7; Velocity at 3 range 0 .. 7; Controller at 2 range 0 .. 7; Controller_Value at 3 range 0 .. 7; Instrument at 2 range 0 .. 7; Pressure at 2 range 0 .. 7; Bend at 2 range 0 .. 7; end record; Current_Key : MIDI_Key := MIDI_Key'First; function To_Message is new Ada.Unchecked_Conversion (Source => USB.Device.MIDI.MIDI_Event, Target => Message); procedure Initialize is use type USB.Device.Init_Result; Status : USB.Device.Init_Result; begin if not USB_Stack.Register_Class (USB_MIDI'Access) then return; end if; Status := USB_Stack.Initialize (Controller => RP.Device.UDC'Access, Manufacturer => USB.To_USB_String ("Pimoroni"), Product => USB.To_USB_String ("Picosystem"), Serial_Number => USB.To_USB_String ("42"), Max_Packet_Size => 64); if Status /= USB.Device.Ok then return; end if; USB_Stack.Start; end Initialize; procedure Update is use HAL; Event : USB.Device.MIDI.MIDI_Event; M : Message; begin USB_Stack.Poll; if USB_MIDI.Receive (Event) then M := To_Message (Event); case M.Kind is when Note_On => Current_Key := M.Key; declare Note : constant Sound.Notes := Sound.Notes'Val (Natural (M.Key) mod 12); Octave : constant Sound.Octaves := Sound.Octaves ((Natural (M.Key) / 12) mod Natural (Sound.Octaves'Last)); begin Sound.Play (Note, Octave, 0); end; when Note_Off => if M.Key = Current_Key then Sound.Stop; end if; when others => null; end case; end if; Sound.Update; end Update; end MIDI;
kernel/arch/i386/interrupts.asm
jarlostensen/jos
5
167788
<reponame>jarlostensen/jos [bits 32] section .text %include "arch/i386/macros.inc" ; ===================================================================================== ; IDT ; the idt descriptor extern _idt_desc ; load the _idt table global _k_load_idt:function _k_load_idt: mov eax, dword _idt_desc lidt [eax] ret global _k_store_idt:function _k_store_idt: sidt [esp+4] ret ; ===================================================================================== ; IRQs PIC1_COMMAND equ 0x20 PIC2_COMMAND equ 0x0a ; handler; forwards call to the registered handler via argument 0 extern _k_irq_handler irq_handler_stub: ; put another copy of the IRQ number on the stack for later push dword [esp] ; chain to handler, irq number is first arg call _k_irq_handler add esp, 4 ; send EOI to the right PIC pop eax cmp al, 8 jl .irq_handler_stub_1 ; EOI to PIC2 mov al, 0x20 out PIC2_COMMAND, al ; always send EOI to master (PIC1) .irq_handler_stub_1: ; EOI to PIC1 mov al, 0x20 out PIC1_COMMAND, al .irq_handler_stub_2: iret %macro IRQ_HANDLER 1 global _k_irq%1:function _k_irq%1: push dword %1 jmp irq_handler_stub %endmacro IRQ_HANDLER 0 IRQ_HANDLER 1 IRQ_HANDLER 2 IRQ_HANDLER 3 IRQ_HANDLER 4 IRQ_HANDLER 5 IRQ_HANDLER 6 IRQ_HANDLER 7 IRQ_HANDLER 8 IRQ_HANDLER 9 IRQ_HANDLER 10 IRQ_HANDLER 11 IRQ_HANDLER 12 IRQ_HANDLER 13 IRQ_HANDLER 14 IRQ_HANDLER 15 IRQ_HANDLER 16 IRQ_HANDLER 17 IRQ_HANDLER 18 IRQ_HANDLER 19 ; ===================================================================================== ; ISRs ; handler; forwards call to the registered handler via argument 0 extern _k_isr_handler isr_handler_stub: ISR_HANDLER_PREAMBLE cld call _k_isr_handler ISR_HANDLER_POSTAMBLE iret ; an isr/fault/trap that doesn't provide an error code %macro ISR_HANDLER 1 global _k_isr%1:function _k_isr%1: cli ; empty error code push 0 ; isr id push dword %1 jmp isr_handler_stub %endmacro ; some faults (but not all) provide an error code %macro ISR_HANDLER_ERROR_CODE 1 global _k_isr%1:function _k_isr%1: cli ; error code is already pushed ; isr id push dword %1 jmp isr_handler_stub %endmacro ; divide by zero ISR_HANDLER 0 ; debug ISR_HANDLER 1 ; NMI ISR_HANDLER 2 ; breakpoint ISR_HANDLER 3 ; overflow ISR_HANDLER 4 ; bound range exceeded ISR_HANDLER 5 ; invalid opcode ISR_HANDLER 6 ; device not available ISR_HANDLER 7 ; double fault ISR_HANDLER_ERROR_CODE 8 ; "coprocessor segment overrun" ISR_HANDLER 9 ; invalid TSS ISR_HANDLER_ERROR_CODE 10 ; segment not present ISR_HANDLER_ERROR_CODE 11 ; stack segment fault ISR_HANDLER_ERROR_CODE 12 ; genera protection fault ISR_HANDLER_ERROR_CODE 13 ; page fault ISR_HANDLER_ERROR_CODE 14 ; this one is reserved... ISR_HANDLER 15 ; x87 FP exception ISR_HANDLER 16 ; alignment check fault ISR_HANDLER_ERROR_CODE 17 ; machine check ISR_HANDLER 18 ; SIMD fp exception ISR_HANDLER 19 ; virtualization exception ISR_HANDLER 20 ; reserved ISR_HANDLER 21 ISR_HANDLER 22 ISR_HANDLER 23 ISR_HANDLER 24 ISR_HANDLER 25 ISR_HANDLER 26 ISR_HANDLER 27 ISR_HANDLER 28 ISR_HANDLER 29 ; security exception ISR_HANDLER_ERROR_CODE 30 ; "fpu error interrupt" ISR_HANDLER 31
unit_tests/colour_test_cases.ads
alire-project/sdlada
0
9569
<reponame>alire-project/sdlada<filename>unit_tests/colour_test_cases.ads<gh_stars>0 -------------------------------------------------------------------------------------------------------------------- -- Copyright (c) 2014-2015 <NAME> -- -- This software is provided 'as-is', without any express or implied -- warranty. In no event will the authors be held liable for any damages -- arising from the use of this software. -- -- Permission is granted to anyone to use this software for any purpose, -- including commercial applications, and to alter it and redistribute it -- freely, subject to the following restrictions: -- -- 1. The origin of this software must not be misrepresented; you must not -- claim that you wrote the original software. If you use this software -- in a product, an acknowledgment in the product documentation would be -- appreciated but is not required. -- -- 2. Altered source versions must be plainly marked as such, and must not be -- misrepresented as being the original software. -- -- 3. This notice may not be removed or altered from any source -- distribution. -------------------------------------------------------------------------------------------------------------------- -- Colour_Test_Cases -- -- Tests to check whether the memory layout of the pixel formats is correct. -------------------------------------------------------------------------------------------------------------------- with AUnit; use AUnit; with AUnit.Simple_Test_Cases; with SDL.Video.Palettes; package Colour_Test_Cases is type Colour_Test_Case is new AUnit.Simple_Test_Cases.Test_Case with null record; overriding function Name (Test : Colour_Test_Case) return Message_String; overriding procedure Run_Test (Test : in out Colour_Test_Case); private C_Test : constant SDL.Video.Palettes.Colour with Import => True, Convention => C, External_Name => "test_colour"; end Colour_Test_Cases;
state/state_transition_3.als
nowavailable/alloy_als_study
0
664
/*------------------------------------------------------------ * 値オブジェクト(とイベント) *------------------------------------------------------------*/ enum Password {correct, incorrect} some sig UserAccount { password: one correct } sig Session { whose: disj one UserAccount } sig Visitor { signIn: disj lone Session, /** 同一性担保のためのフィールド */ identity: one Pkey } sig InputForm { /* * Formをモデリングしているが、ログインという行為、即ちイベントであるともいえる? */ currentVisitor: disj one Visitor, targetUser: one UserAccount, input: targetUser -> one Password } fact { all sess:Session | sess in Visitor.signIn } fact { // サインインして記録されるUserは、InputFormに入力されたUser all vis:Visitor | vis.signIn != none implies vis.signIn.whose = (currentVisitor.vis).targetUser } /*------------------------------------------------------------*/ sig Pkey { /*val: one Int*/ } { /** Pkeyは、この場合、Visitorに保持されるかたちでのみ存在する。 */ all pkey:Pkey | pkey in (Visitor<:identity)[Visitor] } /*------------------------------------------------------------ * 状態とその遷移 *------------------------------------------------------------*/ abstract sig State { previous: lone State, visitor: one Visitor } sig Idle extends State {} { previous = none } sig Success extends State {} { previous != none } sig Fail extends State { } { previous != none } fact { /** * Successしたらその次のStateは無い。つまり、 * Successがpreviousとして指されることはない。 */ no s:Success | s in State.previous } fact { all s:(State - Idle) | let transitive = (^previous)[s] | // あるStateから、推移的に到達可能なprevious /** * あるStateが、previousとして指すStateは、 * 他のStateからはpreviousとして指されていないこと。反射的関係。 */ s = previous.(s.previous) /** * 遷移の起点は必ずIdle。なので * あるStateから、推移的に到達可能なpreviousには、 * 必ずIdleStateが含まれていないとおかしい. * (Idleのpreviousは無いので、Idleがtransitiveに含まれていれば、 * それは必ず起点であるといってよい) */ && transitive - Idle != transitive } /*------------------------------------------------------------ * 状態遷移と値オブジェクトとを組み合わせたときの制約 *------------------------------------------------------------*/ fact transientBase { /** * 反射的関係。あるStateが指すVisitorは、 * 他のStateからvisitorとして指されていないこと。 */ (all s:State | s = visitor.(s.visitor)) /** * Visitorは必ずStateに保持されている。 */ && all v:Visitor | v in (State <: visitor)[State] } fact identified { /** * 終端、つまり、previousとして参照されていないStateを起点にして * そこから辿れるすべての状態に属するVisitorのidentityは同一。 */ let terminated = State - previous[State] | (all s:terminated | s.^previous.visitor.identity = s.visitor.identity) /** * そのうえで且つ、終端状態の数とPkeyの数は同じであるはず。 */ && #(terminated) = #(Pkey) } /** * 状態を、値オブジェクトの様相でもって定義づける。 */ fact businessLogic { // SuccessならSessionがあり、そうでなければSessionは無い。 (all s:State | s in Success iff s.visitor.signIn != none) && // FailならInputFormはある。 (all f:Fail | let v = f.visitor | ~(currentVisitor :> v)[v] != none) && // IdleならInputFormは無い (all i:Idle | let v = i.visitor | ~(currentVisitor :> v)[v] = none) } run {} for 10
Transynther/x86/_processed/NONE/_xt_/i7-8650U_0xd2_notsx.log_5571_205.asm
ljhsiun2/medusa
9
29969
<filename>Transynther/x86/_processed/NONE/_xt_/i7-8650U_0xd2_notsx.log_5571_205.asm .global s_prepare_buffers s_prepare_buffers: ret .global s_faulty_load s_faulty_load: push %r10 push %r15 push %r9 push %rax push %rbx push %rdx // Load lea addresses_normal+0x132e9, %rdx nop and %r9, %r9 movups (%rdx), %xmm5 vpextrq $1, %xmm5, %r10 nop nop nop add $58203, %rbx // Faulty Load lea addresses_D+0x1e9e9, %r9 nop nop nop nop xor %rdx, %rdx movups (%r9), %xmm4 vpextrq $1, %xmm4, %rax lea oracles, %rdx and $0xff, %rax shlq $12, %rax mov (%rdx,%rax,1), %rax pop %rdx pop %rbx pop %rax pop %r9 pop %r15 pop %r10 ret /* <gen_faulty_load> [REF] {'OP': 'LOAD', 'src': {'type': 'addresses_D', 'size': 2, 'AVXalign': False, 'NT': False, 'congruent': 0, 'same': False}} {'OP': 'LOAD', 'src': {'type': 'addresses_normal', 'size': 16, 'AVXalign': False, 'NT': False, 'congruent': 8, 'same': False}} [Faulty Load] {'OP': 'LOAD', 'src': {'type': 'addresses_D', 'size': 16, 'AVXalign': False, 'NT': False, 'congruent': 0, 'same': True}} <gen_prepare_buffer> {'36': 5571} 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 36 */
stm32f1/stm32f103xx/svd/stm32_svd-dbg.ads
ekoeppen/STM32_Generic_Ada_Drivers
1
22183
<filename>stm32f1/stm32f103xx/svd/stm32_svd-dbg.ads -- This spec has been automatically generated from STM32F103.svd pragma Restrictions (No_Elaboration_Code); pragma Ada_2012; pragma Style_Checks (Off); with System; package STM32_SVD.DBG is pragma Preelaborate; --------------- -- Registers -- --------------- subtype IDCODE_DEV_ID_Field is STM32_SVD.UInt12; subtype IDCODE_REV_ID_Field is STM32_SVD.UInt16; -- DBGMCU_IDCODE type IDCODE_Register is record -- Read-only. DEV_ID DEV_ID : IDCODE_DEV_ID_Field; -- unspecified Reserved_12_15 : STM32_SVD.UInt4; -- Read-only. REV_ID REV_ID : IDCODE_REV_ID_Field; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for IDCODE_Register use record DEV_ID at 0 range 0 .. 11; Reserved_12_15 at 0 range 12 .. 15; REV_ID at 0 range 16 .. 31; end record; subtype CR_DBG_SLEEP_Field is STM32_SVD.Bit; subtype CR_DBG_STOP_Field is STM32_SVD.Bit; subtype CR_DBG_STANDBY_Field is STM32_SVD.Bit; subtype CR_TRACE_IOEN_Field is STM32_SVD.Bit; subtype CR_TRACE_MODE_Field is STM32_SVD.UInt2; subtype CR_DBG_IWDG_STOP_Field is STM32_SVD.Bit; subtype CR_DBG_WWDG_STOP_Field is STM32_SVD.Bit; subtype CR_DBG_TIM1_STOP_Field is STM32_SVD.Bit; subtype CR_DBG_TIM2_STOP_Field is STM32_SVD.Bit; subtype CR_DBG_TIM3_STOP_Field is STM32_SVD.Bit; subtype CR_DBG_TIM4_STOP_Field is STM32_SVD.Bit; subtype CR_DBG_CAN1_STOP_Field is STM32_SVD.Bit; subtype CR_DBG_I2C1_SMBUS_TIMEOUT_Field is STM32_SVD.Bit; subtype CR_DBG_I2C2_SMBUS_TIMEOUT_Field is STM32_SVD.Bit; subtype CR_DBG_TIM8_STOP_Field is STM32_SVD.Bit; subtype CR_DBG_TIM5_STOP_Field is STM32_SVD.Bit; subtype CR_DBG_TIM6_STOP_Field is STM32_SVD.Bit; subtype CR_DBG_TIM7_STOP_Field is STM32_SVD.Bit; subtype CR_DBG_CAN2_STOP_Field is STM32_SVD.Bit; -- DBGMCU_CR type CR_Register is record -- DBG_SLEEP DBG_SLEEP : CR_DBG_SLEEP_Field := 16#0#; -- DBG_STOP DBG_STOP : CR_DBG_STOP_Field := 16#0#; -- DBG_STANDBY DBG_STANDBY : CR_DBG_STANDBY_Field := 16#0#; -- unspecified Reserved_3_4 : STM32_SVD.UInt2 := 16#0#; -- TRACE_IOEN TRACE_IOEN : CR_TRACE_IOEN_Field := 16#0#; -- TRACE_MODE TRACE_MODE : CR_TRACE_MODE_Field := 16#0#; -- DBG_IWDG_STOP DBG_IWDG_STOP : CR_DBG_IWDG_STOP_Field := 16#0#; -- DBG_WWDG_STOP DBG_WWDG_STOP : CR_DBG_WWDG_STOP_Field := 16#0#; -- DBG_TIM1_STOP DBG_TIM1_STOP : CR_DBG_TIM1_STOP_Field := 16#0#; -- DBG_TIM2_STOP DBG_TIM2_STOP : CR_DBG_TIM2_STOP_Field := 16#0#; -- DBG_TIM3_STOP DBG_TIM3_STOP : CR_DBG_TIM3_STOP_Field := 16#0#; -- DBG_TIM4_STOP DBG_TIM4_STOP : CR_DBG_TIM4_STOP_Field := 16#0#; -- DBG_CAN1_STOP DBG_CAN1_STOP : CR_DBG_CAN1_STOP_Field := 16#0#; -- DBG_I2C1_SMBUS_TIMEOUT DBG_I2C1_SMBUS_TIMEOUT : CR_DBG_I2C1_SMBUS_TIMEOUT_Field := 16#0#; -- DBG_I2C2_SMBUS_TIMEOUT DBG_I2C2_SMBUS_TIMEOUT : CR_DBG_I2C2_SMBUS_TIMEOUT_Field := 16#0#; -- DBG_TIM8_STOP DBG_TIM8_STOP : CR_DBG_TIM8_STOP_Field := 16#0#; -- DBG_TIM5_STOP DBG_TIM5_STOP : CR_DBG_TIM5_STOP_Field := 16#0#; -- DBG_TIM6_STOP DBG_TIM6_STOP : CR_DBG_TIM6_STOP_Field := 16#0#; -- DBG_TIM7_STOP DBG_TIM7_STOP : CR_DBG_TIM7_STOP_Field := 16#0#; -- DBG_CAN2_STOP DBG_CAN2_STOP : CR_DBG_CAN2_STOP_Field := 16#0#; -- unspecified Reserved_22_31 : STM32_SVD.UInt10 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CR_Register use record DBG_SLEEP at 0 range 0 .. 0; DBG_STOP at 0 range 1 .. 1; DBG_STANDBY at 0 range 2 .. 2; Reserved_3_4 at 0 range 3 .. 4; TRACE_IOEN at 0 range 5 .. 5; TRACE_MODE at 0 range 6 .. 7; DBG_IWDG_STOP at 0 range 8 .. 8; DBG_WWDG_STOP at 0 range 9 .. 9; DBG_TIM1_STOP at 0 range 10 .. 10; DBG_TIM2_STOP at 0 range 11 .. 11; DBG_TIM3_STOP at 0 range 12 .. 12; DBG_TIM4_STOP at 0 range 13 .. 13; DBG_CAN1_STOP at 0 range 14 .. 14; DBG_I2C1_SMBUS_TIMEOUT at 0 range 15 .. 15; DBG_I2C2_SMBUS_TIMEOUT at 0 range 16 .. 16; DBG_TIM8_STOP at 0 range 17 .. 17; DBG_TIM5_STOP at 0 range 18 .. 18; DBG_TIM6_STOP at 0 range 19 .. 19; DBG_TIM7_STOP at 0 range 20 .. 20; DBG_CAN2_STOP at 0 range 21 .. 21; Reserved_22_31 at 0 range 22 .. 31; end record; ----------------- -- Peripherals -- ----------------- -- Debug support type DBG_Peripheral is record -- DBGMCU_IDCODE IDCODE : aliased IDCODE_Register; -- DBGMCU_CR CR : aliased CR_Register; end record with Volatile; for DBG_Peripheral use record IDCODE at 16#0# range 0 .. 31; CR at 16#4# range 0 .. 31; end record; -- Debug support DBG_Periph : aliased DBG_Peripheral with Import, Address => System'To_Address (16#E0042000#); end STM32_SVD.DBG;
src/FLA/Data/VectorList.agda
turion/functional-linear-algebra
21
14022
{-# OPTIONS --without-K --safe #-} open import Level using (Level) open import Data.List using (List; sum) renaming ([] to []ᴸ; _∷_ to _∷ᴸ_) open import Data.Nat using (ℕ; _+_; zero; suc) open import Data.Vec using (Vec; _++_; take; drop) renaming ([] to []ⱽ; _∷_ to _∷ⱽ_) open import Data.Product as Prod using (∃; ∃₂; _×_; _,_) module FLA.Data.VectorList where -- At the moment, `VectorList` is named `RList` in the Haskell code. data VectorList (A : Set) : List ℕ → Set where []ⱽᴸ : VectorList A []ᴸ _∷ⱽᴸ_ : {n : ℕ} {ns : List ℕ} → Vec A n → VectorList A ns → VectorList A (n ∷ᴸ ns) infixr 5 _∷ⱽᴸ_ concat : {A : Set} {ns : List ℕ} → VectorList A ns → Vec A (sum ns) concat []ⱽᴸ = []ⱽ concat (v ∷ⱽᴸ vs) = v ++ concat vs -- We will want to use split to split a VectorList split : {ℓ : Level} {A : Set ℓ} → {m n : ℕ} → Vec A (m + n) → Vec A m × Vec A n split {ℓ} {A} {zero} {n} v = []ⱽ , v split {ℓ} {A} {suc m} {n} (v ∷ⱽ vs) = let v₁ , v₂ = split vs in v ∷ⱽ v₁ , v₂ -- split' : {ℓ : Level} {A : Set ℓ} → {m n : ℕ} → Vec A (m + n) → Vec A m × Vec A n -- split' {ℓ} {A} {m} {n} v = (take v , drop v) -- Hmm, this will be hard to translate to Haskell, since we match on ns splitToVectorList : {A : Set} → (ns : List ℕ) → Vec A (sum ns) → VectorList A ns splitToVectorList []ᴸ v = []ⱽᴸ splitToVectorList (_ ∷ᴸ ns) v = let v₁ , v₂ = split v in v₁ ∷ⱽᴸ (splitToVectorList ns v₂)
programs/oeis/027/A027801.asm
neoneye/loda
22
167609
<reponame>neoneye/loda ; A027801: a(n) = 5*(n+1)*binomial(n+4,5)/2. ; 5,45,210,700,1890,4410,9240,17820,32175,55055,90090,141960,216580,321300,465120,658920,915705,1250865,1682450,2231460,2922150,3782350,4843800,6142500,7719075,9619155,11893770,14599760,17800200,21564840,25970560,31101840,37051245,43919925,51818130,60865740,71192810,82940130,96259800,111315820,128284695,147356055,168733290,192634200,219291660,248954300,281887200,318372600,358710625,403220025,452238930,506125620,565259310,630040950,700894040,778265460,862626315,954472795,1054327050,1162738080,1280282640,1407566160,1545223680,1693920800,1854354645,2027254845,2213384530,2413541340,2628558450,2859305610,3106690200,3371658300,3655195775,3958329375,4282127850,4627703080,4996211220,5388853860,5806879200,6251583240,6724310985,7226457665,7759469970,8324847300,8924143030,9558965790,10230980760,10941910980,11693538675,12487706595,13326319370,14211344880,15144815640,16128830200,17165554560,18257223600,19406142525,20614688325,21885311250,23220536300 mov $1,$0 add $0,5 bin $0,$1 add $1,2 mul $0,$1 div $0,2 mul $0,5
alloy4fun_models/trashltl/models/17/YFpBSPD7XWfWpqgox.als
Kaixi26/org.alloytools.alloy
0
3514
<filename>alloy4fun_models/trashltl/models/17/YFpBSPD7XWfWpqgox.als open main pred idYFpBSPD7XWfWpqgox_prop18 { always (all f:Protected | f in Trash implies f not in Protected) } pred __repair { idYFpBSPD7XWfWpqgox_prop18 } check __repair { idYFpBSPD7XWfWpqgox_prop18 <=> prop18o }
programs/oeis/006/A006222.asm
neoneye/loda
22
21444
; A006222: 11*n^2 + 11*n + 3. ; 3,25,69,135,223,333,465,619,795,993,1213,1455,1719,2005,2313,2643,2995,3369,3765,4183,4623,5085,5569,6075,6603,7153,7725,8319,8935,9573,10233,10915,11619,12345,13093,13863,14655,15469,16305,17163,18043,18945,19869,20815,21783,22773,23785,24819,25875,26953,28053,29175,30319,31485,32673,33883,35115,36369,37645,38943,40263,41605,42969,44355,45763,47193,48645,50119,51615,53133,54673,56235,57819,59425,61053,62703,64375,66069,67785,69523,71283,73065,74869,76695,78543,80413,82305,84219,86155,88113,90093,92095,94119,96165,98233,100323,102435,104569,106725,108903 sub $1,$0 bin $1,2 mul $1,22 add $1,3 mov $0,$1
programs/oeis/094/A094793.asm
neoneye/loda
22
85721
; A094793: a(n) = (1/n!)*A001688(n). ; 9,53,181,465,1001,1909,3333,5441,8425,12501,17909,24913,33801,44885,58501,75009,94793,118261,145845,178001,215209,257973,306821,362305,425001,495509,574453,662481,760265,868501,987909,1119233,1263241 sub $2,$0 add $0,2 mul $2,$0 bin $0,2 pow $0,2 sub $0,$2 sub $0,1 mul $0,4 add $0,9
libsrc/_DEVELOPMENT/sound/bit/z80/asm_bit_beepfx/_bfx_51.asm
meesokim/z88dk
0
25010
; BeepFX sound effect by shiru ; http://shiru.untergrund.net SECTION rodata_sound_bit PUBLIC _bfx_51 _bfx_51: ; Gulp defb 1 ;tone defw 50,200,500,65516,128 defb 0
src/main/fragment/mos6502-common/vbuxx_neq_pbum1_derefidx_vbuyy_then_la1.asm
jbrandwood/kickc
2
12235
stx $fd lda {m1} sta $fe lda {m1}+1 sta $ff lda ($fe),y cmp $fd bne {la1}
Cubical/HITs/Susp.agda
limemloh/cubical
0
4734
<reponame>limemloh/cubical {-# OPTIONS --cubical --safe #-} module Cubical.HITs.Susp where open import Cubical.HITs.Susp.Base public -- open import Cubical.HITs.Susp.Properties public
src/Fragment/Examples/Semigroup/Arith/Reasoning.agda
yallop/agda-fragment
18
15288
{-# OPTIONS --without-K --safe #-} module Fragment.Examples.Semigroup.Arith.Reasoning where open import Fragment.Examples.Semigroup.Arith.Base +-direct : ∀ {m n} → (m + 2) + (3 + n) ≡ m + (5 + n) +-direct {m} {n} = begin (m + 2) + (3 + n) ≡⟨ fragment SemigroupFrex +-semigroup ⟩ m + (5 + n) ∎ open import Data.Nat.Properties using (*-distribˡ-+) +-inner : ∀ {m n k} → k * (m + 2) + k * (3 + n) ≡ k * (m + 5 + n) +-inner {m} {n} {k} = begin k * (m + 2) + k * (3 + n) ≡⟨ sym (*-distribˡ-+ k (m + 2) (3 + n)) ⟩ k * ((m + 2) + (3 + n)) ≡⟨ cong (k *_) (fragment SemigroupFrex +-semigroup) ⟩ k * (m + 5 + n) ∎
DiscourseLib.applescript
alldritt/AppleScriptLibraries
41
2839
use AppleScript version "2.4" -- Yosemite (10.10) or later use framework "Foundation" use scripting additions -- Public Discourse Configuration property APIDOMAIN : missing value -- "https://forum.domain.com" property APIKEY : missing value -- "your Discourse API key" property APIUSER : missing value -- "your Discourse username" -- Discourse properties property APIPOSTS_ENDPOINT : "/posts.json" property APIPOST_ENDPOINT : "/posts/{id}.json" property APICATAGORIES_ENDPOINT : "/categories.json" property APITAGGROUPS_ENDPOINT : "/tag_groups.json" property APITAGS_ENDPOINT : "/tags.json" -- classes, constants, and enums used property NSJSONSerialization : a reference to current application's NSJSONSerialization property NSData : a reference to current application's NSData property NSString : a reference to current application's NSString property NSArray : a reference to current application's NSArray property NSURL : a reference to current application's NSURL property NSURLRequest : a reference to current application's NSURLRequest property NSURLRequestReloadIgnoringLocalCacheData : a reference to current application's NSURLRequestReloadIgnoringLocalCacheData property NSMutableURLRequest : a reference to current application's NSMutableURLRequest property NSURLConnection : a reference to current application's NSURLConnection property NSURLComponents : a reference to current application's NSURLComponents property NSURLQueryItem : a reference to current application's NSURLQueryItem on getDiscourseTags() local theJSON, theNames -- so SD can see them -- Construct a URL containing all the query parameters needed to create a Dicourse post set apiKeyParam to NSURLQueryItem's queryItemWithName:"api_key" value:APIKEY set userParam to NSURLQueryItem's queryItemWithName:"api_username" value:APIUSER set urlComponents to NSURLComponents's componentsWithString:(APIDOMAIN & APITAGS_ENDPOINT) urlComponents's setQueryItems:{apiKeyParam, userParam} -- Send the get tags request to the Discourse site set theRequest to NSURLRequest's requestWithURL:(urlComponents's |URL|) ¬ cachePolicy:NSURLRequestReloadIgnoringLocalCacheData timeoutInterval:10 set theResult to NSURLConnection's sendSynchronousRequest:theRequest ¬ returningResponse:(reference) |error|:(missing value) set theJSONData to item 1 of theResult set theJSON to NSJSONSerialization's JSONObjectWithData:theJSONData options:0 |error|:(missing value) set theNames to (theJSON's valueForKeyPath:"tags.text") as list return theNames end getDiscourseTags on getDiscourseCategories() local theJSON, theNames -- so SD can see them -- Construct a URL containing all the query parameters needed to create a Dicourse post set apiKeyParam to NSURLQueryItem's queryItemWithName:"api_key" value:APIKEY set userParam to NSURLQueryItem's queryItemWithName:"api_username" value:APIUSER set urlComponents to NSURLComponents's componentsWithString:(APIDOMAIN & APICATAGORIES_ENDPOINT) urlComponents's setQueryItems:{apiKeyParam, userParam} -- Send the get catagories request to the Discourse site set theRequest to NSURLRequest's requestWithURL:(urlComponents's |URL|) ¬ cachePolicy:NSURLRequestReloadIgnoringLocalCacheData timeoutInterval:10 set theResult to NSURLConnection's sendSynchronousRequest:theRequest ¬ returningResponse:(reference) |error|:(missing value) set theJSONData to item 1 of theResult set theJSON to NSJSONSerialization's JSONObjectWithData:theJSONData options:0 |error|:(missing value) set theNames to (theJSON's valueForKeyPath:"category_list.categories.name") as list return theNames end getDiscourseCategories on getDiscoursePost(postID) local theJSON, endpoint set endpoint to (NSString's stringWithString:APIPOST_ENDPOINT)'s ¬ stringByReplacingOccurrencesOfString:"{id}" withString:(postID as text) -- Construct a URL containing all the query parameters needed to create a Dicourse post set apiKeyParam to NSURLQueryItem's queryItemWithName:"api_key" value:APIKEY set userParam to NSURLQueryItem's queryItemWithName:"api_username" value:APIUSER set urlComponents to NSURLComponents's componentsWithString:(APIDOMAIN & endpoint) urlComponents's setQueryItems:{apiKeyParam, userParam} -- Send the get post request to the Discourse site set theRequest to NSURLRequest's requestWithURL:(urlComponents's |URL|) ¬ cachePolicy:NSURLRequestReloadIgnoringLocalCacheData timeoutInterval:10 set theResult to NSURLConnection's sendSynchronousRequest:theRequest ¬ returningResponse:(reference) |error|:(missing value) set theJSONData to item 1 of theResult set theJSON to NSJSONSerialization's JSONObjectWithData:theJSONData options:0 |error|:(missing value) return theJSON end getDiscoursePost on postToDiscourse(postTitle, postCategory, postTags, postMarkdown) local theRequest, theResult, theJSONData, theJSON -- so SD can see them -- AppleScript strings often have CR line endings while Discourse expects LF line endings. Convert all -- CRs to LFs. set postMarkdown to (NSString's stringWithString:postMarkdown)'s ¬ stringByReplacingOccurrencesOfString:return withString:linefeed if postTags = missing value tjem then postTags = (NSArray's array) else if postTags is not array then set postTags to (NSArray's arrayWithObjects:[postTags]) else set postTags to (NSArray's arrayWithObjects:postTags) end if -- Construct a URL containing all the query parameters needed to create a Dicourse post set apiKeyParam to NSURLQueryItem's queryItemWithName:"api_key" value:APIKEY set userParam to NSURLQueryItem's queryItemWithName:"api_username" value:APIUSER set titleParam to NSURLQueryItem's queryItemWithName:"title" value:postTitle set categoryParam to NSURLQueryItem's queryItemWithName:"category" value:postCategory set tagsParam to NSURLQueryItem's queryItemWithName:"tags" value:postTags set rawParam to NSURLQueryItem's queryItemWithName:"raw" value:postMarkdown set urlComponents to NSURLComponents's componentsWithString:(APIDOMAIN & APIPOSTS_ENDPOINT) urlComponents's setQueryItems:{apiKeyParam, userParam, titleParam, categoryParam, tagsParam, rawParam} -- Send the create post request to the Discourse site set theRequest to NSMutableURLRequest's requestWithURL:(urlComponents's |URL|) ¬ cachePolicy:NSURLRequestReloadIgnoringLocalCacheData timeoutInterval:10 theRequest's setHTTPMethod:"POST" set theResult to NSURLConnection's sendSynchronousRequest:theRequest ¬ returningResponse:(reference) |error|:(missing value) set theJSONData to item 1 of theResult set theJSON to NSJSONSerialization's JSONObjectWithData:theJSONData options:0 |error|:(missing value) return theJSON end postToDiscourse
programs/oeis/058/A058031.asm
karttu/loda
1
22468
; A058031: a(n) = n^4 - 2*n^3 + 3*n^2 - 2*n + 1, the Alexander polynomial for reef and granny knots. ; 1,1,9,49,169,441,961,1849,3249,5329,8281,12321,17689,24649,33489,44521,58081,74529,94249,117649,145161,177241,214369,257049,305809,361201,423801,494209,573049,660969,758641,866761,986049,1117249,1261129,1418481,1590121,1776889,1979649,2199289,2436721,2692881,2968729,3265249,3583449,3924361,4289041,4678569,5094049,5536609,6007401,6507601,7038409,7601049,8196769,8826841,9492561,10195249,10936249,11716929,12538681,13402921,14311089,15264649,16265089,17313921,18412681,19562929,20766249,22024249,23338561,24710841,26142769,27636049,29192409,30813601,32501401,34257609,36084049,37982569,39955041,42003361,44129449,46335249,48622729,50993881,53450721,55995289,58629649,61355889,64176121,67092481,70107129,73222249,76440049,79762761,83192641,86731969,90383049,94148209,98029801,102030201,106151809,110397049,114768369,119268241,123899161,128663649,133564249,138603529,143784081,149108521,154579489,160199649,165971689,171898321,177982281,184226329,190633249,197205849,203946961,210859441,217946169,225210049,232654009,240281001,248094001,256096009,264290049,272679169,281266441,290054961,299047849,308248249,317659329,327284281,337126321,347188689,357474649,367987489,378730521,389707081,400920529,412374249,424071649,436016161,448211241,460660369,473367049,486334809,499567201,513067801,526840209,540888049,555214969,569824641,584720761,599907049,615387249,631165129,647244481,663629121,680322889,697329649,714653289,732297721,750266881,768564729,787195249,806162449,825470361,845123041,865124569,885479049,906190609,927263401,948701601,970509409,992691049,1015250769,1038192841,1061521561,1085241249,1109356249,1133870929,1158789681,1184116921,1209857089,1236014649,1262594089,1289599921,1317036681,1344908929,1373221249,1401978249,1431184561,1460844841,1490963769,1521546049,1552596409,1584119601,1616120401,1648603609,1681574049,1715036569,1748996041,1783457361,1818425449,1853905249,1889901729,1926419881,1963464721,2001041289,2039154649,2077809889,2117012121,2156766481,2197078129,2237952249,2279394049,2321408761,2364001641,2407177969,2450943049,2495302209,2540260801,2585824201,2631997809,2678787049,2726197369,2774234241,2822903161,2872209649,2922159249,2972757529,3024010081,3075922521,3128500489,3181749649,3235675689,3290284321,3345581281,3401572329,3458263249,3515659849,3573767961,3632593441,3692142169,3752420049,3813433009 bin $0,2 mul $0,2 add $0,1 pow $0,2 mov $1,$0
oscomp/build/asm/execve.asm
wei-huan/MyOS
2
170382
<reponame>wei-huan/MyOS<filename>oscomp/build/asm/execve.asm /home/weihuan/Documents/testsuits-for-oskernel-preliminary/riscv-syscalls-testing/user/build/riscv64/execve: file format elf64-littleriscv Disassembly of section .text: 0000000000001000 <_start>: .section .text.entry .globl _start _start: mv a0, sp 1000: 850a mv a0,sp tail __start_main 1002: a08d j 1064 <__start_main> 0000000000001004 <test_execve>: * 测试成功则输出: * " I am test_echo." * 测试失败则输出: * " execve error." */ void test_execve(void){ 1004: 7179 addi sp,sp,-48 TEST_START(__func__); 1006: 00001517 auipc a0,0x1 100a: e8a50513 addi a0,a0,-374 # 1e90 <__clone+0x2c> void test_execve(void){ 100e: f406 sd ra,40(sp) TEST_START(__func__); 1010: 2c6000ef jal ra,12d6 <puts> 1014: 00001517 auipc a0,0x1 1018: eec50513 addi a0,a0,-276 # 1f00 <__func__.0> 101c: 2ba000ef jal ra,12d6 <puts> 1020: 00001517 auipc a0,0x1 1024: e8850513 addi a0,a0,-376 # 1ea8 <__clone+0x44> 1028: 2ae000ef jal ra,12d6 <puts> char *newargv[] = {"test_echo", NULL}; char *newenviron[] = {NULL}; execve("test_echo", newargv, newenviron); 102c: 0030 addi a2,sp,8 102e: 080c addi a1,sp,16 char *newargv[] = {"test_echo", NULL}; 1030: 00001517 auipc a0,0x1 1034: e8850513 addi a0,a0,-376 # 1eb8 <__clone+0x54> 1038: e82a sd a0,16(sp) 103a: ec02 sd zero,24(sp) char *newenviron[] = {NULL}; 103c: e402 sd zero,8(sp) execve("test_echo", newargv, newenviron); 103e: 463000ef jal ra,1ca0 <execve> printf(" execve error.\n"); 1042: 00001517 auipc a0,0x1 1046: e8650513 addi a0,a0,-378 # 1ec8 <__clone+0x64> 104a: 2ae000ef jal ra,12f8 <printf> //TEST_END(__func__); } 104e: 70a2 ld ra,40(sp) 1050: 6145 addi sp,sp,48 1052: 8082 ret 0000000000001054 <main>: int main(void){ 1054: 1141 addi sp,sp,-16 1056: e406 sd ra,8(sp) test_execve(); 1058: fadff0ef jal ra,1004 <test_execve> return 0; } 105c: 60a2 ld ra,8(sp) 105e: 4501 li a0,0 1060: 0141 addi sp,sp,16 1062: 8082 ret 0000000000001064 <__start_main>: #include <unistd.h> extern int main(); int __start_main(long *p) { 1064: 85aa mv a1,a0 int argc = p[0]; char **argv = (void *)(p+1); exit(main(argc, argv)); 1066: 4108 lw a0,0(a0) { 1068: 1141 addi sp,sp,-16 exit(main(argc, argv)); 106a: 05a1 addi a1,a1,8 { 106c: e406 sd ra,8(sp) exit(main(argc, argv)); 106e: fe7ff0ef jal ra,1054 <main> 1072: 40b000ef jal ra,1c7c <exit> return 0; } 1076: 60a2 ld ra,8(sp) 1078: 4501 li a0,0 107a: 0141 addi sp,sp,16 107c: 8082 ret 000000000000107e <printint.constprop.0>: write(f, s, l); } static char digits[] = "0123456789abcdef"; static void printint(int xx, int base, int sign) 107e: 7179 addi sp,sp,-48 1080: f406 sd ra,40(sp) { char buf[16 + 1]; int i; uint x; if (sign && (sign = xx < 0)) 1082: 12054b63 bltz a0,11b8 <printint.constprop.0+0x13a> buf[16] = 0; i = 15; do { buf[i--] = digits[x % base]; 1086: 02b577bb remuw a5,a0,a1 108a: 00001617 auipc a2,0x1 108e: e8660613 addi a2,a2,-378 # 1f10 <digits> buf[16] = 0; 1092: 00010c23 sb zero,24(sp) buf[i--] = digits[x % base]; 1096: 0005871b sext.w a4,a1 109a: 1782 slli a5,a5,0x20 109c: 9381 srli a5,a5,0x20 109e: 97b2 add a5,a5,a2 10a0: 0007c783 lbu a5,0(a5) } while ((x /= base) != 0); 10a4: 02b5583b divuw a6,a0,a1 buf[i--] = digits[x % base]; 10a8: 00f10ba3 sb a5,23(sp) } while ((x /= base) != 0); 10ac: 1cb56363 bltu a0,a1,1272 <printint.constprop.0+0x1f4> buf[i--] = digits[x % base]; 10b0: 45b9 li a1,14 10b2: 02e877bb remuw a5,a6,a4 10b6: 1782 slli a5,a5,0x20 10b8: 9381 srli a5,a5,0x20 10ba: 97b2 add a5,a5,a2 10bc: 0007c783 lbu a5,0(a5) } while ((x /= base) != 0); 10c0: 02e856bb divuw a3,a6,a4 buf[i--] = digits[x % base]; 10c4: 00f10b23 sb a5,22(sp) } while ((x /= base) != 0); 10c8: 0ce86e63 bltu a6,a4,11a4 <printint.constprop.0+0x126> buf[i--] = digits[x % base]; 10cc: 02e6f5bb remuw a1,a3,a4 } while ((x /= base) != 0); 10d0: 02e6d7bb divuw a5,a3,a4 buf[i--] = digits[x % base]; 10d4: 1582 slli a1,a1,0x20 10d6: 9181 srli a1,a1,0x20 10d8: 95b2 add a1,a1,a2 10da: 0005c583 lbu a1,0(a1) 10de: 00b10aa3 sb a1,21(sp) } while ((x /= base) != 0); 10e2: 0007859b sext.w a1,a5 10e6: 12e6ec63 bltu a3,a4,121e <printint.constprop.0+0x1a0> buf[i--] = digits[x % base]; 10ea: 02e7f6bb remuw a3,a5,a4 10ee: 1682 slli a3,a3,0x20 10f0: 9281 srli a3,a3,0x20 10f2: 96b2 add a3,a3,a2 10f4: 0006c683 lbu a3,0(a3) } while ((x /= base) != 0); 10f8: 02e7d83b divuw a6,a5,a4 buf[i--] = digits[x % base]; 10fc: 00d10a23 sb a3,20(sp) } while ((x /= base) != 0); 1100: 12e5e863 bltu a1,a4,1230 <printint.constprop.0+0x1b2> buf[i--] = digits[x % base]; 1104: 02e876bb remuw a3,a6,a4 1108: 1682 slli a3,a3,0x20 110a: 9281 srli a3,a3,0x20 110c: 96b2 add a3,a3,a2 110e: 0006c683 lbu a3,0(a3) } while ((x /= base) != 0); 1112: 02e855bb divuw a1,a6,a4 buf[i--] = digits[x % base]; 1116: 00d109a3 sb a3,19(sp) } while ((x /= base) != 0); 111a: 12e86463 bltu a6,a4,1242 <printint.constprop.0+0x1c4> buf[i--] = digits[x % base]; 111e: 02e5f6bb remuw a3,a1,a4 1122: 1682 slli a3,a3,0x20 1124: 9281 srli a3,a3,0x20 1126: 96b2 add a3,a3,a2 1128: 0006c683 lbu a3,0(a3) } while ((x /= base) != 0); 112c: 02e5d83b divuw a6,a1,a4 buf[i--] = digits[x % base]; 1130: 00d10923 sb a3,18(sp) } while ((x /= base) != 0); 1134: 0ce5ec63 bltu a1,a4,120c <printint.constprop.0+0x18e> buf[i--] = digits[x % base]; 1138: 02e876bb remuw a3,a6,a4 113c: 1682 slli a3,a3,0x20 113e: 9281 srli a3,a3,0x20 1140: 96b2 add a3,a3,a2 1142: 0006c683 lbu a3,0(a3) } while ((x /= base) != 0); 1146: 02e855bb divuw a1,a6,a4 buf[i--] = digits[x % base]; 114a: 00d108a3 sb a3,17(sp) } while ((x /= base) != 0); 114e: 10e86963 bltu a6,a4,1260 <printint.constprop.0+0x1e2> buf[i--] = digits[x % base]; 1152: 02e5f6bb remuw a3,a1,a4 1156: 1682 slli a3,a3,0x20 1158: 9281 srli a3,a3,0x20 115a: 96b2 add a3,a3,a2 115c: 0006c683 lbu a3,0(a3) } while ((x /= base) != 0); 1160: 02e5d83b divuw a6,a1,a4 buf[i--] = digits[x % base]; 1164: 00d10823 sb a3,16(sp) } while ((x /= base) != 0); 1168: 10e5e763 bltu a1,a4,1276 <printint.constprop.0+0x1f8> buf[i--] = digits[x % base]; 116c: 02e876bb remuw a3,a6,a4 1170: 1682 slli a3,a3,0x20 1172: 9281 srli a3,a3,0x20 1174: 96b2 add a3,a3,a2 1176: 0006c683 lbu a3,0(a3) } while ((x /= base) != 0); 117a: 02e857bb divuw a5,a6,a4 buf[i--] = digits[x % base]; 117e: 00d107a3 sb a3,15(sp) } while ((x /= base) != 0); 1182: 10e86363 bltu a6,a4,1288 <printint.constprop.0+0x20a> buf[i--] = digits[x % base]; 1186: 1782 slli a5,a5,0x20 1188: 9381 srli a5,a5,0x20 118a: 97b2 add a5,a5,a2 118c: 0007c783 lbu a5,0(a5) 1190: 4599 li a1,6 1192: 00f10723 sb a5,14(sp) if (sign) 1196: 00055763 bgez a0,11a4 <printint.constprop.0+0x126> buf[i--] = '-'; 119a: 02d00793 li a5,45 119e: 00f106a3 sb a5,13(sp) buf[i--] = digits[x % base]; 11a2: 4595 li a1,5 write(f, s, l); 11a4: 003c addi a5,sp,8 11a6: 4641 li a2,16 11a8: 9e0d subw a2,a2,a1 11aa: 4505 li a0,1 11ac: 95be add a1,a1,a5 11ae: 27f000ef jal ra,1c2c <write> i++; if (i < 0) puts("printint error"); out(stdout, buf + i, 16 - i); } 11b2: 70a2 ld ra,40(sp) 11b4: 6145 addi sp,sp,48 11b6: 8082 ret x = -xx; 11b8: 40a0083b negw a6,a0 buf[i--] = digits[x % base]; 11bc: 02b877bb remuw a5,a6,a1 11c0: 00001617 auipc a2,0x1 11c4: d5060613 addi a2,a2,-688 # 1f10 <digits> buf[16] = 0; 11c8: 00010c23 sb zero,24(sp) buf[i--] = digits[x % base]; 11cc: 0005871b sext.w a4,a1 11d0: 1782 slli a5,a5,0x20 11d2: 9381 srli a5,a5,0x20 11d4: 97b2 add a5,a5,a2 11d6: 0007c783 lbu a5,0(a5) } while ((x /= base) != 0); 11da: 02b858bb divuw a7,a6,a1 buf[i--] = digits[x % base]; 11de: 00f10ba3 sb a5,23(sp) } while ((x /= base) != 0); 11e2: 06b86963 bltu a6,a1,1254 <printint.constprop.0+0x1d6> buf[i--] = digits[x % base]; 11e6: 02e8f7bb remuw a5,a7,a4 11ea: 1782 slli a5,a5,0x20 11ec: 9381 srli a5,a5,0x20 11ee: 97b2 add a5,a5,a2 11f0: 0007c783 lbu a5,0(a5) } while ((x /= base) != 0); 11f4: 02e8d6bb divuw a3,a7,a4 buf[i--] = digits[x % base]; 11f8: 00f10b23 sb a5,22(sp) } while ((x /= base) != 0); 11fc: ece8f8e3 bgeu a7,a4,10cc <printint.constprop.0+0x4e> buf[i--] = '-'; 1200: 02d00793 li a5,45 1204: 00f10aa3 sb a5,21(sp) buf[i--] = digits[x % base]; 1208: 45b5 li a1,13 120a: bf69 j 11a4 <printint.constprop.0+0x126> 120c: 45a9 li a1,10 if (sign) 120e: f8055be3 bgez a0,11a4 <printint.constprop.0+0x126> buf[i--] = '-'; 1212: 02d00793 li a5,45 1216: 00f108a3 sb a5,17(sp) buf[i--] = digits[x % base]; 121a: 45a5 li a1,9 121c: b761 j 11a4 <printint.constprop.0+0x126> 121e: 45b5 li a1,13 if (sign) 1220: f80552e3 bgez a0,11a4 <printint.constprop.0+0x126> buf[i--] = '-'; 1224: 02d00793 li a5,45 1228: 00f10a23 sb a5,20(sp) buf[i--] = digits[x % base]; 122c: 45b1 li a1,12 122e: bf9d j 11a4 <printint.constprop.0+0x126> 1230: 45b1 li a1,12 if (sign) 1232: f60559e3 bgez a0,11a4 <printint.constprop.0+0x126> buf[i--] = '-'; 1236: 02d00793 li a5,45 123a: 00f109a3 sb a5,19(sp) buf[i--] = digits[x % base]; 123e: 45ad li a1,11 1240: b795 j 11a4 <printint.constprop.0+0x126> 1242: 45ad li a1,11 if (sign) 1244: f60550e3 bgez a0,11a4 <printint.constprop.0+0x126> buf[i--] = '-'; 1248: 02d00793 li a5,45 124c: 00f10923 sb a5,18(sp) buf[i--] = digits[x % base]; 1250: 45a9 li a1,10 1252: bf89 j 11a4 <printint.constprop.0+0x126> buf[i--] = '-'; 1254: 02d00793 li a5,45 1258: 00f10b23 sb a5,22(sp) buf[i--] = digits[x % base]; 125c: 45b9 li a1,14 125e: b799 j 11a4 <printint.constprop.0+0x126> 1260: 45a5 li a1,9 if (sign) 1262: f40551e3 bgez a0,11a4 <printint.constprop.0+0x126> buf[i--] = '-'; 1266: 02d00793 li a5,45 126a: 00f10823 sb a5,16(sp) buf[i--] = digits[x % base]; 126e: 45a1 li a1,8 1270: bf15 j 11a4 <printint.constprop.0+0x126> i = 15; 1272: 45bd li a1,15 1274: bf05 j 11a4 <printint.constprop.0+0x126> buf[i--] = digits[x % base]; 1276: 45a1 li a1,8 if (sign) 1278: f20556e3 bgez a0,11a4 <printint.constprop.0+0x126> buf[i--] = '-'; 127c: 02d00793 li a5,45 1280: 00f107a3 sb a5,15(sp) buf[i--] = digits[x % base]; 1284: 459d li a1,7 1286: bf39 j 11a4 <printint.constprop.0+0x126> 1288: 459d li a1,7 if (sign) 128a: f0055de3 bgez a0,11a4 <printint.constprop.0+0x126> buf[i--] = '-'; 128e: 02d00793 li a5,45 1292: 00f10723 sb a5,14(sp) buf[i--] = digits[x % base]; 1296: 4599 li a1,6 1298: b731 j 11a4 <printint.constprop.0+0x126> 000000000000129a <getchar>: { 129a: 1101 addi sp,sp,-32 read(stdin, &byte, 1); 129c: 00f10593 addi a1,sp,15 12a0: 4605 li a2,1 12a2: 4501 li a0,0 { 12a4: ec06 sd ra,24(sp) char byte = 0; 12a6: 000107a3 sb zero,15(sp) read(stdin, &byte, 1); 12aa: 179000ef jal ra,1c22 <read> } 12ae: 60e2 ld ra,24(sp) 12b0: 00f14503 lbu a0,15(sp) 12b4: 6105 addi sp,sp,32 12b6: 8082 ret 00000000000012b8 <putchar>: { 12b8: 1101 addi sp,sp,-32 12ba: 87aa mv a5,a0 return write(stdout, &byte, 1); 12bc: 00f10593 addi a1,sp,15 12c0: 4605 li a2,1 12c2: 4505 li a0,1 { 12c4: ec06 sd ra,24(sp) char byte = c; 12c6: 00f107a3 sb a5,15(sp) return write(stdout, &byte, 1); 12ca: 163000ef jal ra,1c2c <write> } 12ce: 60e2 ld ra,24(sp) 12d0: 2501 sext.w a0,a0 12d2: 6105 addi sp,sp,32 12d4: 8082 ret 00000000000012d6 <puts>: { 12d6: 1141 addi sp,sp,-16 12d8: e406 sd ra,8(sp) 12da: e022 sd s0,0(sp) 12dc: 842a mv s0,a0 r = -(write(stdout, s, strlen(s)) < 0); 12de: 56a000ef jal ra,1848 <strlen> 12e2: 862a mv a2,a0 12e4: 85a2 mv a1,s0 12e6: 4505 li a0,1 12e8: 145000ef jal ra,1c2c <write> } 12ec: 60a2 ld ra,8(sp) 12ee: 6402 ld s0,0(sp) r = -(write(stdout, s, strlen(s)) < 0); 12f0: 957d srai a0,a0,0x3f return r; 12f2: 2501 sext.w a0,a0 } 12f4: 0141 addi sp,sp,16 12f6: 8082 ret 00000000000012f8 <printf>: out(stdout, buf, i); } // Print to the console. only understands %d, %x, %p, %s. void printf(const char *fmt, ...) { 12f8: 7171 addi sp,sp,-176 12fa: fc56 sd s5,56(sp) 12fc: ed3e sd a5,152(sp) buf[i++] = '0'; 12fe: 7ae1 lui s5,0xffff8 va_list ap; int cnt = 0, l = 0; char *a, *z, *s = (char *)fmt, str; int f = stdout; va_start(ap, fmt); 1300: 18bc addi a5,sp,120 { 1302: e8ca sd s2,80(sp) 1304: e4ce sd s3,72(sp) 1306: e0d2 sd s4,64(sp) 1308: f85a sd s6,48(sp) 130a: f486 sd ra,104(sp) 130c: f0a2 sd s0,96(sp) 130e: eca6 sd s1,88(sp) 1310: fcae sd a1,120(sp) 1312: e132 sd a2,128(sp) 1314: e536 sd a3,136(sp) 1316: e93a sd a4,144(sp) 1318: f142 sd a6,160(sp) 131a: f546 sd a7,168(sp) va_start(ap, fmt); 131c: e03e sd a5,0(sp) for (;;) { if (!*s) break; for (a = s; *s && *s != '%'; s++) 131e: 02500913 li s2,37 out(f, a, l); if (l) continue; if (s[1] == 0) break; switch (s[1]) 1322: 07300a13 li s4,115 case 'p': printptr(va_arg(ap, uint64)); break; case 's': if ((a = va_arg(ap, char *)) == 0) a = "(null)"; 1326: 00001b17 auipc s6,0x1 132a: bbab0b13 addi s6,s6,-1094 # 1ee0 <__clone+0x7c> buf[i++] = '0'; 132e: 830aca93 xori s5,s5,-2000 buf[i++] = digits[x >> (sizeof(uint64) * 8 - 4)]; 1332: 00001997 auipc s3,0x1 1336: bde98993 addi s3,s3,-1058 # 1f10 <digits> if (!*s) 133a: 00054783 lbu a5,0(a0) 133e: 16078a63 beqz a5,14b2 <printf+0x1ba> 1342: 862a mv a2,a0 for (a = s; *s && *s != '%'; s++) 1344: 19278163 beq a5,s2,14c6 <printf+0x1ce> 1348: 00164783 lbu a5,1(a2) 134c: 0605 addi a2,a2,1 134e: fbfd bnez a5,1344 <printf+0x4c> 1350: 84b2 mv s1,a2 l = z - a; 1352: 40a6043b subw s0,a2,a0 write(f, s, l); 1356: 85aa mv a1,a0 1358: 8622 mv a2,s0 135a: 4505 li a0,1 135c: 0d1000ef jal ra,1c2c <write> if (l) 1360: 18041c63 bnez s0,14f8 <printf+0x200> if (s[1] == 0) 1364: 0014c783 lbu a5,1(s1) 1368: 14078563 beqz a5,14b2 <printf+0x1ba> switch (s[1]) 136c: 1d478063 beq a5,s4,152c <printf+0x234> 1370: 18fa6663 bltu s4,a5,14fc <printf+0x204> 1374: 06400713 li a4,100 1378: 1ae78063 beq a5,a4,1518 <printf+0x220> 137c: 07000713 li a4,112 1380: 1ce79963 bne a5,a4,1552 <printf+0x25a> printptr(va_arg(ap, uint64)); 1384: 6702 ld a4,0(sp) buf[i++] = '0'; 1386: 01511423 sh s5,8(sp) write(f, s, l); 138a: 4649 li a2,18 printptr(va_arg(ap, uint64)); 138c: 631c ld a5,0(a4) 138e: 0721 addi a4,a4,8 1390: e03a sd a4,0(sp) for (j = 0; j < (sizeof(uint64) * 2); j++, x <<= 4) 1392: 00479293 slli t0,a5,0x4 1396: 00879f93 slli t6,a5,0x8 139a: 00c79f13 slli t5,a5,0xc 139e: 01079e93 slli t4,a5,0x10 13a2: 01479e13 slli t3,a5,0x14 13a6: 01879313 slli t1,a5,0x18 13aa: 01c79893 slli a7,a5,0x1c 13ae: 02479813 slli a6,a5,0x24 13b2: 02879513 slli a0,a5,0x28 13b6: 02c79593 slli a1,a5,0x2c 13ba: 03079693 slli a3,a5,0x30 13be: 03479713 slli a4,a5,0x34 buf[i++] = digits[x >> (sizeof(uint64) * 8 - 4)]; 13c2: 03c7d413 srli s0,a5,0x3c 13c6: 01c7d39b srliw t2,a5,0x1c 13ca: 03c2d293 srli t0,t0,0x3c 13ce: 03cfdf93 srli t6,t6,0x3c 13d2: 03cf5f13 srli t5,t5,0x3c 13d6: 03cede93 srli t4,t4,0x3c 13da: 03ce5e13 srli t3,t3,0x3c 13de: 03c35313 srli t1,t1,0x3c 13e2: 03c8d893 srli a7,a7,0x3c 13e6: 03c85813 srli a6,a6,0x3c 13ea: 9171 srli a0,a0,0x3c 13ec: 91f1 srli a1,a1,0x3c 13ee: 92f1 srli a3,a3,0x3c 13f0: 9371 srli a4,a4,0x3c 13f2: 96ce add a3,a3,s3 13f4: 974e add a4,a4,s3 13f6: 944e add s0,s0,s3 13f8: 92ce add t0,t0,s3 13fa: 9fce add t6,t6,s3 13fc: 9f4e add t5,t5,s3 13fe: 9ece add t4,t4,s3 1400: 9e4e add t3,t3,s3 1402: 934e add t1,t1,s3 1404: 98ce add a7,a7,s3 1406: 93ce add t2,t2,s3 1408: 984e add a6,a6,s3 140a: 954e add a0,a0,s3 140c: 95ce add a1,a1,s3 140e: 0006c083 lbu ra,0(a3) 1412: 0002c283 lbu t0,0(t0) 1416: 00074683 lbu a3,0(a4) 141a: 000fcf83 lbu t6,0(t6) 141e: 000f4f03 lbu t5,0(t5) 1422: 000ece83 lbu t4,0(t4) 1426: 000e4e03 lbu t3,0(t3) 142a: 00034303 lbu t1,0(t1) 142e: 0008c883 lbu a7,0(a7) 1432: 0003c383 lbu t2,0(t2) 1436: 00084803 lbu a6,0(a6) 143a: 00054503 lbu a0,0(a0) 143e: 0005c583 lbu a1,0(a1) 1442: 00044403 lbu s0,0(s0) for (j = 0; j < (sizeof(uint64) * 2); j++, x <<= 4) 1446: 03879713 slli a4,a5,0x38 buf[i++] = digits[x >> (sizeof(uint64) * 8 - 4)]; 144a: 9371 srli a4,a4,0x3c 144c: 8bbd andi a5,a5,15 144e: 974e add a4,a4,s3 1450: 97ce add a5,a5,s3 1452: 005105a3 sb t0,11(sp) 1456: 01f10623 sb t6,12(sp) 145a: 01e106a3 sb t5,13(sp) 145e: 01d10723 sb t4,14(sp) 1462: 01c107a3 sb t3,15(sp) 1466: 00610823 sb t1,16(sp) 146a: 011108a3 sb a7,17(sp) 146e: 00710923 sb t2,18(sp) 1472: 010109a3 sb a6,19(sp) 1476: 00a10a23 sb a0,20(sp) 147a: 00b10aa3 sb a1,21(sp) 147e: 00110b23 sb ra,22(sp) 1482: 00d10ba3 sb a3,23(sp) 1486: 00810523 sb s0,10(sp) 148a: 00074703 lbu a4,0(a4) 148e: 0007c783 lbu a5,0(a5) write(f, s, l); 1492: 002c addi a1,sp,8 1494: 4505 li a0,1 buf[i++] = digits[x >> (sizeof(uint64) * 8 - 4)]; 1496: 00e10c23 sb a4,24(sp) 149a: 00f10ca3 sb a5,25(sp) buf[i] = 0; 149e: 00010d23 sb zero,26(sp) write(f, s, l); 14a2: 78a000ef jal ra,1c2c <write> // Print unknown % sequence to draw attention. putchar('%'); putchar(s[1]); break; } s += 2; 14a6: 00248513 addi a0,s1,2 if (!*s) 14aa: 00054783 lbu a5,0(a0) 14ae: e8079ae3 bnez a5,1342 <printf+0x4a> } va_end(ap); } 14b2: 70a6 ld ra,104(sp) 14b4: 7406 ld s0,96(sp) 14b6: 64e6 ld s1,88(sp) 14b8: 6946 ld s2,80(sp) 14ba: 69a6 ld s3,72(sp) 14bc: 6a06 ld s4,64(sp) 14be: 7ae2 ld s5,56(sp) 14c0: 7b42 ld s6,48(sp) 14c2: 614d addi sp,sp,176 14c4: 8082 ret for (z = s; s[0] == '%' && s[1] == '%'; z++, s += 2) 14c6: 00064783 lbu a5,0(a2) 14ca: 84b2 mv s1,a2 14cc: 01278963 beq a5,s2,14de <printf+0x1e6> 14d0: b549 j 1352 <printf+0x5a> 14d2: 0024c783 lbu a5,2(s1) 14d6: 0605 addi a2,a2,1 14d8: 0489 addi s1,s1,2 14da: e7279ce3 bne a5,s2,1352 <printf+0x5a> 14de: 0014c783 lbu a5,1(s1) 14e2: ff2788e3 beq a5,s2,14d2 <printf+0x1da> l = z - a; 14e6: 40a6043b subw s0,a2,a0 write(f, s, l); 14ea: 85aa mv a1,a0 14ec: 8622 mv a2,s0 14ee: 4505 li a0,1 14f0: 73c000ef jal ra,1c2c <write> if (l) 14f4: e60408e3 beqz s0,1364 <printf+0x6c> 14f8: 8526 mv a0,s1 14fa: b581 j 133a <printf+0x42> switch (s[1]) 14fc: 07800713 li a4,120 1500: 04e79963 bne a5,a4,1552 <printf+0x25a> printint(va_arg(ap, int), 16, 1); 1504: 6782 ld a5,0(sp) 1506: 45c1 li a1,16 1508: 4388 lw a0,0(a5) 150a: 07a1 addi a5,a5,8 150c: e03e sd a5,0(sp) 150e: b71ff0ef jal ra,107e <printint.constprop.0> s += 2; 1512: 00248513 addi a0,s1,2 1516: bf51 j 14aa <printf+0x1b2> printint(va_arg(ap, int), 10, 1); 1518: 6782 ld a5,0(sp) 151a: 45a9 li a1,10 151c: 4388 lw a0,0(a5) 151e: 07a1 addi a5,a5,8 1520: e03e sd a5,0(sp) 1522: b5dff0ef jal ra,107e <printint.constprop.0> s += 2; 1526: 00248513 addi a0,s1,2 152a: b741 j 14aa <printf+0x1b2> if ((a = va_arg(ap, char *)) == 0) 152c: 6782 ld a5,0(sp) 152e: 6380 ld s0,0(a5) 1530: 07a1 addi a5,a5,8 1532: e03e sd a5,0(sp) 1534: c031 beqz s0,1578 <printf+0x280> l = strnlen(a, 200); 1536: 0c800593 li a1,200 153a: 8522 mv a0,s0 153c: 3f8000ef jal ra,1934 <strnlen> write(f, s, l); 1540: 0005061b sext.w a2,a0 1544: 85a2 mv a1,s0 1546: 4505 li a0,1 1548: 6e4000ef jal ra,1c2c <write> s += 2; 154c: 00248513 addi a0,s1,2 1550: bfa9 j 14aa <printf+0x1b2> return write(stdout, &byte, 1); 1552: 4605 li a2,1 1554: 002c addi a1,sp,8 1556: 4505 li a0,1 char byte = c; 1558: 01210423 sb s2,8(sp) return write(stdout, &byte, 1); 155c: 6d0000ef jal ra,1c2c <write> char byte = c; 1560: 0014c783 lbu a5,1(s1) return write(stdout, &byte, 1); 1564: 4605 li a2,1 1566: 002c addi a1,sp,8 1568: 4505 li a0,1 char byte = c; 156a: 00f10423 sb a5,8(sp) return write(stdout, &byte, 1); 156e: 6be000ef jal ra,1c2c <write> s += 2; 1572: 00248513 addi a0,s1,2 1576: bf15 j 14aa <printf+0x1b2> a = "(null)"; 1578: 845a mv s0,s6 157a: bf75 j 1536 <printf+0x23e> 000000000000157c <isspace>: #define HIGHS (ONES * (UCHAR_MAX / 2 + 1)) #define HASZERO(x) (((x)-ONES) & ~(x)&HIGHS) int isspace(int c) { return c == ' ' || (unsigned)c - '\t' < 5; 157c: 02000793 li a5,32 1580: 00f50663 beq a0,a5,158c <isspace+0x10> 1584: 355d addiw a0,a0,-9 1586: 00553513 sltiu a0,a0,5 158a: 8082 ret 158c: 4505 li a0,1 } 158e: 8082 ret 0000000000001590 <isdigit>: int isdigit(int c) { return (unsigned)c - '0' < 10; 1590: fd05051b addiw a0,a0,-48 } 1594: 00a53513 sltiu a0,a0,10 1598: 8082 ret 000000000000159a <atoi>: return c == ' ' || (unsigned)c - '\t' < 5; 159a: 02000613 li a2,32 159e: 4591 li a1,4 int atoi(const char *s) { int n = 0, neg = 0; while (isspace(*s)) 15a0: 00054703 lbu a4,0(a0) return c == ' ' || (unsigned)c - '\t' < 5; 15a4: ff77069b addiw a3,a4,-9 15a8: 04c70d63 beq a4,a2,1602 <atoi+0x68> 15ac: 0007079b sext.w a5,a4 15b0: 04d5f963 bgeu a1,a3,1602 <atoi+0x68> s++; switch (*s) 15b4: 02b00693 li a3,43 15b8: 04d70a63 beq a4,a3,160c <atoi+0x72> 15bc: 02d00693 li a3,45 15c0: 06d70463 beq a4,a3,1628 <atoi+0x8e> neg = 1; case '+': s++; } /* Compute n as a negative number to avoid overflow on INT_MIN */ while (isdigit(*s)) 15c4: fd07859b addiw a1,a5,-48 15c8: 4625 li a2,9 15ca: 873e mv a4,a5 15cc: 86aa mv a3,a0 int n = 0, neg = 0; 15ce: 4e01 li t3,0 while (isdigit(*s)) 15d0: 04b66a63 bltu a2,a1,1624 <atoi+0x8a> int n = 0, neg = 0; 15d4: 4501 li a0,0 while (isdigit(*s)) 15d6: 4825 li a6,9 15d8: 0016c603 lbu a2,1(a3) n = 10 * n - (*s++ - '0'); 15dc: 0025179b slliw a5,a0,0x2 15e0: 9d3d addw a0,a0,a5 15e2: fd07031b addiw t1,a4,-48 15e6: 0015189b slliw a7,a0,0x1 while (isdigit(*s)) 15ea: fd06059b addiw a1,a2,-48 n = 10 * n - (*s++ - '0'); 15ee: 0685 addi a3,a3,1 15f0: 4068853b subw a0,a7,t1 while (isdigit(*s)) 15f4: 0006071b sext.w a4,a2 15f8: feb870e3 bgeu a6,a1,15d8 <atoi+0x3e> return neg ? n : -n; 15fc: 000e0563 beqz t3,1606 <atoi+0x6c> } 1600: 8082 ret s++; 1602: 0505 addi a0,a0,1 1604: bf71 j 15a0 <atoi+0x6> return neg ? n : -n; 1606: 4113053b subw a0,t1,a7 160a: 8082 ret while (isdigit(*s)) 160c: 00154783 lbu a5,1(a0) 1610: 4625 li a2,9 s++; 1612: 00150693 addi a3,a0,1 while (isdigit(*s)) 1616: fd07859b addiw a1,a5,-48 161a: 0007871b sext.w a4,a5 int n = 0, neg = 0; 161e: 4e01 li t3,0 while (isdigit(*s)) 1620: fab67ae3 bgeu a2,a1,15d4 <atoi+0x3a> 1624: 4501 li a0,0 } 1626: 8082 ret while (isdigit(*s)) 1628: 00154783 lbu a5,1(a0) 162c: 4625 li a2,9 s++; 162e: 00150693 addi a3,a0,1 while (isdigit(*s)) 1632: fd07859b addiw a1,a5,-48 1636: 0007871b sext.w a4,a5 163a: feb665e3 bltu a2,a1,1624 <atoi+0x8a> neg = 1; 163e: 4e05 li t3,1 1640: bf51 j 15d4 <atoi+0x3a> 0000000000001642 <memset>: void *memset(void *dest, int c, size_t n) { char *p = dest; for (int i = 0; i < n; ++i, *(p++) = c) 1642: 16060d63 beqz a2,17bc <memset+0x17a> 1646: 40a007b3 neg a5,a0 164a: 8b9d andi a5,a5,7 164c: 00778713 addi a4,a5,7 1650: 482d li a6,11 1652: 0ff5f593 zext.b a1,a1 1656: fff60693 addi a3,a2,-1 165a: 17076263 bltu a4,a6,17be <memset+0x17c> 165e: 16e6ea63 bltu a3,a4,17d2 <memset+0x190> 1662: 16078563 beqz a5,17cc <memset+0x18a> 1666: 00b50023 sb a1,0(a0) 166a: 4705 li a4,1 166c: 00150e93 addi t4,a0,1 1670: 14e78c63 beq a5,a4,17c8 <memset+0x186> 1674: 00b500a3 sb a1,1(a0) 1678: 4709 li a4,2 167a: 00250e93 addi t4,a0,2 167e: 14e78d63 beq a5,a4,17d8 <memset+0x196> 1682: 00b50123 sb a1,2(a0) 1686: 470d li a4,3 1688: 00350e93 addi t4,a0,3 168c: 12e78b63 beq a5,a4,17c2 <memset+0x180> 1690: 00b501a3 sb a1,3(a0) 1694: 4711 li a4,4 1696: 00450e93 addi t4,a0,4 169a: 14e78163 beq a5,a4,17dc <memset+0x19a> 169e: 00b50223 sb a1,4(a0) 16a2: 4715 li a4,5 16a4: 00550e93 addi t4,a0,5 16a8: 12e78c63 beq a5,a4,17e0 <memset+0x19e> 16ac: 00b502a3 sb a1,5(a0) 16b0: 471d li a4,7 16b2: 00650e93 addi t4,a0,6 16b6: 12e79763 bne a5,a4,17e4 <memset+0x1a2> 16ba: 00750e93 addi t4,a0,7 16be: 00b50323 sb a1,6(a0) 16c2: 4f1d li t5,7 16c4: 00859713 slli a4,a1,0x8 16c8: 8f4d or a4,a4,a1 16ca: 01059e13 slli t3,a1,0x10 16ce: 01c76e33 or t3,a4,t3 16d2: 01859313 slli t1,a1,0x18 16d6: 006e6333 or t1,t3,t1 16da: 02059893 slli a7,a1,0x20 16de: 011368b3 or a7,t1,a7 16e2: 02859813 slli a6,a1,0x28 16e6: 40f60333 sub t1,a2,a5 16ea: 0108e833 or a6,a7,a6 16ee: 03059693 slli a3,a1,0x30 16f2: 00d866b3 or a3,a6,a3 16f6: 03859713 slli a4,a1,0x38 16fa: 97aa add a5,a5,a0 16fc: ff837813 andi a6,t1,-8 1700: 8f55 or a4,a4,a3 1702: 00f806b3 add a3,a6,a5 1706: e398 sd a4,0(a5) 1708: 07a1 addi a5,a5,8 170a: fed79ee3 bne a5,a3,1706 <memset+0xc4> 170e: ff837693 andi a3,t1,-8 1712: 00de87b3 add a5,t4,a3 1716: 01e6873b addw a4,a3,t5 171a: 0ad30663 beq t1,a3,17c6 <memset+0x184> 171e: 00b78023 sb a1,0(a5) 1722: 0017069b addiw a3,a4,1 1726: 08c6fb63 bgeu a3,a2,17bc <memset+0x17a> 172a: 00b780a3 sb a1,1(a5) 172e: 0027069b addiw a3,a4,2 1732: 08c6f563 bgeu a3,a2,17bc <memset+0x17a> 1736: 00b78123 sb a1,2(a5) 173a: 0037069b addiw a3,a4,3 173e: 06c6ff63 bgeu a3,a2,17bc <memset+0x17a> 1742: 00b781a3 sb a1,3(a5) 1746: 0047069b addiw a3,a4,4 174a: 06c6f963 bgeu a3,a2,17bc <memset+0x17a> 174e: 00b78223 sb a1,4(a5) 1752: 0057069b addiw a3,a4,5 1756: 06c6f363 bgeu a3,a2,17bc <memset+0x17a> 175a: 00b782a3 sb a1,5(a5) 175e: 0067069b addiw a3,a4,6 1762: 04c6fd63 bgeu a3,a2,17bc <memset+0x17a> 1766: 00b78323 sb a1,6(a5) 176a: 0077069b addiw a3,a4,7 176e: 04c6f763 bgeu a3,a2,17bc <memset+0x17a> 1772: 00b783a3 sb a1,7(a5) 1776: 0087069b addiw a3,a4,8 177a: 04c6f163 bgeu a3,a2,17bc <memset+0x17a> 177e: 00b78423 sb a1,8(a5) 1782: 0097069b addiw a3,a4,9 1786: 02c6fb63 bgeu a3,a2,17bc <memset+0x17a> 178a: 00b784a3 sb a1,9(a5) 178e: 00a7069b addiw a3,a4,10 1792: 02c6f563 bgeu a3,a2,17bc <memset+0x17a> 1796: 00b78523 sb a1,10(a5) 179a: 00b7069b addiw a3,a4,11 179e: 00c6ff63 bgeu a3,a2,17bc <memset+0x17a> 17a2: 00b785a3 sb a1,11(a5) 17a6: 00c7069b addiw a3,a4,12 17aa: 00c6f963 bgeu a3,a2,17bc <memset+0x17a> 17ae: 00b78623 sb a1,12(a5) 17b2: 2735 addiw a4,a4,13 17b4: 00c77463 bgeu a4,a2,17bc <memset+0x17a> 17b8: 00b786a3 sb a1,13(a5) ; return dest; } 17bc: 8082 ret 17be: 472d li a4,11 17c0: bd79 j 165e <memset+0x1c> for (int i = 0; i < n; ++i, *(p++) = c) 17c2: 4f0d li t5,3 17c4: b701 j 16c4 <memset+0x82> 17c6: 8082 ret 17c8: 4f05 li t5,1 17ca: bded j 16c4 <memset+0x82> 17cc: 8eaa mv t4,a0 17ce: 4f01 li t5,0 17d0: bdd5 j 16c4 <memset+0x82> 17d2: 87aa mv a5,a0 17d4: 4701 li a4,0 17d6: b7a1 j 171e <memset+0xdc> 17d8: 4f09 li t5,2 17da: b5ed j 16c4 <memset+0x82> 17dc: 4f11 li t5,4 17de: b5dd j 16c4 <memset+0x82> 17e0: 4f15 li t5,5 17e2: b5cd j 16c4 <memset+0x82> 17e4: 4f19 li t5,6 17e6: bdf9 j 16c4 <memset+0x82> 00000000000017e8 <strcmp>: int strcmp(const char *l, const char *r) { for (; *l == *r && *l; l++, r++) 17e8: 00054783 lbu a5,0(a0) 17ec: 0005c703 lbu a4,0(a1) 17f0: 00e79863 bne a5,a4,1800 <strcmp+0x18> 17f4: 0505 addi a0,a0,1 17f6: 0585 addi a1,a1,1 17f8: fbe5 bnez a5,17e8 <strcmp> 17fa: 4501 li a0,0 ; return *(unsigned char *)l - *(unsigned char *)r; } 17fc: 9d19 subw a0,a0,a4 17fe: 8082 ret return *(unsigned char *)l - *(unsigned char *)r; 1800: 0007851b sext.w a0,a5 1804: bfe5 j 17fc <strcmp+0x14> 0000000000001806 <strncmp>: int strncmp(const char *_l, const char *_r, size_t n) { const unsigned char *l = (void *)_l, *r = (void *)_r; if (!n--) 1806: ce05 beqz a2,183e <strncmp+0x38> return 0; for (; *l && *r && n && *l == *r; l++, r++, n--) 1808: 00054703 lbu a4,0(a0) 180c: 0005c783 lbu a5,0(a1) 1810: cb0d beqz a4,1842 <strncmp+0x3c> if (!n--) 1812: 167d addi a2,a2,-1 1814: 00c506b3 add a3,a0,a2 1818: a819 j 182e <strncmp+0x28> for (; *l && *r && n && *l == *r; l++, r++, n--) 181a: 00a68e63 beq a3,a0,1836 <strncmp+0x30> 181e: 0505 addi a0,a0,1 1820: 00e79b63 bne a5,a4,1836 <strncmp+0x30> 1824: 00054703 lbu a4,0(a0) ; return *l - *r; 1828: 0005c783 lbu a5,0(a1) for (; *l && *r && n && *l == *r; l++, r++, n--) 182c: cb19 beqz a4,1842 <strncmp+0x3c> 182e: 0005c783 lbu a5,0(a1) 1832: 0585 addi a1,a1,1 1834: f3fd bnez a5,181a <strncmp+0x14> return *l - *r; 1836: 0007051b sext.w a0,a4 183a: 9d1d subw a0,a0,a5 183c: 8082 ret return 0; 183e: 4501 li a0,0 } 1840: 8082 ret 1842: 4501 li a0,0 return *l - *r; 1844: 9d1d subw a0,a0,a5 1846: 8082 ret 0000000000001848 <strlen>: size_t strlen(const char *s) { const char *a = s; typedef size_t __attribute__((__may_alias__)) word; const word *w; for (; (uintptr_t)s % SS; s++) 1848: 00757793 andi a5,a0,7 184c: cf89 beqz a5,1866 <strlen+0x1e> 184e: 87aa mv a5,a0 1850: a029 j 185a <strlen+0x12> 1852: 0785 addi a5,a5,1 1854: 0077f713 andi a4,a5,7 1858: cb01 beqz a4,1868 <strlen+0x20> if (!*s) 185a: 0007c703 lbu a4,0(a5) 185e: fb75 bnez a4,1852 <strlen+0xa> for (w = (const void *)s; !HASZERO(*w); w++) ; s = (const void *)w; for (; *s; s++) ; return s - a; 1860: 40a78533 sub a0,a5,a0 } 1864: 8082 ret for (; (uintptr_t)s % SS; s++) 1866: 87aa mv a5,a0 for (w = (const void *)s; !HASZERO(*w); w++) 1868: 6394 ld a3,0(a5) 186a: 00000597 auipc a1,0x0 186e: 67e5b583 ld a1,1662(a1) # 1ee8 <__clone+0x84> 1872: 00000617 auipc a2,0x0 1876: 67e63603 ld a2,1662(a2) # 1ef0 <__clone+0x8c> 187a: a019 j 1880 <strlen+0x38> 187c: 6794 ld a3,8(a5) 187e: 07a1 addi a5,a5,8 1880: 00b68733 add a4,a3,a1 1884: fff6c693 not a3,a3 1888: 8f75 and a4,a4,a3 188a: 8f71 and a4,a4,a2 188c: db65 beqz a4,187c <strlen+0x34> for (; *s; s++) 188e: 0007c703 lbu a4,0(a5) 1892: d779 beqz a4,1860 <strlen+0x18> 1894: 0017c703 lbu a4,1(a5) 1898: 0785 addi a5,a5,1 189a: d379 beqz a4,1860 <strlen+0x18> 189c: 0017c703 lbu a4,1(a5) 18a0: 0785 addi a5,a5,1 18a2: fb6d bnez a4,1894 <strlen+0x4c> 18a4: bf75 j 1860 <strlen+0x18> 00000000000018a6 <memchr>: void *memchr(const void *src, int c, size_t n) { const unsigned char *s = src; c = (unsigned char)c; for (; ((uintptr_t)s & ALIGN) && n && *s != c; s++, n--) 18a6: 00757713 andi a4,a0,7 { 18aa: 87aa mv a5,a0 c = (unsigned char)c; 18ac: 0ff5f593 zext.b a1,a1 for (; ((uintptr_t)s & ALIGN) && n && *s != c; s++, n--) 18b0: cb19 beqz a4,18c6 <memchr+0x20> 18b2: ce25 beqz a2,192a <memchr+0x84> 18b4: 0007c703 lbu a4,0(a5) 18b8: 04b70e63 beq a4,a1,1914 <memchr+0x6e> 18bc: 0785 addi a5,a5,1 18be: 0077f713 andi a4,a5,7 18c2: 167d addi a2,a2,-1 18c4: f77d bnez a4,18b2 <memchr+0xc> ; s = (const void *)w; } for (; n && *s != c; s++, n--) ; return n ? (void *)s : 0; 18c6: 4501 li a0,0 if (n && *s != c) 18c8: c235 beqz a2,192c <memchr+0x86> 18ca: 0007c703 lbu a4,0(a5) 18ce: 04b70363 beq a4,a1,1914 <memchr+0x6e> size_t k = ONES * c; 18d2: 00000517 auipc a0,0x0 18d6: 62653503 ld a0,1574(a0) # 1ef8 <__clone+0x94> for (w = (const void *)s; n >= SS && !HASZERO(*w ^ k); w++, n -= SS) 18da: 471d li a4,7 size_t k = ONES * c; 18dc: 02a58533 mul a0,a1,a0 for (w = (const void *)s; n >= SS && !HASZERO(*w ^ k); w++, n -= SS) 18e0: 02c77a63 bgeu a4,a2,1914 <memchr+0x6e> 18e4: 00000897 auipc a7,0x0 18e8: 6048b883 ld a7,1540(a7) # 1ee8 <__clone+0x84> 18ec: 00000817 auipc a6,0x0 18f0: 60483803 ld a6,1540(a6) # 1ef0 <__clone+0x8c> 18f4: 431d li t1,7 18f6: a029 j 1900 <memchr+0x5a> 18f8: 1661 addi a2,a2,-8 18fa: 07a1 addi a5,a5,8 18fc: 02c37963 bgeu t1,a2,192e <memchr+0x88> 1900: 6398 ld a4,0(a5) 1902: 8f29 xor a4,a4,a0 1904: 011706b3 add a3,a4,a7 1908: fff74713 not a4,a4 190c: 8f75 and a4,a4,a3 190e: 01077733 and a4,a4,a6 1912: d37d beqz a4,18f8 <memchr+0x52> 1914: 853e mv a0,a5 1916: 97b2 add a5,a5,a2 1918: a021 j 1920 <memchr+0x7a> for (; n && *s != c; s++, n--) 191a: 0505 addi a0,a0,1 191c: 00f50763 beq a0,a5,192a <memchr+0x84> 1920: 00054703 lbu a4,0(a0) 1924: feb71be3 bne a4,a1,191a <memchr+0x74> 1928: 8082 ret return n ? (void *)s : 0; 192a: 4501 li a0,0 } 192c: 8082 ret return n ? (void *)s : 0; 192e: 4501 li a0,0 for (; n && *s != c; s++, n--) 1930: f275 bnez a2,1914 <memchr+0x6e> } 1932: 8082 ret 0000000000001934 <strnlen>: size_t strnlen(const char *s, size_t n) { 1934: 1101 addi sp,sp,-32 1936: e822 sd s0,16(sp) const char *p = memchr(s, 0, n); 1938: 862e mv a2,a1 { 193a: 842e mv s0,a1 const char *p = memchr(s, 0, n); 193c: 4581 li a1,0 { 193e: e426 sd s1,8(sp) 1940: ec06 sd ra,24(sp) 1942: 84aa mv s1,a0 const char *p = memchr(s, 0, n); 1944: f63ff0ef jal ra,18a6 <memchr> return p ? p - s : n; 1948: c519 beqz a0,1956 <strnlen+0x22> } 194a: 60e2 ld ra,24(sp) 194c: 6442 ld s0,16(sp) return p ? p - s : n; 194e: 8d05 sub a0,a0,s1 } 1950: 64a2 ld s1,8(sp) 1952: 6105 addi sp,sp,32 1954: 8082 ret 1956: 60e2 ld ra,24(sp) return p ? p - s : n; 1958: 8522 mv a0,s0 } 195a: 6442 ld s0,16(sp) 195c: 64a2 ld s1,8(sp) 195e: 6105 addi sp,sp,32 1960: 8082 ret 0000000000001962 <strcpy>: char *strcpy(char *restrict d, const char *s) { typedef size_t __attribute__((__may_alias__)) word; word *wd; const word *ws; if ((uintptr_t)s % SS == (uintptr_t)d % SS) 1962: 00b547b3 xor a5,a0,a1 1966: 8b9d andi a5,a5,7 1968: eb95 bnez a5,199c <strcpy+0x3a> { for (; (uintptr_t)s % SS; s++, d++) 196a: 0075f793 andi a5,a1,7 196e: e7b1 bnez a5,19ba <strcpy+0x58> if (!(*d = *s)) return d; wd = (void *)d; ws = (const void *)s; for (; !HASZERO(*ws); *wd++ = *ws++) 1970: 6198 ld a4,0(a1) 1972: 00000617 auipc a2,0x0 1976: 57663603 ld a2,1398(a2) # 1ee8 <__clone+0x84> 197a: 00000817 auipc a6,0x0 197e: 57683803 ld a6,1398(a6) # 1ef0 <__clone+0x8c> 1982: a029 j 198c <strcpy+0x2a> 1984: e118 sd a4,0(a0) 1986: 6598 ld a4,8(a1) 1988: 05a1 addi a1,a1,8 198a: 0521 addi a0,a0,8 198c: 00c707b3 add a5,a4,a2 1990: fff74693 not a3,a4 1994: 8ff5 and a5,a5,a3 1996: 0107f7b3 and a5,a5,a6 199a: d7ed beqz a5,1984 <strcpy+0x22> ; d = (void *)wd; s = (const void *)ws; } for (; (*d = *s); s++, d++) 199c: 0005c783 lbu a5,0(a1) 19a0: 00f50023 sb a5,0(a0) 19a4: c785 beqz a5,19cc <strcpy+0x6a> 19a6: 0015c783 lbu a5,1(a1) 19aa: 0505 addi a0,a0,1 19ac: 0585 addi a1,a1,1 19ae: 00f50023 sb a5,0(a0) 19b2: fbf5 bnez a5,19a6 <strcpy+0x44> ; return d; } 19b4: 8082 ret for (; (uintptr_t)s % SS; s++, d++) 19b6: 0505 addi a0,a0,1 19b8: df45 beqz a4,1970 <strcpy+0xe> if (!(*d = *s)) 19ba: 0005c783 lbu a5,0(a1) for (; (uintptr_t)s % SS; s++, d++) 19be: 0585 addi a1,a1,1 19c0: 0075f713 andi a4,a1,7 if (!(*d = *s)) 19c4: 00f50023 sb a5,0(a0) 19c8: f7fd bnez a5,19b6 <strcpy+0x54> } 19ca: 8082 ret 19cc: 8082 ret 00000000000019ce <strncpy>: char *strncpy(char *restrict d, const char *s, size_t n) { typedef size_t __attribute__((__may_alias__)) word; word *wd; const word *ws; if (((uintptr_t)s & ALIGN) == ((uintptr_t)d & ALIGN)) 19ce: 00b547b3 xor a5,a0,a1 19d2: 8b9d andi a5,a5,7 19d4: 1a079863 bnez a5,1b84 <strncpy+0x1b6> { for (; ((uintptr_t)s & ALIGN) && n && (*d = *s); n--, s++, d++) 19d8: 0075f793 andi a5,a1,7 19dc: 16078463 beqz a5,1b44 <strncpy+0x176> 19e0: ea01 bnez a2,19f0 <strncpy+0x22> 19e2: a421 j 1bea <strncpy+0x21c> 19e4: 167d addi a2,a2,-1 19e6: 0505 addi a0,a0,1 19e8: 14070e63 beqz a4,1b44 <strncpy+0x176> 19ec: 1a060863 beqz a2,1b9c <strncpy+0x1ce> 19f0: 0005c783 lbu a5,0(a1) 19f4: 0585 addi a1,a1,1 19f6: 0075f713 andi a4,a1,7 19fa: 00f50023 sb a5,0(a0) 19fe: f3fd bnez a5,19e4 <strncpy+0x16> 1a00: 4805 li a6,1 1a02: 1a061863 bnez a2,1bb2 <strncpy+0x1e4> 1a06: 40a007b3 neg a5,a0 1a0a: 8b9d andi a5,a5,7 1a0c: 4681 li a3,0 1a0e: 18061a63 bnez a2,1ba2 <strncpy+0x1d4> 1a12: 00778713 addi a4,a5,7 1a16: 45ad li a1,11 1a18: 18b76363 bltu a4,a1,1b9e <strncpy+0x1d0> 1a1c: 1ae6eb63 bltu a3,a4,1bd2 <strncpy+0x204> 1a20: 1a078363 beqz a5,1bc6 <strncpy+0x1f8> for (int i = 0; i < n; ++i, *(p++) = c) 1a24: 00050023 sb zero,0(a0) 1a28: 4685 li a3,1 1a2a: 00150713 addi a4,a0,1 1a2e: 18d78f63 beq a5,a3,1bcc <strncpy+0x1fe> 1a32: 000500a3 sb zero,1(a0) 1a36: 4689 li a3,2 1a38: 00250713 addi a4,a0,2 1a3c: 18d78e63 beq a5,a3,1bd8 <strncpy+0x20a> 1a40: 00050123 sb zero,2(a0) 1a44: 468d li a3,3 1a46: 00350713 addi a4,a0,3 1a4a: 16d78c63 beq a5,a3,1bc2 <strncpy+0x1f4> 1a4e: 000501a3 sb zero,3(a0) 1a52: 4691 li a3,4 1a54: 00450713 addi a4,a0,4 1a58: 18d78263 beq a5,a3,1bdc <strncpy+0x20e> 1a5c: 00050223 sb zero,4(a0) 1a60: 4695 li a3,5 1a62: 00550713 addi a4,a0,5 1a66: 16d78d63 beq a5,a3,1be0 <strncpy+0x212> 1a6a: 000502a3 sb zero,5(a0) 1a6e: 469d li a3,7 1a70: 00650713 addi a4,a0,6 1a74: 16d79863 bne a5,a3,1be4 <strncpy+0x216> 1a78: 00750713 addi a4,a0,7 1a7c: 00050323 sb zero,6(a0) 1a80: 40f80833 sub a6,a6,a5 1a84: ff887593 andi a1,a6,-8 1a88: 97aa add a5,a5,a0 1a8a: 95be add a1,a1,a5 1a8c: 0007b023 sd zero,0(a5) 1a90: 07a1 addi a5,a5,8 1a92: feb79de3 bne a5,a1,1a8c <strncpy+0xbe> 1a96: ff887593 andi a1,a6,-8 1a9a: 9ead addw a3,a3,a1 1a9c: 00b707b3 add a5,a4,a1 1aa0: 12b80863 beq a6,a1,1bd0 <strncpy+0x202> 1aa4: 00078023 sb zero,0(a5) 1aa8: 0016871b addiw a4,a3,1 1aac: 0ec77863 bgeu a4,a2,1b9c <strncpy+0x1ce> 1ab0: 000780a3 sb zero,1(a5) 1ab4: 0026871b addiw a4,a3,2 1ab8: 0ec77263 bgeu a4,a2,1b9c <strncpy+0x1ce> 1abc: 00078123 sb zero,2(a5) 1ac0: 0036871b addiw a4,a3,3 1ac4: 0cc77c63 bgeu a4,a2,1b9c <strncpy+0x1ce> 1ac8: 000781a3 sb zero,3(a5) 1acc: 0046871b addiw a4,a3,4 1ad0: 0cc77663 bgeu a4,a2,1b9c <strncpy+0x1ce> 1ad4: 00078223 sb zero,4(a5) 1ad8: 0056871b addiw a4,a3,5 1adc: 0cc77063 bgeu a4,a2,1b9c <strncpy+0x1ce> 1ae0: 000782a3 sb zero,5(a5) 1ae4: 0066871b addiw a4,a3,6 1ae8: 0ac77a63 bgeu a4,a2,1b9c <strncpy+0x1ce> 1aec: 00078323 sb zero,6(a5) 1af0: 0076871b addiw a4,a3,7 1af4: 0ac77463 bgeu a4,a2,1b9c <strncpy+0x1ce> 1af8: 000783a3 sb zero,7(a5) 1afc: 0086871b addiw a4,a3,8 1b00: 08c77e63 bgeu a4,a2,1b9c <strncpy+0x1ce> 1b04: 00078423 sb zero,8(a5) 1b08: 0096871b addiw a4,a3,9 1b0c: 08c77863 bgeu a4,a2,1b9c <strncpy+0x1ce> 1b10: 000784a3 sb zero,9(a5) 1b14: 00a6871b addiw a4,a3,10 1b18: 08c77263 bgeu a4,a2,1b9c <strncpy+0x1ce> 1b1c: 00078523 sb zero,10(a5) 1b20: 00b6871b addiw a4,a3,11 1b24: 06c77c63 bgeu a4,a2,1b9c <strncpy+0x1ce> 1b28: 000785a3 sb zero,11(a5) 1b2c: 00c6871b addiw a4,a3,12 1b30: 06c77663 bgeu a4,a2,1b9c <strncpy+0x1ce> 1b34: 00078623 sb zero,12(a5) 1b38: 26b5 addiw a3,a3,13 1b3a: 06c6f163 bgeu a3,a2,1b9c <strncpy+0x1ce> 1b3e: 000786a3 sb zero,13(a5) 1b42: 8082 ret ; if (!n || !*s) 1b44: c645 beqz a2,1bec <strncpy+0x21e> 1b46: 0005c783 lbu a5,0(a1) 1b4a: ea078be3 beqz a5,1a00 <strncpy+0x32> goto tail; wd = (void *)d; ws = (const void *)s; for (; n >= sizeof(size_t) && !HASZERO(*ws); n -= sizeof(size_t), ws++, wd++) 1b4e: 479d li a5,7 1b50: 02c7ff63 bgeu a5,a2,1b8e <strncpy+0x1c0> 1b54: 00000897 auipc a7,0x0 1b58: 3948b883 ld a7,916(a7) # 1ee8 <__clone+0x84> 1b5c: 00000817 auipc a6,0x0 1b60: 39483803 ld a6,916(a6) # 1ef0 <__clone+0x8c> 1b64: 431d li t1,7 1b66: 6198 ld a4,0(a1) 1b68: 011707b3 add a5,a4,a7 1b6c: fff74693 not a3,a4 1b70: 8ff5 and a5,a5,a3 1b72: 0107f7b3 and a5,a5,a6 1b76: ef81 bnez a5,1b8e <strncpy+0x1c0> *wd = *ws; 1b78: e118 sd a4,0(a0) for (; n >= sizeof(size_t) && !HASZERO(*ws); n -= sizeof(size_t), ws++, wd++) 1b7a: 1661 addi a2,a2,-8 1b7c: 05a1 addi a1,a1,8 1b7e: 0521 addi a0,a0,8 1b80: fec363e3 bltu t1,a2,1b66 <strncpy+0x198> d = (void *)wd; s = (const void *)ws; } for (; n && (*d = *s); n--, s++, d++) 1b84: e609 bnez a2,1b8e <strncpy+0x1c0> 1b86: a08d j 1be8 <strncpy+0x21a> 1b88: 167d addi a2,a2,-1 1b8a: 0505 addi a0,a0,1 1b8c: ca01 beqz a2,1b9c <strncpy+0x1ce> 1b8e: 0005c783 lbu a5,0(a1) 1b92: 0585 addi a1,a1,1 1b94: 00f50023 sb a5,0(a0) 1b98: fbe5 bnez a5,1b88 <strncpy+0x1ba> ; tail: 1b9a: b59d j 1a00 <strncpy+0x32> memset(d, 0, n); return d; } 1b9c: 8082 ret 1b9e: 472d li a4,11 1ba0: bdb5 j 1a1c <strncpy+0x4e> 1ba2: 00778713 addi a4,a5,7 1ba6: 45ad li a1,11 1ba8: fff60693 addi a3,a2,-1 1bac: e6b778e3 bgeu a4,a1,1a1c <strncpy+0x4e> 1bb0: b7fd j 1b9e <strncpy+0x1d0> 1bb2: 40a007b3 neg a5,a0 1bb6: 8832 mv a6,a2 1bb8: 8b9d andi a5,a5,7 1bba: 4681 li a3,0 1bbc: e4060be3 beqz a2,1a12 <strncpy+0x44> 1bc0: b7cd j 1ba2 <strncpy+0x1d4> for (int i = 0; i < n; ++i, *(p++) = c) 1bc2: 468d li a3,3 1bc4: bd75 j 1a80 <strncpy+0xb2> 1bc6: 872a mv a4,a0 1bc8: 4681 li a3,0 1bca: bd5d j 1a80 <strncpy+0xb2> 1bcc: 4685 li a3,1 1bce: bd4d j 1a80 <strncpy+0xb2> 1bd0: 8082 ret 1bd2: 87aa mv a5,a0 1bd4: 4681 li a3,0 1bd6: b5f9 j 1aa4 <strncpy+0xd6> 1bd8: 4689 li a3,2 1bda: b55d j 1a80 <strncpy+0xb2> 1bdc: 4691 li a3,4 1bde: b54d j 1a80 <strncpy+0xb2> 1be0: 4695 li a3,5 1be2: bd79 j 1a80 <strncpy+0xb2> 1be4: 4699 li a3,6 1be6: bd69 j 1a80 <strncpy+0xb2> 1be8: 8082 ret 1bea: 8082 ret 1bec: 8082 ret 0000000000001bee <open>: #include <unistd.h> #include "syscall.h" int open(const char *path, int flags) { 1bee: 87aa mv a5,a0 1bf0: 862e mv a2,a1 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2)) } static inline long __syscall4(long n, long a, long b, long c, long d) { register long a7 __asm__("a7") = n; 1bf2: 03800893 li a7,56 register long a0 __asm__("a0") = a; 1bf6: f9c00513 li a0,-100 register long a1 __asm__("a1") = b; 1bfa: 85be mv a1,a5 register long a2 __asm__("a2") = c; register long a3 __asm__("a3") = d; 1bfc: 4689 li a3,2 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2), "r"(a3)) 1bfe: 00000073 ecall return syscall(SYS_openat, AT_FDCWD, path, flags, O_RDWR); } 1c02: 2501 sext.w a0,a0 1c04: 8082 ret 0000000000001c06 <openat>: register long a7 __asm__("a7") = n; 1c06: 03800893 li a7,56 register long a3 __asm__("a3") = d; 1c0a: 18000693 li a3,384 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2), "r"(a3)) 1c0e: 00000073 ecall int openat(int dirfd,const char *path, int flags) { return syscall(SYS_openat, dirfd, path, flags, 0600); } 1c12: 2501 sext.w a0,a0 1c14: 8082 ret 0000000000001c16 <close>: register long a7 __asm__("a7") = n; 1c16: 03900893 li a7,57 __asm_syscall("r"(a7), "0"(a0)) 1c1a: 00000073 ecall int close(int fd) { return syscall(SYS_close, fd); } 1c1e: 2501 sext.w a0,a0 1c20: 8082 ret 0000000000001c22 <read>: register long a7 __asm__("a7") = n; 1c22: 03f00893 li a7,63 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2)) 1c26: 00000073 ecall ssize_t read(int fd, void *buf, size_t len) { return syscall(SYS_read, fd, buf, len); } 1c2a: 8082 ret 0000000000001c2c <write>: register long a7 __asm__("a7") = n; 1c2c: 04000893 li a7,64 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2)) 1c30: 00000073 ecall ssize_t write(int fd, const void *buf, size_t len) { return syscall(SYS_write, fd, buf, len); } 1c34: 8082 ret 0000000000001c36 <getpid>: register long a7 __asm__("a7") = n; 1c36: 0ac00893 li a7,172 __asm_syscall("r"(a7)) 1c3a: 00000073 ecall pid_t getpid(void) { return syscall(SYS_getpid); } 1c3e: 2501 sext.w a0,a0 1c40: 8082 ret 0000000000001c42 <getppid>: register long a7 __asm__("a7") = n; 1c42: 0ad00893 li a7,173 __asm_syscall("r"(a7)) 1c46: 00000073 ecall pid_t getppid(void) { return syscall(SYS_getppid); } 1c4a: 2501 sext.w a0,a0 1c4c: 8082 ret 0000000000001c4e <sched_yield>: register long a7 __asm__("a7") = n; 1c4e: 07c00893 li a7,124 __asm_syscall("r"(a7)) 1c52: 00000073 ecall int sched_yield(void) { return syscall(SYS_sched_yield); } 1c56: 2501 sext.w a0,a0 1c58: 8082 ret 0000000000001c5a <fork>: register long a7 __asm__("a7") = n; 1c5a: 0dc00893 li a7,220 register long a0 __asm__("a0") = a; 1c5e: 4545 li a0,17 register long a1 __asm__("a1") = b; 1c60: 4581 li a1,0 __asm_syscall("r"(a7), "0"(a0), "r"(a1)) 1c62: 00000073 ecall pid_t fork(void) { return syscall(SYS_clone, SIGCHLD, 0); } 1c66: 2501 sext.w a0,a0 1c68: 8082 ret 0000000000001c6a <clone>: pid_t clone(int (*fn)(void *arg), void *arg, void *stack, size_t stack_size, unsigned long flags) { 1c6a: 85b2 mv a1,a2 1c6c: 863a mv a2,a4 if (stack) 1c6e: c191 beqz a1,1c72 <clone+0x8> stack += stack_size; 1c70: 95b6 add a1,a1,a3 return __clone(fn, stack, flags, NULL, NULL, NULL); 1c72: 4781 li a5,0 1c74: 4701 li a4,0 1c76: 4681 li a3,0 1c78: 2601 sext.w a2,a2 1c7a: a2ed j 1e64 <__clone> 0000000000001c7c <exit>: register long a7 __asm__("a7") = n; 1c7c: 05d00893 li a7,93 __asm_syscall("r"(a7), "0"(a0)) 1c80: 00000073 ecall //return syscall(SYS_clone, fn, stack, flags, NULL, NULL, NULL); } void exit(int code) { syscall(SYS_exit, code); } 1c84: 8082 ret 0000000000001c86 <waitpid>: register long a7 __asm__("a7") = n; 1c86: 10400893 li a7,260 register long a3 __asm__("a3") = d; 1c8a: 4681 li a3,0 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2), "r"(a3)) 1c8c: 00000073 ecall int waitpid(int pid, int *code, int options) { return syscall(SYS_wait4, pid, code, options, 0); } 1c90: 2501 sext.w a0,a0 1c92: 8082 ret 0000000000001c94 <exec>: register long a7 __asm__("a7") = n; 1c94: 0dd00893 li a7,221 __asm_syscall("r"(a7), "0"(a0)) 1c98: 00000073 ecall int exec(char *name) { return syscall(SYS_execve, name); } 1c9c: 2501 sext.w a0,a0 1c9e: 8082 ret 0000000000001ca0 <execve>: register long a7 __asm__("a7") = n; 1ca0: 0dd00893 li a7,221 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2)) 1ca4: 00000073 ecall int execve(const char *name, char *const argv[], char *const argp[]) { return syscall(SYS_execve, name, argv, argp); } 1ca8: 2501 sext.w a0,a0 1caa: 8082 ret 0000000000001cac <times>: register long a7 __asm__("a7") = n; 1cac: 09900893 li a7,153 __asm_syscall("r"(a7), "0"(a0)) 1cb0: 00000073 ecall int times(void *mytimes) { return syscall(SYS_times, mytimes); } 1cb4: 2501 sext.w a0,a0 1cb6: 8082 ret 0000000000001cb8 <get_time>: int64 get_time() { 1cb8: 1141 addi sp,sp,-16 register long a7 __asm__("a7") = n; 1cba: 0a900893 li a7,169 register long a0 __asm__("a0") = a; 1cbe: 850a mv a0,sp register long a1 __asm__("a1") = b; 1cc0: 4581 li a1,0 __asm_syscall("r"(a7), "0"(a0), "r"(a1)) 1cc2: 00000073 ecall TimeVal time; int err = sys_get_time(&time, 0); if (err == 0) 1cc6: 2501 sext.w a0,a0 1cc8: ed09 bnez a0,1ce2 <get_time+0x2a> { return ((time.sec & 0xffff) * 1000 + time.usec / 1000); 1cca: 67a2 ld a5,8(sp) 1ccc: 3e800713 li a4,1000 1cd0: 00015503 lhu a0,0(sp) 1cd4: 02e7d7b3 divu a5,a5,a4 1cd8: 02e50533 mul a0,a0,a4 1cdc: 953e add a0,a0,a5 } else { return -1; } } 1cde: 0141 addi sp,sp,16 1ce0: 8082 ret return -1; 1ce2: 557d li a0,-1 1ce4: bfed j 1cde <get_time+0x26> 0000000000001ce6 <sys_get_time>: register long a7 __asm__("a7") = n; 1ce6: 0a900893 li a7,169 __asm_syscall("r"(a7), "0"(a0), "r"(a1)) 1cea: 00000073 ecall int sys_get_time(TimeVal *ts, int tz) { return syscall(SYS_gettimeofday, ts, tz); } 1cee: 2501 sext.w a0,a0 1cf0: 8082 ret 0000000000001cf2 <time>: register long a7 __asm__("a7") = n; 1cf2: 42600893 li a7,1062 __asm_syscall("r"(a7), "0"(a0)) 1cf6: 00000073 ecall int time(unsigned long *tloc) { return syscall(SYS_time, tloc); } 1cfa: 2501 sext.w a0,a0 1cfc: 8082 ret 0000000000001cfe <sleep>: int sleep(unsigned long long time) { 1cfe: 1141 addi sp,sp,-16 TimeVal tv = {.sec = time, .usec = 0}; 1d00: e02a sd a0,0(sp) register long a0 __asm__("a0") = a; 1d02: 850a mv a0,sp 1d04: e402 sd zero,8(sp) register long a7 __asm__("a7") = n; 1d06: 06500893 li a7,101 register long a1 __asm__("a1") = b; 1d0a: 85aa mv a1,a0 __asm_syscall("r"(a7), "0"(a0), "r"(a1)) 1d0c: 00000073 ecall if (syscall(SYS_nanosleep, &tv, &tv)) return tv.sec; 1d10: e501 bnez a0,1d18 <sleep+0x1a> return 0; 1d12: 4501 li a0,0 } 1d14: 0141 addi sp,sp,16 1d16: 8082 ret if (syscall(SYS_nanosleep, &tv, &tv)) return tv.sec; 1d18: 4502 lw a0,0(sp) } 1d1a: 0141 addi sp,sp,16 1d1c: 8082 ret 0000000000001d1e <set_priority>: register long a7 __asm__("a7") = n; 1d1e: 08c00893 li a7,140 __asm_syscall("r"(a7), "0"(a0)) 1d22: 00000073 ecall int set_priority(int prio) { return syscall(SYS_setpriority, prio); } 1d26: 2501 sext.w a0,a0 1d28: 8082 ret 0000000000001d2a <mmap>: __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2), "r"(a3), "r"(a4)) } static inline long __syscall6(long n, long a, long b, long c, long d, long e, long f) { register long a7 __asm__("a7") = n; 1d2a: 0de00893 li a7,222 register long a1 __asm__("a1") = b; register long a2 __asm__("a2") = c; register long a3 __asm__("a3") = d; register long a4 __asm__("a4") = e; register long a5 __asm__("a5") = f; __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2), "r"(a3), "r"(a4), "r"(a5)) 1d2e: 00000073 ecall void *mmap(void *start, size_t len, int prot, int flags, int fd, off_t off) { return syscall(SYS_mmap, start, len, prot, flags, fd, off); } 1d32: 8082 ret 0000000000001d34 <munmap>: register long a7 __asm__("a7") = n; 1d34: 0d700893 li a7,215 __asm_syscall("r"(a7), "0"(a0), "r"(a1)) 1d38: 00000073 ecall int munmap(void *start, size_t len) { return syscall(SYS_munmap, start, len); } 1d3c: 2501 sext.w a0,a0 1d3e: 8082 ret 0000000000001d40 <wait>: int wait(int *code) { 1d40: 85aa mv a1,a0 register long a7 __asm__("a7") = n; 1d42: 10400893 li a7,260 register long a0 __asm__("a0") = a; 1d46: 557d li a0,-1 register long a2 __asm__("a2") = c; 1d48: 4601 li a2,0 register long a3 __asm__("a3") = d; 1d4a: 4681 li a3,0 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2), "r"(a3)) 1d4c: 00000073 ecall return waitpid((int)-1, code, 0); } 1d50: 2501 sext.w a0,a0 1d52: 8082 ret 0000000000001d54 <spawn>: register long a7 __asm__("a7") = n; 1d54: 19000893 li a7,400 __asm_syscall("r"(a7), "0"(a0)) 1d58: 00000073 ecall int spawn(char *file) { return syscall(SYS_spawn, file); } 1d5c: 2501 sext.w a0,a0 1d5e: 8082 ret 0000000000001d60 <mailread>: register long a7 __asm__("a7") = n; 1d60: 19100893 li a7,401 __asm_syscall("r"(a7), "0"(a0), "r"(a1)) 1d64: 00000073 ecall int mailread(void *buf, int len) { return syscall(SYS_mailread, buf, len); } 1d68: 2501 sext.w a0,a0 1d6a: 8082 ret 0000000000001d6c <mailwrite>: register long a7 __asm__("a7") = n; 1d6c: 19200893 li a7,402 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2)) 1d70: 00000073 ecall int mailwrite(int pid, void *buf, int len) { return syscall(SYS_mailwrite, pid, buf, len); } 1d74: 2501 sext.w a0,a0 1d76: 8082 ret 0000000000001d78 <fstat>: register long a7 __asm__("a7") = n; 1d78: 05000893 li a7,80 __asm_syscall("r"(a7), "0"(a0), "r"(a1)) 1d7c: 00000073 ecall int fstat(int fd, struct kstat *st) { return syscall(SYS_fstat, fd, st); } 1d80: 2501 sext.w a0,a0 1d82: 8082 ret 0000000000001d84 <sys_linkat>: register long a4 __asm__("a4") = e; 1d84: 1702 slli a4,a4,0x20 register long a7 __asm__("a7") = n; 1d86: 02500893 li a7,37 register long a4 __asm__("a4") = e; 1d8a: 9301 srli a4,a4,0x20 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2), "r"(a3), "r"(a4)) 1d8c: 00000073 ecall int sys_linkat(int olddirfd, char *oldpath, int newdirfd, char *newpath, unsigned int flags) { return syscall(SYS_linkat, olddirfd, oldpath, newdirfd, newpath, flags); } 1d90: 2501 sext.w a0,a0 1d92: 8082 ret 0000000000001d94 <sys_unlinkat>: register long a2 __asm__("a2") = c; 1d94: 1602 slli a2,a2,0x20 register long a7 __asm__("a7") = n; 1d96: 02300893 li a7,35 register long a2 __asm__("a2") = c; 1d9a: 9201 srli a2,a2,0x20 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2)) 1d9c: 00000073 ecall int sys_unlinkat(int dirfd, char *path, unsigned int flags) { return syscall(SYS_unlinkat, dirfd, path, flags); } 1da0: 2501 sext.w a0,a0 1da2: 8082 ret 0000000000001da4 <link>: int link(char *old_path, char *new_path) { 1da4: 87aa mv a5,a0 1da6: 86ae mv a3,a1 register long a7 __asm__("a7") = n; 1da8: 02500893 li a7,37 register long a0 __asm__("a0") = a; 1dac: f9c00513 li a0,-100 register long a1 __asm__("a1") = b; 1db0: 85be mv a1,a5 register long a2 __asm__("a2") = c; 1db2: f9c00613 li a2,-100 register long a4 __asm__("a4") = e; 1db6: 4701 li a4,0 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2), "r"(a3), "r"(a4)) 1db8: 00000073 ecall return sys_linkat(AT_FDCWD, old_path, AT_FDCWD, new_path, 0); } 1dbc: 2501 sext.w a0,a0 1dbe: 8082 ret 0000000000001dc0 <unlink>: int unlink(char *path) { 1dc0: 85aa mv a1,a0 register long a7 __asm__("a7") = n; 1dc2: 02300893 li a7,35 register long a0 __asm__("a0") = a; 1dc6: f9c00513 li a0,-100 register long a2 __asm__("a2") = c; 1dca: 4601 li a2,0 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2)) 1dcc: 00000073 ecall return sys_unlinkat(AT_FDCWD, path, 0); } 1dd0: 2501 sext.w a0,a0 1dd2: 8082 ret 0000000000001dd4 <uname>: register long a7 __asm__("a7") = n; 1dd4: 0a000893 li a7,160 __asm_syscall("r"(a7), "0"(a0)) 1dd8: 00000073 ecall int uname(void *buf) { return syscall(SYS_uname, buf); } 1ddc: 2501 sext.w a0,a0 1dde: 8082 ret 0000000000001de0 <brk>: register long a7 __asm__("a7") = n; 1de0: 0d600893 li a7,214 __asm_syscall("r"(a7), "0"(a0)) 1de4: 00000073 ecall int brk(void *addr) { return syscall(SYS_brk, addr); } 1de8: 2501 sext.w a0,a0 1dea: 8082 ret 0000000000001dec <getcwd>: register long a7 __asm__("a7") = n; 1dec: 48c5 li a7,17 __asm_syscall("r"(a7), "0"(a0), "r"(a1)) 1dee: 00000073 ecall char *getcwd(char *buf, size_t size){ return syscall(SYS_getcwd, buf, size); } 1df2: 8082 ret 0000000000001df4 <chdir>: register long a7 __asm__("a7") = n; 1df4: 03100893 li a7,49 __asm_syscall("r"(a7), "0"(a0)) 1df8: 00000073 ecall int chdir(const char *path){ return syscall(SYS_chdir, path); } 1dfc: 2501 sext.w a0,a0 1dfe: 8082 ret 0000000000001e00 <mkdir>: int mkdir(const char *path, mode_t mode){ 1e00: 862e mv a2,a1 1e02: 87aa mv a5,a0 register long a2 __asm__("a2") = c; 1e04: 1602 slli a2,a2,0x20 register long a7 __asm__("a7") = n; 1e06: 02200893 li a7,34 register long a0 __asm__("a0") = a; 1e0a: f9c00513 li a0,-100 register long a1 __asm__("a1") = b; 1e0e: 85be mv a1,a5 register long a2 __asm__("a2") = c; 1e10: 9201 srli a2,a2,0x20 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2)) 1e12: 00000073 ecall return syscall(SYS_mkdirat, AT_FDCWD, path, mode); } 1e16: 2501 sext.w a0,a0 1e18: 8082 ret 0000000000001e1a <getdents>: register long a7 __asm__("a7") = n; 1e1a: 03d00893 li a7,61 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2)) 1e1e: 00000073 ecall int getdents(int fd, struct linux_dirent64 *dirp64, unsigned long len){ //return syscall(SYS_getdents64, fd, dirp64, len); return syscall(SYS_getdents64, fd, dirp64, len); } 1e22: 2501 sext.w a0,a0 1e24: 8082 ret 0000000000001e26 <pipe>: register long a7 __asm__("a7") = n; 1e26: 03b00893 li a7,59 register long a1 __asm__("a1") = b; 1e2a: 4581 li a1,0 __asm_syscall("r"(a7), "0"(a0), "r"(a1)) 1e2c: 00000073 ecall int pipe(int fd[2]){ return syscall(SYS_pipe2, fd, 0); } 1e30: 2501 sext.w a0,a0 1e32: 8082 ret 0000000000001e34 <dup>: register long a7 __asm__("a7") = n; 1e34: 48dd li a7,23 __asm_syscall("r"(a7), "0"(a0)) 1e36: 00000073 ecall int dup(int fd){ return syscall(SYS_dup, fd); } 1e3a: 2501 sext.w a0,a0 1e3c: 8082 ret 0000000000001e3e <dup2>: register long a7 __asm__("a7") = n; 1e3e: 48e1 li a7,24 register long a2 __asm__("a2") = c; 1e40: 4601 li a2,0 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2)) 1e42: 00000073 ecall int dup2(int old, int new){ return syscall(SYS_dup3, old, new, 0); } 1e46: 2501 sext.w a0,a0 1e48: 8082 ret 0000000000001e4a <mount>: register long a7 __asm__("a7") = n; 1e4a: 02800893 li a7,40 __asm_syscall("r"(a7), "0"(a0), "r"(a1), "r"(a2), "r"(a3), "r"(a4)) 1e4e: 00000073 ecall int mount(const char *special, const char *dir, const char *fstype, unsigned long flags, const void *data) { return syscall(SYS_mount, special, dir, fstype, flags, data); } 1e52: 2501 sext.w a0,a0 1e54: 8082 ret 0000000000001e56 <umount>: register long a7 __asm__("a7") = n; 1e56: 02700893 li a7,39 register long a1 __asm__("a1") = b; 1e5a: 4581 li a1,0 __asm_syscall("r"(a7), "0"(a0), "r"(a1)) 1e5c: 00000073 ecall int umount(const char *special) { return syscall(SYS_umount2, special, 0); } 1e60: 2501 sext.w a0,a0 1e62: 8082 ret 0000000000001e64 <__clone>: .global __clone .type __clone, %function __clone: # Save func and arg to stack addi a1, a1, -16 1e64: 15c1 addi a1,a1,-16 sd a0, 0(a1) 1e66: e188 sd a0,0(a1) sd a3, 8(a1) 1e68: e594 sd a3,8(a1) # Call SYS_clone mv a0, a2 1e6a: 8532 mv a0,a2 mv a2, a4 1e6c: 863a mv a2,a4 mv a3, a5 1e6e: 86be mv a3,a5 mv a4, a6 1e70: 8742 mv a4,a6 li a7, 220 # SYS_clone 1e72: 0dc00893 li a7,220 ecall 1e76: 00000073 ecall beqz a0, 1f 1e7a: c111 beqz a0,1e7e <__clone+0x1a> # Parent ret 1e7c: 8082 ret # Child 1: ld a1, 0(sp) 1e7e: 6582 ld a1,0(sp) ld a0, 8(sp) 1e80: 6522 ld a0,8(sp) jalr a1 1e82: 9582 jalr a1 # Exit li a7, 93 # SYS_exit 1e84: 05d00893 li a7,93 ecall 1e88: 00000073 ecall
programs/oeis/082/A082569.asm
neoneye/loda
22
10404
; A082569: a(1)=2; a(n)=ceiling(n*(a(n-1)-1/a(n-1))). ; 2,3,8,32,160,960,6720,53760,483840,4838400,53222400,638668800,8302694400,116237721600,1743565824000,27897053184000,474249904128000,8536498274304000,162193467211776000,3243869344235520000 mov $1,1 add $1,$0 seq $1,142 ; Factorial numbers: n! = 1*2*3*4*...*n (order of symmetric group S_n, number of permutations of n letters). mul $1,4 add $1,2 div $1,3 mov $0,$1
Pruebas/prueba.adb
Arles96/PCompiladores
0
15200
<reponame>Arles96/PCompiladores procedure Hello is C, D: INTEGER := 0; begin C := 1; D := 4 / 2; put(D); end Hello;
Data/List/Kleene.agda
oisdk/agda-kleene-lists
0
13744
<reponame>oisdk/agda-kleene-lists {-# OPTIONS --without-K --safe #-} module Data.List.Kleene where open import Data.List.Kleene.Base public
bb-runtimes/x86_64/src/i-x86_64-ns16550.ads
JCGobbi/Nucleo-STM32G474RE
0
14753
<filename>bb-runtimes/x86_64/src/i-x86_64-ns16550.ads ------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- N S 1 6 5 5 0 -- -- -- -- S p e c -- -- -- -- Copyright (C) 2020, Free Software Foundation, Inc. -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ package Interfaces.X86_64.NS16550 with Pure, No_Elaboration_Code_All is type Number_Of_Bits is (Five, Six, Seven, Eight); for Number_Of_Bits use (Five => 2#00#, Six => 2#01#, Seven => 2#10#, Eight => 2#11#); type Number_Of_Stop_Bits is (One, Two); for Number_Of_Stop_Bits use (One => 0, Two => 1); type Parity_Option is (None, Odd, Even, Mark, Space); for Parity_Option use (None => 0, Odd => 1, Even => 2, Mark => 3, Space => 4); type Line_Control is record Data_Bits : Number_Of_Bits; Stop_Bits : Number_Of_Stop_Bits; Parity : Parity_Option; Divisor_Latch_Access : Boolean; end record with Size => 8; for Line_Control use record Data_Bits at 0 range 0 .. 1; Stop_Bits at 0 range 2 .. 2; Parity at 0 range 3 .. 5; Divisor_Latch_Access at 0 range 7 .. 7; end record; type Line_Status is record Data_Ready : Boolean; Overrun_Error : Boolean; Parity_Error : Boolean; Framing_Error : Boolean; Break_Indicator : Boolean; Transmit_Ready : Boolean; Transmitter_Empty : Boolean; Impending_Error : Boolean; end record with Size => 8; for Line_Status use record Data_Ready at 0 range 0 .. 0; Overrun_Error at 0 range 1 .. 1; Parity_Error at 0 range 2 .. 2; Framing_Error at 0 range 3 .. 3; Break_Indicator at 0 range 4 .. 4; Transmit_Ready at 0 range 5 .. 5; Transmitter_Empty at 0 range 6 .. 6; Impending_Error at 0 range 7 .. 7; end record; procedure Set_Line_Control (Data : Line_Control; Port : IO_Port); function Get_Line_Status (Port : IO_Port) return Line_Status; function Read_Data (Port : IO_Port) return Character; procedure Write_Data (Data : Character; Port : IO_Port); end Interfaces.X86_64.NS16550;
software/obsolete/new-rom/listing.asm
Noah1989/micro-21
1
20744
public listing_IX_seek_line_BC public listing_IX_read_line_eof_Z extern error include "listing.inc" listing_IX_seek_line_BC: LD L, (IX+listing_seek_line_BC) LD H, (IX+listing_seek_line_BC+1) JP (HL) listing_IX_read_line_eof_Z: LD L, (IX+listing_read_line_eof_Z) LD H, (IX+listing_read_line_eof_Z+1) JP (HL)
Engine/Graphics/ClearInterlacedDataMemory.asm
wide-dot/thomson-to8-game-engine
11
96437
******************************************************************************** * Clear memory in data area * !!! IRQ should be disabled !!! * * input REG : [x] color for 4 pixels ******************************************************************************** ClearInterlacedEvenDataMemory ldb #$18 stb CIDM_a_start+3 stb CIDM_b_start+3 ldb #0 stb CIDM_a_end+3 stb CIDM_b_end+3 bra ClearInterlacedDataMemory ClearInterlacedOddDataMemory ldb #$40 stb CIDM_a_start+3 stb CIDM_b_start+3 ldb #$28 stb CIDM_a_end+3 stb CIDM_b_end+3 ClearInterlacedDataMemory pshs u,dp sts CIDM_end+2 CIDM_a_start lds #$DF40 ; (dynamic) leau ,x leay ,x tfr x,d tfr a,dp CIDM_a pshs u,y,x,dp,b,a pshs u,y,x,dp,b,a pshs u,y,x,dp,b,a pshs u,y,x,dp,b,a pshs u,y CIDM_a_end cmps #$C000 leas -40,s bne CIDM_a CIDM_b_start lds #$BF40 ; (dynamic) CIDM_b pshs u,y,x,dp,b,a pshs u,y,x,dp,b,a pshs u,y,x,dp,b,a pshs u,y,x,dp,b,a pshs u,y CIDM_b_end cmps #$A000 leas -40,s bne CIDM_b CIDM_end lds #$0000 puls dp,u,pc
core/src/main/antlr4/TxnParser.g4
e257-fi/tackler
0
7508
/* * Copyright 2016-2019 E257.FI * * 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. * */ parser grammar TxnParser; options { tokenVocab = TxnLexer; language = Java; } txns: blankline* txn (blankline+ txn)* blankline* opt_sp EOF; txn: date code? (description | opt_sp) NL txn_meta[0, 0, 0]? txn_comment* postings; date: DATE | TS | TS_TZ ; code: sp '(' code_value ')'; code_value: ~( '\'' | '(' | ')' | '[' | ']' | '{' | '}' | '<' | '>' | NL)*; description: sp '\'' text; text: ~(NL)*; txn_meta [int u, int l, int t]: ( {$u < 1}? txn_meta_uuid NL {$u++;} | {$l < 1}? txn_meta_location NL {$l++;} | {$t < 1}? txn_meta_tags NL {$t++;} )+; txn_meta_uuid: indent '#' sp UUID_NAME ':' sp UUID_VALUE opt_sp; txn_meta_location: indent '#' sp LOCATION_NAME ':' sp geo_uri opt_sp; txn_meta_tags: indent '#' sp TAGS_NAME ':' sp tags opt_sp; geo_uri: GEO_NAME ':' lat ',' lon (',' alt)?; lat: INT | NUMBER; lon: INT | NUMBER; alt: INT | NUMBER; tags: tag | tags opt_sp ',' opt_sp tag; tag: ID (':' (ID | SUBID | INT))*; txn_comment: indent comment NL; indent: (' '|'\t')+; comment: ';' ' ' text; postings: posting+ (posting|last_posting); posting: indent account sp amount opt_unit? (opt_comment | opt_sp) NL; last_posting: indent account (opt_comment | opt_sp) NL; opt_unit: sp unit opt_position?; opt_comment: opt_sp comment; opt_position: opt_opening_pos | opt_opening_pos closing_pos | closing_pos ; opt_opening_pos: sp '{' opt_sp amount sp unit opt_sp '}'; closing_pos: sp ('@' | '=') sp amount sp unit; account: ID (':' (ID | SUBID | INT))*; amount: INT | NUMBER; unit: ID; sp: (' '|'\t')+; opt_sp: (' '|'\t')*; blankline: opt_sp NL;
programs/oeis/027/A027778.asm
neoneye/loda
22
179220
<reponame>neoneye/loda ; A027778: a(n) = 5*(n+1)*binomial(n+2, 5)/2. ; 10,75,315,980,2520,5670,11550,21780,38610,65065,105105,163800,247520,364140,523260,736440,1017450,1382535,1850695,2443980,3187800,4111250,5247450,6633900,8312850,10331685,12743325,15606640,18986880 mov $1,$0 add $0,5 bin $0,$1 add $1,4 mul $0,$1 div $0,2 mul $0,5
triton-compiler/src/main/antlr4/org/bw/tl/antlr/Grammar.g4
BradleyWood/Triton-Lang
3
574
grammar Grammar; file : NL* (packageDef NL*)? imp* NL* topLevelStatement* NL* EOF ; script : NL* (packageDef NL*)? imp* NL* (scriptStatement semi)* (scriptStatement semi?)? NL* EOF ; scriptStatement : statement | functionDef | varDef ; topLevelStatement : ( functionDef ) semi? | varDef semi | schedule semi ; statement : block | whileStatement | forStatement | expression | async | varDef | returnStatement | schedule | SEMICOLON ; expression : LPAREN NL* wrapped=expression NL* RPAREN | literal | preceeding=expression NL* DOT NL* id=IDENTIFIER | name=fqn | preceeding=expression NL* DOT NL* call=functionCall | call=functionCall | ifStatement | whenExpr | delegate | newStatement | listDef | preceeding=expression NL* DOT NL* assignment | assignment | typeCast | expression indices (NL* ASSIGN NL* assign=expression)? | lhs=expression NL* (RANGE) NL* rhs=expression | (PLUS | MINUS | NOT) NL* unaryOperand=expression | lhs=expression NL* (POW) NL* rhs=expression | lhs=expression NL* (MULT | DIV | MOD) NL* rhs=expression | lhs=expression NL* (PLUS | MINUS) NL* rhs=expression | lhs=expression NL* (GT | LT | GTE | LTE | EQUALS | NOT_EQ) NL* rhs=expression | lhs=expression NL* (AND | OR) NL* rhs=expression ; schedule : SCHEDULE NL* LBR NL* (task NL*)* RBR ; task : TASK NL* taskParams NL* block NL* constraint* ; taskParams : LPAREN ((NL* PERIOD NL* ASSIGN)? NL* period=INT) NL* RPAREN ; constraint : CONSTRAINT NL* condition=block (NL* CONSTRAINT_VIOLATION NL* violation=block)? ; indices : (NL* '[' NL* expression NL* ']')+ ; /** RMD **/ delegate : DELEGATE (NL* LPAREN condition=expression RPAREN)? NL* body=block; async : ASYNC (NL* LPAREN condition=expression RPAREN)? NL* body=block (NL* CALLBACK NL* cb=block)? ; /** RMD **/ assignment : <assoc=right> IDENTIFIER NL* ( ASSIGN | PLUS_EQ | MINUS_EQ | MULT_EQ | DIV_EQ | MOD_EQ | POW_EQ ) NL* val=expression ; typeArguments : '<' NL* (typeArgument (NL* ',' typeArgument)* NL*)? '>' ; typeArgument : fqn typeArguments? | arrayType ; listDef : (typeArguments NL*)? '[' NL* (expressionList NL*)? ']' ; typeCast : '(' NL* type NL* ')' NL* expression ; varDef : (modifierList NL*)? (type | VAR | VAL) NL* IDENTIFIER (NL* ASSIGN NL* expression)? ; functionCall : IDENTIFIER NL* LPAREN (NL* expression (NL* COMMA NL* expression)*)? NL* RPAREN ; functionDef : (modifierList NL*)? FUN NL* IDENTIFIER NL* LPAREN functionParamDefs? RPAREN NL* (':' NL* (VOID_T | type) NL*)? (block? | ('=' NL* expression)) ; functionParamDefs : functionParam (NL* COMMA NL* functionParam)* ; functionParam : (modifierList NL*)? type NL* IDENTIFIER ; type : primitiveType | fqn typeArguments? | arrayType ; arrayType : (primitiveType | fqn) (NL* '[' NL* ']')+ ; primitiveType : INT_T | LONG_T | BOOL_T | BYTE_T | FLOAT_T | DOUBLE_T ; packageDef : PACKAGE fqn semi ; imp : IMP fqn semi ; block : LBR NL* (statement semi)* (statement semi?)? NL* RBR ; ifStatement : IF NL* LPAREN condition=expression RPAREN NL* body=statement SEMICOLON? (NL* ELSE NL* else_=statement)? ; whenExpr : WHEN NL* (LPAREN NL* expression NL* RPAREN NL*)? '{' NL* (whenCase semi)* (whenElse semi?)? '}' ; whenCase : whenCondition NL* '->' NL* (expression | block) ; whenCondition : expression | ('is' | '!is') type ; whenElse : ELSE NL* '->' NL* (expression | block) ; whileStatement : WHILE NL* LPAREN condition=expression RPAREN NL* body=statement | DO NL* body=statement NL* WHILE NL* LPAREN condition=expression RPAREN ; returnStatement : RETURN expression? ; newStatement : NEW NL* fqn NL* LPAREN (expression (NL* COMMA NL* expression)*)? NL* RPAREN | array=NEW NL* (fqn | primitiveType) NL* ('[' NL* expression NL* ']')+ ; forStatement : FOR NL* LPAREN NL* forControl NL* RPAREN NL* ((statement semi?) | SEMICOLON) | FOR NL* statement ; forControl : (modifierList NL*)? (type | VAR | VAL) NL* IDENTIFIER NL* COLON NL* expression | ((varDef | init=expression) NL*)? SEMICOLON NL* (condition=expression NL*)? SEMICOLON (NL* expressionList)? ; localVariable : type localVarDefList ; localVarDefList : localVarDef (COMMA localVarDef)* ; localVarDef : IDENTIFIER ASSIGN expression ; expressionList : expression (NL* COMMA NL* expression)* ; literal : number | bool | string | NULL ; bool : TRUE | FALSE ; number : INT | HEX | FLOAT ; string : StringLiteral ; fqn : IDENTIFIER (DOT IDENTIFIER)* ; modifierList : modifier+ ; modifier : visibilityModifier | 'final' ; visibilityModifier : PUBLIC | PRIVATE | PROTECT ; // tokens StringLiteral : '"' StringCharacters? '"' ; fragment StringCharacters : StringCharacter+ ; fragment StringCharacter : ~["\\] | EscapeSequence ; // §3.10.6 Escape Sequences for Character and String Literals fragment EscapeSequence : '\\' [btnfr"'\\] | OctalEscape | UnicodeEscape ; fragment OctalEscape : '\\' OctalDigit | '\\' OctalDigit OctalDigit | '\\' ZeroToThree OctalDigit OctalDigit ; fragment OctalDigit : [0-7] ; fragment UnicodeEscape : '\\' 'u' HexDigit HexDigit HexDigit HexDigit ; fragment ZeroToThree : [0-3] ; IF : 'if'; IS : 'is'; DO : 'do'; NEW : 'new'; FUN : 'fun'; VAR : 'var'; VAL : 'val'; FOR : 'for'; IMP : 'import'; INT_T : 'int'; TASK : 'task'; LONG_T : 'long'; BYTE_T : 'byte'; NULL : 'null'; TRUE : 'true'; ELSE : 'else'; WHEN : 'when'; FALSE : 'false'; WHILE : 'while'; FLOAT_T : 'float'; NATIVE : 'native'; DOUBLE_T: 'double'; PERIOD : 'period'; RETURN : 'return'; PUBLIC : 'public'; PRIVATE : 'private'; PACKAGE : 'package'; PROTECT : 'protected'; VOID_T : 'void'; BOOL_T : 'boolean'; LPAREN : '('; RPAREN : ')'; SCHEDULE : 'schedule'; CONSTRAINT : 'constrainedBy'; CONSTRAINT_VIOLATION : 'constraintViolation'; // RMD DELEGATE : 'delegate'; ASYNC : 'async'; CALLBACK : 'callback'; LBR : '{'; RBR : '}'; RANGE : '..'; IDENTIFIER : [a-zA-Z_][a-zA-Z_0-9]*; WS : [\u0020\u0009\u000C] -> skip; NL: '\u000A' | '\u000D' '\u000A' ; semi: NL+ | SEMICOLON | SEMICOLON NL+; COMMENT : '/*' .*? '*/' -> channel(HIDDEN); LINE_COMMENT : '//' ~[\r\n]* -> channel(HIDDEN); // arithmetic PLUS : '+'; MINUS : '-'; MULT : '*'; DIV : '/'; MOD : '%'; POW : '**'; ASSIGN : '='; PLUS_EQ : '+='; MINUS_EQ: '-='; MULT_EQ : '*='; DIV_EQ : '/='; MOD_EQ : '%='; POW_EQ : '**='; // logical EQUALS : '=='; NOT_EQ : '!='; AND : '&&'; OR : '||'; NOT : '!'; GT : '>'; GTE : '>='; LT : '<'; LTE : '<='; COLON : ':'; DOT : '.'; COMMA : ','; SEMICOLON : ';'; INT : Digit+ ; HEX : '0' [xX] HexDigit+ ; FLOAT : Digit+ '.' Digit* ExponentPart? [fF]? | '.' Digit+ ExponentPart? [fF]? | Digit+ ExponentPart [fF]? | Digit+ [fF] ; fragment ExponentPart : [eE] [+-]? Digit+ ; fragment HexExponentPart : [pP] [+-]? Digit+ ; fragment Digit : [0-9] ; fragment HexDigit : [0-9a-fA-F] ;
hacking-date/HackingDate.scpt
RainySummerLuo/OpenHappyHackingCalendar-Python
50
4035
set now to current date set y to text -4 thru -1 of ("0000" & (year of now)) set m to text -2 thru -1 of ("00" & ((month of now) as integer)) set d to text -2 thru -1 of ("00" & (day of now)) y & "-" & m & "-" & d
notes/fixed-points/PolynomialFunctors.agda
asr/fotc
11
5551
{-# OPTIONS --exact-split #-} {-# OPTIONS --no-sized-types #-} {-# OPTIONS --no-universe-polymorphism #-} {-# OPTIONS --without-K #-} module PolynomialFunctors where -- From: <NAME>. Dependently typed programming in Agda. In Koopman -- et al., editors. Advanced Functional Programming (AFP 2008), volume -- 5832 of LNCS. Springer-Verlag, 2009. pages 230–266. infixr 50 _|+|_ _⊕_ infixr 60 _|x|_ _×_ record True : Set where data _⊕_ (A B : Set) : Set where inl : A → A ⊕ B inr : B → A ⊕ B data _×_ (A B : Set) : Set where _,_ : A → B → A × B data Functor : Set₁ where |Id| : Functor |K| : Set → Functor _|+|_ : Functor → Functor → Functor _|x|_ : Functor → Functor → Functor [_] : Functor → Set → Set [ |Id| ] X = X [ |K| A ] X = A [ F |+| G ] X = [ F ] X ⊕ [ G ] X [ F |x| G ] X = [ F ] X × [ G ] X data μ_ (F : Functor) : Set where <_> : [ F ] (μ F) → μ F NatF : Functor NatF = |K| True |+| |Id| NAT : Set NAT = μ NatF Z : NAT Z = < inl _ > S : NAT → NAT S n = < inr n > _+_ : NAT → NAT → NAT m + < inl _ > = m m + < inr n > = S (m + n) ListF : (A : Set) → Functor ListF = λ A → |K| True |+| |K| A |x| |Id| LIST : (A : Set) → Set LIST = λ A → μ (ListF A) nil : {A : Set} → LIST A nil = < inl _ > cons : {A : Set} → A → LIST A → LIST A cons x xs = < inr (x , xs) >
Assembler/Monitor.asm
techno-sorcery/CPU-16
3
161614
<reponame>techno-sorcery/CPU-16<filename>Assembler/Monitor.asm ;ATLAS Machine Code Monitor ;Definitions ORG $FFFF dw $E000 org $FD00 .splash dw 'ATLAS Machine Code Monitor 16\n(c)2021 ATLAS Digital Systems\, <NAME>\n\n\0' .prompt dw '>> \0' .syntaxError dw 'Syntax error\n\0' .hexTable dw '0123456789ABCDEF\0' .asciiTable dw '................................' dw ' !"#$%&\'()*+\,-./0123456789:;<=' dw '>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\\' dw ']^_`abcdefghijklmnopqrstuvwxyz{|' dw '}~..............................' dw '................................' dw '................................' dw '................................' dw '...\0' org $C000 .devTerm org $C000 .devKey org $01FE .wrPos org $01FF .rdPos org $0200 .keyStart org $02FF .keyEnd org $0300 .cmdBuffer ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; ; init ; Program initialization ; Parameters: ; None ; Modifies: SP, $1, STAT ; LNK Offset: 0 ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; ORG $E000 .init ;Init stack & vectors MOV #$C000,SP MOV #srKeyStore,1 ;Generate splash screen PSH #splash JSR srStrTermWord ADD #1,SP ;Initialize status register ORT #%1111111100000000 .main MOV #'>',devTerm JSR getInput LNK D7,#0 PSH #keyStart JSR srStringParse ULNK D7 LNK D7,#0 PSH #syntaxError JSR srStrTermWord ULNK D7 JMP main ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; ; getInput ; Read & handle input from key buffer ; Parameters: ; None ; Modifies: D0, D1, wrPos, rdPos, (wrPos) ; LNK Offset: 0 ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; .getInput ;Initialize key buffer and cursor position MOV #0,D1 MOV #keyStart,wrPos MOV #keyStart,rdPos .LOC_getInput_readKey ;Read from key buffer CMP wrPos,rdPos BIE LOC_getInput_readKey PSH D1 JSR srKeyRead POP D1 ;Check if control char CMP #31,D0 BIC LOC_getInput_noCTRL ;Check if enter CMP #10,D0 BIE LOC_getInput_enter ;Check if backspace CMP #8,D0 BNE LOC_getInput_readKey ;Check if null CMP #0,D1 BNE LOC_getInput_decCursor JMP LOC_getInput_readKey .LOC_getInput_decCursor DEC D1 MOV #8,devTerm JMP LOC_getInput_readKey .LOC_getInput_noCTRL MOV D0,devTerm INC D1 JMP LOC_getInput_readKey .LOC_getInput_enter ANT #%100000000000000 MOV D0,devTerm MOV rdPos,D0 DEC D0 MOV #0,(D0) RTS ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; ; mDump ; Dumps memory from p1-p2 to terminal ; Parameters: ; ; Modifies: ; LNK Offset: 0 ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; .mDump PSH D4 PSH D7 .LOC_mDump_Y MOV #0,D4 MOV D5,D7 JSR srBinHexTerm MOV #':',devTerm MOV #' ',devTerm PSH D5 .LOC_mDump_X MOV (D5),D7 JSR srBinHexTerm MOV #' ',devTerm INC D4 INC D5 CMP #8,D4 BNE LOC_mDump_X MOV #' ',devTerm POP D5 MOV #0,D4 .LOC_mDump_Z MOV (D5),D7 JSR srBinAsciiTerm MOV #' ',devTerm INC D4 INC D5 CMP #8,D4 BNE LOC_mDump_Z MOV #'\n',devTerm CMP D5,D6 BNE LOC_mDump_Y POP D4 POP D7 HLT ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; ; srBinHexTerm ; Convert binary word (D7) to ascii hex, and output to terminal ; Parameters: ; ; Modifies: ; LNK Offset: 0 ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; .srBinHexTerm PSH D6 MOV D7,D6 SWP D6 RSH D6 RSH D6 RSH D6 RSH D6 AND #%1111,D6 MOV hexTable(D6),devTerm MOV D7,D6 SWP D6 AND #%1111,D6 MOV hexTable(D6),devTerm MOV D7,D6 RSH D6 RSH D6 RSH D6 RSH D6 AND #%1111,D6 MOV hexTable(D6),devTerm MOV D7,D6 AND #%1111,D6 MOV hexTable(D6),devTerm POP D6 RTS ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; ; srBinAsciiTerm ; Convert binary word (D7) to ascii, and output to terminal ; Parameters: ; ; Modifies: ; LNK Offset: 0 ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; .srBinAsciiTerm PSH D6 MOV D7,D6 SWP D6 AND #%11111111,D6 MOV asciiTable(D6),devTerm MOV D7,D6 AND #%11111111,D6 MOV asciiTable(D6),devTerm POP D6 RTS ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; ; srStrTermWord ; Output ascii-encoded string @ (D7) to terminal ; Parameters: ; -1(BP): String start address ; Modifies: D0, devTerm ; LNK Offset: 0 ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; .srStrTermWord POP D0 .LOC_StrTermWordX MOV (D0)+,devTerm CMP #0,(D0) BNE LOC_StrTermWordX RTS ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; ; srKeyStore ; Stores key input to the keybuffer ; Parameters: ; None ; Modifies: D0, wrPos, (wrPos) ; LNK Offset: 0 ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; .srKeyStore MOV wrPos,D0 MOV devKey,(D0) INC D0 CMP #keyEnd,D0 BNE LOC_KeyStore_End MOV #keyStart,D0 .LOC_KeyStore_End MOV D0,wrPos RTS ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; ; srKeyRead ; Stores character from key buffer to register D0 ; Parameters: ; None ; Modifies: D0, D1, rdPos ; LNK Offset: 0 ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; .srKeyRead ANT #%100000000000000 MOV rdPos,D1 MOV (D1),D0 INC D1 CMP #keyEnd,D1 BNE LOC_KeyRead_End MOV #keyStart,D1 .LOC_KeyRead_End MOV D1,rdPos RTS ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; ; srStringParse ; Parses string, accounting for control characters ; Parameters: ; -1(BP): String start address ; Modifies: D0, D1, (-1(BP)) ; LNK Offset: 0 ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; .srStringParse PSH D2 ;Read MOV -1(D7),D0 ;Write MOV -1(D7),D1 .LOC_StringParse_X MOV (D0),D2 CMP #31,D2 BIC LOC_StringParse_write CMP #0,D2 BIE LOC_StringParse_exit CMP #8,D2 BIE LOC_StringParse_bkSpace JMP LOC_StringParse_exit .LOC_StringParse_write MOV D2,(D1)+ .LOC_StringParse_incRead INC D0 JMP LOC_StringParse_X .LOC_StringParse_exit MOV #0,(D1) POP D2 RTS .LOC_StringParse_bkSpace CMP -1(D7),D1 BIE LOC_StringParse_incRead DEC D1 JMP LOC_StringParse_incRead ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; ; srStringSplit ; Program initialization ; Parameters: ; -1(BP): String start address ; -2(BP): Separator character ; -3(BP): String index number ; Modifies: SP, $1, STAT ; LNK Offset: -1 ;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; .srStringSplit PSH D2 ;String address MOV -1(D7),D0 PSH D0 ;Index number MOV #0,D1 .LOC_StringSplit_X MOV (D0),D2 CMP -2(D7),D2 BNE LOC_StringSplit_inc CMP -3(D7),D1 BIE LOC_StringSplit_exit .LOC_StringSplit_inc .LOC_StringSplit_exit POP D0
libtool/src/gmp-6.1.2/mpn/x86_64/coreisbr/addmul_2.asm
kroggen/aergo
1,602
925
dnl AMD64 mpn_addmul_2 optimised for Intel Sandy Bridge. dnl Contributed to the GNU project by <NAME>. dnl Copyright 2003-2005, 2007, 2008, 2011-2013 Free Software Foundation, Inc. dnl This file is part of the GNU MP Library. dnl dnl The GNU MP Library is free software; you can redistribute it and/or modify dnl it under the terms of either: dnl dnl * the GNU Lesser General Public License as published by the Free dnl Software Foundation; either version 3 of the License, or (at your dnl option) any later version. dnl dnl or dnl dnl * the GNU General Public License as published by the Free Software dnl Foundation; either version 2 of the License, or (at your option) any dnl later version. dnl dnl or both in parallel, as here. dnl dnl The GNU MP Library is distributed in the hope that it will be useful, but dnl WITHOUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY dnl or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License dnl for more details. dnl dnl You should have received copies of the GNU General Public License and the dnl GNU Lesser General Public License along with the GNU MP Library. If not, dnl see https://www.gnu.org/licenses/. include(`../config.m4') C cycles/limb best C AMD K8,K9 C AMD K10 C AMD bull C AMD pile C AMD bobcat C AMD jaguar C Intel P4 C Intel core C Intel NHM C Intel SBR 2.93 this C Intel IBR 2.66 this C Intel HWL 2.5 2.15 C Intel BWL C Intel atom C VIA nano C This code is the result of running a code generation and optimisation tool C suite written by <NAME> and <NAME>. C When playing with pointers, set this to $2 to fall back to conservative C indexing in wind-down code. define(`I',`$1') define(`rp', `%rdi') C rcx define(`up', `%rsi') C rdx define(`n_param', `%rdx') C r8 define(`vp', `%rcx') C r9 define(`n', `%rcx') define(`v0', `%rbx') define(`v1', `%rbp') define(`w0', `%r8') define(`w1', `%r9') define(`w2', `%r10') define(`w3', `%r11') define(`X0', `%r12') define(`X1', `%r13') ABI_SUPPORT(DOS64) ABI_SUPPORT(STD64) ASM_START() TEXT ALIGN(32) PROLOGUE(mpn_addmul_2) FUNC_ENTRY(4) push %rbx push %rbp push %r12 push %r13 mov (vp), v0 mov 8(vp), v1 mov (up), %rax mov n_param, n neg n lea (up,n_param,8), up lea 8(rp,n_param,8), rp mul v0 test $1, R8(n) jnz L(bx1) L(bx0): mov -8(rp,n,8), X0 mov %rdx, w1 add %rax, X0 adc $0, w1 mov (up,n,8), %rax xor w0, w0 xor w3, w3 test $2, R8(n) jnz L(b10) L(b00): nop C this nop make loop go faster on SBR! mul v1 mov (rp,n,8), X1 jmp L(lo0) L(b10): lea -2(n), n jmp L(lo2) L(bx1): mov -8(rp,n,8), X1 mov %rdx, w3 add %rax, X1 adc $0, w3 mov (up,n,8), %rax xor w1, w1 xor w2, w2 test $2, R8(n) jz L(b11) L(b01): mov (rp,n,8), X0 inc n jmp L(lo1) L(b11): dec n jmp L(lo3) ALIGN(32) L(top): L(lo1): mul v1 mov %rdx, w0 C 1 add %rax, X0 C 0 adc $0, w0 C 1 add w1, X1 C 3 adc $0, w3 C 0 add w2, X0 C 0 adc $0, w0 C 1 mov (up,n,8), %rax mul v0 add %rax, X0 C 0 mov %rdx, w1 C 1 adc $0, w1 C 1 mov (up,n,8), %rax mul v1 mov X1, -16(rp,n,8) C 3 mov (rp,n,8), X1 C 1 add w3, X0 C 0 adc $0, w1 C 1 L(lo0): mov %rdx, w2 C 2 mov X0, -8(rp,n,8) C 0 add %rax, X1 C 1 adc $0, w2 C 2 mov 8(up,n,8), %rax add w0, X1 C 1 adc $0, w2 C 2 mul v0 add %rax, X1 C 1 mov %rdx, w3 C 2 adc $0, w3 C 2 mov 8(up,n,8), %rax L(lo3): mul v1 add w1, X1 C 1 mov 8(rp,n,8), X0 C 2 adc $0, w3 C 2 mov %rdx, w0 C 3 add %rax, X0 C 2 adc $0, w0 C 3 mov 16(up,n,8), %rax mul v0 add w2, X0 C 2 mov X1, (rp,n,8) C 1 mov %rdx, w1 C 3 adc $0, w0 C 3 add %rax, X0 C 2 adc $0, w1 C 3 mov 16(up,n,8), %rax add w3, X0 C 2 adc $0, w1 C 3 L(lo2): mul v1 mov 16(rp,n,8), X1 C 3 add %rax, X1 C 3 mov %rdx, w2 C 4 adc $0, w2 C 4 mov 24(up,n,8), %rax mov X0, 8(rp,n,8) C 2 mul v0 add w0, X1 C 3 mov %rdx, w3 C 4 adc $0, w2 C 4 add %rax, X1 C 3 mov 24(up,n,8), %rax mov 24(rp,n,8), X0 C 0 useless but harmless final read adc $0, w3 C 4 add $4, n jnc L(top) L(end): mul v1 add w1, X1 adc $0, w3 add w2, %rax adc $0, %rdx mov X1, I(-16(rp),-16(rp,n,8)) add w3, %rax adc $0, %rdx mov %rax, I(-8(rp),-8(rp,n,8)) mov %rdx, %rax pop %r13 pop %r12 pop %rbp pop %rbx FUNC_EXIT() ret EPILOGUE()
src/PJ/poco/callglue/pococall.asm
AnimatorPro/Animator-Pro
119
163088
EXTRN postack_to_cstack:WORD CGROUP group code code segment dword 'CODE' assume cs:CGROUP,ds:CGROUP ;(return type) poco_call_cfunc(void *stack_descriptor, void *poco_stack, ; int cstack_size, FUNC cvector ); ; A raft of symbols for different data types. Maybe not needed if casts ; do the job at higher level ; the double call works with watcom since it returns it's result in the ; eax,edx register pair and not on the stack. This same code can also be ; used to call functions that return an structure since the address of the ; structure area in the caller is passed in in watcom in the esi register ; and the call copys it's result there. It would be possible to make a version ; of this that would be passed in a pointer to the destination struct area ; and then stuff this into esi and then call this to return a structure value ; into *esi in the caller public poco_call_ifunc ; integer function public poco_call_pfunc ; pointer function public poco_call_sfunc ; short function public poco_call_bfunc ; byte function public poco_call_ffunc ; double float function public poco_call_ppfunc ; Popot function poco_call_ifunc proc near poco_call_pfunc proc near poco_call_sfunc proc near poco_call_bfunc proc near poco_call_ffunc proc near poco_call_ppfunc proc near pococall_arg struc ;poco_call_Xfunc parameter structure pc_ebp dd ? pc_ret dd ? pc_stack_desc dd ? pc_poco_stack dd ? pc_cstack_size dd ? pc_cvector dd ? pococall_arg ends push ebp ; save old stack frame mov ebp,esp ; sp to ebp sub esp,[ebp].pc_cstack_size ; make space requested on stack sub esp,010H ; allow space for *pocostack and rounding and esp,0fffffffcH ; round up stack to be long word aligned ; call postack_to_cstack(stack_desk,poco_stack,&c_stack); push esp ; push pointer to cstack buffer on stack push [ebp].pc_poco_stack push [ebp].pc_stack_desc call near ptr postack_to_cstack add esp,0cH ; pop args off stack ; call (*cvector)(...[c_stack]...) call vector with stack frame for "C" stack call dword ptr [ebp].pc_cvector leave ; Restore ebp to esp and pop ebp to caller's stack frame ret poco_call_ppfunc endp poco_call_ffunc endp poco_call_bfunc endp poco_call_sfunc endp poco_call_pfunc endp poco_call_ifunc endp code ends end
audio/music/titlescreen.asm
pokeachromicdevs/pokeoctober
1
99562
Music_TitleScreen: musicheader 4, 1, title2_3_Ch1 musicheader 1, 2, title2_3_Ch2 musicheader 1, 3, title2_3_Ch3 musicheader 1, 4, title2_3_Ch4 ; include group.def ;bank3d group G_MUSIC4 ; ;; title2_3 ; ;; Converting on Fri Jul 30 19:00:35 1999 ; ;; by ver 1.01 ; ; public mustitle3 ;mustitle3: ;---------------------------------------- title2_3_Ch1: ;---------------------------------------- tempo 144 volume 7, 7 pitch_offset 1 duty_cycle 3 stereo_panning TRUE, FALSE soundinput 0 ; P1-1 note_type 12, 8, 0 ; P1-2 octave 2 note G_,16 ; P1-3 note G#,16 ; P1-4 octave 3 note C_,16 ; P1-5 note C_,16 ; P1-6 tempo 136 note_type 12, 11, 3 note D_,4 octave 2 note G_,2 octave 3 note D_,4 octave 2 note G_,2 octave 3 note D_,2 octave 2 note G_,2 ; P1-7 octave 3 note C_,4 octave 2 note F_,2 octave 3 note C_,4 octave 2 note F_,2 octave 3 note C_,2 octave 2 note F_,2 ; P1-8 note B_,4 note G_,2 note B_,4 note G_,2 note B_,2 note G_,2 ; P1-9 note A_,4 note D_,2 note A_,4 note D_,2 note A_,2 octave 3 note C_,2 ; P1-10 note D_,6 octave 2 note B_,2 octave 3 note D_,4 octave 2 note B_,4 ; P1-11 octave 3 note C_,6 note F_,6 note C_,4 ; P1-12 note D_,6 note D#,1 note E_,1 note F_,6 note E_,1 note D#,1 ; P1-13 note D_,8 note_type 8, 11, 3 note C_,4 octave 2 note B_,4 octave 3 note C_,4 ; P1-14 note D_,9 octave 2 note B_,3 octave 3 note D_,6 octave 2 note B_,6 ; P1-15 octave 3 note C_,3 note D_,6 note E_,3 note E_,4 note E_,4 note C_,4 ; P1-16 octave 2 note B_,12 octave 3 note F_,4 note E_,4 note C_,4 ; P1-17 note D_,12 rest 3 octave 2 note B_,3 octave 3 note C_,3 note D_,3 ; P1-18 note D_,9 octave 2 note B_,3 octave 3 note D_,6 octave 2 note B_,6 ; P1-19 octave 3 note C_,9 note F_,9 note C_,6 ; P1-20 note D_,9 note_type 12, 11, 3 note D#,1 note E_,1 note F_,6 note E_,1 note D#,1 ; P1-21 note D_,8 note_type 8, 11, 3 note C_,4 octave 2 note B_,4 octave 3 note C_,4 ; P1-22 note D_,9 octave 2 note B_,3 octave 3 note D_,9 note G_,3 ; P1-23 note A_,4 note G_,4 note F_,4 note F_,6 note E_,6 ; P1-24 note D_,9 note F_,3 note G_,3 note D_,6 note G_,3 ; P1-25 note G_,9 note A_,6 note F_,3 note A_,3 octave 4 note C_,3 ; P1-26 note_type 12, 11, 3 octave 3 note D_,12 note E_,4 ; P1-27 note F_,8 note G_,4 note F_,4 ; P1-28 note E_,8 note_type 8, 11, 3 note G_,4 note F_,4 note E_,4 ; P1-29 note G_,12 octave 4 note C_,6 note C#,6 ; P1-30 note_type 12, 11, 3 note D_,1 rest 1 stereo_panning TRUE, TRUE octave 2 note D_,1 octave 1 note A_,1 octave 2 note D_,1 rest 1 note D_,1 octave 1 note A_,1 octave 2 note D_,1 rest 1 note D_,1 octave 1 note A_,1 octave 2 note D_,1 rest 1 note D_,1 octave 1 note A_,1 ; P1-31 octave 2 note D_,1 rest 1 note D_,1 octave 1 note A_,1 octave 2 note D_,1 rest 1 note D_,1 octave 1 note A_,1 note_type 8, 11, 3 stereo_panning TRUE, FALSE octave 4 note C_,4 note C_,4 note C#,4 ; P1-32 stereo_panning TRUE, TRUE note_type 12, 11, 3 note D_,1 rest 1 octave 2 note D_,1 octave 1 note A_,1 octave 2 note D_,1 rest 1 note D_,1 octave 1 note A_,1 octave 2 note D_,1 rest 1 note D_,1 octave 1 note A_,1 octave 2 note D_,1 rest 1 note D_,1 octave 1 note A_,1 ; P1-33 octave 2 note D_,1 rest 1 note D_,1 octave 1 note A_,1 octave 2 note D_,1 rest 1 note D_,1 octave 1 note A_,1 note_type 8, 11, 3 stereo_panning TRUE, FALSE octave 3 note E_,4 note E_,4 note C_,4 ; P1-34 note_type 12, 11, 7 note D_,16 ; P1-35 note C_,16 ; P1-36 octave 2 note B_,16 ; P1-37 octave 3 note C_,8 octave 2 note B_,8 ; P1-38 octave 3 note D_,8 octave 2 note B_,8 ; P1-39 octave 3 note C_,8 note F_,8 ; P1-40 note A_,8 note G_,6 note G_,1 note F#,1 ; P1-41 note F_,8 note E_,8 ; P1-42 note D_,16 ; P1-43 note D_,16 ; P1-44 octave 2 note G_,1 rest 3 note G_,1 rest 5 note G_,1 note G_,1 note G_,1 rest 3 ; P1-45 note G_,1 rest 3 note G_,1 rest 3 note_type 8, 11, 3 note A_,2 note A_,2 note A_,2 note A_,2 note A_,2 note F#,2 ; P1-46 note_type 12, 11, 2 note G_,16 sound_ret ;---------------------------------------- title2_3_Ch2: ;---------------------------------------- duty_cycle 3 vibrato 16, 1, 4 ; P2-1 note_type 12, 10, 0 ; P2-2 octave 3 stereo_panning TRUE, TRUE note D_,16 ; P2-3 volume_envelope 11, 0 note C_,8 note G#,6 note G_,1 note F#,1 ; P2-4 note F_,16 ; P2-5 note G#,16 note_type 12, 12, 7 ; P2-6 rest 16 ; P2-7 rest 16 ; P2-8 rest 16 ; P2-9 note E_,4 note D_,2 note C_,4 note D_,2 note E_,4 ; P2-10 stereo_panning TRUE, TRUE ;;; note G_,6 note B_,2 octave 4 note D_,8 ; P2-11 stereo_panning FALSE, TRUE ;;; octave 2 note A_,4 note F_,4 stereo_panning TRUE, TRUE ;;; octave 4 note F_,6 note E_,1 note D#,1 ; P2-12 note D_,8 stereo_panning FALSE, TRUE ;;; octave 2 note A_,8 ; P2-13 stereo_panning TRUE, TRUE ;;; octave 4 note D_,4 note D_,2 note C_,4 note C_,2 octave 3 note B_,4 ; P2-14 note G_,6 note B_,2 octave 4 note D_,8 ; P2-15 stereo_panning FALSE, TRUE ;;; octave 2 note A_,6 note F_,2 stereo_panning TRUE, TRUE ;;; note_type 8, 12, 7 octave 4 note C_,4 octave 3 note B_,4 octave 4 note C_,4 ; P2-16 note D_,12 stereo_panning FALSE, TRUE ;;; octave 2 note A_,9 note_type 12, 12, 7 note G_,1 note A_,1 ; P2-17 note B_,6 note E_,1 note F#,1 note G_,4 note A_,4 ; P2-18 stereo_panning TRUE, TRUE ;;; octave 3 note G_,6 note B_,2 octave 4 note D_,8 ; P2-19 stereo_panning FALSE, TRUE ;;; octave 2 note A_,2 note F_,6 stereo_panning TRUE, TRUE ;;; octave 4 note F_,6 note E_,1 note D#,1 ; P2-20 note D_,8 stereo_panning FALSE, TRUE ;;; octave 3 note C_,2 octave 2 note A_,6 ; P2-21 note B_,6 note G_,2 note_type 8, 12, 7 note F_,4 note G_,4 note F_,4 ; P2-22 stereo_panning TRUE, TRUE ;;; octave 3 note G_,9 note B_,3 octave 4 note D_,12 ; P2-23 octave 3 note D_,4 note C_,4 note D_,4 octave 4 note F_,4 note E_,4 note F_,4 ; P2-24 note G_,9 note A#,3 note G_,12 ; P2-25 note G_,12 note A_,12 ; P2-26 note A#,9 note F_,3 note F_,12 ; P2-27 stereo_panning FALSE, TRUE ;;; octave 3 note D_,12 stereo_panning TRUE, TRUE ;;; octave 4 note A#,6 note B_,6 ; P2-28 octave 5 note C_,9 octave 4 note G_,3 note G_,12 ; P2-29 stereo_panning FALSE, TRUE ;;; octave 3 note E_,12 stereo_panning TRUE, TRUE ;;; octave 5 note C_,6 note C#,6 ; P2-30 note_type 12, 12, 7 stereo_panning TRUE, FALSE ;;; note D_,1 octave 3 note A_,1 stereo_panning FALSE, TRUE ;;; octave 4 note D_,1 note A_,1 stereo_panning TRUE, FALSE ;;; note D_,1 octave 3 note A_,1 stereo_panning FALSE, TRUE ;;; octave 4 note D_,1 note A_,1 stereo_panning TRUE, FALSE ;;; note D_,1 octave 3 note A_,1 stereo_panning FALSE, TRUE ;;; octave 4 note D_,1 note A_,1 stereo_panning TRUE, FALSE ;;; note D_,1 octave 3 note A_,1 stereo_panning FALSE, TRUE ;;; octave 4 note D_,1 note A_,1 ; P2-31 stereo_panning TRUE, FALSE ;;; note D_,1 octave 3 note A_,1 stereo_panning FALSE, TRUE ;;; octave 4 note D_,1 note A_,1 stereo_panning TRUE, FALSE ;;; note D_,1 octave 3 note A_,1 stereo_panning FALSE, TRUE ;;; octave 4 note D_,1 note A_,1 stereo_panning TRUE, TRUE ;;; note_type 8, 12, 7 octave 5 note C_,4 note C_,4 note C#,4 ; P2-32 note_type 12, 12, 7 stereo_panning TRUE, FALSE ;;; note D_,1 octave 3 note A_,1 stereo_panning FALSE, TRUE ;;; octave 4 note D_,1 note A_,1 stereo_panning TRUE, FALSE ;;; note D_,1 octave 3 note A_,1 stereo_panning FALSE, TRUE ;;; octave 4 note D_,1 note A_,1 stereo_panning TRUE, FALSE ;;; note D_,1 octave 3 note A_,1 stereo_panning FALSE, TRUE ;;; octave 4 note D_,1 note A_,1 stereo_panning TRUE, FALSE ;;; note D_,1 octave 3 note A_,1 stereo_panning FALSE, TRUE ;;; octave 4 note D_,1 note A_,1 ; P2-31 stereo_panning TRUE, FALSE ;;; note D_,1 octave 3 note A_,1 stereo_panning FALSE, TRUE ;;; octave 4 note D_,1 note A_,1 stereo_panning TRUE, FALSE ;;; note D_,1 octave 3 note A_,1 stereo_panning FALSE, TRUE ;;; octave 4 note D_,1 note A_,1 stereo_panning TRUE, TRUE ;;; note_type 8, 12, 7 octave 5 note C_,4 note C_,4 octave 4 note A_,4 ; P2-34 note_type 12, 12, 7 octave 3 note B_,16 ; P2-35 note A_,8 note F_,6 note E_,1 note D#,1 ; P2-36 note D_,8 note G_,8 ; P2-37 note F_,8 note A_,8 ; P2-38 note G_,16 ; P2-39 note F_,8 octave 4 note F_,6 note E_,1 note D#,1 ; P2-40 note D_,8 octave 2 note B_,8 ; P2-41 octave 3 note C_,8 note A_,6 note F_,1 note A_,1 ; P2-42 note G_,16 ; P2-43 note G_,16 ; P2-44 octave 4 note G_,1 rest 3 note G_,1 rest 5 note G_,1 note G_,1 note G_,1 rest 3 ; P2-45 note G_,1 rest 3 note G_,4 note_type 8, 11, 3 octave 3 note F_,2 note F_,2 note F_,2 note F_,2 note F_,2 note F#,2 ; P2-46 note_type 12, 12, 2 note G_,16 sound_ret ;---------------------------------------- title2_3_Ch3: ;---------------------------------------- note_type 12, 2, 7 stereo_panning FALSE, TRUE ; P3-2 octave 3 note D_,16 ; P3-3 note D#,16 ; P3-4 note F_,16 ; P3-5 stereo_panning TRUE, TRUE note_type 12, 1, 7 ; g# octave 2 note G#,4 note D#,2 note G#,4 note D#,2 note G#,2 note D#,2 ; P3-6 octave 2 note G_,4 note D_,2 note G_,4 note D_,2 note G_,2 note D_,2 ; P3-7 note A_,4 note F_,2 note A_,4 note F_,2 note A_,2 note F_,2 ; P3-8 note G_,4 note D_,2 note G_,4 note D_,2 note G_,2 note D_,2 ; P3-9 note F_,4 note A_,2 note F_,4 note A_,2 octave 3 note C_,2 octave 2 note A_,2 ; P3-10 note G_,4 note D_,2 note G_,4 note D_,2 note G_,2 note D_,2 ; P3-11 note A_,4 note F_,2 note A_,4 note F_,2 note A_,2 octave 3 note C_,2 ; P3-12 octave 2 note B_,4 note G_,2 note B_,4 note G_,2 note B_,2 note G_,2 ; P3-13 note G_,4 note B_,2 note A_,4 note B_,2 octave 3 note C_,2 note C_,2 ; P3-14 octave 2 note G_,4 note D_,2 note G_,4 note D_,2 note G_,2 note D_,2 ; P3-15 note A_,4 note F_,2 note A_,4 note F_,2 note A_,2 octave 3 note C_,2 ; P3-16 octave 2 note B_,4 note G_,2 note B_,4 note G_,2 note B_,2 octave 3 note C_,2 ; P3-17 octave 2 note B_,4 note G_,2 note B_,4 note G_,2 octave 3 note D_,4 ; P3-18 octave 2 note G_,4 note D_,2 note G_,4 note D_,2 note G_,2 note D_,2 ; P3-19 note A_,4 note F_,2 note A_,4 note F_,2 note A_,2 octave 3 note C_,2 ; P3-20 octave 2 note B_,4 note G_,2 note B_,4 note G_,2 note B_,2 note G_,2 ; P3-21 octave 3 note D_,4 octave 2 note G_,2 octave 3 note D_,4 octave 2 note G_,2 octave 3 note D_,2 octave 2 note A_,2 ; P3-22 note G_,4 note D_,2 note G_,4 note D_,2 note G_,2 note D_,2 ; P3-23 note A_,4 note F_,2 note A_,4 note F_,2 note A_,2 octave 3 note C_,2 ; P3-24 octave 2 note B_,4 note G_,2 note B_,4 note G_,2 octave 3 note D_,2 octave 2 note G_,2 ; P3-25 note G_,2 note D_,2 note G_,2 note A_,4 note F_,2 note A_,2 octave 3 note C_,2 ; P3-26 octave 2 note A#,4 note F_,2 note A#,4 note F_,2 note A#,2 note F_,2 ; P3-27 note A#,4 note F_,2 note A#,4 note F_,2 note B_,2 note G_,2 ; P3-28 octave 3 note C_,4 octave 2 note G_,2 octave 3 note C_,4 octave 2 note G_,2 octave 3 note C_,2 octave 2 note G_,2 ; P3-29 octave 3 note C_,4 octave 2 note G_,2 octave 3 note C_,4 octave 2 note G_,2 octave 3 note C#,2 octave 2 note A_,2 ; P3-30 octave 3 note D_,1 rest 1 note A_,2 rest 2 octave 4 note D_,4 octave 3 note A_,2 rest 2 octave 5 note D_,2 ; P3-31 -tie note D_,2 octave 4 note D_,4 octave 3 note A_,2 note_type 8, 1, 7 note C_,4 note C_,4 note C#,4 ; P3-32 note_type 12, 1, 7 note D_,1 rest 1 note A_,2 rest 2 octave 5 note D_,4 octave 3 note A_,2 rest 2 octave 4 note D_,2 ; P3-33 -tie note D_,2 octave 3 note A_,2 octave 4 note C_,2 octave 3 note B_,2 note_type 8, 1, 7 note C_,4 note C_,4 note E_,2 note F#,2 ; P3-34 note_type 12, 1, 7 note G_,16 ; P3-35 note F_,16 ; P3-36 note G_,8 note D_,6 note D_,1 note E_,1 ; P3-37 note F_,2 note F_,12 note E_,1 note D#,1 ; P3-38 note D_,8 note G_,8 ; P3-39 note F_,8 note A_,8 ; P3-40 note G_,8 note D_,6 note D_,1 note E_,1 ; P3-41 note F_,16 ; P3-42 note G_,1 rest 3 note G_,1 rest 5 note G_,1 note G_,1 note G_,1 rest 3 ; P3-43 note G_,1 rest 3 note G_,1 rest 5 note G_,1 note G_,1 note G_,1 rest 3 ; P3-44 octave 2 note G_,1 rest 3 note G_,1 rest 5 note G_,1 note G_,1 note G_,1 rest 3 ; P3-45 note G_,1 rest 3 note G_,1 rest 3 note_type 8, 1, 7 note F_,2 note F_,2 note F_,2 note F_,2 note F_,2 note A_,2 ; P3-46 note_type 12, 1, 7 note G_,1 rest 15 sound_ret ;---------------------------------------- title2_3_Ch4: ;---------------------------------------- toggle_noise 0 drum_speed 12 ; P4-2 rest 16 ; P4-3 rest 16 ; P4-4 rest 16 ; P4-5 rest 8 octave 1 drum_note 2,1 rest 1 drum_note 2,1 rest 1 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 ; P4-6 drum_note 2,1 rest 1 stereo_panning TRUE, FALSE drum_note 6,1 rest 1 stereo_panning TRUE, TRUE drum_note 2,1 rest 1 stereo_panning TRUE, FALSE drum_note 6,1 rest 1 stereo_panning FALSE, TRUE drum_note 8,1 stereo_panning TRUE, TRUE rest 1 drum_note 2,1 drum_note 2,1 drum_note 2,1 rest 1 stereo_panning TRUE, FALSE drum_note 6,1 rest 1 ; P4-7 stereo_panning TRUE, TRUE drum_note 2,1 rest 1 stereo_panning TRUE, FALSE drum_note 6,1 rest 1 stereo_panning TRUE, TRUE drum_note 2,1 rest 1 stereo_panning FALSE, TRUE drum_note 8,1 rest 1 stereo_panning TRUE, FALSE drum_note 6,1 rest 1 stereo_panning TRUE, TRUE drum_note 2,1 drum_note 2,1 drum_note 2,1 rest 1 stereo_panning TRUE, FALSE drum_note 6,1 rest 1 ; P4-8 stereo_panning TRUE, TRUE drum_note 2,1 rest 1 stereo_panning TRUE, FALSE drum_note 6,1 rest 1 stereo_panning TRUE, TRUE drum_note 2,1 rest 1 stereo_panning FALSE, TRUE drum_note 8,1 rest 1 stereo_panning TRUE, FALSE drum_note 6,1 rest 1 stereo_panning TRUE, TRUE drum_note 2,1 drum_note 2,1 drum_note 2,1 rest 1 stereo_panning TRUE, FALSE drum_note 6,1 rest 1 ; P4-9 stereo_panning TRUE, TRUE drum_note 2,1 rest 1 stereo_panning TRUE, FALSE drum_note 6,1 rest 1 stereo_panning TRUE, TRUE drum_note 2,1 rest 1 stereo_panning TRUE, FALSE drum_note 6,1 rest 1 stereo_panning TRUE, FALSE drum_note 6,1 rest 1 stereo_panning TRUE, TRUE drum_note 2,1 drum_note 2,1 drum_note 2,1 rest 1 drum_speed 6 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 ; P4-10 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-11 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-12 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-13 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 drum_note 6,2 stereo_panning TRUE, TRUE rest 2 drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 ; P4-14 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-15 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 drum_note 2,2 rest 2 ; P4-16 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-17 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 drum_note 2,2 drum_note 2,2 ; P4-18 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-19 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-20 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-21 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 ; P4-22 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-23 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-24 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 drum_note 2,2 drum_note 2,2 ; P4-25 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 ; P4-26 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-27 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-28 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning FALSE, TRUE drum_note 8,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 ; P4-29 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 rest 2 drum_note 2,2 rest 2 stereo_panning TRUE, FALSE drum_note 6,2 rest 2 stereo_panning TRUE, TRUE drum_note 2,2 drum_note 2,2 drum_note 2,2 drum_note 2,2 drum_note 2,2 drum_note 2,2 ; P4-30 drum_note 2,2 rest 2 drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 drum_note 2,2 drum_note 2,2 ; P4-31 drum_note 2,2 rest 2 drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 2 drum_note 2,2 drum_note 2,2 drum_speed 8 drum_note 2,2 rest 2 drum_note 2,2 rest 2 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 ; P4-32 drum_speed 12 drum_note 2,1 rest 1 drum_note 2,1 drum_note 2,1 drum_note 2,1 rest 1 drum_note 2,1 drum_note 2,1 drum_note 2,1 rest 1 drum_note 2,1 drum_note 2,1 drum_note 2,1 rest 1 drum_note 2,1 drum_note 2,1 ; P4-33 drum_note 2,1 rest 1 drum_note 2,1 drum_note 2,1 drum_note 2,1 rest 1 drum_note 2,1 drum_note 2,1 drum_speed 8 drum_note 2,2 rest 2 drum_note 2,2 rest 2 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 ; P4-34 drum_note 5,12 drum_speed 12 rest 8 ; P4-35 rest 16 ; P4-36 rest 16 ; P4-37 rest 16 ; P4-38 rest 16 ; P4-39 rest 16 ; P4-40 rest 16 ; P4-41 rest 12 drum_speed 6 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 ; P4-42 drum_note 2,2 rest 6 drum_note 2,2 rest 10 drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 6 ; P4-43 drum_note 2,2 rest 6 drum_note 2,2 rest 10 drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 6 ; P4-44 drum_note 2,2 rest 6 drum_note 2,2 rest 10 drum_note 2,2 drum_note 2,2 drum_note 2,2 rest 6 ; P4-45 drum_note 2,2 rest 6 drum_note 2,2 rest 6 drum_speed 8 drum_note 2,2 drum_note 2,2 drum_note 2,2 drum_speed 6 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 drum_note 2,1 ; P4-46 drum_note 2,8 drum_speed 12 rest 12 sound_ret
cards/bn4/ModCards/134-D022 Charge WideSht1 (0E).asm
RockmanEXEZone/MMBN-Mod-Card-Kit
10
166028
<filename>cards/bn4/ModCards/134-D022 Charge WideSht1 (0E).asm .include "defaults_mod.asm" table_file_jp equ "exe4-utf8.tbl" table_file_en equ "bn4-utf8.tbl" game_code_len equ 3 game_code equ 0x4234574A // B4WJ game_code_2 equ 0x42345745 // B4WE game_code_3 equ 0x42345750 // B4WP card_type equ 1 card_id equ 52 card_no equ "052" card_sub equ "Mod Card 052" card_sub_x equ 64 card_desc_len equ 2 card_desc_1 equ "Address 0E" card_desc_2 equ "Charge WideSht1" card_desc_3 equ "" card_name_jp_full equ "チャージワイドショット1" card_name_jp_game equ "チャージワイドショット1" card_name_en_full equ "Charge WideSht1" card_name_en_game equ "Charge WideSht1" card_address equ "0E" card_address_id equ 4 card_bug equ 0 card_wrote_en equ "Charge WideSht1" card_wrote_jp equ "チャージワイドショット1"
ada-containers-indefinite_multiway_trees.ads
mgrojo/adalib
15
10801
-- Standard Ada library specification -- Copyright (c) 2004-2016 AXE Consultants -- Copyright (c) 2004, 2005, 2006 Ada-Europe -- Copyright (c) 2000 The MITRE Corporation, Inc. -- Copyright (c) 1992, 1993, 1994, 1995 Intermetrics, Inc. -- SPDX-License-Identifier: BSD-3-Clause and LicenseRef-AdaReferenceManual --------------------------------------------------------------------------- with Ada.Iterator_Interfaces; generic type Element_Type (<>) is private; with function "=" (Left, Right : Element_Type) return Boolean is <>; package Ada.Containers.Indefinite_Multiway_Trees is pragma Preelaborate(Indefinite_Multiway_Trees); pragma Remote_Types(Indefinite_Multiway_Trees); type Tree is tagged private with Constant_Indexing => Constant_Reference, Variable_Indexing => Reference, Default_Iterator => Iterate, Iterator_Element => Element_Type; pragma Preelaborable_Initialization(Tree); type Cursor is private; pragma Preelaborable_Initialization(Cursor); Empty_Tree : constant Tree; No_Element : constant Cursor; function Has_Element (Position : Cursor) return Boolean; package Tree_Iterator_Interfaces is new Ada.Iterator_Interfaces (Cursor, Has_Element); function Equal_Subtree (Left_Position : Cursor; Right_Position: Cursor) return Boolean; function "=" (Left, Right : Tree) return Boolean; function Is_Empty (Container : Tree) return Boolean; function Node_Count (Container : Tree) return Count_Type; function Subtree_Node_Count (Position : Cursor) return Count_Type; function Depth (Position : Cursor) return Count_Type; function Is_Root (Position : Cursor) return Boolean; function Is_Leaf (Position : Cursor) return Boolean; function Root (Container : Tree) return Cursor; procedure Clear (Container : in out Tree); function Element (Position : Cursor) return Element_Type; procedure Replace_Element (Container : in out Tree; Position : in Cursor; New_Item : in Element_Type); procedure Query_Element (Position : in Cursor; Process : not null access procedure (Element : in Element_Type)); procedure Update_Element (Container : in out Tree; Position : in Cursor; Process : not null access procedure (Element : in out Element_Type)); type Constant_Reference_Type (Element : not null access constant Element_Type) is private with Implicit_Dereference => Element; type Reference_Type (Element : not null access Element_Type) is private with Implicit_Dereference => Element; function Constant_Reference (Container : aliased in Tree; Position : in Cursor) return Constant_Reference_Type; function Reference (Container : aliased in out Tree; Position : in Cursor) return Reference_Type; procedure Assign (Target : in out Tree; Source : in Tree); function Copy (Source : Tree) return Tree; procedure Move (Target : in out Tree; Source : in out Tree); procedure Delete_Leaf (Container : in out Tree; Position : in out Cursor); procedure Delete_Subtree (Container : in out Tree; Position : in out Cursor); procedure Swap (Container : in out Tree; I, J : in Cursor); function Find (Container : Tree; Item : Element_Type) return Cursor; function Find_In_Subtree (Position : Cursor; Item : Element_Type) return Cursor; function Ancestor_Find (Position : Cursor; Item : Element_Type) return Cursor; function Contains (Container : Tree; Item : Element_Type) return Boolean; procedure Iterate (Container : in Tree; Process : not null access procedure (Position : in Cursor)); procedure Iterate_Subtree (Position : in Cursor; Process : not null access procedure (Position : in Cursor)); function Iterate (Container : in Tree) return Tree_Iterator_Interfaces.Forward_Iterator'Class; function Iterate_Subtree (Position : in Cursor) return Tree_Iterator_Interfaces.Forward_Iterator'Class; function Child_Count (Parent : Cursor) return Count_Type; function Child_Depth (Parent, Child : Cursor) return Count_Type; procedure Insert_Child (Container : in out Tree; Parent : in Cursor; Before : in Cursor; New_Item : in Element_Type; Count : in Count_Type := 1); procedure Insert_Child (Container : in out Tree; Parent : in Cursor; Before : in Cursor; New_Item : in Element_Type; Position : out Cursor; Count : in Count_Type := 1); procedure Prepend_Child (Container : in out Tree; Parent : in Cursor; New_Item : in Element_Type; Count : in Count_Type := 1); procedure Append_Child (Container : in out Tree; Parent : in Cursor; New_Item : in Element_Type; Count : in Count_Type := 1); procedure Delete_Children (Container : in out Tree; Parent : in Cursor); procedure Copy_Subtree (Target : in out Tree; Parent : in Cursor; Before : in Cursor; Source : in Cursor); procedure Splice_Subtree (Target : in out Tree; Parent : in Cursor; Before : in Cursor; Source : in out Tree; Position : in out Cursor); procedure Splice_Subtree (Container: in out Tree; Parent : in Cursor; Before : in Cursor; Position : in Cursor); procedure Splice_Children (Target : in out Tree; Target_Parent : in Cursor; Before : in Cursor; Source : in out Tree; Source_Parent : in Cursor); procedure Splice_Children (Container : in out Tree; Target_Parent : in Cursor; Before : in Cursor; Source_Parent : in Cursor); function Parent (Position : Cursor) return Cursor; function First_Child (Parent : Cursor) return Cursor; function First_Child_Element (Parent : Cursor) return Element_Type; function Last_Child (Parent : Cursor) return Cursor; function Last_Child_Element (Parent : Cursor) return Element_Type; function Next_Sibling (Position : Cursor) return Cursor; function Previous_Sibling (Position : Cursor) return Cursor; procedure Next_Sibling (Position : in out Cursor); procedure Previous_Sibling (Position : in out Cursor); procedure Iterate_Children (Parent : in Cursor; Process : not null access procedure (Position : in Cursor)); procedure Reverse_Iterate_Children (Parent : in Cursor; Process : not null access procedure (Position : in Cursor)); function Iterate_Children (Container : in Tree; Parent : in Cursor) return Tree_Iterator_Interfaces.Reversible_Iterator'Class; private -- not specified by the language end Ada.Containers.Indefinite_Multiway_Trees;
Scrip.Compiler/Scrip.g4
dotn8/scrip
0
5917
<reponame>dotn8/scrip grammar Scrip; paragraphs : paragraph (PARAGRAPH_SEP+ paragraph)*; PARAGRAPH_SEP : '\r\n'; paragraph : block*?; block : text | codeBlock | italics | bold | underline | strikeout | literal | heading | textbox | checkedCheckbox | uncheckedCheckbox | quotation | hashtag | mention | table | (orderedItem block*?) | (unorderedItem block*?) ; orderedItem : ORDERED_ITEM_DELIMITER block+; ORDERED_ITEM_DELIMITER : [0-9]+ '. '; unorderedItem : '- ' block+; textbox : TEXTBOX; TEXTBOX : '_' '_'+; uncheckedCheckbox : UNCHECKED_CHECKBOX; UNCHECKED_CHECKBOX : '[ ]'; checkedCheckbox : CHECKED_CHECKBOX; CHECKED_CHECKBOX : '[x]'; quotation : QUOTATION; QUOTATION : '"""' .*? QUOTATION_AUTHOR? '"""'; QUOTATION_AUTHOR : (' ' | '\n' | '\t')+ '--' (~(' ' | '\n' | '\t')+ | MENTION); //parens : PARENS_OPEN block* PARENS_CLOSE; //PARENS_OPEN : '('; //PARENS_CLOSE : ')'; text : TEXT; TEXT : (. | ' / ' | ~' ' '/' ~' ' | ' * ' | ~' ' '*' ~' ' | ' ' '-'+ ' ' | ~' ' '-'+ ~' ' )+?; italics : '/' block* '/'; bold : '*' block* '*'; underline : '_' block* '_'; strikeout : '-' block* '-'; mention : MENTION; MENTION : '@' [a-zA-Z]+; literal : LITERAL; LITERAL : '`' .*? '`'; heading : '#'+ block*? ('\r\n' | '\n'); codeBlock : CODE_BLOCK_DELIMITER_START .+? CODE_BLOCK_DELIMITER_STOP; CODE_BLOCK_DELIMITER_START : '#!'; CODE_BLOCK_DELIMITER_STOP : '!#'; table : tableRow+; tableRow : '|' tableCell ('|' tableCell)* '\r\n'; tableCell : block*?; hashtag : HASHTAG_WITH_PARAMETERS | HASHTAG_WITHOUT_PARAMETERS; HASHTAG_WITH_PARAMETERS : '#' [a-zA-Z]+ '{' .*? ('|' .*?)*? '}'; HASHTAG_WITHOUT_PARAMETERS : '#' [a-zA-Z]+;
Transynther/x86/_processed/NONE/_xt_/i7-8650U_0xd2_notsx.log_115_1797.asm
ljhsiun2/medusa
9
91442
.global s_prepare_buffers s_prepare_buffers: push %r10 push %r11 push %r15 push %r8 push %rbp push %rcx push %rdi push %rsi lea addresses_UC_ht+0x9712, %r15 nop and %r11, %r11 movl $0x61626364, (%r15) nop nop xor %rbp, %rbp lea addresses_D_ht+0x173aa, %rsi lea addresses_D_ht+0x5e32, %rdi clflush (%rdi) nop nop cmp %r11, %r11 mov $28, %rcx rep movsw nop nop nop add %r11, %r11 lea addresses_A_ht+0xd9c2, %r11 nop nop cmp $52451, %rbp mov (%r11), %edi nop nop nop nop nop cmp $35296, %r10 lea addresses_WC_ht+0x12ace, %rbp add %rcx, %rcx mov $0x6162636465666768, %rsi movq %rsi, (%rbp) nop xor %rsi, %rsi lea addresses_WC_ht+0x9b11, %rsi lea addresses_normal_ht+0x1e27a, %rdi nop nop and $33252, %r10 mov $30, %rcx rep movsb nop nop nop nop add $3840, %r10 lea addresses_WT_ht+0x1e9ba, %rdi nop nop nop nop nop sub %rcx, %rcx mov $0x6162636465666768, %r10 movq %r10, (%rdi) nop nop nop dec %r10 lea addresses_D_ht+0xe7ba, %rsi lea addresses_A_ht+0x1cf9a, %rdi nop nop sub $33444, %r11 mov $22, %rcx rep movsq nop nop nop and %r15, %r15 lea addresses_D_ht+0x1e67a, %rbp nop nop sub $735, %r10 mov (%rbp), %ecx xor $39858, %r15 lea addresses_D_ht+0x11afa, %rdi clflush (%rdi) nop nop nop nop nop and $10309, %rbp mov (%rdi), %r10d cmp $11666, %r10 lea addresses_normal_ht+0xa5ba, %rsi lea addresses_WC_ht+0x1acba, %rdi nop nop nop nop nop cmp %r8, %r8 mov $67, %rcx rep movsl nop dec %rsi lea addresses_UC_ht+0x71ba, %r10 clflush (%r10) sub %rsi, %rsi movb $0x61, (%r10) nop nop nop nop nop sub %rdi, %rdi lea addresses_normal_ht+0xb1ba, %rdi nop xor %r15, %r15 movw $0x6162, (%rdi) sub %rbp, %rbp lea addresses_WC_ht+0x2bfa, %rbp clflush (%rbp) nop nop nop nop xor $41866, %r8 movl $0x61626364, (%rbp) nop add $51942, %r11 lea addresses_WC_ht+0x12892, %r11 nop nop nop cmp $7318, %rdi mov $0x6162636465666768, %r10 movq %r10, %xmm7 movups %xmm7, (%r11) nop nop nop nop sub $62706, %rcx lea addresses_WC_ht+0x6bd2, %rsi clflush (%rsi) nop nop nop nop xor %r10, %r10 mov (%rsi), %rbp nop nop nop nop dec %r11 pop %rsi pop %rdi pop %rcx pop %rbp pop %r8 pop %r15 pop %r11 pop %r10 ret .global s_faulty_load s_faulty_load: push %r10 push %r11 push %r12 push %r8 push %rdi // Faulty Load lea addresses_WC+0xb1ba, %rdi inc %r12 mov (%rdi), %r10 lea oracles, %r8 and $0xff, %r10 shlq $12, %r10 mov (%r8,%r10,1), %r10 pop %rdi pop %r8 pop %r12 pop %r11 pop %r10 ret /* <gen_faulty_load> [REF] {'OP': 'LOAD', 'src': {'type': 'addresses_WC', 'size': 8, 'AVXalign': False, 'NT': False, 'congruent': 0, 'same': False}} [Faulty Load] {'OP': 'LOAD', 'src': {'type': 'addresses_WC', 'size': 8, 'AVXalign': False, 'NT': False, 'congruent': 0, 'same': True}} <gen_prepare_buffer> {'OP': 'STOR', 'dst': {'type': 'addresses_UC_ht', 'size': 4, 'AVXalign': False, 'NT': False, 'congruent': 2, 'same': True}} {'OP': 'REPM', 'src': {'type': 'addresses_D_ht', 'congruent': 3, 'same': False}, 'dst': {'type': 'addresses_D_ht', 'congruent': 3, 'same': False}} {'OP': 'LOAD', 'src': {'type': 'addresses_A_ht', 'size': 4, 'AVXalign': False, 'NT': False, 'congruent': 3, 'same': False}} {'OP': 'STOR', 'dst': {'type': 'addresses_WC_ht', 'size': 8, 'AVXalign': False, 'NT': False, 'congruent': 1, 'same': False}} {'OP': 'REPM', 'src': {'type': 'addresses_WC_ht', 'congruent': 0, 'same': False}, 'dst': {'type': 'addresses_normal_ht', 'congruent': 5, 'same': True}} {'OP': 'STOR', 'dst': {'type': 'addresses_WT_ht', 'size': 8, 'AVXalign': False, 'NT': False, 'congruent': 9, 'same': False}} {'OP': 'REPM', 'src': {'type': 'addresses_D_ht', 'congruent': 8, 'same': False}, 'dst': {'type': 'addresses_A_ht', 'congruent': 1, 'same': True}} {'OP': 'LOAD', 'src': {'type': 'addresses_D_ht', 'size': 4, 'AVXalign': False, 'NT': False, 'congruent': 6, 'same': True}} {'OP': 'LOAD', 'src': {'type': 'addresses_D_ht', 'size': 4, 'AVXalign': False, 'NT': False, 'congruent': 5, 'same': False}} {'OP': 'REPM', 'src': {'type': 'addresses_normal_ht', 'congruent': 10, 'same': False}, 'dst': {'type': 'addresses_WC_ht', 'congruent': 7, 'same': False}} {'OP': 'STOR', 'dst': {'type': 'addresses_UC_ht', 'size': 1, 'AVXalign': False, 'NT': False, 'congruent': 11, 'same': True}} {'OP': 'STOR', 'dst': {'type': 'addresses_normal_ht', 'size': 2, 'AVXalign': False, 'NT': False, 'congruent': 11, 'same': True}} {'OP': 'STOR', 'dst': {'type': 'addresses_WC_ht', 'size': 4, 'AVXalign': True, 'NT': False, 'congruent': 5, 'same': False}} {'OP': 'STOR', 'dst': {'type': 'addresses_WC_ht', 'size': 16, 'AVXalign': False, 'NT': False, 'congruent': 3, 'same': False}} {'OP': 'LOAD', 'src': {'type': 'addresses_WC_ht', 'size': 8, 'AVXalign': True, 'NT': False, 'congruent': 3, 'same': False}} {'38': 115} 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 38 */
erl.Oracle.TnsNames/ANTLR/TnsNamesParser.g4
espenrl/TnsNames
6
3175
parser grammar TnsNamesParser; options { tokenVocab = TnsNamesLexer; } configuration_file : ( parameter )* ; parameter : keyword EQUALS parameterValue; parameterValue : scalar=value #scalarParameterValue | LEFT_PAREN valueList+=value ( COMMA valueList+=value )* RIGHT_PAREN #valueListParameterValue | ( LEFT_PAREN parameterList+=parameter RIGHT_PAREN )+ #parameterListParameterValue ; keyword : WORD ; value : content=WORD | SINGLE_QUOTE content=WORD SINGLE_QUOTE | DOUBLE_QUOTE content=WORD DOUBLE_QUOTE ;
ASM/src/song_fix.asm
ActuallyAdasi/OoT-Randomizer
289
165824
;================================================================================================== ; Fixes songs in certain scenes to allow for various song learning function to properly play ; through their scripts. ;================================================================================================== suns_song_fix_event: addu at, at, s3 addi t7, r0, 0x0047 bne t7, t2, @@return lui v0, 0x8012 lw v0, 0xA5D4(v0) lw t7, 0x00A4(s3) sra t7, t7, 8 bnez v0, @@child li v0, 0x4830 bne t7, v0, @@return nop addiu t9, r0, 0x0003 b @@return @@child: li v0, 0x6311 bne t7, v0, @@return nop addiu t9, r0, 0x0003 @@return: jr ra nop suns_song_fix: lw t5, 0x8AA0(t5) li v0, 0x8000 beq v0, t5, @@check_suns_status nop b @@return @@check_suns_status: li t7, 0x801D84A0 lb v0, 0x1CBF(t7) andi v0, 0x0001 beqz v0, @@disable_suns nop b @@return @@disable_suns: li v0, 0x0001 sb v0, 0x1CBF(t7) @@return: jr ra nop ;================================================================================================== warp_song_fix: addu at, at, s3 lui v0, 0x8012 lw v0, 0xA5D4(v0) lw t7, 0x00A4(s3) sra t7, t7, 8 bnez v0, @@child li v0, 0x4830 bne t7, v0, @@return nop addiu t9, r0, 0x0003 b @@return @@child: li v0, 0x6311 bne t7, v0, @@return nop addiu t9, r0, 0x0003 @@return: jr ra nop ;================================================================================================== ; Change Epona check for owning or being able to play the song ;================================================================================================== Check_Has_Epona_Song: ; If not Epona owned flag, then return result li at, 0x18 bne a0, at, @@return nop ; If epona is owned, then return True bnez v0, @@return nop li t2, SAVE_CONTEXT ; Check if has Epona's Song lb t0, 0xA6(t2) andi t0, t0, 0x20 beqz t0, @@return ; Return False if no song li v0, 0 ; Check if has Ocarina li v0, 1 lb t0, 0x7B(t2) li t1, 0x07 ; Fairy ocarina beq t0, t1, @@return li t2, 0x08 ; Ocarina of Time beq t0, t2, @@return ; Return True if song & (fairy or oot) ocarina nop li v0, 0 ; Else False @@return: jr ra nop
test/pipeline_output/test_pipeline_output.adb
charlie5/aShell
11
18967
with Shell.Commands, Ada.Text_IO; procedure Test_Pipeline_Output is use Ada.Text_IO; begin Put_Line ("Begin 'Pipeline_Output' test."); New_Line (2); declare use Shell, Shell.Commands, Shell.Commands.Forge; Commands : Command_Array := To_Commands ("ps -A | grep bash | wc"); Output : constant String := +Output_Of (Run (Commands)); begin Put_Line ("'" & Output & "'"); end; New_Line (2); Put_Line ("End 'Pipeline_Output' test."); end Test_Pipeline_Output;
programs/oeis/265/A265029.asm
karttu/loda
0
18507
; A265029: First differences of A264619. ; 6,14,10,42,20,14,20,146,40,28,40,22,40,28,40,546,80,56,80,44,80,56,80,38,80,56,80,44,80,56,80,2114,160,112,160,88,160,112,160,76,160,112,160,88,160,112,160,70,160,112,160,88,160,112,160,76,160,112,160,88,160,112,160,8322,320,224,320,176,320,224,320,152,320,224,320,176,320,224,320,140,320,224,320,176,320,224,320,152,320,224,320,176,320,224,320,134,320,224,320,176,320,224,320,152,320,224,320,176,320,224,320,140,320,224,320,176,320,224,320,152,320,224,320,176,320,224,320,33026,640,448,640,352,640,448,640,304,640,448,640,352,640,448,640,280,640,448,640,352,640,448,640,304,640,448,640,352,640,448,640,268,640,448,640,352,640,448,640,304,640,448,640,352,640,448,640,280,640,448,640,352,640,448,640,304,640,448,640,352,640,448,640,262,640,448,640,352,640,448,640,304,640,448,640,352,640,448,640,280,640,448,640,352,640,448,640,304,640,448,640,352,640,448,640,268,640,448,640,352,640,448,640,304,640,448,640,352,640,448,640,280,640,448,640,352,640,448,640,304,640,448 mov $3,2 mov $5,$0 lpb $3,1 mov $0,$5 sub $3,1 add $0,$3 cal $0,264619 ; a(0) = 1; for n>0, working in binary, write n followed by 1 then n-reversed (including leading zeros); show result in base 10. mov $2,$3 mov $4,$0 div $4,2 lpb $2,1 mov $1,$4 sub $2,1 lpe lpe lpb $5,1 sub $1,$4 mov $5,0 lpe sub $1,3 mul $1,2 add $1,6
src/tests/ahven/ahven-text_runner.adb
RREE/ada-util
60
19841
<reponame>RREE/ada-util -- -- Copyright (c) 2007-2009 <NAME> <<EMAIL>> -- -- Permission to use, copy, modify, and 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 Ada.Text_IO; with Ada.Strings.Fixed; with Ada.Characters.Latin_1; with Ada.IO_Exceptions; with Ahven.Runner; with Ahven.XML_Runner; with Ahven.AStrings; use Ada.Text_IO; use Ada.Strings.Fixed; package body Ahven.Text_Runner is use Ahven.Results; use Ahven.Framework; use Ahven.AStrings; -- Local procedures procedure Pad (Level : Natural); procedure Print_Test (Info : Result_Info; Level : Natural; Result : String); procedure Print_Passes (Result : Result_Collection; Level : Natural); procedure Report_Results (Result : Result_Collection; Verbose : Boolean := False); procedure Print_Log_File (Filename : String); procedure Pad (Level : Natural) is begin for A in Integer range 1 .. Level loop Put (" "); end loop; end Pad; procedure Pad (Amount : in Natural; Total : in out Natural) is begin for A in Natural range 1 .. Amount loop Put (" "); end loop; Total := Total + Amount; end Pad; procedure Multiline_Pad (Input : String; Level : Natural) is begin Pad (Level); for A in Input'Range loop Put (Input (A)); if (Input (A) = Ada.Characters.Latin_1.LF) and (A /= Input'Last) then Pad (Level); end if; end loop; end Multiline_Pad; procedure Print_Test (Info : Result_Info; Level : Natural; Result : String) is use Ada.Strings; Max_Output_Width : constant := 50; Max_Result_Width : constant := 7; Max_Time_Out_Width : constant := 12; subtype Result_Size is Integer range 1 .. Max_Result_Width; subtype Time_Out_Size is Integer range 1 .. Max_Time_Out_Width; procedure Print_Text (Str : String; Total : in out Natural) is begin Put (Str); Total := Total + Str'Length; end Print_Text; Msg : constant String := Get_Message (Info); Result_Out : String (Result_Size) := (others => ' '); Time_Out : String (Time_Out_Size) := (others => ' '); Total_Text : Natural := 0; begin Pad (Level + 1, Total_Text); Print_Text (Get_Routine_Name (Info), Total_Text); if Msg'Length > 0 then Print_Text (" - ", Total_Text); Print_Text (Msg, Total_Text); end if; if Total_Text < Max_Output_Width then Pad (Max_Output_Width - Total_Text, Total_Text); end if; -- If we know the name of the routine, we print it, -- the result, and the execution time. if Get_Routine_Name (Info)'Length > 0 then Move (Source => Result, Target => Result_Out, Drop => Right, Justify => Left, Pad => ' '); Move (Source => Duration'Image (Get_Execution_Time (Info)), Target => Time_Out, Drop => Right, Justify => Right, Pad => ' '); Put (" " & Result_Out); Put (" " & Time_Out & "s"); end if; if Get_Long_Message (Info)'Length > 0 then New_Line; Multiline_Pad (Get_Long_Message (Info), Level + 2); end if; New_Line; end Print_Test; type Print_Child_Proc is access procedure (Result : Result_Collection; Level : Natural); type Child_Count_Proc is access function (Result : Result_Collection) return Natural; procedure Print_Children (Result : Result_Collection; Level : Natural; Action : Print_Child_Proc; Count : Child_Count_Proc) is Child_Iter : Result_Collection_Cursor := First_Child (Result); begin loop exit when not Is_Valid (Child_Iter); if Count.all (Data (Child_Iter).all) > 0 then Action.all (Data (Child_Iter).all, Level + 1); end if; Child_Iter := Next (Child_Iter); end loop; end Print_Children; procedure Print_Statuses (Result : Result_Collection; Level : Natural; Start : Result_Info_Cursor; Action : Print_Child_Proc; Status : String; Count : Child_Count_Proc; Print_Log : Boolean) is Position : Result_Info_Cursor := Start; begin if Length (Get_Test_Name (Result)) > 0 then Pad (Level); Put_Line (To_String (Get_Test_Name (Result)) & ":"); end if; Test_Loop : loop exit Test_Loop when not Is_Valid (Position); Print_Test (Data (Position), Level, Status); if Print_Log and (Length (Get_Output_File (Data (Position))) > 0) then Print_Log_File (To_String (Get_Output_File (Data (Position)))); end if; Position := Next (Position); end loop Test_Loop; Print_Children (Result => Result, Level => Level, Action => Action, Count => Count); end Print_Statuses; -- -- Print all failures from the result collection -- and then recurse into child collections. -- procedure Print_Failures (Result : Result_Collection; Level : Natural) is begin Print_Statuses (Result => Result, Level => Level, Start => First_Failure (Result), Action => Print_Failures'Access, Status => "FAIL", Count => Failure_Count'Access, Print_Log => True); end Print_Failures; -- -- Print all skips from the result collection -- and then recurse into child collections. -- procedure Print_Skips (Result : Result_Collection; Level : Natural) is begin Print_Statuses (Result => Result, Level => Level, Start => First_Skipped (Result), Action => Print_Skips'Access, Status => "SKIPPED", Count => Skipped_Count'Access, Print_Log => True); end Print_Skips; -- -- Print all errors from the result collection -- and then recurse into child collections. -- procedure Print_Errors (Result : Result_Collection; Level : Natural) is begin Print_Statuses (Result => Result, Level => Level, Start => First_Error (Result), Action => Print_Errors'Access, Status => "ERROR", Count => Error_Count'Access, Print_Log => True); end Print_Errors; -- -- Print all passes from the result collection -- and then recurse into child collections. -- procedure Print_Passes (Result : Result_Collection; Level : Natural) is begin Print_Statuses (Result => Result, Level => Level, Start => First_Pass (Result), Action => Print_Passes'Access, Status => "PASS", Count => Pass_Count'Access, Print_Log => False); end Print_Passes; -- -- Report passes, skips, failures, and errors from the result collection. procedure Report_Results (Result : Result_Collection; Verbose : Boolean := False) is begin Put_Line ("Passed : " & Integer'Image (Pass_Count (Result))); if Verbose then Print_Passes (Result => Result, Level => 0); end if; New_Line; if Skipped_Count (Result) > 0 then Put_Line ("Skipped : " & Integer'Image (Skipped_Count (Result))); Print_Skips (Result => Result, Level => 0); New_Line; end if; if Failure_Count (Result) > 0 then Put_Line ("Failed : " & Integer'Image (Failure_Count (Result))); Print_Failures (Result => Result, Level => 0); New_Line; end if; if Error_Count (Result) > 0 then Put_Line ("Errors : " & Integer'Image (Error_Count (Result))); Print_Errors (Result => Result, Level => 0); end if; end Report_Results; procedure Print_Log_File (Filename : String) is Handle : File_Type; Char : Character := ' '; First : Boolean := True; begin Open (Handle, In_File, Filename); begin loop exit when End_Of_File (Handle); Get (Handle, Char); if First then Put_Line ("===== Output ======="); First := False; end if; Put (Char); if End_Of_Line (Handle) then New_Line; end if; end loop; -- The End_Error exception is sometimes raised. exception when Ada.IO_Exceptions.End_Error => null; end; Close (Handle); if not First then Put_Line ("===================="); end if; end Print_Log_File; procedure Do_Report (Test_Results : Results.Result_Collection; Args : Parameters.Parameter_Info) is begin if Parameters.XML_Results (Args) then XML_Runner.Report_Results (Test_Results, Parameters.Result_Dir (Args)); else Report_Results (Test_Results, Parameters.Verbose (Args)); end if; end Do_Report; procedure Run (Suite : in out Framework.Test'Class) is begin Runner.Run_Suite (Suite, Do_Report'Access); end Run; procedure Run (Suite : Framework.Test_Suite_Access) is begin Run (Suite.all); end Run; end Ahven.Text_Runner;
Transynther/x86/_processed/NONE/_xt_/i7-7700_9_0x48_notsx.log_21829_268.asm
ljhsiun2/medusa
9
27507
<filename>Transynther/x86/_processed/NONE/_xt_/i7-7700_9_0x48_notsx.log_21829_268.asm .global s_prepare_buffers s_prepare_buffers: ret .global s_faulty_load s_faulty_load: push %r10 push %r11 push %r12 push %r13 push %r15 push %rdi // Faulty Load lea addresses_D+0x5d3c, %r10 clflush (%r10) nop nop and %r15, %r15 movups (%r10), %xmm5 vpextrq $0, %xmm5, %r13 lea oracles, %r12 and $0xff, %r13 shlq $12, %r13 mov (%r12,%r13,1), %r13 pop %rdi pop %r15 pop %r13 pop %r12 pop %r11 pop %r10 ret /* <gen_faulty_load> [REF] {'OP': 'LOAD', 'src': {'same': False, 'NT': False, 'AVXalign': True, 'size': 1, 'type': 'addresses_D', 'congruent': 0}} [Faulty Load] {'OP': 'LOAD', 'src': {'same': True, 'NT': False, 'AVXalign': False, 'size': 16, 'type': 'addresses_D', 'congruent': 0}} <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 */
src/Projects/eu_projects-times-time_expressions.adb
fintatarta/eugen
0
7670
-- with Ada.Text_IO; use Ada.Text_IO; package body EU_Projects.Times.Time_Expressions is ------------- -- Extract -- ------------- function Extract (X : Symbolic_Instant_Array) return Time_Expr.Expression_Array is Result : Time_Expr.Expression_Array (X'Range); begin for I in X'Range loop Result (I) := X (I).T; end loop; return Result; end Extract; function Min (X : Symbolic_Instant_Array) return Symbolic_Instant is ((T => Time_Expr.Function_Call (Min_Function, Extract (X)))); function Max (X : Symbolic_Instant_Array) return Symbolic_Instant is ((T => Time_Expr.Function_Call (Max_Function, Extract (X)))); ---------- -- Call -- ---------- function Call (Name : Dotted_Identifier; Param : Scalar_Array) return Scalar_Type is Result : scalar_Type; begin if Name = Min_Function then Result := Param (Param'First); for I in Param'Range loop Result := Min (Result, Param (I)); end loop; elsif Name = "max" then Result := Param (Param'First); for I in Param'Range loop Result := Max (Result, Param (I)); end loop; elsif Name = "lt" then Result := (if Instant(Param (Param'First)) < Instant(Param (Param'First + 1)) then True else Untrue); elsif Name = "le" then Result := (if Instant(Param (Param'First)) <= Instant(Param (Param'First + 1)) then True else Untrue); elsif Name = "gt" then Result := (if Instant(Param (Param'First)) > Instant(Param (Param'First + 1)) then True else Untrue); elsif Name = "ge" then Result := (if Instant(Param (Param'First)) >= Instant(Param (Param'First + 1)) then True else Untrue); elsif Name = "eq" then Result := (if Param (Param'First) = Param (Param'First + 1) then True else Untrue); elsif Name = "ne" then Result := (if Param (Param'First) /= Param (Param'First + 1) then True else Untrue); elsif Name = "not" then Result := (if Param (Param'First) = Untrue then True else Untrue); elsif Name = "if" then Result := (if Param (Param'First) = True then Param (Param'First + 1) else Param (Param'First + 2)); else raise Constraint_Error; end if; return Result; end Call; -- function Image (Item : Scalar_Type) return String -- is -- begin -- return Scalar_Type'Image (Item); -- end Image; end EU_Projects.Times.Time_Expressions;
levelmovedata.asm
encukou/ti83-dex
1
174357
DEFINE P5LEVELMOVEDATA, SPACE=ROM SEGMENT P5LEVELMOVEDATA extern _Green extern _DrawPkName extern _Red extern _Select extern _Move extern _LoadPic extern _LPicBank1 extern _DrawMoveName extern _DrawMoveName_AlignRight extern _MoveList extern _LoadLevelMoves public LoadLevelMoves public LoadBreedMoves public eggmovedatastart include "header.inc" LoadLevelMoves: ; gets index in DE and keeps it there ; puts data to statVars, byte 0 = len (number of entries, multiply by 3 to get bytes), then data push DE ; ld HL,zeroes ; ld DE,statVars ; ld BC,3*8*4+1 ; LDIR pop DE push DE ld HL,lvupmovelen ; get length to BC add HL,DE ld C,(HL) xor A ld B,A ld HL,lvupmoveoffset ; get source to DE add HL,DE add HL,DE ld E,(HL) inc HL ld D,(HL) ld HL,statVars ; get destination to HL ld (HL),C ; store length byte inc HL ld A,C ; multiply C by 3 add C add C ld C,A jr z,skip_ldir ; security ex HL,DE ; swap source & destination (LDIR: HL->DE) LDIR ; load skip_ldir: ld HL,zeroes ;ld DE,statVars ld BC,3 LDIR pop DE ret LoadBreedMoves: ; gets offset in HL ; puts data to statVars, byte 0 = len (number of entries, multiply by 2 to get bytes), then data ld A,(HL) srl A srl A srl A srl A ld (statVars),A sla A jr z,skip_ldir_breed ld C,A xor A ld B,A ld DE,statVars+1 LDIR skip_ldir_breed: ld HL,zeroes ;ld DE,statVars ld BC,3 LDIR ret zeroes: ;dw [3*8*4]0,0FFh dw [3]0 lvupmoveoffset: ;dw 0 dw lvupmovedatastart+0000h,lvupmovedatastart+0021h,lvupmovedatastart+0048h,lvupmovedatastart+0072h dw lvupmovedatastart+0096h,lvupmovedatastart+00BDh,lvupmovedatastart+00F3h,lvupmovedatastart+0114h dw lvupmovedatastart+013Bh,lvupmovedatastart+0168h,lvupmovedatastart+016Eh,lvupmovedatastart+0174h dw lvupmovedatastart+0195h,lvupmovedatastart+019Bh,lvupmovedatastart+01A1h,lvupmovedatastart+01BCh dw lvupmovedatastart+01D7h,lvupmovedatastart+01F8h,lvupmovedatastart+021Ch,lvupmovedatastart+0234h dw lvupmovedatastart+0252h,lvupmovedatastart+026Dh,lvupmovedatastart+028Bh,lvupmovedatastart+02ACh dw lvupmovedatastart+02D3h,lvupmovedatastart+02F7h,lvupmovedatastart+0309h,lvupmovedatastart+0324h dw lvupmovedatastart+0345h,lvupmovedatastart+0366h,lvupmovedatastart+038Ah,lvupmovedatastart+03A8h dw lvupmovedatastart+03C9h,lvupmovedatastart+03EDh,lvupmovedatastart+040Eh,lvupmovedatastart+0435h dw lvupmovedatastart+0444h,lvupmovedatastart+0465h,lvupmovedatastart+047Ah,lvupmovedatastart+049Eh dw lvupmovedatastart+04AAh,lvupmovedatastart+04C8h,lvupmovedatastart+04F2h,lvupmovedatastart+050Dh dw lvupmovedatastart+0531h,lvupmovedatastart+0552h,lvupmovedatastart+056Dh,lvupmovedatastart+0591h dw lvupmovedatastart+05B2h,lvupmovedatastart+05E2h,lvupmovedatastart+0600h,lvupmovedatastart+062Dh dw lvupmovedatastart+064Bh,lvupmovedatastart+066Fh,lvupmovedatastart+068Dh,lvupmovedatastart+06B4h dw lvupmovedatastart+06D5h,lvupmovedatastart+0705h,lvupmovedatastart+0723h,lvupmovedatastart+073Bh dw lvupmovedatastart+0756h,lvupmovedatastart+0777h,lvupmovedatastart+0792h,lvupmovedatastart+0795h dw lvupmovedatastart+07BCh,lvupmovedatastart+07E3h,lvupmovedatastart+0807h,lvupmovedatastart+0834h dw lvupmovedatastart+0861h,lvupmovedatastart+087Fh,lvupmovedatastart+08A3h,lvupmovedatastart+08C7h dw lvupmovedatastart+08E5h,lvupmovedatastart+090Ch,lvupmovedatastart+0930h,lvupmovedatastart+095Dh dw lvupmovedatastart+098Dh,lvupmovedatastart+09AEh,lvupmovedatastart+09DEh,lvupmovedatastart+09FCh dw lvupmovedatastart+0A2Ch,lvupmovedatastart+0A4Dh,lvupmovedatastart+0A7Ah,lvupmovedatastart+0A9Bh dw lvupmovedatastart+0AB6h,lvupmovedatastart+0ADAh,lvupmovedatastart+0AF2h,lvupmovedatastart+0B19h dw lvupmovedatastart+0B37h,lvupmovedatastart+0B5Bh,lvupmovedatastart+0B76h,lvupmovedatastart+0B8Bh dw lvupmovedatastart+0BACh,lvupmovedatastart+0BD3h,lvupmovedatastart+0BFAh,lvupmovedatastart+0C1Eh dw lvupmovedatastart+0C3Fh,lvupmovedatastart+0C69h,lvupmovedatastart+0C87h,lvupmovedatastart+0CB1h dw lvupmovedatastart+0CD2h,lvupmovedatastart+0CFCh,lvupmovedatastart+0D1Ah,lvupmovedatastart+0D29h dw lvupmovedatastart+0D4Dh,lvupmovedatastart+0D80h,lvupmovedatastart+0DA7h,lvupmovedatastart+0DCBh dw lvupmovedatastart+0DE9h,lvupmovedatastart+0E07h,lvupmovedatastart+0E2Eh,lvupmovedatastart+0E4Fh dw lvupmovedatastart+0E79h,lvupmovedatastart+0E9Dh,lvupmovedatastart+0EC1h,lvupmovedatastart+0EDFh dw lvupmovedatastart+0EF7h,lvupmovedatastart+0F18h,lvupmovedatastart+0F39h,lvupmovedatastart+0F60h dw lvupmovedatastart+0F84h,lvupmovedatastart+0F9Ch,lvupmovedatastart+0FCFh,lvupmovedatastart+0FF0h dw lvupmovedatastart+101Ah,lvupmovedatastart+1038h,lvupmovedatastart+105Ch,lvupmovedatastart+107Dh dw lvupmovedatastart+10A1h,lvupmovedatastart+10AAh,lvupmovedatastart+10D1h,lvupmovedatastart+10F5h dw lvupmovedatastart+10F8h,lvupmovedatastart+1116h,lvupmovedatastart+1140h,lvupmovedatastart+1167h dw lvupmovedatastart+1191h,lvupmovedatastart+11B2h,lvupmovedatastart+11D6h,lvupmovedatastart+1203h dw lvupmovedatastart+1227h,lvupmovedatastart+1251h,lvupmovedatastart+1269h,lvupmovedatastart+1299h dw lvupmovedatastart+12B7h,lvupmovedatastart+12D2h,lvupmovedatastart+12F3h,lvupmovedatastart+1314h dw lvupmovedatastart+1338h,lvupmovedatastart+1362h,lvupmovedatastart+1386h,lvupmovedatastart+1398h dw lvupmovedatastart+13B6h,lvupmovedatastart+13DAh,lvupmovedatastart+13FEh,lvupmovedatastart+1416h dw lvupmovedatastart+1431h,lvupmovedatastart+144Fh,lvupmovedatastart+146Ah,lvupmovedatastart+1488h dw lvupmovedatastart+14A9h,lvupmovedatastart+14C7h,lvupmovedatastart+14E8h,lvupmovedatastart+1503h dw lvupmovedatastart+1524h,lvupmovedatastart+1542h,lvupmovedatastart+1563h,lvupmovedatastart+1584h dw lvupmovedatastart+15ABh,lvupmovedatastart+15D2h,lvupmovedatastart+15F0h,lvupmovedatastart+1611h dw lvupmovedatastart+1623h,lvupmovedatastart+1638h,lvupmovedatastart+1647h,lvupmovedatastart+166Bh dw lvupmovedatastart+1698h,lvupmovedatastart+16B0h,lvupmovedatastart+16CBh,lvupmovedatastart+16E0h dw lvupmovedatastart+16F8h,lvupmovedatastart+1716h,lvupmovedatastart+1728h,lvupmovedatastart+1743h dw lvupmovedatastart+1767h,lvupmovedatastart+1782h,lvupmovedatastart+1794h,lvupmovedatastart+17B2h dw lvupmovedatastart+17D9h,lvupmovedatastart+1800h,lvupmovedatastart+181Eh,lvupmovedatastart+1836h dw lvupmovedatastart+1851h,lvupmovedatastart+1875h,lvupmovedatastart+1893h,lvupmovedatastart+18B1h dw lvupmovedatastart+18D2h,lvupmovedatastart+18F3h,lvupmovedatastart+190Bh,lvupmovedatastart+192Ch dw lvupmovedatastart+194Ah,lvupmovedatastart+194Dh,lvupmovedatastart+1959h,lvupmovedatastart+197Dh dw lvupmovedatastart+1998h,lvupmovedatastart+19B9h,lvupmovedatastart+19DAh,lvupmovedatastart+19F5h dw lvupmovedatastart+1A19h,lvupmovedatastart+1A37h,lvupmovedatastart+1A55h,lvupmovedatastart+1A76h dw lvupmovedatastart+1A9Ah,lvupmovedatastart+1AAFh,lvupmovedatastart+1ACDh,lvupmovedatastart+1AF1h dw lvupmovedatastart+1B0Fh,lvupmovedatastart+1B33h,lvupmovedatastart+1B4Eh,lvupmovedatastart+1B6Fh dw lvupmovedatastart+1B87h,lvupmovedatastart+1BA8h,lvupmovedatastart+1BC6h,lvupmovedatastart+1BDEh dw lvupmovedatastart+1BF9h,lvupmovedatastart+1BFCh,lvupmovedatastart+1C17h,lvupmovedatastart+1C35h dw lvupmovedatastart+1C53h,lvupmovedatastart+1C74h,lvupmovedatastart+1C95h,lvupmovedatastart+1CB0h dw lvupmovedatastart+1CCBh,lvupmovedatastart+1CECh,lvupmovedatastart+1D0Ah,lvupmovedatastart+1D28h dw lvupmovedatastart+1D2Eh,lvupmovedatastart+1D4Fh,lvupmovedatastart+1D73h,lvupmovedatastart+1D8Eh dw lvupmovedatastart+1DACh,lvupmovedatastart+1DC7h,lvupmovedatastart+1DEBh,lvupmovedatastart+1E09h dw lvupmovedatastart+1E27h,lvupmovedatastart+1E4Bh,lvupmovedatastart+1E69h,lvupmovedatastart+1E8Dh dw lvupmovedatastart+1EB1h,lvupmovedatastart+1ECFh,lvupmovedatastart+1EEDh,lvupmovedatastart+1F08h dw lvupmovedatastart+1F29h,lvupmovedatastart+1F53h,lvupmovedatastart+1F7Dh,lvupmovedatastart+1F9Eh dw lvupmovedatastart+1FC8h,lvupmovedatastart+1FF8h,lvupmovedatastart+201Ch,lvupmovedatastart+2049h dw lvupmovedatastart+2076h,lvupmovedatastart+209Ah,lvupmovedatastart+20C7h,lvupmovedatastart+20EBh dw lvupmovedatastart+2115h,lvupmovedatastart+211Eh,lvupmovedatastart+2124h,lvupmovedatastart+2142h dw lvupmovedatastart+2148h,lvupmovedatastart+2166h,lvupmovedatastart+217Bh,lvupmovedatastart+2199h dw lvupmovedatastart+21A5h,lvupmovedatastart+21BAh,lvupmovedatastart+21D8h,lvupmovedatastart+21E4h dw lvupmovedatastart+2202h,lvupmovedatastart+222Fh,lvupmovedatastart+224Dh,lvupmovedatastart+2268h dw lvupmovedatastart+2289h,lvupmovedatastart+22A7h,lvupmovedatastart+22D1h,lvupmovedatastart+22F2h dw lvupmovedatastart+230Ah,lvupmovedatastart+2331h,lvupmovedatastart+2349h,lvupmovedatastart+236Dh dw lvupmovedatastart+2391h,lvupmovedatastart+23BEh,lvupmovedatastart+23E2h,lvupmovedatastart+23EEh dw lvupmovedatastart+2415h,lvupmovedatastart+2436h,lvupmovedatastart+2463h,lvupmovedatastart+2481h dw lvupmovedatastart+24A5h,lvupmovedatastart+24CCh,lvupmovedatastart+24EDh,lvupmovedatastart+2517h dw lvupmovedatastart+2532h,lvupmovedatastart+2556h,lvupmovedatastart+2583h,lvupmovedatastart+258Ch dw lvupmovedatastart+25ADh,lvupmovedatastart+25CBh,lvupmovedatastart+25F5h,lvupmovedatastart+260Dh dw lvupmovedatastart+2631h,lvupmovedatastart+2655h,lvupmovedatastart+267Ch,lvupmovedatastart+26A9h dw lvupmovedatastart+26CAh,lvupmovedatastart+26F4h,lvupmovedatastart+2712h,lvupmovedatastart+2739h dw lvupmovedatastart+2760h,lvupmovedatastart+278Ah,lvupmovedatastart+27B4h,lvupmovedatastart+27DEh dw lvupmovedatastart+2811h,lvupmovedatastart+2832h,lvupmovedatastart+285Ch,lvupmovedatastart+287Ah dw lvupmovedatastart+2898h,lvupmovedatastart+28AAh,lvupmovedatastart+28CBh,lvupmovedatastart+28F5h dw lvupmovedatastart+2916h,lvupmovedatastart+2937h,lvupmovedatastart+295Bh,lvupmovedatastart+297Fh dw lvupmovedatastart+29B5h,lvupmovedatastart+29D6h,lvupmovedatastart+2A03h,lvupmovedatastart+2A18h dw lvupmovedatastart+2A39h,lvupmovedatastart+2A63h,lvupmovedatastart+2A90h,lvupmovedatastart+2AABh dw lvupmovedatastart+2ACFh,lvupmovedatastart+2AF3h,lvupmovedatastart+2B14h,lvupmovedatastart+2B41h dw lvupmovedatastart+2B62h,lvupmovedatastart+2B83h,lvupmovedatastart+2BADh,lvupmovedatastart+2BDAh dw lvupmovedatastart+2BE6h,lvupmovedatastart+2BFEh,lvupmovedatastart+2C16h,lvupmovedatastart+2C37h dw lvupmovedatastart+2C55h,lvupmovedatastart+2C7Ch,lvupmovedatastart+2C9Ah,lvupmovedatastart+2CBBh dw lvupmovedatastart+2CDCh,lvupmovedatastart+2D00h,lvupmovedatastart+2D2Dh,lvupmovedatastart+2D5Ah dw lvupmovedatastart+2D72h,lvupmovedatastart+2D90h,lvupmovedatastart+2DAEh,lvupmovedatastart+2DCCh dw lvupmovedatastart+2DF3h,lvupmovedatastart+2E11h,lvupmovedatastart+2E38h,lvupmovedatastart+2E56h dw lvupmovedatastart+2E80h,lvupmovedatastart+2EA7h,lvupmovedatastart+2EC8h,lvupmovedatastart+2EF5h dw lvupmovedatastart+2F25h,lvupmovedatastart+2F28h,lvupmovedatastart+2F46h,lvupmovedatastart+2F6Dh dw lvupmovedatastart+2F88h,lvupmovedatastart+2FA3h,lvupmovedatastart+2FC1h,lvupmovedatastart+2FE2h dw lvupmovedatastart+3003h,lvupmovedatastart+3024h,lvupmovedatastart+3045h,lvupmovedatastart+3066h dw lvupmovedatastart+308Ah,lvupmovedatastart+30D5h,lvupmovedatastart+30F9h lvupmovelen: ;db 0 db 11,13,14,12,13,18,11,13,15,2,2,11,2,2,9,9,11,12,8,10,9,10,11,13,12,6,9,11,11,12,10,11,12,11,13,5,11,7,12,4,10 db 14,9,12,11,9,12,11,16,10,15,10,12,10,13,11,16,10,8,9,11,9,1,13,13,12,15,15,10,12,12,10,13,12,15,16,11,16,10,16 db 11,15,11,9,12,8,13,10,12,9,7,11,13,13,12,11,14,10,14,11,14,10,5,12,17,13,12,10,10,13,11,14,12,12,10,8,11,11,13 db 12,8,17,11,14,10,12,11,12,3,13,12,1,10,14,13,14,11,12,15,12,14,8,16,10,9,11,11,12,14,12,6,10,12,12,8,9,10,9,10 db 11,10,11,9,11,10,11,11,13,13,10,11,6,7,5,12,15,8,9,7,8,10,6,9,12,9,6,10,13,13,10,8,9,12,10,10,11,11,8,11,10,1,4 db 12,9,11,11,9,12,10,10,11,12,7,10,12,10,12,9,11,8,11,10,8,9,1,9,10,10,11,11,9,9,11,10,10,2,11,12,9,10,9,12,10,10 db 12,10,12,12,10,10,9,11,14,14,11,14,16,12,15,15,12,15,12,14,3,2,10,2,10,7,10,4,7,10,4,10,15,10,9,11,10,14,11,8 db 13,8,12,12,15,12,4,13,11,15,10,12,13,11,14,9,12,15,3,11,10,14,8,12,12,13,15,11,14,10,13,13,14,14,14,17,11,14,10 db 10,6,11,14,11,11,12,12,18,11,15,7,11,14,15,9,12,12,11,15,11,11,14,15,4,8,8,11,10,13,10,11,11,12,15,15,8,10,10 db 10,13,10,13,10,14,13,11,15,16,1,10,13,9,9,10,11,11,11,11,11,12,25,12 ;public lvupmovedatastart lvupmovedatastart: db 00000010b,00011110b,00100001b,00001000b,00011110b,00101101b,00001110b,00011110b,01001001b,00010100b,00011110b,00010110b db 00011110b,00011110b,01001101b,00011110b,00011110b,01001111b,00101000b,00011110b,01001011b,00110010b,00011000b,11100110b db 01000000b,00011110b,01001010b,01001110b,00011000b,11101011b,01011100b,00011110b,01001100b,00000010b,00011110b,00100001b db 00000010b,00011110b,00101101b,00000010b,00011110b,01001001b,00001000b,00011000b,00101101b,00001110b,00011110b,01001001b db 00010100b,00011110b,00010110b,00011110b,00011110b,01001101b,00011110b,00011110b,01001111b,00101100b,00011110b,01001011b db 00111010b,00011000b,11100110b,01001100b,00011110b,01001010b,01011110b,00011000b,11101011b,01110000b,00011110b,01001100b db 00000010b,00011110b,00010110b,00000010b,00011110b,00100001b,00000010b,00011110b,00101101b,00000010b,00011110b,01001001b db 00001000b,00011000b,00101101b,00001110b,00011110b,01001001b,00010100b,00011110b,00010110b,00011110b,00011110b,01001101b db 00011110b,00011110b,01001111b,00101100b,00011110b,01001011b,00111010b,00011000b,11100110b,01010010b,00011110b,01001010b db 01101010b,00011000b,11101011b,10000010b,00011110b,01001100b,00000010b,00011110b,00001010b,00000010b,00011110b,00101101b db 00001110b,00011110b,00110100b,00011010b,01100000b,11101000b,00011010b,00011000b,01101100b,00011110b,00100110b,00101011b db 00100110b,01011110b,01100011b,00110010b,00011000b,10111000b,00111110b,00011110b,00110101b,01001010b,00011110b,10100011b db 01010110b,00011000b,01010010b,01100010b,00011110b,01010011b,00000010b,00011110b,00001010b,00000010b,00011110b,00101101b db 00000010b,00011110b,00110100b,00001110b,00011110b,00110100b,00011010b,01100000b,11101000b,00011011b,00011000b,01101100b db 00011110b,00100110b,00101011b,00101000b,01011110b,01100011b,00110110b,00011000b,10111000b,01000100b,00011110b,00110101b db 01010010b,00011110b,10100011b,01100000b,00011000b,01010010b,01101110b,00011110b,01010011b,00000010b,01100000b,11101000b db 00000010b,01100001b,00000001b,00000010b,01011000b,01101100b,00000010b,00011110b,00001010b,00000010b,00100110b,00101011b db 00000010b,00011110b,00101101b,00000010b,00011110b,00110100b,00001110b,00011110b,00110100b,00011010b,01100000b,11101000b db 00011011b,00011000b,01101100b,00011110b,00100110b,00101011b,00101000b,01011110b,01100011b,00110110b,00011000b,10111000b db 01000100b,00011110b,00110101b,01001000b,00011000b,00010001b,01011000b,00011110b,10100011b,01101100b,00011000b,01010010b db 10000000b,00011110b,01010011b,00000010b,00011110b,00100001b,00001000b,00011110b,00100111b,00001110b,00011110b,10010001b db 00010100b,00011110b,01101110b,00011010b,00011110b,00110111b,00100100b,00011110b,00101100b,00101110b,00011000b,11100101b db 00111000b,00011000b,10110110b,01000010b,00011000b,11110000b,01010000b,00011110b,10000010b,01011110b,00011110b,00111000b db 00000010b,00011110b,00100001b,00000010b,00011110b,00100111b,00000010b,00011110b,10010001b,00001000b,00011000b,00100111b db 00001110b,00011110b,10010001b,00010100b,00011110b,01101110b,00011010b,00011110b,00110111b,00100110b,00011110b,00101100b db 00110010b,00011000b,11100101b,00111110b,00011000b,10110110b,01001010b,00011000b,11110000b,01011010b,00011110b,10000010b db 01101010b,00011110b,00111000b,00000010b,00011110b,00100001b,00000010b,00011110b,00100111b,00000010b,00011110b,10010001b db 00000010b,00011110b,01101110b,00001000b,00011000b,00100111b,00001110b,00011110b,10010001b,00010100b,00011000b,01101110b db 00011010b,00011110b,00110111b,00011110b,00100110b,00110111b,00100110b,00011110b,00101100b,00110010b,00011000b,11100101b db 00111110b,00011000b,10110110b,01010100b,00011000b,11110000b,01101110b,00011110b,10000010b,10001000b,00011110b,00111000b db 00000010b,00011110b,00100001b,00000010b,00011110b,01010001b,00000010b,00011110b,01101010b,00001110b,00011010b,01101010b db 00000010b,00011110b,01011101b,00010100b,00011110b,01011101b,00011010b,00011110b,01001101b,00011100b,00011110b,01001110b db 00011110b,00011110b,01001111b,00100100b,00011110b,00110000b,00101110b,00011110b,00010010b,00111000b,00011010b,00010000b db 01000100b,00011110b,00111100b,01010000b,00011000b,11011011b,01011110b,00000001b,00111110b,00000010b,00011110b,00101000b db 00000010b,00011110b,01010001b,00000010b,00011110b,01101010b,00001110b,00011000b,01101010b,00000010b,00011110b,00011111b db 00010100b,00011110b,00011111b,00011110b,00011110b,01110100b,00101000b,00011110b,00101001b,00110010b,00011110b,01100011b db 00111100b,00011000b,11100100b,01000110b,00011110b,00101010b,01010000b,00011110b,01100001b,01011010b,00000001b,00011011b db 00000010b,00011000b,00100001b,00001010b,00011110b,00011100b,00010010b,00011110b,00010000b,00011010b,00011110b,01100010b db 00100110b,00011110b,00010010b,00110010b,00011110b,00010001b,00111110b,00000001b,00101001b,01001110b,00011110b,01100001b db 01011110b,00011110b,01110111b,00000010b,00011000b,00100001b,00000010b,00011110b,00010000b,00000010b,00011110b,00011100b db 00001010b,00011110b,00011100b,00010010b,00011000b,00010000b,00011010b,00011110b,01100010b,00101000b,00011110b,00010010b db 00110110b,00011110b,00010001b,01000100b,00000001b,00101001b,01010110b,00011110b,01100001b,01101000b,00011110b,01110111b db 00000010b,00011000b,00100001b,00000010b,00011110b,00010000b,00000010b,00011110b,00011100b,00000010b,00011110b,01100010b db 00001010b,00011110b,00011100b,00010010b,00011000b,00010000b,00011010b,00011110b,01100010b,00101000b,00011110b,00010010b db 00110110b,00011110b,00010001b,01000100b,00000001b,00101001b,01100000b,00011110b,01100001b,01111100b,00011110b,01110111b db 00000010b,00011110b,00100001b,00000010b,00011110b,00100111b,00001110b,00011110b,01100010b,00011010b,00011110b,10011110b db 00101000b,00011110b,01110100b,00110110b,00011000b,11100100b,01000100b,00011110b,10100010b,01010010b,00000001b,00011011b db 00000010b,00011110b,00100001b,00000010b,00011110b,00100111b,00000010b,00011110b,01100010b,00001110b,00011110b,01100010b db 00011010b,00011110b,10011110b,00101000b,00011000b,10111000b,00110110b,00100110b,01110100b,00111100b,00011000b,11100100b db 01010000b,00011110b,10100010b,01100100b,00000001b,00011011b,00000010b,00011110b,00101101b,00000010b,00011110b,01000000b db 00001110b,00011110b,00101011b,00011010b,00011110b,00011111b,00100110b,00011000b,11100100b,00110010b,00000001b,01001100b db 00111110b,00011110b,01110111b,01001010b,00011110b,01000001b,01010110b,00011110b,01100001b,00000010b,00011110b,00101011b db 00000010b,00011110b,00101101b,00000010b,00011110b,01000000b,00000010b,00011110b,00011111b,00001110b,00011110b,00101011b db 00011010b,00011000b,00011111b,00110100b,00011000b,11100100b,01000000b,00011110b,01110111b,01010000b,00011110b,01000001b db 01011110b,00011110b,01100001b,00000010b,00011110b,00100011b,00000010b,00011110b,00101011b,00010000b,00011110b,00101000b db 00011010b,00011110b,00101100b,00101000b,00011110b,10001001b,00110010b,00011110b,01100111b,01000000b,00011110b,00110011b db 01001010b,00000000b,11111110b,01001010b,00000000b,11111111b,01001010b,00000001b,00000000b,01011000b,00011000b,01110010b db 00000010b,00011110b,00100011b,00000010b,00011110b,00101000b,00000010b,00011110b,00101011b,00000010b,00011110b,00101100b db 00010000b,00011110b,00101000b,00011010b,00011000b,00101100b,00101000b,00011110b,10001001b,00111000b,00011110b,01100111b db 01001100b,00011110b,00110011b,01011100b,00000000b,11111110b,01011100b,00000000b,11111111b,01011100b,00000001b,00000000b db 01110000b,00011000b,01110010b,00000010b,00011110b,00101101b,00000010b,00011110b,01010100b,00001100b,00011010b,00100111b db 00010000b,00011110b,01010110b,00010110b,00011110b,01100010b,00011110b,00011010b,01101000b,00101000b,00011010b,00010101b db 00110100b,00011010b,01010101b,00110100b,00100100b,10000001b,01000010b,00011110b,01100001b,01010010b,00011100b,01010111b db 01100100b,00011000b,01110001b,00000010b,00011000b,00100111b,00000010b,00011000b,01010101b,00000010b,00011000b,01100010b db 00000010b,00100110b,00101101b,00000010b,00011110b,01010100b,00000010b,00100110b,01010110b,00000010b,00011110b,00001010b db 00001100b,00011000b,01101111b,00010110b,00011110b,00011100b,00100010b,00011110b,00101000b,00101110b,00011110b,10100011b db 00111100b,00011110b,10000001b,01001010b,00011110b,10011010b,01011010b,00000001b,01001000b,01101010b,00011000b,11001001b db 00000010b,00011000b,01101111b,00000010b,00011110b,00001010b,00000010b,00011110b,00011100b,00001100b,00011000b,01101111b db 00010110b,00011110b,00011100b,00100010b,00011110b,00101000b,00110000b,00011110b,10100011b,01000010b,00011110b,10000001b db 01010100b,00011110b,10011010b,01101000b,00000001b,01001000b,01111100b,00011000b,11001001b,00000010b,00111110b,00100001b db 00000010b,00011110b,00101101b,00000010b,00011110b,00001010b,00010000b,00011110b,00100111b,00011000b,00011110b,00011000b db 00100010b,00011110b,00101000b,00101000b,00011110b,00101100b,00101110b,00000001b,00001110b,00111100b,00011110b,10011010b db 01001100b,00000001b,00000100b,01011110b,00000000b,11110010b,00000010b,00111110b,00100001b,00000010b,00011110b,00101101b db 00000010b,00011110b,00001010b,00010000b,00100110b,00001010b,00010000b,00011110b,00100111b,00011000b,00011110b,00011000b db 00100100b,00011110b,00101000b,00101100b,00011110b,00101100b,00110100b,00000001b,00001110b,01000100b,00011110b,10011010b db 01010110b,00000001b,00000100b,01101010b,00000000b,11110010b,00000010b,01100000b,00011100b,00000010b,00011110b,00001010b db 00000010b,00111110b,00100001b,00000010b,00011110b,00100111b,00000010b,00011010b,00011000b,00000010b,00000100b,00101000b db 00010000b,00100110b,00001010b,00101110b,10011110b,00100010b,00101110b,00100110b,00100010b,01010110b,01100001b,00010100b db 00000010b,00000000b,01000000b,00000010b,00111110b,00100001b,00000010b,00011110b,00101011b,00010000b,00011110b,01110100b db 00011000b,00011110b,00011000b,00100010b,00011110b,00101000b,00101000b,00011110b,00011110b,00101110b,00000001b,00001110b db 00111100b,00011110b,00011111b,01001100b,00000001b,00000100b,01011110b,00011110b,00100000b,00000010b,00000000b,01000000b db 00000010b,00111110b,00100001b,00000010b,00011110b,00101011b,00010000b,00100110b,00011110b,00010000b,00011110b,01110100b db 00011000b,00011110b,00011000b,00100100b,00011110b,00101000b,00101100b,00011110b,00011110b,00110100b,00000001b,00001110b db 01000100b,00011110b,00011111b,01010110b,00000001b,00000100b,01101010b,00011110b,00100000b,00000010b,00000000b,01000000b db 00000010b,00000000b,01110100b,00000010b,00111110b,00011110b,00000010b,00111110b,00100001b,00000010b,00011110b,00101000b db 00000010b,00011010b,00011000b,00010000b,00100110b,00011110b,00011100b,00100100b,00101000b,00101110b,10011110b,00100101b db 00101110b,00100110b,00100101b,01010110b,01100000b,11100000b,00000010b,00011110b,00000001b,00000010b,00011110b,00101101b db 00001010b,00011000b,11100011b,00010010b,00011110b,00101111b,00011010b,00011110b,00000011b,00100010b,00000001b,00001010b db 00101010b,00011110b,01101011b,00110010b,00011110b,01101111b,00111010b,00011110b,01110110b,01000010b,00000001b,01000010b db 01001010b,00011000b,11101100b,01010010b,00011110b,01110001b,01011010b,00000001b,00110101b,00000010b,00111000b,11101100b db 00000010b,00011110b,00000011b,00000010b,00011110b,00101111b,00000010b,00000110b,01101011b,00000010b,00011110b,01110110b db 00000010b,00011110b,00110100b,00001010b,00011110b,00100111b,00010010b,00011110b,00101110b,00011010b,00011110b,01100010b db 00100010b,00000001b,00000101b,00101010b,00011110b,01101101b,00110010b,00000001b,00011110b,00111010b,00011110b,00110101b db 01000010b,00011000b,11011011b,01001010b,00000001b,00100000b,01010010b,00011110b,01010011b,00000010b,00011000b,01101101b db 00000010b,00011000b,11011011b,00000010b,00100110b,00100111b,00000010b,00100110b,00101110b,00000010b,00011110b,00110100b db 00000010b,00011110b,01100010b,01011010b,00011000b,01010011b,00000010b,00011110b,00101111b,00001000b,00011110b,01101111b db 00010010b,00011110b,00000001b,00011100b,00011110b,00110010b,00100110b,00011000b,11001101b,00110000b,00011110b,00000011b db 00111010b,00011110b,10011100b,01000100b,00011110b,00100010b,01001110b,00000000b,01100110b,01011000b,00000001b,00110000b db 01100010b,00011110b,00100110b,11111110b,00101000b,10010010b,00000010b,00011110b,00000011b,00000010b,00011110b,00101111b db 00000010b,00011110b,00110010b,00000010b,00011110b,01101111b,00000010b,00011110b,10001101b,00001101b,00011110b,00110000b db 00010111b,00100001b,00110110b,00100000b,00011110b,00101100b,00101010b,00011110b,00010001b,00110100b,00011110b,01101101b db 00111110b,00000001b,00111010b,01001000b,00011000b,11010100b,01010010b,00000001b,00110001b,01011100b,00011110b,01110010b db 00000010b,00000001b,00110110b,00000010b,00011110b,01100111b,00000010b,00011110b,10001101b,00000010b,00011110b,00110000b db 00001101b,00011000b,00110000b,00010111b,00100001b,00110110b,00011110b,00100110b,00101100b,00100000b,00011110b,00101100b db 00101010b,00011110b,00010001b,00111000b,00011110b,01101101b,01000110b,00000001b,00111010b,01010100b,00011000b,11010100b db 01100010b,00000001b,00110001b,01110000b,00011110b,01110010b,00000010b,00011110b,01000111b,00001110b,00011000b,11100110b db 00011100b,00011110b,01001101b,00100000b,00011110b,01001110b,00100100b,00011110b,01001111b,00101110b,00011110b,00110011b db 01000000b,00011000b,11101100b,01001110b,00011110b,01010000b,01011100b,00100110b,01001100b,00000010b,00011000b,11100110b db 00000010b,00011110b,01000111b,00000010b,00011110b,01001101b,00001110b,00011000b,11100110b,00011100b,00011110b,01001101b db 00100000b,00011110b,01001110b,00100010b,00100110b,01001110b,00100100b,00011110b,01001111b,00110000b,00011110b,00110011b db 01000110b,00011000b,11101100b,01011000b,00011110b,01010000b,01101000b,00100110b,01001100b,00000010b,00000000b,01001000b db 00000010b,00000001b,00111000b,00000010b,00011000b,01000111b,00000010b,00111000b,11100110b,00000010b,00100110b,00110011b db 00000010b,00011110b,01001110b,00000010b,00100110b,01001111b,00011110b,00100110b,01001101b,00100010b,00100110b,01001110b db 00100110b,00100110b,01001111b,01011000b,00011110b,01010000b,00000010b,00011110b,00001010b,00001110b,00011110b,01001110b db 00011010b,00011000b,01001101b,00100110b,00011110b,10001101b,00110010b,00011110b,10010011b,00111110b,00011110b,10100011b db 01001010b,00011110b,01001010b,01010110b,00011000b,11001010b,01100010b,00000001b,00111000b,00000010b,00011000b,01001101b db 00000010b,00011110b,00001010b,00000010b,00011110b,01001110b,00001110b,00011110b,01001110b,00011010b,00011000b,01001101b db 00100110b,00011110b,10001101b,00101000b,00100110b,10001101b,00110110b,00011110b,10010011b,01000110b,00011110b,10100011b db 01010110b,00011110b,01001010b,01100110b,00011000b,11001010b,01110110b,00000001b,00111000b,00000010b,00011000b,11000001b db 00000010b,00011110b,00100001b,00000010b,00011110b,00110010b,00010010b,00011010b,00110000b,00100010b,00011010b,01011101b db 00101000b,00011110b,01001101b,00110010b,00011110b,10001101b,00111000b,00011110b,01001110b,01000010b,00011110b,00111100b db 01001000b,00011110b,01001111b,01010010b,00011110b,01011110b,00000010b,00000001b,00111110b,00000010b,00011000b,11000001b db 00000010b,00011010b,00110000b,00000010b,00011110b,00100001b,00000010b,00011110b,00110010b,00010010b,00011000b,00110000b db 00100010b,00011010b,01011101b,00101000b,00011110b,01001101b,00110000b,00100100b,01001101b,00110010b,00011110b,10001101b db 00110110b,00100100b,10001101b,00111000b,00011110b,01001110b,00111110b,00011000b,00010000b,01001000b,00011110b,00111100b db 01010100b,00011100b,01001111b,01101000b,00011100b,01011110b,00000010b,00011110b,00001010b,00000010b,00011110b,00011100b db 00001010b,00011110b,00101101b,00010010b,00011000b,11011110b,00100010b,00011110b,01011011b,00101010b,01100000b,10011010b db 00110010b,00000000b,10111101b,01000010b,00011110b,10100011b,01010010b,00011110b,01011001b,01100010b,00011000b,01011010b db 00000010b,00001000b,10100001b,00000010b,00011110b,00001010b,00000010b,00011110b,00101101b,00000010b,00011110b,00011100b db 00001010b,00011110b,00101101b,00010010b,00011000b,11011110b,00010010b,00111000b,11011110b,00100010b,00011110b,01011011b db 00100110b,00100110b,01011011b,00101010b,01100000b,10011010b,00110010b,00000000b,10111101b,00110100b,00000001b,01001000b db 01001100b,00011110b,10100011b,01100110b,00011110b,01011001b,10000000b,00011000b,01011010b,00000010b,00011110b,00001010b db 00000010b,00011110b,00101101b,00010110b,10011110b,00101100b,00101000b,11011110b,00000110b,00111001b,00011000b,10111001b db 01000111b,00011110b,01100111b,01010011b,00111110b,10011010b,01011010b,01100000b,11001111b,01011101b,00111110b,10100011b db 01100101b,00100000b,11111100b,00000010b,00011110b,00001010b,00000010b,00011110b,00101100b,00000010b,00011110b,00101101b db 00010110b,10011110b,00101100b,00101000b,11011110b,00000110b,00110000b,00100110b,01100111b,00111011b,00011000b,10111001b db 01001101b,00011110b,01100111b,01011101b,00011110b,10011010b,01101011b,00011110b,10100011b,01110111b,00000000b,11111100b db 01111010b,01100000b,11001111b,00000010b,00000001b,01011010b,00000010b,00011110b,00001010b,00000010b,00100100b,10000101b db 00001010b,00011110b,00100111b,00010100b,00011110b,00110010b,00100000b,00011110b,01011101b,00101110b,00011000b,01100111b db 00111110b,00011000b,11110100b,01010000b,00011110b,10011010b,01100100b,00011110b,00111000b,00000010b,00000001b,01011010b db 00000010b,00011110b,00001010b,00000010b,00011110b,00100111b,00000010b,00011110b,00110010b,00000010b,00100100b,10000101b db 00001010b,00011110b,00100111b,00010100b,00011110b,00110010b,00100000b,00011110b,01011101b,00100000b,00111000b,01011101b db 00101110b,00011000b,01100111b,00111110b,00011000b,11110100b,01011000b,00011110b,10011010b,01110100b,00011110b,00111000b db 00000010b,00011110b,00001010b,00000010b,00011110b,00101011b,00010011b,00011010b,01000011b,00011111b,00011110b,00000010b db 00101011b,00111110b,10011010b,00110111b,00111110b,01110100b,01000011b,00111110b,01000101b,01001000b,01100000b,11001111b db 01001111b,00111000b,11101110b,01011011b,00011000b,01100111b,01100111b,00111110b,00100101b,00000010b,00011010b,01000011b db 00000010b,00011110b,00001010b,00000010b,00011110b,00101011b,00000010b,00011010b,01100011b,00010011b,00011000b,01000011b db 00011110b,00100110b,00000010b,00011111b,00011110b,00000010b,00101011b,00111110b,10011010b,00101010b,00100100b,10011010b db 00110111b,00111110b,01110100b,00111000b,00011000b,01100011b,01001001b,00111110b,01000101b,01011000b,01100000b,11001111b db 01011011b,00111000b,11101110b,01101100b,10011000b,01100111b,01111110b,10011100b,00100101b,00000010b,00011110b,00101100b db 00000010b,00011110b,00101110b,00001110b,00011110b,00110100b,00011010b,00011110b,00101011b,00100110b,00000001b,00111100b db 00110010b,00011110b,00100100b,00111110b,00011000b,10101100b,01001010b,00000001b,00001110b,01010110b,00011110b,01100001b db 01100010b,00011110b,00110101b,00000010b,00000000b,00101100b,00000010b,00000001b,00111100b,00000010b,00111000b,10101100b db 00000010b,00111110b,00100100b,00000010b,00111110b,00101011b,00000010b,00011110b,00101110b,00000010b,00000110b,00110100b db 01100010b,00011000b,11110101b,00000010b,00011110b,10010001b,00001110b,00011110b,01011111b,00011010b,00011110b,00110111b db 00100110b,00011110b,00000011b,00110010b,00011000b,11110000b,00111110b,00011110b,00100010b,01001010b,00011000b,10111011b db 01001100b,00100110b,10000101b,01010110b,00011110b,00111000b,00000010b,00011110b,00110111b,00000010b,00011110b,01011111b db 00000010b,00011110b,10010001b,00001110b,00011110b,01011111b,00011010b,00011110b,00110111b,00100110b,00011110b,00000011b db 00110110b,00011000b,11110000b,01000110b,00011110b,00100010b,01010010b,00100110b,10000101b,01010110b,00011000b,10111011b db 01100110b,00011110b,00111000b,00000010b,00011000b,01000010b,00000010b,00011110b,00000011b,00000010b,00100110b,00100010b db 00000010b,00011110b,00110111b,00000010b,00011110b,01011111b,00100000b,00100110b,01011111b,00100110b,00100110b,00110111b db 01000110b,00011000b,01000010b,01100110b,00011000b,10101010b,00000010b,00011110b,01100100b,00000010b,00011010b,10000110b db 00000010b,00011110b,01100100b,00000010b,00011110b,01011101b,00100000b,00011100b,01011101b,00100100b,00011110b,00110010b db 00101000b,00100100b,00110010b,00101010b,00011110b,00111100b,00101110b,00011110b,01110011b,00110010b,00011110b,01101001b db 00111100b,00011000b,11111000b,01000010b,00000001b,00010000b,01001000b,00011110b,01011110b,01010110b,00000001b,00001111b db 00000010b,00011010b,10000110b,00000010b,00011110b,01100100b,00000010b,00011110b,01011101b,00100000b,00011100b,01011101b db 00100100b,00011110b,00110010b,00101000b,00100100b,00110010b,00101010b,00011110b,00111100b,00101110b,00011110b,01110011b db 00110010b,00011110b,01101001b,00111100b,00011000b,11111000b,01000010b,00000001b,01011011b,01001000b,00011110b,01011110b db 01010110b,00000001b,00001111b,00000010b,00011110b,01000011b,00000010b,00011110b,00101011b,00001110b,00011110b,01110100b db 00011010b,00011110b,00000010b,00100110b,00011110b,01000101b,00101100b,00011000b,11000001b,00110010b,00000001b,00010111b db 00111110b,00011000b,11101001b,01001010b,00011110b,01000010b,01010000b,00011000b,11101110b,01010110b,00011000b,10111000b db 01100010b,00000000b,11011111b,00000010b,00011110b,00101011b,00000010b,00011110b,01000011b,00000010b,00011110b,01110100b db 00001110b,00011000b,01110100b,00011010b,00011110b,00000010b,00100110b,00011110b,01000101b,00101000b,00100110b,01000011b db 00101100b,00011000b,11000001b,00110010b,00000001b,00010111b,00110010b,00100110b,00101011b,01000010b,00011000b,11101001b db 01010010b,00011110b,01000010b,01011100b,00011000b,11101110b,01100110b,00011000b,10111000b,01110110b,00000000b,11011111b db 00000010b,00011110b,00101011b,00000010b,00011110b,01000011b,00000010b,00011110b,01110100b,00001110b,00011000b,01110100b db 00011010b,00011110b,00000010b,00100110b,00011110b,01000101b,00101000b,00100110b,01000011b,00101100b,00011000b,11000001b db 00110010b,00000001b,00010111b,00110010b,00100110b,00101011b,01000010b,00011000b,11101001b,01010010b,00011110b,01000010b db 01011100b,00011000b,11101110b,01100110b,00011000b,10111000b,01110110b,00000000b,11011111b,00000010b,00011110b,00010110b db 00001100b,00011110b,01001010b,00010110b,00011110b,00100011b,00011110b,00011110b,01001111b,00100010b,00011110b,01001101b db 00100110b,00011110b,01001110b,00101110b,00011110b,00110011b,00111100b,00011000b,11100110b,01001010b,00011110b,01001011b db 01011010b,00011110b,00010101b,00000010b,00011110b,00010110b,00000010b,00011110b,00100011b,00000010b,00011110b,01001010b db 00001100b,00011000b,01001010b,00010110b,00011110b,00100011b,00011110b,00011110b,01001111b,00100010b,00011110b,01001101b db 00100110b,00011110b,01001110b,00110000b,00011110b,00110011b,01000010b,00011000b,11100110b,01010100b,00011110b,01001011b db 01101100b,00011110b,00010101b,00000010b,01100000b,11111110b,00000010b,01100000b,11111111b,00000010b,01100001b,00000000b db 00000010b,00011000b,00010110b,00000010b,00011000b,11100110b,00000010b,00100110b,00110011b,00000010b,00011110b,01001011b db 00000010b,00100110b,01001110b,00000010b,00011110b,01001111b,00011010b,00100110b,00100011b,00011110b,00100110b,01001101b db 00100100b,00100110b,01001111b,00000010b,00011110b,00101000b,00001100b,00011110b,00110000b,00011000b,00011110b,10000100b db 00100110b,00011110b,00110011b,00101100b,00100110b,00110111b,00110010b,00011000b,00111101b,00111100b,00011110b,00100011b db 01001000b,00011110b,01110000b,01010110b,00011110b,01100111b,01100010b,00011110b,00111000b,00000010b,00011110b,00110000b db 00000010b,00011110b,00101000b,00000010b,00011110b,10000100b,00001100b,00011110b,00110000b,00011000b,00011000b,10000100b db 00011010b,00100110b,00100011b,00100110b,00011110b,00110011b,00101100b,00100110b,00110111b,00110010b,00011000b,00111101b db 00111100b,00011110b,00100011b,01001100b,00011110b,01110000b,01011110b,00011110b,01100111b,01101110b,00011110b,00111000b db 00000010b,00011110b,00100001b,00000010b,00011110b,01101111b,00001100b,00000001b,00101100b,00010110b,00011110b,01011000b db 00100000b,00011000b,11011110b,00101010b,00011110b,01111000b,00110100b,00111110b,01101010b,00110100b,00011000b,11001101b db 00111110b,00000001b,01011110b,01001000b,00011110b,01011001b,01010010b,00011110b,10011001b,01011100b,00000000b,00100110b db 00000010b,00000001b,00101100b,00000010b,00011110b,00100001b,00000010b,00011110b,01101111b,00000010b,00011110b,01011000b db 00001100b,00000001b,00101100b,00001100b,00111110b,01101111b,00010110b,00011000b,01011000b,00100000b,00011000b,11011110b db 00101010b,00011110b,01111000b,00110110b,00111110b,01101010b,00111010b,00011000b,11001101b,01001010b,00000001b,01011110b db 01011010b,00011110b,01011001b,01101010b,00011110b,10011001b,01111100b,00000000b,00100110b,00000010b,00000001b,00101100b db 00000010b,00011110b,00100001b,00000010b,00011110b,01101111b,00000010b,00011110b,01011000b,00001100b,00000001b,00101100b db 00001100b,00111110b,01101111b,00010110b,00011000b,01011000b,00100000b,00011000b,11011110b,00100000b,00111000b,11011110b db 00101010b,00011110b,01111000b,00110110b,00111110b,01101010b,00111010b,00011000b,11001101b,01001010b,00000001b,01011110b db 01011010b,00011110b,01011001b,01101010b,00011110b,10011001b,01111100b,00000000b,00100110b,00000010b,01100000b,01100010b db 00000010b,01011000b,00100001b,00001010b,00011110b,00101101b,00010010b,00011110b,00100111b,00011100b,00011110b,00110100b db 00100110b,00011110b,00010111b,00110010b,00011110b,01010011b,00111110b,00011110b,00100100b,01001100b,00011110b,01100001b db 01011010b,00000001b,01010100b,01101010b,00011000b,01111110b,00000010b,01100000b,01100010b,00000010b,01011000b,00100001b db 00000010b,00011110b,00100111b,00000010b,00011110b,00101101b,00000010b,00011110b,00110100b,00001010b,00011110b,00101101b db 00010010b,00011110b,00100111b,00011100b,00011000b,00110100b,00100110b,00011110b,00010111b,00110010b,00011110b,01010011b db 00111110b,00011110b,00100100b,01000000b,00100110b,00010111b,01001100b,00011110b,01100001b,01010000b,00011000b,00011111b db 01100100b,00000001b,01010100b,01111110b,00011000b,01111110b,00000010b,00000001b,00011001b,00000010b,00011000b,00100001b db 00000010b,00011000b,10101110b,00001100b,00011110b,00101101b,00011110b,11011110b,00110111b,00101001b,00011110b,01011101b db 00111011b,00111110b,00110010b,01000101b,00111110b,00011101b,01010111b,00111110b,10000101b,01100001b,00111110b,01011110b db 00000010b,00000001b,00011001b,00000010b,00011000b,00100001b,00000010b,00011000b,10101110b,00000010b,00011110b,00101101b db 00001100b,00011000b,00101101b,00011110b,11011110b,00110111b,00011110b,00111000b,00110111b,00100100b,00100110b,00110010b db 00101001b,00011110b,01011101b,00101100b,00100110b,00011101b,00111011b,00111110b,00110010b,01000101b,00111110b,00011101b db 01001010b,00011110b,01101110b,01011101b,00111110b,10000101b,01101101b,00111110b,01011110b,01101110b,01100000b,11110100b db 00000010b,00000001b,00111111b,00000010b,00011110b,00100001b,00001100b,00011110b,01010100b,00010110b,00011110b,00110000b db 00100000b,00011110b,00110001b,00101010b,00011110b,01010110b,00110100b,00000000b,11010001b,01000000b,00011000b,11000111b db 01001100b,00011110b,10000001b,01011000b,00011110b,01100111b,01100100b,00011000b,11000000b,00000010b,00000001b,00111111b db 00000010b,00011110b,00100001b,00000010b,00011110b,01010100b,00000010b,00011110b,00110000b,00001100b,00011110b,01010100b db 00010110b,00011000b,00110000b,00100000b,00011110b,00110001b,00100000b,00111110b,00110001b,00101010b,00011110b,01010110b db 00110100b,00000000b,11010001b,01000110b,00011000b,11000111b,01000110b,00110110b,10000001b,01011000b,00001000b,10100001b db 01101010b,00011110b,01100111b,01111100b,00011000b,11000000b,00000010b,00011110b,01000000b,00001100b,00011110b,00011100b db 00010110b,00011110b,00101011b,00100000b,00011110b,00011111b,00101010b,00000001b,00011010b,00110100b,00000000b,11010010b db 00111110b,00011110b,00001110b,01001000b,00011110b,01100001b,01010010b,00011110b,10100011b,01011100b,00011000b,11001110b db 11111110b,00101000b,11100010b,00000010b,00011110b,01000000b,00000010b,00011110b,00101101b,00010010b,00011000b,11100100b db 00011010b,00011110b,00011111b,00101010b,00011110b,10100001b,00110010b,00011110b,01100011b,01000010b,00000000b,11111101b db 01001010b,00011110b,01000001b,01011010b,00011110b,01100001b,00000010b,00011000b,11100100b,00000010b,00011110b,00011111b db 00000010b,00011110b,00101101b,00000010b,00011110b,01000000b,00010010b,00011000b,11100100b,00011010b,00011110b,00011111b db 00101000b,00100110b,00101101b,00101010b,00011110b,10100001b,00110010b,00011110b,01100011b,01001100b,00000000b,11111101b db 01011110b,00011110b,01000001b,01111000b,00011110b,01100001b,00000010b,00011110b,00011101b,00010010b,00011110b,00101101b db 00100010b,00000000b,11000100b,00101010b,00011110b,00111110b,00111010b,00011110b,10011100b,01001010b,00011110b,00100100b db 01010010b,00011110b,00111010b,01100010b,00011000b,11011011b,00000010b,01100001b,01000100b,00000010b,00000000b,11000100b db 00000010b,00011110b,00011101b,00000010b,00011110b,00101101b,00000010b,00011110b,00111110b,00010010b,00011110b,00101101b db 00100010b,00000000b,11000100b,00101010b,00011110b,00111110b,00111010b,00011110b,10011100b,01000100b,00000001b,01001001b db 01010100b,00011110b,00100100b,01100110b,00011110b,00111010b,10000000b,00011000b,11011011b,00000010b,00011110b,00000001b db 00000010b,00011110b,10001011b,00001000b,00011110b,01101010b,00010000b,00011110b,00110010b,00011010b,00011110b,01111100b db 00100110b,00011110b,01101011b,00110100b,00011110b,01100111b,01000100b,00011110b,10010111b,01010110b,00011000b,10111100b db 01101010b,00000001b,00000110b,00000010b,00011110b,00000001b,00000010b,00011110b,10001011b,00000010b,00011110b,01101010b db 00001000b,00011000b,01101010b,00010000b,00011110b,00110010b,00011010b,00011110b,01111100b,00100110b,00011110b,01101011b db 00110100b,00011110b,01100111b,00111100b,00100110b,10001011b,01000100b,00011110b,10010111b,01011110b,00011000b,10111100b db 01111010b,00000001b,00000110b,00000010b,00011110b,00100001b,00000010b,00011110b,01101110b,00010000b,01100001b,01001101b db 00010011b,00011110b,00110000b,00100011b,00011110b,00111110b,00110011b,00011000b,10110110b,01000011b,00011110b,00101011b db 01010010b,11111110b,10000000b,01100010b,10111110b,00111010b,00000010b,00011000b,10110110b,00000010b,00011110b,00110000b db 00000010b,00011110b,00111110b,00000010b,00011110b,01101110b,00000010b,00100110b,10000000b,01000011b,00001000b,10111111b db 01010010b,11111110b,10000011b,00000010b,00011110b,01111010b,00000010b,00011110b,01011111b,00010000b,00011000b,10110100b db 00011011b,00011000b,11010100b,00100001b,00011000b,10101110b,00101010b,00011110b,01100101b,00111001b,00111110b,01101101b db 01000011b,00111110b,10001010b,01001001b,00011000b,11000010b,01001000b,01100000b,11110111b,01010010b,01100000b,10101011b db 00000010b,00011000b,10110100b,00000010b,00011110b,01111010b,00000010b,00011110b,01011111b,00010000b,00011000b,10110100b db 00011011b,00011000b,11010100b,00100001b,00011000b,10101110b,00101011b,00111110b,01100101b,00110010b,00000001b,01000101b db 00111111b,00111110b,01101101b,01001111b,00111110b,10001010b,01011010b,01100000b,11110111b,01100001b,00111000b,11000010b db 01101010b,01100000b,10101011b,00000010b,00011000b,10110100b,00000010b,00011110b,01111010b,00000010b,00011110b,01011111b db 00010000b,00011000b,10110100b,00011011b,00011000b,11010100b,00100001b,00011000b,10101110b,00101011b,00111110b,01100101b db 00110010b,00000001b,01000101b,00111111b,00111110b,01101101b,01001111b,00111110b,10001010b,01011010b,01100000b,11110111b db 01100001b,00111000b,11000010b,01101010b,01100000b,10101011b,00000010b,00011110b,00100001b,00000010b,00011110b,01100111b db 00010010b,10011110b,00010100b,00011010b,10011110b,01011000b,00101010b,11011110b,01101010b,00110010b,11011110b,01100011b db 00111100b,01100000b,11100001b,01000010b,10111000b,11001001b,01001011b,00011110b,00010101b,01011010b,00000000b,11100111b db 01100011b,00000001b,01001000b,01110010b,10000000b,00100110b,00000010b,00011110b,00000001b,00000010b,00011110b,01011111b db 00010101b,00011110b,00110010b,00100101b,00111110b,01011101b,00110011b,00111110b,00011101b,00111111b,00111110b,10001011b db 01001001b,00111110b,01100000b,01010001b,00111110b,01011110b,01010010b,01100000b,11001111b,01010111b,00111000b,11110100b db 01011010b,11111000b,11111000b,00000010b,01100000b,10101011b,00000010b,00011110b,00000001b,00000010b,00011110b,00110010b db 00000010b,00011110b,01011101b,00000010b,00011110b,01011111b,00010101b,00011110b,00110010b,00100101b,00111110b,01011101b db 00110011b,00111110b,00011101b,01000011b,00111110b,10001011b,01010001b,00111110b,01100000b,01100011b,00111110b,01011110b db 01100010b,01100000b,11001111b,01101111b,00111000b,11110100b,01111001b,00011000b,11111000b,00000010b,00011110b,10010001b db 00001010b,00011110b,00101011b,00011000b,00011110b,00001011b,00100000b,00011110b,01101010b,00101110b,00000001b,01010101b db 00110110b,00011110b,00010111b,01000100b,00011110b,00001100b,01010011b,00011000b,10110110b,01011010b,00011110b,10011000b db 01100010b,01100000b,10101111b,00000010b,01100000b,01101010b,00000010b,01100000b,11101000b,00000010b,00011110b,00001011b db 00000010b,00011110b,00101011b,00000010b,00011110b,10010001b,00001010b,00011000b,00101011b,00011000b,00011110b,00001011b db 00100000b,00011110b,01101010b,00101110b,00000001b,01010101b,00110110b,00011110b,00010111b,01001100b,00011110b,00001100b db 01100011b,00111000b,10110110b,01110010b,00011110b,10011000b,10000010b,01100000b,10101111b,00000010b,00000001b,00001100b db 00000010b,00011110b,00100001b,00010000b,00011110b,01100111b,00011110b,00011110b,00110001b,00101010b,00000000b,11010001b db 00110110b,00011110b,01111000b,01000000b,00011000b,11001101b,01001010b,00011110b,01110001b,01010100b,00011110b,10000001b db 01011100b,00011110b,10011001b,01100010b,00011000b,11110011b,00000010b,00000001b,00001100b,00000010b,00011110b,00100001b db 00000010b,00011110b,00110001b,00000010b,00011110b,01100111b,00010000b,00011000b,01100111b,00011110b,00011110b,00110001b db 00101010b,00000000b,11010001b,00101110b,00111000b,01111000b,00110110b,00011110b,01111000b,01000100b,00011000b,11001101b db 01010010b,00011110b,01110001b,01100000b,00011110b,10000001b,01101100b,00011110b,10011001b,01110110b,00011000b,11110011b db 00000010b,00000000b,11111101b,00000010b,00011110b,01011111b,00000010b,00011110b,10001100b,00001110b,00011110b,01110011b db 00011010b,00011110b,01001001b,00100110b,00011000b,01011101b,00110010b,00011110b,01001110b,00111110b,00011110b,01001101b db 01001010b,00011110b,01001111b,01010110b,00011110b,01001100b,00000010b,00011000b,01011101b,00000010b,00011110b,01011111b db 00000010b,00011110b,10001100b,00100110b,00011110b,00010111b,00111110b,00011000b,01111001b,00000010b,00011110b,00101101b db 00001010b,00011010b,00100111b,00010010b,00011110b,01111101b,00011010b,00011010b,00011101b,00100010b,00011110b,00101011b db 00101010b,00011110b,01110100b,00110010b,00011110b,10011011b,00111010b,00011100b,01100011b,01000010b,00011000b,11001110b db 01001010b,00011110b,00100101b,01010010b,00011000b,11000110b,01011010b,00000000b,00100110b,00000010b,00011010b,00100111b db 00000010b,00011100b,00101101b,00000010b,00011110b,01111101b,00000010b,00011010b,00011101b,00001010b,00011010b,00100111b db 00010010b,00011010b,01111101b,00011010b,00011000b,00011101b,00100010b,00011110b,00101011b,00101010b,00011110b,01110100b db 00110010b,00100100b,00101011b,00110010b,00011110b,10011011b,01000000b,00011110b,01100011b,01000010b,00100100b,01110100b db 01001110b,00011000b,11001110b,01011100b,00011110b,00100101b,01101010b,00011000b,11000110b,01111010b,00000000b,00100110b db 00000010b,00000001b,00010111b,00000010b,00011110b,00011000b,00001100b,00011110b,01100000b,00010110b,00011110b,00011011b db 00100000b,00011110b,00011010b,00101000b,00000001b,00011000b,00101010b,00011110b,01110100b,00110100b,00011110b,10001000b db 00111110b,00011000b,10101010b,01001000b,00011000b,11000001b,01010010b,00011000b,11001011b,01011100b,00011110b,00011001b db 01100110b,00011000b,10110011b,00000010b,00000001b,00010111b,00000010b,00011110b,00000100b,00001110b,00011110b,01100001b db 00011010b,00011000b,11100100b,00101000b,00011000b,10110111b,00110100b,00011110b,00000111b,00110100b,00011110b,00001000b db 00110100b,00011110b,00001001b,01000000b,00000001b,01000111b,01001100b,00011110b,00000101b,01011000b,00011000b,11000101b db 01100100b,00011110b,01000100b,00000010b,00011000b,01111010b,00001110b,00011110b,00110000b,00011000b,00011110b,01101111b db 00100100b,00000001b,00011010b,00101110b,00011110b,00010111b,00111010b,00011110b,00100011b,01000100b,00011110b,00110010b db 01010000b,00011110b,00010101b,01011010b,00011110b,01100111b,01100110b,00000001b,00011111b,00000010b,00011000b,10001011b db 00000010b,00011110b,00100001b,00010010b,00011110b,01111011b,00100010b,00011110b,01111000b,00101010b,00011110b,01111100b db 00110010b,00011110b,01101100b,01000010b,00011110b,01110010b,01010010b,00011110b,10011001b,01011010b,00011000b,11000010b db 01100010b,00000001b,00000110b,00000010b,00011000b,10001011b,00000010b,00011110b,00100001b,00000010b,00011110b,01111011b db 00000010b,00011110b,01111000b,00010010b,00011000b,01111011b,00100010b,00011000b,01111000b,00101010b,00011110b,01111100b db 00110010b,00011110b,01101100b,01000000b,00100110b,01111100b,01000010b,00011110b,01110010b,01011000b,00011110b,10011001b db 01100110b,00011000b,11000010b,01110100b,00000001b,00000110b,00000010b,00011110b,00011110b,00000010b,00011110b,00100111b db 00010100b,00011110b,00010111b,00011110b,00011110b,00011111b,00110000b,00011000b,10111000b,00111010b,00000001b,01011110b db 01001100b,00011110b,00100000b,01010110b,00011110b,00100100b,01100100b,00100110b,00101011b,01101000b,00011000b,01011001b db 01110010b,00000000b,11100000b,00000010b,00011110b,00010111b,00000010b,00011110b,00011110b,00000010b,00011110b,00011111b db 00000010b,00011110b,00100111b,00010100b,00011110b,00010111b,00011110b,00011110b,00011111b,00110000b,00011000b,10111000b db 00111010b,00000001b,01011110b,01000110b,00100110b,00100111b,01001100b,00011110b,00100000b,01011100b,00011110b,00100100b db 01101110b,00100110b,00101011b,01110100b,00011000b,01011001b,10000100b,00000000b,11100000b,00000010b,00011110b,00000001b db 00000010b,00011110b,00101101b,00001010b,00011010b,00100111b,00010010b,00000001b,00011111b,00011010b,00011000b,10000111b db 00100010b,00011110b,00000011b,00101110b,00011110b,01101011b,00111010b,00011110b,00101111b,01000110b,00011000b,01111001b db 01010010b,00011110b,01101111b,01100010b,00011110b,01110001b,01110010b,00011100b,00100110b,00000010b,00000001b,00010011b db 00000010b,00011110b,10000100b,00001000b,00011110b,01001111b,00010100b,00011110b,01000111b,00011010b,00011100b,01001010b db 00100110b,00011110b,01001101b,00101100b,00011010b,00010110b,00111000b,00011110b,00010100b,00111110b,00011000b,01001000b db 01001010b,00011110b,01001110b,01010000b,00011110b,00010101b,01011100b,00000001b,01000001b,00000010b,00011110b,00000100b db 00000010b,00011110b,00101011b,00001110b,00011110b,00101100b,00011010b,00011110b,00100111b,00100110b,00000000b,11111100b db 00110010b,00011110b,00000101b,00111110b,00011110b,01100011b,01001010b,00011000b,11001011b,01010110b,00011110b,10010010b db 01100010b,00011000b,10110011b,00000010b,00011110b,10010001b,00010000b,00011110b,01101100b,00011110b,00011110b,00101011b db 00101100b,00011110b,00110111b,00111010b,00011000b,11101111b,01001000b,00011110b,01100001b,01010110b,00011110b,00111000b db 01100100b,00000001b,01011101b,00000010b,00011110b,01101100b,00000010b,00011110b,10010001b,00000010b,00011110b,00101011b db 00000010b,00011110b,00110111b,00010000b,00011110b,01101100b,00011110b,00011000b,00101011b,00101100b,00011000b,00110111b db 00111010b,00011000b,11101111b,01010000b,00011110b,01100001b,01100110b,00011110b,00111000b,01111100b,00000001b,01011101b db 00000010b,00000001b,01011010b,00000010b,00011110b,00100111b,00000010b,00011110b,01000000b,00010100b,00011110b,00110000b db 00011110b,00011110b,00011110b,00110000b,00011000b,10101111b,00111010b,00011110b,00011111b,01001100b,00011110b,01111111b db 01010110b,00011110b,00100000b,01101000b,00011110b,01100001b,01110010b,01100000b,11100000b,00000010b,00000001b,01011010b db 00000010b,00111000b,00100111b,00000010b,00011110b,00100111b,00000010b,00011110b,01000000b,00000010b,00011110b,00110000b db 00010100b,00000110b,00110000b,00011110b,00011110b,00011110b,00110000b,00011000b,10101111b,00111010b,00011110b,00011111b db 01010010b,00011110b,01111111b,01100010b,00011110b,00100000b,01111010b,00011110b,01100001b,10001010b,01100000b,11100000b db 00000010b,00011110b,00100001b,00000010b,00011110b,01101010b,00001100b,00011110b,00110111b,00010100b,00011000b,11100101b db 00011110b,00011110b,01101001b,00100110b,00000001b,00100101b,00110000b,00011110b,10000001b,00111000b,00011000b,00111101b db 01000010b,00011110b,01101011b,01001010b,00011110b,01110001b,01010100b,00000001b,01000010b,01011100b,00011110b,00111000b db 00000010b,00000000b,10000001b,00000010b,00111000b,00111101b,00000010b,00011000b,01101001b,00000010b,00011000b,11100101b db 00000010b,00111110b,00100001b,00000010b,00000110b,00110111b,00000010b,00100110b,01101010b,01000010b,00011000b,01101101b db 00000010b,00011110b,01110000b,00001010b,00011110b,01011101b,00010010b,10011110b,10100100b,00011010b,10011110b,01100000b db 00011110b,00100110b,01011101b,00100010b,11011110b,00000011b,00101010b,11011000b,01110011b,00101010b,11011110b,01110001b db 00101100b,01100001b,01011001b,00110010b,10111000b,11100011b,00111010b,00011000b,00111100b,01000010b,00000001b,00010110b db 01001010b,10000001b,00001111b,01010010b,10000001b,00010000b,01011010b,11000000b,01011110b,01100010b,11011000b,11100010b db 01101011b,00011000b,11011011b,00000010b,00011110b,01100010b,00000010b,00011110b,00101011b,00001100b,00011110b,01110100b db 00010110b,00011000b,11100100b,00100000b,00011000b,11001110b,00101010b,00011110b,01100001b,00110100b,00011010b,00010001b db 00111110b,00011110b,10100011b,01001000b,00011110b,00001110b,01010010b,00011110b,01101000b,01011100b,00000000b,11010010b db 00000010b,00011000b,10110101b,00000010b,00011110b,00000001b,00000010b,00011110b,10001110b,00000010b,00011110b,01111010b db 00010010b,00011000b,10001110b,00011010b,00011000b,10110101b,00101010b,00011110b,00000011b,00110010b,00011110b,00001000b db 01000110b,00011000b,11010100b,01010010b,00000001b,00111001b,01011110b,00100110b,00100101b,01100110b,00011110b,00100010b db 01110010b,00011000b,11000011b,10000110b,00011110b,00111011b,00000010b,00011110b,00101011b,00000010b,00011110b,01100010b db 00000010b,00011110b,00001001b,00010010b,00011000b,00001001b,00100010b,00011110b,01110001b,00110010b,00011000b,10000001b db 01000100b,00100110b,01010100b,01001000b,00011110b,01100111b,01011110b,00011000b,01010101b,01110100b,00011110b,01010111b db 00000010b,00011110b,00110100b,00000010b,00011110b,00101011b,00000010b,00011110b,00000111b,00000010b,00011110b,01111011b db 00001110b,00011000b,00101011b,00011010b,00011000b,01111011b,00100110b,00011000b,00000111b,00110010b,00011110b,01101100b db 01000010b,00011000b,11110001b,01010010b,00011110b,00110101b,01100010b,00011110b,01101101b,01110010b,00011000b,01111110b db 00000010b,00011110b,00001011b,00000010b,00011110b,01110100b,00001110b,00011010b,00010100b,00011010b,00011110b,01000101b db 00100110b,00011110b,01101010b,00110010b,00000001b,00010111b,00111110b,00000001b,00011000b,01001010b,00011110b,00001100b db 01010110b,00011000b,01000010b,01100010b,00011110b,00001110b,01100010b,00100110b,10100011b,00000010b,00011110b,00100001b db 00001001b,00011110b,00100111b,00010001b,00011110b,01100011b,00011011b,00111000b,00011110b,00100111b,00111000b,10111000b db 00101010b,00100110b,00010111b,00110101b,00111000b,11100100b,00110100b,01100000b,11001111b,01000100b,00011000b,10011100b db 01000110b,00100110b,00101011b,01010110b,00011000b,00100101b,01101010b,00011110b,00100100b,00000010b,00011110b,10010110b db 00011110b,00011110b,00100001b,00111100b,00011000b,10101111b,00000010b,00011000b,00100101b,00101000b,00011110b,00101100b db 00101000b,00100100b,00101100b,00110010b,00011110b,01010010b,00110010b,00100100b,01010010b,00111100b,00011110b,00101011b db 01000000b,00100100b,00101011b,01000110b,00011000b,11101111b,01010000b,00011110b,00111000b,01010010b,00100100b,00111000b db 01011010b,00011000b,11110000b,01100100b,00000001b,01011101b,01101110b,00011110b,00111111b,00000010b,00011110b,00101101b db 00000010b,00011110b,00110111b,00000010b,00011110b,00101111b,00001110b,00011110b,00110110b,00011010b,00011110b,00100010b db 00100110b,00011110b,01101101b,00110010b,00011000b,11000011b,00111110b,00011110b,00111010b,01001010b,00011000b,11110000b db 01010110b,00011000b,11011011b,01100010b,00011110b,00111000b,01101110b,00000001b,01001001b,00000010b,00011110b,10010000b db 00000010b,00000001b,00001110b,00000010b,00011110b,00100001b,00000010b,00011110b,00100111b,00010000b,00011110b,00011100b db 00100000b,00011010b,00101101b,00101110b,00011110b,01100010b,00111100b,00011110b,00101100b,01001000b,00001000b,11100010b db 01001000b,00110010b,01110100b,01010100b,00011110b,00100100b,00000010b,00000001b,00001110b,00000010b,00011110b,00100001b db 00000010b,00011110b,00100111b,00010000b,00011110b,00011100b,00100000b,00011110b,00110111b,00101110b,00011110b,01100010b db 00110110b,00100110b,01100010b,00111100b,00011110b,00101100b,00111110b,00100110b,00110111b,01001000b,00011010b,00111110b db 01010100b,00011110b,01110010b,01011110b,00011100b,10010111b,01100000b,00100110b,00110110b,01101000b,00011100b,00111000b db 00000010b,00000001b,00001110b,00000010b,00011110b,00100001b,00000010b,00011110b,00100111b,00010000b,00011110b,00011100b db 00100000b,00011110b,01010100b,00101110b,00011110b,01100010b,00110110b,00100110b,01100010b,00111100b,00011110b,00011000b db 00111110b,00100110b,01010100b,01001000b,00011110b,00101010b,01010100b,00011110b,01010110b,01011110b,00011100b,01100001b db 01101000b,00011100b,01010111b,00000010b,00000001b,00001110b,00000010b,00011110b,00100001b,00000010b,00011110b,00100111b db 00010000b,00011110b,00011100b,00100000b,00011110b,00110100b,00101110b,00011110b,01100010b,00110110b,00100110b,01100010b db 00111100b,00011110b,00101100b,00111110b,00100110b,00110100b,01001000b,00011110b,01010011b,01010100b,00011010b,01111011b db 01011110b,00011100b,00101011b,01100000b,00100100b,01100011b,01101000b,00011100b,00110101b,00000010b,00011000b,10110000b db 00000010b,00011110b,00100001b,00000010b,00011110b,10100000b,00010010b,00011110b,01100001b,00011000b,00011110b,00111100b db 00101000b,00011110b,01101001b,00110000b,00011110b,10011111b,01000000b,00011000b,11000111b,01001000b,00011110b,10100001b db 01011000b,00000001b,00010110b,01100000b,00011000b,11000000b,00000010b,00011000b,10000100b,00000010b,00011110b,01101110b db 00011010b,00011000b,00101100b,00100110b,00011110b,00110111b,00110010b,00000001b,01010101b,00111110b,00011110b,00101011b db 01000100b,00100110b,00011110b,01001010b,00011000b,10110110b,01010110b,00000001b,01000001b,01011100b,00100110b,10000011b db 01100010b,00011000b,11110110b,01101110b,00011110b,00111000b,00000010b,01100000b,00110111b,00000010b,00011000b,00101100b db 00000010b,00011000b,10000100b,00000010b,00100110b,00011110b,00000010b,00011110b,01101110b,00011010b,00011000b,00101100b db 00100110b,00011110b,00110111b,00110010b,00000001b,01010101b,00111110b,00011110b,00101011b,01000100b,00100110b,00011110b db 01001010b,00011000b,10110110b,01010000b,00011110b,10000011b,01011100b,00000001b,01000001b,01101110b,00011000b,11110110b db 10000010b,00011110b,00111000b,00000010b,00011110b,00001010b,00000010b,00011110b,01101010b,00011010b,00011110b,01000111b db 00100110b,00011110b,00101011b,00110010b,00000001b,01010101b,00111110b,00011000b,00011100b,01001010b,00011000b,11001011b db 01001110b,00100110b,10100011b,01010110b,00000001b,00111111b,01100010b,00011000b,01001000b,01100010b,00100110b,00111000b db 01101110b,00011000b,11110110b,00000010b,01100000b,11010010b,00000010b,00011110b,00001010b,00000010b,00011110b,01000111b db 00000010b,00011110b,01101010b,00011010b,00011110b,01000111b,00100110b,00011110b,00101011b,00110010b,00000001b,01010101b db 00111110b,00011000b,00011100b,01001010b,00011000b,11001011b,01010000b,00011110b,10100011b,01011100b,00000001b,00111111b db 01101010b,00100110b,00111000b,01101110b,00011000b,01001000b,10000010b,00011000b,11110110b,00000010b,00011110b,00010001b db 00010000b,00011110b,01100001b,00011110b,00011110b,00101100b,00101100b,00011110b,00110000b,00111010b,00011000b,11110110b db 01001000b,00011000b,10111000b,01010110b,00011110b,00100100b,01100100b,00011110b,00111111b,00000010b,00011000b,00100001b db 00001100b,10011110b,10000101b,00010100b,10011000b,01101111b,00011110b,11011000b,10111011b,00100110b,11011110b,00011101b db 00110001b,00000001b,00011001b,00111001b,00011110b,10011100b,00111000b,10111000b,10101101b,01000010b,00011110b,00100010b db 01001010b,01100000b,11010110b,01001011b,00000001b,01001111b,01010010b,00100110b,01101010b,01010101b,00000001b,01010111b db 01011101b,00011000b,11001101b,01100000b,00100110b,00100110b,01100110b,11111110b,00111111b,00000010b,00011000b,00010000b db 00000010b,00011000b,10110101b,00000010b,00100110b,01000000b,00011010b,00011110b,00110110b,00110010b,00011110b,01100001b db 01001010b,00011000b,10101010b,01100010b,00011110b,00111010b,01111010b,00011000b,01110011b,10010010b,00011110b,00111011b db 10101010b,00000001b,01001001b,00000010b,00011000b,01000000b,00000010b,00011110b,01010100b,00011010b,00011000b,01010110b db 00110010b,00011110b,01100001b,01001010b,00011000b,11000101b,01100010b,00011110b,01000001b,01111010b,00000001b,00001100b db 10010010b,00011110b,01110001b,10101010b,00011110b,01010111b,00000010b,00011000b,00010001b,00000010b,00011000b,00110100b db 00000010b,00100110b,01000000b,00011010b,00011110b,01010011b,00110010b,00011110b,01100001b,01001010b,00011000b,11001011b db 01100010b,00011000b,00110101b,01100110b,00100110b,00101011b,01111010b,00011000b,11011011b,10010010b,00000001b,00000001b db 10101010b,00011110b,10001111b,00000010b,00011110b,00100011b,00000010b,00011110b,00101011b,00010000b,00011110b,01010110b db 00011110b,00011000b,11101111b,00101100b,00011110b,01010010b,00111010b,00011110b,00010101b,01001000b,00011110b,01100001b db 01010110b,00011000b,11011011b,01100100b,00011000b,11001000b,01110010b,00011110b,00111111b,11111110b,00101000b,11110101b db 00000010b,00011000b,11101111b,00000010b,00011110b,00100011b,00000010b,00011110b,00101011b,00000010b,00011110b,01010110b db 00010000b,00011110b,01010110b,00011110b,00011000b,11101111b,00101100b,00011110b,01010010b,00111010b,00011110b,00010101b db 01001100b,00011110b,01100001b,01011110b,00011000b,11011011b,01110000b,00011000b,11001000b,10000010b,00011110b,00111111b db 00000010b,00011000b,11101111b,00000010b,00011110b,00100011b,00000010b,00011110b,00101011b,00000010b,00011110b,01010110b db 00010000b,00011110b,01010110b,00011110b,00011000b,11101111b,00101000b,00100110b,01100001b,00101100b,00011110b,01010010b db 00111010b,00011110b,00010101b,01001100b,00011110b,01100001b,01011110b,00011000b,11011011b,01101110b,00011000b,00010001b db 01111010b,00011000b,11001000b,10010110b,00011110b,00111111b,00000010b,00011110b,00110010b,00000010b,00011110b,01011101b db 00010110b,00011110b,01110000b,00101101b,00011110b,10000001b,01000011b,00011000b,11110100b,01011001b,00011000b,11111000b db 01101111b,00111110b,00110110b,10000100b,00011110b,01011110b,10000100b,00100110b,01011110b,10011011b,00011110b,10000101b db 10110001b,00111110b,01101001b,11000111b,00111000b,11011011b,00000010b,00011110b,00000001b,00010100b,00011110b,10010000b db 00101000b,00011110b,00000101b,00111100b,00011110b,01110110b,01010000b,00011110b,01011110b,01100100b,00011000b,11110110b db 00000010b,00011000b,00100001b,00000010b,00011000b,00101101b,00010000b,00011000b,01001011b,00011000b,00011000b,01110011b db 00011110b,00011000b,01001101b,00101100b,00011000b,11101011b,00111010b,00011000b,00100010b,01001000b,00011000b,01110001b db 01010110b,00011000b,11011011b,01100100b,00011000b,01001100b,00000010b,00011000b,00100001b,00000010b,00011000b,00101101b db 00000010b,00011000b,01001011b,00000010b,00011000b,01110011b,00010000b,00011000b,01001011b,00011000b,00011000b,01110011b db 00011110b,00011000b,01001101b,00101110b,00011000b,11101011b,00111110b,00011000b,00100010b,01001110b,00011000b,01110001b db 01011110b,00011000b,11011011b,01101110b,00011000b,01001100b,00000010b,00011000b,00100001b,00000010b,00011000b,00101101b db 00000010b,00011000b,01001011b,00000010b,00011000b,01110011b,00010000b,00011000b,01001011b,00011000b,00011000b,01110011b db 00011110b,00011000b,01001101b,00101110b,00011000b,11101011b,00111110b,00011000b,00100010b,01010010b,00011000b,01110001b db 01100110b,00011000b,11011011b,01111010b,00011000b,01001100b,00000010b,00011000b,00100001b,00000010b,00011000b,00101011b db 00001100b,00011000b,01101100b,00011000b,00011000b,00110100b,00100110b,00011000b,01100010b,00110110b,00011000b,10101100b db 01001000b,00011000b,10000001b,01011100b,00011000b,00110101b,00000010b,00011000b,00100001b,00000010b,00011000b,00101011b db 00000010b,00011000b,01101100b,00001100b,00011000b,01101100b,00011000b,00011000b,00110100b,00101010b,00011000b,01100010b db 00111110b,00011000b,10101100b,01010100b,00011000b,10000001b,01101100b,00011000b,00110101b,00000010b,00011000b,00100001b db 00000010b,00011000b,00101011b,00000010b,00011000b,00110100b,00000010b,00011000b,01101100b,00001100b,00011000b,01101100b db 00011000b,00011000b,00110100b,00101010b,00011000b,01100010b,00111110b,00011000b,10101100b,01011010b,00011000b,10000001b db 01111000b,00011000b,00110101b,00000010b,00011000b,00001010b,00000010b,00011000b,00101011b,00001110b,00011000b,01100011b db 00011010b,00011000b,00110111b,00101000b,00011000b,00101100b,00110110b,00011000b,10111000b,01000110b,00011000b,10100011b db 01010110b,00011000b,01100111b,01101000b,00011000b,00111000b,00000010b,00011000b,00001010b,00000010b,00011000b,00101011b db 00000010b,00011000b,01100011b,00001110b,00011000b,01100011b,00011010b,00011000b,00110111b,00101010b,00011000b,00101100b db 00111000b,00011000b,10111000b,01001010b,00011000b,10100011b,01011010b,00011000b,01100111b,01101110b,00011000b,00111000b db 00000010b,00011000b,00001010b,00000010b,00011000b,00101011b,00000010b,00011000b,00110111b,00000010b,00011000b,01100011b db 00001110b,00011000b,01100011b,00011010b,00011000b,00110111b,00101010b,00011000b,00101100b,00111000b,00011000b,10111000b db 01001100b,00011000b,10100011b,01011110b,00011000b,01100111b,01110100b,00011000b,00111000b,00000010b,00000000b,00001010b db 00000010b,00111000b,00100001b,00001000b,00011000b,01101111b,00001110b,00011000b,01100010b,00011000b,00011000b,10011010b db 00100010b,00000001b,00001110b,00110000b,00011000b,00010101b,00111110b,00000001b,00001010b,01010000b,00011000b,10011100b db 01100010b,00011000b,10000101b,00000010b,00011000b,00001010b,00000010b,00011000b,01100010b,00000010b,00011000b,01101111b db 00001000b,00011000b,01101111b,00001110b,00011000b,01100010b,00011000b,00011000b,10011010b,00100110b,00000001b,00001110b db 00111000b,00011000b,00010101b,01001010b,00000001b,00001010b,01100000b,00011000b,10011100b,01110110b,00011000b,10000101b db 00000010b,00011000b,00100001b,00000010b,00011000b,00101101b,00001100b,00011000b,11000001b,00010110b,00011000b,01000000b db 00100000b,00011000b,01011111b,00101100b,00011000b,01110011b,00111000b,00011000b,00100100b,01000100b,00011000b,01011101b db 01100000b,00011000b,10001010b,00000010b,00011000b,00100001b,00000010b,00011000b,00101101b,00000010b,00011000b,01000000b db 00000010b,00011000b,11000001b,00001100b,00011000b,11000001b,00010110b,00011000b,01000000b,00100000b,00011000b,01011111b db 00110010b,00011000b,01110011b,01000010b,00011000b,00100100b,01010010b,00011000b,01011101b,01110010b,00011000b,10001010b db 00000010b,00011000b,00100001b,00010000b,00011000b,00110000b,00011110b,00011000b,00000100b,00101100b,00011000b,01110001b db 00101100b,00011000b,01110011b,00101100b,00011000b,11011011b,00111010b,00011000b,11100010b,01001000b,00011000b,10000001b db 01010110b,00011000b,01100001b,01100100b,00011000b,00100110b,00000010b,00011000b,00100001b,00000010b,00011000b,00110000b db 00010000b,00011000b,00110000b,00011110b,00011000b,00000100b,00110000b,00011000b,01110001b,00110000b,00011000b,01110011b db 00110000b,00011000b,11011011b,01000010b,00011000b,11100010b,01010100b,00011000b,10000001b,01100110b,00011000b,01100001b db 01111000b,00011000b,00100110b,00000010b,00011000b,00101000b,00000010b,00011000b,01010001b,00001100b,00011000b,10111000b db 00010110b,00011000b,10000100b,00100010b,00011000b,01100101b,00101110b,00011000b,10001101b,00111100b,00011000b,10011010b db 01001010b,00011000b,10101001b,01011010b,00001000b,01100001b,01011010b,00110000b,01100111b,01101010b,00011000b,01011110b db 00000010b,00011000b,00101000b,00000010b,00011000b,01010001b,00000010b,00011000b,10000100b,00000010b,00011000b,10111000b db 00001100b,00011000b,10111000b,00010110b,00011000b,10000100b,00100010b,00011000b,01100101b,00110010b,00011000b,10001101b db 01000100b,00011000b,10011010b,01010110b,00011000b,10101001b,01101010b,00001000b,01100001b,01101010b,00110000b,01100111b db 01111110b,00011000b,01011110b,00000010b,00000001b,00110110b,00000010b,00011000b,00110000b,00000010b,00011000b,01100111b db 00000010b,00011000b,10001101b,00001101b,00011000b,00110000b,00010111b,00100001b,00110110b,00100000b,00011000b,00101100b db 00101010b,00011000b,00010001b,00111000b,00011000b,01101101b,01000110b,00000001b,00111010b,01010100b,00011000b,11010100b db 01100010b,00000001b,00110001b,01110000b,00011000b,01110010b,00000010b,00011000b,01010110b,00000010b,00011000b,10010001b db 00001010b,00011000b,00110000b,00011010b,00011000b,10101111b,00100010b,00011000b,00110111b,00110010b,00011000b,11010001b db 00111010b,00011000b,01101101b,01001010b,00011000b,00100100b,01010010b,00011000b,00111000b,01100010b,00000001b,00001100b db 00000010b,00011000b,00110000b,00000010b,00011000b,01010110b,00000010b,00011000b,10010001b,00001010b,00011000b,00110000b db 00011010b,00011000b,10101111b,00100010b,00011000b,00110111b,00110010b,00011000b,11010001b,01000000b,00011000b,01101101b db 01010110b,00011000b,00100100b,01100100b,00011000b,00111000b,01111010b,00000001b,00001100b,00000010b,00011000b,01010100b db 00000010b,00011000b,11001100b,00001100b,00011000b,00100111b,00010000b,00011000b,01010110b,00010110b,00011000b,10111010b db 11111110b,00101000b,10010010b,00000010b,00011000b,00000001b,00000010b,00011000b,11001100b,00001000b,00011000b,11100011b db 00010000b,00011000b,00101111b,00011010b,00011000b,10111010b,00100010b,01100001b,01011001b,11111110b,00101000b,10010010b db 00000010b,00011000b,00101111b,00000010b,00011000b,11001100b,00001000b,00011000b,01101111b,00010010b,00011000b,00000001b db 00011100b,00011000b,10111010b,00000010b,00011000b,00101101b,00000010b,00011000b,11001100b,00001100b,11011000b,01110110b db 00010110b,11011000b,10111010b,00100001b,00000001b,00011001b,00101011b,00011000b,11100011b,00101010b,01100000b,11110110b db 00110100b,10000001b,00001010b,00111110b,11000001b,00010001b,01001001b,00011000b,11011011b,01010011b,00011000b,00100110b db 01010010b,01100000b,11100010b,00000010b,01100000b,01110110b,00000010b,01100000b,10111010b,00000010b,01100001b,01011001b db 00000010b,00011000b,00101101b,00000010b,00011000b,11001100b,00001100b,11011000b,01110110b,00010110b,11011000b,10111010b db 00100001b,00000001b,00011001b,00101011b,00011000b,11100011b,00101010b,01100000b,11110110b,00110100b,10000001b,00001010b db 00111110b,11000001b,00010001b,01001001b,00011000b,11011011b,01010011b,00011000b,00100110b,01010010b,01100000b,11100010b db 00000010b,00011000b,00101011b,00000010b,00011000b,01000000b,00010100b,00011000b,01100101b,00101000b,00011000b,01100100b db 00111100b,00000001b,00010001b,00111100b,00011000b,11111000b,01010000b,00011000b,01101101b,01100100b,00011000b,01011110b db 00000010b,00011000b,00101011b,00000010b,00011000b,01000000b,00010100b,00011000b,01100101b,00010100b,00111000b,01100101b db 00101000b,00011000b,01100100b,01000110b,00000001b,00010001b,01000110b,00011000b,11111000b,01100100b,00011000b,01101101b db 10000010b,00011000b,01011110b,00000010b,00011000b,00100001b,00000010b,00011000b,00101101b,00010010b,00011000b,01010100b db 00100000b,00011000b,01010110b,00101110b,00011000b,10110010b,00111100b,00011000b,01110001b,01001010b,00011000b,01010111b db 00000010b,00011000b,00100001b,00000010b,00011000b,00101101b,00000010b,00011000b,01010100b,00010010b,00011000b,01010100b db 00100100b,00011000b,01010110b,00110110b,00011000b,10110010b,01001000b,00011000b,01110001b,01011010b,00011000b,01010111b db 00000010b,00011000b,00100001b,00000010b,00011000b,00101101b,00000010b,00011000b,01010100b,00000010b,00011000b,01010110b db 00010010b,00011000b,01010100b,00100100b,00011000b,01010110b,00110110b,00011000b,10110010b,00111100b,00011000b,00001001b db 01010100b,00011000b,01110001b,01110010b,00011000b,01010111b,00000010b,00000001b,01011001b,00000010b,00011000b,01000111b db 00000010b,00011000b,01001110b,00000010b,00011000b,11100110b,01011000b,00011000b,01010000b,01101110b,00011000b,01001100b db 00000010b,00011000b,00100001b,00000110b,00011000b,01101111b,00001100b,00011000b,00100111b,00010100b,00011000b,00110111b db 00011110b,00011000b,11001101b,00101010b,00011000b,00111101b,00111000b,00011000b,00100110b,01001000b,00011000b,11110000b db 01011010b,00000000b,00111000b,00000010b,00011000b,00100001b,00000010b,00011000b,00100111b,00000010b,00011000b,00110111b db 00000010b,00011000b,01101111b,00000110b,00011000b,01101111b,00001100b,00011000b,00100111b,00010100b,00011000b,00110111b db 00011110b,00011000b,11001101b,00110000b,00011000b,00111101b,01000100b,00011000b,00100110b,01011010b,00011000b,11110000b db 01110010b,00000000b,00111000b,00000010b,00011000b,01011000b,00000010b,00011000b,01100110b,00010010b,00011000b,10101111b db 00100010b,00011000b,01000011b,00110010b,00011000b,10011101b,01000010b,00000001b,01001111b,01010010b,00011000b,10111001b db 01100010b,00011000b,00010101b,01110010b,00000000b,00100110b,00000010b,00011000b,00000011b,00000010b,00011000b,00110111b db 00000010b,00011000b,01011111b,00000010b,00011000b,11000011b,01000110b,00011000b,11000011b,01100110b,00011000b,11001111b db 00000010b,00011000b,10010110b,00001010b,00011000b,11101011b,00001010b,00011000b,00100111b,00010100b,00011000b,00100001b db 00011010b,00011000b,01001101b,00011110b,00011000b,01001110b,00100010b,00011000b,01001111b,00101000b,00011000b,01001001b db 00110010b,00011000b,10110010b,00111100b,00011000b,01001000b,00000010b,00011000b,00100001b,00000010b,00011000b,00100111b db 00000010b,00011000b,10010110b,00000010b,00011000b,11101011b,00001010b,00001000b,11101011b,00001010b,00011000b,00100111b db 00010100b,00011000b,00100001b,00011010b,00011000b,01001101b,00011110b,00011000b,01001110b,00100010b,00011000b,01001111b db 00101100b,00011000b,01001001b,00111010b,00011000b,10110010b,01001000b,00011000b,01001000b,00000010b,00011000b,00100001b db 00000010b,00011000b,00100111b,00000010b,00011000b,10010110b,00000010b,00011000b,11101011b,00001010b,00001000b,11101011b db 00001010b,00011000b,00100111b,00010100b,00011000b,00100001b,00011010b,00011000b,01001101b,00011110b,00011000b,01001110b db 00100010b,00011000b,01001111b,00101100b,00011000b,01001001b,01000010b,00011000b,10110010b,01011000b,00011000b,01001000b db 00000010b,00011000b,00001010b,00000010b,00011000b,00100111b,00001100b,00011000b,00011100b,00011010b,00000001b,00110110b db 00100100b,00011000b,11100010b,00110010b,00000001b,01000001b,00111110b,00011000b,10011010b,01001100b,00011000b,10000001b db 01010110b,00011000b,01100111b,01100100b,00011000b,01100001b,00000010b,00011000b,01000111b,00001100b,00011000b,01001010b db 00011010b,00011000b,01001000b,00100100b,00000001b,00010011b,00110010b,00000001b,00011011b,00111100b,00011000b,11110001b db 01001010b,00011000b,11101011b,01010100b,00011000b,11001010b,00000010b,00011000b,00000001b,00000010b,00011000b,01000111b db 00001100b,00011000b,01001010b,00011010b,00011000b,01001011b,00100100b,00000001b,00010011b,00110010b,00000001b,01001011b db 00111100b,00011000b,11110001b,01001010b,00011000b,01010000b,01010100b,00011000b,01001100b,00000010b,00011000b,00100001b db 00000010b,00011000b,11000001b,00001110b,10011000b,01100010b,00011010b,10011000b,01101000b,00100110b,11011000b,00110001b db 00101110b,01100000b,01011111b,00110011b,00011000b,11000101b,00111111b,00011000b,00110000b,01001011b,00000000b,11111101b db 01001010b,00110000b,10000001b,01010111b,00001000b,00010001b,01100010b,10111000b,01100111b,00000010b,00011000b,00100111b db 00000010b,00011000b,00110111b,00010110b,00011000b,00010101b,00100000b,00000001b,01010101b,00101010b,00011000b,10000101b db 00111110b,00000001b,00011001b,01001000b,00011000b,01011001b,01010010b,00011000b,11110000b,01100110b,00011000b,00110110b db 01100110b,00011000b,01110010b,00000010b,00011000b,00100111b,00000010b,00011000b,00110111b,00010110b,00011000b,00010101b db 00100000b,00000001b,01010101b,00101110b,00011000b,10000101b,01000110b,00000001b,00011001b,01010100b,00011000b,01011001b db 01100010b,00011000b,11110000b,01111010b,00011000b,00110110b,01111010b,00011000b,01110010b,00000010b,00000001b,00001110b db 00000010b,00011000b,00100001b,00000010b,00011000b,00100111b,00010000b,00011000b,00011100b,00100000b,00011000b,01011101b db 00101110b,00011000b,01100010b,00111100b,00011000b,10000001b,01001000b,00011000b,00111100b,01010100b,00011000b,11110100b db 01011110b,00011000b,01011110b,01101000b,00011000b,11101010b,00000010b,00000001b,00001110b,00000010b,00011000b,00100001b db 00000010b,00011000b,00100111b,00010000b,00011000b,00011100b,00100000b,00011000b,11100100b,00101110b,00011000b,01100010b db 00111100b,00011000b,01101101b,01001000b,00011000b,10111001b,01010100b,00011000b,11010100b,01011110b,00011000b,01100111b db 01101000b,00011000b,11101100b,00000010b,00011000b,01000000b,00010010b,00000001b,00110110b,00011100b,00011000b,11100100b db 00101100b,00011000b,01110010b,00110110b,00011000b,01100101b,01000110b,00011000b,10111001b,01010000b,00000001b,00001101b db 01100000b,00011000b,11010100b,00000010b,00000001b,00011001b,00000010b,00011000b,00100001b,00000010b,00011000b,10101110b db 00001100b,00011000b,00101101b,00011110b,11011000b,00110111b,00101001b,00011000b,01011101b,00111011b,00111000b,00110010b db 01000101b,00111000b,00011101b,01010111b,00111000b,11001111b,01011110b,01100000b,11110100b,01100001b,00111000b,01011110b db 00000010b,00011000b,00101101b,00000010b,00011000b,10010101b,00001100b,00011000b,10110100b,00010110b,00000001b,00110110b db 00100010b,00011000b,01101101b,00101110b,00011000b,11010100b,00111100b,00011000b,00111100b,01001010b,00011000b,11011100b db 01011010b,00011000b,11000011b,01101010b,00000001b,00100000b,00000010b,00011000b,11101101b,00000010b,00011000b,01000100b db 00000010b,00011000b,11000010b,00000010b,00011000b,11011011b,00000010b,00011000b,11110011b,00000010b,00011000b,00100001b db 00000010b,00011000b,00101101b,00001110b,00000001b,00110110b,00001110b,00111000b,01011101b,00011010b,00011000b,01011101b db 00011010b,00111000b,00010111b,00100110b,00011000b,00010111b,00110010b,00000001b,00111100b,00111110b,00011000b,01100001b db 01001010b,00011000b,11100010b,01010110b,00011000b,00111100b,01100010b,00011000b,11110010b,00000010b,00011000b,00100001b db 00000010b,00011000b,10110110b,00010000b,00011000b,01111000b,00011110b,00011000b,00100100b,00101100b,00011000b,11100101b db 00111010b,00011000b,01110101b,01001000b,00011000b,10011001b,01010110b,00011000b,10111111b,01100100b,00011000b,00100110b db 00000010b,00011000b,00100001b,00000010b,00011000b,01111000b,00000010b,00011000b,10110110b,00010000b,00011000b,01111000b db 00011110b,00011000b,00100100b,00101100b,00011000b,11100101b,00111010b,00011000b,01110101b,00111110b,01100000b,11000000b db 01001110b,00011000b,10011001b,01100010b,00011000b,10111111b,01110110b,00011000b,00100110b,00000010b,00011000b,01100011b db 00001000b,00011000b,01101111b,00010110b,00000001b,00011001b,00011100b,00011000b,10001001b,00101010b,01100000b,11001101b db 00101011b,00011000b,10110100b,00110001b,00011000b,11100100b,00111111b,00011000b,01100111b,01000101b,00011000b,00100100b db 01010011b,00000001b,00011011b,01011000b,01100000b,10101111b,00000010b,00011000b,00101000b,00001100b,00011000b,00011100b db 00011010b,00011000b,01101010b,00101000b,00011000b,01100010b,00111000b,00011000b,10111001b,01001000b,00011000b,10100011b db 01011000b,00011000b,01100111b,01101000b,00011000b,00001100b,11111110b,00101000b,01011001b,00000010b,00011000b,00100001b db 00000010b,00011000b,01100111b,00010010b,10011000b,00010100b,00011010b,10011000b,01011000b,00101010b,11011000b,01101010b db 00110010b,11011000b,01100011b,00111100b,01100000b,11100001b,01000010b,10111000b,11001001b,01001011b,00011000b,00010101b db 01011010b,00000000b,11100111b,01100011b,00011000b,11110010b,01110010b,10000000b,00100110b,00000010b,00011000b,00100001b db 00000010b,00011000b,10111000b,00001000b,00011000b,00100111b,00010000b,00011000b,11001100b,00011010b,00011000b,00101100b db 00100110b,00011000b,01111010b,00110100b,00011000b,00101110b,01000100b,00011000b,01100011b,01010110b,00011000b,00100100b db 01101010b,00000000b,11110010b,00000010b,00011000b,00100001b,00000010b,00011000b,10111000b,00001000b,00011000b,00100111b db 00010000b,00011000b,11001100b,00011010b,00011000b,00101100b,00100110b,00011000b,01111010b,00111000b,00011000b,00101110b db 01001100b,00011000b,01100011b,01100010b,00011000b,00100100b,01111010b,00000000b,11110010b,00000010b,00001000b,10111111b db 00000010b,00011000b,00100001b,00000010b,00011000b,00101000b,00010100b,10011000b,01101010b,00010100b,10011000b,01101011b db 00100111b,00111000b,00110111b,00110010b,01100001b,00010111b,00111001b,00111000b,00101010b,01001011b,00011000b,00100100b db 01011010b,01100000b,11000010b,01011101b,00111000b,00111000b,00000010b,00011000b,00101011b,00000010b,00011000b,01100010b db 00001100b,00011000b,01110100b,00010110b,00011000b,11100100b,00100000b,00011000b,11001110b,00101010b,00011000b,01100001b db 00110100b,00011000b,11101000b,00111110b,00011000b,10100011b,01001000b,00011000b,00001110b,01010010b,01100001b,01001110b db 01010010b,01011000b,01101000b,01011100b,00000000b,11010010b,00000010b,00011000b,01101110b,00000010b,00011000b,10000100b db 00010010b,00011000b,00100011b,00011100b,00011000b,11100011b,00101110b,00011000b,11011011b,00111000b,00011000b,01110101b db 01001010b,00011000b,10011100b,00000010b,00011000b,00100001b,00000010b,00011000b,00101011b,00001100b,00011000b,00011110b db 00010110b,00011000b,11001011b,00100010b,00011000b,00011111b,00101110b,00000001b,00011000b,00111100b,00011000b,01000100b db 01001010b,00011000b,00100100b,01011010b,00011000b,10110011b,01101010b,00011000b,11100000b,00000010b,00000001b,00001101b db 00000010b,00011000b,00001010b,00000010b,00011000b,00101011b,00010000b,00011000b,01100010b,00011110b,00011000b,01100111b db 00101100b,00011000b,10111001b,00111010b,00011000b,10011010b,01001000b,00011000b,01100001b,01010110b,00000000b,11000100b db 01100100b,00011000b,10100011b,01110010b,00011000b,11111011b,10000000b,00001000b,11101000b,00000010b,00011000b,00001010b db 00000010b,00011000b,00101011b,00001110b,00011000b,01111010b,00011010b,00011000b,10011010b,00100110b,00000001b,00111001b db 00110010b,00011000b,10111001b,00111110b,00011000b,10011100b,01001010b,00011000b,10100011b,01010110b,00011000b,10101101b db 01100010b,00011000b,00100101b,00000010b,00011000b,00001010b,00000010b,00011000b,00101011b,00000010b,00011000b,01111010b db 00000010b,00011000b,10011010b,00001110b,00011000b,01111010b,00011010b,00011000b,10011010b,00100110b,00000001b,00111001b db 00110010b,00011000b,10111001b,00111110b,00011000b,10011100b,01001010b,00011000b,10100011b,01010110b,00011000b,10101101b db 01100010b,00011000b,00100101b,00000010b,00000001b,00011001b,00000010b,00011000b,01111011b,00010000b,00011000b,00110100b db 00011110b,00011000b,01011000b,00101100b,00011000b,01101010b,00111010b,00011000b,10000101b,01001000b,00011000b,00110101b db 01010110b,00011000b,10011101b,01100100b,00011000b,00100010b,00000010b,00000001b,00011001b,00000010b,00011000b,00110100b db 00000010b,00011000b,01011000b,00000010b,00011000b,01111011b,00010000b,00011000b,00110100b,00011110b,00011000b,01011000b db 00101100b,00011000b,01101010b,00111010b,00011000b,10000101b,01001000b,00011000b,00110101b,01100000b,00011000b,10011101b db 01111000b,00011000b,00100010b,00000010b,00000001b,00111100b,00000010b,00011000b,00100001b,00010100b,00011000b,10110101b db 00100110b,00011000b,11001011b,00111000b,00011000b,00100100b,01001010b,00011000b,00110110b,01011100b,00011000b,00111011b db 01101110b,00001000b,10000101b,00000010b,00000001b,00111100b,00000010b,00011000b,00011110b,00000010b,00011000b,10110101b db 00000010b,00011000b,11001011b,00010100b,00011000b,10110101b,00100110b,00011000b,11001011b,00111000b,00011000b,00100100b db 01000010b,00011000b,00011111b,01010100b,00011000b,00110110b,01110000b,00011000b,00111011b,10001100b,00001000b,10000101b db 00000010b,00011000b,00100001b,00001100b,00011000b,01101010b,00011000b,00011000b,10010001b,00100010b,00000001b,00011111b db 00100010b,00011000b,01101001b,00101110b,00011000b,00111101b,00111000b,00011000b,10000011b,01000100b,00000001b,01011110b db 01001110b,00011000b,11110011b,01011010b,00011000b,11110110b,00000010b,00011000b,00110111b,00010110b,00011000b,11000111b db 00101100b,00011000b,00111100b,00101100b,00011000b,00111101b,00101100b,00011000b,00111110b,01000010b,00011000b,01110100b db 01011000b,00011000b,00111010b,01101110b,00011000b,00111111b,00000010b,00011000b,00110111b,00010110b,00011000b,10000100b db 00101100b,00011000b,00111100b,00101100b,00011000b,00111101b,00101100b,00011000b,00111110b,00110010b,00011000b,10111110b db 01001100b,00011000b,01110100b,01101100b,00011000b,00111010b,10001100b,00011000b,00111111b,00000010b,00011000b,11011001b db 00000010b,00011000b,00100001b,00000010b,00011000b,10010001b,00010000b,00011000b,00110000b,00011110b,00011000b,00111101b db 00101100b,00011000b,00100100b,00111010b,00011000b,01100001b,01001000b,00011000b,00010001b,01010110b,00000001b,01100000b db 01100100b,00011000b,01101101b,00000010b,00011000b,00101011b,00000010b,00011000b,01000000b,00010100b,00011000b,00011100b db 00011010b,00011000b,10000001b,00100000b,00011000b,01100001b,00110100b,00011000b,00011111b,00111010b,00000001b,00111010b db 01000000b,00011000b,11010011b,01010100b,00000000b,10111111b,01011010b,00000001b,00111111b,00000010b,00011000b,00101011b db 00000010b,00011000b,00110100b,00001110b,00000001b,01010000b,00011010b,00011000b,01111011b,00100110b,00011000b,00101110b db 00110010b,00011000b,00101100b,00111110b,00000001b,00111100b,01001010b,00011000b,10111001b,01010110b,00011000b,00110101b db 01100010b,00011000b,11110010b,00000010b,00000001b,01010000b,00000010b,00011000b,00101011b,00000010b,00011000b,00110100b db 00001110b,00000001b,01010000b,00011010b,00011000b,01111011b,00100110b,00011000b,00101110b,00110110b,00011000b,00101100b db 01000110b,00000001b,00111100b,01010110b,00011000b,10111001b,01100110b,00011000b,00110101b,01110110b,00011000b,11110010b db 00000010b,00011000b,00101011b,00000010b,00011000b,00110111b,00000010b,00011000b,01101100b,00000010b,00011000b,10010001b db 00010000b,00011000b,01101100b,00011110b,00011000b,00101011b,00101100b,00011000b,00110111b,00111010b,00011000b,11101111b db 01010000b,00011000b,01100001b,01100110b,00011000b,00111000b,01111100b,00000001b,01011101b,00000010b,00000001b,00111100b db 00000010b,00011000b,00100001b,00000010b,00011000b,00101101b,00010010b,00011000b,01101111b,00100010b,00011000b,10101111b db 00110010b,00011000b,00100100b,01000010b,00011000b,11001101b,01010010b,00011000b,11001011b,01100010b,00011000b,00100110b db 00000010b,00000001b,00111100b,00000010b,00011000b,00011110b,00000010b,00011000b,00101101b,00010010b,00011000b,01101111b db 00100010b,00011000b,10101111b,00110010b,00011000b,00011111b,01000010b,00011000b,11001101b,01010010b,00011000b,11100101b db 01100010b,00011000b,01011001b,00000010b,00011000b,00100001b,00000010b,00011000b,10100000b,00000010b,00011000b,10110000b db 00010010b,00011000b,01100001b,00011000b,00011000b,00111100b,00101000b,00011000b,01101001b,00110000b,00011000b,01101111b db 01000000b,00011000b,11000111b,01001000b,00011000b,10100001b,01011000b,00000001b,00010110b,01100000b,00011000b,11000000b db 00000010b,00011000b,00100001b,00001110b,00011000b,00101011b,00011010b,11000001b,00110110b,00100110b,11011000b,01011111b db 00110011b,00011000b,00010111b,00111111b,00011000b,00011100b,00111110b,01100001b,00010000b,01001010b,00011000b,00100100b db 01010110b,11011000b,01101101b,01100010b,11000001b,01011011b,00000010b,00011000b,10100110b,00010110b,00011000b,10100110b db 00101010b,00011000b,10100110b,00111110b,00011000b,10100110b,01010010b,00011000b,10100110b,01100110b,00011000b,10100110b db 01111010b,00011000b,10100110b,10001110b,00011000b,10100110b,10100010b,00011000b,10100110b,10110110b,00011000b,10100110b db 00000010b,00011000b,00100001b,11111110b,00101000b,10010010b,00000010b,00000001b,00010111b,00000010b,00011000b,00011011b db 00001110b,00011000b,01110100b,00011010b,00011000b,11100100b,00100110b,00011000b,01100010b,00101000b,00011000b,10100111b db 00110010b,00011000b,11100101b,00111110b,00011000b,01000100b,01001010b,00011000b,01100001b,01010110b,00011000b,11000101b db 01100010b,00000001b,00011011b,00000010b,00011000b,00000001b,00000010b,00011000b,01111010b,00010010b,00011000b,10111010b db 00011010b,00011000b,10110101b,00101010b,00011000b,01011101b,00110010b,00011000b,00101111b,01000010b,00011000b,11010100b db 01001010b,00000001b,00111001b,01011010b,00011000b,01011110b,01100010b,00011000b,11000011b,01110010b,00011000b,00111011b db 11111110b,00101000b,10010010b,00000010b,00011000b,00101011b,00000010b,00011000b,01100010b,00010010b,00011000b,00001001b db 00100010b,00011000b,01110001b,00110010b,00011000b,10000001b,01000010b,00011000b,01100111b,01010010b,00011000b,01010101b db 01100010b,00011000b,01010111b,11111110b,00101000b,10010010b,00000010b,00011000b,00110100b,00001110b,00011000b,00101011b db 00011010b,00011000b,01111011b,00100110b,00011000b,00000111b,00110010b,00011000b,01101100b,00111110b,00011000b,11110001b db 01001010b,00011000b,00110101b,01010110b,00011000b,01101101b,01100010b,00011000b,01111110b,11111110b,00101000b,10010010b db 00000010b,00011000b,00100001b,00001000b,00011000b,00101101b,00010000b,00011000b,01101111b,00011010b,00011000b,00010111b db 00100110b,00011000b,11010000b,00110100b,00011000b,01110101b,01000100b,00011000b,11001101b,01010110b,00011000b,00100010b db 01101010b,00011000b,11010111b,00000010b,00011000b,00000001b,00000010b,00011000b,00101101b,00001000b,00011000b,00100111b db 00001110b,00000001b,00011111b,00010100b,00011000b,10000111b,00011010b,00011000b,00000011b,00100100b,00011000b,01101011b db 00101110b,00011000b,00101111b,00111000b,00011000b,01111001b,01000010b,00011000b,01101111b,01010000b,00011000b,01110001b db 01011110b,00011000b,00100110b,00000010b,00011000b,00101011b,00000010b,00011000b,00101100b,00010110b,00011000b,01010100b db 00101010b,00011000b,00101110b,00111110b,00011000b,01100010b,01010010b,00011000b,11010001b,01100110b,00011000b,01110011b db 01111010b,00011000b,11110010b,10001110b,00011000b,01010111b,10100010b,00000001b,01011011b,00000010b,00011000b,00101011b db 00000010b,00011000b,00101100b,00010110b,00011000b,00110100b,00101010b,00011000b,00101110b,00111110b,00011000b,01010011b db 01010010b,00011000b,00010111b,01100110b,00011000b,00110101b,01111010b,00011000b,11001111b,10001110b,00011000b,01111110b db 10100010b,00000001b,01011011b,00000010b,00011000b,00101011b,00000010b,00011000b,00101100b,00010110b,00110000b,00110111b db 00010110b,00011000b,00111101b,00101010b,00001000b,11110000b,00101010b,00110000b,00101110b,00111110b,00011000b,00010000b db 01010010b,00001000b,00111110b,01100110b,00011000b,00110110b,01111010b,00011000b,11110011b,10001110b,00011000b,00111000b db 10100010b,00000001b,01011011b,00000010b,00011000b,00101011b,00000010b,00011000b,00101100b,00010000b,00011000b,11001001b db 00011110b,00011000b,01100111b,00101100b,00011000b,10011101b,00111010b,00011000b,00100101b,01001000b,00011000b,10111000b db 01010110b,00011000b,11110010b,01100100b,00011000b,01011001b,01110010b,00011000b,00111111b,00000010b,00011000b,00101011b db 00000010b,00011000b,00101100b,00000010b,00011000b,01100111b,00000010b,00011000b,11001001b,00010000b,00011000b,11001001b db 00011110b,00011000b,01100111b,00101100b,00011000b,10011101b,00111010b,00011000b,00100101b,01001100b,00011000b,10111000b db 01011110b,00011000b,11110010b,01110000b,00011000b,01011001b,10000010b,00011000b,00111111b,00000010b,00011000b,00101011b db 00000010b,00011000b,00101100b,00000010b,00011000b,01100111b,00000010b,00011000b,11001001b,00010000b,00011000b,11001001b db 00011110b,00011000b,01100111b,00101100b,00011000b,10011101b,00111010b,00011000b,00100101b,01001100b,00011000b,10111000b db 01011110b,00011000b,11110010b,01111010b,00011000b,01011001b,10010110b,00011000b,00111111b,00000010b,00011000b,00010010b db 00010110b,00011000b,11011011b,00101100b,00011000b,00010000b,01000010b,00011000b,01101001b,01011000b,00011000b,00111000b db 01101110b,00011000b,11110000b,10000100b,00011000b,10000001b,10011010b,00011000b,10110001b,10110000b,00011000b,11110110b db 11000110b,00011000b,11111000b,00000010b,00011000b,00010010b,00010110b,00011000b,11011011b,00101100b,00011000b,00010000b db 01000010b,00011000b,01101001b,01011000b,00011000b,01111110b,01101110b,00011000b,11110001b,10000100b,00011000b,10000001b db 10011010b,00011000b,11011101b,10110000b,00011000b,11110110b,11000110b,00011000b,11111000b,00000010b,00011000b,01001001b db 00000010b,00011000b,01011101b,00000010b,00011000b,01101001b,00000010b,00011000b,11010111b,00010100b,00011000b,11011011b db 00101000b,00011000b,11110110b,00111100b,00011000b,11111000b,01010000b,00011000b,11100010b,01100100b,00011000b,11000011b db 00000010b,00000000b,00000001b,00000010b,00000000b,00101011b,00001100b,00000000b,01000111b,00010110b,00000000b,01100010b db 00100000b,00000000b,11100100b,00101010b,00000000b,01100111b,00110100b,00000000b,01001000b,00111110b,00000000b,01100001b db 01001000b,00000000b,00010101b,01010010b,00000000b,11000101b,01011100b,00000000b,11001010b,00000010b,00000000b,00000001b db 00000010b,00000000b,00101011b,00000010b,00000000b,01000111b,00000010b,00000000b,01100010b,00001100b,00000000b,01000111b db 00010110b,00000000b,01100010b,00100000b,00000000b,11010010b,00100010b,00000000b,11100100b,00101110b,00000000b,01100111b db 00111010b,00000001b,01011100b,01000110b,00000000b,01100001b,01010010b,00000000b,00010101b,01011110b,00000000b,11000101b db 01101010b,00000000b,11001110b,00000010b,00000000b,00000001b,00000010b,00000000b,00101011b,00000010b,00000000b,01000111b db 00000010b,00000000b,01100010b,00001100b,00000000b,01000111b,00010110b,00000000b,01100010b,00100000b,00000000b,11010010b db 00100010b,00000000b,11100100b,00101110b,00000000b,01100111b,00111010b,00000001b,01011100b,01000110b,00000000b,01100001b db 01010110b,00000000b,00010101b,01100110b,00000000b,11000101b,01110110b,00000000b,11001110b,00000010b,00000000b,00001010b db 00000010b,00000000b,00101101b,00001110b,00000000b,01110100b,00010100b,00000000b,00110100b,00100000b,00000000b,01000000b db 00100110b,00000000b,00011100b,00110010b,00000000b,01010011b,00111000b,00000000b,01100010b,01000100b,00000000b,10100011b db 01001010b,00000000b,01110111b,01010110b,00000000b,00110101b,00000010b,00000000b,00001010b,00000010b,00000000b,00101101b db 00000010b,00000000b,00110100b,00000010b,00000000b,01110100b,00001110b,00000000b,01110100b,00011010b,00000000b,00110100b db 00100000b,00000000b,00011000b,00100010b,00000000b,01000000b,00101010b,00000000b,00011100b,00111000b,00000001b,01010011b db 01000000b,00000000b,01100010b,01001110b,00000000b,10100011b,01010110b,00000000b,01110111b,01100100b,00000001b,01000111b db 00000010b,00000000b,00000111b,00000010b,00000000b,00001010b,00000010b,00000000b,00101101b,00000010b,00000000b,00110100b db 00000010b,00000000b,01110100b,00001110b,00000000b,01110100b,00011010b,00000000b,00110100b,00100000b,00000000b,00011000b db 00100010b,00000000b,01000000b,00101010b,00000000b,00011100b,00111000b,00000001b,01010011b,01000000b,00000000b,01100010b db 01001000b,00000001b,00101011b,01010100b,00000000b,10100011b,01100010b,00000000b,01110111b,01110110b,00000001b,01000111b db 00000010b,00000000b,00100001b,00000010b,00000000b,00101101b,00001100b,00000000b,10111101b,00010100b,00000000b,00110111b db 00011110b,00000000b,01110101b,00100110b,00000000b,11000001b,00110000b,00000001b,00101100b,00111000b,00000000b,00100100b db 01000010b,00000000b,11111010b,01001010b,00000000b,10110110b,01010100b,00000000b,00111000b,01011100b,00000001b,00011011b db 00000010b,00000000b,00100001b,00000010b,00000000b,00101101b,00000010b,00000000b,00110111b,00000010b,00000000b,10111101b db 00001100b,00000000b,10111101b,00010100b,00000000b,00110111b,00011110b,00000000b,01110101b,00100000b,00000001b,01010101b db 00101000b,00000000b,11000001b,00110010b,00000001b,00101100b,00111110b,00000000b,00100100b,01001010b,00000001b,01001010b db 01010100b,00000000b,10110110b,01011100b,00000000b,01011001b,01101010b,00000001b,00011011b,00000010b,00000000b,00100001b db 00000010b,00000000b,00101101b,00000010b,00000000b,00110111b,00000010b,00000000b,10111101b,00001100b,00000000b,10111101b db 00010100b,00000000b,00110111b,00011110b,00000000b,01110101b,00100000b,00000001b,01010101b,00101000b,00000000b,11000001b db 00110010b,00000001b,00101100b,00111110b,00000000b,00100100b,01001110b,00000001b,01001010b,01011100b,00000000b,10110110b db 01101000b,00000000b,01011001b,01111010b,00000001b,00011011b,00000010b,00000000b,00100001b,00001010b,00000001b,01010000b db 00010010b,00000000b,00011100b,00011010b,00000000b,00101100b,00100010b,00000001b,00111100b,00101010b,00000000b,00101110b db 00110010b,00000000b,11001111b,00111010b,00000000b,10111000b,01000010b,00000000b,00100100b,01001010b,00000001b,00001101b db 01010010b,00000000b,11110010b,01011010b,00000000b,10101000b,00000010b,00000000b,00011100b,00000010b,00000000b,00100001b db 00000010b,00000000b,00101100b,00000010b,00000001b,01010000b,00001010b,00000001b,01010000b,00010010b,00000000b,00011100b db 00011010b,00000000b,00101100b,00100010b,00000001b,00111100b,00101100b,00000000b,00101110b,00110110b,00000000b,11001111b db 01000000b,00000000b,10111000b,01001010b,00000000b,00100100b,01010100b,00000001b,00001101b,01011110b,00000000b,11110010b db 01101000b,00000000b,10101000b,00000010b,00000000b,00100001b,00000010b,00000000b,00101101b,00001010b,00000000b,00100111b db 00010010b,00000000b,00011101b,00011010b,00000000b,00011100b,00100010b,00000001b,00111100b,00101010b,00000001b,00101100b db 00110010b,00000000b,00101010b,00111010b,00000001b,01010111b,01000010b,00000000b,10101111b,01001010b,00000000b,10011100b db 01010010b,00000000b,10111011b,00000010b,00000000b,00011101b,00000010b,00000000b,00100001b,00000010b,00000000b,00100111b db 00000010b,00000000b,00101101b,00001010b,00000000b,00100111b,00010010b,00000000b,00011101b,00011010b,00000000b,00011100b db 00100010b,00000001b,00111100b,00101110b,00000001b,00101100b,00111010b,00000000b,10011010b,01000110b,00000001b,01010111b db 01010010b,00000000b,10100011b,01011110b,00000000b,10011100b,01101010b,00000000b,10111011b,00000010b,00000000b,00100001b db 00000010b,00000000b,01010001b,00001010b,00000000b,00101000b,00000010b,00000000b,01101010b,00001110b,00000000b,01101010b db 00000010b,00000000b,01000111b,00010100b,00000000b,01000111b,00011010b,00000000b,00010000b,00100010b,00000000b,01001110b db 00101000b,00000000b,11101010b,00110000b,00000000b,01001000b,00110110b,00000000b,00010010b,00111110b,00000000b,11010101b db 01000100b,00000001b,00111110b,01001100b,00000000b,11001010b,00000010b,00000000b,01101010b,00001110b,00000000b,01101010b db 00000010b,00000000b,01011101b,00010100b,00000000b,01011101b,00011010b,00000000b,00010000b,00100010b,00000000b,10110110b db 00101000b,00000000b,11101100b,00110000b,00000000b,00111100b,00110110b,00000000b,00010010b,00111110b,00000000b,01110001b db 01000100b,00000001b,00111110b,01001100b,00000000b,01011100b,00000010b,00000001b,00110110b,00000110b,00000000b,00101101b db 00001110b,00000000b,01000111b,00011010b,00000001b,00001011b,00101010b,00000000b,00110110b,00111110b,00000000b,11110000b db 01010110b,00000000b,01001000b,00000010b,00000001b,00110110b,00000110b,00000000b,00101101b,00001110b,00000000b,01000111b db 00011010b,00000001b,00001011b,00100110b,00000000b,11111100b,00110010b,00000000b,10011010b,00111110b,00000001b,01011010b db 01001010b,00000000b,10101000b,01010110b,00000000b,11111101b,01100010b,00000000b,00111000b,00000010b,00000000b,00101101b db 00000010b,00000000b,01000111b,00000010b,00000001b,00001011b,00000010b,00000001b,00110110b,00000010b,00000000b,01110101b db 00000110b,00000000b,01101010b,00001110b,00000000b,01001010b,00011010b,00000001b,00001011b,00101010b,00000000b,11101011b db 00111110b,00000000b,11110001b,01010110b,00000000b,10011001b,00000010b,00000000b,00000001b,00000110b,00000000b,01101010b db 00001110b,00000000b,01001010b,00011010b,00000001b,00001011b,00100110b,00000000b,11111100b,00110010b,00000001b,00000011b db 00111110b,00000000b,10111001b,01001010b,00000000b,00001101b,01010110b,00000000b,11001111b,01100010b,00000001b,01000110b db 00000010b,00000000b,00000001b,00000010b,00000000b,01001010b,00000010b,00000000b,01101010b,00000010b,00000001b,00001011b db 00000010b,00000000b,00001010b,00000010b,00000000b,01101010b,00001010b,00000000b,10001101b,00010010b,00000000b,00011100b db 00011100b,00000000b,10011010b,00100110b,00000000b,10101010b,00110010b,00000000b,11001110b,00111110b,00000000b,10111101b db 01001100b,00000000b,11101000b,01011010b,00000000b,01011011b,00000010b,00000000b,00001010b,00000010b,00000000b,00011100b db 00000010b,00000000b,01101010b,00000010b,00000000b,10001101b,00001010b,00000000b,10001101b,00010010b,00000000b,00011100b db 00011100b,00000000b,10011010b,00100110b,00000000b,10101010b,00101000b,00000000b,01100111b,00101000b,00000000b,01101000b db 00101000b,00000000b,11010010b,00110010b,00000000b,00001110b,00111110b,00000000b,10100011b,01001100b,00000000b,01100001b db 01011010b,00000000b,11100010b,00000010b,00000000b,00001010b,00000010b,00000000b,01101010b,00001010b,00000000b,10001101b db 00010010b,00000000b,00011100b,00011100b,00000000b,10011010b,00100110b,00000000b,10101010b,00110010b,00000000b,10110100b db 00111110b,00000000b,01101101b,01001100b,00000000b,11110111b,01011010b,00000001b,00100000b,00000010b,00000000b,00101101b db 00000010b,00000000b,01000000b,00001000b,00000000b,01110100b,00010000b,00000000b,01100010b,00011010b,00000000b,00010001b db 00100110b,00000000b,01101000b,00110100b,00000001b,00011011b,01000100b,00000001b,01001100b,01010110b,00000000b,01100001b db 00000010b,00000000b,00101101b,00000010b,00000000b,01000000b,00000010b,00000000b,01100010b,00000010b,00000000b,01110100b db 00001000b,00000000b,01110100b,00010000b,00000000b,01100010b,00011010b,00000000b,00010001b,00100110b,00000000b,01101000b db 00111000b,00000001b,00011011b,01001100b,00000001b,01001100b,01100010b,00000000b,01100001b,00000010b,00000000b,01000111b db 00001000b,00000000b,00100001b,00001110b,00000000b,01001110b,00010100b,00000000b,01001001b,00100000b,00000000b,01001000b db 00101100b,00000000b,00011101b,00111000b,00000000b,01001101b,01001000b,00000000b,01001010b,01011010b,00000000b,11001010b db 01101100b,00000000b,10010011b,00000010b,00000000b,00100001b,00000010b,00000000b,01000111b,00000010b,00000000b,01001001b db 00000010b,00000000b,01001110b,00001000b,00000000b,00100001b,00001110b,00000000b,01001110b,00010100b,00000000b,01001001b db 00100000b,00000000b,01001000b,00101100b,00000000b,00011101b,00101110b,00000000b,10110111b,00111000b,00000000b,01000100b db 01001000b,00000001b,01000111b,01011010b,00000000b,10101010b,01101100b,00000000b,11011111b,00000010b,00000000b,00100001b db 00001010b,00000000b,11111101b,00011000b,00000000b,10111001b,00100000b,00000000b,00111100b,00101110b,00000000b,01011111b db 00110110b,00000000b,10010010b,01000100b,00000001b,00101010b,01001100b,00000000b,11110100b,01011010b,00000000b,00100110b db 01100010b,00000000b,10101111b,01110000b,00000000b,00100101b,00000010b,00000000b,00101101b,00000010b,00000000b,00110111b db 00001110b,00000000b,00110000b,00011010b,00000000b,00010001b,00101010b,00000000b,00110110b,00111110b,00000000b,01100010b db 01010110b,00000000b,11100100b,01101110b,00000000b,01100001b,00000010b,00000000b,00010001b,00000010b,00000000b,00101101b db 00000010b,00000000b,00110111b,00000010b,00000001b,01011010b,00000110b,00000000b,00110111b,00001110b,00000000b,00110000b db 00011010b,00000000b,00010001b,00101010b,00000000b,00110110b,00110010b,00000000b,10110110b,01000010b,00000000b,11111110b db 01000010b,00000001b,00000000b,01011110b,00000000b,11111111b,01111010b,00000000b,00111000b,00000010b,00000000b,10010001b db 00001110b,00000000b,01100010b,00011010b,00000000b,11100110b,00100110b,00000001b,01011010b,00110010b,00000000b,00111101b db 00111110b,00000000b,01100001b,01001010b,00000000b,00110110b,01001010b,00000000b,01110010b,00000010b,00000000b,01100010b db 00000010b,00000000b,10010001b,00000010b,00000000b,11100110b,00000010b,00000001b,01011010b,00001110b,00000000b,01100010b db 00011010b,00000000b,11100110b,00100110b,00000001b,01011010b,00110100b,00000000b,00010000b,01000010b,00000000b,10111000b db 01010000b,00000000b,01001110b,01011110b,00000001b,00111110b,01101010b,00000000b,00010010b,00000010b,00000000b,10010110b db 00001010b,00000000b,00101101b,00010100b,00000000b,00110111b,00011100b,00000000b,11001101b,00100110b,00000000b,11111010b db 00101110b,00000001b,00110110b,00111000b,00000001b,01100000b,01000000b,00000000b,00110110b,01001010b,00000000b,10011100b db 01010010b,00000001b,01000011b,01011100b,00000000b,10000101b,01100100b,00000000b,00111000b,00000010b,00000000b,00101101b db 00000010b,00000000b,00110111b,00000010b,00000000b,10010110b,00000010b,00000000b,11001101b,00001010b,00000000b,00101101b db 00010100b,00000000b,00110111b,00011100b,00000000b,11001101b,00100110b,00000000b,11111010b,00101110b,00000001b,00110110b db 00111000b,00000001b,01100000b,01000000b,00000000b,00110110b,01001010b,00000000b,10011100b,01011000b,00000001b,01000011b db 01101000b,00000000b,10000101b,01110110b,00000000b,00111000b,00000010b,00000000b,00100001b,00000010b,00000000b,00101101b db 00000110b,00000000b,00100111b,00001110b,00000000b,11010101b,00011010b,00000000b,00101111b,00011110b,00000000b,00000011b db 00100110b,00000001b,00010010b,00110010b,00000000b,11001100b,00110110b,00000000b,10111001b,00111110b,00000001b,01010111b db 01001010b,00000000b,11010111b,01001110b,00000000b,00100110b,00000010b,00000000b,00000011b,00000010b,00000000b,00101101b db 00000010b,00000000b,00101111b,00000010b,00000000b,11010101b,00000010b,00000000b,00001010b,00000010b,00000000b,00100111b db 00000010b,00000000b,01111010b,00000010b,00000000b,10101000b,00000010b,00000001b,00110110b,00001000b,00000000b,00010100b db 00001110b,00000000b,10111001b,00011000b,00000000b,10011010b,00100010b,00000000b,00111100b,00110000b,00000000b,01100111b db 00111110b,00000000b,10100011b,01010000b,00000000b,10100100b,01100010b,00000000b,11110110b,00000010b,00000000b,01011101b db 00000110b,00000000b,01101010b,00001010b,00000000b,11100101b,00001110b,00000000b,10111101b,00010110b,00000000b,00111100b db 00011110b,00000001b,00111101b,00100110b,00000000b,01111000b,00110010b,00000000b,11110110b,00111110b,00000000b,11001001b db 01001010b,00000001b,01000010b,01011010b,00000000b,10011001b,00000010b,00000000b,01011101b,00000010b,00000000b,01100100b db 00000010b,00000000b,01101010b,00000010b,00000000b,11100101b,00000110b,00000000b,01101010b,00001010b,00000000b,11100101b db 00001110b,00000000b,10111101b,00010110b,00000000b,00111100b,00011110b,00000001b,00111101b,00100110b,00000000b,01111000b db 00110010b,00000000b,11110110b,00111110b,00000000b,11001001b,01001000b,00000000b,00111111b,01010100b,00000001b,01000010b db 01101110b,00000000b,10011001b,00000010b,00000000b,00100001b,00001110b,00000000b,01101010b,00011010b,00000000b,01011000b db 00100000b,00000001b,01001111b,00101100b,00000000b,01010110b,00111000b,00000000b,10011101b,00111110b,00000000b,11001001b db 01001010b,00000000b,10011100b,01010110b,00000000b,11000000b,01011100b,00000000b,11000111b,00000010b,00000000b,00110100b db 00001000b,00000000b,01111011b,00001110b,00000000b,10101110b,00011100b,00000000b,01101100b,00100010b,00000000b,01010011b db 00101000b,00000000b,00100010b,00110110b,00000000b,10110110b,00111100b,00000000b,00110101b,01000010b,00000001b,01001110b db 01010000b,00000000b,10000101b,01010110b,00000000b,10101111b,01011100b,00000001b,00000001b,00000010b,00000000b,00001010b db 00000010b,00000000b,00101011b,00001010b,00000000b,11000001b,00010010b,00000000b,01100101b,00011010b,00000001b,00110110b db 00100010b,00000000b,10011010b,00101010b,00000000b,11111100b,00110010b,00000000b,11000101b,00111010b,00000000b,10111001b db 01000010b,00000001b,00011010b,01001010b,00000000b,01101101b,01010010b,00000000b,11110111b,01011010b,00000000b,11010100b db 00000010b,00000000b,10111101b,00001100b,00000001b,00101100b,00001100b,00000001b,01011010b,00010110b,00000000b,00110111b db 00100000b,00000000b,11011110b,00101010b,00000000b,10000101b,00110100b,00000000b,10011100b,00110100b,00000000b,10101101b db 00111110b,00000000b,01011001b,01001000b,00000000b,11111000b,01010010b,00000000b,01011010b,00000010b,00000000b,10111101b db 00000010b,00000001b,00101100b,00000010b,00000001b,01000001b,00000010b,00000001b,01011010b,00001100b,00000001b,00101100b db 00001100b,00000001b,01011010b,00010110b,00000000b,00110111b,00100000b,00000000b,11011110b,00101010b,00000000b,10000101b db 00110100b,00000000b,10011100b,00110100b,00000000b,10101101b,01001000b,00000000b,01011001b,01011100b,00000000b,11111000b db 01110000b,00000000b,01011010b,00000010b,00000000b,00100001b,00001000b,00000000b,11001100b,00011000b,00000000b,00110111b db 00100000b,00000000b,01100001b,00110000b,00000000b,00100100b,00111000b,00000000b,11010101b,01001000b,00000000b,10111010b db 01010000b,00000000b,10101111b,01100000b,00000000b,11011011b,00000010b,00000000b,10010001b,00001110b,00000000b,01101010b db 00010100b,00000000b,00001011b,00011010b,00000000b,00101011b,00101000b,10000000b,00111101b,00101110b,10000000b,10110110b db 00110100b,10000001b,00011010b,01000000b,10000001b,00001101b,01000110b,10000000b,10011000b,01001100b,10000000b,00001110b db 01010110b,01100000b,11110010b,01011000b,11100000b,00001100b,00000010b,00000000b,00001011b,00000010b,00000000b,00101011b db 00000010b,00000000b,01101010b,00000010b,00000000b,10010001b,00001110b,00000000b,01101010b,00010100b,00000000b,00001011b db 00011010b,00000000b,00101011b,00101000b,10000000b,00111101b,00101110b,10000000b,10110110b,00110100b,10000001b,00011010b db 01000100b,10000001b,00001101b,01001110b,10000000b,10011000b,01011000b,10000000b,00001110b,01100110b,01100000b,11110010b db 01101001b,00000000b,00001100b,00000010b,00000000b,10010110b,00011110b,00000000b,00100001b,00111100b,00000000b,10101111b db 00000010b,00000000b,00110111b,00001010b,00000000b,00100011b,00010100b,00000001b,01011010b,00011110b,00000001b,00011111b db 00101000b,00000001b,01100000b,00110010b,00000000b,11101111b,00111100b,00000000b,01101001b,01000110b,00000000b,11110000b db 01010000b,00000000b,00111000b,01011010b,00000000b,11010101b,01100100b,00000000b,11011011b,00000010b,00000000b,00101011b db 00000010b,00000000b,00101100b,00001110b,00000000b,01100011b,00011010b,00000000b,01110100b,00100000b,00000000b,10111000b db 00101100b,00000000b,11110010b,00111000b,00000000b,01100111b,00111110b,00000000b,00100100b,01001010b,00000000b,11001111b db 01010110b,00000000b,01100001b,00000010b,00000000b,00101011b,00000010b,00000000b,00101100b,00000010b,00000000b,01100011b db 00000010b,00000000b,01110100b,00001110b,00000000b,01100011b,00011010b,00000000b,01110100b,00100000b,00000000b,10111000b db 00101100b,00000000b,11110010b,00111000b,00000000b,01100111b,01000010b,00000000b,10100011b,01001100b,00000001b,00001101b db 01010110b,00000000b,11001111b,01100000b,00000000b,10000010b,01101010b,00000000b,01100001b,00000010b,00000000b,00101100b db 00010010b,00000000b,00011100b,00100010b,00000000b,10111001b,00110010b,00000001b,01001000b,01000010b,00000000b,11110010b db 01010010b,00000000b,01011011b,01100010b,00000000b,11001001b,01110010b,00000000b,00111111b,00000010b,00000000b,00011100b db 00000010b,00000000b,00101100b,00000010b,00000000b,10111001b,00000010b,00000001b,01001000b,00010010b,00000000b,00011100b db 00100010b,00000000b,10111001b,00110010b,00000001b,01001000b,01000010b,00000000b,11110010b,01000110b,00000000b,11100001b db 01010010b,00000000b,01100111b,01100010b,00000000b,11001001b,01110010b,00000000b,00111111b,00000010b,00000000b,00011100b db 00000010b,00000000b,00101100b,00000010b,00000000b,10111001b,00000010b,00000001b,01001000b,00010010b,00000000b,00011100b db 00100010b,00000000b,10111001b,00110010b,00000001b,01001000b,01000010b,00000000b,11110010b,01000110b,00000000b,11100001b db 01010010b,00000000b,01100111b,01101010b,00000000b,11001001b,10000010b,00000000b,00111111b,00000010b,00000000b,00100001b db 00000010b,00000000b,01110100b,00001000b,00000000b,00011100b,00010100b,00000001b,00100100b,00011010b,00000000b,11101001b db 00100110b,00000000b,11111100b,00101100b,00000000b,00010010b,00111000b,00000001b,00011010b,00111110b,00000001b,00001001b db 01001010b,00000000b,10111011b,01010000b,00000000b,11001011b,01011100b,00000000b,01000101b,01100010b,00000000b,10110011b db 00000010b,00000000b,00011100b,00000010b,00000000b,00100001b,00000010b,00000000b,01110100b,00000010b,00000001b,00100100b db 00001000b,00000000b,00011100b,00010100b,00000001b,00100100b,00011010b,00000000b,11101001b,00100110b,00000000b,11111100b db 00101100b,00000000b,00010010b,00111010b,00000001b,00011010b,01000010b,00000001b,00001001b,01010000b,00000000b,10111011b db 01011000b,00000000b,11001011b,01100110b,00000000b,01000101b,01101110b,00000000b,10110011b,00000010b,00000000b,00100001b db 00001000b,00000000b,01010110b,00010010b,00000000b,00101011b,00011000b,00000001b,01010000b,00100010b,00000000b,01100010b db 00101000b,00000000b,11010001b,00110010b,00000001b,00111100b,00111000b,00000000b,00101110b,01000010b,00000000b,00101100b db 01001000b,00000000b,01010111b,01010010b,00000001b,00001100b,00000010b,00000000b,00100001b,00000010b,00000000b,00101011b db 00000010b,00000000b,01010110b,00000010b,00000001b,01010000b,00001000b,00000000b,01010110b,00010010b,00000000b,00101011b db 00011000b,00000001b,01010000b,00100010b,00000000b,01100010b,00101000b,00000000b,11010001b,00110010b,00000001b,00111100b db 00111110b,00000000b,00101110b,01001110b,00000000b,00101100b,01011010b,00000000b,01010111b,01101010b,00000001b,00001100b db 00000010b,00000000b,00100001b,00000010b,00000000b,00101101b,00010110b,00000000b,00110100b,00100110b,00000000b,11011110b db 00110010b,00000000b,01110100b,00111010b,00000000b,00100100b,00111110b,00000000b,10000101b,01000110b,00000000b,01011001b db 01010010b,00000000b,00110101b,01100010b,00000000b,00100110b,00000010b,00000000b,00100001b,00000010b,00000000b,00101101b db 00000010b,00000000b,00110100b,00000010b,00000000b,11011110b,00010110b,00000000b,00110100b,00100110b,00000000b,11011110b db 00110010b,00000000b,01110100b,00111010b,00000000b,00100100b,00111110b,00000000b,10000101b,01000010b,00000000b,10011101b db 01001010b,00000000b,01011001b,01011010b,00000001b,00011100b,01101110b,00000000b,01011010b,00000010b,01100000b,01101111b db 00000010b,00000000b,00101101b,00000010b,00000000b,00110111b,00000010b,00000000b,10110101b,00001110b,00000000b,11100011b db 00011010b,00000001b,00101101b,00100110b,00000000b,00100010b,00110010b,00000000b,00111110b,00111110b,00000001b,00000010b db 01001010b,00000000b,10011100b,01001010b,00000000b,10101101b,01010110b,00000000b,00111011b,01100010b,00000001b,01001001b db 00000010b,01100000b,01101111b,00000010b,00000000b,00101101b,00000010b,00000000b,00110111b,00000010b,00000000b,10110101b db 00000010b,00000000b,11100011b,00001110b,00000000b,11100011b,00011010b,00000001b,00101101b,00100110b,00000000b,00100010b db 00110010b,00000000b,00111110b,00111110b,00000001b,00000010b,01001110b,00000000b,10011100b,01001110b,00000000b,10101101b db 01011110b,00000000b,00111011b,01101110b,00000001b,01001001b,00000010b,01100000b,01101111b,00000010b,00000000b,00101101b db 00000010b,00000000b,00110111b,00000010b,00000000b,10110101b,00000010b,00000000b,11100011b,00001110b,00000000b,11100011b db 00011010b,00000001b,00101101b,00100110b,00000000b,00100010b,00110010b,00000000b,00111110b,00111110b,00000001b,00000010b db 01001110b,00000000b,10011100b,01001110b,00000000b,10101101b,01100100b,00000000b,00111011b,01111010b,00000001b,01001001b db 00000010b,00000000b,00101000b,00000010b,00000000b,00101011b,00001010b,00000000b,01000111b,00010010b,00000000b,01001010b db 00011010b,00000000b,01001001b,00100010b,00000000b,00011100b,00101010b,00000000b,00101010b,00110010b,00000001b,00010011b db 00111010b,00000000b,10111001b,01000010b,00000000b,10111111b,01001010b,00000001b,00101110b,01010010b,00000000b,10110010b db 01011010b,00000000b,11001001b,01100010b,01100000b,11000010b,00000010b,01100001b,00010111b,00000010b,00000000b,00101000b db 00000010b,00000000b,00101011b,00000010b,00000000b,01000111b,00000010b,00000000b,01001010b,00001010b,00000000b,01000111b db 00010010b,00000000b,01001010b,00011010b,00000000b,01001001b,00100010b,00000000b,00011100b,00101010b,00000000b,00101010b db 00110010b,00000001b,00010011b,00111010b,00000000b,10111001b,01000110b,00000000b,10111111b,01010010b,00000001b,00101110b db 01011110b,00000000b,10110010b,01101010b,00000000b,11001001b,01110110b,01100000b,11000010b,00000010b,00000000b,00101011b db 00000010b,00000000b,10110101b,00001110b,00000000b,01101000b,00010100b,00000000b,00101100b,00100000b,00000000b,11000100b db 00100110b,00000000b,00011101b,00110010b,00000000b,10110110b,00111000b,00000000b,11110010b,01000100b,00000000b,00111010b db 01001010b,00000001b,00000010b,01010110b,00000000b,00111011b,00000010b,00000000b,00101011b,00000010b,00000000b,00101100b db 00000010b,00000000b,01101000b,00000010b,00000000b,10110101b,00001110b,00000000b,01101000b,00010100b,00000000b,00101100b db 00100000b,00000000b,11000100b,00100110b,00000000b,00011101b,00110010b,00000000b,10110110b,00111000b,00000000b,11110010b db 01000100b,00000000b,00111010b,01010100b,00000001b,00000010b,01101010b,00000000b,00111011b,01111010b,00000001b,01001001b db 00000010b,00000000b,00100001b,00000010b,00000000b,01101010b,00001110b,00000000b,01011101b,00011010b,00000000b,01011000b db 00100110b,00000000b,01011111b,00110010b,00000000b,10010101b,00111110b,00000001b,01000010b,01001010b,00000000b,01011110b db 01010110b,00000000b,11111000b,01100010b,00000000b,10011001b,00000010b,00000000b,00100001b,00000010b,00000000b,01101010b db 00001110b,00000000b,01011101b,00011010b,00000000b,01011000b,00100110b,00000000b,01010011b,00110010b,00000000b,10010101b db 00111110b,00000001b,01000010b,01001010b,00000000b,10011101b,01010110b,00000000b,01001100b,01100010b,00000000b,10011001b db 00000010b,00000000b,10010110b,00000110b,00000000b,11001100b,00001100b,00000000b,00100111b,00010100b,00000000b,10010001b db 00011110b,00000000b,00010101b,00101010b,00000000b,00110111b,00000010b,00000000b,10010110b,00001110b,00000000b,10010101b db 00010100b,00000001b,00111100b,00100000b,00000000b,00111100b,00100110b,00000000b,11110100b,00110010b,00000000b,01101101b db 00111000b,00000001b,00010101b,01000100b,00000000b,01011110b,01001010b,00000000b,10011100b,01001010b,00000000b,10101101b db 01010110b,00000001b,01010100b,00000010b,00000000b,00111100b,00000010b,00000000b,10010101b,00000010b,00000000b,10010110b db 00000010b,00000001b,00111100b,00001110b,00000000b,10010101b,00010100b,00000001b,00111100b,00100000b,00000000b,00111100b db 00100110b,00000000b,11110100b,00110010b,00000000b,01101101b,00111000b,00000001b,00010101b,01001010b,00000000b,01011110b db 01010110b,00000000b,10011100b,01010110b,00000000b,10101101b,01101110b,00000001b,01010100b,00000010b,00000000b,00101101b db 00001000b,00000000b,01010110b,00010100b,00000000b,01100010b,00011010b,00000001b,00001110b,00100110b,00000000b,11010001b db 00101100b,00000000b,11100011b,00111000b,00000001b,00111001b,00111110b,00000001b,00001100b,01001010b,00000000b,01010111b db 01010000b,00000000b,11100010b,01011110b,00000000b,01100001b,00000010b,00000000b,00101101b,00001000b,00000000b,01010110b db 00010100b,00000000b,01100010b,00011010b,00000001b,00001110b,00100110b,00000000b,11010001b,00101100b,00000000b,11100011b db 00111000b,00000000b,11001100b,00111110b,00000001b,00001100b,01001010b,00000000b,01010111b,01010000b,00000000b,11100010b db 01011110b,00000000b,01100001b,00000010b,00000001b,00110110b,00001100b,00000001b,00111001b,00010110b,00000000b,00101100b db 00100000b,00000000b,11100110b,00101010b,00000000b,00001011b,00110100b,00000000b,10111001b,00111110b,00000000b,11100010b db 01001000b,00000000b,11110010b,01010010b,00000001b,01001110b,01011100b,00000000b,11111110b,01011100b,00000000b,11111111b db 01011100b,00000001b,00000000b,00000010b,00000000b,01110101b,00001000b,00000000b,01100000b,00010010b,00000000b,01011101b db 00011000b,00000000b,11000101b,00100100b,10000000b,11101101b,00101000b,01100000b,11001111b,00101101b,00000000b,10101010b db 00111000b,00000001b,01011011b,01000000b,10100000b,10001000b,01001100b,11000000b,11110100b,01010100b,10000000b,10110011b db 01100001b,00000000b,01101001b,00000010b,00000000b,00000111b,00000010b,00000000b,00001000b,00000010b,00000000b,00001001b db 00000010b,00000000b,01011101b,00000010b,00000000b,01100000b,00000010b,00000000b,01110101b,00000010b,00000000b,11000101b db 00001000b,00000000b,01100000b,00010010b,00000000b,01011101b,00011000b,00000000b,11000101b,00100100b,10000000b,11101101b db 00101000b,01100000b,11001111b,00101101b,00000000b,10101010b,00111000b,00000001b,01011011b,01000000b,10100000b,10001000b db 01010001b,00000000b,11110100b,01011100b,10100000b,10110011b,01101100b,11100000b,01101001b,00000010b,00000000b,00101101b db 00000010b,00000000b,01000000b,00010000b,00000001b,00110110b,00010110b,00000000b,00101111b,00100100b,00000000b,00011111b db 00101010b,00000000b,11011011b,00111000b,00000000b,00110110b,00111110b,00000000b,00100100b,01001100b,00000000b,01110111b db 01010010b,00000001b,00011111b,01100000b,00000000b,11000011b,00000010b,00000000b,00101101b,00000010b,00000000b,00101111b db 00000010b,00000000b,01000000b,00000010b,00000001b,00110110b,00010000b,00000001b,00110110b,00010110b,00000000b,00101111b db 00100100b,00000000b,00011111b,00101010b,00000000b,11011011b,00111000b,00000000b,00110110b,00111110b,00000000b,00100100b db 01000110b,00000000b,11100001b,01010000b,00000001b,01011101b,01011010b,00000001b,00011111b,01101100b,00000000b,11000011b db 01110110b,00000000b,10001111b,00000010b,00000000b,10010110b,00000010b,00000000b,11001100b,00000010b,00000000b,11100011b db 00011110b,00000000b,01000100b,00011110b,00000000b,11000010b,00011110b,00000000b,11011011b,00011110b,00000000b,11110011b db 00000010b,00000000b,00101011b,00000010b,00000000b,01100101b,00001010b,00000000b,00110010b,00011000b,00000000b,11000001b db 00100000b,00000001b,00110110b,00101110b,00000000b,01101101b,00110110b,00000000b,11100100b,01000100b,00000000b,10101110b db 01001100b,00000001b,00000101b,01011010b,00000000b,11010100b,01100010b,00000000b,11111000b,00000010b,00000000b,00010100b db 00000010b,00000000b,00101011b,00000010b,00000000b,00110010b,00000010b,00000000b,01100101b,00001010b,00000000b,00110010b db 00011000b,00000000b,11000001b,00100000b,00000001b,00110110b,00101110b,00000000b,01101101b,00110110b,00000000b,11100100b db 01000100b,00000000b,10101110b,01001010b,00000001b,01000101b,01010010b,00000001b,00000101b,01100110b,00000000b,11010100b db 01110100b,00000000b,11111000b,00000010b,00000000b,01000111b,00001010b,00000000b,01001010b,00010010b,00000000b,00101000b db 00011010b,00000000b,01001110b,00100010b,00000000b,01001000b,00101010b,00000000b,01001001b,00110010b,00000001b,01011001b db 00111010b,00000001b,01000000b,01000010b,00000000b,11001010b,01001010b,00000000b,11100110b,01010010b,00000001b,00010011b db 01011010b,00000000b,01011100b,01100010b,00000000b,01010000b,01101010b,00000001b,00111000b,01110010b,00000000b,11101011b db 00000010b,00000000b,00001010b,00000010b,00000001b,00011001b,00001110b,00000000b,11100011b,00011010b,00000001b,00101111b db 00100110b,00000000b,10111001b,00110010b,00000000b,10000101b,00111110b,00000001b,01010111b,01001010b,00000000b,01000100b db 01010110b,00000000b,10101111b,00000010b,00000000b,00001010b,00000010b,00000000b,01110100b,00000010b,00000000b,11100011b db 00000010b,00000000b,11111101b,00001110b,00000000b,11100011b,00011010b,00000000b,11111101b,00100110b,00000000b,10011010b db 00110010b,00000000b,11001011b,00111110b,00000000b,10100011b,01001010b,00000000b,01000100b,01010110b,00000001b,00001000b db 01100010b,00000000b,10110011b,00000010b,00000000b,00001010b,00000010b,00000000b,11100011b,00000010b,00000001b,00011001b db 00000010b,00000001b,00101111b,00001110b,00000000b,11100011b,00011010b,00000001b,00101111b,00100110b,00000000b,10111001b db 00110010b,00000000b,10000101b,00111110b,00000001b,01010111b,01001000b,00000000b,11001111b,01001010b,00000000b,01000100b db 01010110b,00000000b,10101111b,00000010b,00000000b,00000001b,00001100b,00000001b,00011001b,00010010b,00000000b,10001011b db 00011100b,00000000b,01111100b,00100010b,00000000b,10000101b,00101110b,00000000b,11100011b,00111000b,00000000b,01011100b db 01000100b,00000000b,11111110b,01000100b,00000000b,11111111b,01000100b,00000001b,00000000b,01001110b,00000000b,10111100b db 00000010b,00000000b,00000001b,00000010b,00000000b,01111100b,00000010b,00000000b,10001011b,00000010b,00000001b,00011001b db 00001100b,00000001b,00011001b,00010010b,00000000b,10001011b,00011100b,00000000b,01111100b,00100010b,00000000b,10000101b db 00101110b,00000000b,11100011b,00110100b,00000000b,00100010b,00111110b,00000000b,01011100b,01010000b,00000000b,11111110b db 01010000b,00000000b,11111111b,01010000b,00000001b,00000000b,01100000b,00000000b,10111100b,00000010b,00000000b,00010000b db 00000010b,00000000b,00101011b,00001110b,00000000b,01001010b,00010110b,00000000b,01001011b,00100010b,00000000b,00010111b db 00101010b,00000000b,11100110b,00110110b,00000000b,00010010b,00111110b,00000001b,01011001b,01001010b,00000000b,00100010b db 01010010b,00000000b,01001100b,01011110b,00000000b,11101011b,00000010b,00000000b,00000001b,00001010b,00000000b,11111101b db 00010110b,00000001b,00110110b,00011110b,00000001b,01010000b,00101010b,00000000b,00110000b,00110010b,00000000b,00010111b db 00111110b,00000000b,01100111b,01000110b,00000000b,00101110b,01010010b,00000000b,10011100b,01010010b,00000000b,11010110b db 01011010b,00000001b,00110000b,00000010b,00000000b,00000001b,00000010b,00000000b,11111101b,00000010b,00000001b,00110110b db 00000010b,00000001b,01010000b,00001010b,00000000b,11111101b,00010110b,00000001b,00110110b,00011110b,00000001b,01010000b db 00101110b,00000000b,00110000b,00111010b,00000000b,00010111b,01001010b,00000000b,01100111b,01010110b,00000000b,00101110b db 01100110b,00000000b,10011100b,01100110b,00000000b,11010110b,01110010b,00000001b,00110000b,00000010b,00000000b,00000001b db 00000010b,00000000b,11111101b,00000010b,00000001b,00110110b,00000010b,00000001b,01010000b,00001010b,00000000b,11111101b db 00010110b,00000001b,00110110b,00011110b,00000001b,01010000b,00101110b,00000000b,00110000b,00111010b,00000000b,00010111b db 01001010b,00000000b,01100111b,01010000b,00000000b,00111111b,01011010b,00000000b,00101110b,01101110b,00000000b,10011100b db 01101110b,00000000b,11010110b,01111110b,00000001b,00110000b,00000010b,00000000b,00110111b,00000010b,00000000b,10000000b db 00000010b,00000000b,11111010b,00000010b,00000001b,01001110b,00000010b,00000000b,11111010b,00010000b,00000000b,00101100b db 00011110b,00000000b,01100111b,00101100b,00000001b,01100000b,00111010b,00000000b,10111000b,01001000b,00000000b,11110010b db 01010110b,00000000b,11100010b,01100100b,00000000b,00111000b,00000010b,00000000b,11111010b,00010000b,00000000b,01011101b db 00011110b,00000000b,01100001b,00101100b,00000001b,01100000b,00111010b,00000000b,10000101b,01001000b,00000000b,01011110b db 01010110b,00000000b,11100010b,01100100b,00000000b,00111000b,00000010b,00000000b,00001010b,00001010b,00000000b,00101011b db 00010010b,00000001b,00001101b,00011010b,00000000b,01100010b,00100010b,00000000b,00001101b,00101010b,00000000b,00101100b db 00110100b,00000000b,00001110b,00111110b,00000000b,01101000b,01001000b,00000000b,10100011b,01010010b,00000000b,11111000b db 01011100b,00000000b,11000011b,00000010b,00000001b,00011010b,00010000b,00000000b,01100111b,00011010b,00000000b,01100101b db 00101000b,00000000b,10101110b,00110010b,00000000b,10110100b,01000000b,00000001b,00000101b,01001010b,00000000b,10111001b db 01011000b,00000000b,11110111b,01100010b,00000001b,00100001b,01110000b,00000001b,00100000b,00000010b,00000000b,01100101b db 00000010b,00000000b,01100111b,00000010b,00000000b,10101110b,00000010b,00000001b,00011010b,00010000b,00000000b,01100111b db 00011010b,00000000b,01100101b,00101000b,00000000b,10101110b,00110010b,00000000b,10110100b,01000000b,00000001b,00000101b db 01001110b,00000000b,10111001b,01100000b,00000000b,11110111b,01101110b,00000001b,00100001b,10000000b,00000001b,00100000b db 00000010b,00000000b,00100011b,00001110b,00000000b,01111010b,00010100b,00000000b,00101100b,00100000b,00000001b,01010110b db 00100110b,00000000b,01100111b,00110010b,00000000b,10001001b,00111000b,00000000b,11110010b,01000100b,00000001b,00110001b db 01001010b,00000000b,11001111b,01010110b,00000000b,01110010b,00000010b,00000000b,00001010b,00001000b,00000000b,00101011b db 00001110b,00000000b,01100010b,00010100b,00000000b,00001110b,00011010b,00000000b,11010010b,00100110b,00000000b,10100011b db 00110010b,00000000b,11100100b,00111110b,00000001b,00110010b,01001010b,00000001b,00001101b,01011100b,00000000b,11000101b db 01101110b,00000000b,11001110b,00000010b,00000000b,00100001b,00000010b,00000000b,01101010b,00010000b,00000000b,00110111b db 00011110b,00000001b,00111101b,00101100b,00000001b,00011001b,00111010b,00000000b,00100100b,01001000b,00000001b,00101100b db 01010110b,00000000b,11110110b,01100100b,00000000b,10011100b,01110010b,00000000b,00100110b,10000000b,00000000b,00111000b db 00000010b,00000000b,00100001b,00001000b,00000000b,01101010b,00001110b,00000000b,10111101b,00010100b,00000000b,00011101b db 00011010b,00000000b,11101000b,00100010b,00000001b,01001110b,00101010b,00000000b,00101110b,00110010b,00000000b,00100100b db 00111010b,00000000b,11100111b,01000100b,00000000b,10110110b,01001110b,00000001b,00111111b,01011000b,00000000b,00100110b db 00000010b,00000000b,00011101b,00000010b,00000000b,00100001b,00000010b,00000000b,01101010b,00000010b,00000000b,10111101b db 00001000b,00000000b,01101010b,00001110b,00000000b,10111101b,00010100b,00000000b,00011101b,00011010b,00000000b,11101000b db 00100010b,00000001b,01001110b,00101010b,00000000b,00101110b,00110010b,00000000b,00100100b,00111010b,00000000b,11100111b db 01001010b,00000000b,10110110b,01011010b,00000001b,00111111b,01101010b,00000000b,00100110b,00000010b,00000000b,00011101b db 00000010b,00000000b,00100001b,00000010b,00000000b,01101010b,00000010b,00000000b,10111101b,00001000b,00000000b,01101010b db 00001110b,00000000b,10111101b,00010100b,00000000b,00011101b,00011010b,00000000b,11101000b,00100010b,00000001b,01001110b db 00101010b,00000000b,00101110b,00110010b,00000000b,00100100b,00111010b,00000000b,11100111b,01001010b,00000000b,10110110b db 01100100b,00000001b,00111111b,01111110b,00000000b,00100110b,00000010b,00000000b,00100001b,00010100b,00000000b,00110100b db 00010100b,00000000b,00110111b,00010100b,00000000b,10110101b,00101000b,00000000b,11110000b,00101000b,00000000b,11110001b db 00101000b,00000001b,00000010b,00111100b,00000001b,00110111b,00000010b,00000000b,00100001b,00001010b,00000000b,01101101b db 00010010b,00000000b,01101000b,00011010b,00000000b,11101100b,00100010b,00000000b,01100010b,00101010b,00000001b,00100110b db 00110010b,00000001b,01000100b,00111010b,00000000b,10110110b,01000010b,00000001b,00001110b,01001010b,00000000b,00100110b db 00000010b,00000000b,00100001b,00001010b,00000000b,11100110b,00010010b,00000000b,11001100b,00011010b,00000000b,11101100b db 00100010b,00000000b,01100010b,00101010b,00000001b,00010001b,00110010b,00000000b,11100011b,00111010b,00000001b,00000100b db 01000010b,00000001b,00001110b,01001010b,00000001b,01010111b,00000010b,00000001b,00110110b,00010000b,00000000b,10000100b db 00011110b,00000000b,00110011b,00101100b,00000001b,00010011b,00111010b,00000000b,01101101b,01001000b,00000000b,10000101b db 01010110b,00000000b,11110110b,01100100b,00000000b,11111110b,01100100b,00000000b,11111111b,01100100b,00000001b,00000000b db 00000010b,00000000b,00110011b,00000010b,00000000b,10000100b,00000010b,00000001b,00010011b,00000010b,00000001b,00110110b db 00010000b,00000000b,10000100b,00011110b,00000000b,00110011b,00101100b,00000001b,00010011b,00111010b,00000000b,01101101b db 01001000b,00000000b,10000101b,01100000b,00000000b,11110110b,01111000b,00000000b,11111110b,01111000b,00000000b,11111111b db 01111000b,00000001b,00000000b,00000010b,00000000b,00001010b,00001110b,00000000b,01101010b,00011010b,00000001b,00101100b db 00100110b,00000000b,00110111b,00110010b,00000000b,11101000b,00111110b,00000000b,10110110b,01001010b,00000000b,11110110b db 01010110b,00000000b,11010010b,01100010b,00000000b,10100011b,01101110b,00000001b,01011110b,00000010b,00000000b,00001010b db 00000010b,00000000b,00110111b,00000010b,00000000b,01101010b,00000010b,00000001b,00101100b,00001110b,00000000b,01101010b db 00011010b,00000001b,00101100b,00100110b,00000000b,00110111b,00110010b,00000000b,11101000b,00111110b,00000000b,10110110b db 01001010b,00000000b,11110110b,01011100b,00000000b,11010010b,01101110b,00000000b,10100011b,10000000b,00000001b,01011110b db 00000010b,00000000b,00101101b,00001100b,00000000b,01011101b,00010110b,00000000b,01101000b,00100000b,00000000b,01100100b db 00101010b,00000001b,01011011b,00110100b,00000000b,01011110b,00111110b,00000001b,00011110b,01001000b,00000000b,11111000b db 01010010b,00000000b,01011111b,01011100b,00000000b,10001010b,00000010b,01100001b,01011001b,00000010b,00000000b,00101101b db 00000010b,00000000b,01011101b,00000010b,00000000b,01100100b,00000010b,00000000b,01101000b,00001100b,00000000b,01011101b db 00010110b,00000000b,01101000b,00100000b,00000000b,01100100b,00101010b,00000001b,01011011b,00110100b,00000000b,01011110b db 01000010b,00000001b,00011110b,01010000b,00000000b,11111000b,01011110b,00000000b,01011111b,01101100b,00000000b,10001010b db 00000010b,00000000b,00101101b,00000010b,00000000b,01011101b,00000010b,00000000b,01100100b,00000010b,00000000b,01101000b db 00001100b,00000000b,01011101b,00010110b,00000000b,01101000b,00100000b,00000000b,01100100b,00101010b,00000001b,01011011b db 00110100b,00000000b,01011110b,01000010b,00000001b,00011110b,01010100b,00000000b,11111000b,01100110b,00000000b,01011111b db 01111000b,00000000b,10001010b,00000010b,00000000b,01100011b,00001010b,00000000b,00101100b,00010010b,00000000b,00101011b db 00100010b,00000000b,00011101b,00101010b,00000000b,01110100b,00110010b,00000000b,00110100b,01000010b,00000000b,11100001b db 01001010b,00000000b,10111000b,01010010b,00000000b,11110010b,01100010b,00000001b,01010001b,01101010b,00000000b,00100110b db 00000010b,00000000b,00011101b,00000010b,00000000b,00101011b,00000010b,00000000b,00101100b,00000010b,00000000b,01100011b db 00001010b,00000000b,00101100b,00010010b,00000000b,00101011b,00100010b,00000000b,00011101b,00101010b,00000000b,01110100b db 00110010b,00000000b,00110100b,00111100b,00000000b,10110110b,01001100b,00000000b,11100001b,01011110b,00000000b,10111000b db 01110000b,00000000b,11110010b,10001010b,00000001b,01010001b,10011100b,00000000b,00100110b,00000010b,00000000b,00011101b db 00000010b,00000000b,00101011b,00000010b,00000000b,00101100b,00000010b,00000000b,01100011b,00001010b,00000000b,00101100b db 00010010b,00000000b,00101011b,00100010b,00000000b,00011101b,00101010b,00000000b,01110100b,00110010b,00000000b,00110100b db 00111100b,00000000b,10110110b,01001100b,00000000b,11100001b,01011110b,00000000b,10111000b,01100100b,00000000b,00010011b db 01111010b,00000000b,11110010b,10011110b,00000001b,01010001b,10111010b,00000000b,00100110b,00000010b,00000000b,00100100b db 00000010b,00000000b,00100100b,00101000b,00000000b,01011101b,00101000b,00000000b,11101000b,00110100b,00000000b,10111000b db 01000000b,00000000b,11100100b,01001100b,00000000b,01011110b,01011000b,00000001b,01001110b,01100100b,00000001b,00110101b db 01110000b,00000000b,01100001b,01111100b,00000000b,00111111b,00000010b,00000000b,00100100b,00000010b,00000000b,01011101b db 00000010b,00000000b,10111000b,00000010b,00000000b,11101000b,00101000b,00000000b,01011101b,00101000b,00000000b,11101000b db 00110100b,00000000b,10111000b,01000000b,00000000b,11100100b,01001100b,00000000b,01011110b,01011000b,00000001b,01001110b db 01101110b,00000001b,00110101b,10000100b,00000000b,01100001b,10011010b,00000000b,00111111b,00000010b,00000000b,10011001b db 00010010b,00000000b,01011000b,00100010b,00000000b,10101110b,00110010b,00000001b,00010100b,01000010b,00000000b,11110110b db 01010010b,00000001b,01001110b,01100010b,00000000b,11000000b,01110010b,00000000b,11000111b,10000010b,00000000b,00111111b db 00000010b,00000000b,10011001b,00010010b,00000000b,11000100b,00100010b,00000000b,10101110b,00110010b,00000001b,00010100b db 01000010b,00000000b,11110110b,01010010b,00000000b,10000101b,01100010b,00000000b,11000000b,01110010b,00000000b,11000111b db 10000010b,00000000b,00111111b,00000010b,00000000b,10011001b,00010010b,00000000b,11101000b,00100010b,00000000b,10101110b db 00110010b,00000001b,00010100b,01000010b,00000000b,11110110b,01010010b,00000000b,10000101b,01010010b,00000001b,01001110b db 01100010b,00000000b,11000000b,01110010b,00000000b,11000111b,10000010b,00000000b,00111111b,00000010b,00000001b,01100000b db 00001010b,00000000b,10111000b,00011110b,00000000b,11110110b,00101000b,00000000b,00100010b,00111100b,00000001b,01011011b db 01000110b,00000000b,00111010b,01011010b,00000000b,00111000b,01100100b,00000000b,10011100b,01111000b,00000001b,01001001b db 10000010b,00000000b,00100110b,10010110b,00000001b,01000011b,00000010b,00000001b,01010101b,00001010b,00000000b,10111000b db 00011110b,00000000b,11110110b,00101000b,00000000b,10100011b,00111100b,00000001b,01010011b,01000110b,00000000b,01011001b db 01011010b,00000000b,01111110b,01100100b,00000000b,10011100b,01111000b,00000000b,01011010b,10000010b,00000000b,01001100b db 10010110b,00000001b,00011100b,00000010b,00000000b,11101111b,00001010b,00000000b,10111000b,00011110b,00000000b,11110110b db 00101000b,00000001b,01010001b,00111100b,00000001b,01011101b,01000110b,00000000b,11110010b,01011010b,00000000b,00010011b db 01100100b,00000000b,10011100b,01111000b,00000000b,11110101b,10000010b,00000000b,11001000b,10010110b,00000000b,00111111b db 00000010b,00000000b,10010101b,00001010b,00000001b,00010001b,00010100b,00000001b,00001110b,00011110b,00000000b,11011011b db 00101000b,00000000b,11100001b,00110010b,00000001b,01011010b,00111100b,00000001b,00011111b,01000110b,00000001b,00101000b db 01010000b,00000000b,01011110b,01011010b,00000000b,01101001b,01100100b,00000000b,11001100b,00000010b,00000000b,10010101b db 00001010b,00000001b,00000110b,00010100b,00000001b,00001110b,00011110b,00000000b,11011011b,00101000b,00000000b,11100001b db 00110010b,00000000b,10110110b,00111100b,00000001b,00011111b,01000110b,00000001b,00100111b,01010000b,00000000b,01011110b db 01011010b,00000000b,01101001b,01100100b,00000001b,01011101b,00000010b,00000000b,01011101b,00000010b,00000001b,00010001b db 00001010b,00000000b,10011100b,00010100b,00000000b,10000001b,00011110b,00000001b,00001110b,00101000b,00000000b,01011110b db 00110010b,00000001b,00011111b,00111100b,00000000b,10011100b,01000110b,00000000b,00100110b,01010000b,00000000b,11111000b db 01011010b,00000001b,01000010b,01100100b,00000001b,01100001b ;db 00000010b,00100000b,00100011b,00000010b,00100000b,00101011b ;db 00001010b,00100000b,01100101b,00010100b,00100000b,01101000b,00010100b,00100000b,01100100b,00011110b,00100001b,00000110b ;db 00011110b,00100001b,00001101b,00011110b,00100001b,00011010b,00101000b,00100000b,10111111b,00101000b,00100000b,11100100b ;db 00110010b,00100000b,01011110b,00111100b,00100001b,00010100b,00111100b,00100000b,10000001b,00111100b,00100001b,00100001b ;db 01000110b,00100000b,10000101b,01000110b,00100001b,01001110b,01000110b,00100000b,01100001b,01000110b,00100001b,01000010b ;db 01010000b,00100000b,11000000b,01010000b,00100000b,01101001b,01011010b,00100001b,01100010b,01100100b,00100000b,01000100b ;db 01100100b,00100000b,11110011b,01100100b,00100000b,11110101b,01100100b,00100000b,00111111b ; DEOXYS WEIRDNESS db 00000010b,00011110b,00100011b,00000010b,00011110b,00101011b,00001010b,00011110b,01100101b db 00010100b,01000000b,01101000b,00010100b,01111110b,01100100b,00011110b,00000111b,00011010b db 00011110b,00111001b,00000110b,00011110b,00111111b,00001101b,00101000b,00011000b,11100100b db 00101000b,00100110b,10111111b,00110010b,00011110b,01011110b,00111100b,00111001b,00010100b db 00111100b,01000000b,10000001b,00111100b,01100111b,00100001b,01000110b,00100110b,10000101b db 01000110b,00100111b,01001110b,01000110b,01000000b,01100001b,01000110b,01111001b,01000010b db 01010000b,00000110b,01101001b,01010000b,00111000b,11000000b,01011010b,00011111b,01100010b db 01100100b,00100110b,01000100b,01100100b,00100110b,11110011b,01100100b,01000000b,11110101b db 01100100b,01111000b,00111111b db 00000010b,00000000b,00100011b db 00001100b,00000000b,00101101b,00010010b,00000001b,00110110b,00011100b,00000000b,01011101b,00100010b,00000000b,00100100b db 00101100b,00000000b,11111101b,00110010b,00000001b,00011001b,00111100b,00000000b,10010101b,01000010b,00000000b,00100110b db 01001100b,00000000b,11010111b,01010010b,00000000b,11011011b,01011100b,00000000b,01011110b eggmovedatastart: db 10011001b,01011001b,10011110b,10000010b,10010110b,00001101b,10011000b,10101110b,10011110b,01010000b,10011110b,11001100b db 10011001b,01000000b,10011110b,01110001b,10011110b,11011011b,10001110b,10111011b,10001110b,11111011b,10001110b,00101100b db 10001110b,11001000b,10001000b,00001110b,10001110b,10011101b,10001110b,11110110b,10001001b,01011101b,10011001b,00101100b db 10011110b,10101111b,10010110b,01011101b,10011001b,00011001b,10011110b,00110110b,10011110b,11000001b,10011001b,00011111b db 10011110b,01110010b,10011110b,11110011b,01011110b,11000001b,01011001b,00111010b,01011110b,11010011b,01011110b,10111001b db 01011110b,11100100b,10001000b,11001111b,10001110b,01000100b,10001110b,10101100b,10001000b,11111101b,10001110b,01100111b db 10001110b,10110011b,10001110b,00101100b,10001110b,10011010b,01111110b,11001110b,01111001b,00110110b,01111110b,10111000b db 01111110b,01100010b,01111110b,10111001b,01111000b,10001111b,01111110b,10100001b,01101110b,10110100b,01100010b,11110010b db 01101001b,00110001b,01101110b,11100100b,01101110b,00010101b,01101110b,11111011b,10011000b,11101000b,10011110b,10101111b db 10010010b,11110010b,10011000b,00001110b,10011001b,00110010b,10011110b,11011011b,10011000b,10011101b,10011110b,01000100b db 10011110b,11100101b,01111110b,00110010b,01111110b,11001100b,01111110b,00100100b,01111110b,01000100b,01111110b,11111011b db 01111110b,00110000b,01111110b,01110100b,01111110b,00110000b,01111110b,01011101b,01111110b,00110010b,01111110b,10000101b db 01111110b,00100100b,01111110b,01000100b,01111110b,11111011b,10001001b,01010000b,10001110b,10101111b,10001000b,11110100b db 10001110b,00110010b,10001110b,10110100b,10001001b,00000001b,10001110b,01011111b,10001110b,10111001b,01101000b,10101110b db 01101110b,01100010b,01101110b,00010000b,01101110b,10111001b,01101110b,00010010b,01101110b,11100100b,01101001b,00010011b db 01101110b,10101111b,01101110b,00001110b,01101110b,11001100b,01101110b,01001011b,01101110b,11101011b,10001110b,00111100b db 10001110b,01110001b,10001110b,11100100b,10001110b,01000100b,10001110b,10101111b,10001110b,11100110b,10001110b,01100111b db 10001110b,11001110b,01001110b,01100111b,01001110b,11001010b,01001001b,01000100b,01001110b,11100010b,01111110b,01100111b db 01111110b,11110110b,01111000b,10011101b,01111110b,10111001b,01111110b,11111011b,01111000b,11111101b,01111110b,11100100b db 01101001b,00010010b,01101110b,10110100b,01101110b,01011111b,01101110b,11001100b,01101000b,11110100b,01101110b,10000101b db 10101001b,00011111b,10101110b,01011111b,10101110b,11111000b,10101110b,00111100b,10101110b,01110001b,10100010b,11101110b db 10101000b,11101110b,10101110b,01011110b,10101110b,11000001b,10100110b,00111010b,10001001b,00001001b,10001110b,01100000b db 10001110b,11000001b,10001001b,00010111b,10001110b,10011101b,10001110b,11111011b,10001110b,01000100b,10001110b,10110011b db 01111110b,00100101b,01111110b,11110010b,01111001b,01010000b,01111110b,01010011b,01111110b,00100010b,01111110b,11011011b db 01111001b,00000001b,01111110b,00110110b,01111110b,10010110b,01111001b,00101101b,01111110b,00111101b,01111110b,10101010b db 01111001b,01011010b,01111110b,01110010b,01111000b,00001000b,01111110b,01110000b,01111000b,00001001b,01111110b,11100011b db 01111000b,00000111b,01111001b,00011010b,01110110b,01110001b,01111000b,01000100b,01111110b,00011011b,01111110b,11100011b db 01111000b,10011101b,01111110b,01100000b,01111001b,00001001b,01111110b,01110001b,01111110b,00001110b,01111110b,11100011b db 01111001b,00010011b,01111110b,01110011b,01111110b,11101011b,01111001b,01011001b,01111110b,10001101b,01101000b,01101101b db 01101110b,11011011b,01101110b,00111110b,01101110b,11100101b,01101110b,01110010b,01101110b,11110011b,00111001b,01001111b db 00111110b,00000101b,00111110b,10011101b,01111000b,00100110b,01111110b,01011111b,01110110b,01100010b,01111110b,00011000b db 01111110b,10101100b,01111110b,00100101b,01111110b,11001100b,01111001b,00101100b,01111110b,11011011b,01111000b,10101101b db 01111110b,00010111b,01111110b,11111000b,01111000b,11010110b,01111110b,10111011b,10001001b,00101001b,10001110b,01110111b db 10001100b,11010011b,10001110b,00010000b,10001110b,10101111b,10001000b,10101110b,10001110b,01100010b,10001110b,11000001b db 01101110b,00110000b,01101110b,10101111b,01101110b,01100010b,01101110b,10111001b,01101001b,00011011b,01101110b,01110010b db 10011000b,11111100b,10011110b,00110010b,10011110b,11100011b,10011001b,01001101b,10011110b,01111010b,10010110b,01000000b db 10011000b,00100000b,10011110b,00010101b,10011110b,11000011b,01111000b,10101110b,01111110b,01110010b,01111001b,00011110b db 01111110b,01111010b,01111000b,10011001b,01111001b,01000101b,01111110b,11010100b,01101110b,00100100b,01101110b,01110000b db 01101110b,00111101b,01101110b,11100101b,01101110b,01100111b,01101001b,01001101b,01111110b,10010101b,01111000b,10011001b db 01111001b,00110110b,01111110b,11000011b,01111001b,00000101b,01111110b,01110010b,01111001b,00100000b,01001001b,01001111b db 01001110b,10011101b,01001000b,10011001b,01001110b,10101111b,01111000b,00000111b,01111001b,00010000b,01110110b,01110001b db 01111000b,00001000b,01111001b,00010010b,01111000b,00001001b,01111110b,01110000b,01111110b,00010101b,01111110b,10000101b db 01111000b,00001110b,01111110b,01011011b,01111110b,10101111b,01111001b,00011010b,01111110b,01110010b,10001000b,11110100b db 10001110b,11101011b,10000110b,01001000b,10001001b,00010011b,10001110b,11101100b,10001000b,10101110b,10001110b,01110011b db 10001110b,11110110b,01111110b,10111011b,01111110b,10000010b,01111110b,11000011b,01111010b,00001110b,01111110b,10011101b db 01111110b,11110110b,01111110b,01100111b,10001000b,10100100b,10001000b,11010110b,10001110b,10111011b,10001000b,10101101b db 10001001b,00001001b,10001110b,11011110b,10001000b,10101110b,10001110b,00100010b,01101110b,00111100b,01101110b,11000010b db 01101110b,01100111b,01101110b,11011100b,01101001b,00000101b,01101110b,10010101b,10101000b,10101110b,10101110b,10011101b db 10101110b,11110010b,10101001b,00110010b,10101110b,10110011b,10100110b,00100101b,10101000b,00001110b,10101110b,01000100b db 10101110b,11011110b,10100110b,11100100b,01011000b,10100100b,01011110b,11010111b,01011001b,00111000b,01011110b,11011001b db 01011110b,01110110b,01111000b,01001001b,01111110b,01011101b,01111110b,10101111b,01111001b,00001011b,01111110b,01110011b db 01111110b,01001000b,01111110b,10000101b,10001001b,00110010b,10001110b,01110100b,10001000b,01000100b,10001110b,00010111b db 10001110b,11000001b,10001000b,10100100b,10001110b,00110010b,10001110b,11011011b,01111000b,11100001b,01111110b,01010010b db 01111110b,10111110b,01111110b,00110010b,01111110b,10010110b,01111110b,00111110b,01111110b,10101111b,01011110b,00111000b db 01011000b,11010110b,01011110b,00111100b,01011001b,00101100b,01011110b,01110010b,00110110b,00110000b,00110110b,00111110b db 00110110b,01110000b,01101001b,00001111b,01101110b,11111000b,01101000b,11110100b,01101110b,01011111b,01101000b,11111100b db 01101110b,01100110b,10001110b,00001101b,10001110b,10110011b,10001000b,11001011b,10001110b,01000100b,10001110b,11011011b db 10001001b,00111110b,10001110b,01110001b,10001110b,11100010b,01001000b,10111001b,01001110b,10101111b,01001000b,11001110b db 01001110b,00011111b,10011000b,10101110b,10011001b,01000001b,10010110b,00111110b,10011000b,00100000b,10011000b,11010110b db 10011001b,01011101b,10011000b,10100100b,10011001b,00011111b,10011110b,11000001b,01101001b,00010001b,01101110b,11001100b db 01101000b,10101110b,01101001b,01000001b,01101000b,11001011b,01101110b,10101111b,01111000b,10111111b,01111110b,00111101b db 01111110b,00010101b,01111110b,00111110b,01111000b,10011101b,01111110b,00110000b,01111110b,01110010b,01111000b,01101101b db 01111110b,00111110b,01111110b,11100101b,01111001b,00011010b,01111110b,01011011b,01111110b,00111101b,01111110b,10101111b db 01101110b,00010010b,01101110b,11100100b,01101000b,10101110b,01101110b,11000001b,01101000b,11100001b,01101110b,11010011b db 01101000b,10100100b,01101110b,11001100b,01101000b,00100110b,01101000b,10101110b,01101000b,01011010b,01101110b,01111010b db 01101110b,00110000b,01101110b,01110010b,01101000b,11100001b,01101110b,00110110b,01101001b,01011101b,01101110b,01110001b db 10011001b,00010011b,10011110b,01000100b,10011110b,11110110b,10011001b,01000000b,10011110b,01001001b,10010010b,00001110b db 10011001b,00001011b,10011110b,00010110b,10011110b,10101111b,10011001b,01010000b,10011110b,01100010b,10011110b,11000001b db 10011001b,01010111b,10011110b,10011010b,10010010b,01000010b,10011001b,00110010b,10011110b,00100101b,10011110b,10110011b db 10011001b,01010001b,10011110b,00111000b,10011110b,11110110b,10011001b,01011010b,10011110b,10011101b,10010110b,00001101b db 10011001b,00101100b,10011110b,00100101b,10011110b,11110010b,10001110b,10110011b,10001001b,00001111b,10001110b,01110100b db 10001110b,11100100b,10001001b,00010010b,10001110b,10100011b,10001000b,10100100b,10001110b,00100110b,01111010b,10001111b db 01111110b,00110000b,01111110b,00010001b,01111110b,01110111b,01111001b,00101001b,01111110b,00010010b,01111110b,10111001b db 01001001b,00111110b,01000110b,01110001b,01001110b,00111100b,01001110b,01110101b,01101110b,00110010b,01101110b,11100100b db 01101001b,01000100b,01101110b,00111100b,01101110b,00110001b,01101110b,11100010b,01001110b,10101111b,01001000b,10000101b db 01000110b,00110000b,01001110b,01100111b,01111001b,00010001b,01111110b,10110011b,01111110b,00000011b,01111110b,11011001b db 01111001b,00001100b,01111110b,01110101b,01111110b,11100011b,10001110b,01100110b,10001110b,10010110b,10001000b,10100100b db 10001110b,01110110b,10001110b,10111011b,10001001b,00010001b,10001110b,10000101b,10001110b,11011001b,01011001b,00010001b db 01011110b,11000011b,01011001b,00111001b,01011110b,11011001b,01011110b,10111001b,01111000b,11110100b,01111110b,11000001b db 01111110b,01000000b,01111110b,11011001b,01111000b,10100100b,01111110b,01110111b,01111110b,11111000b,10001000b,11110100b db 10001110b,01000001b,10001110b,10111001b,10001001b,00011111b,10001110b,01100010b,10001110b,11010011b,10001001b,00101001b db 10001110b,01110010b,10001110b,11011011b,10001001b,00111100b,10001110b,01100111b,10000110b,01010101b,10001110b,00100010b db 10001110b,01110011b,10001001b,00001100b,10001110b,00100100b,10000110b,01110001b,10000110b,11000001b,10000110b,11111000b db 10000110b,10000101b,10000110b,11000011b,10000110b,00110000b,10000110b,10111011b,10000110b,11011001b,00011110b,01111000b db 10011001b,00001110b,10011110b,01110011b,10010110b,00000110b,10011110b,00100110b,10011110b,10000101b,10010110b,00101101b db 10011000b,11110100b,10011110b,01011101b,10011110b,11100011b,10001110b,00010101b,10001110b,01100111b,10001110b,11111011b db 10001110b,01000100b,10001110b,10110100b,10001110b,00000011b,10001110b,01100001b,10001110b,11100100b,01101001b,00001110b db 01101000b,11100011b,01101001b,01000000b,01101000b,01001001b,01101001b,00001011b,01101000b,10101110b,01011001b,01000100b db 01011110b,10110011b,01011110b,00010010b,01011001b,00111110b,01011110b,10001101b,10001000b,11111110b,10001110b,00100010b db 10001000b,00000001b,10001000b,11111111b,10001110b,11011011b,10001000b,10101110b,10001001b,00101100b,10001110b,11110110b db 10011000b,01101101b,10011010b,10001111b,10011110b,01000001b,10011000b,11000011b,10011110b,00010001b,10011110b,01110111b db 10011001b,00101001b,10011110b,00010010b,10010110b,01100010b,01001000b,11110100b,01001110b,11000010b,01001001b,00011110b db 01001110b,01100111b,10001110b,10000101b,10001110b,11111011b,10001001b,00010101b,10001110b,11000001b,10001000b,11110100b db 10001110b,00100100b,10001110b,11111000b,10001001b,00010001b,01101110b,00101010b,01101110b,10101111b,01101000b,01000100b db 01101110b,01110011b,01101001b,01001000b,01101110b,10000001b,10001001b,00110110b,10001110b,10011101b,10001000b,00011101b db 10001110b,00101100b,10001110b,11110110b,10001000b,10101110b,10001110b,01110101b,10000110b,01100011b,01011001b,01001000b db 01011110b,01000100b,01011110b,00001101b,01011110b,11101000b,01011110b,00010001b,10100110b,01111010b,10101001b,00001001b db 10101110b,10111001b,10101110b,11110010b,10101110b,01110011b,10101110b,11010111b,10100110b,00101011b,10101000b,10101101b db 10101110b,01110110b,10101110b,11011001b,01011110b,00111101b,01011001b,00110110b,01011110b,01110010b,01011110b,00110000b db 01011110b,10101111b,00011110b,11100110b,01001110b,01110101b,01001000b,11001110b,01001110b,10101111b,01001110b,01101010b db 01111001b,00110010b,01111110b,01110011b,01111110b,00101100b,01111110b,10110100b,01111000b,11111100b,01111110b,01000100b db 01111110b,11000001b,10011000b,11010110b,10011010b,11101000b,10011110b,01000101b,10011001b,00011001b,10011110b,00100100b db 10011110b,11110010b,10011001b,00111001b,10011110b,01000100b,10010110b,01110100b,00101001b,00000001b,00101110b,10010111b db 10001110b,00100010b,10001110b,10011101b,10001001b,01001101b,10001110b,00100100b,10001110b,11110110b,10001001b,01010101b db 10001110b,00101100b,10001000b,00100110b,10011000b,01110000b,10011110b,00110110b,10011110b,10011101b,10011001b,00010011b db 10011110b,01100111b,10010110b,11011011b,10011000b,01101101b,10011001b,01001101b,10011110b,10000101b,01111001b,01011110b db 01111110b,01100111b,01111110b,00110000b,01111110b,01110010b,01111000b,01010110b,01111110b,00111110b,01111110b,10111110b db 01101001b,00101101b,01101110b,10010110b,01101110b,00111110b,01101110b,11100101b,01101110b,01100010b,01101110b,11111000b db 01101110b,11101111b,01101000b,10011101b,01101110b,00111000b,01101001b,00101100b,01101110b,01110010b,01101110b,00010101b db 01011110b,00010010b,01011000b,10101110b,01011110b,01000001b,01011010b,10001111b,01011110b,11100100b,10001001b,00000101b db 10001110b,01100011b,10001110b,11100100b,10001110b,01000100b,10001110b,10110011b,10001110b,11111011b,10001110b,01010011b db 10001110b,10110100b,01111000b,01011010b,01111110b,01110100b,01111000b,10101101b,01111110b,11110110b,01111000b,01000100b db 01111110b,00100010b,01110010b,00110111b,10001000b,11001111b,10001110b,00101100b,10000110b,01110001b,10001000b,11110100b db 10001110b,00110010b,10000110b,01110011b,10001001b,01000110b,10001110b,10110100b,01011110b,10110111b,01011110b,10001000b db 01011110b,11100101b,01011110b,10101010b,01011001b,00001110b,01101000b,11110100b,01101110b,01100000b,01101000b,11111100b db 01100110b,10001110b,01101000b,00001000b,01101001b,00010001b,01111000b,00001000b,01111110b,00011011b,01111010b,11101110b db 01111110b,01100000b,01111000b,00000111b,01111110b,00000010b,01111110b,01110000b,01101000b,00001001b,01101110b,00000101b db 01101010b,11101110b,01101110b,01100111b,01101110b,00000010b,01101110b,01110000b,10001000b,10101110b,10001000b,11110100b db 10001110b,10110011b,10001000b,11001011b,10001001b,00001110b,10001110b,11011001b,10001000b,11010110b,10001110b,01000101b db 01111110b,01110100b,01111110b,11110110b,01111001b,01011101b,01111110b,11001000b,01111110b,00010111b,01111110b,11100100b db 01111000b,10101110b,01101000b,11110010b,01101001b,00110010b,01101000b,01001001b,01101001b,00011011b,01101000b,11100001b db 01101001b,00101100b,01101000b,10110011b,01101001b,00001001b,01101000b,01000100b,01101000b,11001011b,01101000b,10011101b db 01101000b,11001111b,01101000b,11110011b,01101001b,00101101b,01101000b,00010111b,01101000b,11111101b,01101000b,10101110b db 01101001b,00011111b,01011001b,00110001b,01011000b,00101011b,01011001b,00110110b,01011001b,00011001b,01011001b,01010111b db 01011000b,10100100b,01011001b,00001111b,01011000b,11001100b,01011001b,01000001b,01011000b,11100100b,01101000b,00110111b db 01101000b,10101111b,01101000b,01001001b,01101000b,11100110b,01101000b,01001011b,01101000b,11101011b,01101000b,00001101b db 01101000b,01100010b,01101000b,00100100b,01101000b,10000101b,01101000b,01001001b,01101000b,11001110b,01001000b,00010000b db 01001001b,00111110b,01001000b,10111001b,01001000b,11001011b,01101000b,01110111b,01101001b,00011111b,01101000b,00110000b db 01101000b,10001111b,01101000b,01100011b,01101000b,11100100b,01011000b,11001111b,01011000b,11001100b,01011001b,00001110b db 01011000b,11001110b,01011001b,00111001b,10001001b,00001111b,10001000b,00110010b,10001000b,11100011b,10001001b,00010001b db 10001000b,10011101b,10001001b,00001001b,10001001b,00010010b,10001000b,11100010b,01011000b,00010000b,01011000b,11101111b db 01011000b,00110110b,01011001b,01011010b,01011000b,01100001b,01011000b,00111100b,01011001b,01010101b,01011000b,10101010b db 01011000b,00111000b,01011000b,11000001b,10001000b,01011010b,10001000b,11001111b,10001000b,00100101b,10001000b,10101101b db 10001000b,11010110b,10001000b,00100110b,10001000b,10101110b,10001001b,01000001b,10001000b,10100100b,10001000b,11111101b db 10001001b,00111001b,10001000b,11100010b,10001001b,00001110b,10001001b,01000001b,10001000b,11110100b,10001001b,00010001b db 00111001b,00001111b,00111001b,00010101b,00111000b,00110010b,00111000b,10011001b,00111000b,11001101b,00111000b,11011110b db 01001000b,11001011b,01001001b,00011100b,01001000b,11010110b,01001001b,00011001b,00111000b,11110100b,00111000b,01101001b db 00111000b,11101100b,00111000b,11111010b,00111000b,00100101b,00111000b,11010001b,01001001b,00101100b,01001000b,00110000b db 01001001b,01011010b,01001000b,10010110b,01001000b,11110110b,01001001b,00011011b,01001000b,00100010b,01001001b,00101100b db 01101000b,01011111b,01101000b,11100001b,01101000b,01101101b,01101000b,11110011b,01101000b,01110001b,01101001b,00101100b db 00111000b,00100101b,00111000b,00100110b,00111000b,00111000b,00111000b,01110100b,00111000b,00010000b,00111000b,01100010b db 10001000b,11000001b,10001000b,11101110b,10001000b,01000100b,10001000b,11000101b,10001001b,00001110b,10001000b,10111001b db 10001000b,11011111b,10001001b,00010111b,01011000b,00011101b,01011000b,11110010b,01011000b,10000001b,01011000b,11111101b db 01011000b,10101110b,01101000b,00100010b,01101000b,11001101b,01101000b,01101111b,01101001b,01010000b,01101000b,00010111b db 01101000b,10111000b,10001000b,01011010b,10001000b,11111110b,10001001b,01011010b,10001000b,10011101b,10001000b,11111111b db 10001000b,00000001b,10001000b,10101110b,10001001b,00011001b,01011001b,01000000b,01011000b,11011111b,01011000b,00110011b db 01011001b,00101010b,01011000b,01000100b,00101000b,10111111b,00101001b,01001111b,01011000b,00010101b,01011001b,00011111b db 01011000b,00101111b,01011001b,01000001b,01011000b,11100011b,01001000b,11111000b,01001001b,00001111b,01001000b,10100100b db 01001001b,01000110b,00101000b,10100100b,00101001b,00010001b,00101001b,00010001b,00101000b,10100100b,01101000b,11110100b db 01101001b,01000001b,01101000b,00001110b,01101000b,11110110b,01101000b,11001110b,01101001b,00110001b,01111000b,00001001b db 01111000b,11100010b,01111000b,00000111b,01111000b,11000001b,01111000b,11111100b,01111000b,00001000b,01111000b,11011111b db 01001000b,11100100b,01001000b,01100011b,01001000b,01110010b,01001000b,01100001b,01101000b,11011100b,01101001b,00100000b db 01101000b,10111001b,01101001b,00000110b,01101000b,11000010b,01101001b,00011110b,01001000b,10111111b,01001000b,00101010b db 01001000b,11101011b,01001000b,10110010b,01111000b,10100011b,01111000b,11010110b,01111000b,10101101b,01111000b,11100100b db 01111000b,00100010b,01111000b,10101110b,01111001b,00110010b,01001000b,01111011b,01001000b,11011100b,01001000b,10001010b db 01001000b,10010111b,01011000b,00011101b,01011000b,00001101b,01011000b,01001001b,01011000b,00010101b,01011001b,00001011b db 01011000b,00100100b,01011001b,00001001b,01011000b,10101101b,01011001b,01000110b,01011000b,11001111b,01101000b,00100010b db 01101000b,01110000b,01101000b,00110000b,01101001b,00011111b,01101000b,01101101b,01101001b,00101100b,01101000b,00100110b db 01101000b,10111001b,01101000b,10100100b,01101000b,11100010b,01101000b,10101110b,01101001b,00010101b,01011000b,00110010b db 01011001b,00011110b,01011000b,11000001b,01011001b,00110110b,01011000b,11000010b,01001000b,00100010b,01001000b,11111110b db 01001000b,00000001b,01001000b,11111111b,01101000b,00001101b,01101000b,01000100b,01101000b,00011000b,01101000b,10101110b db 01101000b,00101110b,01101000b,10101111b,01101001b,01011010b,01101000b,10000010b,01101000b,11010110b,01101000b,10000101b db 01101000b,11011110b,01101000b,10011101b,01001001b,00001001b,01001000b,00010111b,01001001b,00011011b,01001000b,00100010b db 00101000b,11111000b,00101000b,11110100b,00111001b,00111110b,00111000b,11100010b,00111001b,00001111b,00111001b,00111110b db 00111000b,01001010b,00111000b,11100010b,01001000b,10011101b,01001000b,01101001b,01001000b,11110011b,01001000b,01110000b db 01001000b,10011101b,01001000b,11100101b,01001000b,00001110b,01001001b,00011010b,01011000b,00110010b,01011001b,00000101b db 01011000b,11000010b,01011001b,00000110b,01011000b,11010100b,01101000b,00111000b,01101000b,11101111b,01101000b,01010010b db 01101001b,01011101b,01101000b,00100101b,01101000b,10111011b
programs/oeis/083/A083713.asm
karttu/loda
1
86938
<reponame>karttu/loda ; A083713: a(n) = (8^n - 1)*3/7. ; 0,3,27,219,1755,14043,112347,898779,7190235,57521883,460175067,3681400539,29451204315,235609634523,1884877076187,15079016609499,120632132875995,965057063007963,7720456504063707,61763652032509659 mov $1,8 pow $1,$0 div $1,7 mul $1,3
Transynther/x86/_processed/NONE/_zr_/i3-7100_9_0xca_notsx.log_335_1111.asm
ljhsiun2/medusa
9
22850
.global s_prepare_buffers s_prepare_buffers: push %r10 push %r12 push %r13 push %r14 push %r8 push %rcx push %rdi push %rsi lea addresses_A_ht+0xd547, %rsi lea addresses_WT_ht+0x1cdd7, %rdi nop nop nop nop xor $3391, %r14 mov $100, %rcx rep movsq nop nop nop nop inc %r10 lea addresses_UC_ht+0x1a2d7, %r13 nop sub $13614, %r12 mov $0x6162636465666768, %rcx movq %rcx, (%r13) add $27425, %r10 lea addresses_WC_ht+0xb263, %rcx xor %rsi, %rsi mov $0x6162636465666768, %r12 movq %r12, %xmm2 movups %xmm2, (%rcx) nop lfence lea addresses_WT_ht+0x1367, %r14 nop nop nop nop sub $8283, %rsi mov (%r14), %di nop and $22830, %rsi lea addresses_WC_ht+0x1b971, %rsi lea addresses_A_ht+0x7377, %rdi nop nop xor %r8, %r8 mov $11, %rcx rep movsb nop nop nop nop xor $59524, %r10 lea addresses_D_ht+0x17897, %rsi lea addresses_WC_ht+0x4eb7, %rdi and %r14, %r14 mov $111, %rcx rep movsl nop nop nop cmp $16500, %rdi lea addresses_UC_ht+0x1d0af, %rsi lea addresses_D_ht+0x128af, %rdi and %r13, %r13 mov $113, %rcx rep movsw nop nop add %rcx, %rcx lea addresses_WT_ht+0x17bd7, %r12 mfence mov (%r12), %rsi sub $46683, %r8 lea addresses_WC_ht+0x10587, %rdi nop cmp %r10, %r10 mov (%rdi), %r8 nop nop and $1277, %r10 pop %rsi pop %rdi pop %rcx pop %r8 pop %r14 pop %r13 pop %r12 pop %r10 ret .global s_faulty_load s_faulty_load: push %r11 push %r12 push %r15 push %r8 push %rbx push %rcx push %rsi // Store lea addresses_normal+0x17ee2, %r15 nop nop add $32502, %r11 movl $0x51525354, (%r15) nop xor %rcx, %rcx // Store mov $0xbd7, %r8 nop nop nop nop sub %r12, %r12 mov $0x5152535455565758, %r15 movq %r15, %xmm7 movaps %xmm7, (%r8) nop and %r15, %r15 // Store lea addresses_UC+0x1c9b7, %rcx nop nop nop nop add %r11, %r11 movb $0x51, (%rcx) nop nop xor %rsi, %rsi // Faulty Load lea addresses_A+0x18fd7, %r12 xor $43978, %rbx mov (%r12), %r11d lea oracles, %r12 and $0xff, %r11 shlq $12, %r11 mov (%r12,%r11,1), %r11 pop %rsi pop %rcx pop %rbx pop %r8 pop %r15 pop %r12 pop %r11 ret /* <gen_faulty_load> [REF] {'src': {'same': False, 'congruent': 0, 'NT': False, 'type': 'addresses_A', 'size': 32, 'AVXalign': False}, 'OP': 'LOAD'} {'OP': 'STOR', 'dst': {'same': False, 'congruent': 0, 'NT': False, 'type': 'addresses_normal', 'size': 4, 'AVXalign': False}} {'OP': 'STOR', 'dst': {'same': False, 'congruent': 8, 'NT': False, 'type': 'addresses_P', 'size': 16, 'AVXalign': True}} {'OP': 'STOR', 'dst': {'same': False, 'congruent': 5, 'NT': False, 'type': 'addresses_UC', 'size': 1, 'AVXalign': False}} [Faulty Load] {'src': {'same': True, 'congruent': 0, 'NT': False, 'type': 'addresses_A', 'size': 4, 'AVXalign': False}, 'OP': 'LOAD'} <gen_prepare_buffer> {'src': {'type': 'addresses_A_ht', 'congruent': 4, 'same': False}, 'OP': 'REPM', 'dst': {'type': 'addresses_WT_ht', 'congruent': 8, 'same': False}} {'OP': 'STOR', 'dst': {'same': False, 'congruent': 8, 'NT': False, 'type': 'addresses_UC_ht', 'size': 8, 'AVXalign': False}} {'OP': 'STOR', 'dst': {'same': False, 'congruent': 1, 'NT': False, 'type': 'addresses_WC_ht', 'size': 16, 'AVXalign': False}} {'src': {'same': False, 'congruent': 4, 'NT': False, 'type': 'addresses_WT_ht', 'size': 2, 'AVXalign': False}, 'OP': 'LOAD'} {'src': {'type': 'addresses_WC_ht', 'congruent': 1, 'same': False}, 'OP': 'REPM', 'dst': {'type': 'addresses_A_ht', 'congruent': 5, 'same': False}} {'src': {'type': 'addresses_D_ht', 'congruent': 6, 'same': False}, 'OP': 'REPM', 'dst': {'type': 'addresses_WC_ht', 'congruent': 5, 'same': False}} {'src': {'type': 'addresses_UC_ht', 'congruent': 1, 'same': False}, 'OP': 'REPM', 'dst': {'type': 'addresses_D_ht', 'congruent': 3, 'same': False}} {'src': {'same': False, 'congruent': 8, 'NT': False, 'type': 'addresses_WT_ht', 'size': 8, 'AVXalign': False}, 'OP': 'LOAD'} {'src': {'same': False, 'congruent': 4, 'NT': False, 'type': 'addresses_WC_ht', 'size': 8, 'AVXalign': False}, 'OP': 'LOAD'} {'00': 335} 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 */
oeis/104/A104588.asm
neoneye/loda-programs
11
90594
; A104588: Product of primes less than or equal to sqrt(n). ; Submitted by <NAME> ; 1,1,1,2,2,2,2,2,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,30,30,30,30,30,30,30,30,30,30,30,30,30,30,30,30,30,30,30,30,30,30,30,30,210,210,210,210,210,210,210,210,210,210,210,210,210,210,210,210,210,210,210,210,210,210 add $0,1 seq $0,196 ; Integer part of square root of n. Or, number of positive squares <= n. Or, n appears 2n+1 times. seq $0,34386 ; Primorial numbers (second definition): n# = product of primes <= n.
Transynther/x86/_processed/US/_zr_/i3-7100_9_0x84_notsx.log_21829_491.asm
ljhsiun2/medusa
9
89909
<reponame>ljhsiun2/medusa<filename>Transynther/x86/_processed/US/_zr_/i3-7100_9_0x84_notsx.log_21829_491.asm .global s_prepare_buffers s_prepare_buffers: push %r12 push %r9 push %rax push %rbp push %rbx push %rcx push %rdi push %rsi lea addresses_A_ht+0xd3b2, %rsi add $18612, %rax movups (%rsi), %xmm4 vpextrq $1, %xmm4, %r12 nop nop sub %rbx, %rbx lea addresses_WT_ht+0x15b2, %rsi lea addresses_WT_ht+0x14fb2, %rdi nop nop sub %r9, %r9 mov $28, %rcx rep movsb nop nop nop nop nop cmp %rsi, %rsi lea addresses_A_ht+0x12bb2, %rsi lea addresses_UC_ht+0xc0b2, %rdi nop nop nop inc %rbp mov $83, %rcx rep movsq nop nop xor $15949, %rbx lea addresses_D_ht+0x1ba, %rbx clflush (%rbx) nop nop nop nop dec %rbp movl $0x61626364, (%rbx) nop nop and $32121, %rbp lea addresses_normal_ht+0x154d2, %rax nop nop nop xor $63521, %rbp movups (%rax), %xmm7 vpextrq $1, %xmm7, %r12 nop nop nop sub %rsi, %rsi pop %rsi pop %rdi pop %rcx pop %rbx pop %rbp pop %rax pop %r9 pop %r12 ret .global s_faulty_load s_faulty_load: push %r10 push %r11 push %r14 push %r15 push %rbp push %rcx push %rsi // Store lea addresses_WC+0x1f2e0, %r15 nop nop nop sub $39153, %rcx mov $0x5152535455565758, %r11 movq %r11, %xmm6 movups %xmm6, (%r15) nop nop sub %r10, %r10 // Store lea addresses_WC+0x1bb18, %rsi nop nop sub $45568, %rbp movb $0x51, (%rsi) nop sub $41843, %rcx // Store mov $0xc32, %r14 nop nop nop and %rbp, %rbp mov $0x5152535455565758, %r15 movq %r15, (%r14) nop nop xor %rcx, %rcx // Faulty Load lea addresses_US+0xd3b2, %r14 add $29, %r10 mov (%r14), %bp lea oracles, %rcx and $0xff, %rbp shlq $12, %rbp mov (%rcx,%rbp,1), %rbp pop %rsi pop %rcx pop %rbp pop %r15 pop %r14 pop %r11 pop %r10 ret /* <gen_faulty_load> [REF] {'src': {'type': 'addresses_US', 'same': False, 'size': 32, 'congruent': 0, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} {'dst': {'type': 'addresses_WC', 'same': False, 'size': 16, 'congruent': 1, 'NT': False, 'AVXalign': False}, 'OP': 'STOR'} {'dst': {'type': 'addresses_WC', 'same': False, 'size': 1, 'congruent': 0, 'NT': True, 'AVXalign': False}, 'OP': 'STOR'} {'dst': {'type': 'addresses_P', 'same': False, 'size': 8, 'congruent': 5, 'NT': False, 'AVXalign': False}, 'OP': 'STOR'} [Faulty Load] {'src': {'type': 'addresses_US', 'same': True, 'size': 2, 'congruent': 0, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} <gen_prepare_buffer> {'src': {'type': 'addresses_A_ht', 'same': False, 'size': 16, 'congruent': 11, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} {'src': {'type': 'addresses_WT_ht', 'congruent': 7, 'same': True}, 'dst': {'type': 'addresses_WT_ht', 'congruent': 7, 'same': False}, 'OP': 'REPM'} {'src': {'type': 'addresses_A_ht', 'congruent': 11, 'same': False}, 'dst': {'type': 'addresses_UC_ht', 'congruent': 8, 'same': False}, 'OP': 'REPM'} {'dst': {'type': 'addresses_D_ht', 'same': False, 'size': 4, 'congruent': 2, 'NT': False, 'AVXalign': False}, 'OP': 'STOR'} {'src': {'type': 'addresses_normal_ht', 'same': True, 'size': 16, 'congruent': 5, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} {'00': 21829} 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 */
src/util/sprite/cursor.asm
olifink/qspread
0
246611
;Sprite source code generated with EASYSOURCE  1991 <NAME> Software ;************************************************************************** ; -> asm_spr_ <- 1992 Jun 13 12:42:56 section sprite xdef mes_curs mes_curs sp1 dc.w $0100,$0000 ;form, time/adaption dc.w $0006,$000A ;x size, y size dc.w $0003,$0004 ;x origin, y origin dc.l cp1-* ;pointer to colour pattern dc.l pm1-* ;pointer to pattern mask dc.l 0 ;pointer to next definition cp1 dc.w $FCFC,$0000 dc.w $FCFC,$0000 dc.w $FCFC,$0000 dc.w $FCFC,$0000 dc.w $FCFC,$0000 dc.w $FCFC,$0000 dc.w $FCFC,$0000 dc.w $FCFC,$0000 dc.w $FCFC,$0000 dc.w $FCFC,$0000 pm1 dc.w $0000,$0000 dc.w $0000,$0000 dc.w $0000,$0000 dc.w $0000,$0000 dc.w $0000,$0000 dc.w $0000,$0000 dc.w $0000,$0000 dc.w $0000,$0000 dc.w $0000,$0000 dc.w $0000,$0000 ; end
src/lang/stemmer-basque.adb
stcarrez/ada-stemmer
3
1774
<gh_stars>1-10 -- Generated by Snowball 2.2.0 - https://snowballstem.org/ package body Stemmer.Basque is pragma Style_Checks ("-mr"); pragma Warnings (Off, "*variable*is never read and never assigned*"); pragma Warnings (Off, "*mode could be*instead of*"); pragma Warnings (Off, "*formal parameter.*is not modified*"); pragma Warnings (Off, "*this line is too long*"); pragma Warnings (Off, "*is not referenced*"); procedure R_R1 (Z : in out Context_Type; Result : out Boolean); procedure R_R2 (Z : in out Context_Type; Result : out Boolean); procedure R_RV (Z : in out Context_Type; Result : out Boolean); procedure R_Mark_regions (Z : in out Context_Type; Result : out Boolean); procedure R_Adjetiboak (Z : in out Context_Type; Result : out Boolean); procedure R_Izenak (Z : in out Context_Type; Result : out Boolean); procedure R_Aditzak (Z : in out Context_Type; Result : out Boolean); G_V : constant Grouping_Array (0 .. 23) := ( True, False, False, False, True, False, False, False, True, False, False, False, False, False, True, False, False, False, False, False, True, False, False, False ); Among_String : constant String := "idea" & "bidea" & "kidea" & "pidea" & "kundea" & "galea" & "tailea" & "tzailea" & "gunea" & "kunea" & "tzaga" & "gaia" & "aldia" & "taldia" & "karia" & "garria" & "karria" & "ka" & "tzaka" & "la" & "mena" & "pena" & "kina" & "ezina" & "tezina" & "kuna" & "tuna" & "kizuna" & "era" & "bera" & "arabera" & "kera" & "pera" & "orra" & "korra" & "dura" & "gura" & "kura" & "tura" & "eta" & "keta" & "gailua" & "eza" & "erreza" & "tza" & "gaitza" & "kaitza" & "kuntza" & "ide" & "bide" & "kide" & "pide" & "kunde" & "tzake" & "tzeke" & "le" & "gale" & "taile" & "tzaile" & "gune" & "kune" & "tze" & "atze" & "gai" & "aldi" & "taldi" & "ki" & "ari" & "kari" & "lari" & "tari" & "etari" & "garri" & "karri" & "arazi" & "tarazi" & "an" & "ean" & "rean" & "kan" & "etan" & "atseden" & "men" & "pen" & "kin" & "rekin" & "ezin" & "tezin" & "tun" & "kizun" & "go" & "ago" & "tio" & "dako" & "or" & "kor" & "tzat" & "du" & "gailu" & "tu" & "atu" & "aldatu" & "tatu" & "baditu" & "ez" & "errez" & "tzez" & "gaitz" & "kaitz" & "ada" & "kada" & "anda" & "denda" & "gabea" & "kabea" & "aldea" & "kaldea" & "taldea" & "ordea" & "zalea" & "tzalea" & "gilea" & "emea" & "kumea" & "nea" & "enea" & "zionea" & "unea" & "gunea" & "pea" & "aurrea" & "tea" & "kotea" & "artea" & "ostea" & "etxea" & "ga" & "anga" & "gaia" & "aldia" & "taldia" & "handia" & "mendia" & "geia" & "egia" & "degia" & "tegia" & "nahia" & "ohia" & "kia" & "tokia" & "oia" & "koia" & "aria" & "karia" & "laria" & "taria" & "eria" & "keria" & "teria" & "garria" & "larria" & "kirria" & "duria" & "asia" & "tia" & "ezia" & "bizia" & "ontzia" & "ka" & "joka" & "aurka" & "ska" & "xka" & "zka" & "gibela" & "gela" & "kaila" & "skila" & "tila" & "ola" & "na" & "kana" & "ena" & "garrena" & "gerrena" & "urrena" & "zaina" & "tzaina" & "kina" & "mina" & "garna" & "una" & "duna" & "asuna" & "tasuna" & "ondoa" & "kondoa" & "ngoa" & "zioa" & "koa" & "takoa" & "zkoa" & "noa" & "zinoa" & "aroa" & "taroa" & "zaroa" & "eroa" & "oroa" & "osoa" & "toa" & "ttoa" & "ztoa" & "txoa" & "tzoa" & "ñoa" & "ra" & "ara" & "dara" & "liara" & "tiara" & "tara" & "etara" & "tzara" & "bera" & "kera" & "pera" & "ora" & "tzarra" & "korra" & "tra" & "sa" & "osa" & "ta" & "eta" & "keta" & "sta" & "dua" & "mendua" & "ordua" & "lekua" & "burua" & "durua" & "tsua" & "tua" & "mentua" & "estua" & "txua" & "zua" & "tzua" & "za" & "eza" & "eroza" & "tza" & "koitza" & "antza" & "gintza" & "kintza" & "kuntza" & "gabe" & "kabe" & "kide" & "alde" & "kalde" & "talde" & "orde" & "ge" & "zale" & "tzale" & "gile" & "eme" & "kume" & "ne" & "zione" & "une" & "gune" & "pe" & "aurre" & "te" & "kote" & "arte" & "oste" & "etxe" & "gai" & "di" & "aldi" & "taldi" & "geldi" & "handi" & "mendi" & "gei" & "egi" & "degi" & "tegi" & "nahi" & "ohi" & "ki" & "toki" & "oi" & "goi" & "koi" & "ari" & "kari" & "lari" & "tari" & "garri" & "larri" & "kirri" & "duri" & "asi" & "ti" & "ontzi" & "ñi" & "ak" & "ek" & "tarik" & "gibel" & "ail" & "kail" & "kan" & "tan" & "etan" & "en" & "ren" & "garren" & "gerren" & "urren" & "ten" & "tzen" & "zain" & "tzain" & "kin" & "min" & "dun" & "asun" & "tasun" & "aizun" & "ondo" & "kondo" & "go" & "ngo" & "zio" & "ko" & "trako" & "tako" & "etako" & "eko" & "tariko" & "sko" & "tuko" & "minutuko" & "zko" & "no" & "zino" & "ro" & "aro" & "igaro" & "taro" & "zaro" & "ero" & "giro" & "oro" & "oso" & "to" & "tto" & "zto" & "txo" & "tzo" & "gintzo" & "ño" & "zp" & "ar" & "dar" & "behar" & "zehar" & "liar" & "tiar" & "tar" & "tzar" & "or" & "kor" & "os" & "ket" & "du" & "mendu" & "ordu" & "leku" & "buru" & "duru" & "tsu" & "tu" & "tatu" & "mentu" & "estu" & "txu" & "zu" & "tzu" & "gintzu" & "z" & "ez" & "eroz" & "tz" & "koitz" & "zlea" & "keria" & "la" & "era" & "dade" & "tade" & "date" & "tate" & "gi" & "ki" & "ik" & "lanik" & "rik" & "larik" & "ztik" & "go" & "ro" & "ero" & "to"; A_0 : constant Among_Array_Type (0 .. 108) := ( (1, 4, -1, 1, 0), (5, 9, 0, 1, 0), (10, 14, 0, 1, 0), (15, 19, 0, 1, 0), (20, 25, -1, 1, 0), (26, 30, -1, 1, 0), (31, 36, -1, 1, 0), (37, 43, -1, 1, 0), (44, 48, -1, 1, 0), (49, 53, -1, 1, 0), (54, 58, -1, 1, 0), (59, 62, -1, 1, 0), (63, 67, -1, 1, 0), (68, 73, 12, 1, 0), (74, 78, -1, 1, 0), (79, 84, -1, 2, 0), (85, 90, -1, 1, 0), (91, 92, -1, 1, 0), (93, 97, 17, 1, 0), (98, 99, -1, 1, 0), (100, 103, -1, 1, 0), (104, 107, -1, 1, 0), (108, 111, -1, 1, 0), (112, 116, -1, 1, 0), (117, 122, 23, 1, 0), (123, 126, -1, 1, 0), (127, 130, -1, 1, 0), (131, 136, -1, 1, 0), (137, 139, -1, 1, 0), (140, 143, 28, 1, 0), (144, 150, 29, 4, 0), (151, 154, 28, 1, 0), (155, 158, 28, 1, 0), (159, 162, -1, 1, 0), (163, 167, 33, 1, 0), (168, 171, -1, 1, 0), (172, 175, -1, 1, 0), (176, 179, -1, 1, 0), (180, 183, -1, 1, 0), (184, 186, -1, 1, 0), (187, 190, 39, 1, 0), (191, 196, -1, 1, 0), (197, 199, -1, 1, 0), (200, 205, 42, 1, 0), (206, 208, -1, 2, 0), (209, 214, 44, 1, 0), (215, 220, 44, 1, 0), (221, 226, 44, 1, 0), (227, 229, -1, 1, 0), (230, 233, 48, 1, 0), (234, 237, 48, 1, 0), (238, 241, 48, 1, 0), (242, 246, -1, 1, 0), (247, 251, -1, 1, 0), (252, 256, -1, 1, 0), (257, 258, -1, 1, 0), (259, 262, 55, 1, 0), (263, 267, 55, 1, 0), (268, 273, 55, 1, 0), (274, 277, -1, 1, 0), (278, 281, -1, 1, 0), (282, 284, -1, 1, 0), (285, 288, 61, 1, 0), (289, 291, -1, 1, 0), (292, 295, -1, 1, 0), (296, 300, 64, 1, 0), (301, 302, -1, 1, 0), (303, 305, -1, 1, 0), (306, 309, 67, 1, 0), (310, 313, 67, 1, 0), (314, 317, 67, 1, 0), (318, 322, 70, 1, 0), (323, 327, -1, 2, 0), (328, 332, -1, 1, 0), (333, 337, -1, 1, 0), (338, 343, 74, 1, 0), (344, 345, -1, 1, 0), (346, 348, 76, 1, 0), (349, 352, 77, 1, 0), (353, 355, 76, 1, 0), (356, 359, 76, 1, 0), (360, 366, -1, 3, 0), (367, 369, -1, 1, 0), (370, 372, -1, 1, 0), (373, 375, -1, 1, 0), (376, 380, 84, 1, 0), (381, 384, -1, 1, 0), (385, 389, 86, 1, 0), (390, 392, -1, 1, 0), (393, 397, -1, 1, 0), (398, 399, -1, 1, 0), (400, 402, 90, 1, 0), (403, 405, -1, 1, 0), (406, 409, -1, 1, 0), (410, 411, -1, 1, 0), (412, 414, 94, 1, 0), (415, 418, -1, 1, 0), (419, 420, -1, 1, 0), (421, 425, -1, 1, 0), (426, 427, -1, 1, 0), (428, 430, 99, 1, 0), (431, 436, 100, 1, 0), (437, 440, 100, 1, 0), (441, 446, 99, 5, 0), (447, 448, -1, 1, 0), (449, 453, 104, 1, 0), (454, 457, 104, 1, 0), (458, 462, -1, 1, 0), (463, 467, -1, 1, 0)); A_1 : constant Among_Array_Type (0 .. 294) := ( (468, 470, -1, 1, 0), (471, 474, 0, 1, 0), (475, 478, -1, 1, 0), (479, 483, -1, 1, 0), (484, 488, -1, 1, 0), (489, 493, -1, 1, 0), (494, 498, -1, 1, 0), (499, 504, 6, 1, 0), (505, 510, 6, 1, 0), (511, 515, -1, 1, 0), (516, 520, -1, 1, 0), (521, 526, 10, 1, 0), (527, 531, -1, 1, 0), (532, 535, -1, 1, 0), (536, 540, -1, 1, 0), (541, 543, -1, 1, 0), (544, 547, 15, 1, 0), (548, 553, 15, 1, 0), (554, 557, 15, 1, 0), (558, 562, 18, 1, 0), (563, 565, -1, 1, 0), (566, 571, -1, 1, 0), (572, 574, -1, 1, 0), (575, 579, 22, 1, 0), (580, 584, 22, 1, 0), (585, 589, 22, 1, 0), (590, 594, -1, 1, 0), (595, 596, -1, 1, 0), (597, 600, 27, 1, 0), (601, 604, -1, 1, 0), (605, 609, -1, 1, 0), (610, 615, 30, 1, 0), (616, 621, -1, 1, 0), (622, 627, -1, 1, 0), (628, 631, -1, 1, 0), (632, 635, -1, 1, 0), (636, 640, 35, 1, 0), (641, 645, 35, 1, 0), (646, 650, -1, 1, 0), (651, 654, -1, 1, 0), (655, 657, -1, 1, 0), (658, 662, 40, 1, 0), (663, 665, -1, 1, 0), (666, 669, 42, 1, 0), (670, 673, -1, 1, 0), (674, 678, 44, 1, 0), (679, 683, 44, 1, 0), (684, 688, 44, 1, 0), (689, 692, -1, 1, 0), (693, 697, 48, 1, 0), (698, 702, 48, 1, 0), (703, 708, -1, 2, 0), (709, 714, -1, 1, 0), (715, 720, -1, 1, 0), (721, 725, -1, 1, 0), (726, 729, -1, 1, 0), (730, 732, -1, 1, 0), (733, 736, -1, 1, 0), (737, 741, -1, 1, 0), (742, 747, -1, 1, 0), (748, 749, -1, 1, 0), (750, 753, 60, 3, 0), (754, 758, 60, 10, 0), (759, 761, 60, 1, 0), (762, 764, 60, 1, 0), (765, 767, 60, 1, 0), (768, 773, -1, 1, 0), (774, 777, -1, 1, 0), (778, 782, -1, 1, 0), (783, 787, -1, 1, 0), (788, 791, -1, 1, 0), (792, 794, -1, 1, 0), (795, 796, -1, 1, 0), (797, 800, 72, 1, 0), (801, 803, 72, 1, 0), (804, 810, 74, 1, 0), (811, 817, 74, 1, 0), (818, 823, 74, 1, 0), (824, 828, 72, 1, 0), (829, 834, 78, 1, 0), (835, 838, 72, 1, 0), (839, 842, 72, 1, 0), (843, 847, 72, 1, 0), (848, 850, 72, 1, 0), (851, 854, 83, 1, 0), (855, 859, 83, 1, 0), (860, 865, 85, 1, 0), (866, 870, -1, 1, 0), (871, 876, 87, 1, 0), (877, 880, -1, 1, 0), (881, 884, -1, 1, 0), (885, 887, -1, 1, 0), (888, 892, 91, 1, 0), (893, 896, 91, 1, 0), (897, 899, -1, 1, 0), (900, 904, 94, 1, 0), (905, 908, -1, 1, 0), (909, 913, 96, 1, 0), (914, 918, 96, 1, 0), (919, 922, -1, 1, 0), (923, 926, -1, 1, 0), (927, 930, -1, 1, 0), (931, 933, -1, 1, 0), (934, 937, 102, 1, 0), (938, 941, 102, 1, 0), (942, 945, -1, 1, 0), (946, 949, -1, 1, 0), (950, 953, -1, 1, 0), (954, 955, -1, 1, 0), (956, 958, 108, 1, 0), (959, 962, 109, 1, 0), (963, 967, 109, 1, 0), (968, 972, 109, 1, 0), (973, 976, 109, 1, 0), (977, 981, 113, 1, 0), (982, 986, 109, 1, 0), (987, 990, 108, 1, 0), (991, 994, 108, 1, 0), (995, 998, 108, 1, 0), (999, 1001, 108, 2, 0), (1002, 1007, 108, 1, 0), (1008, 1012, 108, 1, 0), (1013, 1015, 108, 1, 0), (1016, 1017, -1, 1, 0), (1018, 1020, 123, 1, 0), (1021, 1022, -1, 1, 0), (1023, 1025, 125, 1, 0), (1026, 1029, 126, 1, 0), (1030, 1032, 125, 1, 0), (1033, 1035, -1, 1, 0), (1036, 1041, 129, 1, 0), (1042, 1046, 129, 1, 0), (1047, 1051, -1, 1, 0), (1052, 1056, -1, 1, 0), (1057, 1061, -1, 1, 0), (1062, 1065, -1, 1, 0), (1066, 1068, -1, 1, 0), (1069, 1074, 136, 1, 0), (1075, 1079, 136, 1, 0), (1080, 1083, -1, 1, 0), (1084, 1086, -1, 1, 0), (1087, 1090, 140, 1, 0), (1091, 1092, -1, 1, 0), (1093, 1095, 142, 1, 0), (1096, 1100, 142, 1, 0), (1101, 1103, 142, 2, 0), (1104, 1109, 145, 1, 0), (1110, 1114, 145, 1, 0), (1115, 1120, 145, 1, 0), (1121, 1126, 145, 1, 0), (1127, 1132, 145, 1, 0), (1133, 1136, -1, 1, 0), (1137, 1140, -1, 1, 0), (1141, 1144, -1, 1, 0), (1145, 1148, -1, 1, 0), (1149, 1153, 154, 1, 0), (1154, 1158, 154, 1, 0), (1159, 1162, -1, 1, 0), (1163, 1164, -1, 1, 0), (1165, 1168, -1, 1, 0), (1169, 1173, 159, 1, 0), (1174, 1177, -1, 1, 0), (1178, 1180, -1, 1, 0), (1181, 1184, -1, 1, 0), (1185, 1186, -1, 1, 0), (1187, 1191, 164, 1, 0), (1192, 1194, 164, 1, 0), (1195, 1198, 166, 1, 0), (1199, 1200, -1, 1, 0), (1201, 1205, -1, 1, 0), (1206, 1207, -1, 1, 0), (1208, 1211, 170, 1, 0), (1212, 1215, 170, 1, 0), (1216, 1219, 170, 1, 0), (1220, 1223, -1, 1, 0), (1224, 1226, -1, 1, 0), (1227, 1228, -1, 1, 0), (1229, 1232, 176, 1, 0), (1233, 1237, 177, 1, 0), (1238, 1242, 176, 8, 0), (1243, 1247, 176, 1, 0), (1248, 1252, 176, 1, 0), (1253, 1255, -1, 1, 0), (1256, 1258, -1, 1, 0), (1259, 1262, 183, 1, 0), (1263, 1266, 183, 1, 0), (1267, 1270, -1, 1, 0), (1271, 1273, -1, 1, 0), (1274, 1275, -1, 1, 0), (1276, 1279, 188, 1, 0), (1280, 1281, -1, 1, 0), (1282, 1284, 190, 1, 0), (1285, 1287, 190, 1, 0), (1288, 1290, -1, 1, 0), (1291, 1294, 193, 1, 0), (1295, 1298, 193, 1, 0), (1299, 1302, 193, 1, 0), (1303, 1307, -1, 2, 0), (1308, 1312, -1, 1, 0), (1313, 1317, -1, 1, 0), (1318, 1321, -1, 1, 0), (1322, 1324, -1, 1, 0), (1325, 1326, -1, 1, 0), (1327, 1331, -1, 1, 0), (1332, 1334, -1, 1, 0), (1335, 1336, -1, 1, 0), (1337, 1338, -1, 1, 0), (1339, 1343, -1, 1, 0), (1344, 1348, -1, 1, 0), (1349, 1351, -1, 1, 0), (1352, 1355, 209, 1, 0), (1356, 1358, -1, 1, 0), (1359, 1361, -1, 1, 0), (1362, 1365, 212, 1, 0), (1366, 1367, -1, 4, 0), (1368, 1370, 214, 2, 0), (1371, 1376, 215, 1, 0), (1377, 1382, 215, 1, 0), (1383, 1387, 215, 1, 0), (1388, 1390, 214, 4, 0), (1391, 1394, 214, 4, 0), (1395, 1398, -1, 1, 0), (1399, 1403, 221, 1, 0), (1404, 1406, -1, 1, 0), (1407, 1409, -1, 1, 0), (1410, 1412, -1, 1, 0), (1413, 1416, -1, 1, 0), (1417, 1421, 226, 1, 0), (1422, 1426, -1, 1, 0), (1427, 1430, -1, 1, 0), (1431, 1435, 229, 1, 0), (1436, 1437, -1, 1, 0), (1438, 1440, 231, 1, 0), (1441, 1443, -1, 1, 0), (1444, 1445, -1, 1, 0), (1446, 1450, 234, 5, 0), (1451, 1454, 234, 1, 0), (1455, 1459, 236, 1, 0), (1460, 1462, 234, 1, 0), (1463, 1468, 234, 1, 0), (1469, 1471, 234, 1, 0), (1472, 1475, 234, 1, 0), (1476, 1483, 241, 6, 0), (1484, 1486, 234, 1, 0), (1487, 1488, -1, 1, 0), (1489, 1492, 244, 1, 0), (1493, 1494, -1, 1, 0), (1495, 1497, 246, 1, 0), (1498, 1502, 247, 9, 0), (1503, 1506, 247, 1, 0), (1507, 1510, 247, 1, 0), (1511, 1513, 246, 1, 0), (1514, 1517, 246, 1, 0), (1518, 1520, 246, 1, 0), (1521, 1523, -1, 1, 0), (1524, 1525, -1, 1, 0), (1526, 1528, 255, 1, 0), (1529, 1531, 255, 1, 0), (1532, 1534, -1, 1, 0), (1535, 1537, -1, 1, 0), (1538, 1543, 259, 1, 0), (1544, 1546, -1, 1, 0), (1547, 1548, -1, 1, 0), (1549, 1550, -1, 1, 0), (1551, 1553, 263, 1, 0), (1554, 1558, 263, 1, 0), (1559, 1563, 263, 7, 0), (1564, 1567, 263, 1, 0), (1568, 1571, 263, 1, 0), (1572, 1574, 263, 1, 0), (1575, 1578, 263, 1, 0), (1579, 1580, -1, 2, 0), (1581, 1583, 271, 1, 0), (1584, 1585, -1, 1, 0), (1586, 1588, -1, 1, 0), (1589, 1590, -1, 1, 0), (1591, 1595, 275, 1, 0), (1596, 1599, 275, 1, 0), (1600, 1603, -1, 1, 0), (1604, 1607, -1, 2, 0), (1608, 1611, -1, 1, 0), (1612, 1614, -1, 1, 0), (1615, 1616, -1, 1, 0), (1617, 1620, 282, 4, 0), (1621, 1625, 282, 1, 0), (1626, 1629, 282, 1, 0), (1630, 1632, -1, 1, 0), (1633, 1634, -1, 1, 0), (1635, 1637, 287, 1, 0), (1638, 1643, 288, 1, 0), (1644, 1644, -1, 1, 0), (1645, 1646, 290, 1, 0), (1647, 1650, 290, 1, 0), (1651, 1652, 290, 1, 0), (1653, 1657, 293, 1, 0)); A_2 : constant Among_Array_Type (0 .. 18) := ( (1658, 1661, -1, 2, 0), (1662, 1666, -1, 1, 0), (1667, 1668, -1, 1, 0), (1669, 1671, -1, 1, 0), (1672, 1675, -1, 1, 0), (1676, 1679, -1, 1, 0), (1680, 1683, -1, 1, 0), (1684, 1687, -1, 1, 0), (1688, 1689, -1, 1, 0), (1690, 1691, -1, 1, 0), (1692, 1693, -1, 1, 0), (1694, 1698, 10, 1, 0), (1699, 1701, 10, 1, 0), (1702, 1706, 12, 1, 0), (1707, 1710, 10, 1, 0), (1711, 1712, -1, 1, 0), (1713, 1714, -1, 1, 0), (1715, 1717, 16, 1, 0), (1718, 1719, -1, 1, 0)); procedure R_Mark_regions (Z : in out Context_Type; Result : out Boolean) is C : Result_Index; A : Integer; v_1 : Char_Index; v_2 : Char_Index; v_3 : Char_Index; v_4 : Char_Index; v_5 : Char_Index; begin -- (, line 23 Z.I_PV := Z.L; Z.I_P1 := Z.L; Z.I_P2 := Z.L; -- do, line 29 v_1 := Z.C; -- (, line 29 -- or, line 31 v_2 := Z.C; -- (, line 30 In_Grouping (Z, G_V, 97, 117, False, C); if C /= 0 then goto lab2; end if; -- or, line 30 v_3 := Z.C; -- (, line 30 Out_Grouping (Z, G_V, 97, 117, False, C); if C /= 0 then goto lab4; end if; -- gopast, line 30 -- grouping v, line 30 Out_Grouping (Z, G_V, 97, 117, True, C); if C < 0 then goto lab4; end if; Z.C := Z.C + C; goto lab3; <<lab4>> Z.C := v_3; -- (, line 30 In_Grouping (Z, G_V, 97, 117, False, C); if C /= 0 then goto lab2; end if; -- gopast, line 30 -- non v, line 30 In_Grouping (Z, G_V, 97, 117, True, C); if C < 0 then goto lab2; end if; Z.C := Z.C + C; <<lab3>> goto lab1; <<lab2>> Z.C := v_2; -- (, line 32 Out_Grouping (Z, G_V, 97, 117, False, C); if C /= 0 then goto lab0; end if; -- or, line 32 v_4 := Z.C; -- (, line 32 Out_Grouping (Z, G_V, 97, 117, False, C); if C /= 0 then goto lab8; end if; -- gopast, line 32 -- grouping v, line 32 Out_Grouping (Z, G_V, 97, 117, True, C); if C < 0 then goto lab8; end if; Z.C := Z.C + C; goto lab7; <<lab8>> Z.C := v_4; -- (, line 32 In_Grouping (Z, G_V, 97, 117, False, C); if C /= 0 then goto lab0; end if; -- next, line 32 C := Skip_Utf8 (Z); if C < 0 then goto lab0; end if; Z.C := C; <<lab7>> <<lab1>> -- setmark pV, line 33 Z.I_PV := Z.C; <<lab0>> Z.C := v_1; -- do, line 35 v_5 := Z.C; -- (, line 35 -- gopast, line 36 -- grouping v, line 36 Out_Grouping (Z, G_V, 97, 117, True, C); if C < 0 then goto lab10; end if; Z.C := Z.C + C; -- gopast, line 36 -- non v, line 36 In_Grouping (Z, G_V, 97, 117, True, C); if C < 0 then goto lab10; end if; Z.C := Z.C + C; -- setmark p1, line 36 Z.I_P1 := Z.C; -- gopast, line 37 -- grouping v, line 37 Out_Grouping (Z, G_V, 97, 117, True, C); if C < 0 then goto lab10; end if; Z.C := Z.C + C; -- gopast, line 37 -- non v, line 37 In_Grouping (Z, G_V, 97, 117, True, C); if C < 0 then goto lab10; end if; Z.C := Z.C + C; -- setmark p2, line 37 Z.I_P2 := Z.C; <<lab10>> Z.C := v_5; Result := True; end R_Mark_regions; procedure R_RV (Z : in out Context_Type; Result : out Boolean) is begin Result := (Z.I_PV <= Z.C); end R_RV; procedure R_R2 (Z : in out Context_Type; Result : out Boolean) is begin Result := (Z.I_P2 <= Z.C); end R_R2; procedure R_R1 (Z : in out Context_Type; Result : out Boolean) is begin Result := (Z.I_P1 <= Z.C); end R_R1; procedure R_Aditzak (Z : in out Context_Type; Result : out Boolean) is C : Result_Index; A : Integer; begin -- (, line 47 Z.Ket := Z.C; -- [, line 48 -- substring, line 48 if Z.C - 1 <= Z.Lb or else Check_Among (Z, Z.C - 1, 3, 16#434c222#) then Result := False; return; -- substring, line 48 end if; Find_Among_Backward (Z, A_0, Among_String, null, A); if A = 0 then Result := False; return; end if; Z.Bra := Z.C; -- ], line 48 -- among, line 48 case A is when 1 => -- (, line 59 -- call RV, line 59 R_RV (Z, Result); if not Result then Result := False; return; end if; -- delete, line 59 Slice_Del (Z); when 2 => -- (, line 61 -- call R2, line 61 R_R2 (Z, Result); if not Result then Result := False; return; end if; -- delete, line 61 Slice_Del (Z); when 3 => -- (, line 63 -- <-, line 63 Slice_From (Z, "atseden"); when 4 => -- (, line 65 -- <-, line 65 Slice_From (Z, "arabera"); when 5 => -- (, line 67 -- <-, line 67 Slice_From (Z, "baditu"); when others => null; end case; Result := True; end R_Aditzak; procedure R_Izenak (Z : in out Context_Type; Result : out Boolean) is C : Result_Index; A : Integer; begin -- (, line 72 Z.Ket := Z.C; -- [, line 73 -- substring, line 73 if Z.C <= Z.Lb or else Check_Among (Z, Z.C - 1, 3, 16#43dda22#) then Result := False; return; -- substring, line 73 end if; Find_Among_Backward (Z, A_1, Among_String, null, A); if A = 0 then Result := False; return; end if; Z.Bra := Z.C; -- ], line 73 -- among, line 73 case A is when 1 => -- (, line 103 -- call RV, line 103 R_RV (Z, Result); if not Result then Result := False; return; end if; -- delete, line 103 Slice_Del (Z); when 2 => -- (, line 105 -- call R2, line 105 R_R2 (Z, Result); if not Result then Result := False; return; end if; -- delete, line 105 Slice_Del (Z); when 3 => -- (, line 107 -- <-, line 107 Slice_From (Z, "jok"); when 4 => -- (, line 109 -- call R1, line 109 R_R1 (Z, Result); if not Result then Result := False; return; end if; -- delete, line 109 Slice_Del (Z); when 5 => -- (, line 111 -- <-, line 111 Slice_From (Z, "tra"); when 6 => -- (, line 113 -- <-, line 113 Slice_From (Z, "minutu"); when 7 => -- (, line 115 -- <-, line 115 Slice_From (Z, "zehar"); when 8 => -- (, line 117 -- <-, line 117 Slice_From (Z, "geldi"); when 9 => -- (, line 119 -- <-, line 119 Slice_From (Z, "igaro"); when 10 => -- (, line 121 -- <-, line 121 Slice_From (Z, "aurka"); when others => null; end case; Result := True; end R_Izenak; procedure R_Adjetiboak (Z : in out Context_Type; Result : out Boolean) is C : Result_Index; A : Integer; begin -- (, line 125 Z.Ket := Z.C; -- [, line 126 -- substring, line 126 if Z.C - 1 <= Z.Lb or else Check_Among (Z, Z.C - 1, 3, 16#8a22#) then Result := False; return; -- substring, line 126 end if; Find_Among_Backward (Z, A_2, Among_String, null, A); if A = 0 then Result := False; return; end if; Z.Bra := Z.C; -- ], line 126 -- among, line 126 case A is when 1 => -- (, line 129 -- call RV, line 129 R_RV (Z, Result); if not Result then Result := False; return; end if; -- delete, line 129 Slice_Del (Z); when 2 => -- (, line 131 -- <-, line 131 Slice_From (Z, "z"); when others => null; end case; Result := True; end R_Adjetiboak; procedure Stem (Z : in out Context_Type; Result : out Boolean) is C : Result_Index; A : Integer; v_2 : Char_Index; v_3 : Char_Index; v_4 : Char_Index; begin -- (, line 137 -- do, line 138 -- call mark_regions, line 138 R_Mark_regions (Z, Result); Z.Lb := Z.C; Z.C := Z.L; -- backwards, line 139 -- (, line 139 -- repeat, line 140 <<lab0>> loop v_2 := Z.L - Z.C; -- call aditzak, line 140 R_Aditzak (Z, Result); if not Result then goto lab1; end if; goto lab0; <<lab1>> Z.C := Z.L - v_2; exit; end loop; -- repeat, line 141 <<lab2>> loop v_3 := Z.L - Z.C; -- call izenak, line 141 R_Izenak (Z, Result); if not Result then goto lab3; end if; goto lab2; <<lab3>> Z.C := Z.L - v_3; exit; end loop; -- do, line 142 v_4 := Z.L - Z.C; -- call adjetiboak, line 142 R_Adjetiboak (Z, Result); Z.C := Z.L - v_4; Z.C := Z.Lb; Result := True; end Stem; end Stemmer.Basque;
data/pokemon/base_stats/venonat.asm
AtmaBuster/pokeplat-gen2
6
88225
<filename>data/pokemon/base_stats/venonat.asm db 0 ; species ID placeholder db 60, 55, 50, 45, 40, 55 ; hp atk def spd sat sdf db BUG, POISON ; type db 190 ; catch rate db 75 ; base exp db NO_ITEM, NO_ITEM ; items db GENDER_F50 ; gender ratio db 20 ; step cycles to hatch INCBIN "gfx/pokemon/venonat/front.dimensions" db GROWTH_MEDIUM_FAST ; growth rate dn EGG_BUG, EGG_BUG ; egg groups db 70 ; happiness ; tm/hm learnset tmhm TOXIC, HIDDEN_POWER, SUNNY_DAY, PROTECT, GIGA_DRAIN, FRUSTRATION, SOLARBEAM, RETURN, PSYCHIC_M, DOUBLE_TEAM, SLUDGE_BOMB, FACADE, SECRET_POWER, REST, ATTRACT, THIEF, SKILL_SWAP, ENDURE, FLASH, CAPTIVATE, SLEEP_TALK, NATURAL_GIFT, SWAGGER, SUBSTITUTE, SIGNAL_BEAM, SNORE, SWIFT, ZEN_HEADBUTT ; end
regtests/security-oauth-servers-tests.ads
jquorning/ada-security
19
11940
----------------------------------------------------------------------- -- Security-oauth-servers-tests - Unit tests for server side OAuth -- Copyright (C) 2017, 2018 <NAME> -- Written by <NAME> (<EMAIL>) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Util.Tests; package Security.OAuth.Servers.Tests is procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite); type Test is new Util.Tests.Test with null record; -- Test the application manager. procedure Test_Application_Manager (T : in out Test); -- Test the user registration and verification. procedure Test_User_Verify (T : in out Test); -- Test the token operation that produces an access token from user/password. -- RFC 6749: Section 4.3. Resource Owner Password Credentials Grant procedure Test_Token_Password (T : in out Test); -- Test the access token validation with invalid tokens (bad formed). procedure Test_Bad_Token (T : in out Test); -- Test the loading configuration files for the File_Registry. procedure Test_Load_Registry (T : in out Test); end Security.OAuth.Servers.Tests;
Library/Ruler/uiRulerTypeControl.asm
steakknife/pcgeos
504
105148
<reponame>steakknife/pcgeos COMMENT @%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% Copyright (c) GeoWorks 1991 -- All Rights Reserved PROJECT: PC GEOS MODULE: FILE: uirtctrl.asm AUTHOR: <NAME> METHODS: Name Description ---- ----------- FUNCTIONS: Scope Name Description ----- ---- ----------- REVISION HISTORY: Name Date Description ---- ---- ----------- jon 11 feb 1992 Initial version. DESCRIPTION: Code for the Ruler Type controller $Id: uiRulerTypeControl.asm,v 1.1 97/04/07 10:42:38 newdeal Exp $ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%@ RulerUICode segment resource COMMENT @---------------------------------------------------------------------- MESSAGE: RulerTypeControlGetInfo -- MSG_GEN_CONTROL_GET_INFO for RulerTypeControlClass DESCRIPTION: Return group PASS: *ds:si - instance data es - segment of RulerTypeControlClass ax - The message cx:dx - GenControlBuildInfo structure to fill in RETURN: none DESTROYED: bx, si, di, ds, es (message handler) REGISTER/STACK USAGE: PSEUDO CODE/STRATEGY: KNOWN BUGS/SIDE EFFECTS/CAVEATS/IDEAS: REVISION HISTORY: Name Date Description ---- ---- ----------- Tony 10/31/91 Initial version ------------------------------------------------------------------------------@ RulerTypeControlGetInfo method dynamic RulerTypeControlClass, MSG_GEN_CONTROL_GET_INFO mov si, offset RTC_dupInfo call CopyDupInfoCommon ret RulerTypeControlGetInfo endm RTC_dupInfo GenControlBuildInfo < 0, ; GCBI_flags RTC_IniFileKey, ; GCBI_initFileKey RTC_gcnList, ; GCBI_gcnList length RTC_gcnList, ; GCBI_gcnCount RTC_notifyTypeList, ; GCBI_notificationList length RTC_notifyTypeList, ; GCBI_notificationCount RTCName, ; GCBI_controllerName handle RulerTypeControlUI, ; GCBI_dupBlock RTC_childList, ; GCBI_childList length RTC_childList, ; GCBI_childCount RTC_featuresList, ; GCBI_featuresList length RTC_featuresList, ; GCBI_featuresCount RTC_DEFAULT_FEATURES, ; GCBI_features 0, ; GCBI_toolBlock 0, ; GCBI_toolList 0, ; GCBI_toolCount 0, ; GCBI_toolFeaturesList 0, ; GCBI_toolFeaturesCount 0, ; GCBI_toolFeatures RTC_helpContext> ; GCBI_helpContext if FULL_EXECUTE_IN_PLACE RulerControlInfoXIP segment resource endif RTC_helpContext char "dbRulerType", 0 RTC_IniFileKey char "rulerType", 0 RTC_gcnList GCNListType \ <MANUFACTURER_ID_GEOWORKS, GAGCNLT_APP_TARGET_NOTIFY_RULER_TYPE_CHANGE> RTC_notifyTypeList NotificationType \ <MANUFACTURER_ID_GEOWORKS, GWNT_RULER_TYPE_CHANGE> ;--- RTC_childList GenControlChildInfo \ <offset RulerTypeList, mask RTCF_INCHES or \ mask RTCF_CENTIMETERS or \ mask RTCF_POINTS or \ mask RTCF_PICAS or \ mask RTCF_SPREADSHEET or \ mask RTCF_DEFAULT, 0> ; Careful, this table is in the *opposite* order as the record which ; it corresponds to. RTC_featuresList GenControlFeaturesInfo \ <offset PicasEntry, PicasName, 0>, <offset PointsEntry, PointsName, 0>, <offset CentimetersEntry, CentimetersName, 0>, <offset InchesEntry, InchesName, 0>, <offset SpreadsheetEntry, SpreadsheetName, 0>, <offset SysDefaultEntry, SysDefaultName, 0> if FULL_EXECUTE_IN_PLACE RulerControlInfoXIP ends endif COMMENT @---------------------------------------------------------------------- MESSAGE: RulerTypeControlTypeChange -- MSG_RTC_TYPE_CHANGE for RulerTypeControlClass DESCRIPTION: Update the UI stuff based on the setting of the RulerTypeControlFlags PASS: *ds:si - instance data es - segment of RulerTypeControlClass ax - The message cl - new VisRulerType RETURN: DESTROYED: bx, si, di, ds, es (message handler) REGISTER/STACK USAGE: PSEUDO CODE/STRATEGY: Only update on a USER change KNOWN BUGS/SIDE EFFECTS/CAVEATS/IDEAS: REVISION HISTORY: Name Date Description ---- ---- ----------- Tony 10/31/91 Initial version ------------------------------------------------------------------------------@ RulerTypeControlTypeChange method dynamic RulerTypeControlClass, MSG_RTC_TYPE_CHANGE mov ax, MSG_VIS_RULER_SET_TYPE mov bx, segment VisRulerClass mov di, offset VisRulerClass call GenControlOutputActionRegs ret RulerTypeControlTypeChange endm COMMENT @---------------------------------------------------------------------- MESSAGE: RulerTypeControlUpdateUI -- MSG_GEN_CONTROL_UPDATE_UI for RulerTypeControlClass DESCRIPTION: Handle notification of type change PASS: *ds:si - instance data es - segment of RulerTypeControlClass ax - MSG_GEN_CONTROL_UPDATE_UI ss:bp - GenControlUpdateUIParams RETURN: nothing DESTROYED: bx, si, di, ds, es (message handler) REGISTER/STACK USAGE: PSEUDO CODE/STRATEGY: KNOWN BUGS/SIDE EFFECTS/CAVEATS/IDEAS: REVISION HISTORY: Name Date Description ---- ---- ----------- jon 11 feb 1992 Initial version ------------------------------------------------------------------------------@ RulerTypeControlUpdateUI method RulerTypeControlClass, MSG_GEN_CONTROL_UPDATE_UI .enter mov si, offset RulerTypeList call UpdateRulerUnits .leave ret RulerTypeControlUpdateUI endm RulerUICode ends
tools-src/gnu/gcc/gcc/ada/sem_maps.ads
enfoTek/tomato.linksys.e2000.nvram-mod
80
24365
------------------------------------------------------------------------------ -- -- -- GNAT COMPILER COMPONENTS -- -- -- -- S E M _ M A P S -- -- -- -- S p e c -- -- -- -- $Revision$ -- -- -- Copyright (C) 1996-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, 59 Temple Place - Suite 330, Boston, -- -- MA 02111-1307, USA. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ -- This package contains the operations on the renaming maps used for -- generic analysis and instantiation. Renaming maps are created when -- a generic unit is analyzed, in order to capture all references to -- global variables within the unit. The renaming map of a generic unit -- copied prior to each instantiation, and then updated by mapping the -- formals into the actuals and the local entities into entities local to -- the instance. When the generic tree is copied to produce the instance, -- all references are updated by means of the renaming map. -- Map composition of renaming maps takes place for nested instantiations, -- for generic child units, and for formal packages. -- For additional details, see the documentation in sem_ch12. with Table; with Types; use Types; package Sem_Maps is type Map is new Int; type Assoc is private; type Scope_Kind is (S_Global, S_Formal, S_Local); function New_Map (Num_Assoc : Int) return Map; -- Build empty map with the given number of associations, and a -- headers table of the appropriate size. function Compose (Orig_Map : Map; New_Map : Map) return Map; -- Update the associations in Orig_Map, so that if Orig_Map (e1) = e2 -- and New_Map (e2) = e3, then the image of e1 under the result is e3. function Copy (M : Map) return Map; -- Full copy of contents and headers. function Lookup (M : Map; E : Entity_Id) return Entity_Id; -- Retrieve image of E under M, Empty if undefined. procedure Add_Association (M : in out Map; O_Id : Entity_Id; N_Id : Entity_Id; Kind : Scope_Kind := S_Local); -- Update M in place. On entry M (O_Id) must not be defined. procedure Update_Association (M : in out Map; O_Id : Entity_Id; N_Id : Entity_Id; Kind : Scope_Kind := S_Local); -- Update the entry in M for O_Id. function Build_Instance_Map (M : Map) return Map; -- Copy renaming map of generic, and create new entities for all the -- local entities within. private -- New maps are created when a generic is analyzed, and for each of -- its instantiations. Maps are also updated for nested generics, for -- child units, and for formal packages. As a result we need to allocate -- maps dynamically. -- When analyzing a generic, we do not know how many references are -- in it. We build an initial map after generic analysis, using a static -- structure that relies on the compiler's extensible table mechanism. -- After constructing this initial map, all subsequent uses and updates -- of this map do not modify its domain, so that dynamically allocated -- maps have a fixed size and never need to be reallocated. Furthermore, -- the headers of the hash table of a dynamically allocated map can be -- chosen according to the total number of entries in the map, to -- accommodate efficiently generic units of different sizes (Unchecked_ -- Conversion vs. Generic_Elementary_Functions, for example). So in -- fact both components of a map have fixed size, and can be allocated -- using the standard table mechanism. A Maps_Table holds records that -- contain indices into the global Headers table and the Associations -- table, and a Map is an index into the Maps_Table. -- -- Maps_Table Headers_Table Associations_Table -- -- |_____| |___________ | -- |_____| | | | | -- ------>|Map |------------------------------>|Associations| -- |Info |------------->| |=========>| for one | -- |_____| | |====| | unit | -- | | | | |====>| | -- |_____| |____________| -- | | | | type Header_Index is new Int; type Assoc_Index is new Int; No_Assoc : constant Assoc_Index := -1; type Map_Info is record Header_Offset : Header_Index; Header_Num : Header_Index; Assoc_Offset : Assoc_Index; Assoc_Num : Assoc_Index; Assoc_Next : Assoc_Index; end record; type Assoc is record Old_Id : Entity_Id := Empty; New_Id : Entity_Id := Empty; Kind : Scope_Kind := S_Local; Next : Assoc_Index := No_Assoc; end record; -- All maps are accessed through the following table. The map attribute -- of a generic unit or an instance is an index into this table. package Maps_Table is new Table.Table ( Table_Component_Type => Map_Info, Table_Index_Type => Map, Table_Low_Bound => 0, Table_Initial => 100, Table_Increment => 10, Table_Name => "Maps_Table"); -- All headers for hash tables are allocated in one global table. Each -- map stores the offset into this table at which its own headers start. package Headers_Table is new Table.Table ( Table_Component_Type => Assoc_Index, Table_Index_Type => Header_Index, Table_Low_Bound => 0, Table_Initial => 1000, Table_Increment => 10, Table_Name => "Headers_Table"); -- All associations are allocated in one global table. Each map stores -- the offset into this table at which its own associations start. package Associations_Table is new Table.Table ( Table_Component_Type => Assoc, Table_Index_Type => Assoc_Index, Table_Low_Bound => 1, Table_Initial => 1000, Table_Increment => 10, Table_Name => "Associations_Table"); end Sem_Maps;
Build/Interpreters/beebOzmoo/asm/vmem.asm
polluks/Puddle-BuildTools
38
27830
!ifndef ACORN { !ifdef ALLRAM { vmem_cache_cnt !byte 0 ; current execution cache vmem_cache_index !fill cache_pages + 1, 0 } } !ifndef VMEM { ; Non-virtual memory !ifndef ALLRAM { read_byte_at_z_address read_byte_at_z_address_for_z_pc ; Subroutine: Read the contents of a byte address in the Z-machine ; x,y (high, low) contains address. ; Returns: value in a sty mempointer ; low byte unchanged ; same page as before? cpx zp_pc_l bne .read_new_byte ; same 256 byte segment, just return - ldy #0 lda (mempointer),y rts .read_new_byte txa sta zp_pc_l clc adc #>story_start sta mempointer + 1 jmp - ; Always branch } else { ; No vmem, but ALLRAM !ifdef ACORN { !error "ALLRAM only supported/needed with VMEM on Acorn" } read_byte_at_z_address read_byte_at_z_address_for_z_pc ; Subroutine: Read the contents of a byte address in the Z-machine ; a,x,y (high, mid, low) contains address. ; Returns: value in a sty mempointer ; low byte unchanged ; same page as before? cpx zp_pc_l bne .read_new_byte ; same 256 byte segment, just return .return_result ldy #0 lda (mempointer),y rts .read_new_byte txa sta zp_pc_l clc adc #>story_start sta mempointer + 1 cmp #first_banked_memory_page bcc .return_result ; Always branch ; swapped memory ; ; Carry is already clear ; adc #>story_start ; sta vmap_c64_offset ; cmp #first_banked_memory_page ; bcc .unswappable ; this is swappable memory ; update vmem_cache if needed ; Check if this page is in cache ldx #vmem_cache_count - 1 - cmp vmem_cache_index,x beq .cache_updated dex bpl - ; The requested page was not found in the cache ; copy vmem to vmem_cache (banking as needed) ldx vmem_cache_cnt ; Protect page held in z_pc_mempointer + 1 pha txa clc adc #>vmem_cache_start cmp z_pc_mempointer + 1 bne + inx cpx #vmem_cache_count bcc ++ ldx #0 ++ stx vmem_cache_cnt + pla sta vmem_cache_index,x pha lda #>vmem_cache_start ; start of cache clc adc vmem_cache_cnt tay pla jsr copy_page ; set next cache to use when needed inx txa dex cmp #vmem_cache_count bcc ++ lda #0 ++ sta vmem_cache_cnt .cache_updated ; x is now vmem_cache (0-4) where we want to read txa clc adc #>vmem_cache_start sta mempointer + 1 jmp .return_result } ; End of block for ALLRAM=1 } else { ; virtual memory ; virtual memory address space ; Z1-Z3: 128 kB (0 - $1ffff) ; Z4-Z5: 256 kB (0 - $3ffff) ; Z6-Z8: 512 kB (0 - $7ffff) ; ; map structure: one entry for each block (512 bytes) of available virtual memory ; each map entry is: ; 1 byte: ZMachine offset high byte (1-3 lowest bits used for ZMachine offset, the rest used to store ticks since block was last used) ; 1 byte: ZMachine offset low byte ; ; needs 102*2=204 bytes for $3400-$FFFF ; will store in datasette_buffer ; !ifdef SMALLBLOCK { vmem_blocksize = 512 } else { vmem_blocksize = 1024 ; This hasn't been used in a long time, and probably doesn't work anymore. !ifdef ACORN { ; Given the above comment I've not made any attempt to make this work on ; Acorn. !error "VMEM only supports SMALLBLOCK on Acorn" } } vmem_blockmask = 255 - (>(vmem_blocksize - 1)) vmem_block_pagecount = vmem_blocksize / 256 ; vmap_max_length = (vmem_end-vmem_start) / vmem_blocksize ; vmap_max_size determines the memory allocated for the vmap; vmap_max_entries ; is the actual run-time limit, which may be less than vmap_max_size but ; obviously can't be larger. ; SFTODO: For a Z3 game 255 is actually likely (not guaranteed) to be slightly ; too large. Not necessarily a problem, but think about it - will there be a ; problem? Are we wasting (a few bytes only) of RAM for no good reason? !ifndef ACORN { vmap_max_size = 102 } else { !ifndef ACORN_SWR { !ifndef ACORN_TUBE_CACHE { !ifdef ACORN_TURBO_SUPPORTED { ; A turbo second processor has enough RAM to hold 255 512-byte blocks. vmap_max_size = 255 ACORN_LARGE_RUNTIME_VMAP = 1 } else { ; If a game had no dynamic memory we'd have room for about 100 512-byte VM ; blocks on the second processor. Let's say every game will have at least 6K of ; dynamic memory, so we've got room for about 88 512-byte VM blocks. vmap_max_size = 88 } } else { ; The host cache is initialised using "extra" entries in the vmap. vmap_max_size = 255 !ifdef ACORN_TURBO_SUPPORTED { ; A turbo second processor has enough RAM to hold 255 512-byte blocks. ACORN_LARGE_RUNTIME_VMAP = 1 } else { ; We *don't* set ACORN_LARGE_RUNTIME_VMAP; after the initial preload of the host ; cache, vmap_max_entries will be approximately 88 because the vmap is only ; concerned with the second processor's own 64K. } } } else { ; We might have enough main+sideways RAM to hold 255 512-byte blocks. vmap_max_size = 255 ACORN_LARGE_RUNTIME_VMAP = 1 } } ; vmap_max_entries !byte 0 ; Moved to ZP ; vmap_used_entries !byte 0 ; Moved to ZP !ifndef ACORN { vmap_blocks_preloaded !byte 0 } vmap_z_h = datasette_buffer_start vmap_z_l = vmap_z_h + vmap_max_size ;SFTODODATA 1 vmap_clock_index !byte 0 ; index where we will attempt to load a block next time !ifndef ACORN { vmap_first_ram_page !byte 0 vmap_c64_offset !byte 0 } else { !ifndef ACORN_SWR { vmap_first_ram_page !byte ACORN_INITIAL_NONSTORED_BLOCKS + >story_start vmap_c64_offset !byte 0 } } vmap_index !byte 0 ; current vmap index matching the z pointer vmem_offset_in_block !byte 0 ; 256 byte offset in 512 byte block (0-1) ; vmem_temp !byte 0 vmem_tick !byte $e0 vmem_oldest_age !byte 0 vmem_oldest_index !byte 0 !ifdef Z8 { vmem_tick_increment = 8 vmem_highbyte_mask = $07 } else { !ifdef Z3 { vmem_tick_increment = 2 vmem_highbyte_mask = $01 } else { vmem_tick_increment = 4 vmem_highbyte_mask = $03 } } !ifdef COUNT_SWAPS { vmem_swap_count !byte 0,0 } !ifdef ACORN_TURBO_SUPPORTED { !macro acorn_adc_vmap_first_ram_page_or_set_mempointer_turbo_bank_from_c { ; If we're running on a normal second processor, carry will be clear and we ; need to do "adc vmap_first_ram_page". Note that we can't treat this as a ; no-op on a turbo second processor simply by setting vmap_first_ram_page to ; 0, because on a turbo second processor carry may be set. ; ; If we're running on a turbo second processor, set mempointer_turbo_bank to ; select virtual memory cache bank C, i.e. bank 1+C (bank 0 is used for code ; and dynamic memory). This must preserve A, X and Y. bit is_turbo bpl .is_normal_second_processor stz mempointer_turbo_bank rol mempointer_turbo_bank inc mempointer_turbo_bank bra .done .is_normal_second_processor ; Carry is already clear adc vmap_first_ram_page .done } } +make_acorn_screen_hole !ifdef DEBUG { !ifdef PREOPT { print_optimized_vm_map stx zp_temp ; Nonzero means premature exit !ifdef ACORN { .handle = zp_temp + 1 lda #0 sta .handle ldx #2 ldy #error_print_s_printchar jsr setjmp beq .print_optimized_vm_map_no_error ldy .handle beq .not_open lda #osfind_close ; 0 sta .handle jsr osfind .not_open jsr error_print_following_string !text 13, "Press SPACE to retry...", 0 jsr wait_for_space .print_optimized_vm_map_no_error lda #osfind_open_output ldx #<.preopt_filename ldy #>.preopt_filename jsr osfind sta .handle } jsr printchar_flush lda #0 sta streams_output_selected + 2 sta is_buffered_window jsr newline jsr dollar jsr dollar jsr dollar jsr print_following_string !pet "clock",13,0 ldx #0 - lda vmap_z_h,x !ifdef ACORN { ldy .handle jsr osbput } jsr print_byte_as_hex lda vmap_z_l,x !ifdef ACORN { ldy .handle jsr osbput } jsr print_byte_as_hex jsr colon inx cpx vmap_used_entries bcc - lda zp_temp bne +++ ; Print block that was just to be read lda zp_pc_h !ifdef ACORN { ldy .handle jsr osbput } jsr print_byte_as_hex lda zp_pc_l and #vmem_blockmask !ifdef ACORN { ldy .handle jsr osbput } jsr print_byte_as_hex jsr colon +++ jsr newline jsr dollar jsr dollar jsr dollar jsr newline !ifndef ACORN { jsr kernal_readchar ; read keyboard jmp kernal_reset ; reset } else { lda #osfind_close ldy .handle jsr osfind jsr print_following_string !text "Saved PREOPT - press BREAK", 0 - jmp - .preopt_filename !text "PREOPT", 13 } } !ifdef TRACE_VM { print_vm_map !zone { !ifndef ACORN { ; print caches jsr space lda #66 jsr streams_print_output jsr space lda vmem_cache_cnt jsr printa jsr space jsr dollar lda vmem_cache_index jsr print_byte_as_hex jsr space jsr dollar lda vmem_cache_index + 1 jsr print_byte_as_hex jsr space jsr dollar lda vmem_cache_index + 2 jsr print_byte_as_hex jsr space jsr dollar lda vmem_cache_index + 3 jsr print_byte_as_hex } jsr newline ldy #0 - ; print !ifdef ACORN_SWR { cpy #100 bcs + jsr space ; alignment when <100 } cpy #10 bcs + jsr space ; alignment when <10 + jsr printy jsr space lda vmap_z_h,y ; zmachine mem offset ($0 - ; SF: I changed the masks here, I think this is correct but it is a ; divergence from upstream. and #($ff xor vmem_highbyte_mask) jsr print_byte_as_hex jsr space jsr dollar lda vmap_z_h,y ; zmachine mem offset ($0 - and #vmem_highbyte_mask jsr printa lda vmap_z_l,y ; zmachine mem offset ($0 - jsr print_byte_as_hex lda #0 ; add 00 jsr print_byte_as_hex ; SF: For ACORN_SWR we don't try to calculate the physical address of the ; VM block as it's moderately involved. !ifndef ACORN_SWR { jsr space tya asl !ifndef SMALLBLOCK { asl } !ifdef ACORN_TURBO_SUPPORTED { bit is_turbo bpl + pha lda #1 adc #0 jsr print_byte_as_hex pla bra .skip_adc_vmap_first_ram_page + } adc vmap_first_ram_page .skip_adc_vmap_first_ram_page jsr print_byte_as_hex lda #$30 jsr streams_print_output lda #$30 jsr streams_print_output } jsr newline .next_entry iny cpy vmap_used_entries bcc - rts } } } load_blocks_from_index ; vmap_index = index to load ; side effects: a,y,x,status destroyed !ifdef TRACE_FLOPPY { jsr dollar jsr dollar lda vmap_index jsr print_byte_as_hex jsr comma tax lda vmap_z_h,x jsr print_byte_as_hex lda vmap_z_l,x jsr print_byte_as_hex } !ifndef ACORN_SWR { lda vmap_index tax asl !ifndef SMALLBLOCK { asl } !ifndef ACORN_TURBO_SUPPORTED { ; Carry is already clear adc vmap_first_ram_page } else { +acorn_adc_vmap_first_ram_page_or_set_mempointer_turbo_bank_from_c } ; SFTODO: Maybe add some tracing for this !ifdef ACORN_TUBE_CACHE { ; Offer the cache on the host a chance to save the block we're about to ; evict from our cache, and ask it if it has the block we want before we ; go to disk for it. sta osword_cache_data_ptr + 1 !ifdef ACORN_TURBO_SUPPORTED { ; If we're on a normal second processor this is redundant but harmless, and ; it's only one cycle slower to just do it rather than check if we need to ; do it first. lda mempointer_turbo_bank sta osword_cache_data_ptr + 2 } ; Other bytes at osword_cache_data_ptr always stay 0 and don't need setting. lda vmap_z_l,x sta osword_cache_index_requested lda vmap_z_h,x and #vmem_highbyte_mask sta osword_cache_index_requested + 1 lda #osword_cache_op ldx #<osword_cache_block ldy #>osword_cache_block jsr osword lda osword_cache_result beq load_blocks_from_index_done ; Host cache has provided the block ; The host cache didn't have the block we want. Restore A and X and fall ; through to the following code to get it from disk. lda osword_cache_data_ptr + 1 ldx vmap_index } } else { ; ACORN_SWR ldx vmap_index jsr convert_index_x_to_ram_bank_and_address } !ifdef TRACE_FLOPPY { jsr comma jsr print_byte_as_hex } tay ; Store in y so we can use it later. ; cmp #$e0 ; bcs + !ifndef ACORN { cmp #first_banked_memory_page bcs load_blocks_from_index_using_cache } + lda #vmem_block_pagecount ; number of blocks sta readblocks_numblocks lda #0 sta readblocks_mempos sty readblocks_mempos + 1 !ifdef ACORN_TURBO_SUPPORTED { ; If we're on a normal second processor this is redundant but harmless, and ; it's only one cycle slower to just do it rather than check if we need to ; do it first. lda mempointer_turbo_bank sta readblocks_mempos + 2 } lda vmap_z_l,x ; start block sta readblocks_currentblock lda vmap_z_h,x ; start block and #vmem_highbyte_mask sta readblocks_currentblock + 1 jsr readblocks load_blocks_from_index_done ; except for any tracing !ifdef TRACE_VM { jsr print_following_string !ifndef ACORN { !pet "load_blocks (normal) ",0 } else { !text "load_blocks (normal) ",0 } jsr print_vm_map } rts !ifdef ACORN_TUBE_CACHE { osword_cache_block !byte 12 ; send block length !byte 12 ; receive block length osword_cache_data_ptr !word 0 ; data address low !word 0 ; data address high osword_cache_index_offered !word 0 ; block index offered osword_cache_index_offered_timestamp_hint !byte 0 ; block offered timestamp hint osword_cache_index_requested !word 0 ; block index requested osword_cache_result !byte 0 ; result } !ifndef ACORN { load_blocks_from_index_using_cache ; vmap_index = index to load ; vmem_cache_cnt = which 256 byte cache use as transfer buffer ; y = first c64 memory page where it should be loaded ; side effects: a,y,x,status destroyed ; initialise block copy function (see below) ; Protect buffer which z_pc points to lda vmem_cache_cnt tax clc adc #>vmem_cache_start cmp z_pc_mempointer + 1 bne + inx cpx #vmem_cache_count bcc ++ ldx #0 ++ stx vmem_cache_cnt + ldx vmap_index lda #>vmem_cache_start ; start of cache clc adc vmem_cache_cnt sta vmem_temp sty vmem_temp + 1 ldx #0 ; Start with page 0 in this 1KB-block ; read next into vmem_cache - lda #>vmem_cache_start ; start of cache clc adc vmem_cache_cnt sta readblocks_mempos + 1 txa pha ldx vmap_index ora vmap_z_l,x ; start block sta readblocks_currentblock lda vmap_z_h,x ; start block and #vmem_highbyte_mask sta readblocks_currentblock + 1 jsr readblock ; copy vmem_cache to block (banking as needed) lda vmem_temp ldy vmem_temp + 1 jsr copy_page inc vmem_temp + 1 pla tax inx cpx #vmem_block_pagecount ; read 2 or 4 blocks (512 or 1024 bytes) in total bcc - ldx vmem_temp + 1 dex txa ldx vmem_cache_cnt sta vmem_cache_index,x rts } +make_acorn_screen_hole ; SF: Note that this is allowed to corrupt X and Y. read_byte_at_z_address ; Subroutine: Read the contents of a byte address in the Z-machine ; a,x,y (high, mid, low) contains address. ; Returns: value in a sty mempointer ; low byte unchanged ; same page as before? cpx zp_pc_l bne .read_new_byte cmp zp_pc_h bne .read_new_byte ; same 256 byte segment, just return !ifdef ACORN_SWR { +acorn_page_in_bank_using_a mempointer_ram_bank } - ldy #0 lda (mempointer),y !ifdef ACORN_SWR { +acorn_swr_page_in_default_bank_using_y } !if 1 { ; SFTODO: JUST TO PROVE IT'S OK ldx #42 ldy #86 } rts .read_new_byte cmp #0 bne .non_dynmem cpx nonstored_blocks bcs .non_dynmem ; Dynmem access sta zp_pc_h txa sta zp_pc_l adc #>story_start sta mempointer + 1 !ifdef ACORN_TURBO_SUPPORTED { ; We need to ensure bank 0 is accessed for dynamic memory on a turbo second ; processor. This isn't necessary on an ordinary second processor, but it's ; harmless and it's faster to just do it rather than check if it's ; necessary. stz mempointer_turbo_bank bra - } else { !ifndef ACORN_SWR_BIG_DYNMEM { ; SF: On an ACORN_SWR_SMALL_DYNMEM build, all dynamic memory is in main ; RAM so it doesn't matter what the value of mempointer_ram_bank is or which ; bank is currently paged in. bne - ; Always branch } else { ; We have to set mempointer_ram_bank correctly so subsequent calls to ; read_byte_at_z_address don't page in the wrong bank. We keep the first ; bank paged in by default, so we don't need to page it in now and therefore ; the '-' label can be after the page in code, to save a few cycles. lda ram_bank_list sta mempointer_ram_bank bpl - ; Always branch SFTODO THIS WON'T WORK IF WE START SUPPORT 12K PRIVATE RAM ON B+ } } .non_dynmem sta zp_pc_h sta vmem_temp + 1 lda #0 sta vmap_quick_index_match txa sta zp_pc_l and #255 - vmem_blockmask ; keep index into kB chunk sta vmem_offset_in_block txa and #vmem_blockmask ; SFTODO: The fact vmem_temp will always be even means it may be possible ; to block out unusable areas of memory above vmem_start by giving them ; vmap_z_[hl] entries with odd addresses which could never be matched. This ; just might be helpful on an Electron port where dynamic memory starts at ; $8000 to avoid contiguous-dynmem problems with the 8K screen at the top of ; main RAM; we could use the ~4K of main RAM below the screen as virtual ; memory cache by putting vmem_start down there and blocking out the screen ; and the actual dynamic memory with unmatchable vmap_z_[h] entries. I ; suppose it's not actually quite that good, as we'd need to prevent those ; unmatched entries aging out, but it might not be too hard/inefficient to ; tweak the code to leave them alone. sta vmem_temp ; Check quick index first ldx #vmap_quick_index_length - 1 - ldy vmap_quick_index,x cmp vmap_z_l,y ; zmachine mem offset ($0 - beq .quick_index_candidate -- dex bpl - bmi .no_quick_index_match ; Always branch .quick_index_candidate lda vmap_z_h,y and #vmem_highbyte_mask cmp vmem_temp + 1 beq .quick_index_match lda vmem_temp jmp -- .quick_index_match inc vmap_quick_index_match tya tax jmp .correct_vmap_index_found ; Always branch .no_quick_index_match +make_acorn_screen_hole_jmp lda vmem_temp ; is there a block with this address in map? ldx vmap_used_entries dex - ; compare with low byte cmp vmap_z_l,x ; zmachine mem offset ($0 - beq + .check_next_block dex !ifndef ACORN_LARGE_RUNTIME_VMAP { bpl - bmi .no_such_block ; Always branch } else { ; SFTODO: This next cpx # is a pretty heavily executed instruction; if we ; can avoid having to do it somehow that would be a small but worthwhile ; saving. Maybe it's essential, but I put it in because it was an "obviously" ; correct way to do the right thing, without too much analysis. cpx #255 bne - beq .no_such_block ; Always branch } ; is the highbyte correct? + lda vmap_z_h,x and #vmem_highbyte_mask cmp vmem_temp + 1 beq .correct_vmap_index_found lda vmem_temp jmp .check_next_block .correct_vmap_index_found ; vm index for this block found stx vmap_index ldy vmap_quick_index_match bne ++ ; This is already in the quick index, don't store it again txa ldx vmap_next_quick_index sta vmap_quick_index,x inx cpx #vmap_quick_index_length bcc + ldx #0 + stx vmap_next_quick_index ++ jmp .index_found ; no index found, add last .no_such_block ; Load 512 byte block into RAM !ifndef ACORN { ; First, check if this is initial REU loading ldx use_reu cpx #$80 bne + ldx #0 ldy vmap_z_l ; ,x is not needed here, since x is always 0 cpy z_pc + 1 bne .block_chosen inx ; Set x to 1 bne .block_chosen ; Always branch } ; SFTODO: I am not sure the bcs case can ever occur on Acorn, since we always ; pre-populate vmap. If this is true we can probably ifdef this out for both SWR ; and 2P builds. (But it's only one instruction, so hardly worth it?) (OK, it ; *can* occur with PREOPT, but it still can't occur "normally" on Acorn. But it ; is still just one byte and I should probably just get rid of this comment...) +make_acorn_screen_hole_jmp + ldx vmap_clock_index - cpx vmap_used_entries bcs .block_chosen !ifdef DEBUG { !ifdef PREOPT { ldx #0 jmp print_optimized_vm_map } } ; Store very recent oldest_age so the first valid index in the following ; loop will be picked as the first candidate. lda #$ff !ifdef DEBUG { sta vmem_oldest_index } sta vmem_oldest_age bne ++ ; Always branch ; Check all other indexes to find something older - lda vmap_z_h,x cmp vmem_oldest_age bcs + ++ ; Found older ; Skip if z_pc points here; it could be in either page of the block. !ifndef SMALLBLOCK { !error "Only SMALLBLOCK supported" } ldy vmap_z_l,x cpy z_pc + 1 beq +++ iny cpy z_pc + 1 bne ++ +++ tay and #vmem_highbyte_mask cmp z_pc beq + tya ++ sta vmem_oldest_age stx vmem_oldest_index + inx cpx vmap_used_entries bcc + ldx #0 + cpx vmap_clock_index bne - ; Load chosen index ldx vmem_oldest_index .block_chosen !ifdef COUNT_SWAPS { inc vmem_swap_count + 1 bne ++ inc vmem_swap_count ++ } cpx vmap_used_entries bcc + inc vmap_used_entries + txa tay !ifndef ACORN_SWR { asl !ifndef SMALLBLOCK { asl } !ifndef ACORN_TURBO_SUPPORTED { ; Carry is already clear adc vmap_first_ram_page } else { +acorn_adc_vmap_first_ram_page_or_set_mempointer_turbo_bank_from_c } sta vmap_c64_offset } ; Pick next index to use iny cpy vmap_max_entries bcc .not_max_index ldy #0 .not_max_index sty vmap_clock_index !ifdef DEBUG { lda vmem_oldest_index cmp #$ff bne + lda #ERROR_NO_VMEM_INDEX jsr fatalerror + } ; We have now decided on a map position where we will store the requested block. Position is held in x. !ifdef DEBUG { !ifdef PRINT_SWAPS { lda streams_output_selected + 2 beq + lda #20 jsr s_printchar lda #64 jsr s_printchar lda #20 jsr s_printchar jmp ++ + jsr space jsr dollar txa jsr print_byte_as_hex jsr colon ; SF: For ACORN_SWR we don't try to calculate the physical address of the ; VM block as it's moderately involved. !ifndef ACORN_SWR { jsr dollar !ifdef ACORN_TURBO_SUPPORTED { bit is_turbo bpl + lda mempointer_turbo_bank jsr print_byte_as_hex + } lda vmap_c64_offset jsr print_byte_as_hex jsr colon } cpx vmap_used_entries bcs .printswaps_part_2 lda vmap_z_h,x ; SF: I altered the mask here, I think it's correct but it's a divergence ; from upstream. and #vmem_highbyte_mask jsr dollar jsr print_byte_as_hex lda vmap_z_l,x jsr print_byte_as_hex .printswaps_part_2 jsr arrow jsr dollar lda zp_pc_h jsr print_byte_as_hex lda zp_pc_l and #vmem_blockmask jsr print_byte_as_hex jsr space ++ } } !ifndef ACORN { ; Forget any cache pages belonging to the old block at this position. lda vmap_c64_offset cmp #first_banked_memory_page bcc .cant_be_in_cache ldy #vmem_cache_count - 1 - lda vmem_cache_index,y and #vmem_blockmask cmp vmap_c64_offset bne + lda #0 sta vmem_cache_index,y + dey bpl - .cant_be_in_cache } ; Update tick lda vmem_tick clc adc #vmem_tick_increment bcc + ; Tick counter has passed max value. Decrease tick value for all pages. Set tick counter back. txa pha ldx vmap_used_entries dex - lda vmap_z_h,x sec sbc #$80 bpl ++ and #vmem_highbyte_mask ++ sta vmap_z_h,x dex !ifndef ACORN_LARGE_RUNTIME_VMAP { bpl - } else { cpx #255 bne - } pla tax lda #$80 + sta vmem_tick !ifdef ACORN_TUBE_CACHE { ; Save the Z-address of the block we're about to evict before we overwrite it. lda vmap_z_l,x sta osword_cache_index_offered lda vmap_z_h,x and #vmem_highbyte_mask sta osword_cache_index_offered + 1 } ; Store address of 512 byte block to load, then load it lda zp_pc_h sta vmap_z_h,x lda zp_pc_l and #vmem_blockmask ; skip bit 0 since 512 byte blocks sta vmap_z_l,x stx vmap_index ; SF: Be aware that if tracing is on here, the newly loaded block will ; show with its pre-adjustment tick. jsr load_blocks_from_index .index_found ; index found ; Update tick for last access ldx vmap_index lda vmap_z_h,x and #vmem_highbyte_mask ora vmem_tick sta vmap_z_h,x !ifndef ACORN_SWR { txa asl !ifndef SMALLBLOCK { asl } !ifndef ACORN_TURBO_SUPPORTED { ; Carry is already clear adc vmap_first_ram_page } else { +acorn_adc_vmap_first_ram_page_or_set_mempointer_turbo_bank_from_c } sta vmap_c64_offset !ifndef ACORN { cmp #first_banked_memory_page bcc .unswappable ; this is swappable memory ; update vmem_cache if needed clc adc vmem_offset_in_block ; Check if this page is in cache ldx #vmem_cache_count - 1 - cmp vmem_cache_index,x beq .cache_updated dex bpl - ; The requested page was not found in the cache ; copy vmem to vmem_cache (banking as needed) sta vmem_temp ldx vmem_cache_cnt ; Protect page held in z_pc_mempointer + 1 pha txa clc adc #>vmem_cache_start cmp z_pc_mempointer + 1 bne + inx cpx #vmem_cache_count bcc ++ ldx #0 ++ stx vmem_cache_cnt + pla sta vmem_cache_index,x lda #>vmem_cache_start ; start of cache clc adc vmem_cache_cnt tay lda vmem_temp jsr copy_page ; set next cache to use when needed inx txa dex cmp #vmem_cache_count bcc ++ lda #0 ++ sta vmem_cache_cnt .cache_updated ; x is now vmem_cache (0-3) where current z_pc is txa clc adc #>vmem_cache_start sta mempointer + 1 ldx vmap_index bne .return_result ; always true .unswappable } ; update memory pointer lda vmem_offset_in_block clc adc vmap_c64_offset } else { jsr convert_index_x_to_ram_bank_and_address clc adc vmem_offset_in_block } sta mempointer + 1 .return_result ldy #0 lda (mempointer),y !ifdef ACORN_SWR { +acorn_swr_page_in_default_bank_using_y } rts !ifdef ACORN_SWR { ; SFTODO: Not sure I will want this as a subroutine, but let's write it here ; like this to help me think about it. For the moment it returns page of physical ; memory in A and ram bank is selected and stored at mempointer_ram_bank. ; adjust_dynamic_memory_inline also relies on the RAM bank index being returned ; in Y. convert_index_x_to_ram_bank_and_address ; 0<=X<=254 is the index of the 512-byte virtual memory block we want to ; access. Index 0 may be in main RAM or sideways RAM, depending on the size ; of dynamic memory. txa sec sbc vmem_blocks_in_main_ram bcc .in_main_ram clc adc vmem_blocks_stolen_in_first_bank ; CA is now the 9-bit block offset of the required data from the start of ; our first sideways RAM bank. Each 16K bank has 32 512-byte blocks, so ; we need to divide by 32=2^5 to get the bank index. pha ror lsr lsr lsr lsr tay +acorn_page_in_bank_using_a_comma_y ram_bank_list ; leaves bank in A sta mempointer_ram_bank ; Now get the low 5 bits of the block offset, multiply by two to convert to ; 256 byte pages and that gives us the page offset within the bank. pla and #31 asl ; Carry is already clear adc #$80 rts .in_main_ram ; A contains a negative block offset from the top of main RAM (BBC sideways ; RAM version) or the bottom of screen RAM (Electron sideways RAM version). ; Multiply by two to get a page offset and add it to the base to get the ; actual start. asl ; Carry is set !ifndef ACORN_ELECTRON_SWR { adc #(>flat_ramtop)-1 } else { adc screen_ram_start_minus_1 } rts } } ; SFTODO: Hack, let's just allocate a fake datasette buffer here ; SFTODO: For now I'm going to pre-fill this as part of the build ; SFTODODATA - THIS IS INITIALISED, BUT I AM HALF THINKING WE SHOULD JUST ; POPULATE IT IN THE DISCARDABLE INIT CODE - BUT MAYBE DON'T RUSH INTO THIS AS ; SWR AND 'SUGGESTED' PAGES AND PREOPT WILL AFFECT THIS DECISION ; SFTODO: Is there any value in page-aligning this? Although since the two halves ; are not exactly page-aligned we'd end up having to waste a couple of bytes so ; each half was page-aligned. Profile this before doing anything. !ifdef ACORN { !ifdef VMEM { datasette_buffer_start !FILL vmap_max_size * 2, 'V' datasette_buffer_end } }
programs/oeis/000/A000540.asm
karttu/loda
0
27981
; A000540: Sum of 6th powers: 0^6 + 1^6 + 2^6 + ... + n^6. ; 0,1,65,794,4890,20515,67171,184820,446964,978405,1978405,3749966,6735950,11562759,19092295,30482920,47260136,71397705,105409929,152455810,216455810,302221931,415601835,563637724,754740700,998881325,1307797101,1695217590,2177107894,2771931215,3500931215,4388434896,5462176720,6753644689,8298449105,10136714730,12313497066,14879223475,17890159859,21408903620,25504903620,30255007861,35744039605,42065402654,49321716510,57625482135,67099779031,77878994360,90109584824,103950872025,119575872025,137172159826,156942769490,179107130619,203902041915,231582682540,262423661996,296720109245,334788801789,376969335430,423625335430,475145709791,531945945375,594469447584,663188924320,738607814945,821261764961,911720147130,1010587629754,1118505792835,1236154792835,1364255076756,1503569146260,1654903372549,1819109862725,1997088378350,2189788306926,2398210687015,2623410287719,2866497743240,3128641743240,3411071279721,3715077951145,4042018324514,4393316356130,4770465871755,5175033106891,5608659307900,6073063394684,6570044685645,7101485685645,7669354937686,8275709939030,8922700122479,9612569903535,10347661794160,11130419583856,11963391588785,12849233969649,13790714119050,14790714119050,15852234269651,16978396688915,18172448985444,19437768003940,20777863644565,22196382756821,23697113108670,25283987431614,26961087542455,28732648542455,30603063094616,32576885779800,34658837532409,36853810156345,39166870921970,41603267244786,44168431446555,46867985599579,49707746454860,52693730454860,55832158831581,59129462790685,62592288782374,66227503859750,70042201125375,74043705266751,78239578181440,82637624692544,87245898355265,92072707355265,97126620499546,102416473300570,107951374154339,113740710613155,119794155753780,126121674641716,132733530892325,139640293329509,146852842742670,154382378742670,162240426717511,170438844888455,178989831467304,187905931915560,197200046306185,206885436788681,216975735158210,227484950529474,238427477116075,249818102116075,261672013704476,274004809133340,286832502940269,300171535265965,314038780281590,328451554726646,343427626558095,358985223711439,375143042974480,391920258974480,409336533279441,427412023614225,446167393192234,465623820163370,485803007178995,506727191074611,528419152670980,550902226694404,574200311816885,598337880816885,623339990861406,649232293910110,676041047242199,703793124106775,732516024497400,762237886051576,792987495075865,824794297697369,857688411142290,891700635142290,926862463469371,963206095599995,1000764448509164,1039571168595180,1079660643735805,1121068015476541,1163829191351750,1207980857339334,1253560490449695,1300606371449695,1349157597722336,1399254096262880,1450936636812129,1504246845127585,1559227216393210,1615921128768506,1674372857077635,1734627586639299,1796731427238100,1860731427238100,1926675587839301,1994612877477765,2064593246370094,2136667641202990,2210888019968615,2287307366946471,2365979707832520,2446960125016264,2530304773006505,2616070894006505,2704316833639266,2795102056823650,2888487163802059,2984533906320395,3083305203961020,3184865160629436,3289279081195405,3396613488289229,3506936139253910,3620316043253910,3736823478541231,3856530009879535,3979508506127024,4105833157978800,4235579495869425,4368824408036401,4505646158745290,4646124406677194,4790340223479315,4938376112479315,5090316027564196,5246245392224420,5406251118763989,5570421627677205,5738846867192830,5911618332986366,6088829088061175,6270573782799159,6456948675181720,6648051651181720,6843982245327161,7044841661437305,7250732793531954,7461760246914610,7678030359430235,7899651222898331,8126732704722060,8359386469674124,8597726001860125 mov $1,3 lpb $0,1 mov $3,$0 sub $0,1 pow $3,6 add $1,$3 lpe sub $1,1 mov $2,$1 add $2,7 add $1,$2 sub $1,10 div $1,2
programs/oeis/202/A202238.asm
neoneye/loda
22
177581
; A202238: Characteristic function of positive integers not prime and not a power of 2. ; 0,0,0,0,0,1,0,0,1,1,0,1,0,1,1,0,0,1,0,1,1,1,0,1,1,1,1,1,0,1,0,0,1,1,1,1,0,1,1,1,0,1,0,1,1,1,0,1,1,1,1,1,0,1,1,1,1,1,0,1,0,1,1,0,1,1,0,1,1,1,0,1,0,1,1,1,1,1,0,1,1,1,0,1,1,1,1,1,0,1,1,1,1,1,1,1,0,1,1,1 mov $2,$0 lpb $0 sub $0,1 mul $0,2 dif $0,4 lpe seq $2,10051 ; Characteristic function of primes: 1 if n is prime, else 0. add $2,1 trn $0,$2 mod $0,2
test-resources/ExamplesFromRoy/globals_example3.ads
hergin/ada2fuml
0
19999
with Globals_Example1; package Globals_Example3 is type Record3 is record I_Attribute : Globals_Example1.Itype; end record; function Unrelated (The_I : Globals_Example1.Itype) return Globals_Example1.Itype; end Globals_Example3;
test/Succeed/Issue3554.agda
cruhland/agda
1,989
13525
<reponame>cruhland/agda open import Agda.Builtin.Bool open import Agda.Builtin.Nat open import Agda.Builtin.Equality _^_ : Nat → Nat → Nat x ^ zero = 1 x ^ suc y = x * (x ^ y) data Enum : Set where makeEnum : (size : Nat) → (variants : Nat) → .{{ _ : (variants < size) ≡ true }} → Enum five : Enum five = makeEnum (2 ^ 32) 5 data Expr : (t : Enum) → Set where constant : (x : Nat) → Expr five func : ∀ {t} → Expr t → Bool func (constant x) = false
src/servlet-streams.adb
My-Colaborations/ada-servlet
6
4019
<gh_stars>1-10 ----------------------------------------------------------------------- -- Servlet.Streams -- Print streams for servlets -- Copyright (C) 2010, 2011, 2012, 2013, 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. ----------------------------------------------------------------------- package body Servlet.Streams is procedure Initialize (Stream : in out Print_Stream; To : in Util.Streams.Texts.Print_Stream_Access) is begin Stream.Target := To; end Initialize; -- ------------------------------ -- Initialize the stream -- ------------------------------ procedure Initialize (Stream : in out Print_Stream; To : in Print_Stream'Class) is begin Stream.Target := To.Target; end Initialize; -- ------------------------------ -- Write an integer on the stream. -- ------------------------------ procedure Write (Stream : in out Print_Stream; Item : in Integer) is begin Stream.Target.Write (Item); end Write; -- ------------------------------ -- Write a string on the stream. -- ------------------------------ procedure Write (Stream : in out Print_Stream; Item : in Ada.Strings.Unbounded.Unbounded_String) is begin Stream.Target.Write (Item); end Write; -- ------------------------------ -- Write a string on the stream. -- ------------------------------ procedure Write (Stream : in out Print_Stream; Item : in Ada.Strings.Wide_Wide_Unbounded.Unbounded_Wide_Wide_String) is begin Stream.Target.Write (Item); end Write; -- ------------------------------ -- Write the object converted into a string on the stream. -- ------------------------------ procedure Write (Stream : in out Print_Stream; Item : in EL.Objects.Object) is begin Stream.Target.Write (EL.Objects.To_String (Item)); end Write; -- ------------------------------ -- Write the buffer array to the output stream. -- ------------------------------ procedure Write (Stream : in out Print_Stream; Buffer : in Ada.Streams.Stream_Element_Array) is begin Stream.Target.Write (Buffer); end Write; -- ------------------------------ -- Flush the buffer by writing on the output stream. -- Raises Data_Error if there is no output stream. -- ------------------------------ procedure Flush (Stream : in out Print_Stream) is begin Stream.Target.Flush; end Flush; -- ------------------------------ -- Close the text stream. -- ------------------------------ overriding procedure Close (Stream : in out Print_Stream) is begin Stream.Target.Close; end Close; -- ------------------------------ -- Write into the text stream. -- ------------------------------ procedure Write (Stream : in out Print_Stream; Print : access procedure (Into : in out Util.Streams.Texts.Print_Stream'Class)) is begin Print (Into => Stream.Target.all); end Write; end Servlet.Streams;
Section11_Templates/Introduction_To_Templates/Introduction_To_Templates/Debug/Source.asm
AlvinToh/Complete-Modern-C-
1
247121
<reponame>AlvinToh/Complete-Modern-C- ; Listing generated by Microsoft (R) Optimizing Compiler Version 19.25.28614.0 TITLE C:\Users\User\Desktop\Alvin_Personal_Projects\Coding_Languages\Complete-Modern-C\Section11_Templates\Introduction_To_Templates\Introduction_To_Templates\Source.cpp .686P .XMM include listing.inc .model flat INCLUDELIB MSVCRTD INCLUDELIB OLDNAMES msvcjmc SEGMENT __47A90C35_vcruntime_new@h DB 01H __09340588_corecrt_math@h DB 01H __24E9E95F_stdlib@h DB 01H __3ADEFC50_cstdlib DB 01H __214B6046_cmath DB 01H __F66CEB67_corecrt_stdio_config@h DB 01H __101834BA_corecrt_wstdio@h DB 01H __AD6A91B7_stdio@h DB 01H __AF2D6193_type_traits DB 01H __B0C4CEA9_malloc@h DB 01H __99999F74_vcruntime_exception@h DB 01H __0ABCEC93_exception DB 01H __367CC694_corecrt_memcpy_s@h DB 01H __35D7DDB3_corecrt_memory@h DB 01H __DC9673E3_corecrt_wstring@h DB 01H __A29A7DFB_string@h DB 01H __5467428D_corecrt_wconio@h DB 01H __4442441F_corecrt_wio@h DB 01H __45F4AF76_corecrt_wtime@h DB 01H __186FF47F_stat@h DB 01H __534C724A_wchar@h DB 01H __EA1B4990_limits DB 01H __E4812FB1_xutility DB 01H __67461A18_xmemory DB 01H __13959C84_xstring DB 01H __83F2D6CE_stdexcept DB 01H __81F03EE0_xcall_once@h DB 01H __3EAD2CC0_system_error DB 01H __84C161B0_vcruntime_typeinfo@h DB 01H __945EDCA8_typeinfo DB 01H __56B5451E_memory DB 01H __7AF01211_xfacet DB 01H __7242C389_ctype@h DB 01H __8BD73F60_xlocinfo DB 01H __CCABE8B5_xlocale DB 01H __B2324873_xiosbase DB 01H __522C8EA2_xlocnum DB 01H __5781BAB1_ios DB 01H __41122F1E_Source@cpp DB 01H __BC6B074B_istream DB 01H __DFBB3271_ostream DB 01H __81526E72_streambuf DB 01H __26F29C16_iosfwd DB 01H __0DD379DB_utility DB 01H __FACCEEC9_xstddef DB 01H __00B06045_xatomic@h DB 01H msvcjmc ENDS PUBLIC ?__empty_global_delete@@YAXPAX@Z ; __empty_global_delete PUBLIC ?__empty_global_delete@@YAXPAXI@Z ; __empty_global_delete PUBLIC ?length@?$_Narrow_char_traits@DH@std@@SAIQBD@Z ; std::_Narrow_char_traits<char,int>::length PUBLIC ?eq_int_type@?$_Narrow_char_traits@DH@std@@SA_NABH0@Z ; std::_Narrow_char_traits<char,int>::eq_int_type PUBLIC ?eof@?$_Narrow_char_traits@DH@std@@SAHXZ ; std::_Narrow_char_traits<char,int>::eof PUBLIC ?name@type_info@@QBEPBDXZ ; type_info::name PUBLIC ??$Max@D@@YADDD@Z ; Max<char> PUBLIC _main PUBLIC ??$Max@M@@YAMMM@Z ; Max<float> PUBLIC ??$Max@N@@YANNN@Z ; Max<double> PUBLIC ??$Max@H@@YAHHH@Z ; Max<int> PUBLIC ??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z ; std::operator<<<std::char_traits<char> > PUBLIC ??$endl@DU?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@@Z ; std::endl<char,std::char_traits<char> > PUBLIC ??0_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z ; std::basic_ostream<char,std::char_traits<char> >::_Sentry_base::_Sentry_base PUBLIC ??1_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ ; std::basic_ostream<char,std::char_traits<char> >::_Sentry_base::~_Sentry_base PUBLIC ??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z ; std::basic_ostream<char,std::char_traits<char> >::sentry::sentry PUBLIC ??1sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ ; std::basic_ostream<char,std::char_traits<char> >::sentry::~sentry PUBLIC ??Bsentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QBE_NXZ ; std::basic_ostream<char,std::char_traits<char> >::sentry::operator bool PUBLIC __JustMyCode_Default PUBLIC ??_R0D@8 ; char `RTTI Type Descriptor' PUBLIC ??_R0M@8 ; float `RTTI Type Descriptor' PUBLIC ??_R0N@8 ; double `RTTI Type Descriptor' PUBLIC ??_R0H@8 ; int `RTTI Type Descriptor' PUBLIC __real@4008000000000000 PUBLIC __real@4018cccccccccccd PUBLIC __real@40400000 PUBLIC __real@40b00000 EXTRN ?uncaught_exception@std@@YA_NXZ:PROC ; std::uncaught_exception EXTRN _strlen:PROC EXTRN ___std_type_info_name:PROC EXTRN __imp_?good@ios_base@std@@QBE_NXZ:PROC EXTRN __imp_?flags@ios_base@std@@QBEHXZ:PROC EXTRN __imp_?width@ios_base@std@@QBE_JXZ:PROC EXTRN __imp_?width@ios_base@std@@QAE_J_J@Z:PROC EXTRN __imp_?sputc@?$basic_streambuf@DU?$char_traits@D@std@@@std@@QAEHD@Z:PROC EXTRN __imp_?sputn@?$basic_streambuf@DU?$char_traits@D@std@@@std@@QAE_JPBD_J@Z:PROC EXTRN __imp_?setstate@?$basic_ios@DU?$char_traits@D@std@@@std@@QAEXH_N@Z:PROC EXTRN __imp_?tie@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEPAV?$basic_ostream@DU?$char_traits@D@std@@@2@XZ:PROC EXTRN __imp_?rdbuf@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEPAV?$basic_streambuf@DU?$char_traits@D@std@@@2@XZ:PROC EXTRN __imp_?fill@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEDXZ:PROC EXTRN __imp_?widen@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEDD@Z:PROC EXTRN __imp_?_Osfx@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAEXXZ:PROC EXTRN __imp_??6?$basic_ostream@DU?$char_traits@D@std@@@std@@QAEAAV01@P6AAAV01@AAV01@@Z@Z:PROC EXTRN __imp_?put@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAEAAV12@D@Z:PROC EXTRN __imp_?flush@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAEAAV12@XZ:PROC EXTRN @_RTC_CheckStackVars@8:PROC EXTRN @__CheckForDebuggerJustMyCode@4:PROC EXTRN @__security_check_cookie@4:PROC EXTRN __RTC_CheckEsp:PROC EXTRN __RTC_InitBase:PROC EXTRN __RTC_Shutdown:PROC EXTRN ___CxxFrameHandler3:PROC EXTRN ??_7type_info@@6B@:QWORD ; type_info::`vftable' EXTRN ?__type_info_root_node@@3U__type_info_node@@A:BYTE ; __type_info_root_node EXTRN __imp_?cout@std@@3V?$basic_ostream@DU?$char_traits@D@std@@@1@A:BYTE EXTRN ___security_cookie:DWORD EXTRN __fltused:DWORD ; COMDAT __real@40b00000 CONST SEGMENT __real@40b00000 DD 040b00000r ; 5.5 CONST ENDS ; COMDAT __real@40400000 CONST SEGMENT __real@40400000 DD 040400000r ; 3 CONST ENDS ; COMDAT __real@4018cccccccccccd CONST SEGMENT __real@4018cccccccccccd DQ 04018cccccccccccdr ; 6.2 CONST ENDS ; COMDAT __real@4008000000000000 CONST SEGMENT __real@4008000000000000 DQ 04008000000000000r ; 3 CONST ENDS ; COMDAT rtc$TMZ rtc$TMZ SEGMENT __RTC_Shutdown.rtc$TMZ DD FLAT:__RTC_Shutdown rtc$TMZ ENDS ; COMDAT rtc$IMZ rtc$IMZ SEGMENT __RTC_InitBase.rtc$IMZ DD FLAT:__RTC_InitBase rtc$IMZ ENDS ; COMDAT ??_R0H@8 data$r SEGMENT ??_R0H@8 DD FLAT:??_7type_info@@6B@ ; int `RTTI Type Descriptor' DD 00H DB '.H', 00H data$r ENDS ; COMDAT ??_R0N@8 data$r SEGMENT ??_R0N@8 DD FLAT:??_7type_info@@6B@ ; double `RTTI Type Descriptor' DD 00H DB '.N', 00H data$r ENDS ; COMDAT ??_R0M@8 data$r SEGMENT ??_R0M@8 DD FLAT:??_7type_info@@6B@ ; float `RTTI Type Descriptor' DD 00H DB '.M', 00H data$r ENDS ; COMDAT ??_R0D@8 data$r SEGMENT ??_R0D@8 DD FLAT:??_7type_info@@6B@ ; char `RTTI Type Descriptor' DD 00H DB '.D', 00H data$r ENDS ; COMDAT xdata$x xdata$x SEGMENT __ehfuncinfo$??1sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ DD 019930522H DD 00H DD 00H DD 2 DUP(00H) DD 2 DUP(00H) DD 00H DD 05H xdata$x ENDS ; COMDAT xdata$x xdata$x SEGMENT __unwindtable$??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z DD 0ffffffffH DD FLAT:__unwindfunclet$??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z$0 __ehfuncinfo$??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z DD 019930522H DD 01H DD FLAT:__unwindtable$??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z DD 2 DUP(00H) DD 2 DUP(00H) DD 00H DD 01H xdata$x ENDS ; COMDAT xdata$x xdata$x SEGMENT __ehfuncinfo$??1_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ DD 019930522H DD 00H DD 00H DD 2 DUP(00H) DD 2 DUP(00H) DD 00H DD 05H xdata$x ENDS ; COMDAT xdata$x xdata$x SEGMENT __catchsym$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z$3 DD 040H DD 00H DD 00H DD FLAT:__catch$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z$0 __tryblocktable$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z DD 01H DD 01H DD 02H DD 01H DD FLAT:__catchsym$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z$3 __unwindtable$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z DD 0ffffffffH DD FLAT:__unwindfunclet$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z$2 DD 00H DD 00H DD 00H DD 00H __ehfuncinfo$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z DD 019930522H DD 03H DD FLAT:__unwindtable$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z DD 01H DD FLAT:__tryblocktable$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z DD 2 DUP(00H) DD 00H DD 01H xdata$x ENDS ; COMDAT xdata$x xdata$x SEGMENT __ehfuncinfo$?name@type_info@@QBEPBDXZ DD 019930522H DD 00H DD 00H DD 2 DUP(00H) DD 2 DUP(00H) DD 00H DD 05H xdata$x ENDS ; COMDAT xdata$x xdata$x SEGMENT __ehfuncinfo$?eof@?$_Narrow_char_traits@DH@std@@SAHXZ DD 019930522H DD 00H DD 00H DD 2 DUP(00H) DD 2 DUP(00H) DD 00H DD 05H xdata$x ENDS ; COMDAT xdata$x xdata$x SEGMENT __ehfuncinfo$?eq_int_type@?$_Narrow_char_traits@DH@std@@SA_NABH0@Z DD 019930522H DD 00H DD 00H DD 2 DUP(00H) DD 2 DUP(00H) DD 00H DD 05H xdata$x ENDS ; COMDAT xdata$x xdata$x SEGMENT __ehfuncinfo$?length@?$_Narrow_char_traits@DH@std@@SAIQBD@Z DD 019930522H DD 00H DD 00H DD 2 DUP(00H) DD 2 DUP(00H) DD 00H DD 05H xdata$x ENDS ; Function compile flags: /Odt ; COMDAT __JustMyCode_Default _TEXT SEGMENT __JustMyCode_Default PROC ; COMDAT push ebp mov ebp, esp pop ebp ret 0 __JustMyCode_Default ENDP _TEXT ENDS ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Program Files (x86)\Microsoft Visual Studio\2019\Community\VC\Tools\MSVC\14.25.28610\include\ostream ; COMDAT ??Bsentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QBE_NXZ _TEXT SEGMENT _this$ = -8 ; size = 4 ??Bsentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QBE_NXZ PROC ; std::basic_ostream<char,std::char_traits<char> >::sentry::operator bool, COMDAT ; _this$ = ecx ; 121 : explicit __CLR_OR_THIS_CALL operator bool() const { push ebp mov ebp, esp sub esp, 204 ; 000000ccH push ebx push esi push edi push ecx lea edi, DWORD PTR [ebp-204] mov ecx, 51 ; 00000033H mov eax, -858993460 ; ccccccccH rep stosd pop ecx mov DWORD PTR _this$[ebp], ecx mov ecx, OFFSET __DFBB3271_ostream call @__CheckForDebuggerJustMyCode@4 ; 122 : return _Ok; mov eax, DWORD PTR _this$[ebp] mov al, BYTE PTR [eax+4] ; 123 : } pop edi pop esi pop ebx add esp, 204 ; 000000ccH cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 ??Bsentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QBE_NXZ ENDP ; std::basic_ostream<char,std::char_traits<char> >::sentry::operator bool _TEXT ENDS ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Program Files (x86)\Microsoft Visual Studio\2019\Community\VC\Tools\MSVC\14.25.28610\include\ostream ; COMDAT ??1sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ _TEXT SEGMENT _this$ = -20 ; size = 4 __$EHRec$ = -12 ; size = 12 ??1sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ PROC ; std::basic_ostream<char,std::char_traits<char> >::sentry::~sentry, COMDAT ; _this$ = ecx ; 110 : __CLR_OR_THIS_CALL ~sentry() noexcept { push ebp mov ebp, esp push -1 push __ehhandler$??1sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ mov eax, DWORD PTR fs:0 push eax sub esp, 204 ; 000000ccH push ebx push esi push edi push ecx lea edi, DWORD PTR [ebp-216] mov ecx, 51 ; 00000033H mov eax, -858993460 ; ccccccccH rep stosd pop ecx mov eax, DWORD PTR ___security_cookie xor eax, ebp push eax lea eax, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, eax mov DWORD PTR _this$[ebp], ecx mov ecx, OFFSET __DFBB3271_ostream call @__CheckForDebuggerJustMyCode@4 ; 111 : #if _HAS_EXCEPTIONS ; 112 : if (!_STD uncaught_exception()) { // TRANSITION, ArchivedOS-12000909 call ?uncaught_exception@std@@YA_NXZ ; std::uncaught_exception movzx eax, al test eax, eax jne SHORT $LN1@sentry ; 113 : this->_Myostr._Osfx(); mov esi, esp mov eax, DWORD PTR _this$[ebp] mov ecx, DWORD PTR [eax] call DWORD PTR __imp_?_Osfx@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAEXXZ cmp esi, esp call __RTC_CheckEsp $LN1@sentry: ; 114 : } ; 115 : #else // _HAS_EXCEPTIONS ; 116 : this->_Myostr._Osfx(); ; 117 : #endif // _HAS_EXCEPTIONS ; 118 : } mov ecx, DWORD PTR _this$[ebp] call ??1_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ ; std::basic_ostream<char,std::char_traits<char> >::_Sentry_base::~_Sentry_base mov ecx, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, ecx pop ecx pop edi pop esi pop ebx add esp, 216 ; 000000d8H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 _TEXT ENDS ; COMDAT text$x text$x SEGMENT __ehhandler$??1sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ: mov edx, DWORD PTR [esp+8] lea eax, DWORD PTR [edx+12] mov ecx, DWORD PTR [edx-220] xor ecx, eax call @__security_check_cookie@4 mov eax, OFFSET __ehfuncinfo$??1sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ jmp ___CxxFrameHandler3 text$x ENDS ??1sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ ENDP ; std::basic_ostream<char,std::char_traits<char> >::sentry::~sentry ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Program Files (x86)\Microsoft Visual Studio\2019\Community\VC\Tools\MSVC\14.25.28610\include\ostream ; COMDAT ??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z _TEXT SEGMENT __Tied$ = -32 ; size = 4 _this$ = -20 ; size = 4 __$EHRec$ = -12 ; size = 12 __Ostr$ = 8 ; size = 4 ??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z PROC ; std::basic_ostream<char,std::char_traits<char> >::sentry::sentry, COMDAT ; _this$ = ecx ; 92 : explicit __CLR_OR_THIS_CALL sentry(basic_ostream& _Ostr) : _Sentry_base(_Ostr) { push ebp mov ebp, esp push -1 push __ehhandler$??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z mov eax, DWORD PTR fs:0 push eax sub esp, 216 ; 000000d8H push ebx push esi push edi push ecx lea edi, DWORD PTR [ebp-228] mov ecx, 54 ; 00000036H mov eax, -858993460 ; ccccccccH rep stosd pop ecx mov eax, DWORD PTR ___security_cookie xor eax, ebp push eax lea eax, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, eax mov DWORD PTR _this$[ebp], ecx mov ecx, OFFSET __DFBB3271_ostream call @__CheckForDebuggerJustMyCode@4 mov eax, DWORD PTR __Ostr$[ebp] push eax mov ecx, DWORD PTR _this$[ebp] call ??0_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z ; std::basic_ostream<char,std::char_traits<char> >::_Sentry_base::_Sentry_base mov DWORD PTR __$EHRec$[ebp+8], 0 ; 93 : if (!_Ostr.good()) { mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov esi, esp mov ecx, edx call DWORD PTR __imp_?good@ios_base@std@@QBE_NXZ cmp esi, esp call __RTC_CheckEsp movzx eax, al test eax, eax jne SHORT $LN2@sentry ; 94 : _Ok = false; mov eax, DWORD PTR _this$[ebp] mov BYTE PTR [eax+4], 0 ; 95 : return; jmp SHORT $LN1@sentry $LN2@sentry: ; 96 : } ; 97 : ; 98 : const auto _Tied = _Ostr.tie(); mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov esi, esp mov ecx, edx call DWORD PTR __imp_?tie@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEPAV?$basic_ostream@DU?$char_traits@D@std@@@2@XZ cmp esi, esp call __RTC_CheckEsp mov DWORD PTR __Tied$[ebp], eax ; 99 : if (!_Tied || _Tied == &_Ostr) { cmp DWORD PTR __Tied$[ebp], 0 je SHORT $LN4@sentry mov eax, DWORD PTR __Tied$[ebp] cmp eax, DWORD PTR __Ostr$[ebp] jne SHORT $LN3@sentry $LN4@sentry: ; 100 : _Ok = true; mov eax, DWORD PTR _this$[ebp] mov BYTE PTR [eax+4], 1 ; 101 : return; jmp SHORT $LN1@sentry $LN3@sentry: ; 102 : } ; 103 : ; 104 : ; 105 : _Tied->flush(); mov esi, esp mov ecx, DWORD PTR __Tied$[ebp] call DWORD PTR __imp_?flush@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAEAAV12@XZ cmp esi, esp call __RTC_CheckEsp ; 106 : _Ok = _Ostr.good(); // store test only after flushing tie mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov esi, esp mov ecx, edx call DWORD PTR __imp_?good@ios_base@std@@QBE_NXZ cmp esi, esp call __RTC_CheckEsp mov ecx, DWORD PTR _this$[ebp] mov BYTE PTR [ecx+4], al $LN1@sentry: ; 107 : } mov DWORD PTR __$EHRec$[ebp+8], -1 mov eax, DWORD PTR _this$[ebp] mov ecx, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, ecx pop ecx pop edi pop esi pop ebx add esp, 228 ; 000000e4H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 4 _TEXT ENDS ; COMDAT text$x text$x SEGMENT __unwindfunclet$??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z$0: mov ecx, DWORD PTR _this$[ebp] jmp ??1_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ ; std::basic_ostream<char,std::char_traits<char> >::_Sentry_base::~_Sentry_base __ehhandler$??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z: mov edx, DWORD PTR [esp+8] lea eax, DWORD PTR [edx+12] mov ecx, DWORD PTR [edx-232] xor ecx, eax call @__security_check_cookie@4 mov eax, OFFSET __ehfuncinfo$??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z jmp ___CxxFrameHandler3 text$x ENDS ??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z ENDP ; std::basic_ostream<char,std::char_traits<char> >::sentry::sentry ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Program Files (x86)\Microsoft Visual Studio\2019\Community\VC\Tools\MSVC\14.25.28610\include\ostream ; COMDAT ??1_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ _TEXT SEGMENT tv72 = -232 ; size = 4 __Rdbuf$ = -32 ; size = 4 _this$ = -20 ; size = 4 __$EHRec$ = -12 ; size = 12 ??1_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ PROC ; std::basic_ostream<char,std::char_traits<char> >::_Sentry_base::~_Sentry_base, COMDAT ; _this$ = ecx ; 78 : __CLR_OR_THIS_CALL ~_Sentry_base() noexcept { // destroy after unlocking push ebp mov ebp, esp push -1 push __ehhandler$??1_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ mov eax, DWORD PTR fs:0 push eax sub esp, 220 ; 000000dcH push ebx push esi push edi push ecx lea edi, DWORD PTR [ebp-232] mov ecx, 55 ; 00000037H mov eax, -858993460 ; ccccccccH rep stosd pop ecx mov eax, DWORD PTR ___security_cookie xor eax, ebp push eax lea eax, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, eax mov DWORD PTR _this$[ebp], ecx mov ecx, OFFSET __DFBB3271_ostream call @__CheckForDebuggerJustMyCode@4 ; 79 : const auto _Rdbuf = _Myostr.rdbuf(); mov eax, DWORD PTR _this$[ebp] mov ecx, DWORD PTR [eax] mov DWORD PTR tv72[ebp], ecx mov edx, DWORD PTR tv72[ebp] mov eax, DWORD PTR [edx] mov ecx, DWORD PTR tv72[ebp] add ecx, DWORD PTR [eax+4] mov esi, esp call DWORD PTR __imp_?rdbuf@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEPAV?$basic_streambuf@DU?$char_traits@D@std@@@2@XZ cmp esi, esp call __RTC_CheckEsp mov DWORD PTR __Rdbuf$[ebp], eax ; 80 : if (_Rdbuf) { cmp DWORD PTR __Rdbuf$[ebp], 0 je SHORT $LN3@Sentry_bas ; 81 : _Rdbuf->_Unlock(); mov eax, DWORD PTR __Rdbuf$[ebp] mov edx, DWORD PTR [eax] mov esi, esp mov ecx, DWORD PTR __Rdbuf$[ebp] mov eax, DWORD PTR [edx+8] call eax cmp esi, esp call __RTC_CheckEsp $LN3@Sentry_bas: ; 82 : } ; 83 : } mov ecx, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, ecx pop ecx pop edi pop esi pop ebx add esp, 232 ; 000000e8H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 _TEXT ENDS ; COMDAT text$x text$x SEGMENT __ehhandler$??1_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ: mov edx, DWORD PTR [esp+8] lea eax, DWORD PTR [edx+12] mov ecx, DWORD PTR [edx-236] xor ecx, eax call @__security_check_cookie@4 mov eax, OFFSET __ehfuncinfo$??1_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ jmp ___CxxFrameHandler3 text$x ENDS ??1_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ ENDP ; std::basic_ostream<char,std::char_traits<char> >::_Sentry_base::~_Sentry_base ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Program Files (x86)\Microsoft Visual Studio\2019\Community\VC\Tools\MSVC\14.25.28610\include\ostream ; COMDAT ??0_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z _TEXT SEGMENT tv73 = -220 ; size = 4 __Rdbuf$ = -20 ; size = 4 _this$ = -8 ; size = 4 __Ostr$ = 8 ; size = 4 ??0_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z PROC ; std::basic_ostream<char,std::char_traits<char> >::_Sentry_base::_Sentry_base, COMDAT ; _this$ = ecx ; 71 : __CLR_OR_THIS_CALL _Sentry_base(basic_ostream& _Ostr) : _Myostr(_Ostr) { // lock the stream buffer, if there push ebp mov ebp, esp sub esp, 220 ; 000000dcH push ebx push esi push edi push ecx lea edi, DWORD PTR [ebp-220] mov ecx, 55 ; 00000037H mov eax, -858993460 ; ccccccccH rep stosd pop ecx mov DWORD PTR _this$[ebp], ecx mov ecx, OFFSET __DFBB3271_ostream call @__CheckForDebuggerJustMyCode@4 mov eax, DWORD PTR _this$[ebp] mov ecx, DWORD PTR __Ostr$[ebp] mov DWORD PTR [eax], ecx ; 72 : const auto _Rdbuf = _Myostr.rdbuf(); mov eax, DWORD PTR _this$[ebp] mov ecx, DWORD PTR [eax] mov DWORD PTR tv73[ebp], ecx mov edx, DWORD PTR tv73[ebp] mov eax, DWORD PTR [edx] mov ecx, DWORD PTR tv73[ebp] add ecx, DWORD PTR [eax+4] mov esi, esp call DWORD PTR __imp_?rdbuf@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEPAV?$basic_streambuf@DU?$char_traits@D@std@@@2@XZ cmp esi, esp call __RTC_CheckEsp mov DWORD PTR __Rdbuf$[ebp], eax ; 73 : if (_Rdbuf) { cmp DWORD PTR __Rdbuf$[ebp], 0 je SHORT $LN1@Sentry_bas ; 74 : _Rdbuf->_Lock(); mov eax, DWORD PTR __Rdbuf$[ebp] mov edx, DWORD PTR [eax] mov esi, esp mov ecx, DWORD PTR __Rdbuf$[ebp] mov eax, DWORD PTR [edx+4] call eax cmp esi, esp call __RTC_CheckEsp $LN1@Sentry_bas: ; 75 : } ; 76 : } mov eax, DWORD PTR _this$[ebp] pop edi pop esi pop ebx add esp, 220 ; 000000dcH cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 4 ??0_Sentry_base@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z ENDP ; std::basic_ostream<char,std::char_traits<char> >::_Sentry_base::_Sentry_base _TEXT ENDS ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Program Files (x86)\Microsoft Visual Studio\2019\Community\VC\Tools\MSVC\14.25.28610\include\ostream ; COMDAT ??$endl@DU?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@@Z _TEXT SEGMENT __Ostr$ = 8 ; size = 4 ??$endl@DU?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@@Z PROC ; std::endl<char,std::char_traits<char> >, COMDAT ; 943 : basic_ostream<_Elem, _Traits>& _Ostr) { // insert newline and flush stream push ebp mov ebp, esp sub esp, 192 ; 000000c0H push ebx push esi push edi lea edi, DWORD PTR [ebp-192] mov ecx, 48 ; 00000030H mov eax, -858993460 ; ccccccccH rep stosd mov ecx, OFFSET __DFBB3271_ostream call @__CheckForDebuggerJustMyCode@4 ; 944 : _Ostr.put(_Ostr.widen('\n')); mov esi, esp push 10 ; 0000000aH mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov ecx, edx call DWORD PTR __imp_?widen@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEDD@Z cmp esi, esp call __RTC_CheckEsp mov esi, esp movzx eax, al push eax mov ecx, DWORD PTR __Ostr$[ebp] call DWORD PTR __imp_?put@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAEAAV12@D@Z cmp esi, esp call __RTC_CheckEsp ; 945 : _Ostr.flush(); mov esi, esp mov ecx, DWORD PTR __Ostr$[ebp] call DWORD PTR __imp_?flush@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAEAAV12@XZ cmp esi, esp call __RTC_CheckEsp ; 946 : return _Ostr; mov eax, DWORD PTR __Ostr$[ebp] ; 947 : } pop edi pop esi pop ebx add esp, 192 ; 000000c0H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 ??$endl@DU?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@@Z ENDP ; std::endl<char,std::char_traits<char> > _TEXT ENDS ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Program Files (x86)\Microsoft Visual Studio\2019\Community\VC\Tools\MSVC\14.25.28610\include\ostream ; COMDAT ??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z _TEXT SEGMENT tv135 = -356 ; size = 8 tv343 = -348 ; size = 8 tv291 = -344 ; size = 4 tv288 = -344 ; size = 8 tv286 = -344 ; size = 4 tv329 = -340 ; size = 8 tv290 = -340 ; size = 4 tv285 = -340 ; size = 4 tv287 = -336 ; size = 4 tv137 = -336 ; size = 4 tv289 = -333 ; size = 1 tv284 = -333 ; size = 1 $T2 = -328 ; size = 4 $T3 = -316 ; size = 4 $T4 = -304 ; size = 4 $T5 = -292 ; size = 4 $T6 = -280 ; size = 4 __Ok$ = -76 ; size = 8 __Pad$ = -60 ; size = 8 __Count$ = -44 ; size = 8 __State$ = -28 ; size = 4 __$ArrayPad$ = -20 ; size = 4 __$EHRec$ = -16 ; size = 16 __Ostr$ = 8 ; size = 4 __Val$ = 12 ; size = 4 ??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z PROC ; std::operator<<<std::char_traits<char> >, COMDAT ; 731 : const char* _Val) { // insert NTBS into char stream push ebp mov ebp, esp push -1 push __ehhandler$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z mov eax, DWORD PTR fs:0 push eax push ecx sub esp, 340 ; 00000154H push ebx push esi push edi lea edi, DWORD PTR [ebp-356] mov ecx, 85 ; 00000055H mov eax, -858993460 ; ccccccccH rep stosd mov eax, DWORD PTR ___security_cookie xor eax, ebp mov DWORD PTR __$ArrayPad$[ebp], eax push eax lea eax, DWORD PTR __$EHRec$[ebp+4] mov DWORD PTR fs:0, eax mov DWORD PTR __$EHRec$[ebp], esp mov ecx, OFFSET __DFBB3271_ostream call @__CheckForDebuggerJustMyCode@4 ; 732 : using _Elem = char; ; 733 : using _Myos = basic_ostream<_Elem, _Traits>; ; 734 : ; 735 : ios_base::iostate _State = ios_base::goodbit; mov DWORD PTR __State$[ebp], 0 ; 736 : streamsize _Count = static_cast<streamsize>(_Traits::length(_Val)); mov eax, DWORD PTR __Val$[ebp] push eax call ?length@?$_Narrow_char_traits@DH@std@@SAIQBD@Z ; std::_Narrow_char_traits<char,int>::length add esp, 4 xor ecx, ecx mov DWORD PTR __Count$[ebp], eax mov DWORD PTR __Count$[ebp+4], ecx ; 737 : streamsize _Pad = _Ostr.width() <= 0 || _Ostr.width() <= _Count ? 0 : _Ostr.width() - _Count; mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov esi, esp mov ecx, edx call DWORD PTR __imp_?width@ios_base@std@@QBE_JXZ cmp esi, esp call __RTC_CheckEsp mov DWORD PTR tv329[ebp], eax mov DWORD PTR tv329[ebp+4], edx cmp DWORD PTR tv329[ebp+4], 0 jl SHORT $LN17@operator jg SHORT $LN24@operator cmp DWORD PTR tv329[ebp], 0 jbe SHORT $LN17@operator $LN24@operator: mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov esi, esp mov ecx, edx call DWORD PTR __imp_?width@ios_base@std@@QBE_JXZ cmp esi, esp call __RTC_CheckEsp mov DWORD PTR tv343[ebp], eax mov DWORD PTR tv343[ebp+4], edx mov eax, DWORD PTR tv343[ebp+4] cmp eax, DWORD PTR __Count$[ebp+4] jl SHORT $LN17@operator jg SHORT $LN25@operator mov ecx, DWORD PTR tv343[ebp] cmp ecx, DWORD PTR __Count$[ebp] jbe SHORT $LN17@operator $LN25@operator: mov edx, DWORD PTR __Ostr$[ebp] mov eax, DWORD PTR [edx] mov ecx, DWORD PTR __Ostr$[ebp] add ecx, DWORD PTR [eax+4] mov esi, esp call DWORD PTR __imp_?width@ios_base@std@@QBE_JXZ cmp esi, esp call __RTC_CheckEsp sub eax, DWORD PTR __Count$[ebp] sbb edx, DWORD PTR __Count$[ebp+4] mov DWORD PTR tv135[ebp], eax mov DWORD PTR tv135[ebp+4], edx jmp SHORT $LN18@operator $LN17@operator: xorps xmm0, xmm0 movlpd QWORD PTR tv135[ebp], xmm0 $LN18@operator: mov ecx, DWORD PTR tv135[ebp] mov DWORD PTR __Pad$[ebp], ecx mov edx, DWORD PTR tv135[ebp+4] mov DWORD PTR __Pad$[ebp+4], edx ; 738 : const typename _Myos::sentry _Ok(_Ostr); mov eax, DWORD PTR __Ostr$[ebp] push eax lea ecx, DWORD PTR __Ok$[ebp] call ??0sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@AAV12@@Z ; std::basic_ostream<char,std::char_traits<char> >::sentry::sentry mov DWORD PTR __$EHRec$[ebp+12], 0 ; 739 : ; 740 : if (!_Ok) { lea ecx, DWORD PTR __Ok$[ebp] call ??Bsentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QBE_NXZ ; std::basic_ostream<char,std::char_traits<char> >::sentry::operator bool movzx eax, al test eax, eax jne SHORT $LN8@operator ; 741 : _State |= ios_base::badbit; mov eax, DWORD PTR __State$[ebp] or eax, 4 mov DWORD PTR __State$[ebp], eax ; 742 : } else { // state okay, insert jmp $LN9@operator $LN8@operator: ; 743 : _TRY_IO_BEGIN mov BYTE PTR __$EHRec$[ebp+12], 1 ; 744 : if ((_Ostr.flags() & ios_base::adjustfield) != ios_base::left) { mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov esi, esp mov ecx, edx call DWORD PTR __imp_?flags@ios_base@std@@QBEHXZ cmp esi, esp call __RTC_CheckEsp mov DWORD PTR tv137[ebp], eax mov eax, DWORD PTR tv137[ebp] and eax, 448 ; 000001c0H cmp eax, 64 ; 00000040H je $LN11@operator ; 745 : for (; 0 < _Pad; --_Pad) { // pad on left jmp SHORT $LN4@operator $LN2@operator: mov eax, DWORD PTR __Pad$[ebp] sub eax, 1 mov ecx, DWORD PTR __Pad$[ebp+4] sbb ecx, 0 mov DWORD PTR __Pad$[ebp], eax mov DWORD PTR __Pad$[ebp+4], ecx $LN4@operator: cmp DWORD PTR __Pad$[ebp+4], 0 jl $LN11@operator jg SHORT $LN26@operator cmp DWORD PTR __Pad$[ebp], 0 jbe $LN11@operator $LN26@operator: ; 746 : if (_Traits::eq_int_type(_Traits::eof(), _Ostr.rdbuf()->sputc(_Ostr.fill()))) { mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov esi, esp mov ecx, edx call DWORD PTR __imp_?fill@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEDXZ cmp esi, esp call __RTC_CheckEsp mov BYTE PTR tv284[ebp], al mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov esi, esp mov ecx, edx call DWORD PTR __imp_?rdbuf@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEPAV?$basic_streambuf@DU?$char_traits@D@std@@@2@XZ cmp esi, esp call __RTC_CheckEsp mov DWORD PTR tv285[ebp], eax mov esi, esp movzx eax, BYTE PTR tv284[ebp] push eax mov ecx, DWORD PTR tv285[ebp] call DWORD PTR __imp_?sputc@?$basic_streambuf@DU?$char_traits@D@std@@@std@@QAEHD@Z cmp esi, esp call __RTC_CheckEsp mov DWORD PTR tv286[ebp], eax mov ecx, DWORD PTR tv286[ebp] mov DWORD PTR $T6[ebp], ecx call ?eof@?$_Narrow_char_traits@DH@std@@SAHXZ ; std::_Narrow_char_traits<char,int>::eof mov DWORD PTR $T5[ebp], eax lea edx, DWORD PTR $T6[ebp] push edx lea eax, DWORD PTR $T5[ebp] push eax call ?eq_int_type@?$_Narrow_char_traits@DH@std@@SA_NABH0@Z ; std::_Narrow_char_traits<char,int>::eq_int_type add esp, 8 movzx ecx, al test ecx, ecx je SHORT $LN12@operator ; 747 : _State |= ios_base::badbit; // insertion failed, quit mov eax, DWORD PTR __State$[ebp] or eax, 4 mov DWORD PTR __State$[ebp], eax ; 748 : break; jmp SHORT $LN11@operator $LN12@operator: ; 749 : } ; 750 : } jmp $LN2@operator $LN11@operator: ; 751 : } ; 752 : ; 753 : if (_State == ios_base::goodbit && _Ostr.rdbuf()->sputn(_Val, _Count) != _Count) { cmp DWORD PTR __State$[ebp], 0 jne SHORT $LN13@operator mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov esi, esp mov ecx, edx call DWORD PTR __imp_?rdbuf@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEPAV?$basic_streambuf@DU?$char_traits@D@std@@@2@XZ cmp esi, esp call __RTC_CheckEsp mov DWORD PTR tv287[ebp], eax mov esi, esp mov eax, DWORD PTR __Count$[ebp+4] push eax mov ecx, DWORD PTR __Count$[ebp] push ecx mov edx, DWORD PTR __Val$[ebp] push edx mov ecx, DWORD PTR tv287[ebp] call DWORD PTR __imp_?sputn@?$basic_streambuf@DU?$char_traits@D@std@@@std@@QAE_JPBD_J@Z cmp esi, esp call __RTC_CheckEsp mov DWORD PTR tv288[ebp], eax mov DWORD PTR tv288[ebp+4], edx mov eax, DWORD PTR tv288[ebp] cmp eax, DWORD PTR __Count$[ebp] jne SHORT $LN27@operator mov ecx, DWORD PTR tv288[ebp+4] cmp ecx, DWORD PTR __Count$[ebp+4] je SHORT $LN13@operator $LN27@operator: ; 754 : _State |= ios_base::badbit; mov eax, DWORD PTR __State$[ebp] or eax, 4 mov DWORD PTR __State$[ebp], eax $LN13@operator: ; 755 : } ; 756 : ; 757 : if (_State == ios_base::goodbit) { cmp DWORD PTR __State$[ebp], 0 jne $LN14@operator ; 758 : for (; 0 < _Pad; --_Pad) { // pad on right jmp SHORT $LN7@operator $LN5@operator: mov eax, DWORD PTR __Pad$[ebp] sub eax, 1 mov ecx, DWORD PTR __Pad$[ebp+4] sbb ecx, 0 mov DWORD PTR __Pad$[ebp], eax mov DWORD PTR __Pad$[ebp+4], ecx $LN7@operator: cmp DWORD PTR __Pad$[ebp+4], 0 jl $LN14@operator jg SHORT $LN28@operator cmp DWORD PTR __Pad$[ebp], 0 jbe $LN14@operator $LN28@operator: ; 759 : if (_Traits::eq_int_type(_Traits::eof(), _Ostr.rdbuf()->sputc(_Ostr.fill()))) { mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov esi, esp mov ecx, edx call DWORD PTR __imp_?fill@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEDXZ cmp esi, esp call __RTC_CheckEsp mov BYTE PTR tv289[ebp], al mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov esi, esp mov ecx, edx call DWORD PTR __imp_?rdbuf@?$basic_ios@DU?$char_traits@D@std@@@std@@QBEPAV?$basic_streambuf@DU?$char_traits@D@std@@@2@XZ cmp esi, esp call __RTC_CheckEsp mov DWORD PTR tv290[ebp], eax mov esi, esp movzx eax, BYTE PTR tv289[ebp] push eax mov ecx, DWORD PTR tv290[ebp] call DWORD PTR __imp_?sputc@?$basic_streambuf@DU?$char_traits@D@std@@@std@@QAEHD@Z cmp esi, esp call __RTC_CheckEsp mov DWORD PTR tv291[ebp], eax mov ecx, DWORD PTR tv291[ebp] mov DWORD PTR $T4[ebp], ecx call ?eof@?$_Narrow_char_traits@DH@std@@SAHXZ ; std::_Narrow_char_traits<char,int>::eof mov DWORD PTR $T3[ebp], eax lea edx, DWORD PTR $T4[ebp] push edx lea eax, DWORD PTR $T3[ebp] push eax call ?eq_int_type@?$_Narrow_char_traits@DH@std@@SA_NABH0@Z ; std::_Narrow_char_traits<char,int>::eq_int_type add esp, 8 movzx ecx, al test ecx, ecx je SHORT $LN15@operator ; 760 : _State |= ios_base::badbit; // insertion failed, quit mov eax, DWORD PTR __State$[ebp] or eax, 4 mov DWORD PTR __State$[ebp], eax ; 761 : break; jmp SHORT $LN14@operator $LN15@operator: ; 762 : } ; 763 : } jmp $LN5@operator $LN14@operator: ; 764 : } ; 765 : ; 766 : _Ostr.width(0); mov esi, esp push 0 push 0 mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov ecx, edx call DWORD PTR __imp_?width@ios_base@std@@QAE_J_J@Z cmp esi, esp call __RTC_CheckEsp jmp SHORT $LN19@operator __catch$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z$0: ; 767 : _CATCH_IO_(ios_base, _Ostr) mov esi, esp push 1 push 4 mov eax, DWORD PTR __Ostr$[ebp] mov ecx, DWORD PTR [eax] mov edx, DWORD PTR __Ostr$[ebp] add edx, DWORD PTR [ecx+4] mov ecx, edx call DWORD PTR __imp_?setstate@?$basic_ios@DU?$char_traits@D@std@@@std@@QAEXH_N@Z cmp esi, esp call __RTC_CheckEsp mov eax, $LN23@operator ret 0 $LN19@operator: mov DWORD PTR __$EHRec$[ebp+12], 0 jmp SHORT $LN9@operator $LN23@operator: mov DWORD PTR __$EHRec$[ebp+12], 0 $LN9@operator: ; 768 : } ; 769 : ; 770 : _Ostr.setstate(_State); mov esi, esp push 0 mov eax, DWORD PTR __State$[ebp] push eax mov ecx, DWORD PTR __Ostr$[ebp] mov edx, DWORD PTR [ecx] mov ecx, DWORD PTR __Ostr$[ebp] add ecx, DWORD PTR [edx+4] call DWORD PTR __imp_?setstate@?$basic_ios@DU?$char_traits@D@std@@@std@@QAEXH_N@Z cmp esi, esp call __RTC_CheckEsp ; 771 : return _Ostr; mov eax, DWORD PTR __Ostr$[ebp] mov DWORD PTR $T2[ebp], eax mov DWORD PTR __$EHRec$[ebp+12], -1 lea ecx, DWORD PTR __Ok$[ebp] call ??1sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ ; std::basic_ostream<char,std::char_traits<char> >::sentry::~sentry mov eax, DWORD PTR $T2[ebp] ; 772 : } push edx mov ecx, ebp push eax lea edx, DWORD PTR $LN32@operator call @_RTC_CheckStackVars@8 pop eax pop edx mov ecx, DWORD PTR __$EHRec$[ebp+4] mov DWORD PTR fs:0, ecx pop ecx pop edi pop esi pop ebx mov ecx, DWORD PTR __$ArrayPad$[ebp] xor ecx, ebp call @__security_check_cookie@4 add esp, 356 ; 00000164H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 npad 2 $LN32@operator: DD 1 DD $LN31@operator $LN31@operator: DD -76 ; ffffffb4H DD 8 DD $LN29@operator $LN29@operator: DB 95 ; 0000005fH DB 79 ; 0000004fH DB 107 ; 0000006bH DB 0 _TEXT ENDS ; COMDAT text$x text$x SEGMENT __unwindfunclet$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z$2: lea ecx, DWORD PTR __Ok$[ebp] jmp ??1sentry@?$basic_ostream@DU?$char_traits@D@std@@@std@@QAE@XZ ; std::basic_ostream<char,std::char_traits<char> >::sentry::~sentry __ehhandler$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z: mov edx, DWORD PTR [esp+8] lea eax, DWORD PTR [edx+12] mov ecx, DWORD PTR [edx-360] xor ecx, eax call @__security_check_cookie@4 mov ecx, DWORD PTR [edx-8] xor ecx, eax call @__security_check_cookie@4 mov eax, OFFSET __ehfuncinfo$??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z jmp ___CxxFrameHandler3 text$x ENDS ??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z ENDP ; std::operator<<<std::char_traits<char> > ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Users\User\Desktop\Alvin_Personal_Projects\Coding_Languages\Complete-Modern-C\Section11_Templates\Introduction_To_Templates\Introduction_To_Templates\Source.cpp ; COMDAT ??$Max@H@@YAHHH@Z _TEXT SEGMENT tv72 = -196 ; size = 4 _x$ = 8 ; size = 4 _y$ = 12 ; size = 4 ??$Max@H@@YAHHH@Z PROC ; Max<int>, COMDAT ; 12 : T Max(T x, T y) { push ebp mov ebp, esp sub esp, 196 ; 000000c4H push ebx push esi push edi lea edi, DWORD PTR [ebp-196] mov ecx, 49 ; 00000031H mov eax, -858993460 ; ccccccccH rep stosd mov ecx, OFFSET __41122F1E_Source@cpp call @__CheckForDebuggerJustMyCode@4 ; 13 : std::cout << typeid(T).name() << std::endl; mov esi, esp push OFFSET ??$endl@DU?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@@Z ; std::endl<char,std::char_traits<char> > mov ecx, OFFSET ??_R0H@8 call ?name@type_info@@QBEPBDXZ ; type_info::name push eax mov eax, DWORD PTR __imp_?cout@std@@3V?$basic_ostream@DU?$char_traits@D@std@@@1@A push eax call ??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z ; std::operator<<<std::char_traits<char> > add esp, 8 mov ecx, eax call DWORD PTR __imp_??6?$basic_ostream@DU?$char_traits@D@std@@@std@@QAEAAV01@P6AAAV01@AAV01@@Z@Z cmp esi, esp call __RTC_CheckEsp ; 14 : return x > y ? x : y; mov eax, DWORD PTR _x$[ebp] cmp eax, DWORD PTR _y$[ebp] jle SHORT $LN3@Max mov ecx, DWORD PTR _x$[ebp] mov DWORD PTR tv72[ebp], ecx jmp SHORT $LN4@Max $LN3@Max: mov edx, DWORD PTR _y$[ebp] mov DWORD PTR tv72[ebp], edx $LN4@Max: mov eax, DWORD PTR tv72[ebp] ; 15 : } pop edi pop esi pop ebx add esp, 196 ; 000000c4H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 ??$Max@H@@YAHHH@Z ENDP ; Max<int> _TEXT ENDS ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Users\User\Desktop\Alvin_Personal_Projects\Coding_Languages\Complete-Modern-C\Section11_Templates\Introduction_To_Templates\Introduction_To_Templates\Source.cpp ; COMDAT ??$Max@N@@YANNN@Z _TEXT SEGMENT tv72 = -200 ; size = 8 _x$ = 8 ; size = 8 _y$ = 16 ; size = 8 ??$Max@N@@YANNN@Z PROC ; Max<double>, COMDAT ; 12 : T Max(T x, T y) { push ebp mov ebp, esp sub esp, 200 ; 000000c8H push ebx push esi push edi lea edi, DWORD PTR [ebp-200] mov ecx, 50 ; 00000032H mov eax, -858993460 ; ccccccccH rep stosd mov ecx, OFFSET __41122F1E_Source@cpp call @__CheckForDebuggerJustMyCode@4 ; 13 : std::cout << typeid(T).name() << std::endl; mov esi, esp push OFFSET ??$endl@DU?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@@Z ; std::endl<char,std::char_traits<char> > mov ecx, OFFSET ??_R0N@8 call ?name@type_info@@QBEPBDXZ ; type_info::name push eax mov eax, DWORD PTR __imp_?cout@std@@3V?$basic_ostream@DU?$char_traits@D@std@@@1@A push eax call ??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z ; std::operator<<<std::char_traits<char> > add esp, 8 mov ecx, eax call DWORD PTR __imp_??6?$basic_ostream@DU?$char_traits@D@std@@@std@@QAEAAV01@P6AAAV01@AAV01@@Z@Z cmp esi, esp call __RTC_CheckEsp ; 14 : return x > y ? x : y; movsd xmm0, QWORD PTR _x$[ebp] comisd xmm0, QWORD PTR _y$[ebp] jbe SHORT $LN3@Max movsd xmm0, QWORD PTR _x$[ebp] movsd QWORD PTR tv72[ebp], xmm0 jmp SHORT $LN4@Max $LN3@Max: movsd xmm0, QWORD PTR _y$[ebp] movsd QWORD PTR tv72[ebp], xmm0 $LN4@Max: fld QWORD PTR tv72[ebp] ; 15 : } pop edi pop esi pop ebx add esp, 200 ; 000000c8H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 ??$Max@N@@YANNN@Z ENDP ; Max<double> _TEXT ENDS ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Users\User\Desktop\Alvin_Personal_Projects\Coding_Languages\Complete-Modern-C\Section11_Templates\Introduction_To_Templates\Introduction_To_Templates\Source.cpp ; COMDAT ??$Max@M@@YAMMM@Z _TEXT SEGMENT tv72 = -196 ; size = 4 _x$ = 8 ; size = 4 _y$ = 12 ; size = 4 ??$Max@M@@YAMMM@Z PROC ; Max<float>, COMDAT ; 12 : T Max(T x, T y) { push ebp mov ebp, esp sub esp, 196 ; 000000c4H push ebx push esi push edi lea edi, DWORD PTR [ebp-196] mov ecx, 49 ; 00000031H mov eax, -858993460 ; ccccccccH rep stosd mov ecx, OFFSET __41122F1E_Source@cpp call @__CheckForDebuggerJustMyCode@4 ; 13 : std::cout << typeid(T).name() << std::endl; mov esi, esp push OFFSET ??$endl@DU?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@@Z ; std::endl<char,std::char_traits<char> > mov ecx, OFFSET ??_R0M@8 call ?name@type_info@@QBEPBDXZ ; type_info::name push eax mov eax, DWORD PTR __imp_?cout@std@@3V?$basic_ostream@DU?$char_traits@D@std@@@1@A push eax call ??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z ; std::operator<<<std::char_traits<char> > add esp, 8 mov ecx, eax call DWORD PTR __imp_??6?$basic_ostream@DU?$char_traits@D@std@@@std@@QAEAAV01@P6AAAV01@AAV01@@Z@Z cmp esi, esp call __RTC_CheckEsp ; 14 : return x > y ? x : y; movss xmm0, DWORD PTR _x$[ebp] comiss xmm0, DWORD PTR _y$[ebp] jbe SHORT $LN3@Max movss xmm0, DWORD PTR _x$[ebp] movss DWORD PTR tv72[ebp], xmm0 jmp SHORT $LN4@Max $LN3@Max: movss xmm0, DWORD PTR _y$[ebp] movss DWORD PTR tv72[ebp], xmm0 $LN4@Max: fld DWORD PTR tv72[ebp] ; 15 : } pop edi pop esi pop ebx add esp, 196 ; 000000c4H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 ??$Max@M@@YAMMM@Z ENDP ; Max<float> _TEXT ENDS ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Users\User\Desktop\Alvin_Personal_Projects\Coding_Languages\Complete-Modern-C\Section11_Templates\Introduction_To_Templates\Introduction_To_Templates\Source.cpp ; COMDAT _main _TEXT SEGMENT _pfn$ = -8 ; size = 4 _main PROC ; COMDAT ; 18 : int main() { push ebp mov ebp, esp sub esp, 204 ; 000000ccH push ebx push esi push edi lea edi, DWORD PTR [ebp-204] mov ecx, 51 ; 00000033H mov eax, -858993460 ; ccccccccH rep stosd mov ecx, OFFSET __41122F1E_Source@cpp call @__CheckForDebuggerJustMyCode@4 ; 19 : Max(static_cast<float>(3), 5.5f); push ecx movss xmm0, DWORD PTR __real@40b00000 movss DWORD PTR [esp], xmm0 push ecx movss xmm0, DWORD PTR __real@40400000 movss DWORD PTR [esp], xmm0 call ??$Max@M@@YAMMM@Z ; Max<float> fstp ST(0) add esp, 8 ; 20 : Max<double>(3, 6.2); sub esp, 8 movsd xmm0, QWORD PTR __real@4018cccccccccccd movsd QWORD PTR [esp], xmm0 sub esp, 8 movsd xmm0, QWORD PTR __real@4008000000000000 movsd QWORD PTR [esp], xmm0 call ??$Max@N@@YANNN@Z ; Max<double> fstp ST(0) add esp, 16 ; 00000010H ; 21 : int (*pfn)(int, int) = Max; mov DWORD PTR _pfn$[ebp], OFFSET ??$Max@H@@YAHHH@Z ; Max<int> ; 22 : //auto num = Max(3.3f, 5.8f); ; 23 : //std::cout << num << std::endl; ; 24 : //auto num2 = Max(38, 12); ; 25 : //std::cout << num2 << std::endl; ; 26 : ; 27 : return 0; xor eax, eax ; 28 : } pop edi pop esi pop ebx add esp, 204 ; 000000ccH cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 _main ENDP _TEXT ENDS ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Users\User\Desktop\Alvin_Personal_Projects\Coding_Languages\Complete-Modern-C\Section11_Templates\Introduction_To_Templates\Introduction_To_Templates\Source.cpp ; COMDAT ??$Max@D@@YADDD@Z _TEXT SEGMENT tv74 = -193 ; size = 1 _x$ = 8 ; size = 1 _y$ = 12 ; size = 1 ??$Max@D@@YADDD@Z PROC ; Max<char>, COMDAT ; 12 : T Max(T x, T y) { push ebp mov ebp, esp sub esp, 196 ; 000000c4H push ebx push esi push edi lea edi, DWORD PTR [ebp-196] mov ecx, 49 ; 00000031H mov eax, -858993460 ; ccccccccH rep stosd mov ecx, OFFSET __41122F1E_Source@cpp call @__CheckForDebuggerJustMyCode@4 ; 13 : std::cout << typeid(T).name() << std::endl; mov esi, esp push OFFSET ??$endl@DU?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@@Z ; std::endl<char,std::char_traits<char> > mov ecx, OFFSET ??_R0D@8 call ?name@type_info@@QBEPBDXZ ; type_info::name push eax mov eax, DWORD PTR __imp_?cout@std@@3V?$basic_ostream@DU?$char_traits@D@std@@@1@A push eax call ??$?6U?$char_traits@D@std@@@std@@YAAAV?$basic_ostream@DU?$char_traits@D@std@@@0@AAV10@PBD@Z ; std::operator<<<std::char_traits<char> > add esp, 8 mov ecx, eax call DWORD PTR __imp_??6?$basic_ostream@DU?$char_traits@D@std@@@std@@QAEAAV01@P6AAAV01@AAV01@@Z@Z cmp esi, esp call __RTC_CheckEsp ; 14 : return x > y ? x : y; movsx eax, BYTE PTR _x$[ebp] movsx ecx, BYTE PTR _y$[ebp] cmp eax, ecx jle SHORT $LN3@Max mov dl, BYTE PTR _x$[ebp] mov BYTE PTR tv74[ebp], dl jmp SHORT $LN4@Max $LN3@Max: mov al, BYTE PTR _y$[ebp] mov BYTE PTR tv74[ebp], al $LN4@Max: mov al, BYTE PTR tv74[ebp] ; 15 : } pop edi pop esi pop ebx add esp, 196 ; 000000c4H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 ??$Max@D@@YADDD@Z ENDP ; Max<char> _TEXT ENDS ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Program Files (x86)\Microsoft Visual Studio\2019\Community\VC\Tools\MSVC\14.25.28610\include\vcruntime_typeinfo.h ; COMDAT ?name@type_info@@QBEPBDXZ _TEXT SEGMENT _this$ = -20 ; size = 4 __$EHRec$ = -12 ; size = 12 ?name@type_info@@QBEPBDXZ PROC ; type_info::name, COMDAT ; _this$ = ecx ; 97 : { push ebp mov ebp, esp push -1 push __ehhandler$?name@type_info@@QBEPBDXZ mov eax, DWORD PTR fs:0 push eax sub esp, 204 ; 000000ccH push ebx push esi push edi push ecx lea edi, DWORD PTR [ebp-216] mov ecx, 51 ; 00000033H mov eax, -858993460 ; ccccccccH rep stosd pop ecx mov eax, DWORD PTR ___security_cookie xor eax, ebp push eax lea eax, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, eax mov DWORD PTR _this$[ebp], ecx mov ecx, OFFSET __84C161B0_vcruntime_typeinfo@h call @__CheckForDebuggerJustMyCode@4 ; 98 : #ifdef _M_CEE_PURE ; 99 : return __std_type_info_name(&_Data, static_cast<__type_info_node*>(__type_info_root_node.ToPointer())); ; 100 : #else ; 101 : return __std_type_info_name(&_Data, &__type_info_root_node); push OFFSET ?__type_info_root_node@@3U__type_info_node@@A ; __type_info_root_node mov eax, DWORD PTR _this$[ebp] add eax, 4 push eax call ___std_type_info_name add esp, 8 ; 102 : #endif ; 103 : } mov ecx, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, ecx pop ecx pop edi pop esi pop ebx add esp, 216 ; 000000d8H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 _TEXT ENDS ; COMDAT text$x text$x SEGMENT __ehhandler$?name@type_info@@QBEPBDXZ: mov edx, DWORD PTR [esp+8] lea eax, DWORD PTR [edx+12] mov ecx, DWORD PTR [edx-220] xor ecx, eax call @__security_check_cookie@4 mov eax, OFFSET __ehfuncinfo$?name@type_info@@QBEPBDXZ jmp ___CxxFrameHandler3 text$x ENDS ?name@type_info@@QBEPBDXZ ENDP ; type_info::name ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Program Files (x86)\Microsoft Visual Studio\2019\Community\VC\Tools\MSVC\14.25.28610\include\xstring ; COMDAT ?eof@?$_Narrow_char_traits@DH@std@@SAHXZ _TEXT SEGMENT __$EHRec$ = -12 ; size = 12 ?eof@?$_Narrow_char_traits@DH@std@@SAHXZ PROC ; std::_Narrow_char_traits<char,int>::eof, COMDAT ; 404 : _NODISCARD static constexpr int_type eof() noexcept { push ebp mov ebp, esp push -1 push __ehhandler$?eof@?$_Narrow_char_traits@DH@std@@SAHXZ mov eax, DWORD PTR fs:0 push eax sub esp, 192 ; 000000c0H push ebx push esi push edi lea edi, DWORD PTR [ebp-204] mov ecx, 48 ; 00000030H mov eax, -858993460 ; ccccccccH rep stosd mov eax, DWORD PTR ___security_cookie xor eax, ebp push eax lea eax, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, eax mov ecx, OFFSET __13959C84_xstring call @__CheckForDebuggerJustMyCode@4 ; 405 : return static_cast<int_type>(EOF); or eax, -1 ; 406 : } mov ecx, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, ecx pop ecx pop edi pop esi pop ebx add esp, 204 ; 000000ccH cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 _TEXT ENDS ; COMDAT text$x text$x SEGMENT __ehhandler$?eof@?$_Narrow_char_traits@DH@std@@SAHXZ: mov edx, DWORD PTR [esp+8] lea eax, DWORD PTR [edx+12] mov ecx, DWORD PTR [edx-208] xor ecx, eax call @__security_check_cookie@4 mov eax, OFFSET __ehfuncinfo$?eof@?$_Narrow_char_traits@DH@std@@SAHXZ jmp ___CxxFrameHandler3 text$x ENDS ?eof@?$_Narrow_char_traits@DH@std@@SAHXZ ENDP ; std::_Narrow_char_traits<char,int>::eof ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Program Files (x86)\Microsoft Visual Studio\2019\Community\VC\Tools\MSVC\14.25.28610\include\xstring ; COMDAT ?eq_int_type@?$_Narrow_char_traits@DH@std@@SA_NABH0@Z _TEXT SEGMENT tv65 = -208 ; size = 4 __$EHRec$ = -12 ; size = 12 __Left$ = 8 ; size = 4 __Right$ = 12 ; size = 4 ?eq_int_type@?$_Narrow_char_traits@DH@std@@SA_NABH0@Z PROC ; std::_Narrow_char_traits<char,int>::eq_int_type, COMDAT ; 396 : _NODISCARD static constexpr bool eq_int_type(const int_type& _Left, const int_type& _Right) noexcept { push ebp mov ebp, esp push -1 push __ehhandler$?eq_int_type@?$_Narrow_char_traits@DH@std@@SA_NABH0@Z mov eax, DWORD PTR fs:0 push eax sub esp, 196 ; 000000c4H push ebx push esi push edi lea edi, DWORD PTR [ebp-208] mov ecx, 49 ; 00000031H mov eax, -858993460 ; ccccccccH rep stosd mov eax, DWORD PTR ___security_cookie xor eax, ebp push eax lea eax, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, eax mov ecx, OFFSET __13959C84_xstring call @__CheckForDebuggerJustMyCode@4 ; 397 : return _Left == _Right; mov eax, DWORD PTR __Left$[ebp] mov ecx, DWORD PTR __Right$[ebp] mov edx, DWORD PTR [eax] cmp edx, DWORD PTR [ecx] jne SHORT $LN3@eq_int_typ mov DWORD PTR tv65[ebp], 1 jmp SHORT $LN4@eq_int_typ $LN3@eq_int_typ: mov DWORD PTR tv65[ebp], 0 $LN4@eq_int_typ: mov al, BYTE PTR tv65[ebp] ; 398 : } mov ecx, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, ecx pop ecx pop edi pop esi pop ebx add esp, 208 ; 000000d0H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 _TEXT ENDS ; COMDAT text$x text$x SEGMENT __ehhandler$?eq_int_type@?$_Narrow_char_traits@DH@std@@SA_NABH0@Z: mov edx, DWORD PTR [esp+8] lea eax, DWORD PTR [edx+12] mov ecx, DWORD PTR [edx-212] xor ecx, eax call @__security_check_cookie@4 mov eax, OFFSET __ehfuncinfo$?eq_int_type@?$_Narrow_char_traits@DH@std@@SA_NABH0@Z jmp ___CxxFrameHandler3 text$x ENDS ?eq_int_type@?$_Narrow_char_traits@DH@std@@SA_NABH0@Z ENDP ; std::_Narrow_char_traits<char,int>::eq_int_type ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Program Files (x86)\Microsoft Visual Studio\2019\Community\VC\Tools\MSVC\14.25.28610\include\xstring ; COMDAT ?length@?$_Narrow_char_traits@DH@std@@SAIQBD@Z _TEXT SEGMENT __$EHRec$ = -12 ; size = 12 __First$ = 8 ; size = 4 ?length@?$_Narrow_char_traits@DH@std@@SAIQBD@Z PROC ; std::_Narrow_char_traits<char,int>::length, COMDAT ; 309 : _NODISCARD static _CONSTEXPR17 size_t length(_In_z_ const _Elem* const _First) noexcept /* strengthened */ { push ebp mov ebp, esp push -1 push __ehhandler$?length@?$_Narrow_char_traits@DH@std@@SAIQBD@Z mov eax, DWORD PTR fs:0 push eax sub esp, 192 ; 000000c0H push ebx push esi push edi lea edi, DWORD PTR [ebp-204] mov ecx, 48 ; 00000030H mov eax, -858993460 ; ccccccccH rep stosd mov eax, DWORD PTR ___security_cookie xor eax, ebp push eax lea eax, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, eax mov ecx, OFFSET __13959C84_xstring call @__CheckForDebuggerJustMyCode@4 ; 310 : // find length of null-terminated string ; 311 : #if _HAS_CXX17 ; 312 : #ifdef __cpp_char8_t ; 313 : if constexpr (is_same_v<_Elem, char8_t>) { ; 314 : #if _HAS_U8_INTRINSICS ; 315 : return __builtin_u8strlen(_First); ; 316 : #else // ^^^ use u8 intrinsics / no u8 intrinsics vvv ; 317 : return _Char_traits<_Elem, _Int_type>::length(_First); ; 318 : #endif // _HAS_U8_INTRINSICS ; 319 : } else ; 320 : #endif // __cpp_char8_t ; 321 : { ; 322 : return __builtin_strlen(_First); ; 323 : } ; 324 : #else // _HAS_CXX17 ; 325 : return _CSTD strlen(reinterpret_cast<const char*>(_First)); mov eax, DWORD PTR __First$[ebp] push eax call _strlen add esp, 4 ; 326 : #endif // _HAS_CXX17 ; 327 : } mov ecx, DWORD PTR __$EHRec$[ebp] mov DWORD PTR fs:0, ecx pop ecx pop edi pop esi pop ebx add esp, 204 ; 000000ccH cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 _TEXT ENDS ; COMDAT text$x text$x SEGMENT __ehhandler$?length@?$_Narrow_char_traits@DH@std@@SAIQBD@Z: mov edx, DWORD PTR [esp+8] lea eax, DWORD PTR [edx+12] mov ecx, DWORD PTR [edx-208] xor ecx, eax call @__security_check_cookie@4 mov eax, OFFSET __ehfuncinfo$?length@?$_Narrow_char_traits@DH@std@@SAIQBD@Z jmp ___CxxFrameHandler3 text$x ENDS ?length@?$_Narrow_char_traits@DH@std@@SAIQBD@Z ENDP ; std::_Narrow_char_traits<char,int>::length ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Users\User\Desktop\Alvin_Personal_Projects\Coding_Languages\Complete-Modern-C\Section11_Templates\Introduction_To_Templates\Introduction_To_Templates\Source.cpp ; COMDAT ?__empty_global_delete@@YAXPAXI@Z _TEXT SEGMENT ___formal$ = 8 ; size = 4 ___formal$ = 12 ; size = 4 ?__empty_global_delete@@YAXPAXI@Z PROC ; __empty_global_delete, COMDAT push ebp mov ebp, esp sub esp, 192 ; 000000c0H push ebx push esi push edi lea edi, DWORD PTR [ebp-192] mov ecx, 48 ; 00000030H mov eax, -858993460 ; ccccccccH rep stosd mov ecx, OFFSET __41122F1E_Source@cpp call @__CheckForDebuggerJustMyCode@4 pop edi pop esi pop ebx add esp, 192 ; 000000c0H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 ?__empty_global_delete@@YAXPAXI@Z ENDP ; __empty_global_delete _TEXT ENDS ; Function compile flags: /Odtp /RTCsu /ZI ; File C:\Users\User\Desktop\Alvin_Personal_Projects\Coding_Languages\Complete-Modern-C\Section11_Templates\Introduction_To_Templates\Introduction_To_Templates\Source.cpp ; COMDAT ?__empty_global_delete@@YAXPAX@Z _TEXT SEGMENT ___formal$ = 8 ; size = 4 ?__empty_global_delete@@YAXPAX@Z PROC ; __empty_global_delete, COMDAT push ebp mov ebp, esp sub esp, 192 ; 000000c0H push ebx push esi push edi lea edi, DWORD PTR [ebp-192] mov ecx, 48 ; 00000030H mov eax, -858993460 ; ccccccccH rep stosd mov ecx, OFFSET __41122F1E_Source@cpp call @__CheckForDebuggerJustMyCode@4 pop edi pop esi pop ebx add esp, 192 ; 000000c0H cmp ebp, esp call __RTC_CheckEsp mov esp, ebp pop ebp ret 0 ?__empty_global_delete@@YAXPAX@Z ENDP ; __empty_global_delete _TEXT ENDS END
oeis/001/A001533.asm
neoneye/loda-programs
11
6242
; A001533: (8n+1)(8n+7). ; 7,135,391,775,1287,1927,2695,3591,4615,5767,7047,8455,9991,11655,13447,15367,17415,19591,21895,24327,26887,29575,32391,35335,38407,41607,44935,48391,51975,55687,59527,63495,67591,71815,76167,80647,85255,89991,94855,99847,104967,110215,115591,121095,126727,132487,138375,144391,150535,156807,163207,169735,176391,183175,190087,197127,204295,211591,219015,226567,234247,242055,249991,258055,266247,274567,283015,291591,300295,309127,318087,327175,336391,345735,355207,364807,374535,384391,394375 add $0,1 bin $0,2 mul $0,128 add $0,7
Transynther/x86/_processed/NONE/_xt_/i3-7100_9_0x84_notsx.log_21829_2417.asm
ljhsiun2/medusa
9
95986
.global s_prepare_buffers s_prepare_buffers: push %r12 push %r14 push %r15 push %r9 push %rbx push %rcx push %rdi push %rsi lea addresses_D_ht+0x710, %rsi lea addresses_UC_ht+0xc828, %rdi clflush (%rsi) nop nop add $48904, %rbx mov $24, %rcx rep movsb nop sub $4087, %r12 lea addresses_UC_ht+0x5f63, %r15 nop nop nop nop cmp $47897, %rcx mov $0x6162636465666768, %rsi movq %rsi, %xmm7 movups %xmm7, (%r15) nop cmp %rsi, %rsi lea addresses_UC_ht+0x1a990, %r15 nop nop nop xor %r9, %r9 and $0xffffffffffffffc0, %r15 movntdqa (%r15), %xmm1 vpextrq $1, %xmm1, %rcx nop nop nop nop xor $62487, %r9 lea addresses_A_ht+0xc390, %rsi lea addresses_WC_ht+0x14110, %rdi nop nop sub $45343, %r14 mov $15, %rcx rep movsq nop nop nop nop cmp $11893, %rcx lea addresses_A_ht+0x8b40, %rsi lea addresses_WC_ht+0x5b10, %rdi nop nop nop dec %r12 mov $70, %rcx rep movsq nop nop inc %r9 lea addresses_WC_ht+0x17790, %rcx clflush (%rcx) add $3907, %rsi mov (%rcx), %di nop xor $62111, %r15 pop %rsi pop %rdi pop %rcx pop %rbx pop %r9 pop %r15 pop %r14 pop %r12 ret .global s_faulty_load s_faulty_load: push %r12 push %r14 push %r15 push %r8 push %rcx push %rdx push %rsi // Load lea addresses_A+0x5b90, %rcx mfence mov (%rcx), %r14w nop nop inc %rsi // Store lea addresses_A+0x5b90, %rdx clflush (%rdx) nop nop xor %r8, %r8 mov $0x5152535455565758, %r12 movq %r12, (%rdx) nop nop nop nop nop xor %rdx, %rdx // Store lea addresses_UC+0x74f0, %r12 nop nop nop and %r8, %r8 mov $0x5152535455565758, %rsi movq %rsi, %xmm5 movups %xmm5, (%r12) nop nop nop nop nop add %rdx, %rdx // Faulty Load lea addresses_A+0x5b90, %rcx cmp %rsi, %rsi vmovups (%rcx), %ymm7 vextracti128 $0, %ymm7, %xmm7 vpextrq $1, %xmm7, %r12 lea oracles, %rcx and $0xff, %r12 shlq $12, %r12 mov (%rcx,%r12,1), %r12 pop %rsi pop %rdx pop %rcx pop %r8 pop %r15 pop %r14 pop %r12 ret /* <gen_faulty_load> [REF] {'src': {'type': 'addresses_A', 'same': True, 'size': 1, 'congruent': 0, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} {'src': {'type': 'addresses_A', 'same': True, 'size': 2, 'congruent': 0, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} {'dst': {'type': 'addresses_A', 'same': True, 'size': 8, 'congruent': 0, 'NT': False, 'AVXalign': False}, 'OP': 'STOR'} {'dst': {'type': 'addresses_UC', 'same': False, 'size': 16, 'congruent': 3, 'NT': False, 'AVXalign': False}, 'OP': 'STOR'} [Faulty Load] {'src': {'type': 'addresses_A', 'same': True, 'size': 32, 'congruent': 0, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} <gen_prepare_buffer> {'src': {'type': 'addresses_D_ht', 'congruent': 7, 'same': False}, 'dst': {'type': 'addresses_UC_ht', 'congruent': 2, 'same': False}, 'OP': 'REPM'} {'dst': {'type': 'addresses_UC_ht', 'same': False, 'size': 16, 'congruent': 0, 'NT': False, 'AVXalign': False}, 'OP': 'STOR'} {'src': {'type': 'addresses_UC_ht', 'same': False, 'size': 16, 'congruent': 5, 'NT': True, 'AVXalign': False}, 'OP': 'LOAD'} {'src': {'type': 'addresses_A_ht', 'congruent': 10, 'same': False}, 'dst': {'type': 'addresses_WC_ht', 'congruent': 7, 'same': False}, 'OP': 'REPM'} {'src': {'type': 'addresses_A_ht', 'congruent': 4, 'same': False}, 'dst': {'type': 'addresses_WC_ht', 'congruent': 7, 'same': False}, 'OP': 'REPM'} {'src': {'type': 'addresses_WC_ht', 'same': False, 'size': 2, 'congruent': 10, 'NT': False, 'AVXalign': False}, 'OP': 'LOAD'} {'35': 21829} 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 35 */
cmd/chkdsk/spawn.asm
minblock/msdos
0
5227
TITLE SPAWN - procedures to spawn another program before exiting ;/* ; * Microsoft Confidential ; * Copyright (C) Microsoft Corporation 1993 ; * All Rights Reserved. ; */ page ,132 .xlist include chkseg.inc include chkmacro.inc INCLUDE SYSCALL.INC INCLUDE PATHMAC.INC .list ;************************************************************************** ; Structures ;************************************************************************** Exec_Block_Parms struc Segment_Env dw 0 Offset_Command dw 0 Segment_Command dw 0 Offset_FCB1 dw 0 Segment_FCB1 dw 0 Offset_FCB2 dw 0 Segment_FCB2 dw 0 Exec_Block_Parms ends PSP_OFFSET_FCB1 EQU 05Ch PSP_OFFSET_FCB2 EQU 06Ch EXEC_STACK_SIZE EQU 1024 ;************************************************************************** ;************************************************************************** data segment ASSUME cs:DG,ds:DG,es:nothing,ss:nothing extrn fatmap:word extrn fattbl_seg:word pathlabl spawn ;************************************************************************** ; Data Area ;************************************************************************** lclExitStatus db ? ;hold exit status to pass to MS-DOS Exec_Block Exec_Block_Parms <> ;EXEC parameter block public EXEC_Path, EXEC_CmdTail EXEC_Path db 80 dup (0) ;EXEC pathname EXEC_CmdTail db 20 dup (0) ;EXEC command tail ;========================================================================= ; SpawnAndExit - This routine spawns another program before exiting ; CHKDSK. When the child process terminates, this ; routines terminates CHKDSK. ; ; This file is linked first in the CHKDSK image so ; this this code and data leave a very small stub ; when Exec'ing the child process. ; ; ; Inputs : AL - Exit code to use when terminating CHKDSK ; ES - CHKDSK PSP segment ; EXEC_Path - contains full pathname of pgm to spawn. ; EXEC_CmdTail - contains cmd tail to pass to child. ; ; Outputs : Exits to MS-DOS ;========================================================================= assume CS:DG,DS:DG,ES:NOTHING ; ShrinkExecExit is actually a part of SpawnAndExit, but located ; before SpawnAndExit so some of the code can be discarded ShrinkExecExit proc near ; Switch to local EXEC stack mov ax, ds cli mov ss, ax mov sp, cx sti DOS_Call Setblock ;shrink memory image, bx has size ; Spawn the child process mov ax, ds mov es, ax mov bx, offset DG:Exec_Block ;es:bx -> parameter block mov dx, offset DG:Exec_Path ;ds:dx -> program specification xor al, al ;exec pgm subfunction DOS_Call Exec ; The child has completed, now terminate CHKDSK. If lclExitStatus ; is not 0 return that, otherwise get and return the child's exit ; status. mov al, lclExitStatus jc see_exit ;Use this status if Exec failed or al, al jnz see_exit ;Status != 0, return it DOS_Call WaitProcess ;Our status is 0, get child's status see_exit: DOS_Call Exit ShrinkExecExit endp End_Exec label near ;End of code/data kept for Exec'ing ; child process public SpawnAndExit assume cs:DG,DS:DG,ES:NOTHING SpawnAndExit proc near mov lclExitStatus, al ;save exit status locally ; Free other CHKDSK memory blocks to make more mem available to child push es ;save PSP segment mov es, fattbl_seg ;these appear to be the only Dos_Call Dealloc ; other two blocks allocated mov es, fatmap Dos_Call Dealloc pop es ; Build the EXEC call parameter block xor ax, ax mov Exec_Block.Segment_Env, ax mov Exec_Block.Offset_Command, offset DG:EXEC_CmdTail mov Exec_Block.Segment_Command, ds mov Exec_Block.Offset_FCB1, PSP_OFFSET_FCB1 mov Exec_Block.Segment_FCB1, es mov Exec_Block.Offset_FCB2, PSP_OFFSET_FCB2 mov Exec_Block.Segment_FCB2, es ; Setup to shrink CHKDSK memory size to make room for child process mov ax, es ;ax = PSP segment mov bx, cs ;bx = data/code segment sub bx, ax ;bx = # paras from psp to data seg mov ax, offset DG:End_Exec add ax, EXEC_STACK_SIZE + 15 mov cl, 4 shr ax, cl ;ax = siz data seg to keep in paras add bx, ax ;bx = # paras to keep mov cx, offset DG:End_Exec add cx, EXEC_STACK_SIZE + 1 and cl, not 1 ;cx = word offset of temp exec stack jmp ShrinkExecExit ;go shrink, exec child, and exit SpawnAndExit endp pathlabl spawn data ENDS END
src/Container/Tree-sort.agda
nad/equality
3
8510
<reponame>nad/equality ------------------------------------------------------------------------ -- An implementation of tree sort, formally proved to return a -- permutation of the input ------------------------------------------------------------------------ {-# OPTIONS --without-K --safe #-} open import Equality open import Prelude hiding (id; _∘_; List; module List; []; _∷_) module Container.Tree-sort {c⁺} (eq : ∀ {a p} → Equality-with-J a p c⁺) {A : Type} (_≤_ : A → A → Bool) -- A comparison function. where open Derived-definitions-and-properties eq open import Logical-equivalence using (module _⇔_) open import Bijection eq using (_↔_; module _↔_) open import Container eq open import Container.List eq as List open import Container.Tree eq as Tree open import Function-universe eq ------------------------------------------------------------------------ -- Boring lemmas private -- The following lemma is easy to prove automatically (for -- instance by using a ring solver). lemma₁ : (A B C D : Type) → A ⊎ B ⊎ C ⊎ D ↔ C ⊎ A ⊎ B ⊎ D lemma₁ A B C D = A ⊎ B ⊎ C ⊎ D ↔⟨ id ⊎-cong ⊎-assoc ⟩ A ⊎ (B ⊎ C) ⊎ D ↔⟨ id ⊎-cong ⊎-comm ⊎-cong id ⟩ A ⊎ (C ⊎ B) ⊎ D ↔⟨ ⊎-assoc ⟩ (A ⊎ C ⊎ B) ⊎ D ↔⟨ ⊎-assoc ⊎-cong id ⟩ ((A ⊎ C) ⊎ B) ⊎ D ↔⟨ (⊎-comm ⊎-cong id) ⊎-cong id ⟩ ((C ⊎ A) ⊎ B) ⊎ D ↔⟨ inverse ⊎-assoc ⊎-cong id ⟩ (C ⊎ A ⊎ B) ⊎ D ↔⟨ inverse ⊎-assoc ⟩ C ⊎ (A ⊎ B) ⊎ D ↔⟨ id ⊎-cong inverse ⊎-assoc ⟩ C ⊎ A ⊎ B ⊎ D □ lemma₂ : {A B C D : Type} (b : Bool) → T b × ((A ⊎ B) ⊎ C ⊎ D) ⊎ T (not b) × (B ⊎ C ⊎ A ⊎ D) ↔ A ⊎ B ⊎ C ⊎ D lemma₂ = if-lemma (λ _ → _) (inverse ⊎-assoc) (lemma₁ _ _ _ _) ------------------------------------------------------------------------ -- Insertion into trees -- Inserts an element into the tree. insert : A → ⟦ Tree ⟧ A → ⟦ Tree ⟧ A insert x = Tree.fold (singleton x) (λ l y r x+l x+r → if x ≤ y then node x+l y r else node l y x+r) -- The insert function inserts. Any-insert : ∀ (P : A → Type) x t → Any P (insert x t) ↔ P x ⊎ Any P t Any-insert P x = Tree.fold-lemma (λ t t′ → Any P t′ ↔ P x ⊎ Any P t) (λ t₁ t₂ t₁≈t₂ t hyp → Any P t ↔⟨ hyp ⟩ P x ⊎ Any P t₁ ↔⟨ id ⊎-cong _⇔_.to (∼⇔∼″ t₁ t₂) t₁≈t₂ P ⟩ P x ⊎ Any P t₂ □) (Any P (singleton x) ↔⟨ Any-singleton P ⟩ P x ↔⟨ inverse ⊎-right-identity ⟩ P x ⊎ ⊥ ↔⟨ id ⊎-cong inverse (Any-leaf P) ⟩ P x ⊎ Any P leaf □) (λ l y r l′ r′ ih-l ih-r → Any P (if x ≤ y then node l′ y r else node l y r′) ↔⟨ Any-if P (node l′ y r) (node l y r′) (x ≤ y) ⟩ T (x ≤ y) × Any P (node l′ y r) ⊎ T (not (x ≤ y)) × Any P (node l y r′) ↔⟨ id ×-cong Any-node P ⊎-cong id ×-cong Any-node P ⟩ T (x ≤ y) × (Any P l′ ⊎ P y ⊎ Any P r) ⊎ T (not (x ≤ y)) × (Any P l ⊎ P y ⊎ Any P r′) ↔⟨ id ×-cong (ih-l ⊎-cong id) ⊎-cong id ×-cong (id ⊎-cong id ⊎-cong ih-r) ⟩ T (x ≤ y) × ((P x ⊎ Any P l) ⊎ P y ⊎ Any P r) ⊎ T (not (x ≤ y)) × (Any P l ⊎ P y ⊎ P x ⊎ Any P r) ↔⟨ lemma₂ (x ≤ y) ⟩ P x ⊎ Any P l ⊎ P y ⊎ Any P r ↔⟨ id ⊎-cong inverse (Any-node P) ⟩ P x ⊎ Any P (node l y r) □) ------------------------------------------------------------------------ -- Turning a list into a search tree -- Converts the list to a search tree. to-search-tree : ⟦ List ⟧ A → ⟦ Tree ⟧ A to-search-tree = List.fold leaf (λ x _ t → insert x t) -- No elements are added or removed. to-search-tree≈ : ∀ xs → to-search-tree xs ≈-bag xs to-search-tree≈ = List.fold-lemma (λ xs t → t ≈-bag xs) (λ xs ys xs≈ys t t≈xs z → z ∈ t ↔⟨ t≈xs z ⟩ z ∈ xs ↔⟨ xs≈ys z ⟩ z ∈ ys □) (λ z → z ∈ leaf ↔⟨ Any-leaf (λ x → z ≡ x) ⟩ ⊥ ↔⟨ inverse $ Any-[] (λ x → z ≡ x) ⟩ z ∈ [] □) (λ x xs t t≈xs z → z ∈ insert x t ↔⟨ Any-insert (λ x → z ≡ x) _ _ ⟩ z ≡ x ⊎ z ∈ t ↔⟨ id ⊎-cong t≈xs z ⟩ z ≡ x ⊎ z ∈ xs ↔⟨ inverse $ Any-∷ (λ x → z ≡ x) ⟩ z ∈ x ∷ xs □) ------------------------------------------------------------------------ -- Sorting -- Sorts a list. sort : ⟦ List ⟧ A → ⟦ List ⟧ A sort = flatten ∘ to-search-tree -- The result is a permutation of the input. sort≈ : ∀ xs → sort xs ≈-bag xs sort≈ xs = λ z → z ∈ sort xs ↔⟨⟩ z ∈ flatten (to-search-tree xs) ↔⟨ flatten≈ (to-search-tree xs) _ ⟩ z ∈ to-search-tree xs ↔⟨ to-search-tree≈ xs _ ⟩ z ∈ xs □