llvm-hs-pure-4.1.0.0: Pure Haskell LLVM functionality (no FFI).

Safe HaskellSafe
LanguageHaskell98

LLVM.AST.FunctionAttribute

Description

Module to allow importing FunctionAttribute distinctly qualified.

Synopsis

Documentation

data FunctionAttribute Source #

Instances

Eq FunctionAttribute Source # 
Data FunctionAttribute Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FunctionAttribute -> c FunctionAttribute #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FunctionAttribute #

toConstr :: FunctionAttribute -> Constr #

dataTypeOf :: FunctionAttribute -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c FunctionAttribute) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FunctionAttribute) #

gmapT :: (forall b. Data b => b -> b) -> FunctionAttribute -> FunctionAttribute #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FunctionAttribute -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FunctionAttribute -> r #

gmapQ :: (forall d. Data d => d -> u) -> FunctionAttribute -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FunctionAttribute -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FunctionAttribute -> m FunctionAttribute #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FunctionAttribute -> m FunctionAttribute #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FunctionAttribute -> m FunctionAttribute #

Ord FunctionAttribute Source # 
Read FunctionAttribute Source # 
Show FunctionAttribute Source # 
Generic FunctionAttribute Source # 
type Rep FunctionAttribute Source # 
type Rep FunctionAttribute = D1 (MetaData "FunctionAttribute" "LLVM.AST.FunctionAttribute" "llvm-hs-pure-4.1.0.0-AkNJ8I3FEBu4Ive898Cmiy" False) ((:+:) ((:+:) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "NoReturn" PrefixI False) U1) (C1 (MetaCons "NoUnwind" PrefixI False) U1)) ((:+:) (C1 (MetaCons "ReadNone" PrefixI False) U1) (C1 (MetaCons "ReadOnly" PrefixI False) U1))) ((:+:) ((:+:) (C1 (MetaCons "NoInline" PrefixI False) U1) (C1 (MetaCons "NoRecurse" PrefixI False) U1)) ((:+:) (C1 (MetaCons "AlwaysInline" PrefixI False) U1) ((:+:) (C1 (MetaCons "MinimizeSize" PrefixI False) U1) (C1 (MetaCons "OptimizeForSize" PrefixI False) U1))))) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "OptimizeNone" PrefixI False) U1) (C1 (MetaCons "StackProtect" PrefixI False) U1)) ((:+:) (C1 (MetaCons "StackProtectReq" PrefixI False) U1) (C1 (MetaCons "StackProtectStrong" PrefixI False) U1))) ((:+:) ((:+:) (C1 (MetaCons "NoRedZone" PrefixI False) U1) (C1 (MetaCons "NoImplicitFloat" PrefixI False) U1)) ((:+:) (C1 (MetaCons "Naked" PrefixI False) U1) ((:+:) (C1 (MetaCons "InlineHint" PrefixI False) U1) (C1 (MetaCons "StackAlignment" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word64)))))))) ((:+:) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "ReturnsTwice" PrefixI False) U1) (C1 (MetaCons "UWTable" PrefixI False) U1)) ((:+:) (C1 (MetaCons "NonLazyBind" PrefixI False) U1) (C1 (MetaCons "Builtin" PrefixI False) U1))) ((:+:) ((:+:) (C1 (MetaCons "NoBuiltin" PrefixI False) U1) (C1 (MetaCons "Cold" PrefixI False) U1)) ((:+:) (C1 (MetaCons "JumpTable" PrefixI False) U1) ((:+:) (C1 (MetaCons "NoDuplicate" PrefixI False) U1) (C1 (MetaCons "SanitizeAddress" PrefixI False) U1))))) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "SanitizeThread" PrefixI False) U1) (C1 (MetaCons "SanitizeMemory" PrefixI False) U1)) ((:+:) (C1 (MetaCons "StringAttribute" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "stringAttributeKind") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ShortByteString)) (S1 (MetaSel (Just Symbol "stringAttributeValue") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ShortByteString)))) ((:+:) (C1 (MetaCons "AllocSize" PrefixI False) ((:*:) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word32)) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Word32))))) (C1 (MetaCons "WriteOnly" PrefixI False) U1)))) ((:+:) ((:+:) (C1 (MetaCons "ArgMemOnly" PrefixI False) U1) (C1 (MetaCons "Convergent" PrefixI False) U1)) ((:+:) (C1 (MetaCons "InaccessibleMemOnly" PrefixI False) U1) ((:+:) (C1 (MetaCons "InaccessibleMemOrArgMemOnly" PrefixI False) U1) (C1 (MetaCons "SafeStack" PrefixI False) U1)))))))

newtype GroupID Source #

Constructors

GroupID Word 

Instances

Eq GroupID Source # 

Methods

(==) :: GroupID -> GroupID -> Bool #

(/=) :: GroupID -> GroupID -> Bool #

Data GroupID Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GroupID -> c GroupID #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GroupID #

toConstr :: GroupID -> Constr #

dataTypeOf :: GroupID -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c GroupID) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GroupID) #

gmapT :: (forall b. Data b => b -> b) -> GroupID -> GroupID #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GroupID -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GroupID -> r #

gmapQ :: (forall d. Data d => d -> u) -> GroupID -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GroupID -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GroupID -> m GroupID #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GroupID -> m GroupID #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GroupID -> m GroupID #

Ord GroupID Source # 
Read GroupID Source # 
Show GroupID Source # 
Generic GroupID Source # 

Associated Types

type Rep GroupID :: * -> * #

Methods

from :: GroupID -> Rep GroupID x #

to :: Rep GroupID x -> GroupID #

type Rep GroupID Source # 
type Rep GroupID = D1 (MetaData "GroupID" "LLVM.AST.FunctionAttribute" "llvm-hs-pure-4.1.0.0-AkNJ8I3FEBu4Ive898Cmiy" True) (C1 (MetaCons "GroupID" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word)))