{-# LANGUAGE OverloadedStrings #-}
module Data.GraphViz.Attributes.Colors.Brewer
( BrewerScheme(..)
, BrewerName(..)
, BrewerColor(..)
) where
import Data.GraphViz.Attributes.ColorScheme(BrewerScheme(..), BrewerName(..))
import Data.GraphViz.Parsing()
import Data.GraphViz.Printing()
import Data.Word(Word8)
data BrewerColor = BC BrewerScheme Word8
deriving (BrewerColor -> BrewerColor -> Bool
(BrewerColor -> BrewerColor -> Bool)
-> (BrewerColor -> BrewerColor -> Bool) -> Eq BrewerColor
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: BrewerColor -> BrewerColor -> Bool
== :: BrewerColor -> BrewerColor -> Bool
$c/= :: BrewerColor -> BrewerColor -> Bool
/= :: BrewerColor -> BrewerColor -> Bool
Eq, Eq BrewerColor
Eq BrewerColor =>
(BrewerColor -> BrewerColor -> Ordering)
-> (BrewerColor -> BrewerColor -> Bool)
-> (BrewerColor -> BrewerColor -> Bool)
-> (BrewerColor -> BrewerColor -> Bool)
-> (BrewerColor -> BrewerColor -> Bool)
-> (BrewerColor -> BrewerColor -> BrewerColor)
-> (BrewerColor -> BrewerColor -> BrewerColor)
-> Ord BrewerColor
BrewerColor -> BrewerColor -> Bool
BrewerColor -> BrewerColor -> Ordering
BrewerColor -> BrewerColor -> BrewerColor
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: BrewerColor -> BrewerColor -> Ordering
compare :: BrewerColor -> BrewerColor -> Ordering
$c< :: BrewerColor -> BrewerColor -> Bool
< :: BrewerColor -> BrewerColor -> Bool
$c<= :: BrewerColor -> BrewerColor -> Bool
<= :: BrewerColor -> BrewerColor -> Bool
$c> :: BrewerColor -> BrewerColor -> Bool
> :: BrewerColor -> BrewerColor -> Bool
$c>= :: BrewerColor -> BrewerColor -> Bool
>= :: BrewerColor -> BrewerColor -> Bool
$cmax :: BrewerColor -> BrewerColor -> BrewerColor
max :: BrewerColor -> BrewerColor -> BrewerColor
$cmin :: BrewerColor -> BrewerColor -> BrewerColor
min :: BrewerColor -> BrewerColor -> BrewerColor
Ord, Int -> BrewerColor -> ShowS
[BrewerColor] -> ShowS
BrewerColor -> String
(Int -> BrewerColor -> ShowS)
-> (BrewerColor -> String)
-> ([BrewerColor] -> ShowS)
-> Show BrewerColor
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> BrewerColor -> ShowS
showsPrec :: Int -> BrewerColor -> ShowS
$cshow :: BrewerColor -> String
show :: BrewerColor -> String
$cshowList :: [BrewerColor] -> ShowS
showList :: [BrewerColor] -> ShowS
Show, ReadPrec [BrewerColor]
ReadPrec BrewerColor
Int -> ReadS BrewerColor
ReadS [BrewerColor]
(Int -> ReadS BrewerColor)
-> ReadS [BrewerColor]
-> ReadPrec BrewerColor
-> ReadPrec [BrewerColor]
-> Read BrewerColor
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS BrewerColor
readsPrec :: Int -> ReadS BrewerColor
$creadList :: ReadS [BrewerColor]
readList :: ReadS [BrewerColor]
$creadPrec :: ReadPrec BrewerColor
readPrec :: ReadPrec BrewerColor
$creadListPrec :: ReadPrec [BrewerColor]
readListPrec :: ReadPrec [BrewerColor]
Read)