{-# LANGUAGE DeriveAnyClass #-}
{-# LANGUAGE DeriveGeneric #-}
module Aztecs.Window (Window (..)) where
import Aztecs.ECS
import Control.DeepSeq (NFData)
import GHC.Generics (Generic)
data Window = Window
{
Window -> String
windowTitle :: !String
}
deriving (Int -> Window -> ShowS
[Window] -> ShowS
Window -> String
(Int -> Window -> ShowS)
-> (Window -> String) -> ([Window] -> ShowS) -> Show Window
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Window -> ShowS
showsPrec :: Int -> Window -> ShowS
$cshow :: Window -> String
show :: Window -> String
$cshowList :: [Window] -> ShowS
showList :: [Window] -> ShowS
Show, (forall x. Window -> Rep Window x)
-> (forall x. Rep Window x -> Window) -> Generic Window
forall x. Rep Window x -> Window
forall x. Window -> Rep Window x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. Window -> Rep Window x
from :: forall x. Window -> Rep Window x
$cto :: forall x. Rep Window x -> Window
to :: forall x. Rep Window x -> Window
Generic, Window -> ()
(Window -> ()) -> NFData Window
forall a. (a -> ()) -> NFData a
$crnf :: Window -> ()
rnf :: Window -> ()
NFData)
instance Component Window