summaryrefslogtreecommitdiff
diff options
context:
space:
mode:
authorRobin H. Johnson <robbat2@gentoo.org>2015-08-08 13:49:04 -0700
committerRobin H. Johnson <robbat2@gentoo.org>2015-08-08 17:38:18 -0700
commit56bd759df1d0c750a065b8c845e93d5dfa6b549d (patch)
tree3f91093cdb475e565ae857f1c5a7fd339e2d781e /app-text/pandoc/files
downloadgentoo-56bd759df1d0c750a065b8c845e93d5dfa6b549d.tar.gz
gentoo-56bd759df1d0c750a065b8c845e93d5dfa6b549d.tar.bz2
gentoo-56bd759df1d0c750a065b8c845e93d5dfa6b549d.zip
proj/gentoo: Initial commit
This commit represents a new era for Gentoo: Storing the gentoo-x86 tree in Git, as converted from CVS. This commit is the start of the NEW history. Any historical data is intended to be grafted onto this point. Creation process: 1. Take final CVS checkout snapshot 2. Remove ALL ChangeLog* files 3. Transform all Manifests to thin 4. Remove empty Manifests 5. Convert all stale $Header$/$Id$ CVS keywords to non-expanded Git $Id$ 5.1. Do not touch files with -kb/-ko keyword flags. Signed-off-by: Robin H. Johnson <robbat2@gentoo.org> X-Thanks: Alec Warner <antarus@gentoo.org> - did the GSoC 2006 migration tests X-Thanks: Robin H. Johnson <robbat2@gentoo.org> - infra guy, herding this project X-Thanks: Nguyen Thai Ngoc Duy <pclouds@gentoo.org> - Former Gentoo developer, wrote Git features for the migration X-Thanks: Brian Harring <ferringb@gentoo.org> - wrote much python to improve cvs2svn X-Thanks: Rich Freeman <rich0@gentoo.org> - validation scripts X-Thanks: Patrick Lauer <patrick@gentoo.org> - Gentoo dev, running new 2014 work in migration X-Thanks: Michał Górny <mgorny@gentoo.org> - scripts, QA, nagging X-Thanks: All of other Gentoo developers - many ideas and lots of paint on the bikeshed
Diffstat (limited to 'app-text/pandoc/files')
-rw-r--r--app-text/pandoc/files/pandoc-1.11.1-highlighting-kate-0.5.5-tests.patch42
-rw-r--r--app-text/pandoc/files/pandoc-1.11.1-no-man-tests.patch24
-rw-r--r--app-text/pandoc/files/pandoc-1.11.1-tagsoup-0.13.patch62
-rw-r--r--app-text/pandoc/files/pandoc-1.11.1-test.patch42
-rw-r--r--app-text/pandoc/files/pandoc-1.13.2-ghc-7.10.patch251
-rw-r--r--app-text/pandoc/files/pandoc-1.15.0.6-no-https.patch12
6 files changed, 433 insertions, 0 deletions
diff --git a/app-text/pandoc/files/pandoc-1.11.1-highlighting-kate-0.5.5-tests.patch b/app-text/pandoc/files/pandoc-1.11.1-highlighting-kate-0.5.5-tests.patch
new file mode 100644
index 000000000000..0ba930f4cfed
--- /dev/null
+++ b/app-text/pandoc/files/pandoc-1.11.1-highlighting-kate-0.5.5-tests.patch
@@ -0,0 +1,42 @@
+--- pandoc-1.11.1-orig/tests/lhs-test.html+lhs 2013-03-18 09:26:59.000000000 +1100
++++ pandoc-1.11.1/tests/lhs-test.html+lhs 2013-09-14 10:27:51.318546683 +1000
+@@ -30,7 +30,7 @@
+ <h1>lhs test</h1>
+ <p><code>unsplit</code> is an arrow that takes a pair of values and combines them to return a single value:</p>
+ <pre class="sourceCode literate literatehaskell"><code class="sourceCode literatehaskell"><span class="ot">&gt; unsplit ::</span> (<span class="dt">Arrow</span> a) <span class="ot">=&gt;</span> (b <span class="ot">-&gt;</span> c <span class="ot">-&gt;</span> d) <span class="ot">-&gt;</span> a (b, c) d
+-<span class="ot">&gt;</span> unsplit <span class="fu">=</span> arr <span class="fu">.</span> <span class="fu">uncurry</span>
++<span class="ot">&gt;</span> unsplit <span class="fu">=</span> arr <span class="fu">.</span> uncurry
+ <span class="ot">&gt;</span> <span class="co">-- arr (\op (x,y) -&gt; x `op` y)</span></code></pre>
+ <p><code>(***)</code> combines two arrows into a new arrow by running the two arrows on a pair of values (one arrow on the first item of the pair and one arrow on the second item of the pair).</p>
+ <pre><code>f *** g = first f &gt;&gt;&gt; second g</code></pre>
+--- pandoc-1.11.1-orig/tests/lhs-test.html 2013-03-18 09:26:59.000000000 +1100
++++ pandoc-1.11.1/tests/lhs-test.html 2013-09-14 10:27:28.671546899 +1000
+@@ -30,7 +30,7 @@
+ <h1>lhs test</h1>
+ <p><code>unsplit</code> is an arrow that takes a pair of values and combines them to return a single value:</p>
+ <pre class="sourceCode literate haskell"><code class="sourceCode haskell"><span class="ot">unsplit ::</span> (<span class="dt">Arrow</span> a) <span class="ot">=&gt;</span> (b <span class="ot">-&gt;</span> c <span class="ot">-&gt;</span> d) <span class="ot">-&gt;</span> a (b, c) d
+-unsplit <span class="fu">=</span> arr <span class="fu">.</span> <span class="fu">uncurry</span>
++unsplit <span class="fu">=</span> arr <span class="fu">.</span> uncurry
+ <span class="co">-- arr (\op (x,y) -&gt; x `op` y)</span></code></pre>
+ <p><code>(***)</code> combines two arrows into a new arrow by running the two arrows on a pair of values (one arrow on the first item of the pair and one arrow on the second item of the pair).</p>
+ <pre><code>f *** g = first f &gt;&gt;&gt; second g</code></pre>
+--- pandoc-1.11.1-orig/tests/lhs-test.latex 2013-09-14 10:46:07.412536229 +1000
++++ pandoc-1.11.1/tests/lhs-test.latex 2013-09-14 10:45:51.638536380 +1000
+@@ -21,7 +21,7 @@
+ \usepackage{color}
+ \usepackage{fancyvrb}
+ \newcommand{\VerbBar}{|}
+-\DefineShortVerb[commandchars=\\\{\}]{\|}
++\newcommand{\VERB}{\Verb[commandchars=\\\{\}]}
+ \DefineVerbatimEnvironment{Highlighting}{Verbatim}{commandchars=\\\{\}}
+ % Add ',fontsize=\small' for more characters per line
+ \newenvironment{Shaded}{}{}
+@@ -73,7 +73,7 @@
+ \begin{Shaded}
+ \begin{Highlighting}[]
+ \OtherTok{unsplit ::} \NormalTok{(}\DataTypeTok{Arrow} \NormalTok{a) }\OtherTok{=>} \NormalTok{(b }\OtherTok{->} \NormalTok{c }\OtherTok{->} \NormalTok{d) }\OtherTok{->} \NormalTok{a (b, c) d}
+-\NormalTok{unsplit }\FunctionTok{=} \NormalTok{arr }\FunctionTok{.} \FunctionTok{uncurry}
++\NormalTok{unsplit }\FunctionTok{=} \NormalTok{arr }\FunctionTok{.} \NormalTok{uncurry}
+ \CommentTok{-- arr (\textbackslash{}op (x,y) -> x `op` y)}
+ \end{Highlighting}
+ \end{Shaded}
diff --git a/app-text/pandoc/files/pandoc-1.11.1-no-man-tests.patch b/app-text/pandoc/files/pandoc-1.11.1-no-man-tests.patch
new file mode 100644
index 000000000000..93528d31204e
--- /dev/null
+++ b/app-text/pandoc/files/pandoc-1.11.1-no-man-tests.patch
@@ -0,0 +1,24 @@
+Fails on ghc-7.6 only as:
+
+ tables.man
+ ../dist/build/pandoc/pandoc --data-dir .. tables.native -r native -w man --columns=78
+- 141 cw(10.50n) lw(9.63n) rw(11.38n) lw(23.63n).
++ 141 cw(10.50n) lw(9.62n) rw(11.38n) lw(23.62n).
+- 177 cw(10.50n) lw(9.63n) rw(11.38n) lw(23.63n).
++ 177 cw(10.50n) lw(9.62n) rw(11.38n) lw(23.62n).
+- 247 cw(10.50n) lw(9.63n) rw(11.38n) lw(23.63n).
++ 247 cw(10.50n) lw(9.62n) rw(11.38n) lw(23.62n).
+
+diff --git a/tests/Tests/Old.hs b/tests/Tests/Old.hs
+index 9e74935..d4cf2a9 100644
+--- a/tests/Tests/Old.hs
++++ b/tests/Tests/Old.hs
+@@ -126,7 +126,7 @@ tests = [ testGroup "markdown"
+ ]
+ , testGroup "other writers" $ map (\f -> testGroup f $ writerTests f)
+ [ "opendocument" , "context" , "texinfo"
+- , "man" , "plain" , "rtf", "org", "asciidoc"
++ {- , "man" -} , "plain" , "rtf", "org", "asciidoc"
+ ]
+ ]
+
diff --git a/app-text/pandoc/files/pandoc-1.11.1-tagsoup-0.13.patch b/app-text/pandoc/files/pandoc-1.11.1-tagsoup-0.13.patch
new file mode 100644
index 000000000000..ed3c3e89a0be
--- /dev/null
+++ b/app-text/pandoc/files/pandoc-1.11.1-tagsoup-0.13.patch
@@ -0,0 +1,62 @@
+--- pandoc-1.11.1-orig/pandoc.cabal 2013-03-18 09:26:59.000000000 +1100
++++ pandoc-1.11.1/pandoc.cabal 2013-08-10 12:52:49.969834000 +1000
+@@ -232,7 +232,7 @@
+ citeproc-hs >= 0.3.7 && < 0.4,
+ pandoc-types >= 1.10 && < 1.11,
+ json >= 0.4 && < 0.8,
+- tagsoup >= 0.12.5 && < 0.13,
++ tagsoup >= 0.12.5 && < 0.14,
+ base64-bytestring >= 0.1 && < 1.1,
+ zlib >= 0.5 && < 0.6,
+ highlighting-kate >= 0.5.3.7 && < 0.6,
+--- /dev/null 2013-08-09 12:59:27.506999856 +1000
++++ pandoc-1.11.1/src/Text/Pandoc/Compat/TagSoupEntity.hs 2013-08-10 12:28:14.261739000 +1000
+@@ -0,0 +1,15 @@
++{-# LANGUAGE CPP #-}
++module Text.Pandoc.Compat.TagSoupEntity (lookupEntity
++ ) where
++
++import qualified Text.HTML.TagSoup.Entity as TE
++
++lookupEntity :: String -> Maybe Char
++#if MIN_VERSION_tagsoup(0,13,0)
++lookupEntity = str2chr . TE.lookupEntity
++ where str2chr :: Maybe String -> Maybe Char
++ str2chr (Just [c]) = Just c
++ str2chr _ = Nothing
++#else
++lookupEntity = TE.lookupEntity
++#endif
+--- pandoc-1.11.1-orig/src/Text/Pandoc/Parsing.hs 2013-03-18 09:26:57.000000000 +1100
++++ pandoc-1.11.1/src/Text/Pandoc/Parsing.hs 2013-08-10 12:28:14.262814000 +1000
+@@ -159,7 +159,7 @@
+ import Text.Pandoc.Shared
+ import qualified Data.Map as M
+ import Text.TeXMath.Macros (applyMacros, Macro, parseMacroDefinitions)
+-import Text.HTML.TagSoup.Entity ( lookupEntity )
++import Text.Pandoc.Compat.TagSoupEntity ( lookupEntity )
+ import Data.Default
+ import qualified Data.Set as Set
+ import Control.Monad.Reader
+--- pandoc-1.11.1-orig/src/Text/Pandoc/Readers/DocBook.hs 2013-03-18 09:26:57.000000000 +1100
++++ pandoc-1.11.1/src/Text/Pandoc/Readers/DocBook.hs 2013-08-10 12:28:14.264936000 +1000
+@@ -4,7 +4,7 @@
+ import Text.Pandoc.Definition
+ import Text.Pandoc.Builder
+ import Text.XML.Light
+-import Text.HTML.TagSoup.Entity (lookupEntity)
++import Text.Pandoc.Compat.TagSoupEntity (lookupEntity)
+ import Data.Generics
+ import Data.Monoid
+ import Data.Char (isSpace)
+--- pandoc-1.11.1-orig/src/Text/Pandoc/XML.hs 2013-03-18 09:26:57.000000000 +1100
++++ pandoc-1.11.1/src/Text/Pandoc/XML.hs 2013-08-10 12:28:17.333957000 +1000
+@@ -39,7 +39,7 @@
+
+ import Text.Pandoc.Pretty
+ import Data.Char (ord, isAscii, isSpace)
+-import Text.HTML.TagSoup.Entity (lookupEntity)
++import Text.Pandoc.Compat.TagSoupEntity (lookupEntity)
+
+ -- | Remove everything between <...>
+ stripTags :: String -> String
diff --git a/app-text/pandoc/files/pandoc-1.11.1-test.patch b/app-text/pandoc/files/pandoc-1.11.1-test.patch
new file mode 100644
index 000000000000..d5d1e894d505
--- /dev/null
+++ b/app-text/pandoc/files/pandoc-1.11.1-test.patch
@@ -0,0 +1,42 @@
+commit fa978e13658f76be109243224f7491550db74240
+Author: John MacFarlane <fiddlosopher@gmail.com>
+Date: Tue May 7 20:22:09 2013 -0700
+
+ Use latest highlighting-kate and texmath.
+
+ Closes #849.
+
+diff --git a/pandoc.cabal b/pandoc.cabal
+index 5f290a9..ea9e850 100644
+--- a/pandoc.cabal
++++ b/pandoc.cabal
+@@ -241,7 +241,7 @@ Library
+ old-locale >= 1 && < 1.1,
+ time >= 1.2 && < 1.5,
+ HTTP >= 4000.0.5 && < 4000.3,
+- texmath >= 0.6.1.3 && < 0.7,
++ texmath >= 0.6.1.5 && < 0.7,
+ xml >= 1.3.12 && < 1.4,
+ random >= 1 && < 1.1,
+ extensible-exceptions >= 0.1 && < 0.2,
+@@ -251,7 +251,7 @@ Library
+ tagsoup >= 0.12.5 && < 0.13,
+ base64-bytestring >= 0.1 && < 1.1,
+ zlib >= 0.5 && < 0.6,
+- highlighting-kate >= 0.5.3.7 && < 0.6,
++ highlighting-kate >= 0.5.3.9 && < 0.6,
+ data-default >= 0.4 && < 0.6,
+ temporary >= 1.1 && < 1.2,
+ blaze-html >= 0.5 && < 0.7,
+diff --git a/tests/lhs-test.latex b/tests/lhs-test.latex
+index 16e9a79..2a5025a 100644
+--- a/tests/lhs-test.latex
++++ b/tests/lhs-test.latex
+@@ -22,6 +22,7 @@
+ \IfFileExists{microtype.sty}{\usepackage{microtype}}{}
+ \usepackage{color}
+ \usepackage{fancyvrb}
++\newcommand{\VerbBar}{|}
+ \DefineShortVerb[commandchars=\\\{\}]{\|}
+ \DefineVerbatimEnvironment{Highlighting}{Verbatim}{commandchars=\\\{\}}
+ % Add ',fontsize=\small' for more characters per line
diff --git a/app-text/pandoc/files/pandoc-1.13.2-ghc-7.10.patch b/app-text/pandoc/files/pandoc-1.13.2-ghc-7.10.patch
new file mode 100644
index 000000000000..3ed96c2a1b94
--- /dev/null
+++ b/app-text/pandoc/files/pandoc-1.13.2-ghc-7.10.patch
@@ -0,0 +1,251 @@
+--- pandoc-1.13.2-orig/pandoc.cabal 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/pandoc.cabal 2015-01-05 10:39:17.951823846 +1100
+@@ -250,7 +250,7 @@
+ hslua >= 0.3 && < 0.4,
+ binary >= 0.5 && < 0.8,
+ SHA >= 1.6 && < 1.7,
+- haddock-library >= 1.1 && < 1.2,
++ haddock-library >= 1.1 && < 1.3,
+ old-time,
+ deepseq-generics >= 0.1 && < 0.2,
+ JuicyPixels >= 3.1.6.1 && < 3.3
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Readers/Haddock.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Readers/Haddock.hs 2015-01-05 14:24:34.371820789 +1100
+@@ -1,3 +1,4 @@
++{-# LANGUAGE CPP #-}
+ {- |
+ Module : Text.Pandoc.Readers.Haddock
+ Copyright : Copyright (C) 2013 David Lazar
+@@ -29,7 +30,12 @@
+ readHaddock :: ReaderOptions -- ^ Reader options
+ -> String -- ^ String to parse
+ -> Pandoc
+-readHaddock opts = B.doc . docHToBlocks . trace' . parseParas
++readHaddock opts =
++#if MIN_VERSION_haddock_library(1,2,0)
++ B.doc . docHToBlocks . trace' . _doc . parseParas
++#else
++ B.doc . docHToBlocks . trace' . parseParas
++#endif
+ where trace' x = if readerTrace opts
+ then trace (show x) x
+ else x
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Readers/LaTeX.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Readers/LaTeX.hs 2015-01-05 11:20:35.193045904 +1100
+@@ -592,7 +592,7 @@
+
+ unescapeURL :: String -> String
+ unescapeURL ('\\':x:xs) | isEscapable x = x:unescapeURL xs
+- where isEscapable c = c `elem` "#$%&~_^\\{}"
++ where isEscapable c = c `elem` ("#$%&~_^\\{}" :: String)
+ unescapeURL (x:xs) = x:unescapeURL xs
+ unescapeURL [] = ""
+
+@@ -1224,7 +1224,7 @@
+ <* optional sp
+ <* optional (char ',')
+ <* optional sp)
+- where isBibtexKeyChar c = isAlphaNum c || c `elem` ".:;?!`'()/*@_+=-[]*"
++ where isBibtexKeyChar c = isAlphaNum c || c `elem` (".:;?!`'()/*@_+=-[]*" :: String)
+
+ cites :: CitationMode -> Bool -> LP [Citation]
+ cites mode multi = try $ do
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Readers/Org.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Readers/Org.hs 2015-01-05 11:24:53.294689830 +1100
+@@ -1,5 +1,6 @@
+ {-# LANGUAGE OverloadedStrings #-}
+ {-# LANGUAGE GeneralizedNewtypeDeriving #-}
++{-# LANGUAGE FlexibleContexts #-}
+ {-
+ Copyright (C) 2014 Albert Krewinkel <tarleb@moltkeplatz.de>
+
+@@ -1168,7 +1169,7 @@
+
+ isUri :: String -> Bool
+ isUri s = let (scheme, path) = break (== ':') s
+- in all (\c -> isAlphaNum c || c `elem` ".-") scheme
++ in all (\c -> isAlphaNum c || c `elem` (".-" :: String)) scheme
+ && not (null path)
+
+ isAbsoluteFilePath :: String -> Bool
+@@ -1214,7 +1215,7 @@
+ solidify = map replaceSpecialChar
+ where replaceSpecialChar c
+ | isAlphaNum c = c
+- | c `elem` "_.-:" = c
++ | c `elem` ("_.-:" :: String) = c
+ | otherwise = '-'
+
+ -- | Parses an inline code block and marks it as an babel block.
+@@ -1465,7 +1466,7 @@
+ parseAsMathMLSym :: String -> Maybe Inlines
+ parseAsMathMLSym cs = B.str <$> MathMLEntityMap.getUnicode (clean cs)
+ -- dropWhileEnd would be nice here, but it's not available before base 4.5
+- where clean = reverse . dropWhile (`elem` "{}") . reverse . drop 1
++ where clean = reverse . dropWhile (`elem` ("{}" :: String)) . reverse . drop 1
+
+ state :: ParserState
+ state = def{ stateOptions = def{ readerParseRaw = True }}
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Readers/RST.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Readers/RST.hs 2015-01-05 11:21:59.819266953 +1100
+@@ -1,4 +1,5 @@
+ {-# LANGUAGE OverloadedStrings #-}
++{-# LANGUAGE FlexibleContexts #-}
+ {-
+ Copyright (C) 2006-2014 John MacFarlane <jgm@berkeley.edu>
+
+@@ -708,7 +709,7 @@
+ toChunks :: String -> [String]
+ toChunks = dropWhile null
+ . map (trim . unlines)
+- . splitBy (all (`elem` " \t")) . lines
++ . splitBy (all (`elem` (" \t" :: String))) . lines
+
+ codeblock :: Maybe String -> String -> String -> RSTParser Blocks
+ codeblock numberLines lang body =
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Readers/TWiki.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Readers/TWiki.hs 2015-01-05 11:25:22.450138135 +1100
+@@ -1,4 +1,4 @@
+-{-# LANGUAGE RelaxedPolyRec, FlexibleInstances, TypeSynonymInstances #-}
++{-# LANGUAGE RelaxedPolyRec, FlexibleInstances, TypeSynonymInstances, FlexibleContexts #-}
+ -- RelaxedPolyRec needed for inlinesBetween on GHC < 7
+ {-
+ Copyright (C) 2014 Alexander Sulfrian <alexander.sulfrian@fu-berlin.de>
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Templates.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Templates.hs 2015-01-05 10:45:45.255969737 +1100
+@@ -124,7 +124,7 @@
+ -> String -- ^ Name of writer
+ -> IO (Either E.IOException String)
+ getDefaultTemplate user writer = do
+- let format = takeWhile (`notElem` "+-") writer -- strip off extensions
++ let format = takeWhile (`notElem` ("+-" :: String)) writer -- strip off extensions
+ case format of
+ "native" -> return $ Right ""
+ "json" -> return $ Right ""
+@@ -288,7 +288,7 @@
+ reservedWords = ["else","endif","for","endfor","sep"]
+
+ skipEndline :: Parser ()
+-skipEndline = P.try $ P.skipMany (P.satisfy (`elem` " \t")) >> P.char '\n' >> return ()
++skipEndline = P.try $ P.skipMany (P.satisfy (`elem` (" \t" :: String))) >> P.char '\n' >> return ()
+
+ pConditional :: Parser Template
+ pConditional = do
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Writers/ConTeXt.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Writers/ConTeXt.hs 2015-01-05 11:36:04.213852145 +1100
+@@ -119,7 +119,7 @@
+ toLabel :: String -> String
+ toLabel z = concatMap go z
+ where go x
+- | elem x "\\#[]\",{}%()|=" = "ux" ++ printf "%x" (ord x)
++ | elem x ("\\#[]\",{}%()|=" :: String) = "ux" ++ printf "%x" (ord x)
+ | otherwise = [x]
+
+ -- | Convert Elements to ConTeXt
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Writers/EPUB.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Writers/EPUB.hs 2015-01-05 11:35:29.166882307 +1100
+@@ -1,4 +1,4 @@
+-{-# LANGUAGE PatternGuards, CPP, ScopedTypeVariables, ViewPatterns #-}
++{-# LANGUAGE PatternGuards, CPP, ScopedTypeVariables, ViewPatterns, FlexibleContexts #-}
+ {-
+ Copyright (C) 2010-2014 John MacFarlane <jgm@berkeley.edu>
+
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Writers/ICML.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Writers/ICML.hs 2015-01-05 11:35:07.163880901 +1100
+@@ -1,4 +1,4 @@
+-{-# LANGUAGE OverloadedStrings #-}
++{-# LANGUAGE OverloadedStrings, FlexibleContexts #-}
+
+ {- |
+ Module : Text.Pandoc.Writers.ICML
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Writers/LaTeX.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Writers/LaTeX.hs 2015-01-05 11:32:29.461099578 +1100
+@@ -240,7 +240,7 @@
+ where go [] = ""
+ go (x:xs)
+ | (isLetter x || isDigit x) && isAscii x = x:go xs
+- | elem x "-+=:;." = x:go xs
++ | elem x ("-+=:;." :: String) = x:go xs
+ | otherwise = "ux" ++ printf "%x" (ord x) ++ go xs
+
+ -- | Puts contents into LaTeX command.
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Writers/Markdown.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Writers/Markdown.hs 2015-01-05 11:34:25.437241616 +1100
+@@ -323,9 +323,9 @@
+ then Just $ writerColumns opts
+ else Nothing
+ let rendered = render colwidth contents
+- let escapeDelimiter (x:xs) | x `elem` ".()" = '\\':x:xs
+- | otherwise = x : escapeDelimiter xs
+- escapeDelimiter [] = []
++ let escapeDelimiter (x:xs) | x `elem` (".()" :: String) = '\\':x:xs
++ | otherwise = x : escapeDelimiter xs
++ escapeDelimiter [] = []
+ let contents' = if isEnabled Ext_all_symbols_escapable opts &&
+ not (stPlain st) && beginsWithOrderedListMarker rendered
+ then text $ escapeDelimiter rendered
+@@ -681,7 +681,7 @@
+ mapM (inlineToMarkdown opts) (avoidBadWraps lst) >>= return . cat
+ where avoidBadWraps [] = []
+ avoidBadWraps (Space:Str (c:cs):xs)
+- | c `elem` "-*+>" = Str (' ':c:cs) : avoidBadWraps xs
++ | c `elem` ("-*+>" :: String) = Str (' ':c:cs) : avoidBadWraps xs
+ avoidBadWraps (x:xs) = x : avoidBadWraps xs
+
+ escapeSpaces :: Inline -> Inline
+@@ -821,8 +821,8 @@
+ sdoc <- inlineListToMarkdown opts sinlines
+ let k' = text (modekey m ++ "@" ++ k)
+ r = case sinlines of
+- Str (y:_):_ | y `elem` ",;]@" -> k' <> sdoc
+- _ -> k' <+> sdoc
++ Str (y:_):_ | y `elem` (",;]@" :: String) -> k' <> sdoc
++ _ -> k' <+> sdoc
+ return $ pdoc <+> r
+ modekey SuppressAuthor = "-"
+ modekey _ = ""
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Writers/OpenDocument.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Writers/OpenDocument.hs 2015-01-05 11:36:22.915591722 +1100
+@@ -1,4 +1,4 @@
+-{-# LANGUAGE PatternGuards, OverloadedStrings #-}
++{-# LANGUAGE PatternGuards, OverloadedStrings, FlexibleContexts #-}
+ {-
+ Copyright (C) 2008-2014 Andrea Rossato <andrea.rossato@ing.unitn.it>
+ and John MacFarlane.
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Writers/RST.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Writers/RST.hs 2015-01-05 11:32:00.815007351 +1100
+@@ -105,7 +105,7 @@
+ -> State WriterState Doc
+ keyToRST (label, (src, _)) = do
+ label' <- inlineListToRST label
+- let label'' = if ':' `elem` (render Nothing label')
++ let label'' = if ':' `elem` ((render Nothing label') :: String)
+ then char '`' <> label' <> char '`'
+ else label'
+ return $ nowrap $ ".. _" <> label'' <> ": " <> text src
+@@ -333,12 +333,12 @@
+ okAfterComplex :: Inline -> Bool
+ okAfterComplex Space = True
+ okAfterComplex LineBreak = True
+- okAfterComplex (Str (c:_)) = isSpace c || c `elem` "-.,:;!?\\/'\")]}>–—"
++ okAfterComplex (Str (c:_)) = isSpace c || c `elem` ("-.,:;!?\\/'\")]}>–—" :: String)
+ okAfterComplex _ = False
+ okBeforeComplex :: Inline -> Bool
+ okBeforeComplex Space = True
+ okBeforeComplex LineBreak = True
+- okBeforeComplex (Str (c:_)) = isSpace c || c `elem` "-:/'\"<([{–—"
++ okBeforeComplex (Str (c:_)) = isSpace c || c `elem` ("-:/'\"<([{–—" :: String)
+ okBeforeComplex _ = False
+ isComplex :: Inline -> Bool
+ isComplex (Emph _) = True
+--- pandoc-1.13.2-orig/src/Text/Pandoc/Writers/Texinfo.hs 2014-12-20 19:18:27.000000000 +1100
++++ pandoc-1.13.2/src/Text/Pandoc/Writers/Texinfo.hs 2015-01-05 11:33:07.407217820 +1100
+@@ -368,7 +368,7 @@
+
+ -- periods, commas, colons, and parentheses are disallowed in node names
+ disallowedInNode :: Char -> Bool
+-disallowedInNode c = c `elem` ".,:()"
++disallowedInNode c = c `elem` (".,:()" :: String)
+
+ -- | Convert inline element to Texinfo
+ inlineToTexinfo :: Inline -- ^ Inline to convert
diff --git a/app-text/pandoc/files/pandoc-1.15.0.6-no-https.patch b/app-text/pandoc/files/pandoc-1.15.0.6-no-https.patch
new file mode 100644
index 000000000000..7e0f4d375a71
--- /dev/null
+++ b/app-text/pandoc/files/pandoc-1.15.0.6-no-https.patch
@@ -0,0 +1,12 @@
+diff --git a/src/Text/Pandoc/Shared.hs b/src/Text/Pandoc/Shared.hs
+index ef9f66a..50b0ec4 100644
+--- a/src/Text/Pandoc/Shared.hs
++++ b/src/Text/Pandoc/Shared.hs
+@@ -143,2 +143,3 @@ import Paths_pandoc (getDataFileName)
+ #endif
++import Codec.Archive.Zip
+ #ifdef HTTP_CLIENT
+@@ -152,3 +153,2 @@ import Network.HTTP.Types.Header ( hContentType)
+ import Network (withSocketsDo)
+-import Codec.Archive.Zip
+ #else