[Haskell-beginners] Lang extension (almost solved)

Daniel Seidel ds at iai.uni-bonn.de
Wed Aug 10 17:21:54 CEST 2011


On Wed, 2011-08-10 at 17:12 +0200, Luca Ciciriello wrote:
> Ok, I've replaced {-# LANGUAGE PArr #-} with {-# LANGUAGE ParallelArrays #-}.
> now my problem is that the compiler is unable to find "elemP" and "foldP"
> Wich package have I to import?

Hayoo (http://holumbus.fh-wedel.de/hayoo/) says:

GHC.PArr.elemP:: a -> [:a:] -> Bool

Cheers,

Daniel.

> 
> Luca.
> 
> On Aug 10, 2011, at 5:04 PM, Luca Ciciriello wrote:
> 
> > Hi All. 
> > I've just installed GHC 7.2.1 And I've some problems with my old code.
> > 
> > To use the parallel List [: :] in my code I use {-# LANGUAGE PArr #-}. Now the new compiler tells me the the extension PArr is unsupported. If I remove {-# LANGUAGE PArr #-} the sinter [: compiled by GHC. Wich extension I've to use in order to built my code?
> > 
> > Thanks in Advance for any answer (I've installed GHC 7.2.1 on MacOS X Lion, Xcode 4.1)
> > 
> > Luca.
> > 
> > 
> > _______________________________________________
> > Beginners mailing list
> > Beginners at haskell.org
> > http://www.haskell.org/mailman/listinfo/beginners
> > 
> 
> 
> _______________________________________________
> Beginners mailing list
> Beginners at haskell.org
> http://www.haskell.org/mailman/listinfo/beginners




More information about the Beginners mailing list