keid-core-0.1.8.0: Core parts of Keid engine.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Render.Samplers

Documentation

data Collection a Source #

Constructors

Collection 

Fields

Instances

Instances details
Foldable Collection Source # 
Instance details

Defined in Render.Samplers

Methods

fold :: Monoid m => Collection m -> m Source #

foldMap :: Monoid m => (a -> m) -> Collection a -> m Source #

foldMap' :: Monoid m => (a -> m) -> Collection a -> m Source #

foldr :: (a -> b -> b) -> b -> Collection a -> b Source #

foldr' :: (a -> b -> b) -> b -> Collection a -> b Source #

foldl :: (b -> a -> b) -> b -> Collection a -> b Source #

foldl' :: (b -> a -> b) -> b -> Collection a -> b Source #

foldr1 :: (a -> a -> a) -> Collection a -> a Source #

foldl1 :: (a -> a -> a) -> Collection a -> a Source #

toList :: Collection a -> [a] Source #

null :: Collection a -> Bool Source #

length :: Collection a -> Int Source #

elem :: Eq a => a -> Collection a -> Bool Source #

maximum :: Ord a => Collection a -> a Source #

minimum :: Ord a => Collection a -> a Source #

sum :: Num a => Collection a -> a Source #

product :: Num a => Collection a -> a Source #

Traversable Collection Source # 
Instance details

Defined in Render.Samplers

Methods

traverse :: Applicative f => (a -> f b) -> Collection a -> f (Collection b) Source #

sequenceA :: Applicative f => Collection (f a) -> f (Collection a) Source #

mapM :: Monad m => (a -> m b) -> Collection a -> m (Collection b) Source #

sequence :: Monad m => Collection (m a) -> m (Collection a) Source #

Applicative Collection Source # 
Instance details

Defined in Render.Samplers

Functor Collection Source # 
Instance details

Defined in Render.Samplers

Methods

fmap :: (a -> b) -> Collection a -> Collection b Source #

(<$) :: a -> Collection b -> Collection a Source #

Generic1 Collection Source # 
Instance details

Defined in Render.Samplers

Associated Types

type Rep1 Collection :: k -> Type Source #

Methods

from1 :: forall (a :: k). Collection a -> Rep1 Collection a Source #

to1 :: forall (a :: k). Rep1 Collection a -> Collection a Source #

Show a => Show (Collection a) Source # 
Instance details

Defined in Render.Samplers

type Rep1 Collection Source # 
Instance details

Defined in Render.Samplers

allocate :: MonadVulkan env io => ("max anisotropy" ::: Float) -> ResourceT io (Collection Sampler) Source #

createInfo :: ("max anisotropy" ::: Float) -> Filter -> ("max LoD" ::: Float) -> SamplerAddressMode -> SamplerCreateInfo '[] Source #