Safe Haskell | None |
---|---|
Language | Haskell2010 |
Gpu.Vulkan.PNext.Middle.Internal
Contents
Synopsis
- data StructCommon = StructCommon {}
- structCommonFromCore :: StructCommon -> StructCommon
- class Peek n => Typeable n where
- class FindChainAll (ns :: [Type]) where
- findChainAll :: Ptr () -> IO (PL Maybe ns)
- class ReadChain (mn :: Maybe Type) where
- class Nextable (n :: Maybe Type -> Type) where
- nextableSize :: Int
- nextableType :: StructureType
- nextPtr :: Ptr () -> IO (Ptr ())
- createNextable :: forall (mn' :: Maybe Type). Ptr () -> M mn' -> IO (n mn')
STRUCT COMMON
data StructCommon Source #
Constructors
StructCommon | |
Fields |
Instances
Show StructCommon Source # | |
Defined in Gpu.Vulkan.PNext.Middle.Internal Methods showsPrec :: Int -> StructCommon -> ShowS # show :: StructCommon -> String # showList :: [StructCommon] -> ShowS # | |
Peek StructCommon Source # | |
Defined in Gpu.Vulkan.PNext.Middle.Internal Methods peek' :: Ptr StructCommon -> IO StructCommon # | |
Poke StructCommon Source # | |
Defined in Gpu.Vulkan.PNext.Middle.Internal Methods poke' :: Ptr StructCommon -> StructCommon -> IO () # |
SET AND READ CHAIN
class Peek n => Typeable n where Source #
Methods
Instances
Typeable DescriptorIndexingFeaturesNoNext Source # | |
Defined in Gpu.Vulkan.PhysicalDevice.Struct Methods | |
Typeable Vulkan12FeaturesNoNext Source # | |
Defined in Gpu.Vulkan.PhysicalDevice.Struct Methods | |
Typeable Vulkan13FeaturesNoNext Source # | |
Defined in Gpu.Vulkan.PhysicalDevice.Struct Methods |
class FindChainAll (ns :: [Type]) where Source #
Instances
FindChainAll ('[] :: [Type]) Source # | |
Defined in Gpu.Vulkan.PNext.Middle.Internal | |
(Typeable n, FindChainAll ns) => FindChainAll (n ': ns) Source # | |
Defined in Gpu.Vulkan.PNext.Middle.Internal |
class Nextable (n :: Maybe Type -> Type) where Source #
Methods
nextableSize :: Int Source #
nextableType :: StructureType Source #
nextPtr :: Ptr () -> IO (Ptr ()) Source #
createNextable :: forall (mn' :: Maybe Type). Ptr () -> M mn' -> IO (n mn') Source #
Instances
Nextable DescriptorIndexingFeatures Source # | |
Defined in Gpu.Vulkan.PhysicalDevice.Struct Methods nextableSize :: Int Source # nextableType :: StructureType Source # nextPtr :: Ptr () -> IO (Ptr ()) Source # createNextable :: forall (mn' :: Maybe Type). Ptr () -> M mn' -> IO (DescriptorIndexingFeatures mn') Source # | |
Nextable Vulkan12Features Source # | |
Defined in Gpu.Vulkan.PhysicalDevice.Struct Methods nextableSize :: Int Source # nextableType :: StructureType Source # nextPtr :: Ptr () -> IO (Ptr ()) Source # createNextable :: forall (mn' :: Maybe Type). Ptr () -> M mn' -> IO (Vulkan12Features mn') Source # | |
Nextable Vulkan13Features Source # | |
Defined in Gpu.Vulkan.PhysicalDevice.Struct Methods nextableSize :: Int Source # nextableType :: StructureType Source # nextPtr :: Ptr () -> IO (Ptr ()) Source # createNextable :: forall (mn' :: Maybe Type). Ptr () -> M mn' -> IO (Vulkan13Features mn') Source # |