Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- data Result
- = SpvReflectResultSuccess
- | SpvReflectResultNotReady
- | SpvReflectResultErrorParseFailed
- | SpvReflectResultErrorAllocFailed
- | SpvReflectResultErrorRangeExceeded
- | SpvReflectResultErrorNullPointer
- | SpvReflectResultErrorInternalError
- | SpvReflectResultErrorCountMismatch
- | SpvReflectResultErrorElementNotFound
- | SpvReflectResultErrorSpirvInvalidCodeSize
- | SpvReflectResultErrorSpirvInvalidMagicNumber
- | SpvReflectResultErrorSpirvUnexpectedEof
- | SpvReflectResultErrorSpirvInvalidIdReference
- | SpvReflectResultErrorSpirvSetNumberOverflow
- | SpvReflectResultErrorSpirvInvalidStorageClass
- | SpvReflectResultErrorSpirvRecursion
- | SpvReflectResultErrorSpirvInvalidInstruction
- | SpvReflectResultErrorSpirvUnexpectedBlockData
- | SpvReflectResultErrorSpirvInvalidBlockMemberReference
- | SpvReflectResultErrorSpirvInvalidEntryPoint
- | SpvReflectResultErrorSpirvInvalidExecutionMode
- type ShaderModulePtr = Ptr ()
- createShaderModule :: CULong -> Ptr () -> ShaderModulePtr -> IO Result
- data ModuleFlags
- createShaderModule2 :: ModuleFlags -> CULong -> Ptr () -> ShaderModulePtr -> IO Result
- destroyShaderModule :: ShaderModulePtr -> IO ()
- shaderModuleSize :: Int
- inflateModule :: ShaderModulePtr -> IO Module
- inflateVector :: Integral i => IO i -> IO (Ptr p) -> Int -> (Ptr p -> IO a) -> IO (Vector a)
- type DescriptorBindingPtr = Ptr ()
- inflateDescriptorBinding :: DescriptorBindingPtr -> IO DescriptorBinding
- type BlockVariablePtr = Ptr ()
- inflateBlockVariable :: BlockVariablePtr -> IO BlockVariable
- type TypeDescriptionPtr = Ptr ()
- inflateTypeDescription :: TypeDescriptionPtr -> IO TypeDescription
- type DescriptorSetPtr = Ptr ()
- inflateDescriptorSet :: DescriptorSetPtr -> IO DescriptorSet
- type InterfaceVariablePtr = Ptr ()
- inflateInterfaceVariable :: InterfaceVariablePtr -> IO InterfaceVariable
- type ImageTraitsPtr = Ptr ()
- inflateImageTraits :: Ptr struct -> Int -> IO Image
- type NumericTraitsPtr = Ptr ()
- inflateNumericTraits :: Ptr struct -> Int -> IO Numeric
- type ArrayTraitsPtr = Ptr ()
- inflateArrayTraits :: Ptr struct -> Int -> IO Array
- inflateIntegral :: (Integral a, Num b) => IO a -> IO b
- inflateEnum :: (Integral a, Enum b) => IO a -> IO b
- inflateFlags32 :: forall a b. (Integral a, Coercible Word32 b) => IO a -> IO b
- inflateText :: IO CString -> IO Text
- createShaderModule'_ :: CULong -> Ptr () -> ShaderModulePtr -> IO CInt
- createShaderModule2'_ :: CUInt -> CULong -> Ptr () -> ShaderModulePtr -> IO CInt
- destroyShaderModule'_ :: ShaderModulePtr -> IO ()
Documentation
Loader interface
type ShaderModulePtr = Ptr () Source #
createShaderModule :: CULong -> Ptr () -> ShaderModulePtr -> IO Result Source #
data ModuleFlags Source #
Instances
createShaderModule2 :: ModuleFlags -> CULong -> Ptr () -> ShaderModulePtr -> IO Result Source #
destroyShaderModule :: ShaderModulePtr -> IO () Source #
Module
inflateModule :: ShaderModulePtr -> IO Module Source #
inflateVector :: Integral i => IO i -> IO (Ptr p) -> Int -> (Ptr p -> IO a) -> IO (Vector a) Source #
type DescriptorBindingPtr = Ptr () Source #
type BlockVariablePtr = Ptr () Source #
type TypeDescriptionPtr = Ptr () Source #
type DescriptorSetPtr = Ptr () Source #
type InterfaceVariablePtr = Ptr () Source #
Traits
type ImageTraitsPtr = Ptr () Source #
type NumericTraitsPtr = Ptr () Source #
type ArrayTraitsPtr = Ptr () Source #
Atomic types
createShaderModule'_ :: CULong -> Ptr () -> ShaderModulePtr -> IO CInt Source #
createShaderModule2'_ :: CUInt -> CULong -> Ptr () -> ShaderModulePtr -> IO CInt Source #
destroyShaderModule'_ :: ShaderModulePtr -> IO () Source #