llvm-hs-pretty-0.9.0.0: A pretty printer for LLVM IR.

Safe HaskellNone
LanguageHaskell2010

LLVM.Pretty

Contents

Synopsis

Documentation

ppllvm :: Module -> Text Source #

Pretty print a LLVM module

ppll :: Pretty a => a -> Text Source #

Pretty print a printable LLVM expression

Orphan instances

Pretty ShortByteString Source # 
Instance details

Pretty Definition Source # 
Instance details

Methods

pretty :: Definition -> Doc ann #

prettyList :: [Definition] -> Doc ann #

Pretty Module Source # 
Instance details

Methods

pretty :: Module -> Doc ann #

prettyList :: [Module] -> Doc ann #

Pretty Global Source # 
Instance details

Methods

pretty :: Global -> Doc ann #

prettyList :: [Global] -> Doc ann #

Pretty Parameter Source # 
Instance details

Methods

pretty :: Parameter -> Doc ann #

prettyList :: [Parameter] -> Doc ann #

Pretty BasicBlock Source # 
Instance details

Methods

pretty :: BasicBlock -> Doc ann #

prettyList :: [BasicBlock] -> Doc ann #

Pretty UnnamedAddr Source # 
Instance details

Methods

pretty :: UnnamedAddr -> Doc ann #

prettyList :: [UnnamedAddr] -> Doc ann #

Pretty Terminator Source # 
Instance details

Methods

pretty :: Terminator -> Doc ann #

prettyList :: [Terminator] -> Doc ann #

Pretty MemoryOrdering Source # 
Instance details

Methods

pretty :: MemoryOrdering -> Doc ann #

prettyList :: [MemoryOrdering] -> Doc ann #

Pretty SynchronizationScope Source # 
Instance details

Pretty LandingPadClause Source # 
Instance details

Pretty Instruction Source # 
Instance details

Methods

pretty :: Instruction -> Doc ann #

prettyList :: [Instruction] -> Doc ann #

Pretty Operand Source # 
Instance details

Methods

pretty :: Operand -> Doc ann #

prettyList :: [Operand] -> Doc ann #

Pretty CallableOperand Source # 
Instance details

Pretty Metadata Source # 
Instance details

Methods

pretty :: Metadata -> Doc ann #

prettyList :: [Metadata] -> Doc ann #

Pretty MetadataNodeID Source # 
Instance details

Methods

pretty :: MetadataNodeID -> Doc ann #

prettyList :: [MetadataNodeID] -> Doc ann #

Pretty MDNode Source # 
Instance details

Methods

pretty :: MDNode -> Doc ann #

prettyList :: [MDNode] -> Doc ann #

Pretty DILocation Source # 
Instance details

Methods

pretty :: DILocation -> Doc ann #

prettyList :: [DILocation] -> Doc ann #

Pretty DIExpression Source # 
Instance details

Methods

pretty :: DIExpression -> Doc ann #

prettyList :: [DIExpression] -> Doc ann #

Pretty DIGlobalVariableExpression Source # 
Instance details

Pretty DIFlag Source # 
Instance details

Methods

pretty :: DIFlag -> Doc ann #

prettyList :: [DIFlag] -> Doc ann #

Pretty DIMacroInfo Source # 
Instance details

Methods

pretty :: DIMacroInfo -> Doc ann #

prettyList :: [DIMacroInfo] -> Doc ann #

Pretty DIMacroNode Source # 
Instance details

Methods

pretty :: DIMacroNode -> Doc ann #

prettyList :: [DIMacroNode] -> Doc ann #

Pretty DINode Source # 
Instance details

Methods

pretty :: DINode -> Doc ann #

prettyList :: [DINode] -> Doc ann #

Pretty DIObjCProperty Source # 
Instance details

Methods

pretty :: DIObjCProperty -> Doc ann #

prettyList :: [DIObjCProperty] -> Doc ann #

Pretty ImportedEntityTag Source # 
Instance details

Pretty DIImportedEntity Source # 
Instance details

Pretty DIEnumerator Source # 
Instance details

Methods

pretty :: DIEnumerator -> Doc ann #

prettyList :: [DIEnumerator] -> Doc ann #

Pretty DISubrange Source # 
Instance details

Methods

pretty :: DISubrange -> Doc ann #

prettyList :: [DISubrange] -> Doc ann #

Pretty DICount Source # 
Instance details

Methods

pretty :: DICount -> Doc ann #

prettyList :: [DICount] -> Doc ann #

Pretty DIScope Source # 
Instance details

Methods

pretty :: DIScope -> Doc ann #

prettyList :: [DIScope] -> Doc ann #

Pretty DIModule Source # 
Instance details

Methods

pretty :: DIModule -> Doc ann #

prettyList :: [DIModule] -> Doc ann #

Pretty DINamespace Source # 
Instance details

Methods

pretty :: DINamespace -> Doc ann #

prettyList :: [DINamespace] -> Doc ann #

Pretty DebugEmissionKind Source # 
Instance details

Pretty DebugNameTableKind Source # 
Instance details

Pretty DICompileUnit Source # 
Instance details

Methods

pretty :: DICompileUnit -> Doc ann #

prettyList :: [DICompileUnit] -> Doc ann #

Pretty DIFile Source # 
Instance details

Methods

pretty :: DIFile -> Doc ann #

prettyList :: [DIFile] -> Doc ann #

Pretty ChecksumKind Source # 
Instance details

Methods

pretty :: ChecksumKind -> Doc ann #

prettyList :: [ChecksumKind] -> Doc ann #

Pretty DILocalScope Source # 
Instance details

Methods

pretty :: DILocalScope -> Doc ann #

prettyList :: [DILocalScope] -> Doc ann #

Pretty DISubprogram Source # 
Instance details

Methods

pretty :: DISubprogram -> Doc ann #

prettyList :: [DISubprogram] -> Doc ann #

Pretty BasicTypeTag Source # 
Instance details

Methods

pretty :: BasicTypeTag -> Doc ann #

prettyList :: [BasicTypeTag] -> Doc ann #

Pretty DIType Source # 
Instance details

Methods

pretty :: DIType -> Doc ann #

prettyList :: [DIType] -> Doc ann #

Pretty DIBasicType Source # 
Instance details

Methods

pretty :: DIBasicType -> Doc ann #

prettyList :: [DIBasicType] -> Doc ann #

Pretty DISubroutineType Source # 
Instance details

Pretty DerivedTypeTag Source # 
Instance details

Methods

pretty :: DerivedTypeTag -> Doc ann #

prettyList :: [DerivedTypeTag] -> Doc ann #

Pretty DIDerivedType Source # 
Instance details

Methods

pretty :: DIDerivedType -> Doc ann #

prettyList :: [DIDerivedType] -> Doc ann #

Pretty DICompositeType Source # 
Instance details

Pretty Encoding Source # 
Instance details

Methods

pretty :: Encoding -> Doc ann #

prettyList :: [Encoding] -> Doc ann #

Pretty DITemplateParameter Source # 
Instance details

Pretty DILexicalBlockBase Source # 
Instance details

Pretty DIVariable Source # 
Instance details

Methods

pretty :: DIVariable -> Doc ann #

prettyList :: [DIVariable] -> Doc ann #

Pretty DIGlobalVariable Source # 
Instance details

Pretty DILocalVariable Source # 
Instance details

Pretty Constant Source # 
Instance details

Methods

pretty :: Constant -> Doc ann #

prettyList :: [Constant] -> Doc ann #

Pretty DataLayout Source # 
Instance details

Methods

pretty :: DataLayout -> Doc ann #

prettyList :: [DataLayout] -> Doc ann #

Pretty Type Source # 
Instance details

Methods

pretty :: Type -> Doc ann #

prettyList :: [Type] -> Doc ann #

Pretty SelectionKind Source # 
Instance details

Methods

pretty :: SelectionKind -> Doc ann #

prettyList :: [SelectionKind] -> Doc ann #

Pretty CallingConvention Source # 
Instance details

Pretty FloatingPointPredicate Source # 
Instance details

Pretty FunctionAttribute Source # 
Instance details

Pretty GroupID Source # 
Instance details

Methods

pretty :: GroupID -> Doc ann #

prettyList :: [GroupID] -> Doc ann #

Pretty IntegerPredicate Source # 
Instance details

Pretty Linkage Source # 
Instance details

Methods

pretty :: Linkage -> Doc ann #

prettyList :: [Linkage] -> Doc ann #

Pretty Name Source # 
Instance details

Methods

pretty :: Name -> Doc ann #

prettyList :: [Name] -> Doc ann #

Pretty ParameterAttribute Source # 
Instance details

Pretty RMWOperation Source # 
Instance details

Methods

pretty :: RMWOperation -> Doc ann #

prettyList :: [RMWOperation] -> Doc ann #

Pretty a => Pretty (Named a) Source # 
Instance details

Methods

pretty :: Named a -> Doc ann #

prettyList :: [Named a] -> Doc ann #

Pretty a => Pretty (MDRef a) Source # 
Instance details

Methods

pretty :: MDRef a -> Doc ann #

prettyList :: [MDRef a] -> Doc ann #

Pretty (Either GroupID FunctionAttribute) Source # 
Instance details