
9 Dec
2010
9 Dec
'10
11:52 a.m.
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