[Haskell-beginners] DPH help
Luca Ciciriello
luca_ciciriello at hotmail.com
Thu Dec 9 17:52:09 CET 2010
Hi All.
I'm trying to load in GHCi the following code:
{-# LANGUAGE Arrows #-}
{-# LANGUAGE PArr, ParallelListComp #-}
module Test where
import Control.Arrow
import Control.Parallel
dotp :: Num a => [:a:] -> [:a:] -> a
dotp xs ys = sumP [:x * y | x <- xs | y <- ys:]
......
Then I get the error:
Not in scope 'sumP'.
What I have to import to avoid this error? Where is defined sumP?
Thanks in advance for any answer.
Luca
More information about the Beginners
mailing list