[commit: ghc] wip/nfs-locking: Upgrade to extra-1.4.7 (00b88a1)

git at git.haskell.org git at git.haskell.org
Fri Oct 27 00:16:16 UTC 2017


Repository : ssh://git@git.haskell.org/ghc

On branch  : wip/nfs-locking
Link       : http://ghc.haskell.org/trac/ghc/changeset/00b88a16a67cf107eaf716b55ff5016fc5732c2a/ghc

>---------------------------------------------------------------

commit 00b88a16a67cf107eaf716b55ff5016fc5732c2a
Author: Andrey Mokhov <andrey.mokhov at gmail.com>
Date:   Mon May 23 00:16:14 2016 +0100

    Upgrade to extra-1.4.7


>---------------------------------------------------------------

00b88a16a67cf107eaf716b55ff5016fc5732c2a
 hadrian.cabal               | 2 +-
 src/Oracles/Dependencies.hs | 2 +-
 src/Oracles/ModuleFiles.hs  | 2 +-
 src/Rules/Library.hs        | 2 +-
 4 files changed, 4 insertions(+), 4 deletions(-)

diff --git a/hadrian.cabal b/hadrian.cabal
index 95ae3a0..c9d5551 100644
--- a/hadrian.cabal
+++ b/hadrian.cabal
@@ -122,7 +122,7 @@ executable hadrian
                        , Cabal                == 1.22.* || == 1.24.*
                        , containers           == 0.5.*
                        , directory            == 1.2.*
-                       , extra                == 1.4.*
+                       , extra                >= 1.4.7
                        , mtl                  == 2.2.*
                        , QuickCheck           >= 2.6 && < 2.9
                        , shake                >= 0.15.6
diff --git a/src/Oracles/Dependencies.hs b/src/Oracles/Dependencies.hs
index ce94805..1a8b587 100644
--- a/src/Oracles/Dependencies.hs
+++ b/src/Oracles/Dependencies.hs
@@ -50,7 +50,7 @@ contextDependencies context at Context {..} = do
 -- | Coarse-grain 'need': make sure given contexts are fully built.
 needContext :: [Context] -> Action ()
 needContext cs = do
-    libs <- fmap concat . forM cs $ \context -> do
+    libs <- concatForM cs $ \context -> do
         libFile  <- pkgLibraryFile     context
         lib0File <- pkgLibraryFile0    context
         lib0     <- buildDll0          context
diff --git a/src/Oracles/ModuleFiles.hs b/src/Oracles/ModuleFiles.hs
index ece6d0b..b11ef3b 100644
--- a/src/Oracles/ModuleFiles.hs
+++ b/src/Oracles/ModuleFiles.hs
@@ -115,7 +115,7 @@ moduleFilesOracle = void $ do
         modules <- fmap sort . pkgDataList $ Modules path
         let dirs = (path -/- "autogen") : map (pkgPath package -/-) srcDirs
             modDirFiles = groupSort $ map decodeModule modules
-        result <- fmap concat . forM dirs $ \dir -> do
+        result <- concatForM dirs $ \dir -> do
             todo <- filterM (doesDirectoryExist . (dir -/-) . fst) modDirFiles
             forM todo $ \(mDir, mFiles) -> do
                 let fullDir = unifyPath $ dir -/- mDir
diff --git a/src/Rules/Library.hs b/src/Rules/Library.hs
index edbdb52..dd144d1 100644
--- a/src/Rules/Library.hs
+++ b/src/Rules/Library.hs
@@ -36,7 +36,7 @@ buildPackageLibrary context at Context {..} = do
 
         split <- interpretInContext context splitObjects
         splitObjs <- if not split then return hObjs else -- TODO: make clearer!
-            fmap concat $ forM hSrcs $ \src -> do
+            concatForM hSrcs $ \src -> do
                 let splitPath = path -/- src ++ "_" ++ osuf way ++ "_split"
                 contents <- liftIO $ IO.getDirectoryContents splitPath
                 return . map (splitPath -/-)



More information about the ghc-commits mailing list