pandoc/tests/test-pandoc.hs
John MacFarlane 0222f367b1 Keep Tests.Arbitrary but remove quickcheck tests for now.
Remove Tests.Shared.
Remove dependency on QuickCheck.
2011-01-14 18:01:57 -08:00

18 lines
340 B
Haskell

{-# OPTIONS_GHC -Wall #-}
module Main where
import Test.Framework
import qualified Tests.Old
import qualified Tests.Readers.LaTeX
tests :: [Test]
tests = [ testGroup "Old" Tests.Old.tests
, testGroup "Readers"
[ testGroup "LaTeX" Tests.Readers.LaTeX.tests
]
]
main :: IO ()
main = defaultMain tests