2018-03-02 01:10:35 +00:00
|
|
|
module Util where
|
|
|
|
|
|
|
|
import Affection as A
|
|
|
|
|
|
|
|
import Data.Matrix as M
|
2018-04-14 16:43:05 +00:00
|
|
|
import qualified Data.HashSet as HS
|
2018-06-08 23:17:03 +00:00
|
|
|
import qualified Data.Set as S
|
|
|
|
import qualified Data.Map as Map
|
|
|
|
import Data.ByteString.Lazy (toStrict)
|
2018-04-14 16:43:05 +00:00
|
|
|
import Data.Graph.AStar
|
2018-06-08 23:17:03 +00:00
|
|
|
import Data.Maybe
|
2018-07-19 02:51:07 +00:00
|
|
|
import qualified Data.Text as T
|
2018-03-02 01:10:35 +00:00
|
|
|
|
2018-03-03 10:06:38 +00:00
|
|
|
import qualified SDL
|
|
|
|
import qualified Graphics.Rendering.OpenGL as GL hiding (get)
|
|
|
|
|
2018-06-08 23:17:03 +00:00
|
|
|
import System.Exit (exitFailure)
|
|
|
|
|
2018-07-06 15:17:57 +00:00
|
|
|
import Linear hiding (E(..))
|
2018-03-03 10:06:38 +00:00
|
|
|
|
2018-06-08 23:17:03 +00:00
|
|
|
import NanoVG hiding (V2(..))
|
|
|
|
import NanoVG.Internal.Image (ImageFlags(..))
|
|
|
|
|
|
|
|
import Codec.Picture as CP
|
|
|
|
import Codec.Picture.Extra
|
|
|
|
|
2018-03-02 01:10:35 +00:00
|
|
|
-- internal imports
|
|
|
|
|
|
|
|
import Types
|
|
|
|
|
|
|
|
convertTileToImg :: Matrix TileState -> Matrix (Maybe ImgId)
|
|
|
|
convertTileToImg mat = fromLists conversion
|
|
|
|
where
|
|
|
|
conversion =
|
2018-09-02 08:44:33 +00:00
|
|
|
zipWith
|
|
|
|
(\i ls -> zipWith (convertTile i) [1..] ls)
|
|
|
|
[1..]
|
|
|
|
(toLists mat)
|
2018-03-02 01:10:35 +00:00
|
|
|
convertTile irow icol tile =
|
|
|
|
case tile of
|
|
|
|
Wall -> Just (case neighWalls irow icol mat of
|
|
|
|
4 ->
|
|
|
|
ImgWallCross
|
|
|
|
3
|
|
|
|
| M.safeGet (irow + 1) icol mat /= Just Wall &&
|
|
|
|
M.safeGet (irow + 1) icol mat /= Just Door ->
|
|
|
|
ImgWallTNW
|
|
|
|
| M.safeGet irow (icol + 1) mat /= Just Wall &&
|
|
|
|
M.safeGet irow (icol + 1) mat /= Just Door ->
|
|
|
|
ImgWallTSW
|
|
|
|
| M.safeGet (irow - 1) icol mat /= Just Wall &&
|
|
|
|
M.safeGet (irow - 1) icol mat /= Just Door ->
|
|
|
|
ImgWallTSE
|
|
|
|
| otherwise ->
|
|
|
|
ImgWallTNE
|
|
|
|
2
|
|
|
|
| (M.safeGet (irow + 1) icol mat == Just Wall ||
|
|
|
|
M.safeGet (irow + 1) icol mat == Just Door) &&
|
|
|
|
(M.safeGet (irow - 1) icol mat == Just Wall ||
|
|
|
|
M.safeGet (irow - 1) icol mat == Just Door) ->
|
|
|
|
ImgWallDesc
|
|
|
|
| (M.safeGet irow (icol + 1) mat == Just Wall ||
|
|
|
|
M.safeGet irow (icol + 1) mat == Just Door) &&
|
|
|
|
(M.safeGet irow (icol - 1) mat == Just Wall ||
|
|
|
|
M.safeGet irow (icol - 1) mat == Just Door) ->
|
|
|
|
ImgWallAsc
|
|
|
|
| (M.safeGet (irow - 1) icol mat == Just Wall ||
|
|
|
|
M.safeGet (irow - 1) icol mat == Just Door) &&
|
|
|
|
(M.safeGet irow (icol - 1) mat == Just Wall ||
|
|
|
|
M.safeGet irow (icol - 1) mat == Just Door) ->
|
|
|
|
ImgWallCornerW
|
|
|
|
| (M.safeGet irow (icol - 1) mat == Just Wall ||
|
|
|
|
M.safeGet irow (icol - 1) mat == Just Door) &&
|
|
|
|
(M.safeGet (irow + 1) icol mat == Just Wall ||
|
|
|
|
M.safeGet (irow + 1) icol mat == Just Door) ->
|
|
|
|
ImgWallCornerS
|
|
|
|
| (M.safeGet (irow + 1) icol mat == Just Wall ||
|
|
|
|
M.safeGet (irow + 1) icol mat == Just Door) &&
|
|
|
|
(M.safeGet irow (icol + 1) mat == Just Wall ||
|
|
|
|
M.safeGet irow (icol + 1) mat == Just Door) ->
|
|
|
|
ImgWallCornerE
|
|
|
|
| otherwise ->
|
|
|
|
ImgWallCornerN
|
|
|
|
1
|
|
|
|
| M.safeGet (irow - 1) icol mat == Just Wall ||
|
|
|
|
M.safeGet (irow - 1) icol mat == Just Door ->
|
|
|
|
ImgWallDesc
|
|
|
|
| M.safeGet (irow + 1) icol mat == Just Wall ||
|
|
|
|
M.safeGet (irow + 1) icol mat == Just Door ->
|
|
|
|
ImgWallDesc
|
|
|
|
| M.safeGet irow (icol + 1) mat == Just Wall ||
|
|
|
|
M.safeGet irow (icol + 1) mat == Just Door ->
|
|
|
|
ImgWallAsc
|
|
|
|
| otherwise ->
|
|
|
|
ImgWallAsc
|
|
|
|
0 ->
|
|
|
|
ImgWallCross
|
|
|
|
_ ->
|
|
|
|
error "unexpected number if neighbouring walls"
|
|
|
|
)
|
2018-04-01 17:40:54 +00:00
|
|
|
Offi
|
|
|
|
| any
|
|
|
|
(\(rr, cc) -> M.safeGet (irow + rr) (icol + cc) mat == Just Door)
|
2018-04-02 14:29:35 +00:00
|
|
|
[(1, 0), (-1, 0), (0, 1), (0, -1)] ->
|
2018-07-21 18:37:01 +00:00
|
|
|
Just ImgEmpty
|
2018-04-01 17:40:54 +00:00
|
|
|
| otherwise ->
|
|
|
|
Nothing
|
2018-03-02 01:10:35 +00:00
|
|
|
_ ->
|
|
|
|
Nothing
|
|
|
|
|
|
|
|
neighWalls :: Int -> Int -> Matrix TileState -> Int
|
|
|
|
neighWalls row col mat =
|
|
|
|
Prelude.foldl (\acc (ir, ic) ->
|
|
|
|
if M.safeGet (row + ir) (col + ic) mat == Just Wall ||
|
|
|
|
M.safeGet (row + ir) (col + ic) mat == Just Door
|
|
|
|
then acc + 1
|
|
|
|
else acc
|
|
|
|
)
|
|
|
|
0
|
|
|
|
[ (0, -1)
|
|
|
|
, (-1, 0)
|
|
|
|
, (0, 1)
|
|
|
|
, (1, 0)
|
|
|
|
]
|
2018-03-03 10:06:38 +00:00
|
|
|
|
|
|
|
relativizeMouseCoords :: V2 Int32 -> IO (V2 Double)
|
|
|
|
relativizeMouseCoords (V2 ix iy) = do
|
|
|
|
(GL.Position vx vy, GL.Size vw vh) <- SDL.get GL.viewport
|
|
|
|
let rx = ix - vx
|
|
|
|
ry = iy - vy
|
|
|
|
hx = fromIntegral vw / 2
|
|
|
|
hy = fromIntegral vh / 2
|
|
|
|
dx = fromIntegral rx - hx
|
|
|
|
dy = fromIntegral ry - hy
|
|
|
|
return $ V2 (dx / hx) (dy / hy)
|
2018-04-14 11:34:28 +00:00
|
|
|
|
|
|
|
inBounds :: V2 Int -> Boundaries Int -> Bool
|
|
|
|
inBounds (V2 r c) (Boundaries (minr, minc) (maxr, maxc)) =
|
|
|
|
(r >= minr && r <= maxr) && (c >= minc && c <= maxc)
|
2018-04-14 16:43:05 +00:00
|
|
|
|
2018-07-21 19:10:32 +00:00
|
|
|
astarAppl
|
|
|
|
:: Matrix (Maybe ImgId)
|
|
|
|
-> [(V2 Double, Boundaries Double)]
|
|
|
|
-> V2 Int
|
|
|
|
-> V2 Int
|
|
|
|
-> Maybe [V2 Int]
|
|
|
|
astarAppl imgmat animBounds target = aStar
|
|
|
|
(naviGraph imgmat animBounds)
|
2018-07-03 14:19:27 +00:00
|
|
|
(\a b -> distance
|
|
|
|
(fmap (fromIntegral :: Int -> Double) a)
|
|
|
|
(fmap (fromIntegral :: Int -> Double) b)
|
|
|
|
)
|
2018-09-02 08:44:33 +00:00
|
|
|
(distance (fmap fromIntegral target) . fmap fromIntegral)
|
2018-04-14 16:43:05 +00:00
|
|
|
(== target)
|
|
|
|
|
2018-07-21 19:10:32 +00:00
|
|
|
naviGraph
|
|
|
|
:: Matrix (Maybe ImgId)
|
|
|
|
-> [(V2 Double, Boundaries Double)]
|
|
|
|
-> V2 Int
|
|
|
|
-> HS.HashSet (V2 Int)
|
|
|
|
naviGraph imgmat animBounds (V2 r c) =
|
2018-04-26 13:25:38 +00:00
|
|
|
let list1 =
|
2018-04-25 12:44:28 +00:00
|
|
|
foldl
|
2018-07-03 14:19:27 +00:00
|
|
|
(\acc (rr, cc) ->
|
2018-05-01 21:52:40 +00:00
|
|
|
if null
|
2018-09-02 08:44:33 +00:00
|
|
|
(maybe [] collisionObstacle
|
2018-09-16 21:55:22 +00:00
|
|
|
(M.safeGet (r + rr) (c + cc) imgmat) ++
|
2018-09-02 08:44:33 +00:00
|
|
|
map snd (filter
|
2018-07-21 19:10:32 +00:00
|
|
|
(\(V2 br bc, _) -> floor br == r + rr && floor bc == c + cc)
|
|
|
|
animBounds))
|
2018-07-03 14:19:27 +00:00
|
|
|
then V2 (r + rr) (c + cc): acc
|
2018-04-25 12:44:28 +00:00
|
|
|
else acc
|
|
|
|
)
|
|
|
|
[]
|
|
|
|
[(0, 1), (0, -1), (1, 0), (-1, 0)]
|
2018-04-26 13:25:38 +00:00
|
|
|
list2 =
|
2018-04-25 12:44:28 +00:00
|
|
|
foldl
|
2018-07-03 14:19:27 +00:00
|
|
|
(\acc (rr, cc) ->
|
2018-07-22 20:30:17 +00:00
|
|
|
if null
|
2018-09-16 21:55:22 +00:00
|
|
|
(maybe [] (collisionObstacle <$>)
|
|
|
|
([M.safeGet (r + rr) (c + cc) imgmat] ++
|
|
|
|
map snd (filter (\(V2 br bc, _) -> floor br == r + rr && floor bc == c + cc)
|
|
|
|
animBounds)))
|
2018-05-14 17:34:07 +00:00
|
|
|
&& all null
|
2018-04-25 12:44:28 +00:00
|
|
|
(map
|
2018-07-22 20:30:17 +00:00
|
|
|
(\(oor, ooc) -> (maybe [] collisionObstacle
|
2018-09-16 21:55:22 +00:00
|
|
|
(M.safeGet (r + oor) (c + ooc) imgmat)) ++
|
2018-09-02 08:44:33 +00:00
|
|
|
map snd (filter
|
2018-07-22 20:30:17 +00:00
|
|
|
(\(V2 br bc, _) -> floor br == r + oor && floor bc == c + ooc)
|
|
|
|
animBounds))
|
2018-07-03 14:19:27 +00:00
|
|
|
[(0, cc), (rr, 0)])
|
|
|
|
then V2 (r + rr) (c + cc): acc
|
2018-04-25 12:44:28 +00:00
|
|
|
else acc
|
|
|
|
)
|
|
|
|
[]
|
|
|
|
[(-1, -1), (-1, 1), (1, -1), (1, 1)]
|
2018-04-26 13:25:38 +00:00
|
|
|
in HS.fromList (list1 ++ list2)
|
2018-06-08 23:17:03 +00:00
|
|
|
|
2018-07-19 02:51:07 +00:00
|
|
|
drawLoadScreen :: UserData -> (Float, T.Text) -> IO ()
|
|
|
|
drawLoadScreen ud (progress, msg) = do
|
2018-06-08 23:17:03 +00:00
|
|
|
let ctx = nano ud
|
2018-06-15 13:39:08 +00:00
|
|
|
save ctx
|
2018-06-08 23:17:03 +00:00
|
|
|
fillColor ctx (rgb 255 128 0)
|
2018-06-10 02:21:00 +00:00
|
|
|
fontSize ctx 100
|
|
|
|
fontFace ctx (assetFonts ud Map.! FontBedstead)
|
|
|
|
textAlign ctx (S.fromList [AlignCenter, AlignTop])
|
|
|
|
textBox ctx 0 300 1280 "Loading"
|
2018-06-15 13:39:08 +00:00
|
|
|
beginPath ctx
|
2018-06-08 23:17:03 +00:00
|
|
|
rect ctx
|
|
|
|
(640 - 640 * realToFrac progress) 450 (1280 * realToFrac progress) 20
|
2018-06-15 13:39:08 +00:00
|
|
|
closePath ctx
|
2018-06-08 23:17:03 +00:00
|
|
|
fill ctx
|
2018-07-19 02:51:07 +00:00
|
|
|
fontSize ctx 25
|
|
|
|
textBox ctx 0 500 1280 msg
|
2018-06-15 13:39:08 +00:00
|
|
|
restore ctx
|
2018-06-08 23:17:03 +00:00
|
|
|
|
|
|
|
loadAnimationSprites
|
|
|
|
:: FilePath -- Path to Sprite map
|
|
|
|
-> Context -- NanoVG context
|
|
|
|
-> [(AnimId, AnimationConfig)]
|
|
|
|
-> IO [(AnimId, Animation)]
|
|
|
|
loadAnimationSprites fp nvg idconfs = do
|
|
|
|
eimg <- readImage fp
|
|
|
|
case eimg of
|
|
|
|
Left err -> do
|
|
|
|
logIO Error err
|
|
|
|
exitFailure
|
|
|
|
Right dimg -> do
|
|
|
|
let img = convertRGBA8 dimg
|
|
|
|
mapM
|
2018-09-02 08:44:33 +00:00
|
|
|
(\(i, AnimationConfig (xoffs, yoffs) (w, h) (sx, sy) count dur pb) -> do
|
2018-06-08 23:17:03 +00:00
|
|
|
let crs = map
|
2018-07-21 04:43:26 +00:00
|
|
|
(\iid -> crop (xoffs + (iid * sx)) (yoffs + (iid * sy)) w h img)
|
2018-06-08 23:17:03 +00:00
|
|
|
[0 .. (count - 1)]
|
|
|
|
mresimgs <- mapM
|
|
|
|
(\cr ->
|
2018-06-16 17:34:17 +00:00
|
|
|
createImageMem nvg
|
2018-07-03 14:19:27 +00:00
|
|
|
ImagePremultiplied (toStrict $ encodePng cr))
|
2018-06-08 23:17:03 +00:00
|
|
|
crs
|
|
|
|
imgs <- if any isNothing mresimgs
|
|
|
|
then do
|
2018-07-03 14:19:27 +00:00
|
|
|
logIO Error ("failed to load: " ++ fp ++ " " ++ show i)
|
2018-06-08 23:17:03 +00:00
|
|
|
exitFailure
|
|
|
|
else
|
|
|
|
return $ catMaybes mresimgs
|
2018-09-02 08:44:33 +00:00
|
|
|
return
|
2018-07-03 14:19:27 +00:00
|
|
|
( i
|
2018-06-08 23:17:03 +00:00
|
|
|
, Animation dur imgs pb
|
|
|
|
)
|
|
|
|
) idconfs
|
2018-07-06 15:17:57 +00:00
|
|
|
|
|
|
|
direction :: V2 Double -> Maybe Direction
|
|
|
|
direction vel'@(V2 vr _) = if sqrt (vel' `dot` vel') > 0
|
|
|
|
then
|
|
|
|
let xuu =
|
|
|
|
acos ((vel' `dot` V2 0 1) /
|
|
|
|
sqrt (vel' `dot` vel')) / pi * 180
|
|
|
|
xu = if vr < 0 then 360 - xuu else xuu
|
|
|
|
d
|
|
|
|
| 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
|
|
|
|
| otherwise = NE
|
|
|
|
in Just d
|
|
|
|
else Nothing
|