gpu-vulkan-0.1.0.153: Vulkan library
Safe HaskellNone
LanguageHaskell2010

Gpu.Vulkan.Fence.Internal

Synopsis

CREATE

create :: forall (mn :: Maybe Type) (mac :: Maybe (Type, Type)) sd a. (WithPoked (M mn), ToMiddle mac) => D sd -> CreateInfo mn -> M (U2 A) mac -> (forall s. F s -> IO a) -> IO a Source #

newtype F sf Source #

Constructors

F F 

Instances

Instances details
Show (F sf) Source # 
Instance details

Defined in Gpu.Vulkan.Fence.Type

Methods

showsPrec :: Int -> F sf -> ShowS #

show :: F sf -> String #

showList :: [F sf] -> ShowS #

data CreateInfo (mn :: Maybe Type) #

Constructors

CreateInfo 

Instances

Instances details
Show (M mn) => Show (CreateInfo mn) 
Instance details

Defined in Gpu.Vulkan.Fence.Middle.Internal

Methods

showsPrec :: Int -> CreateInfo mn -> ShowS #

show :: CreateInfo mn -> String #

showList :: [CreateInfo mn] -> ShowS #

Default (CreateInfo ('Nothing :: Maybe Type)) 
Instance details

Defined in Gpu.Vulkan.Fence.Middle.Internal

Methods

def :: CreateInfo ('Nothing :: Maybe Type) #

Group

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

data Group sd (ma :: Maybe (Type, Type)) sf k Source #

create' :: forall k (mn :: Maybe Type) (ma :: Maybe (Type, Type)) sd sf. (Ord k, WithPoked (M mn), ToMiddle ma) => Group sd ma sf k -> k -> CreateInfo mn -> IO (Either String (F sf)) Source #

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

lookup :: forall k sd (ma :: Maybe (Type, Type)) sf. Ord k => Group sd ma sf k -> k -> IO (Maybe (F sf)) Source #

WAIT FOR FENCES AND RESET FENCES

waitForFs :: forall sd (sfs :: [Type]). D sd -> PL F sfs -> Bool -> Maybe DiffTime -> IO () Source #

resetFs :: forall sd (sfs :: [Type]). D sd -> PL F sfs -> IO () Source #