module Brillo.Data.Display (Display (..))
where
data Display
=
InWindow String (Int, Int) (Int, Int)
|
FullScreen
deriving (Display -> Display -> Bool
(Display -> Display -> Bool)
-> (Display -> Display -> Bool) -> Eq Display
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Display -> Display -> Bool
== :: Display -> Display -> Bool
$c/= :: Display -> Display -> Bool
/= :: Display -> Display -> Bool
Eq, ReadPrec [Display]
ReadPrec Display
Int -> ReadS Display
ReadS [Display]
(Int -> ReadS Display)
-> ReadS [Display]
-> ReadPrec Display
-> ReadPrec [Display]
-> Read Display
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS Display
readsPrec :: Int -> ReadS Display
$creadList :: ReadS [Display]
readList :: ReadS [Display]
$creadPrec :: ReadPrec Display
readPrec :: ReadPrec Display
$creadListPrec :: ReadPrec [Display]
readListPrec :: ReadPrec [Display]
Read, Int -> Display -> ShowS
[Display] -> ShowS
Display -> String
(Int -> Display -> ShowS)
-> (Display -> String) -> ([Display] -> ShowS) -> Show Display
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Display -> ShowS
showsPrec :: Int -> Display -> ShowS
$cshow :: Display -> String
show :: Display -> String
$cshowList :: [Display] -> ShowS
showList :: [Display] -> ShowS
Show)