Hi,

using:
http://www.haskell.org/ghc/dist/current/dist/ghc-6.13.20100819-x86_64-unknown-linux.tar.bz2
parallel-3.1.0.0

and the most-common test program ... ever:

module Main where
import Control.Parallel.Strategies

fib :: Int -> Int
fib n
  | n < 1     = error "n < 1"
  | n == 1    = 1
  | n == 2    = 1
  | otherwise = fib (n-1) + fib(n-2)

fibs = parMap rdeepseq fib $ [1..100]
main = do
  mapM_ (putStrLn . show) $ zip [1..] fibs


ghc -fllvm -threaded -rtsopts -O2 Prog.hs

./Prog -- runs slowly through 1..100 [OK]
./Prog +RTS -N2 -RTS -- requests all available memory [NOT OK]

ghc -fllvm -threaded -rtsopts Prog.hs

./Prog +RTS -N2 -RTS -- slowly but [OK]



Can anybody confirm this?

Gruss,
Christian

Attachment: pgpfof6FwbZjY.pgp
Description: PGP signature

_______________________________________________
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Reply via email to