Safe Haskell | None |
---|---|
Language | Haskell2010 |
Gpu.Vulkan.Framebuffer
Synopsis
- create :: forall (mn :: Maybe Type) (mac :: Maybe (Type, Type)) sd sr (aargs :: [(Symbol, Format, Type)]) a. (WithPoked (M mn), ToMiddle mac) => D sd -> CreateInfo mn sr aargs -> M (U2 A) mac -> (forall s. F s -> IO a) -> IO a
- unsafeRecreate :: forall (mn :: Maybe Type) (mac :: Maybe (Type, Type)) sd sr (aargs :: [(Symbol, Format, Type)]) sf. (WithPoked (M mn), ToMiddle mac) => D sd -> CreateInfo mn sr aargs -> M (U2 A) mac -> F sf -> IO ()
- data F s
- data CreateInfo (mn :: Maybe Type) sr (aargs :: [(Symbol, Format, Type)]) = CreateInfo {
- createInfoNext :: M mn
- createInfoFlags :: CreateFlags
- createInfoRenderPass :: R sr
- createInfoAttachments :: PL (U3 I) aargs
- createInfoWidth :: Word32
- createInfoHeight :: Word32
- createInfoLayers :: Word32
- 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
- data Group sd (ma :: Maybe (Type, Type)) sf k
- create' :: forall k (mn :: Maybe Type) (ma :: Maybe (Type, Type)) sd sf sr (aargs :: [(Symbol, Format, Type)]). (Ord k, WithPoked (M mn), ToMiddle ma) => Group sd ma sf k -> k -> CreateInfo mn sr aargs -> IO (Either String (F sf))
- unsafeDestroy :: forall k (ma :: Maybe (Type, Type)) sd sf. (Ord k, ToMiddle ma) => Group sd ma sf k -> k -> IO (Either String ())
- lookup :: forall k sd (ma :: Maybe (Type, Type)) sf. Ord k => Group sd ma sf k -> k -> IO (Maybe (F sf))
- newtype CreateFlagBits = CreateFlagBits Word32
- pattern CreateFlagBitsMaxEnum :: CreateFlagBits
- pattern CreateFlagsZero :: CreateFlagBits
- unCreateFlagBits :: CreateFlagBits -> Word32
- type CreateFlags = CreateFlagBits
- pattern CreateImagelessBitKhr :: CreateFlagBits
- pattern CreateImagelessBit :: CreateFlagBits
CREATE
create :: forall (mn :: Maybe Type) (mac :: Maybe (Type, Type)) sd sr (aargs :: [(Symbol, Format, Type)]) a. (WithPoked (M mn), ToMiddle mac) => D sd -> CreateInfo mn sr aargs -> M (U2 A) mac -> (forall s. F s -> IO a) -> IO a Source #
unsafeRecreate :: forall (mn :: Maybe Type) (mac :: Maybe (Type, Type)) sd sr (aargs :: [(Symbol, Format, Type)]) sf. (WithPoked (M mn), ToMiddle mac) => D sd -> CreateInfo mn sr aargs -> M (U2 A) mac -> F sf -> IO () Source #
data CreateInfo (mn :: Maybe Type) sr (aargs :: [(Symbol, Format, Type)]) Source #
Constructors
CreateInfo | |
Fields
|
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 #
create' :: forall k (mn :: Maybe Type) (ma :: Maybe (Type, Type)) sd sf sr (aargs :: [(Symbol, Format, Type)]). (Ord k, WithPoked (M mn), ToMiddle ma) => Group sd ma sf k -> k -> CreateInfo mn sr aargs -> 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 #
ENUM
newtype CreateFlagBits #
Constructors
CreateFlagBits Word32 |
Instances
pattern CreateFlagBitsMaxEnum :: CreateFlagBits #
pattern CreateFlagsZero :: CreateFlagBits #
type CreateFlags = CreateFlagBits #
pattern CreateImagelessBitKhr :: CreateFlagBits #
pattern CreateImagelessBit :: CreateFlagBits #