Use Linear.V2 instead of tuples
This commit is contained in:
parent
23e513f003
commit
2c150c7b27
5 changed files with 48 additions and 47 deletions
|
@ -57,5 +57,4 @@ tetris
|
||||||
|
|
||||||
1. Leaderboard saved to txt file (requires adding brick viewport for name entry)
|
1. Leaderboard saved to txt file (requires adding brick viewport for name entry)
|
||||||
and probably wrapping game in a ui state type
|
and probably wrapping game in a ui state type
|
||||||
2. Use linear V2 instead of tuples.. dummy
|
|
||||||
3. Consider refactoring (Game -> a) types with State or Reader abstraction
|
3. Consider refactoring (Game -> a) types with State or Reader abstraction
|
||||||
|
|
|
@ -1,6 +1,4 @@
|
||||||
{-# LANGUAGE TemplateHaskell #-}
|
{-# LANGUAGE TemplateHaskell #-}
|
||||||
{-# LANGUAGE RecordWildCards #-}
|
|
||||||
{-# LANGUAGE TypeSynonymInstances #-}
|
|
||||||
{-# LANGUAGE FlexibleInstances #-}
|
{-# LANGUAGE FlexibleInstances #-}
|
||||||
module Tetris where
|
module Tetris where
|
||||||
|
|
||||||
|
@ -10,6 +8,8 @@ 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
|
||||||
|
import Linear.V2 (V2(..), _x, _y)
|
||||||
|
import qualified Linear.V2 as LV
|
||||||
import System.Random (getStdRandom, randomR)
|
import System.Random (getStdRandom, randomR)
|
||||||
|
|
||||||
import Prelude hiding (Left, Right)
|
import Prelude hiding (Left, Right)
|
||||||
|
@ -24,7 +24,7 @@ data Tetrimino = I | O | T | S | Z | J | L
|
||||||
deriving (Eq, Show, Enum)
|
deriving (Eq, Show, Enum)
|
||||||
|
|
||||||
-- | Coordinates
|
-- | Coordinates
|
||||||
type Coord = (Int, Int)
|
type Coord = V2 Int
|
||||||
|
|
||||||
-- | Tetris shape in location context
|
-- | Tetris shape in location context
|
||||||
data Block = Block
|
data Block = Block
|
||||||
|
@ -66,9 +66,9 @@ class Translatable s where
|
||||||
translateBy :: Int -> Direction -> s -> s
|
translateBy :: Int -> Direction -> s -> s
|
||||||
|
|
||||||
instance Translatable Coord where
|
instance Translatable Coord where
|
||||||
translateBy n Left (x, y) = (x-n, y)
|
translateBy n Left (V2 x y) = V2 (x-n) y
|
||||||
translateBy n Right (x, y) = (x+n, y)
|
translateBy n Right (V2 x y) = V2 (x+n) y
|
||||||
translateBy n Down (x,y) = (x, y-n)
|
translateBy n Down (V2 x y) = V2 x (y-n)
|
||||||
|
|
||||||
instance Translatable Block where
|
instance Translatable Block where
|
||||||
translateBy n d b =
|
translateBy n d b =
|
||||||
|
@ -78,19 +78,16 @@ instance Translatable Block where
|
||||||
-- Low level functions on blocks and coordinates
|
-- Low level functions on blocks and coordinates
|
||||||
|
|
||||||
initBlock :: Tetrimino -> Block
|
initBlock :: Tetrimino -> Block
|
||||||
initBlock t = Block t startOrigin $ offset startOrigin $ relCells t
|
initBlock t = Block t startOrigin . fmap (+ startOrigin) . relCells $ t
|
||||||
|
|
||||||
offset :: Coord -> [Coord] -> [Coord]
|
|
||||||
offset (xo,yo) = fmap (\(x,y) -> (xo + x, yo + y))
|
|
||||||
|
|
||||||
relCells :: Tetrimino -> [Coord]
|
relCells :: Tetrimino -> [Coord]
|
||||||
relCells I = [(-2,0), (-1,0), (1,0)]
|
relCells I = map v2 [(-2,0), (-1,0), (1,0)]
|
||||||
relCells O = [(-1,0), (-1,-1), (0,-1)]
|
relCells O = map v2 [(-1,0), (-1,-1), (0,-1)]
|
||||||
relCells S = [(-1,-1), (0,-1), (1,0)]
|
relCells S = map v2 [(-1,-1), (0,-1), (1,0)]
|
||||||
relCells Z = [(-1,0), (0,-1), (1,-1)]
|
relCells Z = map v2 [(-1,0), (0,-1), (1,-1)]
|
||||||
relCells L = [(-1,-1), (-1,0), (1,0)]
|
relCells L = map v2 [(-1,-1), (-1,0), (1,0)]
|
||||||
relCells J = [(-1,0), (1,0), (1,-1)]
|
relCells J = map v2 [(-1,0), (1,0), (1,-1)]
|
||||||
relCells T = [(-1,0), (0,-1), (1,0)]
|
relCells T = map v2 [(-1,0), (0,-1), (1,0)]
|
||||||
|
|
||||||
-- | Visible, active board size
|
-- | Visible, active board size
|
||||||
boardWidth, boardHeight :: Int
|
boardWidth, boardHeight :: Int
|
||||||
|
@ -99,21 +96,22 @@ boardHeight = 20
|
||||||
|
|
||||||
-- | Starting block origin
|
-- | Starting block origin
|
||||||
startOrigin :: Coord
|
startOrigin :: Coord
|
||||||
startOrigin = (6, 22)
|
startOrigin = V2 6 22
|
||||||
|
|
||||||
-- | Rotate block counter clockwise about origin
|
-- | Rotate block counter clockwise about origin
|
||||||
-- *Note*: Strict unsafe rotation not respecting boundaries
|
-- *Note*: Strict unsafe rotation not respecting boundaries
|
||||||
-- Safety can only be assured within Game context
|
-- Safety can only be assured within Game context
|
||||||
rotate' :: Block -> Block
|
rotate' :: Block -> Block
|
||||||
rotate' b@(Block s o@(xo,yo) cs)
|
rotate' b@(Block s o@(V2 xo yo) cs)
|
||||||
| s == O = b -- O doesn't need rotation
|
| s == O = b -- O doesn't need rotation
|
||||||
| s == I && (xo,yo+1) `elem` cs = rotateWith clockwise b -- I only has two orientations
|
| s == I && V2 xo (yo+1) `elem` cs = rotateWith clockwise -- I only has two orientations
|
||||||
| otherwise = rotateWith counterclockwise b
|
| otherwise = rotateWith counterclockwise
|
||||||
where
|
where
|
||||||
rotateWith :: (Coord -> Coord -> Coord) -> Block -> Block
|
rotateWith :: (Coord -> Coord) -> Block
|
||||||
rotateWith dir b = b & extra %~ fmap (dir (b ^. origin))
|
rotateWith dir = b & extra %~ fmap dir
|
||||||
clockwise (xo, yo) (x, y) = (xo + y - yo, xo + yo - x)
|
clockwise = (+ o) . (cwperp) . (subtract o)
|
||||||
counterclockwise (xo, yo) (x, y) = (xo + yo - y, x + yo - xo)
|
counterclockwise = (+ o) . LV.perp . (subtract o)
|
||||||
|
cwperp (V2 x y) = V2 x (-y)
|
||||||
|
|
||||||
-- | Get coordinates of entire block
|
-- | Get coordinates of entire block
|
||||||
coords :: Block -> [Coord]
|
coords :: Block -> [Coord]
|
||||||
|
@ -129,7 +127,7 @@ bagFourTetriminoEach = go . Seq.viewl
|
||||||
where
|
where
|
||||||
go (t :< ts) = pure (t, ts)
|
go (t :< ts) = pure (t, ts)
|
||||||
go EmptyL = freshList >>= bagFourTetriminoEach
|
go EmptyL = freshList >>= bagFourTetriminoEach
|
||||||
freshList = shuffle $ Seq.cycleTaking 28 $ Seq.fromList [(I)..]
|
freshList = shuffle . Seq.fromList . take 28 . cycle $ [(I)..]
|
||||||
|
|
||||||
-- | Initialize a game with a given level
|
-- | Initialize a game with a given level
|
||||||
initGame :: Int -> IO Game
|
initGame :: Int -> IO Game
|
||||||
|
@ -160,15 +158,15 @@ clearFullRows :: Game -> Game
|
||||||
clearFullRows g = g & board %~ clearBoard
|
clearFullRows g = g & board %~ clearBoard
|
||||||
& rowClears %~ (addToRowClears rowCount)
|
& rowClears %~ (addToRowClears rowCount)
|
||||||
where
|
where
|
||||||
clearBoard = M.mapKeys shiftCoordAbove . M.filterWithKey notInFullRow
|
clearBoard = M.mapKeys shiftCoordAbove . M.filterWithKey notInFullRow
|
||||||
notInFullRow (_,y) _ = y `notElem` fullRowIndices
|
notInFullRow (V2 _ y) _ = y `notElem` fullRowIndices
|
||||||
rowCount = length 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 (V2 _ y) _ = r == y
|
||||||
shiftCoordAbove (x,y) =
|
shiftCoordAbove (V2 x y) =
|
||||||
let offset = length . filter (< y) $ fullRowIndices
|
let offset = length . filter (< y) $ fullRowIndices
|
||||||
in (x, y - offset)
|
in V2 x (y - offset)
|
||||||
|
|
||||||
-- | This updates game points with respect to the current
|
-- | This updates game points with respect to the current
|
||||||
-- _rowClears value (thus should only be used ONCE per step)
|
-- _rowClears value (thus should only be used ONCE per step)
|
||||||
|
@ -215,7 +213,7 @@ blockStopped g = isStopped (g ^. board) (g ^. block)
|
||||||
isStopped :: Board -> Block -> Bool
|
isStopped :: Board -> Block -> Bool
|
||||||
isStopped brd = any cStopped . coords
|
isStopped brd = any cStopped . coords
|
||||||
where cStopped = (||) <$> inRow1 <*> (`M.member` brd) . (translate Down)
|
where cStopped = (||) <$> inRow1 <*> (`M.member` brd) . (translate Down)
|
||||||
inRow1 (_,y) = y == 1
|
inRow1 (V2 _ y) = y == 1
|
||||||
|
|
||||||
hardDrop :: Game -> Game
|
hardDrop :: Game -> Game
|
||||||
hardDrop g = g & block .~ hardDroppedBlock g
|
hardDrop g = g & block .~ hardDroppedBlock g
|
||||||
|
@ -224,10 +222,10 @@ hardDrop g = g & block .~ hardDroppedBlock g
|
||||||
hardDroppedBlock :: Game -> Block
|
hardDroppedBlock :: Game -> Block
|
||||||
hardDroppedBlock g = translateBy n Down $ g ^. block
|
hardDroppedBlock g = translateBy n Down $ g ^. block
|
||||||
where n = minimum $ (subtract 1) <$> (minY : diffs)
|
where n = minimum $ (subtract 1) <$> (minY : diffs)
|
||||||
diffs = [y - yo | (xo,yo) <- brdCs, (x,y) <- blkCs, xo == x, yo < y]
|
diffs = [y - yo | (V2 xo yo) <- brdCs, (V2 x y) <- blkCs, xo == x, yo < y]
|
||||||
brdCs = g ^. board ^. to M.keys
|
brdCs = g ^. board ^. to M.keys
|
||||||
blkCs = g ^. block ^. to coords
|
blkCs = g ^. block ^. to coords
|
||||||
minY = minimum (snd <$> blkCs)
|
minY = minimum (fmap (^. _y) blkCs)
|
||||||
|
|
||||||
-- | Freeze current block
|
-- | Freeze current block
|
||||||
freezeBlock :: Game -> Game
|
freezeBlock :: Game -> Game
|
||||||
|
@ -258,7 +256,7 @@ isOccupied = flip M.member
|
||||||
|
|
||||||
-- | Check if coordinate is in or out of bounds
|
-- | Check if coordinate is in or out of bounds
|
||||||
isInBounds, isOutOfBounds :: Coord -> Bool
|
isInBounds, isOutOfBounds :: Coord -> Bool
|
||||||
isInBounds (x,y) = 1 <= x && x <= boardWidth && 1 <= y
|
isInBounds (V2 x y) = 1 <= x && x <= boardWidth && 1 <= y
|
||||||
isOutOfBounds = not . isInBounds
|
isOutOfBounds = not . isInBounds
|
||||||
|
|
||||||
-- | Gravitate current block, i.e. shift down
|
-- | Gravitate current block, i.e. shift down
|
||||||
|
@ -285,3 +283,6 @@ shuffle xs
|
||||||
-- | Take predicate and input and transform to Maybe
|
-- | Take predicate and input and transform to Maybe
|
||||||
boolMaybe :: (a -> Bool) -> a -> Maybe a
|
boolMaybe :: (a -> Bool) -> a -> Maybe a
|
||||||
boolMaybe p a = if p a then Just a else Nothing
|
boolMaybe p a = if p a then Just a else Nothing
|
||||||
|
|
||||||
|
v2 :: (a, a) -> V2 a
|
||||||
|
v2 (x, y) = V2 x y
|
||||||
|
|
|
@ -20,6 +20,7 @@ import qualified Graphics.Vty as V
|
||||||
import Data.Map (Map)
|
import Data.Map (Map)
|
||||||
import qualified Data.Map as M
|
import qualified Data.Map as M
|
||||||
import Lens.Micro
|
import Lens.Micro
|
||||||
|
import Linear.V2 (V2(..), _x, _y)
|
||||||
|
|
||||||
-- | Ticks mark passing of time
|
-- | Ticks mark passing of time
|
||||||
data Tick = Tick
|
data Tick = Tick
|
||||||
|
@ -95,7 +96,7 @@ drawGrid g = hLimit 22
|
||||||
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 (V2 _ y) _ = r == y
|
||||||
gmap = mconcat [brdMap, cBlkMap, hrdMap, emptyCellMap]
|
gmap = mconcat [brdMap, cBlkMap, hrdMap, emptyCellMap]
|
||||||
brdMap = draw Normal . Just <$> g ^. board
|
brdMap = draw Normal . Just <$> g ^. board
|
||||||
hrdMap = blkMap (hardDroppedBlock g) HardDrop
|
hrdMap = blkMap (hardDroppedBlock g) HardDrop
|
||||||
|
@ -106,7 +107,7 @@ drawGrid g = hLimit 22
|
||||||
emptyCellMap :: Map Coord (Widget Name)
|
emptyCellMap :: Map Coord (Widget Name)
|
||||||
emptyCellMap = M.fromList cws
|
emptyCellMap = M.fromList cws
|
||||||
where
|
where
|
||||||
cws = [((x,y), ew) | x <- [1..boardWidth], y <- [1..boardHeight]]
|
cws = [((V2 x y), ew) | x <- [1..boardWidth], y <- [1..boardHeight]]
|
||||||
ew = drawMCell InGrid Normal Nothing
|
ew = drawMCell InGrid Normal Nothing
|
||||||
|
|
||||||
drawMCell :: CellLocation -> TVisual -> Maybe Tetrimino -> Widget Name
|
drawMCell :: CellLocation -> TVisual -> Maybe Tetrimino -> Widget Name
|
||||||
|
@ -173,9 +174,9 @@ drawNextShape t = withBorderStyle BS.unicodeBold
|
||||||
$ vLimit 4
|
$ vLimit 4
|
||||||
$ vBox $ mkRow <$> [0,-1]
|
$ vBox $ mkRow <$> [0,-1]
|
||||||
where
|
where
|
||||||
mkRow y = hBox $ drawMCell InNextShape Normal . cellAt . (,y) <$> [-2..1]
|
mkRow y = hBox $ drawMCell InNextShape Normal . cellAt . (`V2` y) <$> [-2..1]
|
||||||
cellAt (x,y) = if (x,y) `elem` cs then Just t else Nothing
|
cellAt (V2 x y) = if (V2 x y) `elem` cs then Just t else Nothing
|
||||||
blk = Block t (0,0) (relCells t)
|
blk = Block t (V2 0 0) (relCells t)
|
||||||
cs = blk ^. to coords
|
cs = blk ^. to coords
|
||||||
|
|
||||||
drawHelp :: Widget Name
|
drawHelp :: Widget Name
|
||||||
|
|
|
@ -2,8 +2,7 @@ flags: {}
|
||||||
extra-package-dbs: []
|
extra-package-dbs: []
|
||||||
packages:
|
packages:
|
||||||
- '.'
|
- '.'
|
||||||
extra-deps:
|
extra-deps: []
|
||||||
- containers-0.5.10.2
|
|
||||||
resolver: lts-8.18
|
resolver: lts-8.18
|
||||||
nix:
|
nix:
|
||||||
packages: [gcc, ncurses]
|
packages: [gcc, ncurses]
|
||||||
|
|
|
@ -20,7 +20,8 @@ library
|
||||||
, UI.Game
|
, UI.Game
|
||||||
build-depends: base >= 4.7 && < 5
|
build-depends: base >= 4.7 && < 5
|
||||||
, brick
|
, brick
|
||||||
, containers == 0.5.10.2
|
, containers
|
||||||
|
, linear
|
||||||
, microlens
|
, microlens
|
||||||
, microlens-th
|
, microlens-th
|
||||||
, random
|
, random
|
||||||
|
|
Loading…
Add table
Reference in a new issue