[commit: hsc2hs] master: Update bounds on `process` (ff34f78)

git at git.haskell.org git at git.haskell.org
Sun Nov 1 10:58:52 UTC 2015


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

On branch  : master
Link       : http://git.haskell.org/hsc2hs.git/commitdiff/ff34f784abc868b22003717c1265d59af1c43a9f

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

commit ff34f784abc868b22003717c1265d59af1c43a9f
Author: Herbert Valerio Riedel <hvr at gnu.org>
Date:   Sun Nov 1 11:20:09 2015 +0100

    Update bounds on `process`
    
    While at it, reduce need for CPP in CrossCodegen module


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

ff34f784abc868b22003717c1265d59af1c43a9f
 CrossCodegen.hs | 8 +-------
 hsc2hs.cabal    | 2 +-
 2 files changed, 2 insertions(+), 8 deletions(-)

diff --git a/CrossCodegen.hs b/CrossCodegen.hs
index d30e145..30bb438 100644
--- a/CrossCodegen.hs
+++ b/CrossCodegen.hs
@@ -1,4 +1,3 @@
-{-# LANGUAGE CPP #-}
 {-# LANGUAGE NoMonomorphismRestriction #-}
 
 module CrossCodegen where
@@ -561,12 +560,7 @@ runCompileTest testStr = do
 
 runCompiler :: FilePath -> [String] -> Maybe FilePath -> TestMonad Bool
 runCompiler prog args mStdoutFile = do
-  let cmdLine =
-#if MIN_VERSION_process(1,1,0)
-            showCommandForUser prog args
-#else
-            unwords (prog : args)
-#endif
+  let cmdLine = showCommandForUser prog args
   testLog ("executing: " ++ cmdLine) $ liftTestIO $ do
       mHOut <- case mStdoutFile of
                Nothing -> return Nothing
diff --git a/hsc2hs.cabal b/hsc2hs.cabal
index 0d5e3b2..3da739b 100644
--- a/hsc2hs.cabal
+++ b/hsc2hs.cabal
@@ -40,5 +40,5 @@ Executable hsc2hs
                    containers >= 0.2 && < 0.6,
                    directory  >= 1   && < 1.3,
                    filepath   >= 1   && < 1.5,
-                   process    >= 1   && < 1.3
+                   process    >= 1.1 && < 1.4
 



More information about the ghc-commits mailing list