module Graphics.Gloss.Interface.IO.Animate
( module Graphics.Gloss.Data.Display
, module Graphics.Gloss.Data.Picture
, module Graphics.Gloss.Data.Color
, animateIO
, animateFixedIO
, Controller (..))
where
import Graphics.Gloss.Data.Display
import Graphics.Gloss.Data.Controller
import Graphics.Gloss.Data.Picture
import Graphics.Gloss.Data.Color
import Graphics.Gloss.Internals.Interface.Animate
import Graphics.Gloss.Internals.Interface.Backend
animateIO
:: Display
-> Color
-> (Float -> IO Picture)
-> (Controller -> IO ())
-> IO ()
animateIO :: Display
-> Color -> (Float -> IO Picture) -> (Controller -> IO ()) -> IO ()
animateIO Display
display Color
backColor
Float -> IO Picture
frameFunIO Controller -> IO ()
eatControllerIO
= GLUTState
-> Bool
-> Display
-> Color
-> (Float -> IO Picture)
-> (Controller -> IO ())
-> IO ()
forall a.
Backend a =>
a
-> Bool
-> Display
-> Color
-> (Float -> IO Picture)
-> (Controller -> IO ())
-> IO ()
animateWithBackendIO
GLUTState
defaultBackendState
Bool
True
Display
display Color
backColor
Float -> IO Picture
frameFunIO
Controller -> IO ()
eatControllerIO
animateFixedIO
:: Display
-> Color
-> (Float -> IO Picture)
-> (Controller -> IO ())
-> IO ()
animateFixedIO :: Display
-> Color -> (Float -> IO Picture) -> (Controller -> IO ()) -> IO ()
animateFixedIO Display
display Color
backColor
Float -> IO Picture
frameFunIO Controller -> IO ()
eatControllerIO
= GLUTState
-> Bool
-> Display
-> Color
-> (Float -> IO Picture)
-> (Controller -> IO ())
-> IO ()
forall a.
Backend a =>
a
-> Bool
-> Display
-> Color
-> (Float -> IO Picture)
-> (Controller -> IO ())
-> IO ()
animateWithBackendIO
GLUTState
defaultBackendState
Bool
False
Display
display Color
backColor
Float -> IO Picture
frameFunIO
Controller -> IO ()
eatControllerIO