module Test.Hspec.JUnit.Schema ( Suites (..) , Suite (..) , TestCase (..) , Location (..) , Result (..) ) where import Prelude import Data.Text (Text) import Data.Time (UTCTime) import Numeric.Natural data Suites = Suites { Suites -> Text suitesName :: Text , Suites -> [Suite] suitesSuites :: [Suite] } deriving stock (Int -> Suites -> ShowS [Suites] -> ShowS Suites -> String (Int -> Suites -> ShowS) -> (Suites -> String) -> ([Suites] -> ShowS) -> Show Suites forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a $cshowsPrec :: Int -> Suites -> ShowS showsPrec :: Int -> Suites -> ShowS $cshow :: Suites -> String show :: Suites -> String $cshowList :: [Suites] -> ShowS showList :: [Suites] -> ShowS Show) data Suite = Suite { Suite -> Text suiteName :: Text , Suite -> UTCTime suiteTimestamp :: UTCTime , Suite -> [TestCase] suiteCases :: [TestCase] } deriving stock (Int -> Suite -> ShowS [Suite] -> ShowS Suite -> String (Int -> Suite -> ShowS) -> (Suite -> String) -> ([Suite] -> ShowS) -> Show Suite forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a $cshowsPrec :: Int -> Suite -> ShowS showsPrec :: Int -> Suite -> ShowS $cshow :: Suite -> String show :: Suite -> String $cshowList :: [Suite] -> ShowS showList :: [Suite] -> ShowS Show) data TestCase = TestCase { TestCase -> Maybe Location testCaseLocation :: Maybe Location , TestCase -> Text testCaseClassName :: Text , TestCase -> Text testCaseName :: Text , TestCase -> Double testCaseDuration :: Double , TestCase -> Maybe Result testCaseResult :: Maybe Result } deriving stock (Int -> TestCase -> ShowS [TestCase] -> ShowS TestCase -> String (Int -> TestCase -> ShowS) -> (TestCase -> String) -> ([TestCase] -> ShowS) -> Show TestCase forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a $cshowsPrec :: Int -> TestCase -> ShowS showsPrec :: Int -> TestCase -> ShowS $cshow :: TestCase -> String show :: TestCase -> String $cshowList :: [TestCase] -> ShowS showList :: [TestCase] -> ShowS Show) data Location = Location { Location -> String locationFile :: FilePath , Location -> Natural locationLine :: Natural } deriving stock (Int -> Location -> ShowS [Location] -> ShowS Location -> String (Int -> Location -> ShowS) -> (Location -> String) -> ([Location] -> ShowS) -> Show Location forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a $cshowsPrec :: Int -> Location -> ShowS showsPrec :: Int -> Location -> ShowS $cshow :: Location -> String show :: Location -> String $cshowList :: [Location] -> ShowS showList :: [Location] -> ShowS Show) data Result = Failure Text Text | Skipped Text deriving stock (Int -> Result -> ShowS [Result] -> ShowS Result -> String (Int -> Result -> ShowS) -> (Result -> String) -> ([Result] -> ShowS) -> Show Result forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a $cshowsPrec :: Int -> Result -> ShowS showsPrec :: Int -> Result -> ShowS $cshow :: Result -> String show :: Result -> String $cshowList :: [Result] -> ShowS showList :: [Result] -> ShowS Show)