binaryen-0.0.6.0: Haskell bindings to binaryen
Safe HaskellNone
LanguageHaskell2010

Binaryen

Contents

Description

Global Binaryen state.

See https://github.com/WebAssembly/binaryen/blob/master/src/binaryen-c.h for API documentation.

This module is intended to be imported qualified.

Synopsis

Documentation

setColorsEnabled :: CInt -> IO () Source #

setPassArgument :: Ptr CChar -> Ptr CChar -> IO () Source #

getPassArgument :: Ptr CChar -> IO (Ptr CChar) Source #

setLowMemoryUnused :: CInt -> IO () Source #

setDebugInfo :: CInt -> IO () Source #

getDebugInfo :: IO CInt Source #

setShrinkLevel :: CInt -> IO () Source #

setOptimizeLevel :: CInt -> IO () Source #

Re-exports

data Event Source #

Instances

Instances details
Eq Event Source # 
Instance details

Defined in Binaryen.Event

Methods

(==) :: Event -> Event -> Bool

(/=) :: Event -> Event -> Bool

Show Event Source # 
Instance details

Defined in Binaryen.Event

Methods

showsPrec :: Int -> Event -> ShowS

show :: Event -> String

showList :: [Event] -> ShowS

Storable Event Source # 
Instance details

Defined in Binaryen.Event

Methods

sizeOf :: Event -> Int

alignment :: Event -> Int

peekElemOff :: Ptr Event -> Int -> IO Event

pokeElemOff :: Ptr Event -> Int -> Event -> IO ()

peekByteOff :: Ptr b -> Int -> IO Event

pokeByteOff :: Ptr b -> Int -> Event -> IO ()

peek :: Ptr Event -> IO Event

poke :: Ptr Event -> Event -> IO ()

data Export Source #

Instances

Instances details
Eq Export Source # 
Instance details

Defined in Binaryen.Export

Methods

(==) :: Export -> Export -> Bool

(/=) :: Export -> Export -> Bool

Show Export Source # 
Instance details

Defined in Binaryen.Export

Methods

showsPrec :: Int -> Export -> ShowS

show :: Export -> String

showList :: [Export] -> ShowS

Storable Export Source # 
Instance details

Defined in Binaryen.Export

Methods

sizeOf :: Export -> Int

alignment :: Export -> Int

peekElemOff :: Ptr Export -> Int -> IO Export

pokeElemOff :: Ptr Export -> Int -> Export -> IO ()

peekByteOff :: Ptr b -> Int -> IO Export

pokeByteOff :: Ptr b -> Int -> Export -> IO ()

peek :: Ptr Export -> IO Export

poke :: Ptr Export -> Export -> IO ()

data Expression Source #

Instances

Instances details
Eq Expression Source # 
Instance details

Defined in Binaryen.Expression

Methods

(==) :: Expression -> Expression -> Bool

(/=) :: Expression -> Expression -> Bool

Show Expression Source # 
Instance details

Defined in Binaryen.Expression

Methods

showsPrec :: Int -> Expression -> ShowS

show :: Expression -> String

showList :: [Expression] -> ShowS

Storable Expression Source # 
Instance details

Defined in Binaryen.Expression

Methods

sizeOf :: Expression -> Int

alignment :: Expression -> Int

peekElemOff :: Ptr Expression -> Int -> IO Expression

pokeElemOff :: Ptr Expression -> Int -> Expression -> IO ()

peekByteOff :: Ptr b -> Int -> IO Expression

pokeByteOff :: Ptr b -> Int -> Expression -> IO ()

peek :: Ptr Expression -> IO Expression

poke :: Ptr Expression -> Expression -> IO ()

data ExpressionId Source #

Instances

Instances details
Eq ExpressionId Source # 
Instance details

Defined in Binaryen.ExpressionId

Methods

(==) :: ExpressionId -> ExpressionId -> Bool

(/=) :: ExpressionId -> ExpressionId -> Bool

Show ExpressionId Source # 
Instance details

Defined in Binaryen.ExpressionId

Methods

showsPrec :: Int -> ExpressionId -> ShowS

show :: ExpressionId -> String

showList :: [ExpressionId] -> ShowS

Storable ExpressionId Source # 
Instance details

Defined in Binaryen.ExpressionId

Methods

sizeOf :: ExpressionId -> Int

alignment :: ExpressionId -> Int

peekElemOff :: Ptr ExpressionId -> Int -> IO ExpressionId

pokeElemOff :: Ptr ExpressionId -> Int -> ExpressionId -> IO ()

peekByteOff :: Ptr b -> Int -> IO ExpressionId

pokeByteOff :: Ptr b -> Int -> ExpressionId -> IO ()

peek :: Ptr ExpressionId -> IO ExpressionId

poke :: Ptr ExpressionId -> ExpressionId -> IO ()

data ExternalKind Source #

Instances

Instances details
Eq ExternalKind Source # 
Instance details

Defined in Binaryen.ExternalKind

Methods

(==) :: ExternalKind -> ExternalKind -> Bool

(/=) :: ExternalKind -> ExternalKind -> Bool

Show ExternalKind Source # 
Instance details

Defined in Binaryen.ExternalKind

Methods

showsPrec :: Int -> ExternalKind -> ShowS

show :: ExternalKind -> String

showList :: [ExternalKind] -> ShowS

Storable ExternalKind Source # 
Instance details

Defined in Binaryen.ExternalKind

Methods

sizeOf :: ExternalKind -> Int

alignment :: ExternalKind -> Int

peekElemOff :: Ptr ExternalKind -> Int -> IO ExternalKind

pokeElemOff :: Ptr ExternalKind -> Int -> ExternalKind -> IO ()

peekByteOff :: Ptr b -> Int -> IO ExternalKind

pokeByteOff :: Ptr b -> Int -> ExternalKind -> IO ()

peek :: Ptr ExternalKind -> IO ExternalKind

poke :: Ptr ExternalKind -> ExternalKind -> IO ()

data Features Source #

Instances

Instances details
Eq Features Source # 
Instance details

Defined in Binaryen.Features

Methods

(==) :: Features -> Features -> Bool

(/=) :: Features -> Features -> Bool

Show Features Source # 
Instance details

Defined in Binaryen.Features

Methods

showsPrec :: Int -> Features -> ShowS

show :: Features -> String

showList :: [Features] -> ShowS

Bits Features Source # 
Instance details

Defined in Binaryen.Features

Storable Features Source # 
Instance details

Defined in Binaryen.Features

Methods

sizeOf :: Features -> Int

alignment :: Features -> Int

peekElemOff :: Ptr Features -> Int -> IO Features

pokeElemOff :: Ptr Features -> Int -> Features -> IO ()

peekByteOff :: Ptr b -> Int -> IO Features

pokeByteOff :: Ptr b -> Int -> Features -> IO ()

peek :: Ptr Features -> IO Features

poke :: Ptr Features -> Features -> IO ()

data Function Source #

Instances

Instances details
Eq Function Source # 
Instance details

Defined in Binaryen.Function

Methods

(==) :: Function -> Function -> Bool

(/=) :: Function -> Function -> Bool

Show Function Source # 
Instance details

Defined in Binaryen.Function

Methods

showsPrec :: Int -> Function -> ShowS

show :: Function -> String

showList :: [Function] -> ShowS

Storable Function Source # 
Instance details

Defined in Binaryen.Function

Methods

sizeOf :: Function -> Int

alignment :: Function -> Int

peekElemOff :: Ptr Function -> Int -> IO Function

pokeElemOff :: Ptr Function -> Int -> Function -> IO ()

peekByteOff :: Ptr b -> Int -> IO Function

pokeByteOff :: Ptr b -> Int -> Function -> IO ()

peek :: Ptr Function -> IO Function

poke :: Ptr Function -> Function -> IO ()

data Global Source #

Instances

Instances details
Eq Global Source # 
Instance details

Defined in Binaryen.Global

Methods

(==) :: Global -> Global -> Bool

(/=) :: Global -> Global -> Bool

Show Global Source # 
Instance details

Defined in Binaryen.Global

Methods

showsPrec :: Int -> Global -> ShowS

show :: Global -> String

showList :: [Global] -> ShowS

Storable Global Source # 
Instance details

Defined in Binaryen.Global

Methods

sizeOf :: Global -> Int

alignment :: Global -> Int

peekElemOff :: Ptr Global -> Int -> IO Global

pokeElemOff :: Ptr Global -> Int -> Global -> IO ()

peekByteOff :: Ptr b -> Int -> IO Global

pokeByteOff :: Ptr b -> Int -> Global -> IO ()

peek :: Ptr Global -> IO Global

poke :: Ptr Global -> Global -> IO ()

data Index Source #

Instances

Instances details
Enum Index Source # 
Instance details

Defined in Binaryen.Index

Eq Index Source # 
Instance details

Defined in Binaryen.Index

Methods

(==) :: Index -> Index -> Bool

(/=) :: Index -> Index -> Bool

Integral Index Source # 
Instance details

Defined in Binaryen.Index

Methods

quot :: Index -> Index -> Index

rem :: Index -> Index -> Index

div :: Index -> Index -> Index

mod :: Index -> Index -> Index

quotRem :: Index -> Index -> (Index, Index)

divMod :: Index -> Index -> (Index, Index)

toInteger :: Index -> Integer

Num Index Source # 
Instance details

Defined in Binaryen.Index

Methods

(+) :: Index -> Index -> Index

(-) :: Index -> Index -> Index

(*) :: Index -> Index -> Index

negate :: Index -> Index

abs :: Index -> Index

signum :: Index -> Index

fromInteger :: Integer -> Index

Ord Index Source # 
Instance details

Defined in Binaryen.Index

Methods

compare :: Index -> Index -> Ordering

(<) :: Index -> Index -> Bool

(<=) :: Index -> Index -> Bool

(>) :: Index -> Index -> Bool

(>=) :: Index -> Index -> Bool

max :: Index -> Index -> Index

min :: Index -> Index -> Index

Real Index Source # 
Instance details

Defined in Binaryen.Index

Methods

toRational :: Index -> Rational

Show Index Source # 
Instance details

Defined in Binaryen.Index

Methods

showsPrec :: Int -> Index -> ShowS

show :: Index -> String

showList :: [Index] -> ShowS

Storable Index Source # 
Instance details

Defined in Binaryen.Index

Methods

sizeOf :: Index -> Int

alignment :: Index -> Int

peekElemOff :: Ptr Index -> Int -> IO Index

pokeElemOff :: Ptr Index -> Int -> Index -> IO ()

peekByteOff :: Ptr b -> Int -> IO Index

pokeByteOff :: Ptr b -> Int -> Index -> IO ()

peek :: Ptr Index -> IO Index

poke :: Ptr Index -> Index -> IO ()

data Module Source #

Instances

Instances details
Eq Module Source # 
Instance details

Defined in Binaryen.Module

Methods

(==) :: Module -> Module -> Bool

(/=) :: Module -> Module -> Bool

Show Module Source # 
Instance details

Defined in Binaryen.Module

Methods

showsPrec :: Int -> Module -> ShowS

show :: Module -> String

showList :: [Module] -> ShowS

Storable Module Source # 
Instance details

Defined in Binaryen.Module

Methods

sizeOf :: Module -> Int

alignment :: Module -> Int

peekElemOff :: Ptr Module -> Int -> IO Module

pokeElemOff :: Ptr Module -> Int -> Module -> IO ()

peekByteOff :: Ptr b -> Int -> IO Module

pokeByteOff :: Ptr b -> Int -> Module -> IO ()

peek :: Ptr Module -> IO Module

poke :: Ptr Module -> Module -> IO ()

data Op Source #

Instances

Instances details
Eq Op Source # 
Instance details

Defined in Binaryen.Op

Methods

(==) :: Op -> Op -> Bool

(/=) :: Op -> Op -> Bool

Show Op Source # 
Instance details

Defined in Binaryen.Op

Methods

showsPrec :: Int -> Op -> ShowS

show :: Op -> String

showList :: [Op] -> ShowS

Storable Op Source # 
Instance details

Defined in Binaryen.Op

Methods

sizeOf :: Op -> Int

alignment :: Op -> Int

peekElemOff :: Ptr Op -> Int -> IO Op

pokeElemOff :: Ptr Op -> Int -> Op -> IO ()

peekByteOff :: Ptr b -> Int -> IO Op

pokeByteOff :: Ptr b -> Int -> Op -> IO ()

peek :: Ptr Op -> IO Op

poke :: Ptr Op -> Op -> IO ()

data Relooper Source #

Instances

Instances details
Eq Relooper Source # 
Instance details

Defined in Binaryen.Relooper

Methods

(==) :: Relooper -> Relooper -> Bool

(/=) :: Relooper -> Relooper -> Bool

Show Relooper Source # 
Instance details

Defined in Binaryen.Relooper

Methods

showsPrec :: Int -> Relooper -> ShowS

show :: Relooper -> String

showList :: [Relooper] -> ShowS

Storable Relooper Source # 
Instance details

Defined in Binaryen.Relooper

Methods

sizeOf :: Relooper -> Int

alignment :: Relooper -> Int

peekElemOff :: Ptr Relooper -> Int -> IO Relooper

pokeElemOff :: Ptr Relooper -> Int -> Relooper -> IO ()

peekByteOff :: Ptr b -> Int -> IO Relooper

pokeByteOff :: Ptr b -> Int -> Relooper -> IO ()

peek :: Ptr Relooper -> IO Relooper

poke :: Ptr Relooper -> Relooper -> IO ()

data RelooperBlock Source #

Instances

Instances details
Eq RelooperBlock Source # 
Instance details

Defined in Binaryen.Relooper

Show RelooperBlock Source # 
Instance details

Defined in Binaryen.Relooper

Methods

showsPrec :: Int -> RelooperBlock -> ShowS

show :: RelooperBlock -> String

showList :: [RelooperBlock] -> ShowS

data SideEffects Source #

Instances

Instances details
Eq SideEffects Source # 
Instance details

Defined in Binaryen.SideEffects

Methods

(==) :: SideEffects -> SideEffects -> Bool

(/=) :: SideEffects -> SideEffects -> Bool

Show SideEffects Source # 
Instance details

Defined in Binaryen.SideEffects

Methods

showsPrec :: Int -> SideEffects -> ShowS

show :: SideEffects -> String

showList :: [SideEffects] -> ShowS

Storable SideEffects Source # 
Instance details

Defined in Binaryen.SideEffects

Methods

sizeOf :: SideEffects -> Int

alignment :: SideEffects -> Int

peekElemOff :: Ptr SideEffects -> Int -> IO SideEffects

pokeElemOff :: Ptr SideEffects -> Int -> SideEffects -> IO ()

peekByteOff :: Ptr b -> Int -> IO SideEffects

pokeByteOff :: Ptr b -> Int -> SideEffects -> IO ()

peek :: Ptr SideEffects -> IO SideEffects

poke :: Ptr SideEffects -> SideEffects -> IO ()

data Type Source #

Instances

Instances details
Eq Type Source # 
Instance details

Defined in Binaryen.Type

Methods

(==) :: Type -> Type -> Bool

(/=) :: Type -> Type -> Bool

Show Type Source # 
Instance details

Defined in Binaryen.Type

Methods

showsPrec :: Int -> Type -> ShowS

show :: Type -> String

showList :: [Type] -> ShowS

Storable Type Source # 
Instance details

Defined in Binaryen.Type

Methods

sizeOf :: Type -> Int

alignment :: Type -> Int

peekElemOff :: Ptr Type -> Int -> IO Type

pokeElemOff :: Ptr Type -> Int -> Type -> IO ()

peekByteOff :: Ptr b -> Int -> IO Type

pokeByteOff :: Ptr b -> Int -> Type -> IO ()

peek :: Ptr Type -> IO Type

poke :: Ptr Type -> Type -> IO ()