diff options
| author | John MacFarlane <jgm@berkeley.edu> | 2017-02-20 20:52:00 +0100 |
|---|---|---|
| committer | John MacFarlane <jgm@berkeley.edu> | 2017-02-20 20:52:00 +0100 |
| commit | ce8226f1a7d64da56117d2f7f351e06225a84614 (patch) | |
| tree | 9f2d716df0230f5f17372f19b8718dcf86039fd9 /test/Tests/Writers/HTML.hs | |
| parent | e86e44b98e592d5a5e4c6b43d9b57b195f091ed9 (diff) | |
| parent | 12d96508c62189b4ff8c8b797d34cc9ef177f5ee (diff) | |
| download | pandoc-ce8226f1a7d64da56117d2f7f351e06225a84614.tar.gz | |
Merge commit '9e52ac6bb02afd7b4ed5dad61021a1fa33051203' as 'data/templates'
Diffstat (limited to 'test/Tests/Writers/HTML.hs')
| -rw-r--r-- | test/Tests/Writers/HTML.hs | 43 |
1 files changed, 0 insertions, 43 deletions
diff --git a/test/Tests/Writers/HTML.hs b/test/Tests/Writers/HTML.hs deleted file mode 100644 index 45de2b042..000000000 --- a/test/Tests/Writers/HTML.hs +++ /dev/null @@ -1,43 +0,0 @@ -{-# LANGUAGE OverloadedStrings #-} -module Tests.Writers.HTML (tests) where - -import Test.Framework -import Text.Pandoc.Builder -import Text.Pandoc -import Tests.Helpers -import Text.Pandoc.Arbitrary() - -html :: (ToPandoc a) => a -> String -html = purely (writeHtml4String def{ writerWrapText = WrapNone }) . toPandoc - -{- - "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 html - -tests :: [Test] -tests = [ testGroup "inline code" - [ "basic" =: code "@&" =?> "<code>@&</code>" - , "haskell" =: codeWith ("",["haskell"],[]) ">>=" - =?> "<code class=\"sourceCode haskell\"><span class=\"fu\">>>=</span></code>" - , "nolanguage" =: codeWith ("",["nolanguage"],[]) ">>=" - =?> "<code class=\"nolanguage\">>>=</code>" - ] - , testGroup "images" - [ "alt with formatting" =: - image "/url" "title" ("my " <> emph "image") - =?> "<img src=\"/url\" title=\"title\" alt=\"my image\" />" - ] - ] |
