1 {-# LANGUAGE FlexibleInstances #-}
3 {-# LANGUAGE QuasiQuotes #-}
4 {-# LANGUAGE RecordWildCards #-}
5 {-# LANGUAGE TemplateHaskell #-}
6 {-# LANGUAGE TypeFamilies #-}
8 -- | GameInfo represents a collection of DTDs that we don't really
9 -- handle but want to make available. The raw XML gets stored in the
10 -- database along with the XML_File_ID, but we don't parse any of it.
12 -- See also: TSN.XML.SportInfo
14 module TSN.XML.GameInfo (
18 -- * WARNING: these are private but exported to silence warnings
19 GameInfoConstructor(..) )
23 import Data.Either ( rights )
24 import Data.Time.Clock ( UTCTime )
25 import Database.Groundhog (
29 silentMigrationLogger )
30 import Database.Groundhog.Generic ( runDbConn )
31 import Database.Groundhog.Sqlite ( withSqliteConn )
32 import Database.Groundhog.TH (
35 import Test.Tasty ( TestTree, testGroup )
36 import Test.Tasty.HUnit ( (@?=), testCase )
37 import Text.XML.HXT.Core ( XmlTree )
38 import Text.XML.HXT.DOM.ShowXml ( xshow )
41 import TSN.Codegen ( tsn_codegen_config )
49 parse_xml_time_stamp )
50 import TSN.XmlImport ( XmlImport(..) )
54 unsafe_read_document )
57 -- | The DTDs for everything that we consider "Game Info."
59 -- TODO: This is the list from the old implementation. We need to
60 -- make sure that we are really receiving XML for these DTDs
61 -- (i.e. the names are correct).
65 [ "CBASK_Lineup_XML.dtd",
66 "cbaskpreviewxml.dtd",
68 "Matchup_NBA_NHL_XML.dtd",
70 "MLB_Gaming_Matchup_XML.dtd",
72 "MLB_Matchup_XML.dtd",
73 "MLS_Preview_XML.dtd",
74 "NBA_Gaming_Matchup_XML.dtd",
75 "NBA_Playoff_Matchup_XML.dtd",
78 "NCAA_FB_Preview_XML.dtd",
80 "NFL_NCAA_FB_Matchup_XML.dtd",
83 "WorldBaseballPreviewXML.dtd" ]
86 -- | XML representation of a GameInfo \<message\>.
91 xml_xml_file_id :: Int,
92 xml_time_stamp :: UTCTime,
97 -- | Attempt to parse a 'Message' from an 'XmlTree'. If we cannot,
98 -- we fail with an error message.
100 parse_xml :: String -> XmlTree -> Either String Message
101 parse_xml dtdname xmltree = do
102 xmlfid <- parse_xmlfid xmltree
103 timestamp <- parse_xml_time_stamp xmltree
104 message <- parse_message xmltree
105 return $ Message dtdname (fromInteger xmlfid) timestamp (xshow [message])
108 -- | Database representation of a 'Message'.
113 db_xml_file_id :: Int,
114 db_time_stamp :: UTCTime,
118 instance ToDb Message where
119 -- | The database analogue of a 'Message' is an 'GameInfo'.
120 type Db Message = GameInfo
122 instance FromXml Message where
123 -- | The XML to DB conversion is trivial here.
125 from_xml Message{..} = GameInfo {
127 db_xml_file_id = xml_xml_file_id,
128 db_time_stamp = xml_time_stamp,
132 -- | This allows us to insert the XML representation 'Message'
135 instance XmlImport Message
142 instance DbImport Message where
144 run_dbmigrate $ migrate (undefined :: GameInfo)
146 -- | We import a 'Message' by inserting the whole thing at
147 -- once. Nothing fancy going on here.
150 return ImportSucceeded
153 -- | The database schema for GameInfo is trivial; all we need is for
154 -- the XML_File_ID to be unique.
156 mkPersist tsn_codegen_config [groundhog|
161 - name: unique_game_info
163 # Prevent multiple imports of the same message.
164 fields: [db_xml_file_id]
172 -- | A list of all tests for this module.
174 gameinfo_tests :: TestTree
178 [ test_parse_xml_succeeds,
179 test_dbimport_succeeds ]
182 -- | Sample XML documents for GameInfo types.
184 gameinfo_test_files :: [FilePath]
185 gameinfo_test_files =
186 [ "test/xml/gameinfo/CBASK_Lineup_XML.xml",
187 "test/xml/gameinfo/cbaskpreviewxml.xml",
188 "test/xml/gameinfo/cflpreviewxml.xml",
189 "test/xml/gameinfo/Matchup_NBA_NHL_XML.xml",
190 "test/xml/gameinfo/MLB_Gaming_Matchup_XML.xml",
191 "test/xml/gameinfo/MLB_Lineup_XML.xml",
192 "test/xml/gameinfo/MLB_Matchup_XML.xml",
193 "test/xml/gameinfo/mlbpreviewxml.xml",
194 "test/xml/gameinfo/MLS_Preview_XML.xml",
195 "test/xml/gameinfo/NBA_Gaming_Matchup_XML.xml",
196 "test/xml/gameinfo/NBALineupXML.xml",
197 "test/xml/gameinfo/NBA_Playoff_Matchup_XML.xml",
198 "test/xml/gameinfo/NCAA_FB_Preview_XML.xml",
199 "test/xml/gameinfo/nbapreviewxml.xml",
200 "test/xml/gameinfo/nflpreviewxml.xml",
201 "test/xml/gameinfo/NFL_NCAA_FB_Matchup_XML.xml",
202 "test/xml/gameinfo/nhlpreviewxml.xml",
203 "test/xml/gameinfo/recapxml.xml",
204 "test/xml/gameinfo/WorldBaseballPreviewXML.xml" ]
207 -- | Make sure we can parse every element of 'gameinfo_test_files'.
209 test_parse_xml_succeeds :: TestTree
210 test_parse_xml_succeeds =
211 testGroup "parse_xml" $ map check gameinfo_test_files
213 check t = testCase t $ do
214 x <- unsafe_read_document t
215 let result = parse_xml "dummy" x
216 let actual = case result of -- isRight appears in base-4.7
223 -- | Ensure that each element of 'gameinfo_test_files' can be imported
224 -- by counting the total number of database records (after
225 -- importing) and comparing it against the length of
226 -- 'gameinfo_test_files'.
228 test_dbimport_succeeds :: TestTree
229 test_dbimport_succeeds = testCase "dbimport succeeds" $ do
230 xmltrees <- mapM unsafe_read_document gameinfo_test_files
231 let msgs = rights $ map (parse_xml "dummy") xmltrees
232 actual <- withSqliteConn ":memory:" $ runDbConn $ do
233 runMigration silentMigrationLogger $ do
234 migrate (undefined :: GameInfo)
236 countAll (undefined :: GameInfo)
240 expected = length gameinfo_test_files