From 527346cc7e2bc874092be2f6793001860e10a719 Mon Sep 17 00:00:00 2001 From: Albert Krewinkel Date: Sat, 7 Nov 2020 19:38:03 +0100 Subject: Lint code in PRs and when committing to master (#6790) * Remove unused LANGUAGE pragmata * Apply HLint suggestions * Configure HLint to ignore some warnings * Lint code when committing to master --- src/Text/Pandoc/Readers/Odt/ContentReader.hs | 5 +++-- src/Text/Pandoc/Readers/Odt/Generic/Utils.hs | 1 - 2 files changed, 3 insertions(+), 3 deletions(-) (limited to 'src/Text/Pandoc/Readers/Odt') diff --git a/src/Text/Pandoc/Readers/Odt/ContentReader.hs b/src/Text/Pandoc/Readers/Odt/ContentReader.hs index 24391dbf0..43c44e7e9 100644 --- a/src/Text/Pandoc/Readers/Odt/ContentReader.hs +++ b/src/Text/Pandoc/Readers/Odt/ContentReader.hs @@ -25,6 +25,7 @@ module Text.Pandoc.Readers.Odt.ContentReader import Control.Applicative hiding (liftA, liftA2, liftA3) import Control.Arrow +import Control.Monad ((<=<)) import qualified Data.ByteString.Lazy as B import Data.Foldable (fold) @@ -352,11 +353,11 @@ modifierFromStyleDiff propertyTriple = lookupPreviousValue f = lookupPreviousStyleValue (fmap f . textProperties) - lookupPreviousValueM f = lookupPreviousStyleValue ((f =<<).textProperties) + lookupPreviousValueM f = lookupPreviousStyleValue (f <=< textProperties) lookupPreviousStyleValue f (ReaderState{..},_,mFamily) = findBy f (extendedStylePropertyChain styleTrace styleSet) - <|> ( f =<< fmap (lookupDefaultStyle' styleSet) mFamily ) + <|> (f . lookupDefaultStyle' styleSet =<< mFamily) type ParaModifier = Blocks -> Blocks diff --git a/src/Text/Pandoc/Readers/Odt/Generic/Utils.hs b/src/Text/Pandoc/Readers/Odt/Generic/Utils.hs index 146f35319..6dc56a0d9 100644 --- a/src/Text/Pandoc/Readers/Odt/Generic/Utils.hs +++ b/src/Text/Pandoc/Readers/Odt/Generic/Utils.hs @@ -1,4 +1,3 @@ -{-# LANGUAGE TypeOperators #-} {-# LANGUAGE ViewPatterns #-} {- | Module : Text.Pandoc.Reader.Odt.Generic.Utils -- cgit v1.2.3