vulkan-api-1.1.2.1: Low-level low-overhead vulkan api bindings

Safe HaskellNone
LanguageHaskell2010

Graphics.Vulkan.Ext.VK_EXT_debug_marker

Contents

Synopsis

Vulkan extension: VK_EXT_debug_marker

supported: vulkan

contact: baldurkbaldurk.org@

author: Baldur Karlsson

type: device

Extension number: 23

Required extensions: VK_EXT_debug_report.

Required extensions: VK_EXT_debug_report.

data VkDebugMarkerMarkerInfoEXT Source #

typedef struct VkDebugMarkerMarkerInfoEXT {
    VkStructureType sType;
    const void*                      pNext;
    const char* pMarkerName;
    float            color[4];
} VkDebugMarkerMarkerInfoEXT;

VkDebugMarkerMarkerInfoEXT registry at www.khronos.org

Instances

Eq VkDebugMarkerMarkerInfoEXT Source # 
Ord VkDebugMarkerMarkerInfoEXT Source # 
Show VkDebugMarkerMarkerInfoEXT Source # 
Storable VkDebugMarkerMarkerInfoEXT Source # 
VulkanMarshalPrim VkDebugMarkerMarkerInfoEXT Source # 
VulkanMarshal VkDebugMarkerMarkerInfoEXT Source # 
CanWriteField "pMarkerName" VkDebugMarkerMarkerInfoEXT Source # 
CanWriteField "pNext" VkDebugMarkerMarkerInfoEXT Source # 
CanWriteField "sType" VkDebugMarkerMarkerInfoEXT Source # 
CanReadField "pMarkerName" VkDebugMarkerMarkerInfoEXT Source # 
CanReadField "pNext" VkDebugMarkerMarkerInfoEXT Source # 
CanReadField "sType" VkDebugMarkerMarkerInfoEXT Source # 
HasField "color" VkDebugMarkerMarkerInfoEXT Source # 
HasField "pMarkerName" VkDebugMarkerMarkerInfoEXT Source # 
HasField "pNext" VkDebugMarkerMarkerInfoEXT Source # 
HasField "sType" VkDebugMarkerMarkerInfoEXT Source # 
(KnownNat idx, IndexInBounds "color" idx VkDebugMarkerMarkerInfoEXT) => CanWriteFieldArray "color" idx VkDebugMarkerMarkerInfoEXT Source # 
(KnownNat idx, IndexInBounds "color" idx VkDebugMarkerMarkerInfoEXT) => CanReadFieldArray "color" idx VkDebugMarkerMarkerInfoEXT Source # 
type StructFields VkDebugMarkerMarkerInfoEXT Source # 
type StructFields VkDebugMarkerMarkerInfoEXT = (:) Symbol "sType" ((:) Symbol "pNext" ((:) Symbol "pMarkerName" ((:) Symbol "color" ([] Symbol))))
type CUnionType VkDebugMarkerMarkerInfoEXT Source # 
type ReturnedOnly VkDebugMarkerMarkerInfoEXT Source # 
type StructExtends VkDebugMarkerMarkerInfoEXT Source # 
type FieldArrayLength "color" VkDebugMarkerMarkerInfoEXT Source # 
type FieldType "color" VkDebugMarkerMarkerInfoEXT Source # 
type FieldType "pMarkerName" VkDebugMarkerMarkerInfoEXT Source # 
type FieldType "pNext" VkDebugMarkerMarkerInfoEXT Source # 
type FieldType "sType" VkDebugMarkerMarkerInfoEXT Source # 
type FieldOptional "color" VkDebugMarkerMarkerInfoEXT Source # 
type FieldOptional "pMarkerName" VkDebugMarkerMarkerInfoEXT Source # 
type FieldOptional "pNext" VkDebugMarkerMarkerInfoEXT Source # 
type FieldOptional "sType" VkDebugMarkerMarkerInfoEXT Source # 
type FieldOffset "color" VkDebugMarkerMarkerInfoEXT Source # 
type FieldOffset "pMarkerName" VkDebugMarkerMarkerInfoEXT Source # 
type FieldOffset "pMarkerName" VkDebugMarkerMarkerInfoEXT = 16
type FieldOffset "pNext" VkDebugMarkerMarkerInfoEXT Source # 
type FieldOffset "sType" VkDebugMarkerMarkerInfoEXT Source # 
type FieldIsArray "color" VkDebugMarkerMarkerInfoEXT Source # 
type FieldIsArray "pMarkerName" VkDebugMarkerMarkerInfoEXT Source # 
type FieldIsArray "pNext" VkDebugMarkerMarkerInfoEXT Source # 
type FieldIsArray "sType" VkDebugMarkerMarkerInfoEXT Source # 

data VkDebugMarkerObjectNameInfoEXT Source #

typedef struct VkDebugMarkerObjectNameInfoEXT {
    VkStructureType sType;
    const void*                      pNext;
    VkDebugReportObjectTypeEXT       objectType;
    uint64_t                         object;
    const char* pObjectName;
} VkDebugMarkerObjectNameInfoEXT;

VkDebugMarkerObjectNameInfoEXT registry at www.khronos.org

Instances

Eq VkDebugMarkerObjectNameInfoEXT Source # 
Ord VkDebugMarkerObjectNameInfoEXT Source # 
Show VkDebugMarkerObjectNameInfoEXT Source # 
Storable VkDebugMarkerObjectNameInfoEXT Source # 
VulkanMarshalPrim VkDebugMarkerObjectNameInfoEXT Source # 
VulkanMarshal VkDebugMarkerObjectNameInfoEXT Source # 
CanWriteField "object" VkDebugMarkerObjectNameInfoEXT Source # 
CanWriteField "objectType" VkDebugMarkerObjectNameInfoEXT Source # 
CanWriteField "pNext" VkDebugMarkerObjectNameInfoEXT Source # 
CanWriteField "pObjectName" VkDebugMarkerObjectNameInfoEXT Source # 
CanWriteField "sType" VkDebugMarkerObjectNameInfoEXT Source # 
CanReadField "object" VkDebugMarkerObjectNameInfoEXT Source # 
CanReadField "objectType" VkDebugMarkerObjectNameInfoEXT Source # 
CanReadField "pNext" VkDebugMarkerObjectNameInfoEXT Source # 
CanReadField "pObjectName" VkDebugMarkerObjectNameInfoEXT Source # 
CanReadField "sType" VkDebugMarkerObjectNameInfoEXT Source # 
HasField "object" VkDebugMarkerObjectNameInfoEXT Source # 
HasField "objectType" VkDebugMarkerObjectNameInfoEXT Source # 
HasField "pNext" VkDebugMarkerObjectNameInfoEXT Source # 
HasField "pObjectName" VkDebugMarkerObjectNameInfoEXT Source # 
HasField "sType" VkDebugMarkerObjectNameInfoEXT Source # 
type StructFields VkDebugMarkerObjectNameInfoEXT Source # 
type StructFields VkDebugMarkerObjectNameInfoEXT = (:) Symbol "sType" ((:) Symbol "pNext" ((:) Symbol "objectType" ((:) Symbol "object" ((:) Symbol "pObjectName" ([] Symbol)))))
type CUnionType VkDebugMarkerObjectNameInfoEXT Source # 
type ReturnedOnly VkDebugMarkerObjectNameInfoEXT Source # 
type StructExtends VkDebugMarkerObjectNameInfoEXT Source # 
type FieldType "object" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldType "objectType" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldType "pNext" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldType "pObjectName" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldType "sType" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldOptional "object" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldOptional "objectType" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldOptional "pNext" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldOptional "pObjectName" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldOptional "sType" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldOffset "object" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldOffset "objectType" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldOffset "pNext" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldOffset "pObjectName" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldOffset "sType" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldIsArray "object" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldIsArray "objectType" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldIsArray "pNext" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldIsArray "pObjectName" VkDebugMarkerObjectNameInfoEXT Source # 
type FieldIsArray "sType" VkDebugMarkerObjectNameInfoEXT Source # 

data VkDebugMarkerObjectTagInfoEXT Source #

typedef struct VkDebugMarkerObjectTagInfoEXT {
    VkStructureType sType;
    const void*                      pNext;
    VkDebugReportObjectTypeEXT       objectType;
    uint64_t                         object;
    uint64_t                         tagName;
    size_t                           tagSize;
    const void*        pTag;
} VkDebugMarkerObjectTagInfoEXT;

VkDebugMarkerObjectTagInfoEXT registry at www.khronos.org

Instances

Eq VkDebugMarkerObjectTagInfoEXT Source # 
Ord VkDebugMarkerObjectTagInfoEXT Source # 
Show VkDebugMarkerObjectTagInfoEXT Source # 
Storable VkDebugMarkerObjectTagInfoEXT Source # 
VulkanMarshalPrim VkDebugMarkerObjectTagInfoEXT Source # 
VulkanMarshal VkDebugMarkerObjectTagInfoEXT Source # 
CanWriteField "object" VkDebugMarkerObjectTagInfoEXT Source # 
CanWriteField "objectType" VkDebugMarkerObjectTagInfoEXT Source # 
CanWriteField "pNext" VkDebugMarkerObjectTagInfoEXT Source # 
CanWriteField "pTag" VkDebugMarkerObjectTagInfoEXT Source # 
CanWriteField "sType" VkDebugMarkerObjectTagInfoEXT Source # 
CanWriteField "tagName" VkDebugMarkerObjectTagInfoEXT Source # 
CanWriteField "tagSize" VkDebugMarkerObjectTagInfoEXT Source # 
CanReadField "object" VkDebugMarkerObjectTagInfoEXT Source # 
CanReadField "objectType" VkDebugMarkerObjectTagInfoEXT Source # 
CanReadField "pNext" VkDebugMarkerObjectTagInfoEXT Source # 
CanReadField "pTag" VkDebugMarkerObjectTagInfoEXT Source # 
CanReadField "sType" VkDebugMarkerObjectTagInfoEXT Source # 
CanReadField "tagName" VkDebugMarkerObjectTagInfoEXT Source # 
CanReadField "tagSize" VkDebugMarkerObjectTagInfoEXT Source # 
HasField "object" VkDebugMarkerObjectTagInfoEXT Source # 
HasField "objectType" VkDebugMarkerObjectTagInfoEXT Source # 
HasField "pNext" VkDebugMarkerObjectTagInfoEXT Source # 
HasField "pTag" VkDebugMarkerObjectTagInfoEXT Source # 
HasField "sType" VkDebugMarkerObjectTagInfoEXT Source # 
HasField "tagName" VkDebugMarkerObjectTagInfoEXT Source # 
HasField "tagSize" VkDebugMarkerObjectTagInfoEXT Source # 
type StructFields VkDebugMarkerObjectTagInfoEXT Source # 
type StructFields VkDebugMarkerObjectTagInfoEXT = (:) Symbol "sType" ((:) Symbol "pNext" ((:) Symbol "objectType" ((:) Symbol "object" ((:) Symbol "tagName" ((:) Symbol "tagSize" ((:) Symbol "pTag" ([] Symbol)))))))
type CUnionType VkDebugMarkerObjectTagInfoEXT Source # 
type ReturnedOnly VkDebugMarkerObjectTagInfoEXT Source # 
type StructExtends VkDebugMarkerObjectTagInfoEXT Source # 
type FieldType "object" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldType "objectType" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldType "pNext" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldType "pTag" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldType "sType" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldType "tagName" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldType "tagSize" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOptional "object" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOptional "objectType" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOptional "pNext" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOptional "pTag" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOptional "sType" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOptional "tagName" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOptional "tagSize" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOffset "object" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOffset "objectType" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOffset "pNext" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOffset "pTag" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOffset "sType" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOffset "tagName" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldOffset "tagSize" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldIsArray "object" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldIsArray "objectType" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldIsArray "pNext" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldIsArray "pTag" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldIsArray "sType" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldIsArray "tagName" VkDebugMarkerObjectTagInfoEXT Source # 
type FieldIsArray "tagSize" VkDebugMarkerObjectTagInfoEXT Source # 

data VkDebugReportCallbackCreateInfoEXT Source #

typedef struct VkDebugReportCallbackCreateInfoEXT {
    VkStructureType sType;
    const void*                      pNext;
    VkDebugReportFlagsEXT            flags;
    PFN_vkDebugReportCallbackEXT     pfnCallback;
    void*            pUserData;
} VkDebugReportCallbackCreateInfoEXT;

VkDebugReportCallbackCreateInfoEXT registry at www.khronos.org

Instances

Eq VkDebugReportCallbackCreateInfoEXT Source # 
Ord VkDebugReportCallbackCreateInfoEXT Source # 
Show VkDebugReportCallbackCreateInfoEXT Source # 
Storable VkDebugReportCallbackCreateInfoEXT Source # 
VulkanMarshalPrim VkDebugReportCallbackCreateInfoEXT Source # 
VulkanMarshal VkDebugReportCallbackCreateInfoEXT Source # 
CanWriteField "flags" VkDebugReportCallbackCreateInfoEXT Source # 
CanWriteField "pNext" VkDebugReportCallbackCreateInfoEXT Source # 
CanWriteField "pUserData" VkDebugReportCallbackCreateInfoEXT Source # 
CanWriteField "pfnCallback" VkDebugReportCallbackCreateInfoEXT Source # 
CanWriteField "sType" VkDebugReportCallbackCreateInfoEXT Source # 
CanReadField "flags" VkDebugReportCallbackCreateInfoEXT Source # 
CanReadField "pNext" VkDebugReportCallbackCreateInfoEXT Source # 
CanReadField "pUserData" VkDebugReportCallbackCreateInfoEXT Source # 
CanReadField "pfnCallback" VkDebugReportCallbackCreateInfoEXT Source # 
CanReadField "sType" VkDebugReportCallbackCreateInfoEXT Source # 
HasField "flags" VkDebugReportCallbackCreateInfoEXT Source # 
HasField "pNext" VkDebugReportCallbackCreateInfoEXT Source # 
HasField "pUserData" VkDebugReportCallbackCreateInfoEXT Source # 
HasField "pfnCallback" VkDebugReportCallbackCreateInfoEXT Source # 
HasField "sType" VkDebugReportCallbackCreateInfoEXT Source # 
type StructFields VkDebugReportCallbackCreateInfoEXT Source # 
type StructFields VkDebugReportCallbackCreateInfoEXT = (:) Symbol "sType" ((:) Symbol "pNext" ((:) Symbol "flags" ((:) Symbol "pfnCallback" ((:) Symbol "pUserData" ([] Symbol)))))
type CUnionType VkDebugReportCallbackCreateInfoEXT Source # 
type ReturnedOnly VkDebugReportCallbackCreateInfoEXT Source # 
type StructExtends VkDebugReportCallbackCreateInfoEXT Source # 
type FieldType "flags" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldType "pNext" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldType "pUserData" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldType "pfnCallback" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldType "sType" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldOptional "flags" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldOptional "pNext" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldOptional "pUserData" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldOptional "pfnCallback" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldOptional "sType" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldOffset "flags" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldOffset "pNext" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldOffset "pUserData" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldOffset "pfnCallback" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldOffset "sType" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldIsArray "flags" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldIsArray "pNext" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldIsArray "pUserData" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldIsArray "pfnCallback" VkDebugReportCallbackCreateInfoEXT Source # 
type FieldIsArray "sType" VkDebugReportCallbackCreateInfoEXT Source # 

data VkDebugUtilsObjectTagInfoEXT Source #

typedef struct VkDebugUtilsObjectTagInfoEXT {
    VkStructureType sType;
    const void*                            pNext;
    VkObjectType                           objectType;
    uint64_t                               objectHandle;
    uint64_t                               tagName;
    size_t                                 tagSize;
    const void*              pTag;
} VkDebugUtilsObjectTagInfoEXT;

VkDebugUtilsObjectTagInfoEXT registry at www.khronos.org

Instances

Eq VkDebugUtilsObjectTagInfoEXT Source # 
Ord VkDebugUtilsObjectTagInfoEXT Source # 
Show VkDebugUtilsObjectTagInfoEXT Source # 
Storable VkDebugUtilsObjectTagInfoEXT Source # 
VulkanMarshalPrim VkDebugUtilsObjectTagInfoEXT Source # 
VulkanMarshal VkDebugUtilsObjectTagInfoEXT Source # 
CanWriteField "objectHandle" VkDebugUtilsObjectTagInfoEXT Source # 
CanWriteField "objectType" VkDebugUtilsObjectTagInfoEXT Source # 
CanWriteField "pNext" VkDebugUtilsObjectTagInfoEXT Source # 
CanWriteField "pTag" VkDebugUtilsObjectTagInfoEXT Source # 
CanWriteField "sType" VkDebugUtilsObjectTagInfoEXT Source # 
CanWriteField "tagName" VkDebugUtilsObjectTagInfoEXT Source # 
CanWriteField "tagSize" VkDebugUtilsObjectTagInfoEXT Source # 
CanReadField "objectHandle" VkDebugUtilsObjectTagInfoEXT Source # 
CanReadField "objectType" VkDebugUtilsObjectTagInfoEXT Source # 
CanReadField "pNext" VkDebugUtilsObjectTagInfoEXT Source # 
CanReadField "pTag" VkDebugUtilsObjectTagInfoEXT Source # 
CanReadField "sType" VkDebugUtilsObjectTagInfoEXT Source # 
CanReadField "tagName" VkDebugUtilsObjectTagInfoEXT Source # 
CanReadField "tagSize" VkDebugUtilsObjectTagInfoEXT Source # 
HasField "objectHandle" VkDebugUtilsObjectTagInfoEXT Source # 
HasField "objectType" VkDebugUtilsObjectTagInfoEXT Source # 
HasField "pNext" VkDebugUtilsObjectTagInfoEXT Source # 
HasField "pTag" VkDebugUtilsObjectTagInfoEXT Source # 
HasField "sType" VkDebugUtilsObjectTagInfoEXT Source # 
HasField "tagName" VkDebugUtilsObjectTagInfoEXT Source # 
HasField "tagSize" VkDebugUtilsObjectTagInfoEXT Source # 
type StructFields VkDebugUtilsObjectTagInfoEXT Source # 
type StructFields VkDebugUtilsObjectTagInfoEXT = (:) Symbol "sType" ((:) Symbol "pNext" ((:) Symbol "objectType" ((:) Symbol "objectHandle" ((:) Symbol "tagName" ((:) Symbol "tagSize" ((:) Symbol "pTag" ([] Symbol)))))))
type CUnionType VkDebugUtilsObjectTagInfoEXT Source # 
type ReturnedOnly VkDebugUtilsObjectTagInfoEXT Source # 
type StructExtends VkDebugUtilsObjectTagInfoEXT Source # 
type FieldType "objectHandle" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldType "objectType" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldType "pNext" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldType "pTag" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldType "sType" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldType "tagName" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldType "tagSize" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOptional "objectHandle" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOptional "objectType" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOptional "pNext" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOptional "pTag" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOptional "sType" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOptional "tagName" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOptional "tagSize" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOffset "objectHandle" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOffset "objectHandle" VkDebugUtilsObjectTagInfoEXT = 24
type FieldOffset "objectType" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOffset "pNext" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOffset "pTag" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOffset "sType" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOffset "tagName" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldOffset "tagSize" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldIsArray "objectHandle" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldIsArray "objectType" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldIsArray "pNext" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldIsArray "pTag" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldIsArray "sType" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldIsArray "tagName" VkDebugUtilsObjectTagInfoEXT Source # 
type FieldIsArray "tagSize" VkDebugUtilsObjectTagInfoEXT Source # 

newtype VkDebugReportBitmaskEXT a Source #

Instances

Bounded (VkDebugReportBitmaskEXT FlagMask) Source # 
Enum (VkDebugReportBitmaskEXT FlagMask) Source # 
Eq (VkDebugReportBitmaskEXT a) Source # 
Integral (VkDebugReportBitmaskEXT FlagMask) Source # 
Typeable FlagType a => Data (VkDebugReportBitmaskEXT a) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VkDebugReportBitmaskEXT a -> c (VkDebugReportBitmaskEXT a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (VkDebugReportBitmaskEXT a) #

toConstr :: VkDebugReportBitmaskEXT a -> Constr #

dataTypeOf :: VkDebugReportBitmaskEXT a -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (VkDebugReportBitmaskEXT a)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (VkDebugReportBitmaskEXT a)) #

gmapT :: (forall b. Data b => b -> b) -> VkDebugReportBitmaskEXT a -> VkDebugReportBitmaskEXT a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VkDebugReportBitmaskEXT a -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VkDebugReportBitmaskEXT a -> r #

gmapQ :: (forall d. Data d => d -> u) -> VkDebugReportBitmaskEXT a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VkDebugReportBitmaskEXT a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VkDebugReportBitmaskEXT a -> m (VkDebugReportBitmaskEXT a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VkDebugReportBitmaskEXT a -> m (VkDebugReportBitmaskEXT a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VkDebugReportBitmaskEXT a -> m (VkDebugReportBitmaskEXT a) #

Num (VkDebugReportBitmaskEXT FlagMask) Source # 
Ord (VkDebugReportBitmaskEXT a) Source # 
Read (VkDebugReportBitmaskEXT a) Source # 
Real (VkDebugReportBitmaskEXT FlagMask) Source # 
Show (VkDebugReportBitmaskEXT a) Source # 
Generic (VkDebugReportBitmaskEXT a) Source # 
Storable (VkDebugReportBitmaskEXT a) Source # 
Bits (VkDebugReportBitmaskEXT FlagMask) Source # 

Methods

(.&.) :: VkDebugReportBitmaskEXT FlagMask -> VkDebugReportBitmaskEXT FlagMask -> VkDebugReportBitmaskEXT FlagMask #

(.|.) :: VkDebugReportBitmaskEXT FlagMask -> VkDebugReportBitmaskEXT FlagMask -> VkDebugReportBitmaskEXT FlagMask #

xor :: VkDebugReportBitmaskEXT FlagMask -> VkDebugReportBitmaskEXT FlagMask -> VkDebugReportBitmaskEXT FlagMask #

complement :: VkDebugReportBitmaskEXT FlagMask -> VkDebugReportBitmaskEXT FlagMask #

shift :: VkDebugReportBitmaskEXT FlagMask -> Int -> VkDebugReportBitmaskEXT FlagMask #

rotate :: VkDebugReportBitmaskEXT FlagMask -> Int -> VkDebugReportBitmaskEXT FlagMask #

zeroBits :: VkDebugReportBitmaskEXT FlagMask #

bit :: Int -> VkDebugReportBitmaskEXT FlagMask #

setBit :: VkDebugReportBitmaskEXT FlagMask -> Int -> VkDebugReportBitmaskEXT FlagMask #

clearBit :: VkDebugReportBitmaskEXT FlagMask -> Int -> VkDebugReportBitmaskEXT FlagMask #

complementBit :: VkDebugReportBitmaskEXT FlagMask -> Int -> VkDebugReportBitmaskEXT FlagMask #

testBit :: VkDebugReportBitmaskEXT FlagMask -> Int -> Bool #

bitSizeMaybe :: VkDebugReportBitmaskEXT FlagMask -> Maybe Int #

bitSize :: VkDebugReportBitmaskEXT FlagMask -> Int #

isSigned :: VkDebugReportBitmaskEXT FlagMask -> Bool #

shiftL :: VkDebugReportBitmaskEXT FlagMask -> Int -> VkDebugReportBitmaskEXT FlagMask #

unsafeShiftL :: VkDebugReportBitmaskEXT FlagMask -> Int -> VkDebugReportBitmaskEXT FlagMask #

shiftR :: VkDebugReportBitmaskEXT FlagMask -> Int -> VkDebugReportBitmaskEXT FlagMask #

unsafeShiftR :: VkDebugReportBitmaskEXT FlagMask -> Int -> VkDebugReportBitmaskEXT FlagMask #

rotateL :: VkDebugReportBitmaskEXT FlagMask -> Int -> VkDebugReportBitmaskEXT FlagMask #

rotateR :: VkDebugReportBitmaskEXT FlagMask -> Int -> VkDebugReportBitmaskEXT FlagMask #

popCount :: VkDebugReportBitmaskEXT FlagMask -> Int #

FiniteBits (VkDebugReportBitmaskEXT FlagMask) Source # 
type Rep (VkDebugReportBitmaskEXT a) Source # 
type Rep (VkDebugReportBitmaskEXT a) = D1 (MetaData "VkDebugReportBitmaskEXT" "Graphics.Vulkan.Types.Enum.Debug" "vulkan-api-1.1.2.1-GcVsfRwwhb24i5dsYq91EC" True) (C1 (MetaCons "VkDebugReportBitmaskEXT" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 VkFlags)))

newtype VkDebugReportObjectTypeEXT Source #

Instances

Bounded VkDebugReportObjectTypeEXT Source # 
Enum VkDebugReportObjectTypeEXT Source # 
Eq VkDebugReportObjectTypeEXT Source # 
Data VkDebugReportObjectTypeEXT Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VkDebugReportObjectTypeEXT -> c VkDebugReportObjectTypeEXT #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c VkDebugReportObjectTypeEXT #

toConstr :: VkDebugReportObjectTypeEXT -> Constr #

dataTypeOf :: VkDebugReportObjectTypeEXT -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c VkDebugReportObjectTypeEXT) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c VkDebugReportObjectTypeEXT) #

gmapT :: (forall b. Data b => b -> b) -> VkDebugReportObjectTypeEXT -> VkDebugReportObjectTypeEXT #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VkDebugReportObjectTypeEXT -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VkDebugReportObjectTypeEXT -> r #

gmapQ :: (forall d. Data d => d -> u) -> VkDebugReportObjectTypeEXT -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VkDebugReportObjectTypeEXT -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VkDebugReportObjectTypeEXT -> m VkDebugReportObjectTypeEXT #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VkDebugReportObjectTypeEXT -> m VkDebugReportObjectTypeEXT #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VkDebugReportObjectTypeEXT -> m VkDebugReportObjectTypeEXT #

Num VkDebugReportObjectTypeEXT Source # 
Ord VkDebugReportObjectTypeEXT Source # 
Read VkDebugReportObjectTypeEXT Source # 
Show VkDebugReportObjectTypeEXT Source # 
Generic VkDebugReportObjectTypeEXT Source # 
Storable VkDebugReportObjectTypeEXT Source # 
type Rep VkDebugReportObjectTypeEXT Source # 
type Rep VkDebugReportObjectTypeEXT = D1 (MetaData "VkDebugReportObjectTypeEXT" "Graphics.Vulkan.Types.Enum.Debug" "vulkan-api-1.1.2.1-GcVsfRwwhb24i5dsYq91EC" True) (C1 (MetaCons "VkDebugReportObjectTypeEXT" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int32)))

newtype VkDebugUtilsMessageSeverityBitmaskEXT a Source #

Instances

Bounded (VkDebugUtilsMessageSeverityBitmaskEXT FlagMask) Source # 
Enum (VkDebugUtilsMessageSeverityBitmaskEXT FlagMask) Source # 
Eq (VkDebugUtilsMessageSeverityBitmaskEXT a) Source # 
Integral (VkDebugUtilsMessageSeverityBitmaskEXT FlagMask) Source # 
Typeable FlagType a => Data (VkDebugUtilsMessageSeverityBitmaskEXT a) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VkDebugUtilsMessageSeverityBitmaskEXT a -> c (VkDebugUtilsMessageSeverityBitmaskEXT a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (VkDebugUtilsMessageSeverityBitmaskEXT a) #

toConstr :: VkDebugUtilsMessageSeverityBitmaskEXT a -> Constr #

dataTypeOf :: VkDebugUtilsMessageSeverityBitmaskEXT a -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (VkDebugUtilsMessageSeverityBitmaskEXT a)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (VkDebugUtilsMessageSeverityBitmaskEXT a)) #

gmapT :: (forall b. Data b => b -> b) -> VkDebugUtilsMessageSeverityBitmaskEXT a -> VkDebugUtilsMessageSeverityBitmaskEXT a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VkDebugUtilsMessageSeverityBitmaskEXT a -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VkDebugUtilsMessageSeverityBitmaskEXT a -> r #

gmapQ :: (forall d. Data d => d -> u) -> VkDebugUtilsMessageSeverityBitmaskEXT a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VkDebugUtilsMessageSeverityBitmaskEXT a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VkDebugUtilsMessageSeverityBitmaskEXT a -> m (VkDebugUtilsMessageSeverityBitmaskEXT a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VkDebugUtilsMessageSeverityBitmaskEXT a -> m (VkDebugUtilsMessageSeverityBitmaskEXT a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VkDebugUtilsMessageSeverityBitmaskEXT a -> m (VkDebugUtilsMessageSeverityBitmaskEXT a) #

Num (VkDebugUtilsMessageSeverityBitmaskEXT FlagMask) Source # 
Ord (VkDebugUtilsMessageSeverityBitmaskEXT a) Source # 
Read (VkDebugUtilsMessageSeverityBitmaskEXT a) Source # 
Real (VkDebugUtilsMessageSeverityBitmaskEXT FlagMask) Source # 
Show (VkDebugUtilsMessageSeverityBitmaskEXT a) Source # 
Generic (VkDebugUtilsMessageSeverityBitmaskEXT a) Source # 
Storable (VkDebugUtilsMessageSeverityBitmaskEXT a) Source # 
Bits (VkDebugUtilsMessageSeverityBitmaskEXT FlagMask) Source # 

Methods

(.&.) :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

(.|.) :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

xor :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

complement :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

shift :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

rotate :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

zeroBits :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

bit :: Int -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

setBit :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

clearBit :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

complementBit :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

testBit :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int -> Bool #

bitSizeMaybe :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Maybe Int #

bitSize :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int #

isSigned :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Bool #

shiftL :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

unsafeShiftL :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

shiftR :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

unsafeShiftR :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

rotateL :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

rotateR :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageSeverityBitmaskEXT FlagMask #

popCount :: VkDebugUtilsMessageSeverityBitmaskEXT FlagMask -> Int #

FiniteBits (VkDebugUtilsMessageSeverityBitmaskEXT FlagMask) Source # 
type Rep (VkDebugUtilsMessageSeverityBitmaskEXT a) Source # 
type Rep (VkDebugUtilsMessageSeverityBitmaskEXT a) = D1 (MetaData "VkDebugUtilsMessageSeverityBitmaskEXT" "Graphics.Vulkan.Types.Enum.Debug" "vulkan-api-1.1.2.1-GcVsfRwwhb24i5dsYq91EC" True) (C1 (MetaCons "VkDebugUtilsMessageSeverityBitmaskEXT" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 VkFlags)))

newtype VkDebugUtilsMessageTypeBitmaskEXT a Source #

Instances

Bounded (VkDebugUtilsMessageTypeBitmaskEXT FlagMask) Source # 
Enum (VkDebugUtilsMessageTypeBitmaskEXT FlagMask) Source # 
Eq (VkDebugUtilsMessageTypeBitmaskEXT a) Source # 
Integral (VkDebugUtilsMessageTypeBitmaskEXT FlagMask) Source # 
Typeable FlagType a => Data (VkDebugUtilsMessageTypeBitmaskEXT a) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VkDebugUtilsMessageTypeBitmaskEXT a -> c (VkDebugUtilsMessageTypeBitmaskEXT a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (VkDebugUtilsMessageTypeBitmaskEXT a) #

toConstr :: VkDebugUtilsMessageTypeBitmaskEXT a -> Constr #

dataTypeOf :: VkDebugUtilsMessageTypeBitmaskEXT a -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (VkDebugUtilsMessageTypeBitmaskEXT a)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (VkDebugUtilsMessageTypeBitmaskEXT a)) #

gmapT :: (forall b. Data b => b -> b) -> VkDebugUtilsMessageTypeBitmaskEXT a -> VkDebugUtilsMessageTypeBitmaskEXT a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VkDebugUtilsMessageTypeBitmaskEXT a -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VkDebugUtilsMessageTypeBitmaskEXT a -> r #

gmapQ :: (forall d. Data d => d -> u) -> VkDebugUtilsMessageTypeBitmaskEXT a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VkDebugUtilsMessageTypeBitmaskEXT a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VkDebugUtilsMessageTypeBitmaskEXT a -> m (VkDebugUtilsMessageTypeBitmaskEXT a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VkDebugUtilsMessageTypeBitmaskEXT a -> m (VkDebugUtilsMessageTypeBitmaskEXT a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VkDebugUtilsMessageTypeBitmaskEXT a -> m (VkDebugUtilsMessageTypeBitmaskEXT a) #

Num (VkDebugUtilsMessageTypeBitmaskEXT FlagMask) Source # 
Ord (VkDebugUtilsMessageTypeBitmaskEXT a) Source # 
Read (VkDebugUtilsMessageTypeBitmaskEXT a) Source # 
Real (VkDebugUtilsMessageTypeBitmaskEXT FlagMask) Source # 
Show (VkDebugUtilsMessageTypeBitmaskEXT a) Source # 
Generic (VkDebugUtilsMessageTypeBitmaskEXT a) Source # 
Storable (VkDebugUtilsMessageTypeBitmaskEXT a) Source # 
Bits (VkDebugUtilsMessageTypeBitmaskEXT FlagMask) Source # 

Methods

(.&.) :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

(.|.) :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

xor :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

complement :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

shift :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

rotate :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

zeroBits :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

bit :: Int -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

setBit :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

clearBit :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

complementBit :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

testBit :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int -> Bool #

bitSizeMaybe :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Maybe Int #

bitSize :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int #

isSigned :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Bool #

shiftL :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

unsafeShiftL :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

shiftR :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

unsafeShiftR :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

rotateL :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

rotateR :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int -> VkDebugUtilsMessageTypeBitmaskEXT FlagMask #

popCount :: VkDebugUtilsMessageTypeBitmaskEXT FlagMask -> Int #

FiniteBits (VkDebugUtilsMessageTypeBitmaskEXT FlagMask) Source # 
type Rep (VkDebugUtilsMessageTypeBitmaskEXT a) Source # 
type Rep (VkDebugUtilsMessageTypeBitmaskEXT a) = D1 (MetaData "VkDebugUtilsMessageTypeBitmaskEXT" "Graphics.Vulkan.Types.Enum.Debug" "vulkan-api-1.1.2.1-GcVsfRwwhb24i5dsYq91EC" True) (C1 (MetaCons "VkDebugUtilsMessageTypeBitmaskEXT" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 VkFlags)))

newtype VkStructureType Source #

Structure type enumerant

type = enum

VkStructureType registry at www.khronos.org

Constructors

VkStructureType Int32 

Instances

Bounded VkStructureType Source # 
Enum VkStructureType Source # 
Eq VkStructureType Source # 
Data VkStructureType Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VkStructureType -> c VkStructureType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c VkStructureType #

toConstr :: VkStructureType -> Constr #

dataTypeOf :: VkStructureType -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c VkStructureType) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c VkStructureType) #

gmapT :: (forall b. Data b => b -> b) -> VkStructureType -> VkStructureType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VkStructureType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VkStructureType -> r #

gmapQ :: (forall d. Data d => d -> u) -> VkStructureType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VkStructureType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VkStructureType -> m VkStructureType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VkStructureType -> m VkStructureType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VkStructureType -> m VkStructureType #

Num VkStructureType Source # 
Ord VkStructureType Source # 
Read VkStructureType Source # 
Show VkStructureType Source # 
Generic VkStructureType Source # 
Storable VkStructureType Source # 
type Rep VkStructureType Source # 
type Rep VkStructureType = D1 (MetaData "VkStructureType" "Graphics.Vulkan.Types.Enum.StructureType" "vulkan-api-1.1.2.1-GcVsfRwwhb24i5dsYq91EC" True) (C1 (MetaCons "VkStructureType" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int32)))

pattern VK_STRUCTURE_TYPE_LOADER_INSTANCE_CREATE_INFO :: VkStructureType Source #

Reserved for internal use by the loader, layers, and ICDs

pattern VK_STRUCTURE_TYPE_LOADER_DEVICE_CREATE_INFO :: VkStructureType Source #

Reserved for internal use by the loader, layers, and ICDs

type VkDebugMarkerSetObjectTagEXT = "vkDebugMarkerSetObjectTagEXT" Source #

type HS_vkDebugMarkerSetObjectTagEXT Source #

Arguments

 = VkDevice

device

-> Ptr VkDebugMarkerObjectTagInfoEXT

pTagInfo

-> IO VkResult 

Success codes: VK_SUCCESS.

Error codes: VK_ERROR_OUT_OF_HOST_MEMORY, VK_ERROR_OUT_OF_DEVICE_MEMORY.

VkResult vkDebugMarkerSetObjectTagEXT
    ( VkDevice device
    , const VkDebugMarkerObjectTagInfoEXT* pTagInfo
    )

vkDebugMarkerSetObjectTagEXT registry at www.khronos.org

type VkDebugMarkerSetObjectNameEXT = "vkDebugMarkerSetObjectNameEXT" Source #

type HS_vkDebugMarkerSetObjectNameEXT Source #

Arguments

 = VkDevice

device

-> Ptr VkDebugMarkerObjectNameInfoEXT

pNameInfo

-> IO VkResult 

Success codes: VK_SUCCESS.

Error codes: VK_ERROR_OUT_OF_HOST_MEMORY, VK_ERROR_OUT_OF_DEVICE_MEMORY.

VkResult vkDebugMarkerSetObjectNameEXT
    ( VkDevice device
    , const VkDebugMarkerObjectNameInfoEXT* pNameInfo
    )

vkDebugMarkerSetObjectNameEXT registry at www.khronos.org

type VkCmdDebugMarkerBeginEXT = "vkCmdDebugMarkerBeginEXT" Source #

type HS_vkCmdDebugMarkerBeginEXT Source #

Arguments

 = VkCommandBuffer

commandBuffer

-> Ptr VkDebugMarkerMarkerInfoEXT

pMarkerInfo

-> IO () 

Queues: graphics, compute.

Renderpass: both

void vkCmdDebugMarkerBeginEXT
    ( VkCommandBuffer commandBuffer
    , const VkDebugMarkerMarkerInfoEXT* pMarkerInfo
    )

vkCmdDebugMarkerBeginEXT registry at www.khronos.org

type VkCmdDebugMarkerEndEXT = "vkCmdDebugMarkerEndEXT" Source #

type HS_vkCmdDebugMarkerEndEXT Source #

Arguments

 = VkCommandBuffer

commandBuffer

-> IO () 

Queues: graphics, compute.

Renderpass: both

void vkCmdDebugMarkerEndEXT
    ( VkCommandBuffer commandBuffer
    )

vkCmdDebugMarkerEndEXT registry at www.khronos.org

type VkCmdDebugMarkerInsertEXT = "vkCmdDebugMarkerInsertEXT" Source #

type HS_vkCmdDebugMarkerInsertEXT Source #

Arguments

 = VkCommandBuffer

commandBuffer

-> Ptr VkDebugMarkerMarkerInfoEXT

pMarkerInfo

-> IO () 

Queues: graphics, compute.

Renderpass: both

void vkCmdDebugMarkerInsertEXT
    ( VkCommandBuffer commandBuffer
    , const VkDebugMarkerMarkerInfoEXT* pMarkerInfo
    )

vkCmdDebugMarkerInsertEXT registry at www.khronos.org

newtype VkResult Source #

API result codes

type = enum

VkResult registry at www.khronos.org

Constructors

VkResult Int32 

Instances

Bounded VkResult Source # 
Enum VkResult Source # 
Eq VkResult Source # 
Data VkResult Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VkResult -> c VkResult #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c VkResult #

toConstr :: VkResult -> Constr #

dataTypeOf :: VkResult -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c VkResult) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c VkResult) #

gmapT :: (forall b. Data b => b -> b) -> VkResult -> VkResult #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VkResult -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VkResult -> r #

gmapQ :: (forall d. Data d => d -> u) -> VkResult -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VkResult -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VkResult -> m VkResult #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VkResult -> m VkResult #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VkResult -> m VkResult #

Num VkResult Source # 
Ord VkResult Source # 
Read VkResult Source # 
Show VkResult Source # 
Generic VkResult Source # 

Associated Types

type Rep VkResult :: * -> * #

Methods

from :: VkResult -> Rep VkResult x #

to :: Rep VkResult x -> VkResult #

Storable VkResult Source # 
type Rep VkResult Source # 
type Rep VkResult = D1 (MetaData "VkResult" "Graphics.Vulkan.Types.Enum.Result" "vulkan-api-1.1.2.1-GcVsfRwwhb24i5dsYq91EC" True) (C1 (MetaCons "VkResult" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int32)))

pattern VK_SUCCESS :: VkResult Source #

Command completed successfully

pattern VK_NOT_READY :: VkResult Source #

A fence or query has not yet completed

pattern VK_TIMEOUT :: VkResult Source #

A wait operation has not completed in the specified time

pattern VK_EVENT_SET :: VkResult Source #

An event is signaled

pattern VK_EVENT_RESET :: VkResult Source #

An event is unsignaled

pattern VK_INCOMPLETE :: VkResult Source #

A return array was too small for the result

pattern VK_ERROR_OUT_OF_HOST_MEMORY :: VkResult Source #

A host memory allocation has failed

pattern VK_ERROR_OUT_OF_DEVICE_MEMORY :: VkResult Source #

A device memory allocation has failed

pattern VK_ERROR_INITIALIZATION_FAILED :: VkResult Source #

Initialization of a object has failed

pattern VK_ERROR_DEVICE_LOST :: VkResult Source #

The logical device has been lost. See

pattern VK_ERROR_MEMORY_MAP_FAILED :: VkResult Source #

Mapping of a memory object has failed

pattern VK_ERROR_LAYER_NOT_PRESENT :: VkResult Source #

Layer specified does not exist

pattern VK_ERROR_EXTENSION_NOT_PRESENT :: VkResult Source #

Extension specified does not exist

pattern VK_ERROR_FEATURE_NOT_PRESENT :: VkResult Source #

Requested feature is not available on this device

pattern VK_ERROR_INCOMPATIBLE_DRIVER :: VkResult Source #

Unable to find a Vulkan driver

pattern VK_ERROR_TOO_MANY_OBJECTS :: VkResult Source #

Too many objects of the type have already been created

pattern VK_ERROR_FORMAT_NOT_SUPPORTED :: VkResult Source #

Requested format is not supported on this device

pattern VK_ERROR_FRAGMENTED_POOL :: VkResult Source #

A requested pool allocation has failed due to fragmentation of the pool's memory

data VkBuffer_T Source #

Opaque data type referenced by VkBuffer

data VkBufferView_T Source #

Opaque data type referenced by VkBufferView

data VkCommandBuffer_T Source #

Opaque data type referenced by VkCommandBuffer

data VkCommandPool_T Source #

Opaque data type referenced by VkCommandPool

data VkDebugReportCallbackEXT_T Source #

Opaque data type referenced by VkDebugReportCallbackEXT

data VkDebugUtilsMessengerEXT_T Source #

Opaque data type referenced by VkDebugUtilsMessengerEXT

data VkDescriptorPool_T Source #

Opaque data type referenced by VkDescriptorPool

data VkDescriptorSet_T Source #

Opaque data type referenced by VkDescriptorSet

data VkDescriptorSetLayout_T Source #

Opaque data type referenced by VkDescriptorSetLayout

data VkDescriptorUpdateTemplate_T Source #

Opaque data type referenced by VkDescriptorUpdateTemplate

data VkDescriptorUpdateTemplateKHR_T Source #

Opaque data type referenced by VkDescriptorUpdateTemplateKHR

data VkDevice_T Source #

Opaque data type referenced by VkDevice

data VkDeviceMemory_T Source #

Opaque data type referenced by VkDeviceMemory

data VkDisplayKHR_T Source #

Opaque data type referenced by VkDisplayKHR

data VkDisplayModeKHR_T Source #

Opaque data type referenced by VkDisplayModeKHR

data VkEvent_T Source #

Opaque data type referenced by VkEvent

data VkFence_T Source #

Opaque data type referenced by VkFence

data VkFramebuffer_T Source #

Opaque data type referenced by VkFramebuffer

data VkImage_T Source #

Opaque data type referenced by VkImage

data VkImageView_T Source #

Opaque data type referenced by VkImageView

data VkIndirectCommandsLayoutNVX_T Source #

Opaque data type referenced by VkIndirectCommandsLayoutNVX

data VkInstance_T Source #

Opaque data type referenced by VkInstance

data VkObjectTableNVX_T Source #

Opaque data type referenced by VkObjectTableNVX

data VkPhysicalDevice_T Source #

Opaque data type referenced by VkPhysicalDevice

data VkPipeline_T Source #

Opaque data type referenced by VkPipeline

data VkPipelineCache_T Source #

Opaque data type referenced by VkPipelineCache

data VkPipelineLayout_T Source #

Opaque data type referenced by VkPipelineLayout

data VkQueryPool_T Source #

Opaque data type referenced by VkQueryPool

data VkQueue_T Source #

Opaque data type referenced by VkQueue

data VkRenderPass_T Source #

Opaque data type referenced by VkRenderPass

data VkSampler_T Source #

Opaque data type referenced by VkSampler

data VkSamplerYcbcrConversion_T Source #

Opaque data type referenced by VkSamplerYcbcrConversion

data VkSamplerYcbcrConversionKHR_T Source #

Opaque data type referenced by VkSamplerYcbcrConversionKHR

data VkSemaphore_T Source #

Opaque data type referenced by VkSemaphore

data VkShaderModule_T Source #

Opaque data type referenced by VkShaderModule

data VkSurfaceKHR_T Source #

Opaque data type referenced by VkSurfaceKHR

data VkSwapchainKHR_T Source #

Opaque data type referenced by VkSwapchainKHR

data VkValidationCacheEXT_T Source #

Opaque data type referenced by VkValidationCacheEXT

pattern VK_EXT_DEBUG_MARKER_SPEC_VERSION :: forall a. (Num a, Eq a) => a Source #

type VK_EXT_DEBUG_MARKER_EXTENSION_NAME = "VK_EXT_debug_marker" Source #

Orphan instances

VulkanProc "vkCmdDebugMarkerBeginEXT" Source # 

Associated Types

type VkProcType ("vkCmdDebugMarkerBeginEXT" :: Symbol) :: * Source #

Methods

vkProcSymbol :: CString Source #

unwrapVkProcPtr :: FunPtr (VkProcType "vkCmdDebugMarkerBeginEXT") -> VkProcType "vkCmdDebugMarkerBeginEXT" Source #

unwrapVkProcPtrSafe :: FunPtr (VkProcType "vkCmdDebugMarkerBeginEXT") -> VkProcType "vkCmdDebugMarkerBeginEXT" Source #

VulkanProc "vkCmdDebugMarkerEndEXT" Source # 

Associated Types

type VkProcType ("vkCmdDebugMarkerEndEXT" :: Symbol) :: * Source #

Methods

vkProcSymbol :: CString Source #

unwrapVkProcPtr :: FunPtr (VkProcType "vkCmdDebugMarkerEndEXT") -> VkProcType "vkCmdDebugMarkerEndEXT" Source #

unwrapVkProcPtrSafe :: FunPtr (VkProcType "vkCmdDebugMarkerEndEXT") -> VkProcType "vkCmdDebugMarkerEndEXT" Source #

VulkanProc "vkCmdDebugMarkerInsertEXT" Source # 

Associated Types

type VkProcType ("vkCmdDebugMarkerInsertEXT" :: Symbol) :: * Source #

Methods

vkProcSymbol :: CString Source #

unwrapVkProcPtr :: FunPtr (VkProcType "vkCmdDebugMarkerInsertEXT") -> VkProcType "vkCmdDebugMarkerInsertEXT" Source #

unwrapVkProcPtrSafe :: FunPtr (VkProcType "vkCmdDebugMarkerInsertEXT") -> VkProcType "vkCmdDebugMarkerInsertEXT" Source #

VulkanProc "vkDebugMarkerSetObjectNameEXT" Source # 

Associated Types

type VkProcType ("vkDebugMarkerSetObjectNameEXT" :: Symbol) :: * Source #

Methods

vkProcSymbol :: CString Source #

unwrapVkProcPtr :: FunPtr (VkProcType "vkDebugMarkerSetObjectNameEXT") -> VkProcType "vkDebugMarkerSetObjectNameEXT" Source #

unwrapVkProcPtrSafe :: FunPtr (VkProcType "vkDebugMarkerSetObjectNameEXT") -> VkProcType "vkDebugMarkerSetObjectNameEXT" Source #

VulkanProc "vkDebugMarkerSetObjectTagEXT" Source # 

Associated Types

type VkProcType ("vkDebugMarkerSetObjectTagEXT" :: Symbol) :: * Source #

Methods

vkProcSymbol :: CString Source #

unwrapVkProcPtr :: FunPtr (VkProcType "vkDebugMarkerSetObjectTagEXT") -> VkProcType "vkDebugMarkerSetObjectTagEXT" Source #

unwrapVkProcPtrSafe :: FunPtr (VkProcType "vkDebugMarkerSetObjectTagEXT") -> VkProcType "vkDebugMarkerSetObjectTagEXT" Source #