Finish pretty much all game mechanics
This commit is contained in:
parent
0a20f0a5ff
commit
7bea4fc3be
1 changed files with 54 additions and 10 deletions
|
@ -6,7 +6,7 @@ module Tetris where
|
||||||
|
|
||||||
import Data.Map (Map)
|
import Data.Map (Map)
|
||||||
import qualified Data.Map as M
|
import qualified Data.Map as M
|
||||||
import Data.Sequence (ViewL(..), (<|), (><))
|
import Data.Sequence (ViewL(..), ViewR(..), (<|), (|>), (><))
|
||||||
import qualified Data.Sequence as Seq
|
import qualified Data.Sequence as Seq
|
||||||
import Lens.Micro
|
import Lens.Micro
|
||||||
import Lens.Micro.TH
|
import Lens.Micro.TH
|
||||||
|
@ -49,6 +49,7 @@ data Game = Game
|
||||||
, _currBlock :: Block
|
, _currBlock :: Block
|
||||||
, _nextShape :: Tetrimino
|
, _nextShape :: Tetrimino
|
||||||
, _nextShapeBag :: Seq.Seq Tetrimino
|
, _nextShapeBag :: Seq.Seq Tetrimino
|
||||||
|
, _rowClears :: Seq.Seq Int
|
||||||
, _score :: Int
|
, _score :: Int
|
||||||
, _board :: Board
|
, _board :: Board
|
||||||
} deriving (Eq, Show)
|
} deriving (Eq, Show)
|
||||||
|
@ -131,7 +132,7 @@ bagFourTetriminoEach = go . Seq.viewl
|
||||||
-- | Initialize a game with a given level
|
-- | Initialize a game with a given level
|
||||||
initGame :: Int -> IO Game
|
initGame :: Int -> IO Game
|
||||||
initGame lvl = do
|
initGame lvl = do
|
||||||
(s1, bag1) <- bagFourTetriminoEach Seq.empty
|
(s1, bag1) <- bagFourTetriminoEach mempty
|
||||||
(s2, bag2) <- bagFourTetriminoEach bag1
|
(s2, bag2) <- bagFourTetriminoEach bag1
|
||||||
return $
|
return $
|
||||||
Game { _level = lvl
|
Game { _level = lvl
|
||||||
|
@ -139,20 +140,55 @@ initGame lvl = do
|
||||||
, _nextShape = s2
|
, _nextShape = s2
|
||||||
, _nextShapeBag = bag2
|
, _nextShapeBag = bag2
|
||||||
, _score = 0
|
, _score = 0
|
||||||
|
, _rowClears = mempty
|
||||||
, _board = mempty }
|
, _board = mempty }
|
||||||
|
|
||||||
|
isGameOver :: Game -> Bool
|
||||||
|
isGameOver g = currBlockStopped g && g ^. currBlock ^. origin == startOrigin
|
||||||
|
|
||||||
|
timeStep :: Game -> IO Game
|
||||||
|
timeStep g = if (currBlockStopped g)
|
||||||
|
then return . coreUpdater $ g
|
||||||
|
else stopUpdater . coreUpdater $ g
|
||||||
|
where
|
||||||
|
coreUpdater = gravitate
|
||||||
|
stopUpdater = nextBlock . updateScore . clearFullRows . freezeBlock
|
||||||
|
|
||||||
-- TODO check if mapKeysMonotonic works
|
-- TODO check if mapKeysMonotonic works
|
||||||
clearFullRows :: Game -> Game
|
clearFullRows :: Game -> Game
|
||||||
clearFullRows g = g & board %~ clearBoard
|
clearFullRows g = g & board %~ clearBoard
|
||||||
where clearBoard = M.mapKeys shiftRowsAbove . M.filterWithKey isInFullRow
|
& rowClears %~ (|> rowCount)
|
||||||
|
where
|
||||||
|
clearBoard = M.mapKeys shiftCoordAbove . M.filterWithKey isInFullRow
|
||||||
isInFullRow (_,y) _ = y `elem` fullRowIndices
|
isInFullRow (_,y) _ = y `elem` fullRowIndices
|
||||||
|
rowCount = length fullRowIndices
|
||||||
fullRowIndices = filter isFullRow [1..boardHeight]
|
fullRowIndices = filter isFullRow [1..boardHeight]
|
||||||
isFullRow r = boardWidth == (length . M.filterWithKey (inRow r) $ g ^. board)
|
isFullRow r = boardWidth == (length . M.filterWithKey (inRow r) $ g ^. board)
|
||||||
inRow r (_, y) _ = r == y
|
inRow r (_, y) _ = r == y
|
||||||
shiftRowsAbove (x,y) =
|
shiftCoordAbove (x,y) =
|
||||||
let offset = length . filter (< y) $ fullRowIndices
|
let offset = length . filter (< y) $ fullRowIndices
|
||||||
in (x, y - offset)
|
in (x, y - offset)
|
||||||
|
|
||||||
|
-- | This updates game points with respect to the current
|
||||||
|
-- _rowClears value (thus should only be used ONCE per step)
|
||||||
|
--
|
||||||
|
-- Note I'm keeping rowClears as a sequence in case I want to award
|
||||||
|
-- more points for back to back clears, right now the scoring is more simple
|
||||||
|
updateScore :: Game -> Game
|
||||||
|
updateScore g = g & score %~ (+ newPoints)
|
||||||
|
where
|
||||||
|
newPoints = (g ^. level) * (g ^. rowClears ^. to latestOrZero ^. to points)
|
||||||
|
|
||||||
|
-- | Points awarded from number of rows cleared
|
||||||
|
points :: Int -- ^ rows cleared
|
||||||
|
-> Int -- ^ resulting points
|
||||||
|
points 0 = 0
|
||||||
|
points 1 = 40
|
||||||
|
points 2 = 100
|
||||||
|
points 3 = 300
|
||||||
|
points n = 800
|
||||||
|
|
||||||
|
|
||||||
-- | Handle counterclockwise block rotation (if possible)
|
-- | Handle counterclockwise block rotation (if possible)
|
||||||
-- Allows wallkicks: http://tetris.wikia.com/wiki/TGM_rotation
|
-- Allows wallkicks: http://tetris.wikia.com/wiki/TGM_rotation
|
||||||
rotate :: Game -> Game
|
rotate :: Game -> Game
|
||||||
|
@ -165,6 +201,9 @@ rotate g = g & currBlock .~ nextB
|
||||||
blk = g ^. currBlock
|
blk = g ^. currBlock
|
||||||
brd = g ^. board
|
brd = g ^. board
|
||||||
|
|
||||||
|
currBlockStopped :: Game -> Bool
|
||||||
|
currBlockStopped g = isStopped (g ^. board) (g ^. currBlock)
|
||||||
|
|
||||||
-- | Check if a block on a board is stopped from further gravitation
|
-- | Check if a block on a board is stopped from further gravitation
|
||||||
isStopped :: Board -> Block -> Bool
|
isStopped :: Board -> Block -> Bool
|
||||||
isStopped b = any (`M.member` b) . map (translate Down) . blockCoords
|
isStopped b = any (`M.member` b) . map (translate Down) . blockCoords
|
||||||
|
@ -219,3 +258,8 @@ shuffle xs
|
||||||
let (left, right) = Seq.splitAt randomPosition xs
|
let (left, right) = Seq.splitAt randomPosition xs
|
||||||
(y :< ys) = Seq.viewl right
|
(y :< ys) = Seq.viewl right
|
||||||
fmap (y <|) (shuffle $ left >< ys)
|
fmap (y <|) (shuffle $ left >< ys)
|
||||||
|
|
||||||
|
latestOrZero :: Seq.Seq Int -> Int
|
||||||
|
latestOrZero = go . Seq.viewr
|
||||||
|
where go EmptyR = 0
|
||||||
|
go (_ :> n) = n
|
||||||
|
|
Loading…
Add table
Reference in a new issue