Copyright | Trevor Elliott 2011-2016 |
---|---|
License | BSD3 |
Maintainer | awesomelyawesome@gmail.com |
Stability | experimental |
Portability | unknown |
Safe Haskell | Safe |
Language | Haskell2010 |
This is the pretty-printer for llvm assembly versions 3.6 and lower.
- type LLVM = ?config :: Config
- data Config = Config {}
- withConfig :: Config -> (LLVM => a) -> a
- ppLLVM :: (LLVM => a) -> a
- ppLLVM35 :: (LLVM => a) -> a
- ppLLVM36 :: (LLVM => a) -> a
- ppLLVM37 :: (LLVM => a) -> a
- ppLLVM38 :: (LLVM => a) -> a
- checkConfig :: LLVM => (Config -> Bool) -> Bool
- ppModule :: LLVM => Module -> Doc
- ppNamedMd :: NamedMd -> Doc
- ppUnnamedMd :: UnnamedMd -> Doc
- ppGlobalAlias :: GlobalAlias -> Doc
- ppDataLayout :: DataLayout -> Doc
- ppLayoutSpec :: LayoutSpec -> Doc
- ppLayoutBody :: Int -> Int -> Maybe Int -> Doc
- ppMangling :: Mangling -> Doc
- ppInlineAsm :: InlineAsm -> Doc
- ppIdent :: Ident -> Doc
- ppSymbol :: Symbol -> Doc
- ppPrimType :: PrimType -> Doc
- ppFloatType :: FloatType -> Doc
- ppType :: Type -> Doc
- ppTypeDecl :: TypeDecl -> Doc
- ppGlobal :: Global -> Doc
- ppGlobalAttrs :: GlobalAttrs -> Doc
- ppDeclare :: Declare -> Doc
- ppDefine :: LLVM => Define -> Doc
- ppFunAttr :: FunAttr -> Doc
- ppLabelDef :: BlockLabel -> Doc
- ppLabel :: BlockLabel -> Doc
- ppBasicBlock :: LLVM => BasicBlock -> Doc
- ppStmt :: LLVM => Stmt -> Doc
- ppAttachedMetadata :: [(String, ValMd)] -> Doc
- ppLinkage :: Linkage -> Doc
- ppGC :: GC -> Doc
- ppTyped :: (a -> Doc) -> Typed a -> Doc
- ppSignBits :: Bool -> Bool -> Doc
- ppExact :: Bool -> Doc
- ppArithOp :: ArithOp -> Doc
- ppBitOp :: BitOp -> Doc
- ppConvOp :: ConvOp -> Doc
- ppInstr :: LLVM => Instr -> Doc
- ppLoad :: LLVM => Typed (Value' BlockLabel) -> Maybe Align -> Doc
- ppClauses :: Bool -> [Clause] -> Doc
- ppClause :: Clause -> Doc
- ppTypedLabel :: BlockLabel -> Doc
- ppSwitchEntry :: Type -> (Integer, BlockLabel) -> Doc
- ppVectorIndex :: Value -> Doc
- ppAlign :: Maybe Align -> Doc
- ppAlloca :: Type -> Maybe (Typed Value) -> Maybe Int -> Doc
- ppCall :: Bool -> Type -> Value -> [Typed Value] -> Doc
- ppCallSym :: Type -> Value -> Doc
- ppGEP :: LLVM => Bool -> Typed Value -> [Typed Value] -> Doc
- ppInvoke :: Type -> Value -> [Typed Value] -> BlockLabel -> BlockLabel -> Doc
- ppPhiArg :: (Value, BlockLabel) -> Doc
- ppICmpOp :: ICmpOp -> Doc
- ppFCmpOp :: FCmpOp -> Doc
- ppValue :: Value -> Doc
- ppValMd :: ValMd -> Doc
- ppDebugLoc :: DebugLoc -> Doc
- ppTypedValMd :: ValMd -> Doc
- ppMetadata :: Doc -> Doc
- ppMetadataNode :: [Maybe ValMd] -> Doc
- ppStringLiteral :: String -> Doc
- ppAsm :: Bool -> Bool -> String -> String -> Doc
- ppConstExpr :: ConstExpr -> Doc
- ppDebugInfo :: DebugInfo -> Doc
- ppDIBasicType :: DIBasicType -> Doc
- ppDICompileUnit :: DICompileUnit -> Doc
- ppDICompositeType :: DICompositeType -> Doc
- ppDIDerivedType :: DIDerivedType -> Doc
- ppDIEnumerator :: String -> Int64 -> Doc
- ppDIExpression :: DIExpression -> Doc
- ppDIFile :: DIFile -> Doc
- ppDIGlobalVariable :: DIGlobalVariable -> Doc
- ppDIGlobalVariableExpression :: DIGlobalVariableExpression -> Doc
- ppDILexicalBlock :: DILexicalBlock -> Doc
- ppDILexicalBlockFile :: DILexicalBlockFile -> Doc
- ppDILocalVariable :: DILocalVariable -> Doc
- ppDISubprogram :: DISubprogram -> Doc
- ppDISubrange :: DISubrange -> Doc
- ppDISubroutineType :: DISubroutineType -> Doc
- ppBool :: Bool -> Doc
- ppArgList :: Bool -> [Doc] -> Doc
- integral :: Integral i => i -> Doc
- hex :: (Integral i, Show i) => i -> Doc
- opt :: Bool -> Doc -> Doc
- commas :: [Doc] -> Doc
- mcommas :: [Maybe Doc] -> Doc
- angles :: Doc -> Doc
- structBraces :: Doc -> Doc
- ppMaybe :: (a -> Doc) -> Maybe a -> Doc
Documentation
The differences between various versions of the llvm textual AST.
Config | |
|
withConfig :: Config -> (LLVM => a) -> a Source #
ppUnnamedMd :: UnnamedMd -> Doc Source #
ppGlobalAlias :: GlobalAlias -> Doc Source #
ppDataLayout :: DataLayout -> Doc Source #
Pretty print a data layout specification.
ppLayoutSpec :: LayoutSpec -> Doc Source #
Pretty print a single layout specification.
ppLayoutBody :: Int -> Int -> Maybe Int -> Doc Source #
Pretty-print the common case for data layout specifications.
ppMangling :: Mangling -> Doc Source #
ppInlineAsm :: InlineAsm -> Doc Source #
Pretty-print the inline assembly block.
ppPrimType :: PrimType -> Doc Source #
ppFloatType :: FloatType -> Doc Source #
ppTypeDecl :: TypeDecl -> Doc Source #
ppGlobalAttrs :: GlobalAttrs -> Doc Source #
ppLabelDef :: BlockLabel -> Doc Source #
ppLabel :: BlockLabel -> Doc Source #
ppBasicBlock :: LLVM => BasicBlock -> Doc Source #
ppTypedLabel :: BlockLabel -> Doc Source #
ppSwitchEntry :: Type -> (Integer, BlockLabel) -> Doc Source #
ppVectorIndex :: Value -> Doc Source #
ppInvoke :: Type -> Value -> [Typed Value] -> BlockLabel -> BlockLabel -> Doc Source #
ppDebugLoc :: DebugLoc -> Doc Source #
ppTypedValMd :: ValMd -> Doc Source #
ppMetadata :: Doc -> Doc Source #
ppStringLiteral :: String -> Doc Source #
ppConstExpr :: ConstExpr -> Doc Source #
ppDebugInfo :: DebugInfo -> Doc Source #
ppDIBasicType :: DIBasicType -> Doc Source #
ppDICompileUnit :: DICompileUnit -> Doc Source #
ppDIDerivedType :: DIDerivedType -> Doc Source #
ppDIExpression :: DIExpression -> Doc Source #
ppDILexicalBlock :: DILexicalBlock -> Doc Source #
ppDISubprogram :: DISubprogram -> Doc Source #
ppDISubrange :: DISubrange -> Doc Source #
mcommas :: [Maybe Doc] -> Doc Source #
Helpful for all of the optional fields that appear in the metadata values
structBraces :: Doc -> Doc Source #