[commit: testsuite] master: Follow the unsafePerformIO change in base (3e2d8f1)
Ian Lynagh
igloo at earth.li
Sun Feb 17 23:26:11 CET 2013
Repository : ssh://darcs.haskell.org//srv/darcs/testsuite
On branch : master
http://hackage.haskell.org/trac/ghc/changeset/3e2d8f1a57b340a65d1bd462766e26b668219d8e
>---------------------------------------------------------------
commit 3e2d8f1a57b340a65d1bd462766e26b668219d8e
Author: Ian Lynagh <ian at well-typed.com>
Date: Sun Feb 17 21:24:37 2013 +0000
Follow the unsafePerformIO change in base
>---------------------------------------------------------------
tests/concurrent/should_run/conc039.hs | 1 +
tests/concurrent/should_run/conc040.hs | 1 +
2 files changed, 2 insertions(+), 0 deletions(-)
diff --git a/tests/concurrent/should_run/conc039.hs b/tests/concurrent/should_run/conc039.hs
index dc5d181..dc493d4 100644
--- a/tests/concurrent/should_run/conc039.hs
+++ b/tests/concurrent/should_run/conc039.hs
@@ -1,6 +1,7 @@
{-# LANGUAGE ForeignFunctionInterface #-}
import Foreign
+import System.IO.Unsafe
import System.Mem
import Control.Concurrent
diff --git a/tests/concurrent/should_run/conc040.hs b/tests/concurrent/should_run/conc040.hs
index be3bfdb..e4acd84 100644
--- a/tests/concurrent/should_run/conc040.hs
+++ b/tests/concurrent/should_run/conc040.hs
@@ -4,6 +4,7 @@ import Foreign
import Data.IORef
import Control.Concurrent
import Control.Exception
+import System.IO.Unsafe
foreign import ccall "wrapper"
wrap :: IO () -> IO (FunPtr (IO ()))
More information about the ghc-commits
mailing list