2d443ecb07
The org reader test file had grown large, to the point that editor performance was negatively affected in some cases. The tests are spread over multiple submodules, and re-combined into a tasty TestTree in the main org reader test file.
16 lines
521 B
Haskell
16 lines
521 B
Haskell
{-# LANGUAGE OverloadedStrings #-}
|
|
module Tests.Readers.Org (tests) where
|
|
|
|
import Test.Tasty (TestTree, testGroup)
|
|
import qualified Tests.Readers.Org.Block as Block
|
|
import qualified Tests.Readers.Org.Directive as Directive
|
|
import qualified Tests.Readers.Org.Inline as Inline
|
|
import qualified Tests.Readers.Org.Meta as Meta
|
|
|
|
tests :: [TestTree]
|
|
tests =
|
|
[ testGroup "Inlines" Inline.tests
|
|
, testGroup "Basic Blocks" Block.tests
|
|
, testGroup "Meta Information" Meta.tests
|
|
, testGroup "Directives" Directive.tests
|
|
]
|