llvm-hs-pretty-0.5.0.0: A pretty printer for LLVM IR.
LLVM.Pretty
Contents
ppllvm :: Module -> Text Source #
Pretty print a LLVM module
ppll :: Pretty a => a -> Text Source #
Pretty print a printable LLVM expression
Methods
pretty :: ShortByteString -> Doc ann #
prettyList :: [ShortByteString] -> Doc ann #
pretty :: Definition -> Doc ann #
prettyList :: [Definition] -> Doc ann #
pretty :: Module -> Doc ann #
prettyList :: [Module] -> Doc ann #
pretty :: DataLayout -> Doc ann #
prettyList :: [DataLayout] -> Doc ann #
pretty :: Global -> Doc ann #
prettyList :: [Global] -> Doc ann #
pretty :: Parameter -> Doc ann #
prettyList :: [Parameter] -> Doc ann #
pretty :: BasicBlock -> Doc ann #
prettyList :: [BasicBlock] -> Doc ann #
pretty :: UnnamedAddr -> Doc ann #
prettyList :: [UnnamedAddr] -> Doc ann #
pretty :: Terminator -> Doc ann #
prettyList :: [Terminator] -> Doc ann #
pretty :: MemoryOrdering -> Doc ann #
prettyList :: [MemoryOrdering] -> Doc ann #
pretty :: SynchronizationScope -> Doc ann #
prettyList :: [SynchronizationScope] -> Doc ann #
pretty :: LandingPadClause -> Doc ann #
prettyList :: [LandingPadClause] -> Doc ann #
pretty :: Instruction -> Doc ann #
prettyList :: [Instruction] -> Doc ann #
pretty :: Operand -> Doc ann #
prettyList :: [Operand] -> Doc ann #
pretty :: CallableOperand -> Doc ann #
prettyList :: [CallableOperand] -> Doc ann #
pretty :: Metadata -> Doc ann #
prettyList :: [Metadata] -> Doc ann #
pretty :: MetadataNodeID -> Doc ann #
prettyList :: [MetadataNodeID] -> Doc ann #
pretty :: MDNode -> Doc ann #
prettyList :: [MDNode] -> Doc ann #
pretty :: DILocation -> Doc ann #
prettyList :: [DILocation] -> Doc ann #
pretty :: DIExpression -> Doc ann #
prettyList :: [DIExpression] -> Doc ann #
pretty :: DIGlobalVariableExpression -> Doc ann #
prettyList :: [DIGlobalVariableExpression] -> Doc ann #
pretty :: DIFlag -> Doc ann #
prettyList :: [DIFlag] -> Doc ann #
pretty :: DIMacroInfo -> Doc ann #
prettyList :: [DIMacroInfo] -> Doc ann #
pretty :: DIMacroNode -> Doc ann #
prettyList :: [DIMacroNode] -> Doc ann #
pretty :: DINode -> Doc ann #
prettyList :: [DINode] -> Doc ann #
pretty :: DIObjCProperty -> Doc ann #
prettyList :: [DIObjCProperty] -> Doc ann #
pretty :: ImportedEntityTag -> Doc ann #
prettyList :: [ImportedEntityTag] -> Doc ann #
pretty :: DIImportedEntity -> Doc ann #
prettyList :: [DIImportedEntity] -> Doc ann #
pretty :: DIEnumerator -> Doc ann #
prettyList :: [DIEnumerator] -> Doc ann #
pretty :: DISubrange -> Doc ann #
prettyList :: [DISubrange] -> Doc ann #
pretty :: DIScope -> Doc ann #
prettyList :: [DIScope] -> Doc ann #
pretty :: DIModule -> Doc ann #
prettyList :: [DIModule] -> Doc ann #
pretty :: DINamespace -> Doc ann #
prettyList :: [DINamespace] -> Doc ann #
pretty :: DebugEmissionKind -> Doc ann #
prettyList :: [DebugEmissionKind] -> Doc ann #
pretty :: DICompileUnit -> Doc ann #
prettyList :: [DICompileUnit] -> Doc ann #
pretty :: DIFile -> Doc ann #
prettyList :: [DIFile] -> Doc ann #
pretty :: ChecksumKind -> Doc ann #
prettyList :: [ChecksumKind] -> Doc ann #
pretty :: DILocalScope -> Doc ann #
prettyList :: [DILocalScope] -> Doc ann #
pretty :: DISubprogram -> Doc ann #
prettyList :: [DISubprogram] -> Doc ann #
pretty :: BasicTypeTag -> Doc ann #
prettyList :: [BasicTypeTag] -> Doc ann #
pretty :: DIType -> Doc ann #
prettyList :: [DIType] -> Doc ann #
pretty :: DIBasicType -> Doc ann #
prettyList :: [DIBasicType] -> Doc ann #
pretty :: DISubroutineType -> Doc ann #
prettyList :: [DISubroutineType] -> Doc ann #
pretty :: DerivedTypeTag -> Doc ann #
prettyList :: [DerivedTypeTag] -> Doc ann #
pretty :: DIDerivedType -> Doc ann #
prettyList :: [DIDerivedType] -> Doc ann #
pretty :: DICompositeType -> Doc ann #
prettyList :: [DICompositeType] -> Doc ann #
pretty :: Encoding -> Doc ann #
prettyList :: [Encoding] -> Doc ann #
pretty :: DITemplateParameter -> Doc ann #
prettyList :: [DITemplateParameter] -> Doc ann #
pretty :: DILexicalBlockBase -> Doc ann #
prettyList :: [DILexicalBlockBase] -> Doc ann #
pretty :: DIVariable -> Doc ann #
prettyList :: [DIVariable] -> Doc ann #
pretty :: DIGlobalVariable -> Doc ann #
prettyList :: [DIGlobalVariable] -> Doc ann #
pretty :: DILocalVariable -> Doc ann #
prettyList :: [DILocalVariable] -> Doc ann #
pretty :: Constant -> Doc ann #
prettyList :: [Constant] -> Doc ann #
pretty :: Type -> Doc ann #
prettyList :: [Type] -> Doc ann #
pretty :: SelectionKind -> Doc ann #
prettyList :: [SelectionKind] -> Doc ann #
pretty :: CallingConvention -> Doc ann #
prettyList :: [CallingConvention] -> Doc ann #
pretty :: FloatingPointPredicate -> Doc ann #
prettyList :: [FloatingPointPredicate] -> Doc ann #
pretty :: FunctionAttribute -> Doc ann #
prettyList :: [FunctionAttribute] -> Doc ann #
pretty :: GroupID -> Doc ann #
prettyList :: [GroupID] -> Doc ann #
pretty :: IntegerPredicate -> Doc ann #
prettyList :: [IntegerPredicate] -> Doc ann #
pretty :: Linkage -> Doc ann #
prettyList :: [Linkage] -> Doc ann #
pretty :: Name -> Doc ann #
prettyList :: [Name] -> Doc ann #
pretty :: ParameterAttribute -> Doc ann #
prettyList :: [ParameterAttribute] -> Doc ann #
pretty :: RMWOperation -> Doc ann #
prettyList :: [RMWOperation] -> Doc ann #
pretty :: Named a -> Doc ann #
prettyList :: [Named a] -> Doc ann #
pretty :: MDRef a -> Doc ann #
prettyList :: [MDRef a] -> Doc ann #
pretty :: Either GroupID FunctionAttribute -> Doc ann #
prettyList :: [Either GroupID FunctionAttribute] -> Doc ann #