vulkan-3.6: Bindings to the Vulkan graphics API.
Safe HaskellNone
LanguageHaskell2010

Vulkan.Extensions.VK_KHR_incremental_present

Synopsis

Documentation

data PresentRegionsKHR Source #

VkPresentRegionsKHR - Structure hint of rectangular regions changed by vkQueuePresentKHR

Valid Usage

Valid Usage (Implicit)

  • If pRegions is not NULL, pRegions must be a valid pointer to an array of swapchainCount valid PresentRegionKHR structures
  • swapchainCount must be greater than 0

See Also

PresentRegionKHR, StructureType

Constructors

PresentRegionsKHR 

Fields

  • swapchainCount :: Word32

    swapchainCount is the number of swapchains being presented to by this command.

  • regions :: Vector PresentRegionKHR

    pRegions is NULL or a pointer to an array of PresentRegionKHR elements with swapchainCount entries. If not NULL, each element of pRegions contains the region that has changed since the last present to the swapchain in the corresponding entry in the PresentInfoKHR::pSwapchains array.

Instances

Instances details
Show PresentRegionsKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

Generic PresentRegionsKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

Associated Types

type Rep PresentRegionsKHR :: Type -> Type #

FromCStruct PresentRegionsKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

ToCStruct PresentRegionsKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

Zero PresentRegionsKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

type Rep PresentRegionsKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

type Rep PresentRegionsKHR = D1 ('MetaData "PresentRegionsKHR" "Vulkan.Extensions.VK_KHR_incremental_present" "vulkan-3.6-inplace" 'False) (C1 ('MetaCons "PresentRegionsKHR" 'PrefixI 'True) (S1 ('MetaSel ('Just "swapchainCount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Word32) :*: S1 ('MetaSel ('Just "regions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Vector PresentRegionKHR))))

data PresentRegionKHR Source #

VkPresentRegionKHR - Structure containing rectangular region changed by vkQueuePresentKHR for a given VkImage

Valid Usage (Implicit)

  • If rectangleCount is not 0, and pRectangles is not NULL, pRectangles must be a valid pointer to an array of rectangleCount valid RectLayerKHR structures

See Also

PresentRegionsKHR, RectLayerKHR

Constructors

PresentRegionKHR 

Fields

  • rectangleCount :: Word32

    rectangleCount is the number of rectangles in pRectangles, or zero if the entire image has changed and should be presented.

  • rectangles :: Vector RectLayerKHR

    pRectangles is either NULL or a pointer to an array of RectLayerKHR structures. The RectLayerKHR structure is the framebuffer coordinates, plus layer, of a portion of a presentable image that has changed and must be presented. If non-NULL, each entry in pRectangles is a rectangle of the given image that has changed since the last image was presented to the given swapchain.

Instances

Instances details
Show PresentRegionKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

Generic PresentRegionKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

Associated Types

type Rep PresentRegionKHR :: Type -> Type #

FromCStruct PresentRegionKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

ToCStruct PresentRegionKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

Zero PresentRegionKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

type Rep PresentRegionKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

type Rep PresentRegionKHR = D1 ('MetaData "PresentRegionKHR" "Vulkan.Extensions.VK_KHR_incremental_present" "vulkan-3.6-inplace" 'False) (C1 ('MetaCons "PresentRegionKHR" 'PrefixI 'True) (S1 ('MetaSel ('Just "rectangleCount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Word32) :*: S1 ('MetaSel ('Just "rectangles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Vector RectLayerKHR))))

data RectLayerKHR Source #

VkRectLayerKHR - Structure containing a rectangle, including layer, changed by vkQueuePresentKHR for a given VkImage

Valid Usage

Some platforms allow the size of a surface to change, and then scale the pixels of the image to fit the surface. RectLayerKHR specifies pixels of the swapchain’s image(s), which will be constant for the life of the swapchain.

See Also

Extent2D, Offset2D, PresentRegionKHR

Constructors

RectLayerKHR 

Fields

  • offset :: Offset2D

    offset is the origin of the rectangle, in pixels.

  • extent :: Extent2D

    extent is the size of the rectangle, in pixels.

  • layer :: Word32

    layer is the layer of the image. For images with only one layer, the value of layer must be 0.

Instances

Instances details
Show RectLayerKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

Generic RectLayerKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

Associated Types

type Rep RectLayerKHR :: Type -> Type #

FromCStruct RectLayerKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

ToCStruct RectLayerKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

Zero RectLayerKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

type Rep RectLayerKHR Source # 
Instance details

Defined in Vulkan.Extensions.VK_KHR_incremental_present

type Rep RectLayerKHR = D1 ('MetaData "RectLayerKHR" "Vulkan.Extensions.VK_KHR_incremental_present" "vulkan-3.6-inplace" 'False) (C1 ('MetaCons "RectLayerKHR" 'PrefixI 'True) (S1 ('MetaSel ('Just "offset") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Offset2D) :*: (S1 ('MetaSel ('Just "extent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Extent2D) :*: S1 ('MetaSel ('Just "layer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Word32))))

type KHR_INCREMENTAL_PRESENT_EXTENSION_NAME = "VK_KHR_incremental_present" Source #

pattern KHR_INCREMENTAL_PRESENT_EXTENSION_NAME :: forall a. (Eq a, IsString a) => a Source #