glsl-0.0.1.0: Parser and optimizer for a small subset of GLSL
Safe HaskellSafe-Inferred
LanguageHaskell2010

Language.GLSL.Internal.Bits

Documentation

data B Source #

Constructors

O 
I 

Instances

Instances details
Eq B Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

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

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

Show B Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

showsPrec :: Int -> B -> ShowS #

show :: B -> String #

showList :: [B] -> ShowS #

Bits B Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

fill :: B -> B Source #

flat :: B -> [B] Source #

unflat :: [B] -> Maybe (B, [B]) Source #

Expandable (B, B) (B, B, B, B, B) Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

expand :: (B, B) -> (B, B, B, B, B) Source #

Expandable (B, B, B) (B, B, B, B, B) Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

expand :: (B, B, B) -> (B, B, B, B, B) Source #

Expandable (B, B, B, B) (B, B, B, B, B) Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

expand :: (B, B, B, B) -> (B, B, B, B, B) Source #

class Bits a where Source #

Methods

fill :: B -> a Source #

flat :: a -> [B] Source #

unflat :: [B] -> Maybe (a, [B]) Source #

Instances

Instances details
Bits B Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

fill :: B -> B Source #

flat :: B -> [B] Source #

unflat :: [B] -> Maybe (B, [B]) Source #

(Bits a, Bits b) => Bits (a, b) Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

fill :: B -> (a, b) Source #

flat :: (a, b) -> [B] Source #

unflat :: [B] -> Maybe ((a, b), [B]) Source #

(Bits a, Bits b, Bits c) => Bits (a, b, c) Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

fill :: B -> (a, b, c) Source #

flat :: (a, b, c) -> [B] Source #

unflat :: [B] -> Maybe ((a, b, c), [B]) Source #

(Bits a, Bits b, Bits c, Bits d) => Bits (a, b, c, d) Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

fill :: B -> (a, b, c, d) Source #

flat :: (a, b, c, d) -> [B] Source #

unflat :: [B] -> Maybe ((a, b, c, d), [B]) Source #

(Bits a, Bits b, Bits c, Bits d, Bits e) => Bits (a, b, c, d, e) Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

fill :: B -> (a, b, c, d, e) Source #

flat :: (a, b, c, d, e) -> [B] Source #

unflat :: [B] -> Maybe ((a, b, c, d, e), [B]) Source #

zero :: Bits a => a Source #

one :: Bits a => a Source #

class Expandable a b where Source #

Methods

expand :: a -> b Source #

Instances

Instances details
Expandable a a Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

expand :: a -> a Source #

Expandable (B, B) (B, B, B, B, B) Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

expand :: (B, B) -> (B, B, B, B, B) Source #

Expandable (B, B, B) (B, B, B, B, B) Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

expand :: (B, B, B) -> (B, B, B, B, B) Source #

Expandable (B, B, B, B) (B, B, B, B, B) Source # 
Instance details

Defined in Language.GLSL.Internal.Bits

Methods

expand :: (B, B, B, B) -> (B, B, B, B, B) Source #