[Haskell-cafe] ghc 7.2.1 and super simple DPH

Peter Braam peter.braam at parsci.com
Mon Oct 3 07:41:35 CEST 2011


Hi -

I'm trying to compile DotP.hs from
http://www.haskell.org/haskellwiki/GHC/Data_Parallel_Haskell#A_simple_example
(see
below)

The compiler complains and says (twice in fact):

DotP.hs:17:33: Not in scope: `fromPArrayP'

Could someone help me out please?  Thanks a lot!

Peter


{-# LANGUAGE ParallelArrays #-}{-# OPTIONS_GHC -fvectorise #-}
 module DotP (dotp_wrapper)where
 import qualified Preludeimport Data.Array.Parallel.Preludeimport
Data.Array.Parallel.Prelude.Double

dotp_double :: [:Double:] -> [:Double:] -> Double
dotp_double xs ys = sumP [:x * y | x <- xs | y <- ys:]

dotp_wrapper :: PArray Double -> PArray Double -> Double{-# NOINLINE
dotp_wrapper #-}
dotp_wrapper v w = dotp_double (fromPArrayP v) (fromPArrayP w)
-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://www.haskell.org/pipermail/haskell-cafe/attachments/20111002/32754a34/attachment-0001.htm>


More information about the Haskell-Cafe mailing list