Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
inconsistentCases :: Show a => String -> a -> b Source #
allocaAttrBuilder :: (Monad m, MonadAnyCont IO m) => m (Ptr (AttrBuilder a)) Source #
data AttributeList Source #
Instances
Eq AttributeList Source # | |
Defined in LLVM.Internal.Attribute (==) :: AttributeList -> AttributeList -> Bool # (/=) :: AttributeList -> AttributeList -> Bool # | |
Show AttributeList Source # | |
Defined in LLVM.Internal.Attribute showsPrec :: Int -> AttributeList -> ShowS # show :: AttributeList -> String # showList :: [AttributeList] -> ShowS # | |
EncodeM EncodeAST AttributeList AttributeList Source # | |
Defined in LLVM.Internal.Attribute | |
DecodeM DecodeAST AttributeList (AttrSetDecoder a, a) Source # | |
Defined in LLVM.Internal.Attribute decodeM :: (AttrSetDecoder a, a) -> DecodeAST AttributeList Source # |
Orphan instances
DecodeM DecodeAST FunctionAttribute FunctionAttribute Source # | |
DecodeM DecodeAST ParameterAttribute ParameterAttribute Source # | |
Monad m => EncodeM m FunctionAttribute (Ptr FunctionAttrBuilder -> EncodeAST ()) Source # | |
encodeM :: FunctionAttribute -> m (Ptr FunctionAttrBuilder -> EncodeAST ()) Source # | |
Monad m => EncodeM m ParameterAttribute (Ptr ParameterAttrBuilder -> EncodeAST ()) Source # | |
encodeM :: ParameterAttribute -> m (Ptr ParameterAttrBuilder -> EncodeAST ()) Source # | |
EncodeM EncodeAST [Either GroupID FunctionAttribute] FunctionAttributeSet Source # | |
DecodeM DecodeAST a (Attribute b) => DecodeM DecodeAST [a] (AttributeSet b) Source # | |
decodeM :: AttributeSet b -> DecodeAST [a] Source # | |
EncodeM EncodeAST a (Ptr (AttrBuilder b) -> EncodeAST ()) => EncodeM EncodeAST [a] (AttributeSet b) Source # | |
encodeM :: [a] -> EncodeAST (AttributeSet b) Source # |