blob: cb7ea2527a26f74d572ed75b6c25df4beac7483f (
plain)
| 1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
 | {-# LANGUAGE CPP #-}
module Text.Pandoc.Compat.Monoid ( Monoid(..)
                                 , (<>)
                          ) where
#if MIN_VERSION_base(4,5,0)
import Data.Monoid ((<>), Monoid(..))
#else
import Data.Monoid (mappend, Monoid(..))
#endif
#if MIN_VERSION_base(4,5,0)
#else
infixr 6 <>
-- | An infix synonym for 'mappend'.
(<>) :: Monoid m => m -> m -> m
(<>) = mappend
{-# INLINE (<>) #-}
#endif
 |