2018-02-07 00:18:16 +00:00
|
|
|
{-# LANGUAGE MultiParamTypeClasses #-}
|
|
|
|
{-# LANGUAGE TypeFamilies #-}
|
|
|
|
|
|
|
|
module Types.UserData where
|
|
|
|
|
|
|
|
import Affection
|
|
|
|
|
|
|
|
import Control.Concurrent.STM
|
|
|
|
|
2018-06-15 13:39:08 +00:00
|
|
|
import qualified SDL
|
|
|
|
|
2018-02-07 00:18:16 +00:00
|
|
|
import NanoVG hiding (V2(..), V3(..))
|
|
|
|
|
|
|
|
import qualified Data.Map.Strict as M
|
2018-03-01 22:33:08 +00:00
|
|
|
import qualified Data.Text as T
|
2018-02-17 01:36:06 +00:00
|
|
|
import Data.Matrix
|
2018-02-07 00:18:16 +00:00
|
|
|
import Data.Ecstasy
|
|
|
|
|
2018-05-16 14:23:23 +00:00
|
|
|
import Control.Concurrent.MVar
|
|
|
|
|
2018-02-17 01:36:06 +00:00
|
|
|
import Types.Map
|
2018-06-04 03:29:20 +00:00
|
|
|
import Types.StateData
|
|
|
|
import Types.ImgId
|
2018-06-08 23:17:03 +00:00
|
|
|
import Types.FontId
|
2018-06-04 03:29:20 +00:00
|
|
|
import Types.Direction
|
|
|
|
import Types.Animation
|
2018-02-17 01:36:06 +00:00
|
|
|
|
2018-02-07 00:18:16 +00:00
|
|
|
data UserData = UserData
|
2018-05-27 14:03:31 +00:00
|
|
|
{ state :: State
|
|
|
|
, subsystems :: Subsystems
|
|
|
|
, assetImages :: M.Map ImgId Image
|
|
|
|
, assetFonts :: M.Map FontId T.Text
|
|
|
|
, assetAnimations :: M.Map AnimId Animation
|
|
|
|
, nano :: Context
|
|
|
|
, uuid :: [UUID]
|
|
|
|
, worldState :: SystemState Entity IO
|
|
|
|
, stateData :: StateData
|
2018-06-08 23:17:03 +00:00
|
|
|
, stateMVar :: MVar (SystemState Entity IO, StateData)
|
|
|
|
, stateProgress :: MVar Float
|
2018-06-15 13:39:08 +00:00
|
|
|
, threadContext :: Maybe SDL.GLContext
|
|
|
|
, mainContext :: Maybe SDL.GLContext
|
|
|
|
, window :: Maybe SDL.Window
|
2018-02-07 00:18:16 +00:00
|
|
|
}
|
|
|
|
|
|
|
|
data State
|
2018-06-08 23:17:03 +00:00
|
|
|
= Load
|
2018-06-25 21:59:12 +00:00
|
|
|
| Main
|
2018-02-07 00:18:16 +00:00
|
|
|
| Test
|
|
|
|
|
|
|
|
data Entity f = Entity
|
2018-05-27 14:03:31 +00:00
|
|
|
{ pos :: Component f 'Field (V2 Double)
|
|
|
|
, gridPos :: Component f 'Field (V2 Int)
|
|
|
|
, vel :: Component f 'Field (V2 Double)
|
|
|
|
, velFact :: Component f 'Field Double
|
|
|
|
, rot :: Component f 'Field Direction
|
|
|
|
, obstacle :: Component f 'Field (Boundaries Double)
|
|
|
|
, player :: Component f 'Unique ()
|
2018-06-23 22:43:09 +00:00
|
|
|
, npcMoveState :: Component f 'Field NPCMoveState
|
2018-05-27 14:03:31 +00:00
|
|
|
, anim :: Component f 'Field AnimState
|
2018-02-07 00:18:16 +00:00
|
|
|
}
|
|
|
|
deriving (Generic)
|
|
|
|
|
2018-06-23 22:43:09 +00:00
|
|
|
data NPCMoveState
|
2018-04-14 16:43:05 +00:00
|
|
|
= NPCWalking
|
|
|
|
{ npcWalkPath :: [V2 Int]
|
|
|
|
}
|
|
|
|
| NPCStanding
|
2018-05-16 14:23:23 +00:00
|
|
|
{ npcStandTime :: Double
|
|
|
|
, npcFuturePath :: MVar [V2 Int]
|
2018-04-14 16:43:05 +00:00
|
|
|
}
|
|
|
|
|
2018-02-07 00:18:16 +00:00
|
|
|
data Subsystems = Subsystems
|
2018-06-23 22:42:39 +00:00
|
|
|
{ subWindow :: Window
|
|
|
|
, subMouse :: Mouse
|
|
|
|
, subkeyboard :: Keyboard
|
2018-02-07 00:18:16 +00:00
|
|
|
}
|
|
|
|
|
|
|
|
newtype Window = Window (TVar [(UUID, WindowMessage -> Affection UserData())])
|
|
|
|
newtype Mouse = Mouse (TVar [(UUID, MouseMessage -> Affection UserData ())])
|
2018-06-23 22:42:39 +00:00
|
|
|
newtype Keyboard = Keyboard (TVar [(UUID, KeyboardMessage -> Affection UserData ())])
|
2018-02-07 00:18:16 +00:00
|
|
|
|
|
|
|
instance Participant Window UserData where
|
|
|
|
type Mesg Window UserData = WindowMessage
|
|
|
|
|
|
|
|
partSubscribers (Window t) = generalSubscribers t
|
|
|
|
|
|
|
|
partSubscribe (Window t) = generalSubscribe t
|
|
|
|
|
|
|
|
partUnSubscribe (Window t) = generalUnSubscribe t
|
|
|
|
|
|
|
|
instance SDLSubsystem Window UserData where
|
|
|
|
consumeSDLEvents = consumeSDLWindowEvents
|
|
|
|
|
|
|
|
instance Participant Mouse UserData where
|
|
|
|
type Mesg Mouse UserData = MouseMessage
|
|
|
|
|
|
|
|
partSubscribers (Mouse t) = generalSubscribers t
|
|
|
|
|
|
|
|
partSubscribe (Mouse t) = generalSubscribe t
|
|
|
|
|
|
|
|
partUnSubscribe (Mouse t) = generalUnSubscribe t
|
|
|
|
|
|
|
|
instance SDLSubsystem Mouse UserData where
|
|
|
|
consumeSDLEvents = consumeSDLMouseEvents
|
|
|
|
|
2018-06-23 22:42:39 +00:00
|
|
|
instance Participant Keyboard UserData where
|
|
|
|
type Mesg Keyboard UserData = KeyboardMessage
|
|
|
|
|
|
|
|
partSubscribers (Keyboard t) = generalSubscribers t
|
|
|
|
|
|
|
|
partSubscribe (Keyboard t) = generalSubscribe t
|
|
|
|
|
|
|
|
partUnSubscribe (Keyboard t) = generalUnSubscribe t
|
|
|
|
|
|
|
|
instance SDLSubsystem Keyboard UserData where
|
|
|
|
consumeSDLEvents = consumeSDLKeyboardEvents
|
|
|
|
|
2018-02-07 00:18:16 +00:00
|
|
|
generalSubscribers
|
|
|
|
:: TVar [(UUID, msg -> Affection UserData ())]
|
|
|
|
-> Affection UserData [(msg -> Affection UserData ())]
|
|
|
|
generalSubscribers t = do
|
|
|
|
subTups <- liftIO $ readTVarIO t
|
|
|
|
return $ map snd subTups
|
|
|
|
|
|
|
|
generalSubscribe
|
|
|
|
:: TVar [(UUID, msg -> Affection UserData ())]
|
|
|
|
-> (msg -> Affection UserData ())
|
|
|
|
-> Affection UserData UUID
|
|
|
|
generalSubscribe t funct = do
|
2018-02-18 02:11:41 +00:00
|
|
|
uu <- genUUID
|
|
|
|
liftIO $ atomically $ modifyTVar' t ((uu, funct) :)
|
|
|
|
return uu
|
2018-02-07 00:18:16 +00:00
|
|
|
|
|
|
|
generalUnSubscribe
|
|
|
|
:: TVar [(UUID, msg -> Affection UserData ())]
|
|
|
|
-> UUID
|
|
|
|
-> Affection UserData ()
|
2018-02-18 02:11:41 +00:00
|
|
|
generalUnSubscribe t uu =
|
|
|
|
liftIO $ atomically $ modifyTVar' t (filter (`filterMsg` uu))
|
2018-02-07 00:18:16 +00:00
|
|
|
where
|
|
|
|
filterMsg (u, _) p = u /= p
|