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/Readers/Markdown.hs | 461 ---------------------------------------- 1 file changed, 461 deletions(-) delete mode 100644 tests/Tests/Readers/Markdown.hs (limited to 'tests/Tests/Readers/Markdown.hs') diff --git a/tests/Tests/Readers/Markdown.hs b/tests/Tests/Readers/Markdown.hs deleted file mode 100644 index 65edf7c38..000000000 --- a/tests/Tests/Readers/Markdown.hs +++ /dev/null @@ -1,461 +0,0 @@ -{-# LANGUAGE OverloadedStrings #-} -module Tests.Readers.Markdown (tests) where - -import Text.Pandoc.Definition -import Test.Framework -import Tests.Helpers -import Text.Pandoc.Arbitrary() -import Text.Pandoc.Builder -import Text.Pandoc - -markdown :: String -> Pandoc -markdown = purely $ readMarkdown def { readerExtensions = - disableExtension Ext_smart pandocExtensions } - -markdownSmart :: String -> Pandoc -markdownSmart = purely $ readMarkdown def { readerExtensions = - enableExtension Ext_smart pandocExtensions } - -markdownCDL :: String -> Pandoc -markdownCDL = purely $ readMarkdown def { readerExtensions = enableExtension - Ext_compact_definition_lists pandocExtensions } - -markdownGH :: String -> Pandoc -markdownGH = purely $ readMarkdown def { - readerExtensions = githubMarkdownExtensions } - -infix 4 =: -(=:) :: ToString c - => String -> (String, c) -> Test -(=:) = test markdown - -testBareLink :: (String, Inlines) -> Test -testBareLink (inp, ils) = - test (purely $ readMarkdown def{ readerExtensions = - extensionsFromList [Ext_autolink_bare_uris, Ext_raw_html] }) - inp (inp, doc $ para ils) - -autolink :: String -> Inlines -autolink = autolinkWith nullAttr - -autolinkWith :: Attr -> String -> Inlines -autolinkWith attr s = linkWith attr s "" (str s) - -bareLinkTests :: [(String, Inlines)] -bareLinkTests = - [ ("http://google.com is a search engine.", - autolink "http://google.com" <> " is a search engine.") - , ("http://foo.bar.baz", - rawInline "html" "" <> - "http://foo.bar.baz" <> rawInline "html" "") - , ("Try this query: http://google.com?search=fish&time=hour.", - "Try this query: " <> autolink "http://google.com?search=fish&time=hour" <> ".") - , ("HTTPS://GOOGLE.COM,", - autolink "HTTPS://GOOGLE.COM" <> ",") - , ("http://el.wikipedia.org/wiki/Τεχνολογία,", - autolink "http://el.wikipedia.org/wiki/Τεχνολογία" <> ",") - , ("doi:10.1000/182,", - autolink "doi:10.1000/182" <> ",") - , ("git://github.com/foo/bar.git,", - autolink "git://github.com/foo/bar.git" <> ",") - , ("file:///Users/joe/joe.txt, and", - autolink "file:///Users/joe/joe.txt" <> ", and") - , ("mailto:someone@somedomain.com.", - autolink "mailto:someone@somedomain.com" <> ".") - , ("Use http: this is not a link!", - "Use http: this is not a link!") - , ("(http://google.com).", - "(" <> autolink "http://google.com" <> ").") - , ("http://en.wikipedia.org/wiki/Sprite_(computer_graphics)", - autolink "http://en.wikipedia.org/wiki/Sprite_(computer_graphics)") - , ("http://en.wikipedia.org/wiki/Sprite_[computer_graphics]", - link "http://en.wikipedia.org/wiki/Sprite_%5Bcomputer_graphics%5D" "" - (str "http://en.wikipedia.org/wiki/Sprite_[computer_graphics]")) - , ("http://en.wikipedia.org/wiki/Sprite_{computer_graphics}", - link "http://en.wikipedia.org/wiki/Sprite_%7Bcomputer_graphics%7D" "" - (str "http://en.wikipedia.org/wiki/Sprite_{computer_graphics}")) - , ("http://example.com/Notification_Center-GitHub-20101108-140050.jpg", - autolink "http://example.com/Notification_Center-GitHub-20101108-140050.jpg") - , ("https://github.com/github/hubot/blob/master/scripts/cream.js#L20-20", - autolink "https://github.com/github/hubot/blob/master/scripts/cream.js#L20-20") - , ("http://www.rubyonrails.com", - autolink "http://www.rubyonrails.com") - , ("http://www.rubyonrails.com:80", - autolink "http://www.rubyonrails.com:80") - , ("http://www.rubyonrails.com/~minam", - autolink "http://www.rubyonrails.com/~minam") - , ("https://www.rubyonrails.com/~minam", - autolink "https://www.rubyonrails.com/~minam") - , ("http://www.rubyonrails.com/~minam/url%20with%20spaces", - autolink "http://www.rubyonrails.com/~minam/url%20with%20spaces") - , ("http://www.rubyonrails.com/foo.cgi?something=here", - autolink "http://www.rubyonrails.com/foo.cgi?something=here") - , ("http://www.rubyonrails.com/foo.cgi?something=here&and=here", - autolink "http://www.rubyonrails.com/foo.cgi?something=here&and=here") - , ("http://www.rubyonrails.com/contact;new", - autolink "http://www.rubyonrails.com/contact;new") - , ("http://www.rubyonrails.com/contact;new%20with%20spaces", - autolink "http://www.rubyonrails.com/contact;new%20with%20spaces") - , ("http://www.rubyonrails.com/contact;new?with=query&string=params", - autolink "http://www.rubyonrails.com/contact;new?with=query&string=params") - , ("http://www.rubyonrails.com/~minam/contact;new?with=query&string=params", - autolink "http://www.rubyonrails.com/~minam/contact;new?with=query&string=params") - , ("http://en.wikipedia.org/wiki/Wikipedia:Today%27s_featured_picture_%28animation%29/January_20%2C_2007", - autolink "http://en.wikipedia.org/wiki/Wikipedia:Today%27s_featured_picture_%28animation%29/January_20%2C_2007") - , ("http://www.mail-archive.com/rails@lists.rubyonrails.org/", - autolink "http://www.mail-archive.com/rails@lists.rubyonrails.org/") - , ("http://www.amazon.com/Testing-Equal-Sign-In-Path/ref=pd_bbs_sr_1?ie=UTF8&s=books&qid=1198861734&sr=8-1", - autolink "http://www.amazon.com/Testing-Equal-Sign-In-Path/ref=pd_bbs_sr_1?ie=UTF8&s=books&qid=1198861734&sr=8-1") - , ("http://en.wikipedia.org/wiki/Texas_hold%27em", - autolink "http://en.wikipedia.org/wiki/Texas_hold%27em") - , ("https://www.google.com/doku.php?id=gps:resource:scs:start", - autolink "https://www.google.com/doku.php?id=gps:resource:scs:start") - , ("http://www.rubyonrails.com", - autolink "http://www.rubyonrails.com") - , ("http://manuals.ruby-on-rails.com/read/chapter.need_a-period/103#page281", - autolink "http://manuals.ruby-on-rails.com/read/chapter.need_a-period/103#page281") - , ("http://foo.example.com/controller/action?parm=value&p2=v2#anchor123", - autolink "http://foo.example.com/controller/action?parm=value&p2=v2#anchor123") - , ("http://foo.example.com:3000/controller/action", - autolink "http://foo.example.com:3000/controller/action") - , ("http://foo.example.com:3000/controller/action+pack", - autolink "http://foo.example.com:3000/controller/action+pack") - , ("http://business.timesonline.co.uk/article/0,,9065-2473189,00.html", - autolink "http://business.timesonline.co.uk/article/0,,9065-2473189,00.html") - , ("http://www.mail-archive.com/ruby-talk@ruby-lang.org/", - autolink "http://www.mail-archive.com/ruby-talk@ruby-lang.org/") - , ("https://example.org/?anchor=lala-", - autolink "https://example.org/?anchor=lala-") - , ("https://example.org/?anchor=-lala", - autolink "https://example.org/?anchor=-lala") - ] - -{- -p_markdown_round_trip :: Block -> Bool -p_markdown_round_trip b = matches d' d'' - where d' = normalize $ Pandoc (Meta [] [] []) [b] - d'' = normalize - $ readMarkdown def { readerSmart = True } - $ writeMarkdown def d' - matches (Pandoc _ [Plain []]) (Pandoc _ []) = True - matches (Pandoc _ [Para []]) (Pandoc _ []) = True - matches (Pandoc _ [Plain xs]) (Pandoc _ [Para xs']) = xs == xs' - matches x y = x == y --} - -tests :: [Test] -tests = [ testGroup "inline code" - [ "with attribute" =: - "`document.write(\"Hello\");`{.javascript}" - =?> para - (codeWith ("",["javascript"],[]) "document.write(\"Hello\");") - , "with attribute space" =: - "`*` {.haskell .special x=\"7\"}" - =?> para (code "*" <> space <> str "{.haskell" <> space <> - str ".special" <> space <> str "x=\"7\"}") - ] - , testGroup "emph and strong" - [ "two strongs in emph" =: - "***a**b **c**d*" =?> para (emph (strong (str "a") <> str "b" <> space - <> strong (str "c") <> str "d")) - , "emph and strong emph alternating" =: - "*xxx* ***xxx*** xxx\n*xxx* ***xxx*** xxx" - =?> para (emph "xxx" <> space <> strong (emph "xxx") <> - space <> "xxx" <> softbreak <> - emph "xxx" <> space <> strong (emph "xxx") <> - space <> "xxx") - , "emph with spaced strong" =: - "*x **xx** x*" - =?> para (emph ("x" <> space <> strong "xx" <> space <> "x")) - , "intraword underscore with opening underscore (#1121)" =: - "_foot_ball_" =?> para (emph (text "foot_ball")) - ] - , testGroup "raw LaTeX" - [ "in URL" =: - "\\begin\n" =?> para (text "\\begin") - ] - , testGroup "raw HTML" - [ "nesting (issue #1330)" =: - "test" =?> - rawBlock "html" "" <> plain (str "test") <> - rawBlock "html" "" - , "invalid tag (issue #1820" =: - "" =?> - para (text "") - , "technically invalid comment" =: - "" =?> - rawBlock "html" "" - , test markdownGH "issue 2469" $ - "<\n\na>" =?> - para (text "<") <> para (text "a>") - ] - , testGroup "raw email addresses" - [ test markdownGH "issue 2940" $ - "**@user**" =?> - para (strong (text "@user")) - ] - , testGroup "emoji" - [ test markdownGH "emoji symbols" $ - ":smile: and :+1:" =?> para (text "😄 and 👍") - ] - , "unbalanced brackets" =: - "[[[[[[[[[[[[[[[hi" =?> para (text "[[[[[[[[[[[[[[[hi") - , testGroup "backslash escapes" - [ "in URL" =: - "[hi](/there\\))" - =?> para (link "/there)" "" "hi") - , "in title" =: - "[hi](/there \"a\\\"a\")" - =?> para (link "/there" "a\"a" "hi") - , "in reference link title" =: - "[hi]\n\n[hi]: /there (a\\)a)" - =?> para (link "/there" "a)a" "hi") - , "in reference link URL" =: - "[hi]\n\n[hi]: /there\\.0" - =?> para (link "/there.0" "" "hi") - ] - , testGroup "bare URIs" - (map testBareLink bareLinkTests) - , testGroup "autolinks" - [ "with unicode dash following" =: - "\8212" =?> para (autolink "http://foo.bar" <> - str "\8212") - , "a partial URL (#2277)" =: - "" =?> - para (text "") - , "with some attributes" =: - "{#i .j .z k=v}" =?> - para (autolinkWith ("i", ["j", "z"], [("k", "v")]) "http://foo.bar") - , "with some attributes and spaces" =: - " {#i .j .z k=v}" =?> - para (autolink "http://foo.bar" <> space <> text "{#i .j .z k=v}") - ] - , testGroup "links" - [ "no autolink inside link" =: - "[](url)" =?> - para (link "url" "" (text "")) - , "no inline link inside link" =: - "[[a](url2)](url)" =?> - para (link "url" "" (text "[a](url2)")) - , "no bare URI inside link" =: - "[https://example.org(](url)" =?> - para (link "url" "" (text "https://example.org(")) - ] - , testGroup "Headers" - [ "blank line before header" =: - "\n# Header\n" - =?> headerWith ("header",[],[]) 1 "Header" - , "bracketed text (#2062)" =: - "# [hi]\n" - =?> headerWith ("hi",[],[]) 1 "[hi]" - , "ATX header without trailing #s" =: - "# Foo bar\n\n" =?> - headerWith ("foo-bar",[],[]) 1 "Foo bar" - , "ATX header without trailing #s" =: - "# Foo bar with # #" =?> - headerWith ("foo-bar-with",[],[]) 1 "Foo bar with #" - , "setext header" =: - "Foo bar\n=\n\n Foo bar 2 \n=" =?> - headerWith ("foo-bar",[],[]) 1 "Foo bar" - <> headerWith ("foo-bar-2",[],[]) 1 "Foo bar 2" - ] - , testGroup "Implicit header references" - [ "ATX header without trailing #s" =: - "# Header\n[header]\n\n[header ]\n\n[ header]" =?> - headerWith ("header",[],[]) 1 "Header" - <> para (link "#header" "" (text "header")) - <> para (link "#header" "" (text "header")) - <> para (link "#header" "" (text "header")) - , "ATX header with trailing #s" =: - "# Foo bar #\n[foo bar]\n\n[foo bar ]\n\n[ foo bar]" =?> - headerWith ("foo-bar",[],[]) 1 "Foo bar" - <> para (link "#foo-bar" "" (text "foo bar")) - <> para (link "#foo-bar" "" (text "foo bar")) - <> para (link "#foo-bar" "" (text "foo bar")) - , "setext header" =: - " Header \n=\n\n[header]\n\n[header ]\n\n[ header]" =?> - headerWith ("header",[],[]) 1 "Header" - <> para (link "#header" "" (text "header")) - <> para (link "#header" "" (text "header")) - <> para (link "#header" "" (text "header")) - ] - , testGroup "smart punctuation" - [ test markdownSmart "quote before ellipses" - ("'...hi'" - =?> para (singleQuoted "…hi")) - , test markdownSmart "apostrophe before emph" - ("D'oh! A l'*aide*!" - =?> para ("D’oh! A l’" <> emph "aide" <> "!")) - , test markdownSmart "apostrophe in French" - ("À l'arrivée de la guerre, le thème de l'«impossibilité du socialisme»" - =?> para "À l’arrivée de la guerre, le thème de l’«impossibilité du socialisme»") - , test markdownSmart "apostrophe after math" $ -- issue #1909 - "The value of the $x$'s and the systems' condition." =?> - para (text "The value of the " <> math "x" <> text "\8217s and the systems\8217 condition.") - ] - , testGroup "footnotes" - [ "indent followed by newline and flush-left text" =: - "[^1]\n\n[^1]: my note\n\n \nnot in note\n" - =?> para (note (para "my note")) <> para "not in note" - , "indent followed by newline and indented text" =: - "[^1]\n\n[^1]: my note\n \n in note\n" - =?> para (note (para "my note" <> para "in note")) - , "recursive note" =: - "[^1]\n\n[^1]: See [^1]\n" - =?> para (note (para "See [^1]")) - ] - , testGroup "lhs" - [ test (purely $ readMarkdown def{ readerExtensions = enableExtension - Ext_literate_haskell pandocExtensions }) - "inverse bird tracks and html" $ - "> a\n\n< b\n\n
\n" - =?> codeBlockWith ("",["sourceCode","literate","haskell"],[]) "a" - <> - codeBlockWith ("",["sourceCode","haskell"],[]) "b" - <> - rawBlock "html" "
\n\n" - ] --- the round-trip properties frequently fail --- , testGroup "round trip" --- [ property "p_markdown_round_trip" p_markdown_round_trip --- ] - , testGroup "definition lists" - [ "no blank space" =: - "foo1\n : bar\n\nfoo2\n : bar2\n : bar3\n" =?> - definitionList [ (text "foo1", [plain (text "bar")]) - , (text "foo2", [plain (text "bar2"), - plain (text "bar3")]) - ] - , "blank space before first def" =: - "foo1\n\n : bar\n\nfoo2\n\n : bar2\n : bar3\n" =?> - definitionList [ (text "foo1", [para (text "bar")]) - , (text "foo2", [para (text "bar2"), - plain (text "bar3")]) - ] - , "blank space before second def" =: - "foo1\n : bar\n\nfoo2\n : bar2\n\n : bar3\n" =?> - definitionList [ (text "foo1", [plain (text "bar")]) - , (text "foo2", [plain (text "bar2"), - para (text "bar3")]) - ] - , "laziness" =: - "foo1\n : bar\nbaz\n : bar2\n" =?> - definitionList [ (text "foo1", [plain (text "bar" <> - softbreak <> text "baz"), - plain (text "bar2")]) - ] - , "no blank space before first of two paragraphs" =: - "foo1\n : bar\n\n baz\n" =?> - definitionList [ (text "foo1", [para (text "bar") <> - para (text "baz")]) - ] - , "first line not indented" =: - "foo\n: bar\n" =?> - definitionList [ (text "foo", [plain (text "bar")]) ] - , "list in definition" =: - "foo\n: - bar\n" =?> - definitionList [ (text "foo", [bulletList [plain (text "bar")]]) ] - , "in div" =: - "
foo\n: - bar\n
" =?> - divWith nullAttr (definitionList - [ (text "foo", [bulletList [plain (text "bar")]]) ]) - ] - , testGroup "+compact_definition_lists" - [ test markdownCDL "basic compact list" $ - "foo1\n: bar\n baz\nfoo2\n: bar2\n" =?> - definitionList [ (text "foo1", [plain (text "bar" <> softbreak <> - text "baz")]) - , (text "foo2", [plain (text "bar2")]) - ] - ] - , testGroup "lists" - [ "issue #1154" =: - " -
\n first div breaks\n
\n\n \n\n
\n with this div too.\n
\n" - =?> bulletList [divWith nullAttr (para $ text "first div breaks") <> - rawBlock "html" "" <> - divWith nullAttr (para $ text "with this div too.")] - , test markdownGH "issue #1636" $ - unlines [ "* a" - , "* b" - , "* c" - , " * d" ] - =?> - bulletList [ plain "a" - , plain "b" - , plain "c" <> bulletList [plain "d"] ] - ] - , testGroup "entities" - [ "character references" =: - "⟨ ö" =?> para (text "\10216 ö") - , "numeric" =: - ",DD" =?> para (text ",DD") - , "in link title" =: - "[link](/url \"title ⟨ ö ,\")" =?> - para (link "/url" "title \10216 ö ," (text "link")) - ] - , testGroup "citations" - [ "simple" =: - "@item1" =?> para (cite [ - Citation{ citationId = "item1" - , citationPrefix = [] - , citationSuffix = [] - , citationMode = AuthorInText - , citationNoteNum = 0 - , citationHash = 0 - } - ] "@item1") - , "key starts with digit" =: - "@1657:huyghens" =?> para (cite [ - Citation{ citationId = "1657:huyghens" - , citationPrefix = [] - , citationSuffix = [] - , citationMode = AuthorInText - , citationNoteNum = 0 - , citationHash = 0 - } - ] "@1657:huyghens") - ] - , let citation = cite [Citation "cita" [] [] AuthorInText 0 0] (str "@cita") - in testGroup "footnote/link following citation" -- issue #2083 - [ "footnote" =: - unlines [ "@cita[^note]" - , "" - , "[^note]: note" ] =?> - para ( - citation <> note (para $ str "note") - ) - , "normal link" =: - "@cita [link](http://www.com)" =?> - para ( - citation <> space <> link "http://www.com" "" (str "link") - ) - , "reference link" =: - unlines [ "@cita [link][link]" - , "" - , "[link]: http://www.com" ] =?> - para ( - citation <> space <> link "http://www.com" "" (str "link") - ) - , "short reference link" =: - unlines [ "@cita [link]" - , "" - , "[link]: http://www.com" ] =?> - para ( - citation <> space <> link "http://www.com" "" (str "link") - ) - , "implicit header link" =: - unlines [ "# Header" - , "@cita [Header]" ] =?> - headerWith ("header",[],[]) 1 (str "Header") <> para ( - citation <> space <> link "#header" "" (str "Header") - ) - , "regular citation" =: - "@cita [foo]" =?> - para ( - cite [Citation "cita" [] [Str "foo"] AuthorInText 0 0] - (str "@cita" <> space <> str "[foo]") - ) - ] - ] -- cgit v1.2.3