wasm-1.1.1: WebAssembly Language Toolkit and Interpreter
Safe HaskellSafe-Inferred
LanguageHaskell2010

Language.Wasm.Structure

Documentation

data Module Source #

Instances

Instances details
Eq Module Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

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

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

Show Module Source # 
Instance details

Defined in Language.Wasm.Structure

Generic Module Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep Module :: Type -> Type #

Methods

from :: Module -> Rep Module x #

to :: Rep Module x -> Module #

Serialize Module Source # 
Instance details

Defined in Language.Wasm.Binary

NFData Module Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: Module -> () #

type Rep Module Source # 
Instance details

Defined in Language.Wasm.Structure

data DataSegment Source #

Instances

Instances details
Eq DataSegment Source # 
Instance details

Defined in Language.Wasm.Structure

Show DataSegment Source # 
Instance details

Defined in Language.Wasm.Structure

Generic DataSegment Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep DataSegment :: Type -> Type #

Serialize DataSegment Source # 
Instance details

Defined in Language.Wasm.Binary

NFData DataSegment Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: DataSegment -> () #

type Rep DataSegment Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep DataSegment = D1 ('MetaData "DataSegment" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "DataSegment" 'PrefixI 'True) (S1 ('MetaSel ('Just "memIndex") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemoryIndex) :*: (S1 ('MetaSel ('Just "offset") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Expression) :*: S1 ('MetaSel ('Just "chunk") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString))))

data ElemSegment Source #

Instances

Instances details
Eq ElemSegment Source # 
Instance details

Defined in Language.Wasm.Structure

Show ElemSegment Source # 
Instance details

Defined in Language.Wasm.Structure

Generic ElemSegment Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep ElemSegment :: Type -> Type #

Serialize ElemSegment Source # 
Instance details

Defined in Language.Wasm.Binary

NFData ElemSegment Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: ElemSegment -> () #

type Rep ElemSegment Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep ElemSegment = D1 ('MetaData "ElemSegment" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "ElemSegment" 'PrefixI 'True) (S1 ('MetaSel ('Just "tableIndex") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TableIndex) :*: (S1 ('MetaSel ('Just "offset") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Expression) :*: S1 ('MetaSel ('Just "funcIndexes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FuncIndex]))))

data StartFunction Source #

Constructors

StartFunction FuncIndex 

Instances

Instances details
Eq StartFunction Source # 
Instance details

Defined in Language.Wasm.Structure

Show StartFunction Source # 
Instance details

Defined in Language.Wasm.Structure

Generic StartFunction Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep StartFunction :: Type -> Type #

NFData StartFunction Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: StartFunction -> () #

type Rep StartFunction Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep StartFunction = D1 ('MetaData "StartFunction" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "StartFunction" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FuncIndex)))

data Export Source #

Constructors

Export 

Fields

Instances

Instances details
Eq Export Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

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

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

Show Export Source # 
Instance details

Defined in Language.Wasm.Structure

Generic Export Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep Export :: Type -> Type #

Methods

from :: Export -> Rep Export x #

to :: Rep Export x -> Export #

Serialize Export Source # 
Instance details

Defined in Language.Wasm.Binary

NFData Export Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: Export -> () #

type Rep Export Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep Export = D1 ('MetaData "Export" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "Export" 'PrefixI 'True) (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "desc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ExportDesc)))

data ExportDesc Source #

Instances

Instances details
Eq ExportDesc Source # 
Instance details

Defined in Language.Wasm.Structure

Show ExportDesc Source # 
Instance details

Defined in Language.Wasm.Structure

Generic ExportDesc Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep ExportDesc :: Type -> Type #

Serialize ExportDesc Source # 
Instance details

Defined in Language.Wasm.Binary

NFData ExportDesc Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: ExportDesc -> () #

type Rep ExportDesc Source # 
Instance details

Defined in Language.Wasm.Structure

data Table Source #

Constructors

Table TableType 

Instances

Instances details
Eq Table Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: Table -> Table -> Bool #

(/=) :: Table -> Table -> Bool #

Show Table Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

showsPrec :: Int -> Table -> ShowS #

show :: Table -> String #

showList :: [Table] -> ShowS #

Generic Table Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep Table :: Type -> Type #

Methods

from :: Table -> Rep Table x #

to :: Rep Table x -> Table #

Serialize Table Source # 
Instance details

Defined in Language.Wasm.Binary

Methods

put :: Putter Table #

get :: Get Table #

NFData Table Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: Table -> () #

type Rep Table Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep Table = D1 ('MetaData "Table" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "Table" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TableType)))

data Memory Source #

Constructors

Memory Limit 

Instances

Instances details
Eq Memory Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: Memory -> Memory -> Bool #

(/=) :: Memory -> Memory -> Bool #

Show Memory Source # 
Instance details

Defined in Language.Wasm.Structure

Generic Memory Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep Memory :: Type -> Type #

Methods

from :: Memory -> Rep Memory x #

to :: Rep Memory x -> Memory #

Serialize Memory Source # 
Instance details

Defined in Language.Wasm.Binary

NFData Memory Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: Memory -> () #

type Rep Memory Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep Memory = D1 ('MetaData "Memory" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "Memory" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Limit)))

data Global Source #

Constructors

Global 

Instances

Instances details
Eq Global Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

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

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

Show Global Source # 
Instance details

Defined in Language.Wasm.Structure

Generic Global Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep Global :: Type -> Type #

Methods

from :: Global -> Rep Global x #

to :: Rep Global x -> Global #

Serialize Global Source # 
Instance details

Defined in Language.Wasm.Binary

NFData Global Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: Global -> () #

type Rep Global Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep Global = D1 ('MetaData "Global" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "Global" 'PrefixI 'True) (S1 ('MetaSel ('Just "globalType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GlobalType) :*: S1 ('MetaSel ('Just "initializer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Expression)))

data Function Source #

Instances

Instances details
Eq Function Source # 
Instance details

Defined in Language.Wasm.Structure

Show Function Source # 
Instance details

Defined in Language.Wasm.Structure

Generic Function Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep Function :: Type -> Type #

Methods

from :: Function -> Rep Function x #

to :: Rep Function x -> Function #

Serialize Function Source # 
Instance details

Defined in Language.Wasm.Binary

NFData Function Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: Function -> () #

type Rep Function Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep Function = D1 ('MetaData "Function" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "Function" 'PrefixI 'True) (S1 ('MetaSel ('Just "funcType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TypeIndex) :*: (S1 ('MetaSel ('Just "localTypes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LocalsType) :*: S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Expression))))

data Import Source #

Constructors

Import 

Instances

Instances details
Eq Import Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: Import -> Import -> Bool #

(/=) :: Import -> Import -> Bool #

Show Import Source # 
Instance details

Defined in Language.Wasm.Structure

Generic Import Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep Import :: Type -> Type #

Methods

from :: Import -> Rep Import x #

to :: Rep Import x -> Import #

Serialize Import Source # 
Instance details

Defined in Language.Wasm.Binary

NFData Import Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: Import -> () #

type Rep Import Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep Import = D1 ('MetaData "Import" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "Import" 'PrefixI 'True) (S1 ('MetaSel ('Just "sourceModule") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "desc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ImportDesc))))

data ImportDesc Source #

Instances

Instances details
Eq ImportDesc Source # 
Instance details

Defined in Language.Wasm.Structure

Show ImportDesc Source # 
Instance details

Defined in Language.Wasm.Structure

Generic ImportDesc Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep ImportDesc :: Type -> Type #

Serialize ImportDesc Source # 
Instance details

Defined in Language.Wasm.Binary

NFData ImportDesc Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: ImportDesc -> () #

type Rep ImportDesc Source # 
Instance details

Defined in Language.Wasm.Structure

data Instruction index Source #

Instances

Instances details
Eq index => Eq (Instruction index) Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: Instruction index -> Instruction index -> Bool #

(/=) :: Instruction index -> Instruction index -> Bool #

Show index => Show (Instruction index) Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

showsPrec :: Int -> Instruction index -> ShowS #

show :: Instruction index -> String #

showList :: [Instruction index] -> ShowS #

Generic (Instruction index) Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep (Instruction index) :: Type -> Type #

Methods

from :: Instruction index -> Rep (Instruction index) x #

to :: Rep (Instruction index) x -> Instruction index #

Serialize (Instruction Natural) Source # 
Instance details

Defined in Language.Wasm.Binary

NFData index => NFData (Instruction index) Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: Instruction index -> () #

type Rep (Instruction index) Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep (Instruction index) = D1 ('MetaData "Instruction" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) ((((((C1 ('MetaCons "Unreachable" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Nop" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Block" 'PrefixI 'True) (S1 ('MetaSel ('Just "blockType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BlockType) :*: S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Expression)) :+: C1 ('MetaCons "Loop" 'PrefixI 'True) (S1 ('MetaSel ('Just "blockType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BlockType) :*: S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Expression)))) :+: ((C1 ('MetaCons "If" 'PrefixI 'True) (S1 ('MetaSel ('Just "blockType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BlockType) :*: (S1 ('MetaSel ('Just "true") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Expression) :*: S1 ('MetaSel ('Just "false") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Expression))) :+: C1 ('MetaCons "Br" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 index))) :+: (C1 ('MetaCons "BrIf" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 index)) :+: C1 ('MetaCons "BrTable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [index]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 index))))) :+: (((C1 ('MetaCons "Return" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Call" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 index))) :+: (C1 ('MetaCons "CallIndirect" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 index)) :+: C1 ('MetaCons "Drop" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Select" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GetLocal" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 index))) :+: (C1 ('MetaCons "SetLocal" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 index)) :+: (C1 ('MetaCons "TeeLocal" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 index)) :+: C1 ('MetaCons "GetGlobal" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 index))))))) :+: ((((C1 ('MetaCons "SetGlobal" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 index)) :+: C1 ('MetaCons "I32Load" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg))) :+: (C1 ('MetaCons "I64Load" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)) :+: C1 ('MetaCons "F32Load" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)))) :+: ((C1 ('MetaCons "F64Load" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)) :+: C1 ('MetaCons "I32Load8S" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg))) :+: (C1 ('MetaCons "I32Load8U" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)) :+: C1 ('MetaCons "I32Load16S" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg))))) :+: (((C1 ('MetaCons "I32Load16U" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)) :+: C1 ('MetaCons "I64Load8S" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg))) :+: (C1 ('MetaCons "I64Load8U" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)) :+: C1 ('MetaCons "I64Load16S" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)))) :+: ((C1 ('MetaCons "I64Load16U" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)) :+: C1 ('MetaCons "I64Load32S" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg))) :+: (C1 ('MetaCons "I64Load32U" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)) :+: (C1 ('MetaCons "I32Store" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)) :+: C1 ('MetaCons "I64Store" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)))))))) :+: (((((C1 ('MetaCons "F32Store" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)) :+: C1 ('MetaCons "F64Store" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg))) :+: (C1 ('MetaCons "I32Store8" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)) :+: C1 ('MetaCons "I32Store16" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)))) :+: ((C1 ('MetaCons "I64Store8" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)) :+: C1 ('MetaCons "I64Store16" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg))) :+: (C1 ('MetaCons "I64Store32" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemArg)) :+: C1 ('MetaCons "CurrentMemory" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "GrowMemory" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "I32Const" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32))) :+: (C1 ('MetaCons "I64Const" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)) :+: C1 ('MetaCons "F32Const" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Float)))) :+: ((C1 ('MetaCons "F64Const" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Double)) :+: C1 ('MetaCons "IUnOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 IUnOp))) :+: (C1 ('MetaCons "IBinOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 IBinOp)) :+: (C1 ('MetaCons "I32Eqz" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "I64Eqz" 'PrefixI 'False) (U1 :: Type -> Type)))))) :+: ((((C1 ('MetaCons "IRelOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 IRelOp)) :+: C1 ('MetaCons "FUnOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FUnOp))) :+: (C1 ('MetaCons "FBinOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FBinOp)) :+: C1 ('MetaCons "FRelOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FRelOp)))) :+: ((C1 ('MetaCons "I32WrapI64" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ITruncFU" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize))) :+: (C1 ('MetaCons "ITruncFS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize)) :+: C1 ('MetaCons "ITruncSatFU" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize))))) :+: (((C1 ('MetaCons "ITruncSatFS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize)) :+: C1 ('MetaCons "I64ExtendSI32" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "I64ExtendUI32" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FConvertIU" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize)))) :+: ((C1 ('MetaCons "FConvertIS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize)) :+: C1 ('MetaCons "F32DemoteF64" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "F64PromoteF32" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "IReinterpretF" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize)) :+: C1 ('MetaCons "FReinterpretI" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BitSize)))))))))

data MemArg Source #

Constructors

MemArg 

Fields

Instances

Instances details
Eq MemArg Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: MemArg -> MemArg -> Bool #

(/=) :: MemArg -> MemArg -> Bool #

Show MemArg Source # 
Instance details

Defined in Language.Wasm.Structure

Generic MemArg Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep MemArg :: Type -> Type #

Methods

from :: MemArg -> Rep MemArg x #

to :: Rep MemArg x -> MemArg #

Serialize MemArg Source # 
Instance details

Defined in Language.Wasm.Binary

NFData MemArg Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: MemArg -> () #

type Rep MemArg Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep MemArg = D1 ('MetaData "MemArg" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "MemArg" 'PrefixI 'True) (S1 ('MetaSel ('Just "offset") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Natural) :*: S1 ('MetaSel ('Just "align") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Natural)))

data IUnOp Source #

Instances

Instances details
Eq IUnOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: IUnOp -> IUnOp -> Bool #

(/=) :: IUnOp -> IUnOp -> Bool #

Show IUnOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

showsPrec :: Int -> IUnOp -> ShowS #

show :: IUnOp -> String #

showList :: [IUnOp] -> ShowS #

Generic IUnOp Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep IUnOp :: Type -> Type #

Methods

from :: IUnOp -> Rep IUnOp x #

to :: Rep IUnOp x -> IUnOp #

NFData IUnOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: IUnOp -> () #

type Rep IUnOp Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep IUnOp = D1 ('MetaData "IUnOp" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) ((C1 ('MetaCons "IClz" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ICtz" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IPopcnt" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "IExtend8S" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "IExtend16S" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IExtend32S" 'PrefixI 'False) (U1 :: Type -> Type))))

data IBinOp Source #

Instances

Instances details
Eq IBinOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: IBinOp -> IBinOp -> Bool #

(/=) :: IBinOp -> IBinOp -> Bool #

Show IBinOp Source # 
Instance details

Defined in Language.Wasm.Structure

Generic IBinOp Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep IBinOp :: Type -> Type #

Methods

from :: IBinOp -> Rep IBinOp x #

to :: Rep IBinOp x -> IBinOp #

NFData IBinOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: IBinOp -> () #

type Rep IBinOp Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep IBinOp = D1 ('MetaData "IBinOp" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (((C1 ('MetaCons "IAdd" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ISub" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IMul" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "IDivU" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IDivS" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "IRemU" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IRemS" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "IAnd" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IOr" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "IXor" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IShl" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "IShrU" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IShrS" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "IRotl" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IRotr" 'PrefixI 'False) (U1 :: Type -> Type)))))

data IRelOp Source #

Constructors

IEq 
INe 
ILtU 
ILtS 
IGtU 
IGtS 
ILeU 
ILeS 
IGeU 
IGeS 

Instances

Instances details
Eq IRelOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: IRelOp -> IRelOp -> Bool #

(/=) :: IRelOp -> IRelOp -> Bool #

Show IRelOp Source # 
Instance details

Defined in Language.Wasm.Structure

Generic IRelOp Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep IRelOp :: Type -> Type #

Methods

from :: IRelOp -> Rep IRelOp x #

to :: Rep IRelOp x -> IRelOp #

NFData IRelOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: IRelOp -> () #

type Rep IRelOp Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep IRelOp = D1 ('MetaData "IRelOp" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (((C1 ('MetaCons "IEq" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "INe" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ILtU" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ILtS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IGtU" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "IGtS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ILeU" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ILeS" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "IGeU" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IGeS" 'PrefixI 'False) (U1 :: Type -> Type)))))

data FUnOp Source #

Constructors

FAbs 
FNeg 
FCeil 
FFloor 
FTrunc 
FNearest 
FSqrt 

Instances

Instances details
Eq FUnOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: FUnOp -> FUnOp -> Bool #

(/=) :: FUnOp -> FUnOp -> Bool #

Show FUnOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

showsPrec :: Int -> FUnOp -> ShowS #

show :: FUnOp -> String #

showList :: [FUnOp] -> ShowS #

Generic FUnOp Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep FUnOp :: Type -> Type #

Methods

from :: FUnOp -> Rep FUnOp x #

to :: Rep FUnOp x -> FUnOp #

NFData FUnOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: FUnOp -> () #

type Rep FUnOp Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep FUnOp = D1 ('MetaData "FUnOp" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) ((C1 ('MetaCons "FAbs" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FNeg" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FCeil" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "FFloor" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FTrunc" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "FNearest" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FSqrt" 'PrefixI 'False) (U1 :: Type -> Type))))

data FBinOp Source #

Constructors

FAdd 
FSub 
FMul 
FDiv 
FMin 
FMax 
FCopySign 

Instances

Instances details
Eq FBinOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: FBinOp -> FBinOp -> Bool #

(/=) :: FBinOp -> FBinOp -> Bool #

Show FBinOp Source # 
Instance details

Defined in Language.Wasm.Structure

Generic FBinOp Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep FBinOp :: Type -> Type #

Methods

from :: FBinOp -> Rep FBinOp x #

to :: Rep FBinOp x -> FBinOp #

NFData FBinOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: FBinOp -> () #

type Rep FBinOp Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep FBinOp = D1 ('MetaData "FBinOp" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) ((C1 ('MetaCons "FAdd" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FSub" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FMul" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "FDiv" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FMin" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "FMax" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FCopySign" 'PrefixI 'False) (U1 :: Type -> Type))))

data FRelOp Source #

Constructors

FEq 
FNe 
FLt 
FGt 
FLe 
FGe 

Instances

Instances details
Eq FRelOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: FRelOp -> FRelOp -> Bool #

(/=) :: FRelOp -> FRelOp -> Bool #

Show FRelOp Source # 
Instance details

Defined in Language.Wasm.Structure

Generic FRelOp Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep FRelOp :: Type -> Type #

Methods

from :: FRelOp -> Rep FRelOp x #

to :: Rep FRelOp x -> FRelOp #

NFData FRelOp Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: FRelOp -> () #

type Rep FRelOp Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep FRelOp = D1 ('MetaData "FRelOp" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) ((C1 ('MetaCons "FEq" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FNe" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FLt" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "FGt" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FLe" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FGe" 'PrefixI 'False) (U1 :: Type -> Type))))

data BitSize Source #

Constructors

BS32 
BS64 

Instances

Instances details
Eq BitSize Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: BitSize -> BitSize -> Bool #

(/=) :: BitSize -> BitSize -> Bool #

Show BitSize Source # 
Instance details

Defined in Language.Wasm.Structure

Generic BitSize Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep BitSize :: Type -> Type #

Methods

from :: BitSize -> Rep BitSize x #

to :: Rep BitSize x -> BitSize #

NFData BitSize Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: BitSize -> () #

type Rep BitSize Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep BitSize = D1 ('MetaData "BitSize" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "BS32" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BS64" 'PrefixI 'False) (U1 :: Type -> Type))

data TableType Source #

Constructors

TableType Limit ElemType 

Instances

Instances details
Eq TableType Source # 
Instance details

Defined in Language.Wasm.Structure

Show TableType Source # 
Instance details

Defined in Language.Wasm.Structure

Generic TableType Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep TableType :: Type -> Type #

Serialize TableType Source # 
Instance details

Defined in Language.Wasm.Binary

NFData TableType Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: TableType -> () #

type Rep TableType Source # 
Instance details

Defined in Language.Wasm.Structure

data ElemType Source #

Constructors

FuncRef 

Instances

Instances details
Eq ElemType Source # 
Instance details

Defined in Language.Wasm.Structure

Show ElemType Source # 
Instance details

Defined in Language.Wasm.Structure

Generic ElemType Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep ElemType :: Type -> Type #

Methods

from :: ElemType -> Rep ElemType x #

to :: Rep ElemType x -> ElemType #

Serialize ElemType Source # 
Instance details

Defined in Language.Wasm.Binary

NFData ElemType Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: ElemType -> () #

type Rep ElemType Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep ElemType = D1 ('MetaData "ElemType" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "FuncRef" 'PrefixI 'False) (U1 :: Type -> Type))

data Limit Source #

Constructors

Limit Natural (Maybe Natural) 

Instances

Instances details
Eq Limit Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

(==) :: Limit -> Limit -> Bool #

(/=) :: Limit -> Limit -> Bool #

Show Limit Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

showsPrec :: Int -> Limit -> ShowS #

show :: Limit -> String #

showList :: [Limit] -> ShowS #

Generic Limit Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep Limit :: Type -> Type #

Methods

from :: Limit -> Rep Limit x #

to :: Rep Limit x -> Limit #

Serialize Limit Source # 
Instance details

Defined in Language.Wasm.Binary

Methods

put :: Putter Limit #

get :: Get Limit #

NFData Limit Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: Limit -> () #

type Rep Limit Source # 
Instance details

Defined in Language.Wasm.Structure

data GlobalType Source #

Constructors

Const ValueType 
Mut ValueType 

Instances

Instances details
Eq GlobalType Source # 
Instance details

Defined in Language.Wasm.Structure

Show GlobalType Source # 
Instance details

Defined in Language.Wasm.Structure

Generic GlobalType Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep GlobalType :: Type -> Type #

Serialize GlobalType Source # 
Instance details

Defined in Language.Wasm.Binary

NFData GlobalType Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: GlobalType -> () #

type Rep GlobalType Source # 
Instance details

Defined in Language.Wasm.Structure

data FuncType Source #

Constructors

FuncType 

Instances

Instances details
Eq FuncType Source # 
Instance details

Defined in Language.Wasm.Structure

Show FuncType Source # 
Instance details

Defined in Language.Wasm.Structure

Generic FuncType Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep FuncType :: Type -> Type #

Methods

from :: FuncType -> Rep FuncType x #

to :: Rep FuncType x -> FuncType #

Serialize FuncType Source # 
Instance details

Defined in Language.Wasm.Binary

NFData FuncType Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: FuncType -> () #

type Rep FuncType Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep FuncType = D1 ('MetaData "FuncType" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) (C1 ('MetaCons "FuncType" 'PrefixI 'True) (S1 ('MetaSel ('Just "params") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ParamsType) :*: S1 ('MetaSel ('Just "results") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ResultType)))

data ValueType Source #

Constructors

I32 
I64 
F32 
F64 

Instances

Instances details
Eq ValueType Source # 
Instance details

Defined in Language.Wasm.Structure

Show ValueType Source # 
Instance details

Defined in Language.Wasm.Structure

Generic ValueType Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep ValueType :: Type -> Type #

Serialize ValueType Source # 
Instance details

Defined in Language.Wasm.Binary

NFData ValueType Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: ValueType -> () #

type Rep ValueType Source # 
Instance details

Defined in Language.Wasm.Structure

type Rep ValueType = D1 ('MetaData "ValueType" "Language.Wasm.Structure" "wasm-1.1.1-inplace" 'False) ((C1 ('MetaCons "I32" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "I64" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "F32" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "F64" 'PrefixI 'False) (U1 :: Type -> Type)))

data BlockType Source #

Instances

Instances details
Eq BlockType Source # 
Instance details

Defined in Language.Wasm.Structure

Show BlockType Source # 
Instance details

Defined in Language.Wasm.Structure

Generic BlockType Source # 
Instance details

Defined in Language.Wasm.Structure

Associated Types

type Rep BlockType :: Type -> Type #

NFData BlockType Source # 
Instance details

Defined in Language.Wasm.Structure

Methods

rnf :: BlockType -> () #

type Rep BlockType Source # 
Instance details

Defined in Language.Wasm.Structure