{-# language CPP #-}
module Vulkan.Extensions.VK_KHR_get_physical_device_properties2 ( pattern STRUCTURE_TYPE_PHYSICAL_DEVICE_FEATURES_2_KHR
, pattern STRUCTURE_TYPE_PHYSICAL_DEVICE_PROPERTIES_2_KHR
, pattern STRUCTURE_TYPE_FORMAT_PROPERTIES_2_KHR
, pattern STRUCTURE_TYPE_IMAGE_FORMAT_PROPERTIES_2_KHR
, pattern STRUCTURE_TYPE_PHYSICAL_DEVICE_IMAGE_FORMAT_INFO_2_KHR
, pattern STRUCTURE_TYPE_QUEUE_FAMILY_PROPERTIES_2_KHR
, pattern STRUCTURE_TYPE_PHYSICAL_DEVICE_MEMORY_PROPERTIES_2_KHR
, pattern STRUCTURE_TYPE_SPARSE_IMAGE_FORMAT_PROPERTIES_2_KHR
, pattern STRUCTURE_TYPE_PHYSICAL_DEVICE_SPARSE_IMAGE_FORMAT_INFO_2_KHR
, getPhysicalDeviceFeatures2KHR
, getPhysicalDeviceProperties2KHR
, getPhysicalDeviceFormatProperties2KHR
, getPhysicalDeviceImageFormatProperties2KHR
, getPhysicalDeviceQueueFamilyProperties2KHR
, getPhysicalDeviceMemoryProperties2KHR
, getPhysicalDeviceSparseImageFormatProperties2KHR
, PhysicalDeviceFeatures2KHR
, PhysicalDeviceProperties2KHR
, FormatProperties2KHR
, ImageFormatProperties2KHR
, PhysicalDeviceImageFormatInfo2KHR
, QueueFamilyProperties2KHR
, PhysicalDeviceMemoryProperties2KHR
, SparseImageFormatProperties2KHR
, PhysicalDeviceSparseImageFormatInfo2KHR
, KHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_SPEC_VERSION
, pattern KHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_SPEC_VERSION
, KHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_EXTENSION_NAME
, pattern KHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_EXTENSION_NAME
) where
import Data.String (IsString)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (getPhysicalDeviceFeatures2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (getPhysicalDeviceFormatProperties2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (getPhysicalDeviceImageFormatProperties2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (getPhysicalDeviceMemoryProperties2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (getPhysicalDeviceProperties2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (getPhysicalDeviceQueueFamilyProperties2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (getPhysicalDeviceSparseImageFormatProperties2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (FormatProperties2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (ImageFormatProperties2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (PhysicalDeviceFeatures2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (PhysicalDeviceImageFormatInfo2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (PhysicalDeviceMemoryProperties2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (PhysicalDeviceProperties2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (PhysicalDeviceSparseImageFormatInfo2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (QueueFamilyProperties2)
import Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2 (SparseImageFormatProperties2)
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_FORMAT_PROPERTIES_2))
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_IMAGE_FORMAT_PROPERTIES_2))
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_PHYSICAL_DEVICE_FEATURES_2))
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_PHYSICAL_DEVICE_IMAGE_FORMAT_INFO_2))
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_PHYSICAL_DEVICE_MEMORY_PROPERTIES_2))
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_PHYSICAL_DEVICE_PROPERTIES_2))
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_PHYSICAL_DEVICE_SPARSE_IMAGE_FORMAT_INFO_2))
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_QUEUE_FAMILY_PROPERTIES_2))
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_SPARSE_IMAGE_FORMAT_PROPERTIES_2))
pattern $bSTRUCTURE_TYPE_PHYSICAL_DEVICE_FEATURES_2_KHR :: StructureType
$mSTRUCTURE_TYPE_PHYSICAL_DEVICE_FEATURES_2_KHR :: forall {r}. StructureType -> ((# #) -> r) -> ((# #) -> r) -> r
STRUCTURE_TYPE_PHYSICAL_DEVICE_FEATURES_2_KHR = STRUCTURE_TYPE_PHYSICAL_DEVICE_FEATURES_2
pattern $bSTRUCTURE_TYPE_PHYSICAL_DEVICE_PROPERTIES_2_KHR :: StructureType
$mSTRUCTURE_TYPE_PHYSICAL_DEVICE_PROPERTIES_2_KHR :: forall {r}. StructureType -> ((# #) -> r) -> ((# #) -> r) -> r
STRUCTURE_TYPE_PHYSICAL_DEVICE_PROPERTIES_2_KHR = STRUCTURE_TYPE_PHYSICAL_DEVICE_PROPERTIES_2
pattern $bSTRUCTURE_TYPE_FORMAT_PROPERTIES_2_KHR :: StructureType
$mSTRUCTURE_TYPE_FORMAT_PROPERTIES_2_KHR :: forall {r}. StructureType -> ((# #) -> r) -> ((# #) -> r) -> r
STRUCTURE_TYPE_FORMAT_PROPERTIES_2_KHR = STRUCTURE_TYPE_FORMAT_PROPERTIES_2
pattern $bSTRUCTURE_TYPE_IMAGE_FORMAT_PROPERTIES_2_KHR :: StructureType
$mSTRUCTURE_TYPE_IMAGE_FORMAT_PROPERTIES_2_KHR :: forall {r}. StructureType -> ((# #) -> r) -> ((# #) -> r) -> r
STRUCTURE_TYPE_IMAGE_FORMAT_PROPERTIES_2_KHR = STRUCTURE_TYPE_IMAGE_FORMAT_PROPERTIES_2
pattern $bSTRUCTURE_TYPE_PHYSICAL_DEVICE_IMAGE_FORMAT_INFO_2_KHR :: StructureType
$mSTRUCTURE_TYPE_PHYSICAL_DEVICE_IMAGE_FORMAT_INFO_2_KHR :: forall {r}. StructureType -> ((# #) -> r) -> ((# #) -> r) -> r
STRUCTURE_TYPE_PHYSICAL_DEVICE_IMAGE_FORMAT_INFO_2_KHR = STRUCTURE_TYPE_PHYSICAL_DEVICE_IMAGE_FORMAT_INFO_2
pattern $bSTRUCTURE_TYPE_QUEUE_FAMILY_PROPERTIES_2_KHR :: StructureType
$mSTRUCTURE_TYPE_QUEUE_FAMILY_PROPERTIES_2_KHR :: forall {r}. StructureType -> ((# #) -> r) -> ((# #) -> r) -> r
STRUCTURE_TYPE_QUEUE_FAMILY_PROPERTIES_2_KHR = STRUCTURE_TYPE_QUEUE_FAMILY_PROPERTIES_2
pattern $bSTRUCTURE_TYPE_PHYSICAL_DEVICE_MEMORY_PROPERTIES_2_KHR :: StructureType
$mSTRUCTURE_TYPE_PHYSICAL_DEVICE_MEMORY_PROPERTIES_2_KHR :: forall {r}. StructureType -> ((# #) -> r) -> ((# #) -> r) -> r
STRUCTURE_TYPE_PHYSICAL_DEVICE_MEMORY_PROPERTIES_2_KHR = STRUCTURE_TYPE_PHYSICAL_DEVICE_MEMORY_PROPERTIES_2
pattern $bSTRUCTURE_TYPE_SPARSE_IMAGE_FORMAT_PROPERTIES_2_KHR :: StructureType
$mSTRUCTURE_TYPE_SPARSE_IMAGE_FORMAT_PROPERTIES_2_KHR :: forall {r}. StructureType -> ((# #) -> r) -> ((# #) -> r) -> r
STRUCTURE_TYPE_SPARSE_IMAGE_FORMAT_PROPERTIES_2_KHR = STRUCTURE_TYPE_SPARSE_IMAGE_FORMAT_PROPERTIES_2
pattern $bSTRUCTURE_TYPE_PHYSICAL_DEVICE_SPARSE_IMAGE_FORMAT_INFO_2_KHR :: StructureType
$mSTRUCTURE_TYPE_PHYSICAL_DEVICE_SPARSE_IMAGE_FORMAT_INFO_2_KHR :: forall {r}. StructureType -> ((# #) -> r) -> ((# #) -> r) -> r
STRUCTURE_TYPE_PHYSICAL_DEVICE_SPARSE_IMAGE_FORMAT_INFO_2_KHR = STRUCTURE_TYPE_PHYSICAL_DEVICE_SPARSE_IMAGE_FORMAT_INFO_2
getPhysicalDeviceFeatures2KHR :: PhysicalDevice -> io (PhysicalDeviceFeatures2 a)
getPhysicalDeviceFeatures2KHR = forall (a :: [*]) (io :: * -> *).
(Extendss PhysicalDeviceFeatures2 a, PokeChain a, PeekChain a,
MonadIO io) =>
PhysicalDevice -> io (PhysicalDeviceFeatures2 a)
getPhysicalDeviceFeatures2
getPhysicalDeviceProperties2KHR :: PhysicalDevice -> io (PhysicalDeviceProperties2 a)
getPhysicalDeviceProperties2KHR = forall (a :: [*]) (io :: * -> *).
(Extendss PhysicalDeviceProperties2 a, PokeChain a, PeekChain a,
MonadIO io) =>
PhysicalDevice -> io (PhysicalDeviceProperties2 a)
getPhysicalDeviceProperties2
getPhysicalDeviceFormatProperties2KHR :: PhysicalDevice -> Format -> io (FormatProperties2 a)
getPhysicalDeviceFormatProperties2KHR = forall (a :: [*]) (io :: * -> *).
(Extendss FormatProperties2 a, PokeChain a, PeekChain a,
MonadIO io) =>
PhysicalDevice -> Format -> io (FormatProperties2 a)
getPhysicalDeviceFormatProperties2
getPhysicalDeviceImageFormatProperties2KHR :: PhysicalDevice
-> PhysicalDeviceImageFormatInfo2 a
-> io (ImageFormatProperties2 b)
getPhysicalDeviceImageFormatProperties2KHR = forall (a :: [*]) (b :: [*]) (io :: * -> *).
(Extendss PhysicalDeviceImageFormatInfo2 a, PokeChain a,
Extendss ImageFormatProperties2 b, PokeChain b, PeekChain b,
MonadIO io) =>
PhysicalDevice
-> PhysicalDeviceImageFormatInfo2 a
-> io (ImageFormatProperties2 b)
getPhysicalDeviceImageFormatProperties2
getPhysicalDeviceQueueFamilyProperties2KHR :: PhysicalDevice
-> io
("queueFamilyProperties" ::: Vector (QueueFamilyProperties2 a))
getPhysicalDeviceQueueFamilyProperties2KHR = forall (a :: [*]) (io :: * -> *).
(Extendss QueueFamilyProperties2 a, PokeChain a, PeekChain a,
MonadIO io) =>
PhysicalDevice
-> io
("queueFamilyProperties" ::: Vector (QueueFamilyProperties2 a))
getPhysicalDeviceQueueFamilyProperties2
getPhysicalDeviceMemoryProperties2KHR :: PhysicalDevice -> io (PhysicalDeviceMemoryProperties2 a)
getPhysicalDeviceMemoryProperties2KHR = forall (a :: [*]) (io :: * -> *).
(Extendss PhysicalDeviceMemoryProperties2 a, PokeChain a,
PeekChain a, MonadIO io) =>
PhysicalDevice -> io (PhysicalDeviceMemoryProperties2 a)
getPhysicalDeviceMemoryProperties2
getPhysicalDeviceSparseImageFormatProperties2KHR :: PhysicalDevice
-> PhysicalDeviceSparseImageFormatInfo2
-> io ("properties" ::: Vector SparseImageFormatProperties2)
getPhysicalDeviceSparseImageFormatProperties2KHR = forall (io :: * -> *).
MonadIO io =>
PhysicalDevice
-> PhysicalDeviceSparseImageFormatInfo2
-> io ("properties" ::: Vector SparseImageFormatProperties2)
getPhysicalDeviceSparseImageFormatProperties2
type PhysicalDeviceFeatures2KHR = PhysicalDeviceFeatures2
type PhysicalDeviceProperties2KHR = PhysicalDeviceProperties2
type FormatProperties2KHR = FormatProperties2
type ImageFormatProperties2KHR = ImageFormatProperties2
type PhysicalDeviceImageFormatInfo2KHR = PhysicalDeviceImageFormatInfo2
type QueueFamilyProperties2KHR = QueueFamilyProperties2
type PhysicalDeviceMemoryProperties2KHR = PhysicalDeviceMemoryProperties2
type SparseImageFormatProperties2KHR = SparseImageFormatProperties2
type PhysicalDeviceSparseImageFormatInfo2KHR = PhysicalDeviceSparseImageFormatInfo2
type KHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_SPEC_VERSION = 2
pattern KHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_SPEC_VERSION :: forall a . Integral a => a
pattern $bKHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_SPEC_VERSION :: forall a. Integral a => a
$mKHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_SPEC_VERSION :: forall {r} {a}.
Integral a =>
a -> ((# #) -> r) -> ((# #) -> r) -> r
KHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_SPEC_VERSION = 2
type KHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_EXTENSION_NAME = "VK_KHR_get_physical_device_properties2"
pattern KHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_EXTENSION_NAME :: forall a . (Eq a, IsString a) => a
pattern $bKHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_EXTENSION_NAME :: forall a. (Eq a, IsString a) => a
$mKHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_EXTENSION_NAME :: forall {r} {a}.
(Eq a, IsString a) =>
a -> ((# #) -> r) -> ((# #) -> r) -> r
KHR_GET_PHYSICAL_DEVICE_PROPERTIES_2_EXTENSION_NAME = "VK_KHR_get_physical_device_properties2"