Hi all,

Consider the following program:

module Test where
>
> import System.Process (readProcess)
>
> main :: IO ()
> main = readProcess "git" ["describe", "--tags"] "" >>= putStr
>

In Windows I get the following behaviour:

> git --version
> git version 1.7.10.msysgit.1
>
> > ghc --version
> The Glorious Glasgow Haskell Compilation System, version 7.6.1
>
> > runghc Test
> Test: git: createProcess: does not exist (No such file or directory)
>

The same happens with GHC 7.4.2. In Linux, however, it works as expected:

$ git --version
> git version 1.7.9.5
> $ ghc --version
> The Glorious Glasgow Haskell Compilation System, version 7.4.1
> $ runghc Test.hs
> Package-2.0-68-gacaf77a
>

Can anyone reproduce this result in Windows? Is this a bug or am I doing
something wrong?


Thanks,
Pedro
_______________________________________________
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe

Reply via email to