diff options
| author | John MacFarlane <jgm@berkeley.edu> | 2017-05-23 21:00:51 +0200 | 
|---|---|---|
| committer | John MacFarlane <jgm@berkeley.edu> | 2017-05-23 21:00:51 +0200 | 
| commit | 5844af67b41606d6da15e14c9b7dd6cedb17321e (patch) | |
| tree | a85ef27b3b2a319f49f3aeca7e29b82894842230 | |
| parent | c0c54b79063379dc8534a88b4a9cccbe7c9a3b80 (diff) | |
| download | pandoc-5844af67b41606d6da15e14c9b7dd6cedb17321e.tar.gz | |
RST reader: reformatting (code line length).
| -rw-r--r-- | src/Text/Pandoc/Readers/RST.hs | 70 | 
1 files changed, 47 insertions, 23 deletions
| diff --git a/src/Text/Pandoc/Readers/RST.hs b/src/Text/Pandoc/Readers/RST.hs index c835ecf52..e3780f89b 100644 --- a/src/Text/Pandoc/Readers/RST.hs +++ b/src/Text/Pandoc/Readers/RST.hs @@ -35,8 +35,8 @@ import Control.Monad (guard, liftM, mzero, when)  import Control.Monad.Identity (Identity(..))  import Control.Monad.Except (throwError)  import Data.Char (isHexDigit, isSpace, toLower, toUpper) -import Data.List (deleteFirstsBy, findIndex, intercalate, isInfixOf, isSuffixOf, -                  nub, sort, transpose, union) +import Data.List (deleteFirstsBy, findIndex, intercalate, isInfixOf, +                  isSuffixOf, nub, sort, transpose, union)  import qualified Data.Map as M  import Data.Maybe (fromMaybe, isJust)  import Data.Monoid ((<>)) @@ -131,7 +131,10 @@ metaFromDefList ds meta = adjustAuthors $ foldr f meta ds         adjustAuthors (Meta metamap) = Meta $ M.adjust splitAuthors "author"                                             $ M.adjust toPlain "date"                                             $ M.adjust toPlain "title" -                                           $ M.mapKeys (\k -> if k == "authors" then "author" else k) +                                           $ M.mapKeys (\k -> +                                                 if k == "authors" +                                                    then "author" +                                                    else k)                                             $ metamap         toPlain (MetaBlocks [Para xs]) = MetaInlines xs         toPlain x                      = x @@ -595,10 +598,14 @@ listItem start = try $ do    parsed <- parseFromString parseBlocks $ concat (first:rest) ++ "\n"    updateState (\st -> st {stateParserContext = oldContext})    return $ case B.toList parsed of -                [Para xs] -> B.singleton $ Plain xs -                [Para xs, BulletList ys] -> B.fromList [Plain xs, BulletList ys] -                [Para xs, OrderedList s ys] -> B.fromList [Plain xs, OrderedList s ys] -                [Para xs, DefinitionList ys] -> B.fromList [Plain xs, DefinitionList ys] +                [Para xs] -> +                   B.singleton $ Plain xs +                [Para xs, BulletList ys] -> +                   B.fromList [Plain xs, BulletList ys] +                [Para xs, OrderedList s ys] -> +                   B.fromList [Plain xs, OrderedList s ys] +                [Para xs, DefinitionList ys] -> +                   B.fromList [Plain xs, DefinitionList ys]                  _         -> parsed  orderedList :: PandocMonad m => RSTParser m Blocks @@ -726,7 +733,8 @@ directive' = do          "figure" -> do             (caption, legend) <- parseFromString extractCaption body'             let src = escapeURI $ trim top -           return $ B.para (B.imageWith (imgAttr "figclass") src "fig:" caption) <> legend +           return $ B.para (B.imageWith (imgAttr "figclass") src "fig:" +                       caption) <> legend          "image" -> do             let src = escapeURI $ trim top             let alt = B.str $ maybe "image" trim $ lookup "alt" fields @@ -737,7 +745,8 @@ directive' = do                                       $ B.imageWith attr src "" alt                            Nothing -> B.imageWith attr src "" alt          "class" -> do -            let attrs = ("", (splitBy isSpace $ trim top), map (\(k,v) -> (k, trimr v)) fields) +            let attrs = ("", (splitBy isSpace $ trim top), +                              map (\(k,v) -> (k, trimr v)) fields)              --  directive content or the first immediately following element              children <- case body of                  "" -> block @@ -764,20 +773,27 @@ tableDirective top _fields body = do  -- TODO: :stub-columns:. --- Only the first row becomes the header even if header-rows: > 1, since Pandoc doesn't support a table with multiple header rows. --- We don't need to parse :align: as it represents the whole table align.  -listTableDirective :: PandocMonad m => String -> [(String, String)] -> String -> RSTParser m Blocks +-- Only the first row becomes the header even if header-rows: > 1, +-- since Pandoc doesn't support a table with multiple header rows. +-- We don't need to parse :align: as it represents the whole table align. +listTableDirective :: PandocMonad m +                   => String -> [(String, String)] -> String +                   -> RSTParser m Blocks  listTableDirective top fields body = do    bs <- parseFromString parseBlocks body    title <- parseFromString (trimInlines . mconcat <$> many inline) top    let rows = takeRows $ B.toList bs -      headerRowsNum = fromMaybe (0 :: Int) $ lookup "header-rows" fields >>= safeRead +      headerRowsNum = fromMaybe (0 :: Int) $ +         lookup "header-rows" fields >>= safeRead        (headerRow,bodyRows,numOfCols) = case rows of -        x:xs -> if headerRowsNum > 0 then (x, xs, length x) else ([], rows, length x) +        x:xs -> if headerRowsNum > 0 +                   then (x, xs, length x) +                   else ([], rows, length x)          _ -> ([],[],0)        widths = case trim <$> lookup "widths" fields of          Just "auto" -> replicate numOfCols 0 -        Just specs -> normWidths $ map (fromMaybe (0 :: Double) . safeRead) $ splitBy (`elem` (" ," :: String)) specs +        Just specs -> normWidths $ map (fromMaybe (0 :: Double) . safeRead) $ +                           splitBy (`elem` (" ," :: String)) specs          _ -> replicate numOfCols 0    return $ B.table title               (zip (replicate numOfCols AlignDefault) widths) @@ -792,7 +808,8 @@ listTableDirective top fields body = do  -- TODO:  --  - Only supports :format: fields with a single format for :raw: roles,  --    change Text.Pandoc.Definition.Format to fix -addNewRole :: PandocMonad m => String -> [(String, String)] -> RSTParser m Blocks +addNewRole :: PandocMonad m +           => String -> [(String, String)] -> RSTParser m Blocks  addNewRole roleString fields = do      pos <- getPosition      (role, parentRole) <- parseFromString inheritedRole roleString @@ -822,7 +839,8 @@ addNewRole roleString fields = do              SkippedContent ":format: [because parent of role is not :raw:]" pos          _ -> logMessage $ SkippedContent (":" ++ key ++ ":") pos      when (parentRole == "raw" && countKeys "format" > 1) $ -        logMessage $ SkippedContent ":format: [after first in definition of role]" +        logMessage $ SkippedContent +                  ":format: [after first in definition of role]"                    pos      when (parentRole == "code" && countKeys "language" > 1) $          logMessage $ SkippedContent @@ -837,7 +855,8 @@ addNewRole roleString fields = do    where      countKeys k = length . filter (== k) . map fst $ fields      inheritedRole = -        (,) <$> roleName <*> ((char '(' *> roleName <* char ')') <|> pure "span") +        (,) <$> roleName <*> ((char '(' *> roleName <* char ')') +                            <|> pure "span")  -- Can contain character codes as decimal numbers or @@ -1014,7 +1033,8 @@ substKey = try $ do               [Para ils] -> return $ B.fromList ils               _          -> mzero    let key = toKey $ stripFirstAndLast ref -  updateState $ \s -> s{ stateSubstitutions = M.insert key il $ stateSubstitutions s } +  updateState $ \s -> s{ stateSubstitutions = +                          M.insert key il $ stateSubstitutions s }  anonymousKey :: Monad m => RSTParser m ()  anonymousKey = try $ do @@ -1023,7 +1043,8 @@ anonymousKey = try $ do    pos <- getPosition    let key = toKey $ "_" ++ printf "%09d" (sourceLine pos)    --TODO: parse width, height, class and name attributes -  updateState $ \s -> s { stateKeys = M.insert key ((src,""), nullAttr) $ stateKeys s } +  updateState $ \s -> s { stateKeys = M.insert key ((src,""), nullAttr) $ +                          stateKeys s }  stripTicks :: String -> String  stripTicks = reverse . stripTick . reverse . stripTick @@ -1038,7 +1059,8 @@ regularKey = try $ do    src <- targetURI    let key = toKey $ stripTicks ref    --TODO: parse width, height, class and name attributes -  updateState $ \s -> s { stateKeys = M.insert key ((src,""), nullAttr) $ stateKeys s } +  updateState $ \s -> s { stateKeys = M.insert key ((src,""), nullAttr) $ +                          stateKeys s }  headerBlock :: PandocMonad m => RSTParser m [Char]  headerBlock = do @@ -1243,7 +1265,8 @@ interpretedRole = try $ do    (role, contents) <- roleBefore <|> roleAfter    renderRole contents Nothing role nullAttr -renderRole :: PandocMonad m => String -> Maybe String -> String -> Attr -> RSTParser m Inlines +renderRole :: PandocMonad m +           => String -> Maybe String -> String -> Attr -> RSTParser m Inlines  renderRole contents fmt role attr = case role of      "sup"  -> return $ B.superscript $ B.str contents      "superscript" -> return $ B.superscript $ B.str contents @@ -1376,7 +1399,8 @@ referenceLink = try $ do                          (k:_) -> return k    ((src,tit), attr) <- lookupKey [] key    -- if anonymous link, remove key so it won't be used again -  when (isAnonKey key) $ updateState $ \s -> s{ stateKeys = M.delete key keyTable } +  when (isAnonKey key) $ updateState $ \s -> +                          s{ stateKeys = M.delete key keyTable }    return $ B.linkWith attr src tit label'  -- We keep a list of oldkeys so we can detect lookup loops. | 
