gpu-vulkan-middle-0.1.0.60: Medium wrapper for Vulkan API
Safe HaskellNone
LanguageHaskell2010

Gpu.Vulkan.Middle

Synopsis

INFO

ApplicationInfo

makeApiVersion :: Variant -> Major -> Minor -> Patch -> ApiVersion Source #

SubmitInfo

class SubmitInfoListToCore (ns :: [Maybe Type]) where Source #

Methods

submitInfoListToCore :: PL SubmitInfo ns -> ([SubmitInfo] -> IO a) -> IO () Source #

Instances

Instances details
SubmitInfoListToCore ('[] :: [Maybe Type]) Source # 
Instance details

Defined in Gpu.Vulkan.Middle.Internal

Methods

submitInfoListToCore :: PL SubmitInfo ('[] :: [Maybe Type]) -> ([SubmitInfo] -> IO a) -> IO () Source #

(WithPoked (M n), SubmitInfoListToCore ns) => SubmitInfoListToCore (n ': ns) Source # 
Instance details

Defined in Gpu.Vulkan.Middle.Internal

Methods

submitInfoListToCore :: PL SubmitInfo (n ': ns) -> ([SubmitInfo] -> IO a) -> IO () Source #

PROPERTIES

PIPELINE VALUES

ViewPort

data Viewport #

Instances

Instances details
Storable Viewport 
Instance details

Defined in Gpu.Vulkan.Core

Show Viewport 
Instance details

Defined in Gpu.Vulkan.Core

pattern Viewport :: Float -> Float -> Float -> Float -> Float -> Float -> Viewport #

StencilOpState

ClearValue

data ClearValue (ct :: ClearType) where Source #

Instances

Instances details
Show (ClearValue ct) Source # 
Instance details

Defined in Gpu.Vulkan.Middle.Internal

Methods

showsPrec :: Int -> ClearValue ct -> ShowS #

show :: ClearValue ct -> String #

showList :: [ClearValue ct] -> ShowS #

class Length cts => ClearValueListToCore (cts :: [ClearType]) Source #

Minimal complete definition

clearValueListToCore

Instances

Instances details
ClearValueListToCore ('[] :: [ClearType]) Source # 
Instance details

Defined in Gpu.Vulkan.Middle.Internal

Methods

clearValueListToCore :: PL ClearValue ('[] :: [ClearType]) -> ([Ptr ClearValue] -> IO a) -> IO a

(ClearValueToCore ct, ClearValueListToCore cts) => ClearValueListToCore (ct ': cts) Source # 
Instance details

Defined in Gpu.Vulkan.Middle.Internal

Methods

clearValueListToCore :: PL ClearValue (ct ': cts) -> ([Ptr ClearValue] -> IO a) -> IO a

class ClearValueToCore (ct :: ClearType) Source #

Minimal complete definition

clearValueToCore

ClearType

data ClearType Source #

Instances

Instances details
Show ClearType Source # 
Instance details

Defined in Gpu.Vulkan.Middle.Internal

ClearValueListToCore ('[] :: [ClearType]) Source # 
Instance details

Defined in Gpu.Vulkan.Middle.Internal

Methods

clearValueListToCore :: PL ClearValue ('[] :: [ClearType]) -> ([Ptr ClearValue] -> IO a) -> IO a

(ClearValueToCore ct, ClearValueListToCore cts) => ClearValueListToCore (ct ': cts) Source # 
Instance details

Defined in Gpu.Vulkan.Middle.Internal

Methods

clearValueListToCore :: PL ClearValue (ct ': cts) -> ([Ptr ClearValue] -> IO a) -> IO a

ClearColorValue

ClearDepthStencilValue

RECT, OFFSET AND EXTENT

Rect

data Rect2d #

Instances

Instances details
Storable Rect2d 
Instance details

Defined in Gpu.Vulkan.Core

Show Rect2d 
Instance details

Defined in Gpu.Vulkan.Core

pattern Rect2d :: Offset2d -> Extent2d -> Rect2d #

Offset

data Offset2d #

Instances

Instances details
Storable Offset2d 
Instance details

Defined in Gpu.Vulkan.Core

Show Offset2d 
Instance details

Defined in Gpu.Vulkan.Core

pattern Offset2d :: Int32 -> Int32 -> Offset2d #

data Offset3d #

Instances

Instances details
Storable Offset3d 
Instance details

Defined in Gpu.Vulkan.Core

Show Offset3d 
Instance details

Defined in Gpu.Vulkan.Core

pattern Offset3d :: Int32 -> Int32 -> Int32 -> Offset3d #

Extent

data Extent2d #

Instances

Instances details
Storable Extent2d 
Instance details

Defined in Gpu.Vulkan.Core

Show Extent2d 
Instance details

Defined in Gpu.Vulkan.Core

pattern Extent2d :: Word32 -> Word32 -> Extent2d #

data Extent3d #

Instances

Instances details
Storable Extent3d 
Instance details

Defined in Gpu.Vulkan.Core

Show Extent3d 
Instance details

Defined in Gpu.Vulkan.Core

pattern Extent3d :: Word32 -> Word32 -> Word32 -> Extent3d #

OTHERS

newtype Size Source #

Constructors

Size Word64 

Instances

Instances details
Show Size Source # 
Instance details

Defined in Gpu.Vulkan.Middle.Types

Methods

showsPrec :: Int -> Size -> ShowS #

show :: Size -> String #

showList :: [Size] -> ShowS #