module FRP.Rhine.Gloss.Common (
module FRP.Rhine.Gloss.Common,
module X,
) where
import qualified Graphics.Gloss as X
import Graphics.Gloss.Interface.Pure.Game
import qualified Graphics.Gloss.Interface.Pure.Game as X
data GlossSettings = GlossSettings
{ GlossSettings -> Display
display :: Display
, GlossSettings -> Color
backgroundColor :: Color
, GlossSettings -> Int
stepsPerSecond :: Int
}
defaultSettings :: GlossSettings
defaultSettings :: GlossSettings
defaultSettings =
GlossSettings
{ display :: Display
display = String -> (Int, Int) -> (Int, Int) -> Display
InWindow String
"rhine-gloss" (Int
400, Int
400) (Int
10, Int
10)
, backgroundColor :: Color
backgroundColor = Float -> Color
greyN Float
0.3
, stepsPerSecond :: Int
stepsPerSecond = Int
30
}