Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
data InstructionState Source #
type Instruction = State InstructionState () Source #
data AddressingMode Source #
appendBytes :: [Word8] -> InstructionState -> InstructionState Source #
appendBytesThenWord :: [Word8] -> Word16 -> InstructionState -> InstructionState Source #
genericNoByteOp :: Word8 -> Instruction Source #
genericOp :: (FiniteBits a, Integral a) => Word8 -> a -> Instruction Source #
genericTwoByteOp :: Word8 -> Word16 -> Instruction Source #
define :: String -> Instruction -> Instruction Source #
call :: String -> Instruction Source #
adc :: AddressingMode -> Instruction Source #
and :: AddressingMode -> Instruction Source #
asl :: AddressingMode -> Instruction Source #
bbr0 :: AddressingMode -> Instruction Source #
bbr1 :: AddressingMode -> Instruction Source #
bbr2 :: AddressingMode -> Instruction Source #
bbr3 :: AddressingMode -> Instruction Source #
bbr4 :: AddressingMode -> Instruction Source #
bbr5 :: AddressingMode -> Instruction Source #
bbr6 :: AddressingMode -> Instruction Source #
bbr7 :: AddressingMode -> Instruction Source #
bbs0 :: AddressingMode -> Instruction Source #
bbs1 :: AddressingMode -> Instruction Source #
bbs2 :: AddressingMode -> Instruction Source #
bbs3 :: AddressingMode -> Instruction Source #
bbs4 :: AddressingMode -> Instruction Source #
bbs5 :: AddressingMode -> Instruction Source #
bbs6 :: AddressingMode -> Instruction Source #
bbs7 :: AddressingMode -> Instruction Source #
bcc :: AddressingMode -> Instruction Source #
bcs :: AddressingMode -> Instruction Source #
beq :: AddressingMode -> Instruction Source #
bit :: AddressingMode -> Instruction Source #
bmi :: AddressingMode -> Instruction Source #
bne :: AddressingMode -> Instruction Source #
bpl :: AddressingMode -> Instruction Source #
bra :: AddressingMode -> Instruction Source #
brk :: AddressingMode -> Instruction Source #
bvc :: AddressingMode -> Instruction Source #
bvs :: AddressingMode -> Instruction Source #
clc :: AddressingMode -> Instruction Source #
cld :: AddressingMode -> Instruction Source #
cli :: AddressingMode -> Instruction Source #
clv :: AddressingMode -> Instruction Source #
cmp :: AddressingMode -> Instruction Source #
cpx :: AddressingMode -> Instruction Source #
cpy :: AddressingMode -> Instruction Source #
dec :: AddressingMode -> Instruction Source #
dex :: AddressingMode -> Instruction Source #
dey :: AddressingMode -> Instruction Source #
eor :: AddressingMode -> Instruction Source #
inc :: AddressingMode -> Instruction Source #
inx :: AddressingMode -> Instruction Source #
iny :: AddressingMode -> Instruction Source #
jmp :: AddressingMode -> Instruction Source #
jsr :: AddressingMode -> Instruction Source #
lda :: AddressingMode -> Instruction Source #
ldx :: AddressingMode -> Instruction Source #
ldy :: AddressingMode -> Instruction Source #
lsr :: AddressingMode -> Instruction Source #
nop :: AddressingMode -> Instruction Source #
ora :: AddressingMode -> Instruction Source #
pha :: AddressingMode -> Instruction Source #
php :: AddressingMode -> Instruction Source #
phx :: AddressingMode -> Instruction Source #
phy :: AddressingMode -> Instruction Source #
pla :: AddressingMode -> Instruction Source #
plp :: AddressingMode -> Instruction Source #
plx :: AddressingMode -> Instruction Source #
ply :: AddressingMode -> Instruction Source #
rmb0 :: AddressingMode -> Instruction Source #
rmb1 :: AddressingMode -> Instruction Source #
rmb2 :: AddressingMode -> Instruction Source #
rmb3 :: AddressingMode -> Instruction Source #
rmb4 :: AddressingMode -> Instruction Source #
rmb5 :: AddressingMode -> Instruction Source #
rmb6 :: AddressingMode -> Instruction Source #
rmb7 :: AddressingMode -> Instruction Source #
rol :: AddressingMode -> Instruction Source #
ror :: AddressingMode -> Instruction Source #
rti :: AddressingMode -> Instruction Source #
rts :: AddressingMode -> Instruction Source #
sbc :: AddressingMode -> Instruction Source #
sec :: AddressingMode -> Instruction Source #
sed :: AddressingMode -> Instruction Source #
sei :: AddressingMode -> Instruction Source #
smb0 :: AddressingMode -> Instruction Source #
smb1 :: AddressingMode -> Instruction Source #
smb2 :: AddressingMode -> Instruction Source #
smb3 :: AddressingMode -> Instruction Source #
smb4 :: AddressingMode -> Instruction Source #
smb5 :: AddressingMode -> Instruction Source #
smb6 :: AddressingMode -> Instruction Source #
smb7 :: AddressingMode -> Instruction Source #
sta :: AddressingMode -> Instruction Source #
stp :: AddressingMode -> Instruction Source #
stx :: AddressingMode -> Instruction Source #
sty :: AddressingMode -> Instruction Source #
stz :: AddressingMode -> Instruction Source #
tax :: AddressingMode -> Instruction Source #
tay :: AddressingMode -> Instruction Source #
trb :: AddressingMode -> Instruction Source #
tsb :: AddressingMode -> Instruction Source #
tsx :: AddressingMode -> Instruction Source #
txa :: AddressingMode -> Instruction Source #
txs :: AddressingMode -> Instruction Source #
tya :: AddressingMode -> Instruction Source #
wai :: AddressingMode -> Instruction Source #