Improve visuals

This commit is contained in:
Sam Tay 2017-06-18 00:25:24 -04:00
parent ddbf411d49
commit 8361b3464a
3 changed files with 53 additions and 25 deletions

View file

@ -19,7 +19,7 @@ import Data.Monoid (First(..))
-- TODO -- TODO
-- 1. USE linear V2 instead of tuples.. dummy -- 1. USE linear V2 instead of tuples.. dummy
-- 3. possibly add 'user' to game state to draw name entry from UI.Game -- 2. leaderboard saved to txt file (requires adding viewport for name entry)
-- Types and instances -- Types and instances

View file

@ -27,6 +27,8 @@ data Tick = Tick
-- | Named resources -- | Named resources
type Name = () type Name = ()
data CellLocation = InGrid | InNextShape
-- App definition and execution -- App definition and execution
app :: App Game Tick Name app :: App Game Tick Name
@ -53,7 +55,7 @@ levelToDelay n = floor $ 400000 * 0.85 ^ (2 * n)
-- Handling events -- Handling events
handleEvent :: Game -> BrickEvent Name Tick -> EventM Name (Next Game) handleEvent :: Game -> BrickEvent Name Tick -> EventM Name (Next Game)
handleEvent g (AppEvent Tick) = liftIO (timeStep g) >>= continue handleEvent g (AppEvent Tick) = handleTick g
handleEvent g (VtyEvent (V.EvKey V.KRight [])) = continue $ shift Right g handleEvent g (VtyEvent (V.EvKey V.KRight [])) = continue $ shift Right g
handleEvent g (VtyEvent (V.EvKey V.KLeft [])) = continue $ shift Left g handleEvent g (VtyEvent (V.EvKey V.KLeft [])) = continue $ shift Left g
handleEvent g (VtyEvent (V.EvKey V.KDown [])) = continue $ shift Down g handleEvent g (VtyEvent (V.EvKey V.KDown [])) = continue $ shift Down g
@ -63,38 +65,44 @@ handleEvent g (VtyEvent (V.EvKey (V.KChar 'q') [])) = halt g
handleEvent g (VtyEvent (V.EvKey V.KEsc [])) = halt g handleEvent g (VtyEvent (V.EvKey V.KEsc [])) = halt g
handleEvent g _ = continue g handleEvent g _ = continue g
-- | Handles time steps, does nothing if game is over
handleTick :: Game -> EventM Name (Next Game)
handleTick g = if isGameOver g
then continue g
else liftIO (timeStep g) >>= continue
-- Drawing -- Drawing
drawUI :: Game -> [Widget Name] drawUI :: Game -> [Widget Name]
drawUI g = drawUI g =
[ hBox [ C.vCenter $ vLimit 22 $ hBox [ padLeft Max $ drawStats g
[ drawScore (g ^. score) , drawGrid g
, drawGrid g , padRight Max $ drawNextShape (g ^. nextShape)
, drawNextShape (g ^. nextShape) ]
]
] ]
drawGrid :: Game -> Widget Name drawGrid :: Game -> Widget Name
drawGrid g = withBorderStyle BS.unicodeBold drawGrid g = hLimit 22
$ withBorderStyle BS.unicodeBold
$ B.borderWithLabel (str "Tetris") $ B.borderWithLabel (str "Tetris")
$ C.center
-- $ (str $ show $ mconcat [brdMap, blkMap, emptyMap])
$ vBox rows $ vBox rows
where where
rows = [foldr (<+>) emptyWidget $ M.filterWithKey (inRow r) gmap rows = [foldr (<+>) emptyWidget $ M.filterWithKey (inRow r) gmap
| r <- [boardHeight,boardHeight-1..1] | r <- [boardHeight,boardHeight-1..1]
] ]
inRow r (_,y) _ = r == y inRow r (_,y) _ = r == y
gmap = drawMCell <$> mconcat [brdMap, blkMap, emptyMap] gmap = drawMCell InGrid <$> mconcat [brdMap, blkMap, emptyMap]
brdMap = Just <$> g ^. board brdMap = Just <$> g ^. board
blkMap = M.fromList [(c, Just $ g ^. block ^. shape) | c <- g ^. block ^. to coords] blkMap = M.fromList [(c, Just $ g ^. block ^. shape) | c <- g ^. block ^. to coords]
emptyMap :: Map Coord (Maybe a) emptyMap :: Map Coord (Maybe a)
emptyMap = M.fromList [((x,y), Nothing) | x <- [1..boardWidth], y <- [1..boardHeight]] emptyMap = M.fromList [((x,y), Nothing) | x <- [1..boardWidth], y <- [1..boardHeight]]
drawMCell :: Maybe Tetrimino -> Widget Name drawMCell :: CellLocation -> Maybe Tetrimino -> Widget Name
drawMCell Nothing = withAttr emptyAttr cw drawMCell InGrid Nothing = withAttr emptyAttr cw
drawMCell (Just t) = drawCell t drawMCell InNextShape Nothing = withAttr emptyAttr ecw
drawMCell _ (Just t) = drawCell t
drawCell :: Tetrimino -> Widget Name drawCell :: Tetrimino -> Widget Name
drawCell t = withAttr (tToAttr t) cw drawCell t = withAttr (tToAttr t) cw
@ -109,17 +117,36 @@ drawCell t = withAttr (tToAttr t) cw
cw :: Widget Name cw :: Widget Name
cw = str " ." cw = str " ."
drawScore :: Int -> Widget Name ecw :: Widget Name
drawScore n = vBox [ C.vCenter $ str "Score" ecw = str " "
, C.center $ str $ show n
] drawStats :: Game -> Widget Name
drawStats g = padRight (Pad 2)
$ hLimit 22
$ withBorderStyle BS.unicodeBold
$ B.borderWithLabel (str "Stats")
$ vBox [ drawStat "Score" $ g ^. score
, drawStat "Level" $ g ^. level
, drawLeaderBoard g
]
drawStat :: String -> Int -> Widget Name
drawStat s n = padLeftRight 1 $ padTop (Pad 1)
$ str s <+> (padLeft Max $ str $ show n)
drawLeaderBoard :: Game -> Widget Name
drawLeaderBoard g = emptyWidget
drawNextShape :: Tetrimino -> Widget Name drawNextShape :: Tetrimino -> Widget Name
-- TODO try vbox and see if different than foldr drawNextShape t =
drawNextShape t = padAll 1 padLeft (Pad 2)
$ withBorderStyle BS.unicodeBold
$ B.borderWithLabel (str "Next Piece")
$ padTopBottom 1 $ padLeftRight 2
$ vLimit 4
$ vBox $ mkRow <$> [0,-1] $ vBox $ mkRow <$> [0,-1]
where where
mkRow y = hBox $ drawMCell . cellAt . (,y) <$> [-2..1] mkRow y = hBox $ drawMCell InNextShape . cellAt . (,y) <$> [-2..1]
cellAt (x,y) = if (x,y) `elem` cs then Just t else Nothing cellAt (x,y) = if (x,y) `elem` cs then Just t else Nothing
blk = Block t (0,0) (relCells t) blk = Block t (0,0) (relCells t)
cs = blk ^. to coords cs = blk ^. to coords

View file

@ -21,13 +21,14 @@ app = App { appDraw = const [ui]
} }
ui :: Widget () ui :: Widget ()
ui = ui = padLeft (Pad 19) $ padRight (Pad 21)
C.center $ C.center
$ hLimit 20 $ vLimit 30 $ vLimit 22
$ hLimit 22
$ withBorderStyle BS.unicodeBold $ withBorderStyle BS.unicodeBold
$ B.borderWithLabel (str "Tetris") $ B.borderWithLabel (str "Tetris")
$ C.center $ C.center
$ str "Choose Level (0-9)" $ str " Choose Level (0-9)"
theMap :: AttrMap theMap :: AttrMap
theMap = attrMap V.defAttr [] theMap = attrMap V.defAttr []