+{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE QuasiQuotes #-}
import Database.Groundhog.TH (
groundhog,
mkPersist )
+import qualified GHC.Generics as GHC ( Generic )
import Test.Tasty ( TestTree, testGroup )
import Test.Tasty.HUnit ( (@?=), testCase )
import Text.XML.HXT.Core (
xpWrap )
-- Local imports.
+import Generics ( Generic(..), to_tuple )
import TSN.Codegen ( tsn_codegen_config )
import TSN.DbImport ( DbImport(..), ImportResult(..), run_dbmigrate )
import TSN.Picklers (
xml_title :: String,
xml_dates :: [EarlyLineDate],
xml_time_stamp :: UTCTime }
- deriving (Eq, Show)
+ deriving (Eq, GHC.Generic, Show)
+
+-- | For 'Generics.to_tuple'.
+--
+instance Generic Message
instance ToDb Message where
-- with. But it allows us to pickle and unpickle correctly at least.
--
data EarlyLineGameWithNote =
- EarlyLineGameWithNote {
- date_note :: Maybe String,
- date_game :: EarlyLineGameXml }
- deriving (Eq, Show)
+ EarlyLineGameWithNote
+ (Maybe String) -- date_note, unused
+ EarlyLineGameXml -- date_game
+ deriving (Eq, GHC.Generic, Show)
+
+-- | Accessor for the game within a 'EarlyLineGameWithNote'. We define
+-- this ourselves to avoid an unused field warning for date_note.
+--
+date_game :: EarlyLineGameWithNote -> EarlyLineGameXml
+date_game (EarlyLineGameWithNote _ g) = g
+
+-- | For 'Generics.to_tuple'.
+--
+instance Generic EarlyLineGameWithNote
+
-- | XML representation of a \<date\>. It has a \"value\" attribute
EarlyLineDate {
date_value :: UTCTime,
date_games_with_notes :: [EarlyLineGameWithNote] }
- deriving (Eq, Show)
+ deriving (Eq, GHC.Generic, Show)
+
+-- | For 'Generics.to_tuple'.
+--
+instance Generic EarlyLineDate
xml_away_team :: EarlyLineGameTeamXml,
xml_home_team :: EarlyLineGameTeamXml,
xml_over_under :: Maybe String }
- deriving (Eq, Show)
+ deriving (Eq, GHC.Generic, Show)
+
+-- | For 'Generics.to_tuple'.
+--
+instance Generic EarlyLineGameXml
-- * EarlyLineGameTeam / EarlyLineGameTeamXml
-- with the day portion of the supplied @date@. If not, then we
-- just use @date as-is.
--
- combine_date_time :: EarlyLineGameXml -> UTCTime
- combine_date_time (EarlyLineGameXml (Just t) _ _ _) =
+ combine_date_time :: Maybe UTCTime -> UTCTime
+ combine_date_time (Just t) =
UTCTime (utctDay $ date_value date) (utctDayTime t)
- combine_date_time (EarlyLineGameXml Nothing _ _ _ ) = date_value date
+ combine_date_time Nothing = date_value date
-- | Convert an XML game to a database one.
--
convert_game :: EarlyLineGameXml -> EarlyLineGame
- convert_game gx =
+ convert_game EarlyLineGameXml{..} =
EarlyLineGame {
db_early_lines_id = fk,
- db_game_time = combine_date_time gx,
- db_away_team = from_xml (xml_away_team gx),
- db_home_team = from_xml (xml_home_team gx),
- db_over_under = xml_over_under gx }
+ db_game_time = combine_date_time xml_game_time,
+ db_away_team = from_xml xml_away_team,
+ db_home_team = from_xml xml_home_team,
+ db_over_under = xml_over_under }
--
(xpElem "time_stamp" xp_time_stamp)
where
from_tuple = uncurryN Message
- to_tuple m = (xml_xml_file_id m,
- xml_heading m,
- xml_category m,
- xml_sport m,
- xml_title m,
- xml_dates m,
- xml_time_stamp m)
pickle_game
where
from_tuple = uncurry EarlyLineGameWithNote
- to_tuple m = (date_note m, date_game m)
-- | Pickler for the \<date\> elements within each \<message\>.
(xpList pickle_game_with_note)
where
from_tuple = uncurry EarlyLineDate
- to_tuple m = (date_value m, date_games_with_notes m)
(xpElem "over_under" (xpOption xpText))
where
from_tuple = uncurryN EarlyLineGameXml
- to_tuple m = (xml_game_time m,
- xml_away_team m,
- xml_home_team m,
- xml_over_under m)
--
pickle_team :: PU EarlyLineGameTeamXml
pickle_team =
- xpWrap (from_tuple, to_tuple) $
+ xpWrap (from_tuple, to_tuple') $
xp6Tuple (xpAttr "rotation" (xpOption xpInt))
(xpOption $ xpAttr "line" (xpOption xpText))
(xpOption $ xpAttr "name" xpText)
from_tuple (u,v,w,x,y,z) =
EarlyLineGameTeamXml u (join v) w x (join y) (join z)
- to_tuple (EarlyLineGameTeamXml u v w x y z) =
+ to_tuple' (EarlyLineGameTeamXml u v w x y z) =
(u, double_just v, w, x, double_just y, double_just z)
where
double_just val = case val of