hevm-0.16: Ethereum virtual machine evaluator

Safe HaskellNone
LanguageHaskell2010

EVM.ABI

Documentation

data AbiValue Source #

Instances

Eq AbiValue Source # 
Ord AbiValue Source # 
Read AbiValue Source # 
Show AbiValue Source # 
Generic AbiValue Source # 

Associated Types

type Rep AbiValue :: * -> * #

Methods

from :: AbiValue -> Rep AbiValue x #

to :: Rep AbiValue x -> AbiValue #

Arbitrary AbiValue Source # 
type Rep AbiValue Source # 
type Rep AbiValue = D1 * (MetaData "AbiValue" "EVM.ABI" "hevm-0.16-5a74lCQx1KPFycEOS1YSBh" False) ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "AbiUInt" PrefixI False) ((:*:) * (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * Int)) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * Word256)))) (C1 * (MetaCons "AbiInt" PrefixI False) ((:*:) * (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * Int)) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * Int256))))) ((:+:) * (C1 * (MetaCons "AbiAddress" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * Word160))) (C1 * (MetaCons "AbiBool" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * Bool))))) ((:+:) * ((:+:) * (C1 * (MetaCons "AbiBytes" PrefixI False) ((:*:) * (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * Int)) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * ByteString)))) (C1 * (MetaCons "AbiBytesDynamic" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * ByteString)))) ((:+:) * (C1 * (MetaCons "AbiString" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * ByteString))) ((:+:) * (C1 * (MetaCons "AbiArrayDynamic" PrefixI False) ((:*:) * (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * AbiType)) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * (Vector AbiValue))))) (C1 * (MetaCons "AbiArray" PrefixI False) ((:*:) * (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * Int)) ((:*:) * (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * AbiType)) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 * (Vector AbiValue))))))))))

data AbiType Source #

Instances

Eq AbiType Source # 

Methods

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

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

Ord AbiType Source # 
Read AbiType Source # 
Show AbiType Source # 
Generic AbiType Source # 

Associated Types

type Rep AbiType :: * -> * #

Methods

from :: AbiType -> Rep AbiType x #

to :: Rep AbiType x -> AbiType #

Arbitrary AbiType Source # 
type Rep AbiType Source # 

data Anonymity Source #

Constructors

Anonymous 
NotAnonymous 

Instances

Eq Anonymity Source # 
Ord Anonymity Source # 
Show Anonymity Source # 
Generic Anonymity Source # 

Associated Types

type Rep Anonymity :: * -> * #

type Rep Anonymity Source # 
type Rep Anonymity = D1 * (MetaData "Anonymity" "EVM.ABI" "hevm-0.16-5a74lCQx1KPFycEOS1YSBh" False) ((:+:) * (C1 * (MetaCons "Anonymous" PrefixI False) (U1 *)) (C1 * (MetaCons "NotAnonymous" PrefixI False) (U1 *)))

data Indexed Source #

Constructors

Indexed 
NotIndexed 

Instances

Eq Indexed Source # 

Methods

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

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

Ord Indexed Source # 
Show Indexed Source # 
Generic Indexed Source # 

Associated Types

type Rep Indexed :: * -> * #

Methods

from :: Indexed -> Rep Indexed x #

to :: Rep Indexed x -> Indexed #

type Rep Indexed Source # 
type Rep Indexed = D1 * (MetaData "Indexed" "EVM.ABI" "hevm-0.16-5a74lCQx1KPFycEOS1YSBh" False) ((:+:) * (C1 * (MetaCons "Indexed" PrefixI False) (U1 *)) (C1 * (MetaCons "NotIndexed" PrefixI False) (U1 *)))