summaryrefslogtreecommitdiff
path: root/ghc/lib/concurrent/Parallel.lhs
diff options
context:
space:
mode:
authorsof <unknown>1997-03-14 05:19:03 +0000
committersof <unknown>1997-03-14 05:19:03 +0000
commitcc35bcbaa168201f817e3f443c8730af6c70bb3f (patch)
tree918c309022acd04d70622ea596f8a86c2a50061f /ghc/lib/concurrent/Parallel.lhs
parent15ecf716d38217d00af04f4dff724fb849fc257a (diff)
downloadhaskell-cc35bcbaa168201f817e3f443c8730af6c70bb3f.tar.gz
[project @ 1997-03-14 05:19:02 by sof]
Import changes
Diffstat (limited to 'ghc/lib/concurrent/Parallel.lhs')
-rw-r--r--ghc/lib/concurrent/Parallel.lhs3
1 files changed, 3 insertions, 0 deletions
diff --git a/ghc/lib/concurrent/Parallel.lhs b/ghc/lib/concurrent/Parallel.lhs
index 79609ad209..2c068e6462 100644
--- a/ghc/lib/concurrent/Parallel.lhs
+++ b/ghc/lib/concurrent/Parallel.lhs
@@ -13,6 +13,9 @@ module Parallel (par, seq -- re-exported
import ConcBase ( par )
#if defined(__GRANSIM__)
+import PrelBase
+import GHCerr ( parError )
+import GHC ( parGlobal#, parLocal#, parAt#, parAtForNow# )
{-# INLINE parGlobal #-}
parGlobal :: Int -> Int -> Int -> Int -> a -> b -> b