[Haskell] Newbie

Ivan Lazar Miljenovic ivan.miljenovic at gmail.com
Fri Mar 8 02:43:22 CET 2013


On 8 March 2013 11:56, Brandon Allbery <allbery.b at gmail.com> wrote:
> On Thu, Mar 7, 2013 at 7:45 PM, Dan Lior <sitiposit at gmail.com> wrote:
>>
>> 1) Is this the right place for newbies to post questions about Haskell?
>
>
>
> This is most a list for announcements; beginners at haskell.org is better for
> these kinds of questions, and haskell-cafe at haskell.org for general
> discussion.
>
>> pred :: Int -> Int
>> pred 0 = 0
>> pred n+1 = n
>
>
> n+k patterns were part of Haskell '98, but removed from Haskell 2010. You
> may be able to use the pragma
>
>     {-# LANGUAGE NPlusKPatterns #-}
>
> to turn them back on.

Even then, you need to have "pred (n+1) = n".

>
> --
> brandon s allbery kf8nh                               sine nomine associates
> allbery.b at gmail.com                                  ballbery at sinenomine.net
> unix, openafs, kerberos, infrastructure, xmonad        http://sinenomine.net
>
> _______________________________________________
> Haskell mailing list
> Haskell at haskell.org
> http://www.haskell.org/mailman/listinfo/haskell
>



-- 
Ivan Lazar Miljenovic
Ivan.Miljenovic at gmail.com
http://IvanMiljenovic.wordpress.com



More information about the Haskell mailing list