{-# language CPP #-}
module Vulkan.Extensions.VK_EXT_4444_formats ( pattern FORMAT_A4R4G4B4_UNORM_PACK16_EXT
, pattern FORMAT_A4B4G4R4_UNORM_PACK16_EXT
, PhysicalDevice4444FormatsFeaturesEXT(..)
, EXT_4444_FORMATS_SPEC_VERSION
, pattern EXT_4444_FORMATS_SPEC_VERSION
, EXT_4444_FORMATS_EXTENSION_NAME
, pattern EXT_4444_FORMATS_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.Format (Format(FORMAT_A4B4G4R4_UNORM_PACK16))
import Vulkan.Core10.Enums.Format (Format(FORMAT_A4R4G4B4_UNORM_PACK16))
import Vulkan.Core10.Enums.StructureType (StructureType(STRUCTURE_TYPE_PHYSICAL_DEVICE_4444_FORMATS_FEATURES_EXT))
pattern $bFORMAT_A4R4G4B4_UNORM_PACK16_EXT :: Format
$mFORMAT_A4R4G4B4_UNORM_PACK16_EXT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r
FORMAT_A4R4G4B4_UNORM_PACK16_EXT = FORMAT_A4R4G4B4_UNORM_PACK16
pattern $bFORMAT_A4B4G4R4_UNORM_PACK16_EXT :: Format
$mFORMAT_A4B4G4R4_UNORM_PACK16_EXT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r
FORMAT_A4B4G4R4_UNORM_PACK16_EXT = FORMAT_A4B4G4R4_UNORM_PACK16
data PhysicalDevice4444FormatsFeaturesEXT = PhysicalDevice4444FormatsFeaturesEXT
{
PhysicalDevice4444FormatsFeaturesEXT -> Bool
formatA4R4G4B4 :: Bool
,
PhysicalDevice4444FormatsFeaturesEXT -> Bool
formatA4B4G4R4 :: Bool
}
deriving (Typeable, PhysicalDevice4444FormatsFeaturesEXT
-> PhysicalDevice4444FormatsFeaturesEXT -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PhysicalDevice4444FormatsFeaturesEXT
-> PhysicalDevice4444FormatsFeaturesEXT -> Bool
$c/= :: PhysicalDevice4444FormatsFeaturesEXT
-> PhysicalDevice4444FormatsFeaturesEXT -> Bool
== :: PhysicalDevice4444FormatsFeaturesEXT
-> PhysicalDevice4444FormatsFeaturesEXT -> Bool
$c== :: PhysicalDevice4444FormatsFeaturesEXT
-> PhysicalDevice4444FormatsFeaturesEXT -> Bool
Eq)
#if defined(GENERIC_INSTANCES)
deriving instance Generic (PhysicalDevice4444FormatsFeaturesEXT)
#endif
deriving instance Show PhysicalDevice4444FormatsFeaturesEXT
instance ToCStruct PhysicalDevice4444FormatsFeaturesEXT where
withCStruct :: forall b.
PhysicalDevice4444FormatsFeaturesEXT
-> (Ptr PhysicalDevice4444FormatsFeaturesEXT -> IO b) -> IO b
withCStruct PhysicalDevice4444FormatsFeaturesEXT
x Ptr PhysicalDevice4444FormatsFeaturesEXT -> IO b
f = forall a b. Int -> (Ptr a -> IO b) -> IO b
allocaBytes Int
24 forall a b. (a -> b) -> a -> b
$ \Ptr PhysicalDevice4444FormatsFeaturesEXT
p -> forall a b. ToCStruct a => Ptr a -> a -> IO b -> IO b
pokeCStruct Ptr PhysicalDevice4444FormatsFeaturesEXT
p PhysicalDevice4444FormatsFeaturesEXT
x (Ptr PhysicalDevice4444FormatsFeaturesEXT -> IO b
f Ptr PhysicalDevice4444FormatsFeaturesEXT
p)
pokeCStruct :: forall b.
Ptr PhysicalDevice4444FormatsFeaturesEXT
-> PhysicalDevice4444FormatsFeaturesEXT -> IO b -> IO b
pokeCStruct Ptr PhysicalDevice4444FormatsFeaturesEXT
p PhysicalDevice4444FormatsFeaturesEXT{Bool
formatA4B4G4R4 :: Bool
formatA4R4G4B4 :: Bool
$sel:formatA4B4G4R4:PhysicalDevice4444FormatsFeaturesEXT :: PhysicalDevice4444FormatsFeaturesEXT -> Bool
$sel:formatA4R4G4B4:PhysicalDevice4444FormatsFeaturesEXT :: PhysicalDevice4444FormatsFeaturesEXT -> Bool
..} IO b
f = do
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevice4444FormatsFeaturesEXT
p forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
0 :: Ptr StructureType)) (StructureType
STRUCTURE_TYPE_PHYSICAL_DEVICE_4444_FORMATS_FEATURES_EXT)
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevice4444FormatsFeaturesEXT
p forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
8 :: Ptr (Ptr ()))) (forall a. Ptr a
nullPtr)
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevice4444FormatsFeaturesEXT
p forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16 :: Ptr Bool32)) (Bool -> Bool32
boolToBool32 (Bool
formatA4R4G4B4))
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevice4444FormatsFeaturesEXT
p forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
20 :: Ptr Bool32)) (Bool -> Bool32
boolToBool32 (Bool
formatA4B4G4R4))
IO b
f
cStructSize :: Int
cStructSize = Int
24
cStructAlignment :: Int
cStructAlignment = Int
8
pokeZeroCStruct :: forall b. Ptr PhysicalDevice4444FormatsFeaturesEXT -> IO b -> IO b
pokeZeroCStruct Ptr PhysicalDevice4444FormatsFeaturesEXT
p IO b
f = do
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevice4444FormatsFeaturesEXT
p forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
0 :: Ptr StructureType)) (StructureType
STRUCTURE_TYPE_PHYSICAL_DEVICE_4444_FORMATS_FEATURES_EXT)
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevice4444FormatsFeaturesEXT
p forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
8 :: Ptr (Ptr ()))) (forall a. Ptr a
nullPtr)
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevice4444FormatsFeaturesEXT
p forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16 :: Ptr Bool32)) (Bool -> Bool32
boolToBool32 (forall a. Zero a => a
zero))
forall a. Storable a => Ptr a -> a -> IO ()
poke ((Ptr PhysicalDevice4444FormatsFeaturesEXT
p forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
20 :: Ptr Bool32)) (Bool -> Bool32
boolToBool32 (forall a. Zero a => a
zero))
IO b
f
instance FromCStruct PhysicalDevice4444FormatsFeaturesEXT where
peekCStruct :: Ptr PhysicalDevice4444FormatsFeaturesEXT
-> IO PhysicalDevice4444FormatsFeaturesEXT
peekCStruct Ptr PhysicalDevice4444FormatsFeaturesEXT
p = do
Bool32
formatA4R4G4B4 <- forall a. Storable a => Ptr a -> IO a
peek @Bool32 ((Ptr PhysicalDevice4444FormatsFeaturesEXT
p forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16 :: Ptr Bool32))
Bool32
formatA4B4G4R4 <- forall a. Storable a => Ptr a -> IO a
peek @Bool32 ((Ptr PhysicalDevice4444FormatsFeaturesEXT
p forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
20 :: Ptr Bool32))
forall (f :: * -> *) a. Applicative f => a -> f a
pure forall a b. (a -> b) -> a -> b
$ Bool -> Bool -> PhysicalDevice4444FormatsFeaturesEXT
PhysicalDevice4444FormatsFeaturesEXT
(Bool32 -> Bool
bool32ToBool Bool32
formatA4R4G4B4) (Bool32 -> Bool
bool32ToBool Bool32
formatA4B4G4R4)
instance Storable PhysicalDevice4444FormatsFeaturesEXT where
sizeOf :: PhysicalDevice4444FormatsFeaturesEXT -> Int
sizeOf ~PhysicalDevice4444FormatsFeaturesEXT
_ = Int
24
alignment :: PhysicalDevice4444FormatsFeaturesEXT -> Int
alignment ~PhysicalDevice4444FormatsFeaturesEXT
_ = Int
8
peek :: Ptr PhysicalDevice4444FormatsFeaturesEXT
-> IO PhysicalDevice4444FormatsFeaturesEXT
peek = forall a. FromCStruct a => Ptr a -> IO a
peekCStruct
poke :: Ptr PhysicalDevice4444FormatsFeaturesEXT
-> PhysicalDevice4444FormatsFeaturesEXT -> IO ()
poke Ptr PhysicalDevice4444FormatsFeaturesEXT
ptr PhysicalDevice4444FormatsFeaturesEXT
poked = forall a b. ToCStruct a => Ptr a -> a -> IO b -> IO b
pokeCStruct Ptr PhysicalDevice4444FormatsFeaturesEXT
ptr PhysicalDevice4444FormatsFeaturesEXT
poked (forall (f :: * -> *) a. Applicative f => a -> f a
pure ())
instance Zero PhysicalDevice4444FormatsFeaturesEXT where
zero :: PhysicalDevice4444FormatsFeaturesEXT
zero = Bool -> Bool -> PhysicalDevice4444FormatsFeaturesEXT
PhysicalDevice4444FormatsFeaturesEXT
forall a. Zero a => a
zero
forall a. Zero a => a
zero
type EXT_4444_FORMATS_SPEC_VERSION = 1
pattern EXT_4444_FORMATS_SPEC_VERSION :: forall a . Integral a => a
pattern $bEXT_4444_FORMATS_SPEC_VERSION :: forall a. Integral a => a
$mEXT_4444_FORMATS_SPEC_VERSION :: forall {r} {a}.
Integral a =>
a -> ((# #) -> r) -> ((# #) -> r) -> r
EXT_4444_FORMATS_SPEC_VERSION = 1
type EXT_4444_FORMATS_EXTENSION_NAME = "VK_EXT_4444_formats"
pattern EXT_4444_FORMATS_EXTENSION_NAME :: forall a . (Eq a, IsString a) => a
pattern $bEXT_4444_FORMATS_EXTENSION_NAME :: forall a. (Eq a, IsString a) => a
$mEXT_4444_FORMATS_EXTENSION_NAME :: forall {r} {a}.
(Eq a, IsString a) =>
a -> ((# #) -> r) -> ((# #) -> r) -> r
EXT_4444_FORMATS_EXTENSION_NAME = "VK_EXT_4444_formats"