diff options
| author | Mateusz Kowalczyk <fuuzetsu@fuuzetsu.co.uk> | 2014-03-31 18:29:04 +0100 | 
|---|---|---|
| committer | Mateusz Kowalczyk <fuuzetsu@fuuzetsu.co.uk> | 2014-03-31 18:29:04 +0100 | 
| commit | d6cf6f9c75e08ce1760c2dbdee81775ba97a5f0c (patch) | |
| tree | 7aa0b8788c1b093a154eb53a1a5fde191a27f3af /src/Haddock | |
| parent | 8c64228d1b5d63714697a3df1a89e0d6dfc9b095 (diff) | |
Drop leading whitespace in @-style blocks.
Fixes #201.
Diffstat (limited to 'src/Haddock')
| -rw-r--r-- | src/Haddock/Parser.hs | 31 | 
1 files changed, 28 insertions, 3 deletions
| diff --git a/src/Haddock/Parser.hs b/src/Haddock/Parser.hs index cd7bb020..bd5cd200 100644 --- a/src/Haddock/Parser.hs +++ b/src/Haddock/Parser.hs @@ -2,6 +2,7 @@  {-# LANGUAGE StandaloneDeriving               , FlexibleInstances, UndecidableInstances               , IncoherentInstances #-} +{-# LANGUAGE LambdaCase #-}  -- |  -- Module      :  Haddock.Parser  -- Copyright   :  (c) Mateusz Kowalczyk 2013, @@ -21,7 +22,7 @@ import           Control.Applicative  import           Data.Attoparsec.ByteString.Char8 hiding (parse, take, endOfLine)  import qualified Data.ByteString.Char8 as BS  import           Data.Char (chr, isAsciiUpper) -import           Data.List (stripPrefix, intercalate) +import           Data.List (stripPrefix, intercalate, unfoldr)  import           Data.Maybe (fromMaybe)  import           Data.Monoid  import           DynFlags @@ -59,7 +60,8 @@ parseParas d = parse (p <* skipSpace) . encodeUtf8 . (++ "\n")      p :: Parser (Doc RdrName)      p = mconcat <$> paragraph d `sepBy` many (skipHorizontalSpace *> "\n") --- | Parse a text paragraph. +-- | Parse a text paragraph. Actually just a wrapper over 'parseStringBS' which +-- drops leading whitespace and encodes the string to UTF8 first.  parseString :: DynFlags -> String -> Doc RdrName  parseString d = parseStringBS d . encodeUtf8 . dropWhile isSpace @@ -366,8 +368,31 @@ property = DocProperty . strip . decodeUtf8 <$> ("prop>" *> takeWhile1 (/= '\n')  -- for markup.  codeblock :: DynFlags -> Parser (Doc RdrName)  codeblock d = -  DocCodeBlock . parseStringBS d <$> ("@" *> skipHorizontalSpace *> "\n" *> block' <* "@") +  DocCodeBlock . parseStringBS d . dropSpaces +  <$> ("@" *> skipHorizontalSpace *> "\n" *> block' <* "@")    where +    dropSpaces xs = +      let rs = decodeUtf8 xs +      in case splitByNl rs of +        [] -> xs +        ys -> case last ys of +          ' ':_ -> case mapM dropSpace ys of +            Nothing -> xs +            Just zs -> encodeUtf8 $ intercalate "\n" zs +          _ -> xs + +    -- This is necessary because ‘lines’ swallows up a trailing newline +    -- and we lose information about whether the last line belongs to @ or to +    -- text which we need to decide whether we actually want to be dropping +    -- anything at all. +    splitByNl = unfoldr (\case '\n':s -> Just (span (/= '\n') s) +                               _ -> Nothing) +                . ('\n' :) + +    dropSpace "" = Just "" +    dropSpace (' ':xs) = Just xs +    dropSpace _ = Nothing +      block' = scan False p        where          p isNewline c | 
