Moved old tests into Old.hs and added new simple test-pandoc.hs for loading and grouping together tests from different files. Later commits will add more testfiles to the suite with more modular tests.
14 lines
193 B
Haskell
14 lines
193 B
Haskell
{-# OPTIONS_GHC -Wall #-}
|
|
|
|
module Main where
|
|
|
|
import Test.Framework
|
|
|
|
import qualified Old
|
|
|
|
tests :: [Test]
|
|
tests = [ testGroup "Old" Old.tests
|
|
]
|
|
|
|
main :: IO ()
|
|
main = defaultMain tests
|