Safe Haskell | None |
---|---|
Language | Haskell2010 |
LLVM.Internal.Attribute
Contents
Documentation
inconsistentCases :: Show a => String -> a -> b Source #
allocaAttrBuilder :: (Monad m, MonadAnyCont IO m) => m (Ptr (AttrBuilder a)) Source #
data AttributeList Source #
Constructors
AttributeList | |
Fields |
Instances
Eq AttributeList Source # | |
Defined in LLVM.Internal.Attribute Methods (==) :: AttributeList -> AttributeList -> Bool # (/=) :: AttributeList -> AttributeList -> Bool # | |
Show AttributeList Source # | |
Defined in LLVM.Internal.Attribute Methods showsPrec :: Int -> AttributeList -> ShowS # show :: AttributeList -> String # showList :: [AttributeList] -> ShowS # | |
EncodeM EncodeAST AttributeList AttributeList Source # | |
Defined in LLVM.Internal.Attribute Methods encodeM :: AttributeList -> EncodeAST AttributeList0 Source # | |
DecodeM DecodeAST AttributeList (AttrSetDecoder a, a) Source # | |
Defined in LLVM.Internal.Attribute Methods decodeM :: (AttrSetDecoder a, a) -> DecodeAST AttributeList Source # |