diff options
| author | John MacFarlane <jgm@berkeley.edu> | 2010-12-08 00:44:46 -0800 | 
|---|---|---|
| committer | John MacFarlane <jgm@berkeley.edu> | 2010-12-08 00:44:46 -0800 | 
| commit | f02080b62db7671aac090f89bb3df48637134e75 (patch) | |
| tree | 0725c8c758d73f814d3545920a5c8255c10f3c06 /src | |
| parent | 200ea336418af609fb526ce47755c48e10da0183 (diff) | |
| download | pandoc-f02080b62db7671aac090f89bb3df48637134e75.tar.gz | |
Textile reader: Implemented footnotes.
Diffstat (limited to 'src')
| -rw-r--r-- | src/Text/Pandoc/Readers/Textile.hs | 47 | 
1 files changed, 43 insertions, 4 deletions
| diff --git a/src/Text/Pandoc/Readers/Textile.hs b/src/Text/Pandoc/Readers/Textile.hs index 4c655691a..d52b1fd58 100644 --- a/src/Text/Pandoc/Readers/Textile.hs +++ b/src/Text/Pandoc/Readers/Textile.hs @@ -35,12 +35,12 @@ Implemented and parsed:   - blockquote   - Inlines : strong, emph, cite, code, deleted, superscript,     subscript, links + - footnotes  Implemented but discarded:   - HTML-specific and CSS-specific attributes  Left to be implemented: - - footnotes   - dimension sign   - all caps   - definition lists @@ -64,7 +64,7 @@ import Text.Pandoc.Readers.HTML ( htmlTag, htmlEndTag, -- find code blocks  -- import Text.Pandoc.Readers.Markdown (smartPunctuation)  import Text.ParserCombinators.Parsec  import Data.Char ( digitToInt, isLetter ) -import Control.Monad ( guard ) +import Control.Monad ( guard, liftM )  -- | Parse a Textile text and return a Pandoc document.  readTextile :: ParserState -- ^ Parser state, including options for parser @@ -87,8 +87,35 @@ parseTextile = do    -- textile allows raw HTML and does smart punctuation by default    updateState (\state -> state { stateParseRaw = True, stateSmart = True })    many blankline -  blocks <- parseBlocks  -  return $ Pandoc (Meta [Str ""] [[Str ""]] [Str ""]) blocks -- FIXME +  startPos <- getPosition +  -- go through once just to get list of reference keys and notes +  -- docMinusKeys is the raw document with blanks where the keys/notes were... +  let firstPassParser = noteBlock <|> lineClump +  manyTill firstPassParser eof >>= setInput . concat +  setPosition startPos +  st' <- getState +  let reversedNotes = stateNotes st' +  updateState $ \s -> s { stateNotes = reverse reversedNotes } +  -- now parse it for real... +  blocks <- parseBlocks +  return $ Pandoc (Meta [] [] []) blocks -- FIXME + +noteMarker :: GenParser Char ParserState [Char] +noteMarker = skipMany spaceChar >> string "fn" >> manyTill digit (char '.') + +noteBlock :: GenParser Char ParserState [Char] +noteBlock = try $ do +  startPos <- getPosition +  ref <- noteMarker +  optional blankline +  contents <- liftM unlines $ many1Till anyLine (blanklines <|> noteBlock) +  endPos <- getPosition +  let newnote = (ref, contents ++ "\n") +  st <- getState +  let oldnotes = stateNotes st +  updateState $ \s -> s { stateNotes = newnote : oldnotes } +  -- return blanks so line count isn't affected +  return $ replicate (sourceLine endPos - sourceLine startPos) '\n'  -- | Parse document blocks  parseBlocks :: GenParser Char ParserState [Block] @@ -306,6 +333,7 @@ inlines = manyTill inline newline  inlineParsers :: [GenParser Char ParserState Inline]  inlineParsers = [ autoLink                  , mark +                , note                  , str                  , htmlSpan                  , whitespace @@ -349,6 +377,17 @@ copy = do    char ')'    return $ Str "\169" +note :: GenParser Char ParserState Inline +note = try $ do +  char '[' +  ref <- many1 digit +  char ']' +  state <- getState +  let notes = stateNotes state +  case lookup ref notes of +    Nothing   -> fail "note not found" +    Just raw  -> liftM Note $ parseFromString parseBlocks raw +  -- | Any string  str :: GenParser Char ParserState Inline  str = do | 
