Safe Haskell | None |
---|---|
Language | Haskell2010 |
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
- areColorsEnabled :: IO CInt
- setColorsEnabled :: CInt -> IO ()
- setOneCallerInlineMaxSize :: Index -> IO ()
- getOneCallerInlineMaxSize :: IO Index
- setFlexibleInlineMaxSize :: Index -> IO ()
- getFlexibleInlineMaxSize :: IO Index
- setAlwaysInlineMaxSize :: Index -> IO ()
- getAlwaysInlineMaxSize :: IO Index
- clearPassArguments :: IO ()
- setPassArgument :: Ptr CChar -> Ptr CChar -> IO ()
- getPassArgument :: Ptr CChar -> IO (Ptr CChar)
- setLowMemoryUnused :: CInt -> IO ()
- getLowMemoryUnused :: IO CInt
- setDebugInfo :: CInt -> IO ()
- getDebugInfo :: IO CInt
- setShrinkLevel :: CInt -> IO ()
- getShrinkLevel :: IO CInt
- setOptimizeLevel :: CInt -> IO ()
- getOptimizeLevel :: IO CInt
- data Event
- data Export
- data Expression
- data ExpressionId
- data ExternalKind
- data Features
- data Function
- data Global
- data Index
- data Module
- data Op
- data Relooper
- data RelooperBlock
- data SideEffects
- data Type
Documentation
setColorsEnabled :: CInt -> IO () Source #
setOneCallerInlineMaxSize :: Index -> IO () Source #
setFlexibleInlineMaxSize :: Index -> IO () Source #
setAlwaysInlineMaxSize :: Index -> IO () Source #
clearPassArguments :: IO () Source #
setLowMemoryUnused :: CInt -> IO () Source #
setDebugInfo :: CInt -> IO () Source #
getDebugInfo :: IO CInt Source #
setShrinkLevel :: CInt -> IO () Source #
getShrinkLevel :: IO CInt Source #
setOptimizeLevel :: CInt -> IO () Source #
Re-exports
Instances
Eq Event Source # | |
Show Event Source # | |
Storable Event Source # | |
Instances
Eq Export Source # | |
Show Export Source # | |
Storable Export Source # | |
data Expression Source #
Instances
Eq Expression Source # | |
Defined in Binaryen.Expression | |
Show Expression Source # | |
Defined in Binaryen.Expression Methods showsPrec :: Int -> Expression -> ShowS # show :: Expression -> String # showList :: [Expression] -> ShowS # | |
Storable Expression Source # | |
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
Eq ExpressionId Source # | |
Defined in Binaryen.ExpressionId | |
Show ExpressionId Source # | |
Defined in Binaryen.ExpressionId Methods showsPrec :: Int -> ExpressionId -> ShowS # show :: ExpressionId -> String # showList :: [ExpressionId] -> ShowS # | |
Storable ExpressionId Source # | |
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
Eq ExternalKind Source # | |
Defined in Binaryen.ExternalKind | |
Show ExternalKind Source # | |
Defined in Binaryen.ExternalKind Methods showsPrec :: Int -> ExternalKind -> ShowS # show :: ExternalKind -> String # showList :: [ExternalKind] -> ShowS # | |
Storable ExternalKind Source # | |
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 () # |
Instances
Eq Features Source # | |
Show Features Source # | |
Storable Features Source # | |
Defined in Binaryen.Features | |
Bits Features Source # | |
Defined in Binaryen.Features Methods (.&.) :: Features -> Features -> Features # (.|.) :: Features -> Features -> Features # xor :: Features -> Features -> Features # complement :: Features -> Features # shift :: Features -> Int -> Features # rotate :: Features -> Int -> Features # setBit :: Features -> Int -> Features # clearBit :: Features -> Int -> Features # complementBit :: Features -> Int -> Features # testBit :: Features -> Int -> Bool # bitSizeMaybe :: Features -> Maybe Int # isSigned :: Features -> Bool # shiftL :: Features -> Int -> Features # unsafeShiftL :: Features -> Int -> Features # shiftR :: Features -> Int -> Features # unsafeShiftR :: Features -> Int -> Features # rotateL :: Features -> Int -> Features # |
Instances
Eq Function Source # | |
Show Function Source # | |
Storable Function Source # | |
Defined in Binaryen.Function |
Instances
Eq Global Source # | |
Show Global Source # | |
Storable Global Source # | |
Instances
Eq Index Source # | |
Num Index Source # | |
Show Index Source # | |
Storable Index Source # | |
Instances
Eq Module Source # | |
Show Module Source # | |
Storable Module Source # | |
Instances
Eq Relooper Source # | |
Show Relooper Source # | |
Storable Relooper Source # | |
Defined in Binaryen.Relooper |
data RelooperBlock Source #
Instances
Eq RelooperBlock Source # | |
Defined in Binaryen.Relooper Methods (==) :: RelooperBlock -> RelooperBlock -> Bool # (/=) :: RelooperBlock -> RelooperBlock -> Bool # | |
Show RelooperBlock Source # | |
Defined in Binaryen.Relooper Methods showsPrec :: Int -> RelooperBlock -> ShowS # show :: RelooperBlock -> String # showList :: [RelooperBlock] -> ShowS # |
data SideEffects Source #
Instances
Eq SideEffects Source # | |
Defined in Binaryen.SideEffects | |
Show SideEffects Source # | |
Defined in Binaryen.SideEffects Methods showsPrec :: Int -> SideEffects -> ShowS # show :: SideEffects -> String # showList :: [SideEffects] -> ShowS # | |
Storable SideEffects Source # | |
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 () # |