File tree Expand file tree Collapse file tree 3 files changed +3
-3
lines changed Expand file tree Collapse file tree 3 files changed +3
-3
lines changed Original file line number Diff line number Diff line change 66{-# LANGUAGE GADTs #-}
77{-# LANGUAGE LambdaCase #-}
88{-# LANGUAGE MultiParamTypeClasses #-}
9- {-# LANGUAGE PatternSynonyms #-}
109{-# LANGUAGE PolyKinds #-}
1110{-# LANGUAGE RankNTypes #-}
1211{-# LANGUAGE ScopedTypeVariables #-}
Original file line number Diff line number Diff line change @@ -59,7 +59,7 @@ mapIntMapPatchWithKey f (PatchIntMap m) = PatchIntMap $ IntMap.mapWithKey (\ k m
5959-- | Map an effectful function @Int -> a -> f b@ over all @a@s in the given @'PatchIntMap' a@
6060-- (that is, all inserts/updates), producing a @f (PatchIntMap b)@.
6161traverseIntMapPatchWithKey :: Applicative f => (Int -> a -> f b ) -> PatchIntMap a -> f (PatchIntMap b )
62- traverseIntMapPatchWithKey f (PatchIntMap m) = PatchIntMap <$> IntMap. traverseWithKey (\ k mv -> traverse (f k) mv ) m
62+ traverseIntMapPatchWithKey f (PatchIntMap m) = PatchIntMap <$> IntMap. traverseWithKey (traverse . f ) m
6363
6464-- | Extract all @a@s inserted/updated by the given @'PatchIntMap' a@.
6565patchIntMapNewElements :: PatchIntMap a -> [a ]
Original file line number Diff line number Diff line change 11module Main where
22
33import Control.Monad
4- import Language.Haskell.HLint3 (hlint )
4+ import Language.Haskell.HLint (hlint )
55import System.Directory
66import System.Exit (exitFailure , exitSuccess )
77import System.FilePath
@@ -23,6 +23,7 @@ main = do
2323 , " --ignore=Reduce duplication"
2424 , " --cpp-define=USE_TEMPLATE_HASKELL"
2525 , " --ignore=Use tuple-section"
26+ , " --ignore=Unused LANGUAGE pragma" -- hlint3 falsely believes that TypeOperators is not needed
2627 ]
2728 recurseInto = and <$> sequence
2829 [ fileType ==? Directory
You can’t perform that action at this time.
0 commit comments