2bea4e3729
The native writer test needs to run before others that depend on it.
24 lines
577 B
Haskell
24 lines
577 B
Haskell
{-# OPTIONS_GHC -Wall #-}
|
|
|
|
module Main where
|
|
|
|
import Test.Framework
|
|
|
|
import qualified Tests.Old
|
|
import qualified Tests.Readers.LaTeX
|
|
import qualified Tests.Writers.ConTeXt
|
|
import qualified Tests.Writers.Native
|
|
|
|
tests :: [Test]
|
|
tests = [ testGroup "Old" Tests.Old.tests
|
|
, testGroup "Writers"
|
|
[ testGroup "Native" Tests.Writers.Native.tests
|
|
, testGroup "ConTeXt" Tests.Writers.ConTeXt.tests
|
|
]
|
|
, testGroup "Readers"
|
|
[ testGroup "LaTeX" Tests.Readers.LaTeX.tests
|
|
]
|
|
]
|
|
|
|
main :: IO ()
|
|
main = defaultMain tests
|