2016-10-31 22:47:16 +00:00
|
|
|
{-# LANGUAGE RecordWildCards #-}
|
2016-03-25 08:41:22 +00:00
|
|
|
module Affection
|
2016-10-31 22:47:16 +00:00
|
|
|
( withAffection
|
2016-03-25 10:43:31 +00:00
|
|
|
, withWindow
|
|
|
|
, withDefaultWindow
|
|
|
|
, delaySec
|
2016-11-04 15:06:16 +00:00
|
|
|
, get
|
|
|
|
, put
|
2016-03-26 02:50:39 +00:00
|
|
|
, module Affection.Render
|
2016-11-02 00:14:53 +00:00
|
|
|
, module Types
|
2016-03-25 08:41:22 +00:00
|
|
|
) where
|
|
|
|
|
2016-10-31 22:47:16 +00:00
|
|
|
import qualified SDL
|
|
|
|
import qualified GEGL as G
|
|
|
|
|
|
|
|
import qualified Data.Text as T
|
|
|
|
import Data.Maybe
|
|
|
|
|
2016-11-02 00:14:53 +00:00
|
|
|
import System.Clock
|
2016-10-31 22:47:16 +00:00
|
|
|
|
|
|
|
import Control.Monad.Loops
|
|
|
|
import Control.Monad.State
|
|
|
|
import Control.Monad.Reader
|
|
|
|
import Control.Concurrent.MVar
|
2016-03-25 10:43:31 +00:00
|
|
|
|
2016-03-25 15:58:46 +00:00
|
|
|
import Affection.Render
|
2016-10-31 22:47:16 +00:00
|
|
|
import Affection.Types as Types
|
2016-03-25 15:58:46 +00:00
|
|
|
|
2016-11-06 04:02:06 +00:00
|
|
|
-- | Main function which bootstraps everything else.
|
|
|
|
withAffection
|
|
|
|
:: AffectionConfig us -- ^ Configuration of the Game and its engine.
|
|
|
|
-> IO ()
|
2016-10-31 22:47:16 +00:00
|
|
|
withAffection conf@AffectionConfig{..} = do
|
|
|
|
case initComponents of
|
|
|
|
All ->
|
|
|
|
SDL.initializeAll
|
|
|
|
Only is ->
|
|
|
|
SDL.initialize is
|
2016-11-04 15:06:16 +00:00
|
|
|
G.gegl_init
|
2016-11-02 00:14:53 +00:00
|
|
|
execTime <- newMVar =<< getTime Monotonic
|
2016-10-31 22:47:16 +00:00
|
|
|
window <- SDL.createWindow windowTitle windowConfig
|
|
|
|
surface <- SDL.getWindowSurface window
|
2016-11-04 15:06:16 +00:00
|
|
|
initContainer <- return . (\x -> AffectionData
|
|
|
|
{ quitEvent = False
|
|
|
|
, userState = x
|
2016-11-02 00:14:53 +00:00
|
|
|
, drawWindow = window
|
|
|
|
, drawSurface = surface
|
2016-11-04 15:06:16 +00:00
|
|
|
}) =<< loadState surface
|
2016-11-02 00:14:53 +00:00
|
|
|
(res, nState) <- runStateT ( Types.runState $
|
2016-10-31 22:47:16 +00:00
|
|
|
whileM_ (do
|
|
|
|
current <- get
|
2016-11-04 15:06:16 +00:00
|
|
|
return $ not $ Types.quitEvent current
|
2016-10-31 22:47:16 +00:00
|
|
|
)
|
2016-11-04 15:06:16 +00:00
|
|
|
(do
|
2016-11-02 00:14:53 +00:00
|
|
|
now <- liftIO $ getTime Monotonic
|
|
|
|
lastTime <- liftIO $ fromMaybe now <$> tryReadMVar execTime
|
|
|
|
drawLoop
|
|
|
|
updateLoop $ (fromIntegral $ toNanoSecs $ diffTimeSpec lastTime now) /
|
|
|
|
(fromIntegral 10 ^ 9)
|
2016-11-04 15:06:16 +00:00
|
|
|
_ <- liftIO $ swapMVar execTime $ now
|
|
|
|
return ()
|
|
|
|
)
|
2016-10-31 22:47:16 +00:00
|
|
|
) initContainer
|
2016-11-04 15:06:16 +00:00
|
|
|
G.gegl_exit
|
2016-10-31 22:47:16 +00:00
|
|
|
SDL.quit
|
2016-03-25 10:43:31 +00:00
|
|
|
|
2016-11-06 04:02:06 +00:00
|
|
|
-- | DEPRECATED!
|
|
|
|
-- Function for bootstraping a window.
|
2016-10-31 22:47:16 +00:00
|
|
|
withWindow :: Monad m => T.Text -> WindowConfig -> SDL.RendererConfig -> RenderT m a -> IO ()
|
2016-03-25 15:58:46 +00:00
|
|
|
withWindow title wconf rconf ops = do
|
2016-10-31 22:47:16 +00:00
|
|
|
window <- SDL.createWindow title wconf
|
2016-10-16 15:01:31 +00:00
|
|
|
-- I don't need a renderer here, i need a surface
|
2016-10-31 22:47:16 +00:00
|
|
|
renderer <- SDL.createRenderer window (-1) rconf
|
|
|
|
surface <- SDL.getWindowSurface window
|
|
|
|
G.gegl_init
|
2016-10-16 15:01:31 +00:00
|
|
|
-- I think I need some AffectionT or someting similar here and not a RenderT
|
|
|
|
-- from SDL.
|
2016-03-25 15:58:46 +00:00
|
|
|
inRender renderer $ ops
|
2016-10-31 22:47:16 +00:00
|
|
|
G.gegl_exit
|
|
|
|
SDL.destroyWindow window
|
2016-03-25 10:43:31 +00:00
|
|
|
|
2016-11-06 04:02:06 +00:00
|
|
|
-- | DEPRECATED!
|
|
|
|
-- Bootstrap a default window.
|
2016-10-31 22:47:16 +00:00
|
|
|
withDefaultWindow :: Monad m => T.Text -> (RenderT m a) -> IO ()
|
|
|
|
withDefaultWindow title ops = withWindow title defaultWindow SDL.defaultRenderer ops
|
2016-03-25 10:43:31 +00:00
|
|
|
|
2016-11-06 04:02:06 +00:00
|
|
|
-- | block a thread for a specified amount of time
|
|
|
|
delaySec
|
|
|
|
:: Int -- ^ Number of seconds
|
|
|
|
-> IO ()
|
2016-10-31 22:47:16 +00:00
|
|
|
delaySec dur = SDL.delay (fromIntegral $ dur * 1000)
|