module Data.Colour.Palette.Types
(
Kolor
, Hue(..)
, Luminosity(..)
, ColorDefinition(..)
) where
import Data.Colour
type Kolor = Colour Double
data Hue
= HueMonochrome
| HueRed
| HueOrange
| HueYellow
| HueGreen
| HueBlue
| HuePurple
| HuePink
| HueRandom
deriving (Int -> Hue -> ShowS
[Hue] -> ShowS
Hue -> String
(Int -> Hue -> ShowS)
-> (Hue -> String) -> ([Hue] -> ShowS) -> Show Hue
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Hue -> ShowS
showsPrec :: Int -> Hue -> ShowS
$cshow :: Hue -> String
show :: Hue -> String
$cshowList :: [Hue] -> ShowS
showList :: [Hue] -> ShowS
Show, Hue -> Hue -> Bool
(Hue -> Hue -> Bool) -> (Hue -> Hue -> Bool) -> Eq Hue
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Hue -> Hue -> Bool
== :: Hue -> Hue -> Bool
$c/= :: Hue -> Hue -> Bool
/= :: Hue -> Hue -> Bool
Eq)
data Luminosity
= LumBright
| LumLight
| LumDark
| LumRandom
deriving (Int -> Luminosity -> ShowS
[Luminosity] -> ShowS
Luminosity -> String
(Int -> Luminosity -> ShowS)
-> (Luminosity -> String)
-> ([Luminosity] -> ShowS)
-> Show Luminosity
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Luminosity -> ShowS
showsPrec :: Int -> Luminosity -> ShowS
$cshow :: Luminosity -> String
show :: Luminosity -> String
$cshowList :: [Luminosity] -> ShowS
showList :: [Luminosity] -> ShowS
Show, Luminosity -> Luminosity -> Bool
(Luminosity -> Luminosity -> Bool)
-> (Luminosity -> Luminosity -> Bool) -> Eq Luminosity
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Luminosity -> Luminosity -> Bool
== :: Luminosity -> Luminosity -> Bool
$c/= :: Luminosity -> Luminosity -> Bool
/= :: Luminosity -> Luminosity -> Bool
Eq)
data ColorDefinition = ColorDefinition
{ ColorDefinition -> Maybe (Int, Int)
hueRange :: Maybe (Int, Int)
, ColorDefinition -> [(Int, Int)]
lowerBounds :: [(Int, Int)]
}