diff options
Diffstat (limited to 'src/Text/Pandoc/Pretty.hs')
-rw-r--r-- | src/Text/Pandoc/Pretty.hs | 14 |
1 files changed, 1 insertions, 13 deletions
diff --git a/src/Text/Pandoc/Pretty.hs b/src/Text/Pandoc/Pretty.hs index e830a1e78..0bac628af 100644 --- a/src/Text/Pandoc/Pretty.hs +++ b/src/Text/Pandoc/Pretty.hs @@ -80,7 +80,7 @@ import Data.List (intercalate) import Data.String import Control.Monad.State import Data.Char (isSpace) -import Text.Pandoc.Compat.Monoid ((<>)) +import Data.Monoid ((<>)) data RenderState a = RenderState{ output :: [a] -- ^ In reverse order @@ -126,18 +126,6 @@ isEmpty = null . toList . unDoc empty :: Doc empty = mempty -#if MIN_VERSION_base(4,5,0) --- (<>) is defined in Data.Monoid -#else -infixr 6 <> - --- | An infix synonym for 'mappend'. --- @a <> b@ is the result of concatenating @a@ with @b@. -(<>) :: Monoid m => m -> m -> m -(<>) = mappend -{-# INLINE (<>) #-} -#endif - -- | Concatenate a list of 'Doc's. cat :: [Doc] -> Doc cat = mconcat |