Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Text.GLTF.Loader.Gltf
Synopsis
- data Gltf = Gltf {}
- data Asset = Asset {}
- data Material = Material {}
- data MaterialAlphaMode
- data Mesh = Mesh {}
- data Node = Node {
- nodeMeshId :: Maybe Int
- nodeName :: Maybe Text
- nodeRotation :: Maybe (V4 Float)
- nodeScale :: Maybe (V3 Float)
- nodeTranslation :: Maybe (V3 Float)
- nodeWeights :: [Float]
- data MeshPrimitive = MeshPrimitive {}
- data PbrMetallicRoughness = PbrMetallicRoughness {}
- data MeshPrimitiveMode
- _asset :: Lens' Gltf Asset
- _materials :: Lens' Gltf (Vector Material)
- _meshes :: Lens' Gltf (Vector Mesh)
- _nodes :: Lens' Gltf (Vector Node)
- _assetVersion :: Lens' Asset Text
- _assetCopyright :: Lens' Asset (Maybe Text)
- _assetGenerator :: Lens' Asset (Maybe Text)
- _assetMinVersion :: Lens' Asset (Maybe Text)
- _materialAlphaCutoff :: Lens' Material Float
- _materialAlphaMode :: Lens' Material MaterialAlphaMode
- _materialDoubleSided :: Lens' Material Bool
- _materialEmissiveFactor :: Lens' Material (V3 Float)
- _materialName :: Lens' Material (Maybe Text)
- _materialPbrMetallicRoughness :: Lens' Material (Maybe PbrMetallicRoughness)
- _meshPrimitives :: Lens' Mesh (Vector MeshPrimitive)
- _meshWeights :: Lens' Mesh (Vector Float)
- _meshName :: Lens' Mesh (Maybe Text)
- _nodeMeshId :: Lens' Node (Maybe Int)
- _nodeName :: Lens' Node (Maybe Text)
- _nodeRotation :: Lens' Node (Maybe (V4 Float))
- _nodeScale :: Lens' Node (Maybe (V3 Float))
- _nodeTranslation :: Lens' Node (Maybe (V3 Float))
- _nodeWeights :: Lens' Node [Float]
- _meshPrimitiveMaterial :: Lens' MeshPrimitive (Maybe Int)
- _meshPrimitiveIndices :: Lens' MeshPrimitive (Vector Int)
- _meshPrimitiveMode :: Lens' MeshPrimitive MeshPrimitiveMode
- _meshPrimitiveNormals :: Lens' MeshPrimitive (Vector (V3 Float))
- _meshPrimitivePositions :: Lens' MeshPrimitive (Vector (V3 Float))
- _pbrBaseColorFactor :: Lens' PbrMetallicRoughness (V4 Float)
- _pbrMetallicFactor :: Lens' PbrMetallicRoughness Float
- _pbrRoughnessFactor :: Lens' PbrMetallicRoughness Float
Data constructors
The root data type for a glTF asset
Constructors
Gltf | |
Metadata about the glTF asset
Constructors
Asset | |
Fields
|
The material appearance of a primitive
Constructors
Material | |
data MaterialAlphaMode Source #
Alpha rendering mode of a material
Instances
Enum MaterialAlphaMode Source # | |
Defined in Text.GLTF.Loader.Gltf Methods succ :: MaterialAlphaMode -> MaterialAlphaMode # pred :: MaterialAlphaMode -> MaterialAlphaMode # toEnum :: Int -> MaterialAlphaMode # fromEnum :: MaterialAlphaMode -> Int # enumFrom :: MaterialAlphaMode -> [MaterialAlphaMode] # enumFromThen :: MaterialAlphaMode -> MaterialAlphaMode -> [MaterialAlphaMode] # enumFromTo :: MaterialAlphaMode -> MaterialAlphaMode -> [MaterialAlphaMode] # enumFromThenTo :: MaterialAlphaMode -> MaterialAlphaMode -> MaterialAlphaMode -> [MaterialAlphaMode] # | |
Show MaterialAlphaMode Source # | |
Defined in Text.GLTF.Loader.Gltf Methods showsPrec :: Int -> MaterialAlphaMode -> ShowS # show :: MaterialAlphaMode -> String # showList :: [MaterialAlphaMode] -> ShowS # | |
Eq MaterialAlphaMode Source # | |
Defined in Text.GLTF.Loader.Gltf Methods (==) :: MaterialAlphaMode -> MaterialAlphaMode -> Bool # (/=) :: MaterialAlphaMode -> MaterialAlphaMode -> Bool # |
A set of primitives to be rendered
Constructors
Mesh | |
Fields |
A node in the node hierarchy
data MeshPrimitive Source #
Geometry to be rendered with the given material
Constructors
MeshPrimitive | |
Fields |
Instances
Show MeshPrimitive Source # | |
Defined in Text.GLTF.Loader.Gltf Methods showsPrec :: Int -> MeshPrimitive -> ShowS # show :: MeshPrimitive -> String # showList :: [MeshPrimitive] -> ShowS # | |
Eq MeshPrimitive Source # | |
Defined in Text.GLTF.Loader.Gltf Methods (==) :: MeshPrimitive -> MeshPrimitive -> Bool # (/=) :: MeshPrimitive -> MeshPrimitive -> Bool # |
data PbrMetallicRoughness Source #
A set of parameter values that are used to define the metallic-roughness material model from Physically-Based Rendering (PBR) methodology.
Constructors
PbrMetallicRoughness | |
Fields |
Instances
Show PbrMetallicRoughness Source # | |
Defined in Text.GLTF.Loader.Gltf Methods showsPrec :: Int -> PbrMetallicRoughness -> ShowS # show :: PbrMetallicRoughness -> String # showList :: [PbrMetallicRoughness] -> ShowS # | |
Eq PbrMetallicRoughness Source # | |
Defined in Text.GLTF.Loader.Gltf Methods (==) :: PbrMetallicRoughness -> PbrMetallicRoughness -> Bool # (/=) :: PbrMetallicRoughness -> PbrMetallicRoughness -> Bool # |
data MeshPrimitiveMode Source #
The topology type of primitives to render.
Constructors
Points | |
Lines | |
LineLoop | |
LineStrip | |
Triangles | |
TriangleStrip | |
TriangleFan |
Instances
Enum MeshPrimitiveMode Source # | |
Defined in Text.GLTF.Loader.Gltf Methods succ :: MeshPrimitiveMode -> MeshPrimitiveMode # pred :: MeshPrimitiveMode -> MeshPrimitiveMode # toEnum :: Int -> MeshPrimitiveMode # fromEnum :: MeshPrimitiveMode -> Int # enumFrom :: MeshPrimitiveMode -> [MeshPrimitiveMode] # enumFromThen :: MeshPrimitiveMode -> MeshPrimitiveMode -> [MeshPrimitiveMode] # enumFromTo :: MeshPrimitiveMode -> MeshPrimitiveMode -> [MeshPrimitiveMode] # enumFromThenTo :: MeshPrimitiveMode -> MeshPrimitiveMode -> MeshPrimitiveMode -> [MeshPrimitiveMode] # | |
Show MeshPrimitiveMode Source # | |
Defined in Text.GLTF.Loader.Gltf Methods showsPrec :: Int -> MeshPrimitiveMode -> ShowS # show :: MeshPrimitiveMode -> String # showList :: [MeshPrimitiveMode] -> ShowS # | |
Eq MeshPrimitiveMode Source # | |
Defined in Text.GLTF.Loader.Gltf Methods (==) :: MeshPrimitiveMode -> MeshPrimitiveMode -> Bool # (/=) :: MeshPrimitiveMode -> MeshPrimitiveMode -> Bool # |