Reordered test files.
This commit is contained in:
parent
3ebfcd0cea
commit
e61348dc11
4 changed files with 9 additions and 9 deletions
|
@ -1,5 +1,5 @@
|
|||
|
||||
module Old (tests) where
|
||||
module Tests.Old (tests) where
|
||||
|
||||
import Test.Framework (testGroup, Test )
|
||||
import Test.Framework.Providers.HUnit
|
|
@ -1,9 +1,9 @@
|
|||
module Latex.Reader (tests) where
|
||||
module Tests.Readers.LaTeX (tests) where
|
||||
|
||||
import Text.Pandoc.Definition
|
||||
|
||||
import Test.Framework
|
||||
import Helpers
|
||||
import Tests.Shared
|
||||
|
||||
tests :: [Test]
|
||||
tests = [ testGroup "basic" [ latexTest "simplest" "word"
|
|
@ -1,4 +1,4 @@
|
|||
module Helpers where
|
||||
module Tests.Shared where
|
||||
|
||||
import Text.Pandoc
|
||||
|
|
@ -4,13 +4,13 @@ module Main where
|
|||
|
||||
import Test.Framework
|
||||
|
||||
import qualified Old
|
||||
import qualified Latex.Reader
|
||||
import qualified Tests.Old
|
||||
import qualified Tests.Readers.LaTeX
|
||||
|
||||
tests :: [Test]
|
||||
tests = [ testGroup "Old" Old.tests
|
||||
, testGroup "Latex" [ testGroup "Reader" Latex.Reader.tests
|
||||
]
|
||||
tests = [ testGroup "Old" Tests.Old.tests
|
||||
, testGroup "Readers" [ testGroup "LaTeX" Tests.Readers.LaTeX.tests
|
||||
]
|
||||
]
|
||||
|
||||
main :: IO ()
|
||||
|
|
Loading…
Add table
Reference in a new issue