2019-08-20 11:31:03 -04:00
|
|
|
{-
|
|
|
|
|
|
|
|
mtlstats
|
|
|
|
Copyright (C) 2019 Rhéal Lamothe
|
|
|
|
<rheal.lamothe@gmail.com>
|
|
|
|
|
|
|
|
This program is free software: you can redistribute it and/or modify
|
|
|
|
it under the terms of the GNU General Public License as published by
|
|
|
|
the Free Software Foundation, either version 3 of the License, or (at
|
|
|
|
your option) any later version.
|
|
|
|
|
|
|
|
This program is distributed in the hope that it will be useful, but
|
|
|
|
WITHOUT ANY WARRANTY; without even the implied warranty of
|
|
|
|
MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU
|
|
|
|
General Public License for more details.
|
|
|
|
|
|
|
|
You should have received a copy of the GNU General Public License
|
|
|
|
along with this program. If not, see <https://www.gnu.org/licenses/>.
|
|
|
|
|
|
|
|
-}
|
|
|
|
|
2019-08-26 23:55:02 -04:00
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
2019-08-10 10:01:36 -04:00
|
|
|
|
2019-08-09 11:06:13 -04:00
|
|
|
module TypesSpec (spec) where
|
|
|
|
|
2019-08-26 23:55:02 -04:00
|
|
|
import Data.Aeson (FromJSON, ToJSON, decode, encode, toJSON)
|
|
|
|
import Data.Aeson.Types (Value (Object))
|
2019-08-10 10:01:36 -04:00
|
|
|
import Data.ByteString.Lazy (ByteString)
|
2019-08-26 23:55:02 -04:00
|
|
|
import qualified Data.HashMap.Strict as HM
|
2019-08-22 13:05:25 -04:00
|
|
|
import Lens.Micro ((&), (^.), (.~), (?~))
|
2019-08-09 11:06:13 -04:00
|
|
|
import Test.Hspec (Spec, context, describe, it, shouldBe)
|
2019-08-26 23:55:02 -04:00
|
|
|
|
2019-08-09 11:06:13 -04:00
|
|
|
import Mtlstats.Types
|
|
|
|
|
2019-08-21 00:21:22 -04:00
|
|
|
import qualified Types.MenuSpec as Menu
|
|
|
|
|
2019-08-09 11:06:13 -04:00
|
|
|
spec :: Spec
|
2019-08-10 10:01:36 -04:00
|
|
|
spec = describe "Mtlstats.Types" $ do
|
|
|
|
playerSpec
|
2019-08-11 10:24:39 -04:00
|
|
|
goalieSpec
|
2019-08-26 10:20:10 -04:00
|
|
|
gameStatsSpec
|
2019-08-16 11:49:04 -04:00
|
|
|
databaseSpec
|
2019-08-26 23:55:02 -04:00
|
|
|
pPointsSpec
|
2019-08-22 13:05:25 -04:00
|
|
|
gameTypeLSpec
|
2019-08-25 09:23:59 -04:00
|
|
|
otherTeamLSpec
|
2019-08-22 14:19:43 -04:00
|
|
|
homeScoreLSpec
|
2019-08-22 14:33:39 -04:00
|
|
|
awayScoreLSpec
|
2019-08-22 14:59:19 -04:00
|
|
|
teamScoreSpec
|
2019-08-21 00:21:22 -04:00
|
|
|
Menu.spec
|
2019-08-09 11:06:13 -04:00
|
|
|
|
2019-08-22 14:59:19 -04:00
|
|
|
playerSpec :: Spec
|
2019-08-26 23:55:02 -04:00
|
|
|
playerSpec = describe "Player" $ jsonSpec player playerJSON
|
2019-08-22 14:59:19 -04:00
|
|
|
|
2019-08-26 23:55:02 -04:00
|
|
|
goalieSpec :: Spec
|
|
|
|
goalieSpec = describe "Goalie" $ jsonSpec goalie goalieJSON
|
2019-08-22 14:59:19 -04:00
|
|
|
|
2019-08-26 10:20:10 -04:00
|
|
|
gameStatsSpec :: Spec
|
|
|
|
gameStatsSpec = describe "GameStats" $
|
|
|
|
jsonSpec (gameStats 1) (gameStatsJSON 1)
|
|
|
|
|
2019-08-26 23:55:02 -04:00
|
|
|
databaseSpec :: Spec
|
|
|
|
databaseSpec = describe "Database" $ jsonSpec db dbJSON
|
2019-08-22 14:59:19 -04:00
|
|
|
|
2019-08-10 10:01:36 -04:00
|
|
|
pPointsSpec :: Spec
|
2019-08-09 11:06:13 -04:00
|
|
|
pPointsSpec = describe "pPoints" $ mapM_
|
|
|
|
(\(goals, assists, points) -> let
|
|
|
|
desc = "goals: " ++ show goals ++
|
|
|
|
", assists: " ++ show assists
|
|
|
|
stats = newPlayerStats &
|
|
|
|
psGoals .~ goals &
|
|
|
|
psAssists .~ assists
|
|
|
|
in context desc $
|
|
|
|
it ("should be " ++ show points) $
|
|
|
|
pPoints stats `shouldBe` points)
|
|
|
|
-- goals, assists, points
|
|
|
|
[ ( 0, 0, 0 )
|
|
|
|
, ( 1, 0, 1 )
|
|
|
|
, ( 0, 1, 1 )
|
|
|
|
, ( 2, 3, 5 )
|
|
|
|
]
|
2019-08-10 10:01:36 -04:00
|
|
|
|
2019-08-22 13:05:25 -04:00
|
|
|
gameTypeLSpec :: Spec
|
|
|
|
gameTypeLSpec = describe "gameTypeL" $ do
|
|
|
|
|
|
|
|
context "getter" $ do
|
|
|
|
|
|
|
|
context "unexpected mode" $
|
2019-08-23 10:20:06 -04:00
|
|
|
it "should return Nothing" $
|
2019-08-22 13:05:25 -04:00
|
|
|
MainMenu ^. gameTypeL `shouldBe` Nothing
|
|
|
|
|
|
|
|
mapM_
|
|
|
|
(\t -> context (show t) $
|
|
|
|
it ("should return " ++ show t) $ let
|
|
|
|
gs = newGameState & gameType ?~ t
|
|
|
|
m = NewGame gs
|
|
|
|
in m ^. gameTypeL `shouldBe` Just t)
|
|
|
|
[HomeGame, AwayGame]
|
|
|
|
|
|
|
|
context "setter" $ do
|
|
|
|
|
|
|
|
context "unexpected mode" $
|
|
|
|
mapM_
|
|
|
|
(\t -> context (show t) $
|
|
|
|
it ("should set to " ++ show t) $ let
|
|
|
|
m = MainMenu & gameTypeL ?~ t
|
|
|
|
in m ^. gameTypeL `shouldBe` Just t)
|
|
|
|
[HomeGame, AwayGame]
|
|
|
|
|
|
|
|
context "expected mode" $
|
|
|
|
mapM_
|
|
|
|
(\t -> context (show t) $
|
|
|
|
it ("should set to " ++ show t) $ let
|
|
|
|
m = NewGame newGameState & gameTypeL ?~ t
|
|
|
|
in m ^. gameTypeL `shouldBe` Just t)
|
|
|
|
[HomeGame, AwayGame]
|
|
|
|
|
2019-08-25 09:23:59 -04:00
|
|
|
otherTeamLSpec :: Spec
|
|
|
|
otherTeamLSpec = describe "otherTeamL" $ do
|
|
|
|
|
|
|
|
context "getter" $ do
|
|
|
|
|
|
|
|
context "unexpected mode" $
|
|
|
|
it "should return an empty string" $
|
|
|
|
MainMenu ^. otherTeamL `shouldBe` ""
|
|
|
|
|
|
|
|
context "expected mode" $
|
|
|
|
it "should return \"foo\"" $ let
|
|
|
|
m = NewGame $ newGameState & otherTeam .~ "foo"
|
|
|
|
in m ^. otherTeamL `shouldBe` "foo"
|
|
|
|
|
|
|
|
context "setter" $ do
|
|
|
|
|
|
|
|
context "unexpected mode" $
|
|
|
|
it "should set the value" $ let
|
|
|
|
m = MainMenu & otherTeamL .~ "foo"
|
|
|
|
in m ^. otherTeamL `shouldBe` "foo"
|
|
|
|
|
|
|
|
context "expected mode" $
|
|
|
|
it "should set the value" $ let
|
|
|
|
m = NewGame newGameState & otherTeamL .~ "foo"
|
|
|
|
in m ^. otherTeamL `shouldBe` "foo"
|
|
|
|
|
2019-08-25 09:25:34 -04:00
|
|
|
homeScoreLSpec :: Spec
|
2019-08-22 14:19:43 -04:00
|
|
|
homeScoreLSpec = describe "homeScoreL" $ do
|
|
|
|
|
|
|
|
context "getter" $ do
|
|
|
|
|
|
|
|
context "unexpected mode" $
|
|
|
|
it "should return Nothing" $
|
|
|
|
MainMenu ^. homeScoreL `shouldBe` Nothing
|
|
|
|
|
|
|
|
context "expected mode" $
|
|
|
|
it "should return 0" $ let
|
|
|
|
gs = newGameState & homeScore ?~ 0
|
|
|
|
m = NewGame gs
|
|
|
|
in m ^. homeScoreL `shouldBe` Just 0
|
|
|
|
|
|
|
|
context "setter" $ do
|
|
|
|
|
|
|
|
context "unexpected mode" $
|
2019-08-22 14:33:39 -04:00
|
|
|
it "should set home score" $ let
|
2019-08-22 14:19:43 -04:00
|
|
|
m = MainMenu & homeScoreL ?~ 0
|
|
|
|
in m ^. homeScoreL `shouldBe` Just 0
|
|
|
|
|
|
|
|
context "expected mode" $
|
2019-08-22 14:33:39 -04:00
|
|
|
it "should set home score" $ let
|
2019-08-22 14:19:43 -04:00
|
|
|
m = NewGame newGameState & homeScoreL ?~ 0
|
|
|
|
in m ^. homeScoreL `shouldBe` Just 0
|
|
|
|
|
2019-08-22 14:33:39 -04:00
|
|
|
awayScoreLSpec :: Spec
|
|
|
|
awayScoreLSpec = describe "awayScoreL" $ do
|
|
|
|
|
|
|
|
context "getter" $ do
|
|
|
|
|
|
|
|
context "unexpected mode" $
|
|
|
|
it "should return Nothing" $
|
|
|
|
MainMenu ^. awayScoreL `shouldBe` Nothing
|
|
|
|
|
|
|
|
context "expected mode" $
|
|
|
|
it "should return 0" $ let
|
|
|
|
gs = newGameState & awayScore ?~ 0
|
|
|
|
m = NewGame gs
|
|
|
|
in m ^. awayScoreL `shouldBe` Just 0
|
|
|
|
|
|
|
|
context "setter" $ do
|
|
|
|
|
|
|
|
context "unexpected mode" $
|
|
|
|
it "should set the away score" $ let
|
|
|
|
m = MainMenu & awayScoreL ?~ 0
|
|
|
|
in m ^. awayScoreL `shouldBe` Just 0
|
|
|
|
|
|
|
|
context "expected mode" $
|
|
|
|
it "should set the away score" $ let
|
|
|
|
m = NewGame newGameState & awayScoreL ?~ 0
|
|
|
|
in m ^. awayScoreL `shouldBe` Just 0
|
|
|
|
|
2019-08-22 14:59:19 -04:00
|
|
|
teamScoreSpec :: Spec
|
|
|
|
teamScoreSpec = describe "teamScore" $ do
|
|
|
|
let
|
|
|
|
m t = NewGame $ newGameState
|
|
|
|
& gameType ?~ t
|
|
|
|
& homeScore ?~ 1
|
|
|
|
& awayScore ?~ 2
|
|
|
|
s t = newProgState
|
|
|
|
& progMode .~ m t
|
|
|
|
|
|
|
|
context "unexpected state" $
|
|
|
|
it "should return Nothing" $
|
|
|
|
teamScore newProgState `shouldBe` Nothing
|
|
|
|
|
|
|
|
context "HomeGame" $
|
|
|
|
it "should return 1" $
|
|
|
|
teamScore (s HomeGame) `shouldBe` Just 1
|
|
|
|
|
|
|
|
context "AwayGame" $
|
|
|
|
it "should return 2" $
|
|
|
|
teamScore (s AwayGame) `shouldBe` Just 2
|
|
|
|
|
2019-08-26 23:55:02 -04:00
|
|
|
jsonSpec
|
|
|
|
:: (Eq a, Show a, FromJSON a, ToJSON a)
|
|
|
|
=> a
|
|
|
|
-> Value
|
|
|
|
-> Spec
|
|
|
|
jsonSpec x j = do
|
|
|
|
|
|
|
|
describe "decode" $
|
|
|
|
it "should decode" $
|
|
|
|
decode (encode j) `shouldBe` Just x
|
|
|
|
|
|
|
|
describe "toJSON" $
|
|
|
|
it "should encode" $
|
|
|
|
decode (encode $ toJSON x) `shouldBe` Just x
|
|
|
|
|
|
|
|
describe "toEncoding" $
|
|
|
|
it "should encode" $
|
|
|
|
decode (encode x) `shouldBe` Just x
|
|
|
|
|
2019-08-10 10:01:36 -04:00
|
|
|
player :: Player
|
|
|
|
player = newPlayer 1 "Joe" "centre"
|
2019-08-26 23:55:02 -04:00
|
|
|
& pYtd .~ playerStats 1
|
|
|
|
& pLifetime .~ playerStats 2
|
|
|
|
|
|
|
|
playerJSON :: Value
|
|
|
|
playerJSON = Object $ HM.fromList
|
|
|
|
[ ( "number", toJSON (1 :: Int) )
|
|
|
|
, ( "name", toJSON ("Joe" :: String) )
|
|
|
|
, ( "position", toJSON ("centre" :: String) )
|
|
|
|
, ( "ytd", playerStatsJSON 1 )
|
|
|
|
, ( "lifetime", playerStatsJSON 2 )
|
|
|
|
]
|
|
|
|
|
|
|
|
playerStats :: Int -> PlayerStats
|
|
|
|
playerStats n = newPlayerStats
|
|
|
|
& psGoals .~ n
|
|
|
|
& psAssists .~ n + 1
|
|
|
|
& psPMin .~ n + 2
|
|
|
|
|
|
|
|
playerStatsJSON :: Int -> Value
|
|
|
|
playerStatsJSON n = Object $ HM.fromList
|
|
|
|
[ ( "goals", toJSON n )
|
|
|
|
, ( "assists", toJSON $ n + 1 )
|
|
|
|
, ( "penalty_mins", toJSON $ n + 2 )
|
|
|
|
]
|
2019-08-10 10:01:36 -04:00
|
|
|
|
2019-08-11 10:24:39 -04:00
|
|
|
goalie :: Goalie
|
|
|
|
goalie = newGoalie 1 "Joe"
|
2019-08-26 23:55:02 -04:00
|
|
|
& gYtd .~ goalieStats 1
|
|
|
|
& gLifetime .~ goalieStats 2
|
|
|
|
|
|
|
|
goalieJSON :: Value
|
|
|
|
goalieJSON = Object $ HM.fromList
|
|
|
|
[ ( "number", toJSON (1 :: Int) )
|
|
|
|
, ( "name", toJSON ("Joe" :: String ) )
|
|
|
|
, ( "ytd", goalieStatsJSON 1 )
|
|
|
|
, ( "lifetime", goalieStatsJSON 2 )
|
|
|
|
]
|
|
|
|
|
|
|
|
goalieStats :: Int -> GoalieStats
|
|
|
|
goalieStats n = newGoalieStats
|
|
|
|
& gsGames .~ n
|
|
|
|
& gsMinsPlayed .~ n + 1
|
|
|
|
& gsGoalsAllowed .~ n + 2
|
|
|
|
& gsGoalsAgainst .~ n + 3
|
|
|
|
& gsWins .~ n + 4
|
|
|
|
& gsLosses .~ n + 5
|
|
|
|
& gsTies .~ n + 6
|
|
|
|
|
|
|
|
goalieStatsJSON :: Int -> Value
|
|
|
|
goalieStatsJSON n = Object $ HM.fromList
|
|
|
|
[ ( "games", toJSON n )
|
|
|
|
, ( "mins_played", toJSON $ n + 1 )
|
|
|
|
, ( "goals_allowed", toJSON $ n + 2 )
|
|
|
|
, ( "goals_against", toJSON $ n + 3 )
|
|
|
|
, ( "wins", toJSON $ n + 4 )
|
|
|
|
, ( "losses", toJSON $ n + 5 )
|
|
|
|
, ( "ties", toJSON $ n + 6 )
|
|
|
|
]
|
2019-08-11 10:24:39 -04:00
|
|
|
|
2019-08-26 10:20:10 -04:00
|
|
|
gameStats :: Int -> GameStats
|
|
|
|
gameStats n = GameStats
|
|
|
|
{ _gmsWins = n
|
|
|
|
, _gmsLosses = n + 1
|
|
|
|
, _gmsOvertime = n + 2
|
|
|
|
}
|
|
|
|
|
|
|
|
gameStatsJSON :: Int -> Value
|
|
|
|
gameStatsJSON n = Object $ HM.fromList
|
|
|
|
[ ( "wins", toJSON n )
|
|
|
|
, ( "losses", toJSON $ n + 1 )
|
|
|
|
, ( "overtime", toJSON $ n + 2 )
|
|
|
|
]
|
|
|
|
|
2019-08-16 11:49:04 -04:00
|
|
|
db :: Database
|
|
|
|
db = newDatabase
|
2019-08-27 11:10:57 -04:00
|
|
|
& dbPlayers .~ [player]
|
|
|
|
& dbGoalies .~ [goalie]
|
|
|
|
& dbGames .~ 1
|
|
|
|
& dbHomeGameStats .~ gameStats 1
|
|
|
|
& dbAwayGameStats .~ gameStats 2
|
2019-08-16 11:49:04 -04:00
|
|
|
|
2019-08-26 23:55:02 -04:00
|
|
|
dbJSON :: Value
|
|
|
|
dbJSON = Object $ HM.fromList
|
2019-08-27 11:10:57 -04:00
|
|
|
[ ( "players", toJSON [playerJSON] )
|
|
|
|
, ( "goalies", toJSON [goalieJSON] )
|
|
|
|
, ( "games", toJSON (1 :: Int) )
|
|
|
|
, ( "home_game_stats", gameStatsJSON 1 )
|
|
|
|
, ( "away_game_stats", gameStatsJSON 2 )
|
2019-08-26 23:55:02 -04:00
|
|
|
]
|