{-# language CPP #-}
-- | = Name
--
-- VK_EXT_astc_decode_mode - device extension
--
-- == VK_EXT_astc_decode_mode
--
-- [__Name String__]
--     @VK_EXT_astc_decode_mode@
--
-- [__Extension Type__]
--     Device extension
--
-- [__Registered Extension Number__]
--     68
--
-- [__Revision__]
--     1
--
-- [__Extension and Version Dependencies__]
--
--     -   Requires support for Vulkan 1.0
--
--     -   Requires @VK_KHR_get_physical_device_properties2@ to be enabled
--         for any device-level functionality
--
-- [__Contact__]
--
--     -   Jan-Harald Fredriksen
--         <https://github.com/KhronosGroup/Vulkan-Docs/issues/new?body=[VK_EXT_astc_decode_mode] @janharaldfredriksen-arm%0A*Here describe the issue or question you have about the VK_EXT_astc_decode_mode extension* >
--
-- == Other Extension Metadata
--
-- [__Last Modified Date__]
--     2018-08-07
--
-- [__Contributors__]
--
--     -   Jan-Harald Fredriksen, Arm
--
-- == Description
--
-- The existing specification requires that low dynamic range (LDR) ASTC
-- textures are decompressed to FP16 values per component. In many cases,
-- decompressing LDR textures to a lower precision intermediate result
-- gives acceptable image quality. Source material for LDR textures is
-- typically authored as 8-bit UNORM values, so decoding to FP16 values
-- adds little value. On the other hand, reducing precision of the decoded
-- result reduces the size of the decompressed data, potentially improving
-- texture cache performance and saving power.
--
-- The goal of this extension is to enable this efficiency gain on existing
-- ASTC texture data. This is achieved by giving the application the
-- ability to select the intermediate decoding precision.
--
-- Three decoding options are provided:
--
-- -   Decode to 'Vulkan.Core10.Enums.Format.FORMAT_R16G16B16A16_SFLOAT'
--     precision: This is the default, and matches the required behavior in
--     the core API.
--
-- -   Decode to 'Vulkan.Core10.Enums.Format.FORMAT_R8G8B8A8_UNORM'
--     precision: This is provided as an option in LDR mode.
--
-- -   Decode to 'Vulkan.Core10.Enums.Format.FORMAT_E5B9G9R9_UFLOAT_PACK32'
--     precision: This is provided as an option in both LDR and HDR mode.
--     In this mode, negative values cannot be represented and are clamped
--     to zero. The alpha component is ignored, and the results are as if
--     alpha was 1.0. This decode mode is optional and support can be
--     queried via the physical device properties.
--
-- == New Structures
--
-- -   Extending 'Vulkan.Core10.ImageView.ImageViewCreateInfo':
--
--     -   'ImageViewASTCDecodeModeEXT'
--
-- -   Extending
--     'Vulkan.Core11.Promoted_From_VK_KHR_get_physical_device_properties2.PhysicalDeviceFeatures2',
--     'Vulkan.Core10.Device.DeviceCreateInfo':
--
--     -   'PhysicalDeviceASTCDecodeFeaturesEXT'
--
-- == New Enum Constants
--
-- -   'EXT_ASTC_DECODE_MODE_EXTENSION_NAME'
--
-- -   'EXT_ASTC_DECODE_MODE_SPEC_VERSION'
--
-- -   Extending 'Vulkan.Core10.Enums.StructureType.StructureType':
--
--     -   'Vulkan.Core10.Enums.StructureType.STRUCTURE_TYPE_IMAGE_VIEW_ASTC_DECODE_MODE_EXT'
--
--     -   'Vulkan.Core10.Enums.StructureType.STRUCTURE_TYPE_PHYSICAL_DEVICE_ASTC_DECODE_FEATURES_EXT'
--
-- == Issues
--
-- 1) Are implementations allowed to decode at a higher precision than what
-- is requested?
--
-- > RESOLUTION: No.
-- > If we allow this, then this extension could be exposed on all
-- > implementations that support ASTC.
-- > But developers would have no way of knowing what precision was actually
-- > used, and thus whether the image quality is sufficient at reduced
-- > precision.
--
-- 2) Should the decode mode be image view state and\/or sampler state?
--
-- > RESOLUTION: Image view state only.
-- > Some implementations treat the different decode modes as different
-- > texture formats.
--
-- == Example
--
-- Create an image view that decodes to
-- 'Vulkan.Core10.Enums.Format.FORMAT_R8G8B8A8_UNORM' precision:
--
-- >     VkImageViewASTCDecodeModeEXT decodeMode =
-- >     {
-- >         VK_STRUCTURE_TYPE_IMAGE_VIEW_ASTC_DECODE_MODE_EXT, // sType
-- >         NULL, // pNext
-- >         VK_FORMAT_R8G8B8A8_UNORM // decode mode
-- >     };
-- >
-- >     VkImageViewCreateInfo createInfo =
-- >     {
-- >         VK_STRUCTURE_TYPE_IMAGE_VIEW_CREATE_INFO, // sType
-- >         &decodeMode, // pNext
-- >         // flags, image, viewType set to application-desired values
-- >         VK_FORMAT_ASTC_8x8_UNORM_BLOCK, // format
-- >         // components, subresourceRange set to application-desired values
-- >     };
-- >
-- >     VkImageView imageView;
-- >     VkResult result = vkCreateImageView(
-- >         device,
-- >         &createInfo,
-- >         NULL,
-- >         &imageView);
--
-- == Version History
--
-- -   Revision 1, 2018-08-07 (Jan-Harald Fredriksen)
--
--     -   Initial revision
--
-- == See Also
--
-- 'ImageViewASTCDecodeModeEXT', 'PhysicalDeviceASTCDecodeFeaturesEXT'
--
-- == Document Notes
--
-- For more information, see the
-- <https://registry.khronos.org/vulkan/specs/1.3-extensions/html/vkspec.html#VK_EXT_astc_decode_mode 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_astc_decode_mode  ( ImageViewASTCDecodeModeEXT(..)
                                                  , PhysicalDeviceASTCDecodeFeaturesEXT(..)
                                                  , EXT_ASTC_DECODE_MODE_SPEC_VERSION
                                                  , pattern EXT_ASTC_DECODE_MODE_SPEC_VERSION
                                                  , EXT_ASTC_DECODE_MODE_EXTENSION_NAME
                                                  , pattern EXT_ASTC_DECODE_MODE_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.Format (Format)
import Vulkan.Core10.Enums.StructureType (StructureType)
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_IMAGE_VIEW_ASTC_DECODE_MODE_EXT))
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_PHYSICAL_DEVICE_ASTC_DECODE_FEATURES_EXT))
-- | VkImageViewASTCDecodeModeEXT - Structure describing the ASTC decode mode
-- for an image view
--
-- == Valid Usage
--
-- -   #VUID-VkImageViewASTCDecodeModeEXT-decodeMode-02230# @decodeMode@
--     /must/ be one of
--     'Vulkan.Core10.Enums.Format.FORMAT_R16G16B16A16_SFLOAT',
--     'Vulkan.Core10.Enums.Format.FORMAT_R8G8B8A8_UNORM', or
--     'Vulkan.Core10.Enums.Format.FORMAT_E5B9G9R9_UFLOAT_PACK32'
--
-- -   #VUID-VkImageViewASTCDecodeModeEXT-decodeMode-02231# If the
--     <https://registry.khronos.org/vulkan/specs/1.3-extensions/html/vkspec.html#features-astc-decodeModeSharedExponent decodeModeSharedExponent>
--     feature is not enabled, @decodeMode@ /must/ not be
--     'Vulkan.Core10.Enums.Format.FORMAT_E5B9G9R9_UFLOAT_PACK32'
--
-- -   #VUID-VkImageViewASTCDecodeModeEXT-decodeMode-02232# If @decodeMode@
--     is 'Vulkan.Core10.Enums.Format.FORMAT_R8G8B8A8_UNORM' the image view
--     /must/ not include blocks using any of the ASTC HDR modes
--
-- -   #VUID-VkImageViewASTCDecodeModeEXT-format-04084# @format@ of the
--     image view /must/ be one of the
--     <https://registry.khronos.org/vulkan/specs/1.3-extensions/html/vkspec.html#appendix-compressedtex-astc ASTC Compressed Image Formats>
--
-- If @format@ uses sRGB encoding then the @decodeMode@ has no effect.
--
-- == Valid Usage (Implicit)
--
-- -   #VUID-VkImageViewASTCDecodeModeEXT-sType-sType# @sType@ /must/ be
--     'Vulkan.Core10.Enums.StructureType.STRUCTURE_TYPE_IMAGE_VIEW_ASTC_DECODE_MODE_EXT'
--
-- -   #VUID-VkImageViewASTCDecodeModeEXT-decodeMode-parameter#
--     @decodeMode@ /must/ be a valid 'Vulkan.Core10.Enums.Format.Format'
--     value
--
-- = See Also
--
-- <https://www.khronos.org/registry/vulkan/specs/1.2-extensions/html/vkspec.html#VK_EXT_astc_decode_mode VK_EXT_astc_decode_mode>,
-- 'Vulkan.Core10.Enums.Format.Format',
-- 'Vulkan.Core10.Enums.StructureType.StructureType'
data ImageViewASTCDecodeModeEXT = ImageViewASTCDecodeModeEXT
  { -- | @decodeMode@ is the intermediate format used to decode ASTC compressed
    -- formats.
    ImageViewASTCDecodeModeEXT -> Format
decodeMode :: Format }
  deriving (Typeable, ImageViewASTCDecodeModeEXT -> ImageViewASTCDecodeModeEXT -> Bool
(ImageViewASTCDecodeModeEXT -> ImageViewASTCDecodeModeEXT -> Bool)
-> (ImageViewASTCDecodeModeEXT
    -> ImageViewASTCDecodeModeEXT -> Bool)
-> Eq ImageViewASTCDecodeModeEXT
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ImageViewASTCDecodeModeEXT -> ImageViewASTCDecodeModeEXT -> Bool
$c/= :: ImageViewASTCDecodeModeEXT -> ImageViewASTCDecodeModeEXT -> Bool
== :: ImageViewASTCDecodeModeEXT -> ImageViewASTCDecodeModeEXT -> Bool
$c== :: ImageViewASTCDecodeModeEXT -> ImageViewASTCDecodeModeEXT -> Bool
Eq)
#if defined(GENERIC_INSTANCES)
deriving instance Generic (ImageViewASTCDecodeModeEXT)
#endif
deriving instance Show ImageViewASTCDecodeModeEXT

instance ToCStruct ImageViewASTCDecodeModeEXT where
  withCStruct :: forall b.
ImageViewASTCDecodeModeEXT
-> (Ptr ImageViewASTCDecodeModeEXT -> IO b) -> IO b
withCStruct ImageViewASTCDecodeModeEXT
x Ptr ImageViewASTCDecodeModeEXT -> IO b
f = Int -> (Ptr ImageViewASTCDecodeModeEXT -> IO b) -> IO b
forall a b. Int -> (Ptr a -> IO b) -> IO b
allocaBytes Int
24 ((Ptr ImageViewASTCDecodeModeEXT -> IO b) -> IO b)
-> (Ptr ImageViewASTCDecodeModeEXT -> IO b) -> IO b
forall a b. (a -> b) -> a -> b
$ \Ptr ImageViewASTCDecodeModeEXT
p -> Ptr ImageViewASTCDecodeModeEXT
-> ImageViewASTCDecodeModeEXT -> IO b -> IO b
forall a b. ToCStruct a => Ptr a -> a -> IO b -> IO b
pokeCStruct Ptr ImageViewASTCDecodeModeEXT
p ImageViewASTCDecodeModeEXT
x (Ptr ImageViewASTCDecodeModeEXT -> IO b
f Ptr ImageViewASTCDecodeModeEXT
p)
  pokeCStruct :: forall b.
Ptr ImageViewASTCDecodeModeEXT
-> ImageViewASTCDecodeModeEXT -> IO b -> IO b
pokeCStruct Ptr ImageViewASTCDecodeModeEXT
p ImageViewASTCDecodeModeEXT{Format
decodeMode :: Format
$sel:decodeMode:ImageViewASTCDecodeModeEXT :: ImageViewASTCDecodeModeEXT -> Format
..} IO b
f = do
    Ptr StructureType -> StructureType -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr ImageViewASTCDecodeModeEXT
p Ptr ImageViewASTCDecodeModeEXT -> Int -> Ptr StructureType
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
0 :: Ptr StructureType)) (StructureType
STRUCTURE_TYPE_IMAGE_VIEW_ASTC_DECODE_MODE_EXT)
    Ptr (Ptr ()) -> Ptr () -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr ImageViewASTCDecodeModeEXT
p Ptr ImageViewASTCDecodeModeEXT -> Int -> Ptr (Ptr ())
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
8 :: Ptr (Ptr ()))) (Ptr ()
forall a. Ptr a
nullPtr)
    Ptr Format -> Format -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr ImageViewASTCDecodeModeEXT
p Ptr ImageViewASTCDecodeModeEXT -> Int -> Ptr Format
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16 :: Ptr Format)) (Format
decodeMode)
    IO b
f
  cStructSize :: Int
cStructSize = Int
24
  cStructAlignment :: Int
cStructAlignment = Int
8
  pokeZeroCStruct :: forall b. Ptr ImageViewASTCDecodeModeEXT -> IO b -> IO b
pokeZeroCStruct Ptr ImageViewASTCDecodeModeEXT
p IO b
f = do
    Ptr StructureType -> StructureType -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr ImageViewASTCDecodeModeEXT
p Ptr ImageViewASTCDecodeModeEXT -> Int -> Ptr StructureType
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
0 :: Ptr StructureType)) (StructureType
STRUCTURE_TYPE_IMAGE_VIEW_ASTC_DECODE_MODE_EXT)
    Ptr (Ptr ()) -> Ptr () -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr ImageViewASTCDecodeModeEXT
p Ptr ImageViewASTCDecodeModeEXT -> Int -> Ptr (Ptr ())
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
8 :: Ptr (Ptr ()))) (Ptr ()
forall a. Ptr a
nullPtr)
    Ptr Format -> Format -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr ImageViewASTCDecodeModeEXT
p Ptr ImageViewASTCDecodeModeEXT -> Int -> Ptr Format
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16 :: Ptr Format)) (Format
forall a. Zero a => a
zero)
    IO b
f

instance FromCStruct ImageViewASTCDecodeModeEXT where
  peekCStruct :: Ptr ImageViewASTCDecodeModeEXT -> IO ImageViewASTCDecodeModeEXT
peekCStruct Ptr ImageViewASTCDecodeModeEXT
p = do
    Format
decodeMode <- forall a. Storable a => Ptr a -> IO a
peek @Format ((Ptr ImageViewASTCDecodeModeEXT
p Ptr ImageViewASTCDecodeModeEXT -> Int -> Ptr Format
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16 :: Ptr Format))
    ImageViewASTCDecodeModeEXT -> IO ImageViewASTCDecodeModeEXT
forall (f :: * -> *) a. Applicative f => a -> f a
pure (ImageViewASTCDecodeModeEXT -> IO ImageViewASTCDecodeModeEXT)
-> ImageViewASTCDecodeModeEXT -> IO ImageViewASTCDecodeModeEXT
forall a b. (a -> b) -> a -> b
$ Format -> ImageViewASTCDecodeModeEXT
ImageViewASTCDecodeModeEXT
             Format
decodeMode

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

instance Zero ImageViewASTCDecodeModeEXT where
  zero :: ImageViewASTCDecodeModeEXT
zero = Format -> ImageViewASTCDecodeModeEXT
ImageViewASTCDecodeModeEXT
           Format
forall a. Zero a => a
zero


-- | VkPhysicalDeviceASTCDecodeFeaturesEXT - Structure describing ASTC decode
-- mode features
--
-- = Members
--
-- This structure describes the following feature:
--
-- = Description
--
-- If the 'PhysicalDeviceASTCDecodeFeaturesEXT' 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. 'PhysicalDeviceASTCDecodeFeaturesEXT' /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_astc_decode_mode VK_EXT_astc_decode_mode>,
-- 'Vulkan.Core10.FundamentalTypes.Bool32',
-- 'Vulkan.Core10.Enums.StructureType.StructureType'
data PhysicalDeviceASTCDecodeFeaturesEXT = PhysicalDeviceASTCDecodeFeaturesEXT
  { -- | #features-astc-decodeModeSharedExponent# @decodeModeSharedExponent@
    -- indicates whether the implementation supports decoding ASTC compressed
    -- formats to 'Vulkan.Core10.Enums.Format.FORMAT_E5B9G9R9_UFLOAT_PACK32'
    -- internal precision.
    PhysicalDeviceASTCDecodeFeaturesEXT -> Bool
decodeModeSharedExponent :: Bool }
  deriving (Typeable, PhysicalDeviceASTCDecodeFeaturesEXT
-> PhysicalDeviceASTCDecodeFeaturesEXT -> Bool
(PhysicalDeviceASTCDecodeFeaturesEXT
 -> PhysicalDeviceASTCDecodeFeaturesEXT -> Bool)
-> (PhysicalDeviceASTCDecodeFeaturesEXT
    -> PhysicalDeviceASTCDecodeFeaturesEXT -> Bool)
-> Eq PhysicalDeviceASTCDecodeFeaturesEXT
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PhysicalDeviceASTCDecodeFeaturesEXT
-> PhysicalDeviceASTCDecodeFeaturesEXT -> Bool
$c/= :: PhysicalDeviceASTCDecodeFeaturesEXT
-> PhysicalDeviceASTCDecodeFeaturesEXT -> Bool
== :: PhysicalDeviceASTCDecodeFeaturesEXT
-> PhysicalDeviceASTCDecodeFeaturesEXT -> Bool
$c== :: PhysicalDeviceASTCDecodeFeaturesEXT
-> PhysicalDeviceASTCDecodeFeaturesEXT -> Bool
Eq)
#if defined(GENERIC_INSTANCES)
deriving instance Generic (PhysicalDeviceASTCDecodeFeaturesEXT)
#endif
deriving instance Show PhysicalDeviceASTCDecodeFeaturesEXT

instance ToCStruct PhysicalDeviceASTCDecodeFeaturesEXT where
  withCStruct :: forall b.
PhysicalDeviceASTCDecodeFeaturesEXT
-> (Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> IO b) -> IO b
withCStruct PhysicalDeviceASTCDecodeFeaturesEXT
x Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> IO b
f = Int -> (Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> IO b) -> IO b
forall a b. Int -> (Ptr a -> IO b) -> IO b
allocaBytes Int
24 ((Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> IO b) -> IO b)
-> (Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> IO b) -> IO b
forall a b. (a -> b) -> a -> b
$ \Ptr PhysicalDeviceASTCDecodeFeaturesEXT
p -> Ptr PhysicalDeviceASTCDecodeFeaturesEXT
-> PhysicalDeviceASTCDecodeFeaturesEXT -> IO b -> IO b
forall a b. ToCStruct a => Ptr a -> a -> IO b -> IO b
pokeCStruct Ptr PhysicalDeviceASTCDecodeFeaturesEXT
p PhysicalDeviceASTCDecodeFeaturesEXT
x (Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> IO b
f Ptr PhysicalDeviceASTCDecodeFeaturesEXT
p)
  pokeCStruct :: forall b.
Ptr PhysicalDeviceASTCDecodeFeaturesEXT
-> PhysicalDeviceASTCDecodeFeaturesEXT -> IO b -> IO b
pokeCStruct Ptr PhysicalDeviceASTCDecodeFeaturesEXT
p PhysicalDeviceASTCDecodeFeaturesEXT{Bool
decodeModeSharedExponent :: Bool
$sel:decodeModeSharedExponent:PhysicalDeviceASTCDecodeFeaturesEXT :: PhysicalDeviceASTCDecodeFeaturesEXT -> Bool
..} IO b
f = do
    Ptr StructureType -> StructureType -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDeviceASTCDecodeFeaturesEXT
p Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> Int -> Ptr StructureType
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
0 :: Ptr StructureType)) (StructureType
STRUCTURE_TYPE_PHYSICAL_DEVICE_ASTC_DECODE_FEATURES_EXT)
    Ptr (Ptr ()) -> Ptr () -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDeviceASTCDecodeFeaturesEXT
p Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> 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 PhysicalDeviceASTCDecodeFeaturesEXT
p Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> Int -> Ptr Bool32
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16 :: Ptr Bool32)) (Bool -> Bool32
boolToBool32 (Bool
decodeModeSharedExponent))
    IO b
f
  cStructSize :: Int
cStructSize = Int
24
  cStructAlignment :: Int
cStructAlignment = Int
8
  pokeZeroCStruct :: forall b. Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> IO b -> IO b
pokeZeroCStruct Ptr PhysicalDeviceASTCDecodeFeaturesEXT
p IO b
f = do
    Ptr StructureType -> StructureType -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDeviceASTCDecodeFeaturesEXT
p Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> Int -> Ptr StructureType
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
0 :: Ptr StructureType)) (StructureType
STRUCTURE_TYPE_PHYSICAL_DEVICE_ASTC_DECODE_FEATURES_EXT)
    Ptr (Ptr ()) -> Ptr () -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDeviceASTCDecodeFeaturesEXT
p Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> 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 PhysicalDeviceASTCDecodeFeaturesEXT
p Ptr PhysicalDeviceASTCDecodeFeaturesEXT -> 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))
    IO b
f

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

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

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


type EXT_ASTC_DECODE_MODE_SPEC_VERSION = 1

-- No documentation found for TopLevel "VK_EXT_ASTC_DECODE_MODE_SPEC_VERSION"
pattern EXT_ASTC_DECODE_MODE_SPEC_VERSION :: forall a . Integral a => a
pattern $bEXT_ASTC_DECODE_MODE_SPEC_VERSION :: forall a. Integral a => a
$mEXT_ASTC_DECODE_MODE_SPEC_VERSION :: forall {r} {a}.
Integral a =>
a -> (Void# -> r) -> (Void# -> r) -> r
EXT_ASTC_DECODE_MODE_SPEC_VERSION = 1


type EXT_ASTC_DECODE_MODE_EXTENSION_NAME = "VK_EXT_astc_decode_mode"

-- No documentation found for TopLevel "VK_EXT_ASTC_DECODE_MODE_EXTENSION_NAME"
pattern EXT_ASTC_DECODE_MODE_EXTENSION_NAME :: forall a . (Eq a, IsString a) => a
pattern $bEXT_ASTC_DECODE_MODE_EXTENSION_NAME :: forall a. (Eq a, IsString a) => a
$mEXT_ASTC_DECODE_MODE_EXTENSION_NAME :: forall {r} {a}.
(Eq a, IsString a) =>
a -> (Void# -> r) -> (Void# -> r) -> r
EXT_ASTC_DECODE_MODE_EXTENSION_NAME = "VK_EXT_astc_decode_mode"