llvm-hs-9.0.1: General purpose LLVM bindings
Safe HaskellNone
LanguageHaskell2010

LLVM.Internal.DecodeAST

Documentation

type NameMap a = Map (Ptr a) Word Source #

newtype DecodeAST a Source #

Constructors

DecodeAST 

Fields

Instances

Instances details
Monad DecodeAST Source # 
Instance details

Defined in LLVM.Internal.DecodeAST

Methods

(>>=) :: DecodeAST a -> (a -> DecodeAST b) -> DecodeAST b #

(>>) :: DecodeAST a -> DecodeAST b -> DecodeAST b #

return :: a -> DecodeAST a #

Functor DecodeAST Source # 
Instance details

Defined in LLVM.Internal.DecodeAST

Methods

fmap :: (a -> b) -> DecodeAST a -> DecodeAST b #

(<$) :: a -> DecodeAST b -> DecodeAST a #

MonadFail DecodeAST Source # 
Instance details

Defined in LLVM.Internal.DecodeAST

Methods

fail :: String -> DecodeAST a #

Applicative DecodeAST Source # 
Instance details

Defined in LLVM.Internal.DecodeAST

Methods

pure :: a -> DecodeAST a #

(<*>) :: DecodeAST (a -> b) -> DecodeAST a -> DecodeAST b #

liftA2 :: (a -> b -> c) -> DecodeAST a -> DecodeAST b -> DecodeAST c #

(*>) :: DecodeAST a -> DecodeAST b -> DecodeAST b #

(<*) :: DecodeAST a -> DecodeAST b -> DecodeAST a #

MonadIO DecodeAST Source # 
Instance details

Defined in LLVM.Internal.DecodeAST

Methods

liftIO :: IO a -> DecodeAST a #

MonadThrow DecodeAST Source # 
Instance details

Defined in LLVM.Internal.DecodeAST

Methods

throwM :: Exception e => e -> DecodeAST a #

MonadState DecodeState DecodeAST Source # 
Instance details

Defined in LLVM.Internal.DecodeAST

DecodeM DecodeAST ShortByteString MDKindID Source # 
Instance details

Defined in LLVM.Internal.Metadata

DecodeM DecodeAST FunctionAttribute FunctionAttribute Source # 
Instance details

Defined in LLVM.Internal.Attribute

DecodeM DecodeAST ParameterAttribute ParameterAttribute Source # 
Instance details

Defined in LLVM.Internal.Attribute

DecodeM DecodeAST ShortByteString (Ptr MDString) Source # 
Instance details

Defined in LLVM.Internal.Metadata

DecodeM DecodeAST Terminator (Ptr Instruction) Source # 
Instance details

Defined in LLVM.Internal.Instruction

DecodeM DecodeAST Instruction (Ptr Instruction) Source # 
Instance details

Defined in LLVM.Internal.Instruction

DecodeM DecodeAST Operand (Ptr MDValue) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST Operand (Ptr Value) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST CallableOperand (Ptr Value) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST Metadata (Ptr MetadataAsVal) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST Metadata (Ptr Metadata) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DILocation (Ptr DILocation) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIExpression (Ptr DIExpression) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIGlobalVariableExpression (Ptr DIGlobalVariableExpression) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIMacroNode (Ptr DIMacroNode) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DINode (Ptr DINode) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIObjCProperty (Ptr DIObjCProperty) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIImportedEntity (Ptr DIImportedEntity) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIEnumerator (Ptr DIEnumerator) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DISubrange (Ptr DISubrange) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIScope (Ptr DIScope) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIModule (Ptr DIModule) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DINamespace (Ptr DINamespace) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DICompileUnit (Ptr DICompileUnit) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIFile (Ptr DIFile) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DILocalScope (Ptr DILocalScope) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DISubprogram (Ptr DISubprogram) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIType (Ptr DIType) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIBasicType (Ptr DIBasicType) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DISubroutineType (Ptr DISubroutineType) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIDerivedType (Ptr DIDerivedType) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DICompositeType (Ptr DICompositeType) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DITemplateParameter (Ptr DITemplateParameter) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DILexicalBlockBase (Ptr DILexicalBlockBase) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIVariable (Ptr DIVariable) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DIGlobalVariable (Ptr DIGlobalVariable) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST DILocalVariable (Ptr DILocalVariable) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST Constant (Ptr Constant) Source # 
Instance details

Defined in LLVM.Internal.Constant

DecodeM DecodeAST InlineAssembly (Ptr InlineAsm) Source # 
Instance details

Defined in LLVM.Internal.InlineAssembly

DecodeM DecodeAST Type (Ptr Type) Source # 
Instance details

Defined in LLVM.Internal.Type

DecodeM DecodeAST Name (Ptr BasicBlock) Source # 
Instance details

Defined in LLVM.Internal.DecodeAST

DecodeM DecodeAST AttributeList (AttrSetDecoder a, a) Source # 
Instance details

Defined in LLVM.Internal.Attribute

DecodeM DecodeAST (Maybe Encoding) Encoding Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST [Maybe Metadata] (Ptr MDNode) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST a (Attribute b) => DecodeM DecodeAST [a] (AttributeSet b) Source # 
Instance details

Defined in LLVM.Internal.Attribute

DecodeM DecodeAST [Definition] (ModuleAsm CString) Source # 
Instance details

Defined in LLVM.Internal.InlineAssembly

(DecodeM DecodeAST a (Ptr b), DescendentOf MDNode b) => DecodeM DecodeAST (MDRef a) (Ptr b) Source # 
Instance details

Defined in LLVM.Internal.Operand

Methods

decodeM :: Ptr b -> DecodeAST (MDRef a) Source #

DecodeM DecodeAST (MDRef MDNode) (Ptr MDNode) Source # 
Instance details

Defined in LLVM.Internal.Operand

DecodeM DecodeAST a (Ptr Instruction) => DecodeM DecodeAST (DecodeAST (Named a)) (Ptr Instruction) Source # 
Instance details

Defined in LLVM.Internal.Instruction

DecodeM DecodeAST (ShortByteString, SelectionKind) (Ptr COMDAT) Source # 
Instance details

Defined in LLVM.Internal.Global