Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
- class ShaderType t where
- data Expr
- newtype Float = Float Expr
- newtype Sampler2D = Sampler2D Expr
- data V2 = V2 Float Float
- data V3 = V3 Float Float Float
- data V4 = V4 Float Float Float Float
- data M2 = M2 V2 V2
- data M3 = M3 V3 V3 V3
- data M4 = M4 V4 V4 V4 V4
- fromRational :: Rational -> Float
- fromInteger :: Integer -> Float
- negate :: Float -> Float
- (*) :: (Mul a b c, ShaderType a, ShaderType b, ShaderType c) => a -> b -> c
- (/) :: (Mul a b c, ShaderType a, ShaderType b, ShaderType c) => a -> b -> c
- (+) :: (Sum a, ShaderType a) => a -> a -> a
- (-) :: (Sum a, ShaderType a) => a -> a -> a
- (^) :: (ShaderType a, ShaderType b) => a -> b -> a
- (&&) :: Bool -> Bool -> Bool
- (||) :: Bool -> Bool -> Bool
- (==) :: ShaderType a => a -> a -> Bool
- (>=) :: ShaderType a => a -> a -> Bool
- (<=) :: ShaderType a => a -> a -> Bool
- (<) :: ShaderType a => a -> a -> Bool
- (>) :: ShaderType a => a -> a -> Bool
- abs :: Float -> Float
- sign :: Float -> Float
- texture2D :: Sampler2D -> V2 -> V4
- sqrt :: Float -> Float
Documentation
class ShaderType t where Source
ShaderType V2 | |
Typeable * V2 | |
GLES => AttributeCPU V2 V2 | |
GLES => UniformCPU V2 V2 |
ShaderType V3 | |
Typeable * V3 | |
GLES => AttributeCPU V3 V3 | |
GLES => UniformCPU V3 V3 |
ShaderType V4 | |
Typeable * V4 | |
GLES => AttributeCPU V4 V4 | |
GLES => UniformCPU V4 V4 |
fromRational :: Rational -> Float Source
fromInteger :: Integer -> Float Source
(*) :: (Mul a b c, ShaderType a, ShaderType b, ShaderType c) => a -> b -> c infixl 7 Source
(/) :: (Mul a b c, ShaderType a, ShaderType b, ShaderType c) => a -> b -> c infixl 7 Source
(+) :: (Sum a, ShaderType a) => a -> a -> a infixl 6 Source
(-) :: (Sum a, ShaderType a) => a -> a -> a infixl 6 Source
(^) :: (ShaderType a, ShaderType b) => a -> b -> a infixr 8 Source
(==) :: ShaderType a => a -> a -> Bool infix 4 Source
(>=) :: ShaderType a => a -> a -> Bool infix 4 Source
(<=) :: ShaderType a => a -> a -> Bool infix 4 Source
(<) :: ShaderType a => a -> a -> Bool infix 4 Source
(>) :: ShaderType a => a -> a -> Bool infix 4 Source