Color-0.3.3: Color spaces and conversions between them
Safe HaskellNone
LanguageHaskell2010

Graphics.Color.Space.CIE1976.LUV

Description

 
Synopsis

Constructors for an CIE L*u*v* color space.

pattern LUV :: V3 e -> Color (LUV i) e Source #

pattern ColorLUV :: e -> e -> e -> Color (LUV i) e Source #

pattern ColorLUVA :: e -> e -> e -> e -> Color (Alpha (LUV i)) e Source #

Constructor for LUV with alpha channel.

data LUV (i :: k) Source #

CIE L*u*v* color space

Instances

Instances details
(Illuminant i, Elevator e, RealFloat e) => ColorSpace (LUV i) (i :: k) e Source # 
Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

Associated Types

type BaseModel (LUV i) Source #

type BaseSpace (LUV i) Source #

Methods

toBaseModel :: Color (LUV i) e -> Color (BaseModel (LUV i)) e Source #

fromBaseModel :: Color (BaseModel (LUV i)) e -> Color (LUV i) e Source #

toBaseSpace :: Color (LUV i) e -> Color (BaseSpace (LUV i)) e Source #

fromBaseSpace :: Color (BaseSpace (LUV i)) e -> Color (LUV i) e Source #

luminance :: (Elevator a, RealFloat a) => Color (LUV i) e -> Color (Y i) a Source #

toColorXYZ :: (Elevator a, RealFloat a) => Color (LUV i) e -> Color (XYZ i) a Source #

fromColorXYZ :: (Elevator a, RealFloat a) => Color (XYZ i) a -> Color (LUV i) e Source #

Functor (Color (LUV i)) Source #

CIE1976 LUV color space

Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

Methods

fmap :: (a -> b) -> Color (LUV i) a -> Color (LUV i) b #

(<$) :: a -> Color (LUV i) b -> Color (LUV i) a #

Applicative (Color (LUV i)) Source #

CIE1976 LUV color space

Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

Methods

pure :: a -> Color (LUV i) a #

(<*>) :: Color (LUV i) (a -> b) -> Color (LUV i) a -> Color (LUV i) b #

liftA2 :: (a -> b -> c) -> Color (LUV i) a -> Color (LUV i) b -> Color (LUV i) c #

(*>) :: Color (LUV i) a -> Color (LUV i) b -> Color (LUV i) b #

(<*) :: Color (LUV i) a -> Color (LUV i) b -> Color (LUV i) a #

Foldable (Color (LUV i)) Source #

CIE1976 LUV color space

Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

Methods

fold :: Monoid m => Color (LUV i) m -> m #

foldMap :: Monoid m => (a -> m) -> Color (LUV i) a -> m #

foldMap' :: Monoid m => (a -> m) -> Color (LUV i) a -> m #

foldr :: (a -> b -> b) -> b -> Color (LUV i) a -> b #

foldr' :: (a -> b -> b) -> b -> Color (LUV i) a -> b #

foldl :: (b -> a -> b) -> b -> Color (LUV i) a -> b #

foldl' :: (b -> a -> b) -> b -> Color (LUV i) a -> b #

foldr1 :: (a -> a -> a) -> Color (LUV i) a -> a #

foldl1 :: (a -> a -> a) -> Color (LUV i) a -> a #

toList :: Color (LUV i) a -> [a] #

null :: Color (LUV i) a -> Bool #

length :: Color (LUV i) a -> Int #

elem :: Eq a => a -> Color (LUV i) a -> Bool #

maximum :: Ord a => Color (LUV i) a -> a #

minimum :: Ord a => Color (LUV i) a -> a #

sum :: Num a => Color (LUV i) a -> a #

product :: Num a => Color (LUV i) a -> a #

Traversable (Color (LUV i)) Source #

CIE1976 LUV color space

Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

Methods

traverse :: Applicative f => (a -> f b) -> Color (LUV i) a -> f (Color (LUV i) b) #

sequenceA :: Applicative f => Color (LUV i) (f a) -> f (Color (LUV i) a) #

mapM :: Monad m => (a -> m b) -> Color (LUV i) a -> m (Color (LUV i) b) #

sequence :: Monad m => Color (LUV i) (m a) -> m (Color (LUV i) a) #

Eq e => Eq (Color (LUV i) e) Source #

CIE1976 LUV color space

Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

Methods

(==) :: Color (LUV i) e -> Color (LUV i) e -> Bool #

(/=) :: Color (LUV i) e -> Color (LUV i) e -> Bool #

Ord e => Ord (Color (LUV i) e) Source #

CIE1976 LUV color space

Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

Methods

compare :: Color (LUV i) e -> Color (LUV i) e -> Ordering #

(<) :: Color (LUV i) e -> Color (LUV i) e -> Bool #

(<=) :: Color (LUV i) e -> Color (LUV i) e -> Bool #

(>) :: Color (LUV i) e -> Color (LUV i) e -> Bool #

(>=) :: Color (LUV i) e -> Color (LUV i) e -> Bool #

max :: Color (LUV i) e -> Color (LUV i) e -> Color (LUV i) e #

min :: Color (LUV i) e -> Color (LUV i) e -> Color (LUV i) e #

(Illuminant i, Elevator e) => Show (Color (LUV i) e) Source #

CIE1976 LUV color space

Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

Methods

showsPrec :: Int -> Color (LUV i) e -> ShowS #

show :: Color (LUV i) e -> String #

showList :: [Color (LUV i) e] -> ShowS #

Storable e => Storable (Color (LUV i) e) Source #

CIE1976 LUV color space

Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

Methods

sizeOf :: Color (LUV i) e -> Int #

alignment :: Color (LUV i) e -> Int #

peekElemOff :: Ptr (Color (LUV i) e) -> Int -> IO (Color (LUV i) e) #

pokeElemOff :: Ptr (Color (LUV i) e) -> Int -> Color (LUV i) e -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Color (LUV i) e) #

pokeByteOff :: Ptr b -> Int -> Color (LUV i) e -> IO () #

peek :: Ptr (Color (LUV i) e) -> IO (Color (LUV i) e) #

poke :: Ptr (Color (LUV i) e) -> Color (LUV i) e -> IO () #

(Illuminant i, Elevator e) => ColorModel (LUV i) e Source #

CIE1976 LUV color space

Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

Associated Types

type Components (LUV i) e Source #

newtype Color (LUV i) e Source #

Color in CIE L*u*v* color space

Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

newtype Color (LUV i) e = LUV (V3 e)
type BaseModel (LUV i) Source # 
Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

type BaseModel (LUV i) = LUV i
type BaseSpace (LUV i) Source # 
Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

type BaseSpace (LUV i) = LUV i
type Components (LUV i) e Source # 
Instance details

Defined in Graphics.Color.Space.CIE1976.LUV

type Components (LUV i) e = (e, e, e)