huckleberry-0.9.0.0: haskell EDSL Huckleberry

Safe HaskellNone
LanguageHaskell2010

Language.Huckleberry.V10101

Documentation

translate :: Code () -> String Source

pre :: Expr Int16 -> Expr Int16 Source

label :: Int16 -> Code () -> Code () Source

ifThenElse :: Expr Int16 -> Code () -> Code () -> Code () Source

ifThen :: Expr Int16 -> Code () -> Code () Source

forStepNext :: Expr Int16 -> Expr Int16 -> Expr Int16 -> Expr Int16 -> Code () -> Code () Source

forNext :: Expr Int16 -> Expr Int16 -> Expr Int16 -> Code () -> Code () Source

a :: Expr Int16 Source

b :: Expr Int16 Source

c :: Expr Int16 Source

d :: Expr Int16 Source

e :: Expr Int16 Source

f :: Expr Int16 Source

g :: Expr Int16 Source

h :: Expr Int16 Source

i :: Expr Int16 Source

j :: Expr Int16 Source

k :: Expr Int16 Source

l :: Expr Int16 Source

m :: Expr Int16 Source

n :: Expr Int16 Source

o :: Expr Int16 Source

p :: Expr Int16 Source

q :: Expr Int16 Source

r :: Expr Int16 Source

s :: Expr Int16 Source

t :: Expr Int16 Source

u :: Expr Int16 Source

v :: Expr Int16 Source

w :: Expr Int16 Source

x :: Expr Int16 Source

y :: Expr Int16 Source

z :: Expr Int16 Source

arr :: Expr Int16 -> Expr Int16 Source

let' :: Expr Int16 -> [Expr Int16] -> Code () Source

(=:) :: Expr Int16 -> Expr Int16 -> Code () infix 2 Source

print :: Show r => Expr r -> Code () Source

(++) :: (Show a, Show b, IsString c) => Expr a -> Expr b -> Expr c infixl 2 Source

led :: Expr Int16 -> Code () Source

wait :: Expr Int16 -> Code () Source

run :: Code () Source

list :: Expr Int16 -> Expr Int16 -> Code () Source

list' :: Code () Source

goto :: Expr Int16 -> Code () Source

end :: Code () Source

btn :: Expr Int16 -> Expr Int16 Source

new :: Code () Source

locate :: Expr Int16 -> Expr Int16 -> Code () Source

cls :: Code () Source

rnd :: Expr Int16 -> Expr Int16 Source

save :: Expr Int16 -> Code () Source

save' :: Code () Source

load :: Expr Int16 -> Code () Source

load' :: Code () Source

files :: Expr Int16 -> Code () Source

beep :: Expr Int16 -> Expr Int16 -> Code () Source

beep' :: Code () Source

play :: String -> Code () Source

play' :: Code () Source

tempo :: Expr Int16 -> Code () Source

(+) :: Expr Int16 -> Expr Int16 -> Expr Int16 infixl 6 Source

(-) :: Expr Int16 -> Expr Int16 -> Expr Int16 infixl 6 Source

(*) :: Expr Int16 -> Expr Int16 -> Expr Int16 infixl 7 Source

(/) :: Expr Int16 -> Expr Int16 -> Expr Int16 infixl 7 Source

(%) :: Expr Int16 -> Expr Int16 -> Expr Int16 infixl 7 Source

input :: String -> Expr Int16 -> Code () Source

tick :: Expr Int16 Source

clt :: Code () Source

chr :: Expr Int16 -> Expr String Source

chr' :: [Expr Int16] -> Expr String Source

asc :: String -> Expr Int16 Source

scroll :: Expr Int16 -> Code () Source

scr :: Expr Int16 -> Expr Int16 -> Expr Int16 Source

scr' :: Expr Int16 Source

vpeek :: Expr Int16 -> Expr Int16 -> Expr Int16 Source

(==) :: Expr Int16 -> Expr Int16 -> Expr Int16 infix 5 Source

(/=) :: Expr Int16 -> Expr Int16 -> Expr Int16 infix 5 Source

(>=) :: Expr Int16 -> Expr Int16 -> Expr Int16 infix 5 Source

(>) :: Expr Int16 -> Expr Int16 -> Expr Int16 infix 5 Source

(<=) :: Expr Int16 -> Expr Int16 -> Expr Int16 infix 5 Source

(<) :: Expr Int16 -> Expr Int16 -> Expr Int16 infix 5 Source

(&&) :: Expr Int16 -> Expr Int16 -> Expr Int16 infixr 4 Source

(||) :: Expr Int16 -> Expr Int16 -> Expr Int16 infixr 3 Source

not :: Expr Int16 -> Expr Int16 Source

clv :: Code () Source

clear :: Code () Source

clk :: Code () Source

abs :: Expr Int16 -> Expr Int16 Source

gosub :: Expr Int16 -> Code () Source

return :: Code () Source

free :: Expr Int16 Source

ver :: Expr Int16 Source

renum :: Expr Int16 -> Code () Source

renum' :: Code () Source

lrun :: Expr Int16 -> Code () Source

file :: Expr Int16 Source

sleep :: Code () Source

video :: Expr Int16 -> Code () Source

peek :: Expr Int16 -> Expr Int16 Source

poke :: Expr Int16 -> Expr Int16 -> Code () Source

clp :: Code () Source

help :: Code () Source

ana :: Expr Int16 -> Expr Int16 Source

out :: Expr Int16 -> Expr Int16 -> Code () Source

out' :: Expr Int16 -> Code () Source

in' :: Expr Int16 -> Expr Int16 Source

in'' :: Expr Int16 Source

hex :: Expr Int16 -> Expr Int16 -> Expr String Source

hex' :: Expr Int16 -> Expr String Source

bin :: Expr Int16 -> Expr Int16 -> Expr String Source

bin' :: Expr Int16 -> Expr String Source

(.&.) :: Expr Int16 -> Expr Int16 -> Expr Int16 infixl 7 Source

(.|.) :: Expr Int16 -> Expr Int16 -> Expr Int16 infixl 6 Source

xor :: Expr Int16 -> Expr Int16 -> Expr Int16 infixl 7 Source

shiftR :: Expr Int16 -> Expr Int16 -> Expr Int16 infixl 7 Source

shiftL :: Expr Int16 -> Expr Int16 -> Expr Int16 infixl 7 Source

complement :: Expr Int16 -> Expr Int16 Source

bps :: Expr Int16 -> Code () Source

i2cr :: Expr Int16 -> Expr Int16 -> Expr Int16 -> Expr Int16 -> Expr Int16 -> Expr Int16 Source

i2cw :: Expr Int16 -> Expr Int16 -> Expr Int16 -> Expr Int16 -> Expr Int16 -> Expr Int16 Source

usr :: Expr Int16 -> Expr Int16 -> Expr Int16 Source