From dc9c6450f3b16592d0ee865feafc17b670e4ad14 Mon Sep 17 00:00:00 2001 From: fiddlosopher Date: Wed, 20 Dec 2006 06:50:14 +0000 Subject: + Added module data for haddock. + Reformatted code consistently. git-svn-id: https://pandoc.googlecode.com/svn/trunk@252 788f1e2b-df1e-0410-8736-df70ead52e1b --- src/Text/Pandoc/Readers/RST.hs | 631 +++++++++++++++++++++-------------------- 1 file changed, 325 insertions(+), 306 deletions(-) (limited to 'src/Text/Pandoc/Readers/RST.hs') diff --git a/src/Text/Pandoc/Readers/RST.hs b/src/Text/Pandoc/Readers/RST.hs index 69c7d9baa..1672e06dc 100644 --- a/src/Text/Pandoc/Readers/RST.hs +++ b/src/Text/Pandoc/Readers/RST.hs @@ -1,4 +1,14 @@ --- | Parse reStructuredText and return Pandoc document. +{- | + Module : Text.Pandoc.Readers.RST + Copyright : Copyright (C) 2006 John MacFarlane + License : GNU GPL, version 2 or above + + Maintainer : John MacFarlane + Stability : unstable + Portability : portable + +Conversion from reStructuredText to 'Pandoc' document. +-} module Text.Pandoc.Readers.RST ( readRST ) where @@ -61,16 +71,14 @@ promoteHeaders num [] = [] -- promote all the other headers. titleTransform :: [Block] -- ^ list of blocks -> ([Block], [Inline]) -- ^ modified list of blocks, title -titleTransform ((Header 1 head1):(Header 2 head2):rest) = -- title and subtitle - if (any isHeader1 rest) || (any isHeader2 rest) then - ((Header 1 head1):(Header 2 head2):rest, []) - else - ((promoteHeaders 2 rest), head1 ++ [Str ":", Space] ++ head2) +titleTransform ((Header 1 head1):(Header 2 head2):rest) = -- title subtitle + if (any isHeader1 rest) || (any isHeader2 rest) + then ((Header 1 head1):(Header 2 head2):rest, []) + else ((promoteHeaders 2 rest), head1 ++ [Str ":", Space] ++ head2) titleTransform ((Header 1 head1):rest) = -- title, no subtitle - if (any isHeader1 rest) then - ((Header 1 head1):rest, []) - else - ((promoteHeaders 1 rest), head1) + if (any isHeader1 rest) + then ((Header 1 head1):rest, []) + else ((promoteHeaders 1 rest), head1) titleTransform blocks = (blocks, []) parseRST = do @@ -78,17 +86,18 @@ parseRST = do input <- getInput blocks <- parseBlocks -- first pass let anonymousKeys = filter isAnonKeyBlock blocks - let blocks' = if (null anonymousKeys) then - blocks - else -- run parser again to fill in anonymous links... - case runParser parseBlocks (state { stateKeyBlocks = anonymousKeys }) + let blocks' = if (null anonymousKeys) + then blocks + else -- run parser again to fill in anonymous links... + case runParser parseBlocks + (state { stateKeyBlocks = anonymousKeys }) "RST source, second pass" input of - Left err -> error $ "\nError:\n" ++ show err - Right result -> (filter isNotAnonKeyBlock result) - let (blocks'', title) = if stateStandalone state then - titleTransform blocks' - else - (blocks', []) + Left err -> error $ "\nError:\n" ++ show err + Right result -> + (filter isNotAnonKeyBlock result) + let (blocks'', title) = if stateStandalone state + then titleTransform blocks' + else (blocks', []) state <- getState let authors = stateAuthors state let date = stateDate state @@ -103,9 +112,10 @@ parseBlocks = do result <- manyTill block eof return result -block = choice [ codeBlock, rawHtmlBlock, rawLaTeXBlock, blockQuote, referenceKey, - imageBlock, unknownDirective, header, hrule, list, fieldList, lineBlock, - para, plain, blankBlock, nullBlock ] "block" +block = choice [ codeBlock, rawHtmlBlock, rawLaTeXBlock, blockQuote, + referenceKey, imageBlock, unknownDirective, header, + hrule, list, fieldList, lineBlock, para, plain, + blankBlock, nullBlock ] "block" -- -- field list @@ -117,28 +127,32 @@ fieldListItem = try (do string ": " skipSpaces first <- manyTill anyChar newline - rest <- many (do{ notFollowedBy (char ':'); - notFollowedBy blankline; - skipSpaces; - manyTill anyChar newline }) + rest <- many (do + notFollowedBy (char ':') + notFollowedBy blankline + skipSpaces + manyTill anyChar newline ) return (name, (joinWithSep " " (first:rest)))) fieldList = try (do items <- many1 fieldListItem blanklines let authors = case (lookup "Authors" items) of - Just auth -> [auth] - Nothing -> map snd (filter (\(x,y) -> x == "Author") items) + Just auth -> [auth] + Nothing -> map snd (filter (\(x,y) -> x == "Author") items) let date = case (lookup "Date" items) of - Just dat -> dat - Nothing -> "" + Just dat -> dat + Nothing -> "" let title = case (lookup "Title" items) of - Just tit -> [Str tit] - Nothing -> [] - let remaining = filter (\(x,y) -> (x /= "Authors") && (x /= "Author") && (x /= "Date") && - (x /= "Title")) items - let result = map (\(x,y) -> Para [Strong [Str x], Str ":", Space, Str y]) remaining - updateState (\st -> st { stateAuthors = authors, stateDate = date, stateTitle = title }) + Just tit -> [Str tit] + Nothing -> [] + let remaining = filter (\(x,y) -> (x /= "Authors") && (x /= "Author") && + (x /= "Date") && (x /= "Title")) items + let result = map (\(x,y) -> + Para [Strong [Str x], Str ":", Space, Str y]) remaining + updateState (\st -> st { stateAuthors = authors, + stateDate = date, + stateTitle = title }) return (BlockQuote result)) -- @@ -164,18 +178,17 @@ lineBlock = try (do para = choice [ paraBeforeCodeBlock, paraNormal ] "paragraph" codeBlockStart = try (do - string "::" - blankline - blankline) + string "::" + blankline + blankline) -- paragraph that ends in a :: starting a code block paraBeforeCodeBlock = try (do result <- many1 (do {notFollowedBy' codeBlockStart; inline}) followedBy' (string "::") - return (Para (if (last result == Space) then - normalizeSpaces result - else - (normalizeSpaces result) ++ [Str ":"]))) + return (Para (if (last result == Space) + then normalizeSpaces result + else (normalizeSpaces result) ++ [Str ":"]))) -- regular paragraph paraNormal = try (do @@ -195,9 +208,9 @@ plain = do -- imageBlock = try (do - string ".. image:: " - src <- manyTill anyChar newline - return (Plain [Image [Str "image"] (Src src "")])) + string ".. image:: " + src <- manyTill anyChar newline + return (Plain [Image [Str "image"] (Src src "")])) -- -- header blocks @@ -207,59 +220,58 @@ header = choice [ doubleHeader, singleHeader ] "header" -- a header with lines on top and bottom doubleHeader = try (do - c <- oneOf underlineChars - rest <- many (char c) -- the top line - let lenTop = length (c:rest) - skipSpaces - newline - txt <- many1 (do {notFollowedBy blankline; inline}) - pos <- getPosition - let len = (sourceColumn pos) - 1 - if (len > lenTop) then fail "title longer than border" else (do {return ()}) - blankline -- spaces and newline - count lenTop (char c) -- the bottom line - blanklines - -- check to see if we've had this kind of header before. - -- if so, get appropriate level. if not, add to list. - state <- getState - let headerTable = stateHeaderTable state - let (headerTable', level) = case findIndex (== DoubleHeader c) headerTable of - Just ind -> (headerTable, ind + 1) - Nothing -> (headerTable ++ [DoubleHeader c], (length headerTable) + 1) - setState (state { stateHeaderTable = headerTable' }) - return (Header level (normalizeSpaces txt))) + c <- oneOf underlineChars + rest <- many (char c) -- the top line + let lenTop = length (c:rest) + skipSpaces + newline + txt <- many1 (do {notFollowedBy blankline; inline}) + pos <- getPosition + let len = (sourceColumn pos) - 1 + if (len > lenTop) then fail "title longer than border" else (do {return ()}) + blankline -- spaces and newline + count lenTop (char c) -- the bottom line + blanklines + -- check to see if we've had this kind of header before. + -- if so, get appropriate level. if not, add to list. + state <- getState + let headerTable = stateHeaderTable state + let (headerTable',level) = case findIndex (== DoubleHeader c) headerTable of + Just ind -> (headerTable, ind + 1) + Nothing -> (headerTable ++ [DoubleHeader c], (length headerTable) + 1) + setState (state { stateHeaderTable = headerTable' }) + return (Header level (normalizeSpaces txt))) -- a header with line on the bottom only singleHeader = try (do - notFollowedBy' whitespace - txt <- many1 (do {notFollowedBy blankline; inline}) - pos <- getPosition - let len = (sourceColumn pos) - 1 - blankline - c <- oneOf underlineChars - rest <- count (len - 1) (char c) - many (char c) - blanklines - state <- getState - let headerTable = stateHeaderTable state - let (headerTable', level) = case findIndex (== SingleHeader c) headerTable of - Just ind -> (headerTable, ind + 1) - Nothing -> (headerTable ++ [SingleHeader c], (length headerTable) + 1) - setState (state { stateHeaderTable = headerTable' }) - return (Header level (normalizeSpaces txt))) + notFollowedBy' whitespace + txt <- many1 (do {notFollowedBy blankline; inline}) + pos <- getPosition + let len = (sourceColumn pos) - 1 + blankline + c <- oneOf underlineChars + rest <- count (len - 1) (char c) + many (char c) + blanklines + state <- getState + let headerTable = stateHeaderTable state + let (headerTable',level) = case findIndex (== SingleHeader c) headerTable of + Just ind -> (headerTable, ind + 1) + Nothing -> (headerTable ++ [SingleHeader c], (length headerTable) + 1) + setState (state { stateHeaderTable = headerTable' }) + return (Header level (normalizeSpaces txt))) -- -- hrule block -- -hruleWith chr = - try (do - count 4 (char chr) - skipMany (char chr) - skipSpaces - newline - blanklines - return HorizontalRule) +hruleWith chr = try (do + count 4 (char chr) + skipMany (char chr) + skipSpaces + newline + blanklines + return HorizontalRule) hrule = choice (map hruleWith underlineChars) "hrule" @@ -269,9 +281,9 @@ hrule = choice (map hruleWith underlineChars) "hrule" -- read a line indented by a given string indentedLine indents = try (do - string indents - result <- manyTill anyChar newline - return (result ++ "\n")) + string indents + result <- manyTill anyChar newline + return (result ++ "\n")) -- two or more indented lines, possibly separated by blank lines -- if variable = True, then any indent will work, but it must be consistent through the block @@ -279,54 +291,59 @@ indentedLine indents = try (do indentedBlock variable = try (do state <- getState let tabStop = stateTabStop state - indents <- if variable then - many1 (oneOf " \t") - else - oneOfStrings ["\t", (replicate tabStop ' ')] + indents <- if variable + then many1 (oneOf " \t") + else oneOfStrings ["\t", (replicate tabStop ' ')] firstline <- manyTill anyChar newline rest <- many (choice [ indentedLine indents, - try (do {b <- blanklines; l <- indentedLine indents; return (b ++ l)})]) + try (do + b <- blanklines + l <- indentedLine indents + return (b ++ l))]) option "" blanklines return (firstline ++ "\n" ++ (concat rest))) codeBlock = try (do - codeBlockStart - result <- indentedBlock False -- the False means we want one tab stop indent on each line - return (CodeBlock (stripTrailingNewlines result))) + codeBlockStart + result <- indentedBlock False + -- the False means we want one tab stop indent on each line + return (CodeBlock (stripTrailingNewlines result))) -- -- raw html -- rawHtmlBlock = try (do - string ".. raw:: html" - blanklines - result <- indentedBlock True - return (RawHtml result)) + string ".. raw:: html" + blanklines + result <- indentedBlock True + return (RawHtml result)) -- -- raw latex -- rawLaTeXBlock = try (do - string ".. raw:: latex" - blanklines - result <- indentedBlock True - return (Para [(TeX result)])) + string ".. raw:: latex" + blanklines + result <- indentedBlock True + return (Para [(TeX result)])) -- -- block quotes -- blockQuote = try (do - block <- indentedBlock True - -- parse the extracted block, which may contain various block elements: - state <- getState - let parsed = case runParser parseBlocks (state {stateParserContext = BlockQuoteState}) - "block" (block ++ "\n\n") of - Left err -> error $ "Raw block:\n" ++ show block ++ "\nError:\n" ++ show err - Right result -> result - return (BlockQuote parsed)) + block <- indentedBlock True + -- parse the extracted block, which may contain various block elements: + state <- getState + let parsed = case runParser parseBlocks + (state {stateParserContext = BlockQuoteState}) + "block" (block ++ "\n\n") of + Left err -> error $ "Raw block:\n" ++ show block ++ + "\nError:\n" ++ show err + Right result -> result + return (BlockQuote parsed)) -- -- list blocks @@ -335,34 +352,36 @@ blockQuote = try (do list = choice [ bulletList, orderedList ] "list" -- parses bullet list start and returns its length (inc. following whitespace) -bulletListStart = - try (do - notFollowedBy' hrule -- because hrules start out just like lists - marker <- oneOf bulletListMarkers - white <- many1 spaceChar - let len = length (marker:white) - return len) +bulletListStart = try (do + notFollowedBy' hrule -- because hrules start out just like lists + marker <- oneOf bulletListMarkers + white <- many1 spaceChar + let len = length (marker:white) + return len) withPeriodSuffix parser = try (do - a <- parser - b <- char '.' - return (a ++ [b])) + a <- parser + b <- char '.' + return (a ++ [b])) withParentheses parser = try (do - a <- char '(' - b <- parser - c <- char ')' - return ([a] ++ b ++ [c])) + a <- char '(' + b <- parser + c <- char ')' + return ([a] ++ b ++ [c])) withRightParen parser = try (do - a <- parser - b <- char ')' - return (a ++ [b])) + a <- parser + b <- char ')' + return (a ++ [b])) upcaseWord = map toUpper romanNumeral = do - let lowerNumerals = ["i", "ii", "iii", "iiii", "iv", "v", "vi", "vii", "viii", "ix", "x", "xi", "xii", "xiii", "xiv", "xv", "xvi", "xvii", "xviii", "xix", "xx", "xxi", "xxii", "xxiii", "xxiv" ] + let lowerNumerals = ["i", "ii", "iii", "iiii", "iv", "v", "vi", + "vii", "viii", "ix", "x", "xi", "xii", "xiii", + "xiv", "xv", "xvi", "xvii", "xviii", "xix", "xx", + "xxi", "xxii", "xxiii", "xxiv" ] let upperNumerals = map upcaseWord lowerNumerals result <- choice $ map string (lowerNumerals ++ upperNumerals) return result @@ -372,15 +391,14 @@ orderedListEnumerator = choice [ many1 digit, count 1 letter, romanNumeral ] --- parses ordered list start and returns its length (inc. following whitespace) -orderedListStart = - try (do - marker <- choice [ withPeriodSuffix orderedListEnumerator, - withParentheses orderedListEnumerator, - withRightParen orderedListEnumerator ] - white <- many1 spaceChar - let len = length (marker ++ white) - return len) +-- parses ordered list start and returns its length (inc following whitespace) +orderedListStart = try (do + marker <- choice [ withPeriodSuffix orderedListEnumerator, + withParentheses orderedListEnumerator, + withRightParen orderedListEnumerator ] + white <- many1 spaceChar + let len = length (marker ++ white) + return len) -- parse a line of a list item listLine markerLength = try (do @@ -393,72 +411,73 @@ listLine markerLength = try (do indentWith num = do state <- getState let tabStop = stateTabStop state - if (num < tabStop) then - count num (char ' ') - else - choice [ try (count num (char ' ')), - (try (do {char '\t'; count (num - tabStop) (char ' ')})) ] + if (num < tabStop) + then count num (char ' ') + else choice [ try (count num (char ' ')), + (try (do {char '\t'; count (num - tabStop) (char ' ')})) ] -- parse raw text for one list item, excluding start marker and continuations -rawListItem start = - try (do - markerLength <- start - firstLine <- manyTill anyChar newline - restLines <- many (listLine markerLength) - return (markerLength, (firstLine ++ "\n" ++ (concat restLines)))) - --- continuation of a list item - indented and separated by blankline or (in compact lists) --- endline. Note: nested lists are parsed as continuations. -listContinuation markerLength = - try (do - blanks <- many1 blankline - result <- many1 (listLine markerLength) - return (blanks ++ (concat result))) - -listItem start = - try (do - (markerLength, first) <- rawListItem start - rest <- many (listContinuation markerLength) - blanks <- choice [ try (do {b <- many blankline; followedBy' start; return b}), - many1 blankline ] -- whole list must end with blank - -- parsing with ListItemState forces markers at beginning of lines to - -- count as list item markers, even if not separated by blank space. - -- see definition of "endline" - state <- getState - let parsed = case runParser parseBlocks (state {stateParserContext = ListItemState}) - "list item" raw of - Left err -> error $ "Raw:\n" ++ raw ++ "\nError:\n" ++ show err - Right result -> result - where raw = concat (first:rest) ++ blanks - return parsed) - -orderedList = - try (do - items <- many1 (listItem orderedListStart) - let items' = compactify items - return (OrderedList items')) - -bulletList = - try (do - items <- many1 (listItem bulletListStart) - let items' = compactify items - return (BulletList items')) +rawListItem start = try (do + markerLength <- start + firstLine <- manyTill anyChar newline + restLines <- many (listLine markerLength) + return (markerLength, (firstLine ++ "\n" ++ (concat restLines)))) + +-- continuation of a list item - indented and separated by blankline or +-- (in compact lists) endline. +-- Note: nested lists are parsed as continuations. +listContinuation markerLength = try (do + blanks <- many1 blankline + result <- many1 (listLine markerLength) + return (blanks ++ (concat result))) + +listItem start = try (do + (markerLength, first) <- rawListItem start + rest <- many (listContinuation markerLength) + blanks <- choice [ try (do + b <- many blankline + followedBy' start + return b), + many1 blankline ] -- whole list must end with blank + -- parsing with ListItemState forces markers at beginning of lines to + -- count as list item markers, even if not separated by blank space. + -- see definition of "endline" + state <- getState + let parsed = case runParser parseBlocks + (state {stateParserContext = ListItemState}) "list item" + raw of + Left err -> error $ "Raw:\n" ++ raw ++ + "\nError:\n" ++ show err + Right result -> result + where raw = concat (first:rest) ++ blanks + return parsed) + +orderedList = try (do + items <- many1 (listItem orderedListStart) + let items' = compactify items + return (OrderedList items')) + +bulletList = try (do + items <- many1 (listItem bulletListStart) + let items' = compactify items + return (BulletList items')) -- -- unknown directive (e.g. comment) -- unknownDirective = try (do - string ".. " - manyTill anyChar newline - many (do {string " "; - char ':'; - many1 (noneOf "\n:"); - char ':'; - many1 (noneOf "\n"); - newline}) - option "" blanklines - return Null) + string ".. " + manyTill anyChar newline + many (do + string " " + char ':' + many1 (noneOf "\n:") + char ':' + many1 (noneOf "\n") + newline) + option "" blanklines + return Null) -- -- reference key @@ -467,39 +486,43 @@ unknownDirective = try (do referenceKey = choice [imageKey, anonymousKey, regularKeyQuoted, regularKey] imageKey = try (do - string ".. |" - ref <- manyTill inline (char '|') - skipSpaces - string "image::" - src <- manyTill anyChar newline - return (Key (normalizeSpaces ref) (Src (removeLeadingTrailingSpace src) ""))) + string ".. |" + ref <- manyTill inline (char '|') + skipSpaces + string "image::" + src <- manyTill anyChar newline + return (Key (normalizeSpaces ref) + (Src (removeLeadingTrailingSpace src) ""))) anonymousKey = try (do - choice [string ".. __:", string "__"] - skipSpaces - src <- manyTill anyChar newline - state <- getState - return (Key [Str "_"] (Src (removeLeadingTrailingSpace src) ""))) + choice [string ".. __:", string "__"] + skipSpaces + src <- manyTill anyChar newline + state <- getState + return (Key [Str "_"] (Src (removeLeadingTrailingSpace src) ""))) regularKeyQuoted = try (do - string ".. _`" - ref <- manyTill inline (string "`:") - skipSpaces - src <- manyTill anyChar newline - return (Key (normalizeSpaces ref) (Src (removeLeadingTrailingSpace src) ""))) + string ".. _`" + ref <- manyTill inline (string "`:") + skipSpaces + src <- manyTill anyChar newline + return (Key (normalizeSpaces ref) + (Src (removeLeadingTrailingSpace src) ""))) regularKey = try (do - string ".. _" - ref <- manyTill inline (char ':') - skipSpaces - src <- manyTill anyChar newline - return (Key (normalizeSpaces ref) (Src (removeLeadingTrailingSpace src) ""))) + string ".. _" + ref <- manyTill inline (char ':') + skipSpaces + src <- manyTill anyChar newline + return (Key (normalizeSpaces ref) + (Src (removeLeadingTrailingSpace src) ""))) -- -- inline -- -text = choice [ strong, emph, code, str, tabchar, whitespace, endline ] "text" +text = choice [ strong, emph, code, str, tabchar, whitespace, + endline ] "text" inline = choice [ escapedChar, special, hyphens, text, symbol ] "inline" @@ -507,7 +530,8 @@ special = choice [ link, image ] "link, inline html, or image" hyphens = try (do result <- many1 (char '-') - option Space endline -- don't want to treat endline after hyphen or dash as a space + option Space endline + -- don't want to treat endline after hyphen or dash as a space return (Str result)) escapedChar = escaped anyChar @@ -517,12 +541,11 @@ symbol = do return (Str [result]) -- parses inline code, between codeStart and codeEnd -code = - try (do - string "``" - result <- manyTill anyChar (string "``") - let result' = removeLeadingTrailingSpace $ joinWithSep " " $ lines result - return (Code result')) +code = try (do + string "``" + result <- manyTill anyChar (string "``") + let result' = removeLeadingTrailingSpace $ joinWithSep " " $ lines result + return (Code result')) emph = do result <- enclosed (char '*') (char '*') inline @@ -546,99 +569,95 @@ str = do return (Str result) -- an endline character that can be treated as a space, not a structural break -endline = - try (do - newline - notFollowedBy blankline - -- parse potential list starts at beginning of line differently if in a list: - st <- getState - if ((stateParserContext st) == ListItemState) then - notFollowedBy' (choice [orderedListStart, bulletListStart]) - else - option () pzero - return Space) +endline = try (do + newline + notFollowedBy blankline + -- parse potential list-starts at beginning of line differently in a list: + st <- getState + if ((stateParserContext st) == ListItemState) + then notFollowedBy' (choice [orderedListStart, bulletListStart]) + else option () pzero + return Space) -- -- links -- -link = choice [explicitLink, referenceLink, autoLink, oneWordReferenceLink] "link" - -explicitLink = - try (do - char '`' - label <- manyTill inline (try (do {spaces; char '<'})) - src <- manyTill (noneOf ">\n ") (char '>') - skipSpaces - string "`_" - return (Link (normalizeSpaces label) (Src (removeLeadingTrailingSpace src) ""))) - -anonymousLinkEnding = - try (do - char '_' - state <- getState - let anonKeys = stateKeyBlocks state - -- if there's a list of anon key refs (from previous pass), pop one off. - -- otherwise return an anon key ref for the next pass to take care of... - case anonKeys of - (Key [Str "_"] src):rest -> - do{ setState (state { stateKeyBlocks = rest }); - return src } - otherwise -> return (Ref [Str "_"])) - -referenceLink = - try (do - char '`' - label <- manyTill inline (string "`_") - src <- option (Ref []) anonymousLinkEnding - return (Link (normalizeSpaces label) src)) - -oneWordReferenceLink = - try (do - label <- many1 alphaNum - char '_' - src <- option (Ref []) anonymousLinkEnding - notFollowedBy alphaNum -- because this_is_not a link - return (Link [Str label] src)) - -uriScheme = oneOfStrings [ "http://", "https://", "ftp://", "file://", "mailto:", - "news:", "telnet:" ] +link = choice [explicitLink, referenceLink, autoLink, + oneWordReferenceLink] "link" + +explicitLink = try (do + char '`' + label <- manyTill inline (try (do {spaces; char '<'})) + src <- manyTill (noneOf ">\n ") (char '>') + skipSpaces + string "`_" + return (Link (normalizeSpaces label) + (Src (removeLeadingTrailingSpace src) ""))) + +anonymousLinkEnding = try (do + char '_' + state <- getState + let anonKeys = stateKeyBlocks state + -- if there's a list of anon key refs (from previous pass), pop one off. + -- otherwise return an anon key ref for the next pass to take care of... + case anonKeys of + (Key [Str "_"] src):rest -> + do + setState (state { stateKeyBlocks = rest }) + return src + otherwise -> return (Ref [Str "_"])) + +referenceLink = try (do + char '`' + label <- manyTill inline (string "`_") + src <- option (Ref []) anonymousLinkEnding + return (Link (normalizeSpaces label) src)) + +oneWordReferenceLink = try (do + label <- many1 alphaNum + char '_' + src <- option (Ref []) anonymousLinkEnding + notFollowedBy alphaNum -- because this_is_not a link + return (Link [Str label] src)) + +uriScheme = oneOfStrings [ "http://", "https://", "ftp://", "file://", + "mailto:", "news:", "telnet:" ] uri = try (do - scheme <- uriScheme - identifier <- many1 (noneOf " \t\n") - return (scheme ++ identifier)) + scheme <- uriScheme + identifier <- many1 (noneOf " \t\n") + return (scheme ++ identifier)) autoURI = try (do - src <- uri - return (Link [Str src] (Src src ""))) + src <- uri + return (Link [Str src] (Src src ""))) emailChar = alphaNum <|> oneOf "-+_." emailAddress = try (do - firstLetter <- alphaNum - restAddr <- many emailChar - let addr = firstLetter:restAddr - char '@' - dom <- domain - return (addr ++ '@':dom)) + firstLetter <- alphaNum + restAddr <- many emailChar + let addr = firstLetter:restAddr + char '@' + dom <- domain + return (addr ++ '@':dom)) domainChar = alphaNum <|> char '-' domain = try (do - first <- many1 domainChar - dom <- many1 (try (do{ char '.'; many1 domainChar })) - return (joinWithSep "." (first:dom))) + first <- many1 domainChar + dom <- many1 (try (do{ char '.'; many1 domainChar })) + return (joinWithSep "." (first:dom))) autoEmail = try (do - src <- emailAddress - return (Link [Str src] (Src ("mailto:" ++ src) ""))) + src <- emailAddress + return (Link [Str src] (Src ("mailto:" ++ src) ""))) autoLink = autoURI <|> autoEmail -- For now, we assume that all substitution references are for images. -image = - try (do - char '|' - ref <- manyTill inline (char '|') - return (Image (normalizeSpaces ref) (Ref ref))) +image = try (do + char '|' + ref <- manyTill inline (char '|') + return (Image (normalizeSpaces ref) (Ref ref))) -- cgit v1.2.3