diff options
author | John MacFarlane <jgm@berkeley.edu> | 2018-03-16 08:15:09 -0700 |
---|---|---|
committer | John MacFarlane <jgm@berkeley.edu> | 2018-03-16 08:15:09 -0700 |
commit | 94d64a63f2fb463bc260cf2f0bae1eff2116ce28 (patch) | |
tree | 8b2e3ab48e53bab4fce57b36a6f7c10332599e7b /src/Text/Pandoc/Readers | |
parent | 07e098131633e5480b7a274ce28f329bd4f9e46b (diff) | |
download | pandoc-94d64a63f2fb463bc260cf2f0bae1eff2116ce28.tar.gz |
Removed redundant import.
Diffstat (limited to 'src/Text/Pandoc/Readers')
-rw-r--r-- | src/Text/Pandoc/Readers/Odt/Arrows/State.hs | 4 |
1 files changed, 1 insertions, 3 deletions
diff --git a/src/Text/Pandoc/Readers/Odt/Arrows/State.hs b/src/Text/Pandoc/Readers/Odt/Arrows/State.hs index 73bed545e..202118669 100644 --- a/src/Text/Pandoc/Readers/Odt/Arrows/State.hs +++ b/src/Text/Pandoc/Readers/Odt/Arrows/State.hs @@ -1,4 +1,3 @@ - {-# LANGUAGE FlexibleInstances #-} {-# LANGUAGE TupleSections #-} {- @@ -45,7 +44,6 @@ import qualified Control.Category as Cat import Control.Monad import Data.Foldable -import Data.Monoid import Text.Pandoc.Readers.Odt.Arrows.Utils import Text.Pandoc.Readers.Odt.Generic.Fallible @@ -131,7 +129,7 @@ withSubStateF' unlift a = ArrowState go -- and one with any function. foldS :: (Foldable f, Monoid m) => ArrowState s x m -> ArrowState s (f x) m foldS a = ArrowState $ \(s,f) -> foldr a' (s,mempty) f - where a' x (s',m) = second (m <>) $ runArrowState a (s',x) + where a' x (s',m) = second (mappend m) $ runArrowState a (s',x) -- | Fold a state arrow through something 'Foldable'. Collect the results in a -- 'MonadPlus'. |