keid-resource-gltf-0.1.0.0: GLTF loader for Keid engine.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Resource.Gltf.Model

Documentation

type Mesh = Vector MeshPrimitive Source #

type MeshPrimitive = (Maybe (Int, Material), Stuff) Source #

data Stuff Source #

Constructors

Stuff 

Fields

Instances

Instances details
Monoid Stuff Source # 
Instance details

Defined in Resource.Gltf.Model

Methods

mempty :: Stuff #

mappend :: Stuff -> Stuff -> Stuff #

mconcat :: [Stuff] -> Stuff #

Semigroup Stuff Source # 
Instance details

Defined in Resource.Gltf.Model

Methods

(<>) :: Stuff -> Stuff -> Stuff #

sconcat :: NonEmpty Stuff -> Stuff #

stimes :: Integral b => b -> Stuff -> Stuff #

Generic Stuff Source # 
Instance details

Defined in Resource.Gltf.Model

Associated Types

type Rep Stuff :: Type -> Type #

Methods

from :: Stuff -> Rep Stuff x #

to :: Rep Stuff x -> Stuff #

Show Stuff Source # 
Instance details

Defined in Resource.Gltf.Model

Methods

showsPrec :: Int -> Stuff -> ShowS #

show :: Stuff -> String #

showList :: [Stuff] -> ShowS #

Eq Stuff Source # 
Instance details

Defined in Resource.Gltf.Model

Methods

(==) :: Stuff -> Stuff -> Bool #

(/=) :: Stuff -> Stuff -> Bool #

type Rep Stuff Source # 
Instance details

Defined in Resource.Gltf.Model

type Rep Stuff = D1 ('MetaData "Stuff" "Resource.Gltf.Model" "keid-resource-gltf-0.1.0.0-inplace" 'False) (C1 ('MetaCons "Stuff" 'PrefixI 'True) (S1 ('MetaSel ('Just "sPositions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Vector Packed)) :*: (S1 ('MetaSel ('Just "sIndices") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Vector Word32)) :*: S1 ('MetaSel ('Just "sAttrs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Vector VertexAttrs)))))

unzipStuff :: Foldable t => t Stuff -> ([Vector Packed], [Vector VertexAttrs], [Word32], [Vector Word32]) Source #

type StuffLike attrs = (Vector Packed, Vector Word32, Vector attrs) Source #

mergeStuffLike :: Foldable t => t (StuffLike attrs) -> StuffLike attrs Source #