Safe Haskell | None |
---|---|
Language | Haskell2010 |
- module FWGL.Vector
- data Layer
- data Object gs is
- data AttrList is where
- AttrListNil :: AttrList []
- AttrListCons :: (Hashable c, AttributeCPU c g) => g -> [c] -> AttrList gs -> AttrList (g : gs)
- data Geometry is
- data Texture
- data Color = Color !Word8 !Word8 !Word8 !Word8
- (~~) :: (Equal gs gs', Equal is is') => Object gs is -> Object gs' is' -> Object (Union gs gs') (Union is is')
- program :: (Subset gs' gs, Subset gs'' gs, Subset os' os) => VertexShader gs' is os -> FragmentShader gs'' os' -> Program gs is
- nothing :: Object [] []
- static :: Geometry i -> Object [] i
- global :: (Typeable g, UniformCPU c g) => g -> c -> Object gs is -> Object (g : gs) is
- globalDraw :: (Typeable g, UniformCPU c g) => g -> Draw c -> Object gs is -> Object (g : gs) is
- globalTexture :: (BackendIO, Typeable g, UniformCPU ActiveTexture g) => g -> Texture -> Object gs is -> Object (g : gs) is
- globalTexSize :: (BackendIO, Typeable g, UniformCPU c g) => g -> Texture -> ((Int, Int) -> c) -> Object gs is -> Object (g : gs) is
- layer :: (Subset oi pi, Subset og pg) => Program pg pi -> Object og oi -> Layer
- subLayer :: Int -> Int -> Layer -> (Texture -> [Layer]) -> Layer
- unsafeJoin :: (Equal gs'' (Union gs gs'), Equal is'' (Union is is')) => Object gs is -> Object gs' is' -> Object gs'' is''
- mkGeometry :: GLES => AttrList is -> [Word16] -> Geometry is
- mkTexture :: GLES => Int -> Int -> [Color] -> Texture
- textureURL :: String -> Texture
- textureFile :: String -> Texture
- colorTex :: GLES => Color -> Texture
Documentation
module FWGL.Vector
AttrListNil :: AttrList [] | |
AttrListCons :: (Hashable c, AttributeCPU c g) => g -> [c] -> AttrList gs -> AttrList (g : gs) |
An RGBA 32-bit color.
(~~) :: (Equal gs gs', Equal is is') => Object gs is -> Object gs' is' -> Object (Union gs gs') (Union is is') Source
Join two objects.
program :: (Subset gs' gs, Subset gs'' gs, Subset os' os) => VertexShader gs' is os -> FragmentShader gs'' os' -> Program gs is Source
Create a Program
from the shaders.
global :: (Typeable g, UniformCPU c g) => g -> c -> Object gs is -> Object (g : gs) is Source
Sets a global (uniform) of an object.
globalDraw :: (Typeable g, UniformCPU c g) => g -> Draw c -> Object gs is -> Object (g : gs) is Source
Sets a global (uniform) of an object using the Draw
monad.
globalTexture :: (BackendIO, Typeable g, UniformCPU ActiveTexture g) => g -> Texture -> Object gs is -> Object (g : gs) is Source
Sets a global (uniform) of an object using a Texture
.
globalTexSize :: (BackendIO, Typeable g, UniformCPU c g) => g -> Texture -> ((Int, Int) -> c) -> Object gs is -> Object (g : gs) is Source
Sets a global (uniform) of an object using the dimensions of a Texture
.
layer :: (Subset oi pi, Subset og pg) => Program pg pi -> Object og oi -> Layer Source
Associate an object with a program.
unsafeJoin :: (Equal gs'' (Union gs gs'), Equal is'' (Union is is')) => Object gs is -> Object gs' is' -> Object gs'' is'' Source
Join two objects, even if they don't provide the same variables.
Creates a Texture
from a list of pixels.
textureFile :: String -> Texture Source
The same as textureURL
.