Safe Haskell | Safe-Inferred |
---|---|
Language | GHC2021 |
Synopsis
- data Texture tag = Texture {}
- data TextureError
- data Flat
- data CubeMap
- data ArrayOf (layers :: Nat)
- class TextureLayers a where
- debugNameCollection :: (Traversable t, MonadVulkan env m, HasLogFunc env, HasCallStack) => t (Texture layers) -> t FilePath -> m ()
- type TextureLoader m layers = Format -> Queues CommandPool -> FilePath -> m (Texture layers)
- createImageView :: (MonadIO io, HasVulkan context) => context -> Image -> Format -> ("mip levels" ::: Word32) -> ("array layers" ::: Word32) -> io ImageView
- imageCI :: Format -> Extent3D -> Word32 -> Word32 -> ImageCreateInfo '[]
- imageAllocationCI :: AllocationCreateInfo
- stageBufferCI :: Integral a => a -> BufferCreateInfo '[]
- stageAllocationCI :: AllocationCreateInfo
- withSize2d :: Num i => (i -> i -> a) -> Texture tag -> a
- withSize3d :: Num i => (i -> i -> i -> a) -> Texture tag -> a
Documentation
Texture | |
|
data TextureError Source #
Instances
Exception TextureError Source # | |
Defined in Resource.Texture | |
Show TextureError Source # | |
Defined in Resource.Texture showsPrec :: Int -> TextureError -> ShowS # show :: TextureError -> String # showList :: [TextureError] -> ShowS # | |
Eq TextureError Source # | |
Defined in Resource.Texture (==) :: TextureError -> TextureError -> Bool # (/=) :: TextureError -> TextureError -> Bool # | |
Ord TextureError Source # | |
Defined in Resource.Texture compare :: TextureError -> TextureError -> Ordering # (<) :: TextureError -> TextureError -> Bool # (<=) :: TextureError -> TextureError -> Bool # (>) :: TextureError -> TextureError -> Bool # (>=) :: TextureError -> TextureError -> Bool # max :: TextureError -> TextureError -> TextureError # min :: TextureError -> TextureError -> TextureError # |
Texture types
Instances
TextureLayers Flat Source # | |
Defined in Resource.Texture |
Instances
TextureLayers CubeMap Source # | |
Defined in Resource.Texture |
data ArrayOf (layers :: Nat) Source #
Instances
KnownNat n => TextureLayers (ArrayOf n :: Type) Source # | |
Defined in Resource.Texture |
class TextureLayers a where Source #
Number of expected texture layers to load from resource.
Instances
TextureLayers CubeMap Source # | |
Defined in Resource.Texture | |
TextureLayers Flat Source # | |
Defined in Resource.Texture | |
KnownNat n => TextureLayers (ArrayOf n :: Type) Source # | |
Defined in Resource.Texture |
Utilities
debugNameCollection :: (Traversable t, MonadVulkan env m, HasLogFunc env, HasCallStack) => t (Texture layers) -> t FilePath -> m () Source #
type TextureLoader m layers = Format -> Queues CommandPool -> FilePath -> m (Texture layers) Source #
createImageView :: (MonadIO io, HasVulkan context) => context -> Image -> Format -> ("mip levels" ::: Word32) -> ("array layers" ::: Word32) -> io ImageView Source #
stageBufferCI :: Integral a => a -> BufferCreateInfo '[] Source #
withSize2d :: Num i => (i -> i -> a) -> Texture tag -> a Source #
withSize3d :: Num i => (i -> i -> i -> a) -> Texture tag -> a Source #