From 18ab8642692caca2716fd9b5a0e6dbfd3d9cf9cc Mon Sep 17 00:00:00 2001 From: John MacFarlane Date: Sat, 4 Feb 2017 12:56:30 +0100 Subject: Moved tests/ -> test/. --- tests/Tests/Writers/TEI.hs | 43 ------------------------------------------- 1 file changed, 43 deletions(-) delete mode 100644 tests/Tests/Writers/TEI.hs (limited to 'tests/Tests/Writers/TEI.hs') diff --git a/tests/Tests/Writers/TEI.hs b/tests/Tests/Writers/TEI.hs deleted file mode 100644 index 703f565bb..000000000 --- a/tests/Tests/Writers/TEI.hs +++ /dev/null @@ -1,43 +0,0 @@ -{-# LANGUAGE OverloadedStrings #-} -module Tests.Writers.TEI (tests) where - -import Test.Framework -import Text.Pandoc.Builder -import Text.Pandoc -import Tests.Helpers -import Text.Pandoc.Arbitrary() - -{- - "my test" =: X =?> Y - -is shorthand for - - test html "my test" $ X =?> Y - -which is in turn shorthand for - - test html "my test" (X,Y) --} - -infix 4 =: -(=:) :: (ToString a, ToPandoc a) - => String -> (a, String) -> Test -(=:) = test (purely (writeTEI def) . toPandoc) - -tests :: [Test] -tests = [ testGroup "block elements" - ["para" =: para "Lorem ipsum cetera." - =?> "

Lorem ipsum cetera.

" - ] - , testGroup "inlines" - [ - "Emphasis" =: emph ("emphasized") - =?> "

emphasized

" - ,"SingleQuoted" =: singleQuoted (text "quoted material") - =?> "

quoted material

" - ,"DoubleQuoted" =: doubleQuoted (text "quoted material") - =?> "

quoted material

" - ,"NestedQuoted" =: doubleQuoted (singleQuoted (text "quoted material")) - =?> "

quoted material

" - ] - ] -- cgit v1.2.3