tracer/src/Test.hs

463 lines
15 KiB
Haskell
Raw Normal View History

module Test where
2018-02-18 03:11:41 +01:00
import Affection as A hiding (get)
2018-02-18 03:11:41 +01:00
import SDL (get, ($=))
import qualified SDL
import qualified Graphics.Rendering.OpenGL as GL hiding (get)
2018-03-12 00:21:16 +01:00
import NanoVG hiding (V2(..))
2018-02-18 03:11:41 +01:00
2018-03-02 02:10:35 +01:00
import Control.Monad (when, unless, void)
import Control.Monad.IO.Class (liftIO)
import Control.Concurrent.MVar
2018-05-18 20:05:21 +02:00
import Control.Concurrent (forkOS)
2018-02-25 10:30:13 +01:00
import Data.Map.Strict as Map
2018-03-01 23:33:08 +01:00
import qualified Data.Set as S
import qualified Data.Text as T
2018-03-03 11:06:38 +01:00
import Data.Matrix as M
2018-02-18 05:31:34 +01:00
import Data.Ecstasy as E
2018-03-04 22:24:30 +01:00
import Data.Maybe
2018-05-30 16:20:58 +02:00
import Data.List (sortOn)
2018-04-14 18:43:05 +02:00
import System.Random (randomRIO)
2018-05-26 08:34:49 +02:00
import Linear hiding (E)
2018-02-18 03:11:41 +01:00
import Foreign.C.Types (CFloat(..))
2018-02-18 03:11:41 +01:00
import Debug.Trace
2018-03-02 02:10:35 +01:00
-- internal imports
2018-03-03 17:03:17 +01:00
import Interior
2018-03-02 02:10:35 +01:00
import Util
2018-03-12 00:21:16 +01:00
import Types
import Floorplan
2018-04-14 11:18:37 +02:00
import NPC
2018-03-02 02:10:35 +01:00
loadMap :: Affection UserData ()
loadMap = do
ud <- getAffection
2018-03-03 17:42:24 +01:00
let fc = FloorConfig
2018-05-30 16:20:58 +02:00
(10, 10)
[]
2018-05-18 20:05:21 +02:00
(50, 50)
2018-02-18 03:11:41 +01:00
(Subsystems _ m) = subsystems ud
2018-03-06 21:58:55 +01:00
(mat, gr) <- liftIO $ buildHallFloorIO fc
let imgmat = convertTileToImg mat
exits = Prelude.foldl
(\acc coord@(r, c) -> if imgmat M.! coord == Just ImgEmpty
then ReachPoint RoomExit (V2 r c) : acc
else acc
)
[]
((,) <$> [1 .. nrows mat] <*> [1 .. ncols mat])
2018-04-14 13:34:28 +02:00
(inter, rps) <- liftIO $ placeInteriorIO mat imgmat exits gr
liftIO $ logIO A.Debug ("number of reachpoints: " ++ show (length rps))
let nnex = Prelude.filter (\p -> pointType p /= RoomExit) rps
2018-05-18 20:05:21 +02:00
npcposs <- placeNPCs inter mat rps gr 50 -- (length nnex)
2018-05-26 08:34:49 +02:00
liftIO $ A.logIO A.Debug $ "number of placed NPCs: " ++ show (length npcposs)
2018-05-17 13:06:13 +02:00
(nws, _) <- liftIO $ yieldSystemT (worldState ud) $ do
2018-05-27 16:03:31 +02:00
createEntity $ newEntity
2018-05-30 16:20:58 +02:00
{ pos = Just (V2 10.5 10.5)
2018-05-27 16:03:31 +02:00
, vel = Just (V2 0 0)
, player = Just ()
, rot = Just SE
2018-05-30 16:20:58 +02:00
, anim = Just $ AnimState (AnimId 0 "standing" SE) 0 0
2018-02-18 05:31:34 +01:00
}
void $ mapM_ (\npcpos@(V2 nr nc) -> do
2018-05-15 19:27:40 +02:00
fact <- liftIO $ randomRIO (0.5, 1.5)
future <- liftIO $ newEmptyMVar
2018-05-18 20:05:21 +02:00
_ <- liftIO $ forkOS $ getPath (fmap floor npcpos) future nnex inter
2018-05-17 13:06:13 +02:00
createEntity $ newEntity
2018-05-27 16:03:31 +02:00
{ pos = Just (V2 (nr + 0.5) (nc + 0.5))
, vel = Just (V2 0 0)
, velFact = Just fact
, rot = Just SE
, npcState = Just (NPCStanding 0 future)
2018-05-30 16:20:58 +02:00
, anim = Just $ AnimState (AnimId 0 "standing" SE) 0 0
2018-04-14 11:18:37 +02:00
}
) npcposs
2018-02-18 03:11:41 +01:00
uu <- partSubscribe m movePlayer
putAffection ud
2018-02-25 02:03:25 +01:00
{ worldState = nws
2018-02-18 05:31:34 +01:00
, stateData = MenuData
2018-03-06 21:58:55 +01:00
{ mapMat = mat
2018-03-31 23:22:10 +02:00
, imgMat = M.fromList (nrows inter) (ncols inter) $
Prelude.map
(\a -> if a == Just ImgEmpty then Nothing else a)
(M.toList inter)
2018-02-23 13:07:24 +01:00
, initCoords = (0, 500)
2018-04-14 18:43:05 +02:00
, reachPoints = rps
}
2018-02-18 03:11:41 +01:00
, uuid = [uu]
}
2018-02-18 05:31:34 +01:00
mouseToPlayer :: V2 Int32 -> Affection UserData ()
mouseToPlayer mv2 = do
2018-02-18 03:11:41 +01:00
ud <- getAffection
2018-03-06 21:58:55 +01:00
(V2 rx ry) <- liftIO $ relativizeMouseCoords mv2
2018-02-24 23:15:16 +01:00
let dr = (ry / sin (atan (1/2)) / 2) + rx
dc = rx - (ry / sin (atan (1/2)) / 2)
2018-05-17 13:06:13 +02:00
(nws, _) <- liftIO $ yieldSystemT (worldState ud) $ do
emap allEnts $ do
2018-02-18 05:31:34 +01:00
with player
2018-05-17 13:06:13 +02:00
pure $ unchanged
2018-05-13 22:01:05 +02:00
{ vel = Set $ 4 * V2 dr dc
2018-02-18 05:31:34 +01:00
}
2018-02-18 03:11:41 +01:00
putAffection ud
2018-02-25 02:03:25 +01:00
{ worldState = nws
2018-02-18 05:31:34 +01:00
}
movePlayer :: MouseMessage -> Affection UserData ()
movePlayer (MsgMouseMotion _ _ _ [SDL.ButtonLeft] m _) = mouseToPlayer m
movePlayer (MsgMouseButton _ _ SDL.Pressed _ SDL.ButtonLeft _ m) =
mouseToPlayer m
2018-03-06 21:58:55 +01:00
movePlayer (MsgMouseButton _ _ SDL.Released _ SDL.ButtonLeft _ _) = do
2018-02-18 05:31:34 +01:00
ud <- getAffection
2018-05-17 13:06:13 +02:00
(nws, _) <- liftIO $ yieldSystemT (worldState ud) $ do
emap allEnts $ do
2018-02-18 05:31:34 +01:00
with player
2018-05-17 13:06:13 +02:00
pure $ unchanged
2018-02-18 05:31:34 +01:00
{ vel = Set $ V2 0 0
}
putAffection ud
2018-02-25 02:03:25 +01:00
{ worldState = nws
2018-02-18 03:11:41 +01:00
}
movePlayer _ = return ()
drawMap :: Affection UserData ()
drawMap = do
ud <- getAffection
2018-03-01 23:33:08 +01:00
dt <- getDelta
2018-05-30 16:20:58 +02:00
(_, (playerPos, playerRot, posanims)) <- liftIO $ yieldSystemT (worldState ud) $ do
2018-05-21 00:40:40 +02:00
(pc, dir) <- fmap head $ efor allEnts $ do
2018-04-14 11:18:37 +02:00
with player
2018-04-14 18:43:05 +02:00
with pos
2018-05-21 00:40:40 +02:00
with rot
2018-05-17 13:06:13 +02:00
pos' <- query pos
2018-05-21 00:40:40 +02:00
rot' <- query rot
pure (pos', rot')
2018-05-30 16:20:58 +02:00
posanims <- efor allEnts $ do
with anim
2018-04-14 18:43:05 +02:00
with pos
2018-05-30 16:20:58 +02:00
state <- query anim
2018-05-17 13:06:13 +02:00
pos' <- query pos
2018-05-30 16:20:58 +02:00
return (pos', state)
return (pc, dir, posanims)
2018-05-21 00:40:40 +02:00
let V2 pr pc = playerPos
2018-03-06 21:58:55 +01:00
mat = imgMat (stateData ud)
2018-03-03 11:06:38 +01:00
ctx = nano ud
2018-03-06 21:58:55 +01:00
cols = fromIntegral (ncols mat)
rows = fromIntegral (nrows mat)
2018-03-03 11:06:38 +01:00
tileWidth = 64 :: Double
tileHeight = 32 :: Double
x = realToFrac $ 640 + ((1 - pc) + (1 - pr)) * (tileWidth / 2)
y = realToFrac $ 360 + ((1 - pr) - (1 - pc)) * (tileHeight / 2)
2018-04-14 11:18:53 +02:00
liftIO $ do -- draw floor
2018-03-03 11:06:38 +01:00
beginPath ctx
2018-03-30 21:30:27 +02:00
moveTo ctx (x + realToFrac tileWidth / 2) y
2018-03-03 11:06:38 +01:00
lineTo ctx
(x + cols * (realToFrac tileWidth / 2))
2018-03-30 21:30:27 +02:00
(y - (realToFrac tileHeight / 2) * (cols - 1))
2018-03-03 11:06:38 +01:00
lineTo ctx
2018-03-30 21:30:27 +02:00
(x + (realToFrac tileWidth / 2) * (cols + rows - 1))
2018-03-03 11:06:38 +01:00
(y + (rows - cols) * (realToFrac tileHeight / 2))
lineTo ctx
2018-03-30 21:30:27 +02:00
(x + (realToFrac tileWidth / 2) * rows)
(y + (realToFrac tileHeight / 2) * (rows - 1))
2018-03-03 11:06:38 +01:00
closePath ctx
fillColor ctx (rgb 255 255 255)
fill ctx
2018-05-15 19:27:54 +02:00
mapM_ (\(i, ls) -> mapM_
(\(j, t) -> do
2018-05-30 16:20:58 +02:00
drawTile ud ctx posanims pr pc i j t
2018-05-15 19:27:54 +02:00
)
(reverse $ zip [1..] ls))
(zip [1..] (toLists mat))
2018-03-01 23:33:08 +01:00
fontSize ctx 20
fontFace ctx (assetFonts ud Map.! FontBedstead)
textAlign ctx (S.fromList [AlignCenter,AlignTop])
fillColor ctx (rgb 255 128 0)
textBox ctx 0 0 200 ("FPS: " `T.append` (T.pack $ Prelude.take 5 $ show (1/dt)))
2018-05-30 16:20:58 +02:00
drawTile
:: UserData
-> Context
-> [(V2 Double, AnimState)]
-> Double
-> Double
-> Int
-> Int
-> Maybe ImgId
-> IO ()
drawTile ud ctx posanims pr pc row col img =
when ((realToFrac x > -tileWidth && realToFrac y > -tileHeight) &&
(realToFrac x < 1280 && realToFrac (y - (74 - realToFrac tileHeight)) < 720)) $
do
let lt = Prelude.filter (\(V2 nr nc, _) ->
(any (\m -> nr < (fromIntegral (floor nr :: Int)) + m) maxrs &&
any (\m -> nc > (fromIntegral (floor nc :: Int)) + m) maxcs)
) sorted
ge = Prelude.filter (\(V2 nr nc, _) -> not
(any (\m -> nr < (fromIntegral (floor nr :: Int)) + m) maxrs &&
any (\m -> nc > (fromIntegral (floor nc :: Int)) + m) maxcs)
) sorted
save ctx
mapM_ drawAnim lt
when (isJust img) drawImage
mapM_ drawAnim ge
restore ctx
where
ai = assetImages ud
anims = assetAnimations ud
tileWidth = 64 :: Double
tileHeight = 32 :: Double
filtered = Prelude.filter
(\((V2 ar ac), _) -> floor ar == row && floor ac == col) posanims
sorted = sortOn (\(V2 sr sc, _) -> sc + sr * maxCol) filtered
maxCol = maximum (Prelude.map (\(V2 _ mc, _) -> mc) filtered)
minrs = Prelude.map (fst . matmin) mb
maxrs = Prelude.map (fst . matmax) mb
mincs = Prelude.map (snd . matmin) mb
maxcs = Prelude.map (snd . matmax) mb
x = realToFrac $ 640 + ((fromIntegral col - pc) +
(fromIntegral row - pr)) * (tileWidth / 2) :: CFloat
y = realToFrac $ 360 - (tileHeight / 2) + ((fromIntegral row - pr) -
(fromIntegral col - pc)) * (tileHeight / 2) :: CFloat
dist = distance (V2 (fromIntegral row) (fromIntegral col))
(V2 (realToFrac pr - 1) (realToFrac pc)) / 4
fact =
if (pr <= fromIntegral row + minimum maxrs &&
pc >= fromIntegral col + maximum mincs) &&
isWall (fromJust img)
then min 1 dist
else 1
mb = imgObstacle img
drawAnim (V2 nr nc, as) = do
let ax = realToFrac $ 640 + ((nc - pc) + (nr - pr)) * 32
ay = realToFrac $ 360 + ((nr - pr) - (nc - pc)) * 16
a = anims Map.! asId as
beginPath ctx
paint <- imagePattern ctx (ax - 32) (ay - 58) 64 74 0
(animSprites a !! asCurrentFrame as) 1
rect ctx (ax - 32) (ay - 58) 64 74
fillPaint ctx paint
fill ctx
drawImage = do
beginPath ctx
paint <- imagePattern
ctx x (y - (74 - realToFrac tileHeight))
(realToFrac tileWidth) 74
0
(ai Map.! fromJust img)
fact
rect ctx x (y - (74 - realToFrac tileHeight)) (realToFrac tileWidth) 74
fillPaint ctx paint
fill ctx
drawAnims
:: Context
-> Map AnimId Animation
-> SystemState Entity IO
-> [(V2 Double, AnimState)]
-> Double
-> Double
-> Int
-> Int
-> Maybe ImgId
-> IO ()
drawAnims ctx anims ws posanims pr pc r c tile =
mapM_ (\(V2 nr nc, as) -> do
let x = realToFrac $ 640 + ((nc - pc) + (nr - pr)) * 32
y = realToFrac $ 360 + ((nr - pr) - (nc - pc)) * 16
anim = anims Map.! asId as
beginPath ctx
paint <- imagePattern ctx (x - 32) (y - 58) 64 74 0
(animSprites anim !! asCurrentFrame as) 1
rect ctx (x - 32) (y - 58) 64 74
fillPaint ctx paint
fill ctx
) filtered
where
filtered = Prelude.filter
(\((V2 ar ac), _) -> floor ar == r && floor ac == c) posanims
sorted = sortOn (\(V2 sr sc, _) -> sc + sr * maxCol) filtered
maxCol = maximum (Prelude.map (\(V2 _ mc, _) -> mc) filtered)
2018-02-18 05:31:34 +01:00
updateMap :: Double -> Affection UserData ()
2018-02-24 22:24:48 +01:00
updateMap dt = do
2018-05-21 05:56:15 +02:00
let direction :: V2 Double -> Direction -> Direction
direction vel'@(V2 vr _) rot' = if sqrt (vel' `dot` vel') > 0
2018-05-26 08:34:49 +02:00
then
2018-05-21 05:56:15 +02:00
let xuu =
(acos ((vel' `dot` V2 0 1) / sqrt (vel' `dot` vel'))) / pi * 180
xu = if vr < 0 then 360 - xuu else xuu
d
2018-05-26 08:34:49 +02:00
| xu < 22.5 = NE
| xu > 22.5 && xu < 67.5 = E
| xu > 67.5 && xu < 112.5 = SE
| xu > 112.5 && xu < 157.5 = S
| xu > 157.5 && xu < 202.5 = SW
| xu > 202.5 && xu < 247.5 = W
| xu > 247.5 && xu < 292.5 = NW
| xu > 292.5 && xu < 337.5 = N
| xu > 337.5 = NE
in d
2018-05-21 00:40:40 +02:00
else rot'
2018-02-18 05:31:34 +01:00
ud <- getAffection
2018-05-17 13:06:13 +02:00
(nws, _) <- liftIO $ yieldSystemT (worldState ud) $ do
2018-05-30 16:20:58 +02:00
emap allEnts $ do
with anim
state <- query anim
let anim = assetAnimations ud Map.! asId state
ntime = asElapsedTime state + dt
nstate = if ntime > (fromIntegral $ asCurrentFrame state) *
(animDuration anim / (fromIntegral $ length $ animSprites anim))
then
let nframe = asCurrentFrame state + 1
in case animPlay anim of
APLoop ->
let (nnframe, nntime) =
if nframe >= (length $ animSprites anim)
then (0, 0)
else (nframe, ntime)
in state
{ asCurrentFrame = nnframe
, asElapsedTime = nntime
}
APOnce ->
let nnframe = if nframe >= (length $ animSprites anim)
then nframe - 1
else nframe
in state
{ asCurrentFrame = nnframe
, asElapsedTime = ntime
}
else
state
{ asElapsedTime = ntime
}
return $ unchanged
{ anim = Set nstate
}
2018-05-17 13:06:13 +02:00
emap allEnts $ do
2018-05-01 23:00:20 +02:00
without player
with vel
2018-05-15 19:27:40 +02:00
with velFact
2018-05-01 23:00:20 +02:00
with pos
2018-05-21 00:40:40 +02:00
with rot
2018-05-30 16:20:58 +02:00
with anim
2018-05-17 13:06:13 +02:00
pos'@(V2 pr pc) <- query pos
vel' <- query vel
2018-05-21 00:40:40 +02:00
rot' <- query rot
2018-05-17 13:06:13 +02:00
fact' <- query velFact
2018-05-30 16:20:58 +02:00
state <- query anim
2018-05-15 19:27:40 +02:00
let npos@(V2 nr nc) = pos' + fmap (* (dt * fact')) vel'
2018-05-01 23:00:20 +02:00
dpos = npos - pos'
2018-05-30 16:20:58 +02:00
aId = asId state
2018-05-17 13:06:13 +02:00
ent = unchanged
2018-05-01 23:00:20 +02:00
{ pos = Set $ npos
2018-05-21 00:40:40 +02:00
, rot = Set $ direction vel' rot'
2018-05-30 16:20:58 +02:00
, anim = Set state
{ asId = aId
{ aiDirection = direction vel' rot'
}
}
2018-05-01 23:00:20 +02:00
}
return ent
2018-05-17 13:06:13 +02:00
emap allEnts $ do
2018-05-01 23:00:20 +02:00
with player
2018-02-25 02:03:25 +01:00
with vel
with pos
2018-05-21 00:40:40 +02:00
with rot
2018-05-30 16:20:58 +02:00
with anim
2018-05-17 13:06:13 +02:00
pos'@(V2 pr pc) <- query pos
2018-05-21 00:40:40 +02:00
vel'@(V2 vr vc) <- query vel
rot' <- query rot
2018-05-30 16:20:58 +02:00
state <- query anim
2018-05-13 22:01:05 +02:00
let npos@(V2 nr nc) = pos' + fmap (* dt) vel'
dpos@(V2 dpr dpc) = npos - pos'
2018-05-30 16:20:58 +02:00
aId = asId state
2018-05-05 19:23:24 +02:00
len = sqrt (dpos `dot` dpos)
2018-05-13 14:05:15 +02:00
lll = (,)
<$> (
if dpr < 0
then [(floor dpr :: Int) .. 0]
else [0 .. (ceiling dpr :: Int)])
<*> (
if dpc < 0
then [(floor dpc :: Int) .. 0]
else [0 .. (ceiling dpc :: Int)])
2018-05-17 13:06:13 +02:00
ent = unchanged
2018-03-06 16:37:21 +01:00
{ pos = Set $ pos' + dpos * Prelude.foldl
2018-05-01 23:00:20 +02:00
(\acc a -> let ret = checkBoundsCollision2 pos' npos dt acc a
2018-05-14 18:12:37 +02:00
in A.log A.Verbose (show ret) ret)
2018-03-06 16:37:21 +01:00
(V2 1 1)
2018-03-10 10:07:37 +01:00
(
concatMap
(\(dr, dc) ->
2018-03-10 14:02:14 +01:00
let bs = fromMaybe [] (imgObstacle <$> (M.safeGet
2018-05-14 17:54:55 +02:00
(fromIntegral $ floor pr + dr)
(fromIntegral $ floor pc + dc)
2018-03-10 14:02:14 +01:00
(imgMat (stateData ud))))
2018-03-10 10:07:37 +01:00
in Prelude.map (\(Boundaries (minr, minc) (maxr, maxc))->
Boundaries
2018-05-13 14:05:15 +02:00
(minr + fromIntegral dr, minc + fromIntegral dc)
(maxr + fromIntegral dr, maxc + fromIntegral dc)
2018-03-10 10:07:37 +01:00
) bs
)
2018-05-14 18:12:37 +02:00
(A.log A.Verbose (show lll ++ " " ++ show len) lll)
2018-03-10 10:07:37 +01:00
)
2018-05-26 08:34:49 +02:00
, rot = Set (direction vel' rot')
2018-05-30 16:20:58 +02:00
, anim = Set state
{ asId = aId
{ aiDirection = direction vel' rot'
}
}
2018-03-05 21:11:38 +01:00
}
2018-02-25 10:30:13 +01:00
return ent
2018-04-14 18:43:05 +02:00
updateNPCs
(imgMat $ stateData ud)
(Prelude.filter
(\p -> pointType p /= RoomExit)
(reachPoints $ stateData ud)
)
dt
2018-02-18 05:31:34 +01:00
putAffection ud
2018-02-25 02:03:25 +01:00
{ worldState = nws
2018-02-18 05:31:34 +01:00
}
2018-05-01 23:00:20 +02:00
checkBoundsCollision2
:: V2 Double
-> V2 Double
-> Double
-> V2 Double
-> Boundaries Double
-> V2 Double
checkBoundsCollision2
pre@(V2 pr pc) next@(V2 nr nc) dt acc (Boundaries (minr, minc) (maxr, maxc))
2018-05-14 18:12:37 +02:00
| colltr < dt && colltc < dt = V2 0 0
| colltr < dt && incol = V2 0 1 * acc
| colltc < dt && inrow = V2 1 0 * acc
| otherwise = acc
2018-05-01 23:00:20 +02:00
where
vel@(V2 vr vc) = fmap (/ dt) (next - pre)
colltr
2018-05-14 18:12:37 +02:00
| vr > 0 && prr <= maxr =
(((fromIntegral (floor pr :: Int)) + minr - 0.15) - pr) / vr
| vr < 0 && prr >= minr =
(((fromIntegral (floor pr :: Int)) + maxr + 0.15) - pr) / vr
2018-05-14 17:54:55 +02:00
| otherwise = dt
2018-05-01 23:00:20 +02:00
colltc
2018-05-14 18:12:37 +02:00
| vc > 0 && prc <= maxc =
(((fromIntegral (floor pc :: Int)) + minc - 0.15) - pc) / vc
| vc < 0 && prc >= minc =
(((fromIntegral (floor pc :: Int)) + maxc + 0.15) - pc) / vc
2018-05-14 17:54:55 +02:00
| otherwise = dt
2018-05-13 14:05:15 +02:00
inrow = pr > minr && pr < maxr
incol = pc > minc && pc < maxc
2018-05-14 18:00:18 +02:00
prr = pr - (fromIntegral $ floor pr)
prc = pc - (fromIntegral $ floor pc)