{-# language CPP #-}
-- | = Name
--
-- VK_EXT_primitives_generated_query - device extension
--
-- == VK_EXT_primitives_generated_query
--
-- [__Name String__]
--     @VK_EXT_primitives_generated_query@
--
-- [__Extension Type__]
--     Device extension
--
-- [__Registered Extension Number__]
--     383
--
-- [__Revision__]
--     1
--
-- [__Extension and Version Dependencies__]
--
--     -   Requires support for Vulkan 1.0
--
--     -   Requires @VK_EXT_transform_feedback@ to be enabled for any
--         device-level functionality
--
-- [__Special Use__]
--
--     -   <https://www.khronos.org/registry/vulkan/specs/1.2-extensions/html/vkspec.html#extendingvulkan-compatibility-specialuse OpenGL \/ ES support>
--
-- [__Contact__]
--
--     -   Shahbaz Youssefi
--         <https://github.com/KhronosGroup/Vulkan-Docs/issues/new?body=[VK_EXT_primitives_generated_query] @syoussefi%0A*Here describe the issue or question you have about the VK_EXT_primitives_generated_query extension* >
--
-- [__Extension Proposal__]
--     <https://github.com/KhronosGroup/Vulkan-Docs/tree/main/proposals/VK_EXT_primitives_generated_query.adoc VK_EXT_primitives_generated_query>
--
-- == Other Extension Metadata
--
-- [__Last Modified Date__]
--     2022-01-24
--
-- [__Contributors__]
--
--     -   Shahbaz Youssefi, Google
--
--     -   Piers Daniell, NVIDIA
--
--     -   Jason Ekstrand, Collabora
--
--     -   Jan-Harald Fredriksen, Arm
--
-- == Description
--
-- This extension adds support for a new query type to match OpenGL’s
-- @GL_PRIMITIVES_GENERATED@ to support layering.
--
-- == New Structures
--
-- -   Extending
--     'Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2.PhysicalDeviceFeatures2',
--     'Vulkan.Core10.Device.DeviceCreateInfo':
--
--     -   'PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT'
--
-- == New Enum Constants
--
-- -   'EXT_PRIMITIVES_GENERATED_QUERY_EXTENSION_NAME'
--
-- -   'EXT_PRIMITIVES_GENERATED_QUERY_SPEC_VERSION'
--
-- -   Extending 'Vulkan.Core10.Enums.QueryType.QueryType':
--
--     -   'Vulkan.Core10.Enums.QueryType.QUERY_TYPE_PRIMITIVES_GENERATED_EXT'
--
-- -   Extending 'Vulkan.Core10.Enums.StructureType.StructureType':
--
--     -   'Vulkan.Core10.Enums.StructureType.STRUCTURE_TYPE_PHYSICAL_DEVICE_PRIMITIVES_GENERATED_QUERY_FEATURES_EXT'
--
-- == Issues
--
-- 1) Can the query from @VK_EXT_transform_feedback@ be used instead?
--
-- __RESOLVED__: No. While the query from VK_EXT_transform_feedback can
-- produce the same results as in this extension, it is only available
-- while transform feedback is active. The OpenGL @GL_PRIMITIVES_GENERATED@
-- query is independent from transform feedback. Emulation through
-- artificial transform feedback is unnecessarily inefficient.
--
-- 2) Can
-- 'Vulkan.Core10.Enums.QueryPipelineStatisticFlagBits.QUERY_PIPELINE_STATISTIC_CLIPPING_INVOCATIONS_BIT'
-- be used instead?
--
-- __RESOLVED__: It could, but we prefer the extension for simplicity.
-- Vulkan requires that only one query be active at a time. If both the
-- @GL_PRIMITIVES_GENERATED@ and the @GL_CLIPPING_INPUT_PRIMITIVES_ARB@
-- queries need to be simultaneously enabled, emulation of both through
-- 'Vulkan.Core10.Enums.QueryPipelineStatisticFlagBits.QUERY_PIPELINE_STATISTIC_CLIPPING_INVOCATIONS_BIT'
-- is inconvenient.
--
-- 3) On some hardware, this query cannot be implemented if
-- 'Vulkan.Core10.Pipeline.PipelineRasterizationStateCreateInfo'::@rasterizerDiscardEnable@
-- is enabled. How will this be handled?
--
-- __RESOLVED__: A feature flag is exposed by this extension for this. On
-- said hardware, the GL implementation disables rasterizer-discard and
-- achieves the same effect through other means. It will not be able to do
-- the same in Vulkan due to lack of state information. A feature flag is
-- exposed by this extension so the OpenGL implementation on top of Vulkan
-- would be able to implement a similar workaround.
--
-- 4) On some hardware, this query cannot be implemented for non-zero query
-- indices. How will this be handled?
--
-- __RESOLVED__: A feature flag is exposed by this extension for this. If
-- this feature is not present, the query from @VK_EXT_transform_feedback@
-- can be used to the same effect.
--
-- 5) How is the interaction of this extension with
-- @transformFeedbackRasterizationStreamSelect@ handled?
--
-- __RESOLVED__: Disallowed for non-zero streams. In OpenGL, the
-- rasterization stream is always stream zero.
--
-- == Version History
--
-- -   Revision 1, 2021-06-23 (Shahbaz Youssefi)
--
--     -   Internal revisions
--
-- == See Also
--
-- 'PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT'
--
-- == Document Notes
--
-- For more information, see the
-- <https://registry.khronos.org/vulkan/specs/1.3-extensions/html/vkspec.html#VK_EXT_primitives_generated_query Vulkan Specification>
--
-- This page is a generated document. Fixes and changes should be made to
-- the generator scripts, not directly.
module Vulkan.Extensions.VK_EXT_primitives_generated_query  ( PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT(..)
                                                            , EXT_PRIMITIVES_GENERATED_QUERY_SPEC_VERSION
                                                            , pattern EXT_PRIMITIVES_GENERATED_QUERY_SPEC_VERSION
                                                            , EXT_PRIMITIVES_GENERATED_QUERY_EXTENSION_NAME
                                                            , pattern EXT_PRIMITIVES_GENERATED_QUERY_EXTENSION_NAME
                                                            ) where

import Foreign.Marshal.Alloc (allocaBytes)
import Foreign.Ptr (nullPtr)
import Foreign.Ptr (plusPtr)
import Vulkan.CStruct (FromCStruct)
import Vulkan.CStruct (FromCStruct(..))
import Vulkan.CStruct (ToCStruct)
import Vulkan.CStruct (ToCStruct(..))
import Vulkan.Zero (Zero(..))
import Data.String (IsString)
import Data.Typeable (Typeable)
import Foreign.Storable (Storable)
import Foreign.Storable (Storable(peek))
import Foreign.Storable (Storable(poke))
import qualified Foreign.Storable (Storable(..))
import GHC.Generics (Generic)
import Foreign.Ptr (Ptr)
import Data.Kind (Type)
import Vulkan.Core10.FundamentalTypes (bool32ToBool)
import Vulkan.Core10.FundamentalTypes (boolToBool32)
import Vulkan.Core10.FundamentalTypes (Bool32)
import Vulkan.Core10.Enums.StructureType (StructureType)
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_PHYSICAL_DEVICE_PRIMITIVES_GENERATED_QUERY_FEATURES_EXT))
-- | VkPhysicalDevicePrimitivesGeneratedQueryFeaturesEXT - Structure
-- describing support for primitives generated query
--
-- = Members
--
-- This structure describes the following features:
--
-- = Description
--
-- If the 'PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT' structure is
-- included in the @pNext@ chain of the
-- 'Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2.PhysicalDeviceFeatures2'
-- structure passed to
-- 'Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2.getPhysicalDeviceFeatures2',
-- it is filled in to indicate whether each corresponding feature is
-- supported. 'PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT' /can/
-- also be used in the @pNext@ chain of
-- 'Vulkan.Core10.Device.DeviceCreateInfo' to selectively enable these
-- features.
--
-- == Valid Usage (Implicit)
--
-- = See Also
--
-- <https://www.khronos.org/registry/vulkan/specs/1.2-extensions/html/vkspec.html#VK_EXT_primitives_generated_query VK_EXT_primitives_generated_query>,
-- 'Vulkan.Core10.FundamentalTypes.Bool32',
-- 'Vulkan.Core10.Enums.StructureType.StructureType'
data PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT = PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
  { -- | #features-primitivesGeneratedQuery# @primitivesGeneratedQuery@ indicates
    -- whether the implementation supports the
    -- 'Vulkan.Core10.Enums.QueryType.QUERY_TYPE_PRIMITIVES_GENERATED_EXT'
    -- query type.
    PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool
primitivesGeneratedQuery :: Bool
  , -- | #features-primitivesGeneratedQueryWithRasterizerDiscard#
    -- @primitivesGeneratedQueryWithRasterizerDiscard@ indicates whether the
    -- implementation supports this query when
    -- <https://registry.khronos.org/vulkan/specs/1.3-extensions/html/vkspec.html#primsrast-discard rasterization discard>
    -- is enabled.
    PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool
primitivesGeneratedQueryWithRasterizerDiscard :: Bool
  , -- | #features-primitivesGeneratedQueryWithNonZeroStreams#
    -- @primitivesGeneratedQueryWithNonZeroStreams@ indicates whether the
    -- implementation supports this query with a non-zero index in
    -- 'Vulkan.Extensions.VK_EXT_transform_feedback.cmdBeginQueryIndexedEXT'.
    PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool
primitivesGeneratedQueryWithNonZeroStreams :: Bool
  }
  deriving (Typeable, PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool
(PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
 -> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool)
-> (PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
    -> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool)
-> Eq PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool
$c/= :: PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool
== :: PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool
$c== :: PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool
Eq)
#if defined(GENERIC_INSTANCES)
deriving instance Generic (PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT)
#endif
deriving instance Show PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT

instance ToCStruct PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT where
  withCStruct :: forall b.
PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> (Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> IO b)
-> IO b
withCStruct PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
x Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> IO b
f = Int
-> (Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> IO b)
-> IO b
forall a b. Int -> (Ptr a -> IO b) -> IO b
allocaBytes Int
32 ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> IO b)
 -> IO b)
-> (Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> IO b)
-> IO b
forall a b. (a -> b) -> a -> b
$ \Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p -> Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> IO b
-> IO b
forall a b. ToCStruct a => Ptr a -> a -> IO b -> IO b
pokeCStruct Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
x (Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> IO b
f Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p)
  pokeCStruct :: forall b.
Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> IO b
-> IO b
pokeCStruct Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT{Bool
primitivesGeneratedQueryWithNonZeroStreams :: Bool
primitivesGeneratedQueryWithRasterizerDiscard :: Bool
primitivesGeneratedQuery :: Bool
$sel:primitivesGeneratedQueryWithNonZeroStreams:PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT :: PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool
$sel:primitivesGeneratedQueryWithRasterizerDiscard:PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT :: PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool
$sel:primitivesGeneratedQuery:PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT :: PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Bool
..} IO b
f = do
    Ptr StructureType -> StructureType -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr StructureType
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
0 :: Ptr StructureType)) (StructureType
STRUCTURE_TYPE_PHYSICAL_DEVICE_PRIMITIVES_GENERATED_QUERY_FEATURES_EXT)
    Ptr (Ptr ()) -> Ptr () -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr (Ptr ())
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
8 :: Ptr (Ptr ()))) (Ptr ()
forall a. Ptr a
nullPtr)
    Ptr Bool32 -> Bool32 -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr Bool32
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16 :: Ptr Bool32)) (Bool -> Bool32
boolToBool32 (Bool
primitivesGeneratedQuery))
    Ptr Bool32 -> Bool32 -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr Bool32
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
20 :: Ptr Bool32)) (Bool -> Bool32
boolToBool32 (Bool
primitivesGeneratedQueryWithRasterizerDiscard))
    Ptr Bool32 -> Bool32 -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr Bool32
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
24 :: Ptr Bool32)) (Bool -> Bool32
boolToBool32 (Bool
primitivesGeneratedQueryWithNonZeroStreams))
    IO b
f
  cStructSize :: Int
cStructSize = Int
32
  cStructAlignment :: Int
cStructAlignment = Int
8
  pokeZeroCStruct :: forall b.
Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> IO b -> IO b
pokeZeroCStruct Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p IO b
f = do
    Ptr StructureType -> StructureType -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr StructureType
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
0 :: Ptr StructureType)) (StructureType
STRUCTURE_TYPE_PHYSICAL_DEVICE_PRIMITIVES_GENERATED_QUERY_FEATURES_EXT)
    Ptr (Ptr ()) -> Ptr () -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr (Ptr ())
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
8 :: Ptr (Ptr ()))) (Ptr ()
forall a. Ptr a
nullPtr)
    Ptr Bool32 -> Bool32 -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr Bool32
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16 :: Ptr Bool32)) (Bool -> Bool32
boolToBool32 (Bool
forall a. Zero a => a
zero))
    Ptr Bool32 -> Bool32 -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr Bool32
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
20 :: Ptr Bool32)) (Bool -> Bool32
boolToBool32 (Bool
forall a. Zero a => a
zero))
    Ptr Bool32 -> Bool32 -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr Bool32
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
24 :: Ptr Bool32)) (Bool -> Bool32
boolToBool32 (Bool
forall a. Zero a => a
zero))
    IO b
f

instance FromCStruct PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT where
  peekCStruct :: Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> IO PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
peekCStruct Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p = do
    Bool32
primitivesGeneratedQuery <- forall a. Storable a => Ptr a -> IO a
peek @Bool32 ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr Bool32
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16 :: Ptr Bool32))
    Bool32
primitivesGeneratedQueryWithRasterizerDiscard <- forall a. Storable a => Ptr a -> IO a
peek @Bool32 ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr Bool32
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
20 :: Ptr Bool32))
    Bool32
primitivesGeneratedQueryWithNonZeroStreams <- forall a. Storable a => Ptr a -> IO a
peek @Bool32 ((Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
p Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> Int -> Ptr Bool32
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
24 :: Ptr Bool32))
    PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> IO PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
forall (f :: * -> *) a. Applicative f => a -> f a
pure (PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
 -> IO PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT)
-> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> IO PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
forall a b. (a -> b) -> a -> b
$ Bool
-> Bool
-> Bool
-> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
             (Bool32 -> Bool
bool32ToBool Bool32
primitivesGeneratedQuery)
             (Bool32 -> Bool
bool32ToBool Bool32
primitivesGeneratedQueryWithRasterizerDiscard)
             (Bool32 -> Bool
bool32ToBool Bool32
primitivesGeneratedQueryWithNonZeroStreams)

instance Storable PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT where
  sizeOf :: PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Int
sizeOf ~PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
_ = Int
32
  alignment :: PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> Int
alignment ~PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
_ = Int
8
  peek :: Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> IO PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
peek = Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> IO PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
forall a. FromCStruct a => Ptr a -> IO a
peekCStruct
  poke :: Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT -> IO ()
poke Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
poked = Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
-> IO ()
-> IO ()
forall a b. ToCStruct a => Ptr a -> a -> IO b -> IO b
pokeCStruct Ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
ptr PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
poked (() -> IO ()
forall (f :: * -> *) a. Applicative f => a -> f a
pure ())

instance Zero PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT where
  zero :: PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
zero = Bool
-> Bool
-> Bool
-> PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
PhysicalDevicePrimitivesGeneratedQueryFeaturesEXT
           Bool
forall a. Zero a => a
zero
           Bool
forall a. Zero a => a
zero
           Bool
forall a. Zero a => a
zero


type EXT_PRIMITIVES_GENERATED_QUERY_SPEC_VERSION = 1

-- No documentation found for TopLevel "VK_EXT_PRIMITIVES_GENERATED_QUERY_SPEC_VERSION"
pattern EXT_PRIMITIVES_GENERATED_QUERY_SPEC_VERSION :: forall a . Integral a => a
pattern $bEXT_PRIMITIVES_GENERATED_QUERY_SPEC_VERSION :: forall a. Integral a => a
$mEXT_PRIMITIVES_GENERATED_QUERY_SPEC_VERSION :: forall {r} {a}.
Integral a =>
a -> (Void# -> r) -> (Void# -> r) -> r
EXT_PRIMITIVES_GENERATED_QUERY_SPEC_VERSION = 1


type EXT_PRIMITIVES_GENERATED_QUERY_EXTENSION_NAME = "VK_EXT_primitives_generated_query"

-- No documentation found for TopLevel "VK_EXT_PRIMITIVES_GENERATED_QUERY_EXTENSION_NAME"
pattern EXT_PRIMITIVES_GENERATED_QUERY_EXTENSION_NAME :: forall a . (Eq a, IsString a) => a
pattern $bEXT_PRIMITIVES_GENERATED_QUERY_EXTENSION_NAME :: forall a. (Eq a, IsString a) => a
$mEXT_PRIMITIVES_GENERATED_QUERY_EXTENSION_NAME :: forall {r} {a}.
(Eq a, IsString a) =>
a -> (Void# -> r) -> (Void# -> r) -> r
EXT_PRIMITIVES_GENERATED_QUERY_EXTENSION_NAME = "VK_EXT_primitives_generated_query"