llvm-hs-pure-9.0.0: Pure Haskell LLVM functionality (no FFI).
Safe HaskellSafe
LanguageHaskell2010

LLVM.AST.CallingConvention

Description

Module to allow importing CallingConvention distinctly qualified.

Synopsis

Documentation

data CallingConvention Source #

Instances

Instances details
Eq CallingConvention Source # 
Instance details

Defined in LLVM.AST.CallingConvention

Data CallingConvention Source # 
Instance details

Defined in LLVM.AST.CallingConvention

Methods

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

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

toConstr :: CallingConvention -> Constr #

dataTypeOf :: CallingConvention -> DataType #

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

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

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

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

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

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

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

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

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

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

Read CallingConvention Source # 
Instance details

Defined in LLVM.AST.CallingConvention

Show CallingConvention Source # 
Instance details

Defined in LLVM.AST.CallingConvention

Generic CallingConvention Source # 
Instance details

Defined in LLVM.AST.CallingConvention

Associated Types

type Rep CallingConvention :: Type -> Type #

type Rep CallingConvention Source # 
Instance details

Defined in LLVM.AST.CallingConvention

type Rep CallingConvention = D1 ('MetaData "CallingConvention" "LLVM.AST.CallingConvention" "llvm-hs-pure-9.0.0-inplace" 'False) (((((C1 ('MetaCons "C" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Fast" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Cold" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "GHC" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HiPE" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "WebKit_JS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AnyReg" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PreserveMost" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PreserveAll" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Swift" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "CXX_FastTLS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "X86_StdCall" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "X86_FastCall" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ARM_APCS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ARM_AAPCS" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "ARM_AAPCS_VFP" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MSP430_INTR" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "X86_ThisCall" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PTX_Kernel" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PTX_Device" 'PrefixI 'False) (U1 :: Type -> Type)))))) :+: ((((C1 ('MetaCons "SPIR_FUNC" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SPIR_KERNEL" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Intel_OCL_BI" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "X86_64_SysV" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Win64" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "X86_VectorCall" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HHVM" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "HHVM_C" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "X86_Intr" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AVR_Intr" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "AVR_Signal" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AVR_Builtin" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AMDGPU_VS" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "AMDGPU_HS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AMDGPU_GS" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "AMDGPU_PS" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "AMDGPU_CS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AMDGPU_Kernel" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "X86_RegCall" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "MSP430_Builtin" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Numbered" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32))))))))