gpu-vulkan-khr-swapchain-0.1.0.1: VK_KHR_swapchain extension of the Vulkan API
Safe HaskellNone
LanguageHaskell2010

Gpu.Vulkan.Khr.Swapchain

Synopsis

EXTENSION NAME

CREATE

create :: forall (mn :: Maybe Type) (fmt :: Format) (mac :: Maybe (Type, Type)) sd ssfc (mosas :: Maybe (Format, Type)) a. (WithPoked (M mn), FormatToValue fmt, ToMiddle mac) => D sd -> CreateInfo mn ssfc fmt mosas -> M (U2 A) mac -> (forall s. S fmt s -> IO a) -> IO a Source #

unsafeRecreate :: forall (mn :: Maybe Type) (fmt :: Format) (mac :: Maybe (Type, Type)) sd ssfc (mosas :: Maybe (Format, Type)) ssc. (WithPoked (M mn), FormatToValue fmt, ToMiddle mac) => D sd -> CreateInfo mn ssfc fmt mosas -> M (U2 A) mac -> S fmt ssc -> IO () Source #

data S (fmt :: Format) ss Source #

Instances

Instances details
Show (S fmt ss) Source # 
Instance details

Defined in Gpu.Vulkan.Khr.Swapchain.Type

Methods

showsPrec :: Int -> S fmt ss -> ShowS #

show :: S fmt ss -> String #

showList :: [S fmt ss] -> ShowS #

Group

group :: forall (fmt :: Format) k sd (ma :: Maybe (Type, Type)) a. ToMiddle ma => D sd -> M (U2 A) ma -> (forall ssc. Group sd ma fmt ssc k -> IO a) -> IO a Source #

data Group sd (ma :: Maybe (Type, Type)) (fmt :: Format) ssc k Source #

create' :: forall (fmt :: Format) k (mn :: Maybe Type) (ma :: Maybe (Type, Type)) sd ss ssfc (mosas :: Maybe (Format, Type)). (FormatToValue fmt, Ord k, WithPoked (M mn), ToMiddle ma) => Group sd ma fmt ss k -> k -> CreateInfo mn ssfc fmt mosas -> IO (Either String (S fmt ss)) Source #

unsafeDestroy :: forall k (ma :: Maybe (Type, Type)) sd (fmt :: Format) ssc. (Ord k, ToMiddle ma) => Group sd ma fmt ssc k -> k -> IO (Either String ()) Source #

lookup :: forall k sd (ma :: Maybe (Type, Type)) (fmt :: Format) ssc. Ord k => Group sd ma fmt ssc k -> k -> IO (Maybe (S fmt ssc)) Source #

GET IMAGES

getImages :: forall sd (fmt :: Format) ss (nm :: Symbol). D sd -> S fmt ss -> IO [Binded ss ss nm fmt] Source #

QUEUE PRESENT

queuePresent :: forall (mn :: Maybe Type) (swss :: [Type]) (scfmt :: Format) (sscs :: [Type]). WithPoked (M mn) => Q -> PresentInfo mn swss scfmt sscs -> IO () Source #

data PresentInfo (mn :: Maybe Type) (swss :: [Type]) (scfmt :: Format) (sscs :: [Type]) Source #

data SwapchainImageIndex (scfmt :: Format) ssc Source #

Constructors

SwapchainImageIndex (S scfmt ssc) Word32 

Instances

Instances details
Show (SwapchainImageIndex scfmt ssc) Source # 
Instance details

Defined in Gpu.Vulkan.Khr.Swapchain

Methods

showsPrec :: Int -> SwapchainImageIndex scfmt ssc -> ShowS #

show :: SwapchainImageIndex scfmt ssc -> String #

showList :: [SwapchainImageIndex scfmt ssc] -> ShowS #

ACQUIRE NEXT IMAGE

acquireNextImage :: forall sd (scfmt :: Format) ssc ss sf. D sd -> S scfmt ssc -> Maybe Sec -> Maybe (S ss) -> Maybe (F sf) -> IO Word32 Source #

acquireNextImageResult :: forall sd (scfmt :: Format) ssc ss sf. [Result] -> D sd -> S scfmt ssc -> Maybe Sec -> Maybe (S ss) -> Maybe (F sf) -> IO Word32 Source #