[Haskell-cafe] ANNOUNCE: new bridge! (prelude-prime)

Anton Kholomiov anton.kholomiov at gmail.com
Thu May 23 10:38:25 CEST 2013


I wish it was possible to use an extension

CustomPrelude = Prelude.Prime

In the cabal file




2013/5/23 Roman Cheplyaka <roma at ro-che.info>

> I liked Andreas's idea (cited below). Hence the new package
> prelude-prime.
>
> https://github.com/feuerbach/prelude-prime
> http://hackage.haskell.org/package/prelude-prime
>
> Pull requests are welcome, but let's stick to widely agreed changes
> (like the Foldable/Traversable one). I think one of the reasons why
> other Preludes haven't been adopted is because they were too radical.
>
> Let's see whether people here can put their code where their mouth is :)
>
> Roman
>
> * Andreas Abel <andreas.abel at ifi.lmu.de> [2013-05-20 13:26:05+0200]
> > Maybe instead of fiddling with the current Prelude (which might break
> > backwards compatibility), we should design a new prelude which is not
> > automatically loaded but contains roughly the current prelude (with
> > the list functions generalized to collections) plus the "modern" type
> > class stack: Functor, Applicative, Monad, Foldable, Traversable,
> > Monoid etc.
> >
> > I am willing to write
> >
> >   {-# LANGUAGE NoImplicitPrelude #-}
> >   import Base
> >
> > if I get a decent, "modern" standard set of functions that could be
> > considered as the base vocabulary of modern Haskell programmers...
> >
> > I just do not want to think about the democratic process involved in
> > this design...
> >
> > Cheers,
> > Andreas
>
> _______________________________________________
> Haskell-Cafe mailing list
> Haskell-Cafe at haskell.org
> http://www.haskell.org/mailman/listinfo/haskell-cafe
>
-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://www.haskell.org/pipermail/haskell-cafe/attachments/20130523/d09643bb/attachment-0001.htm>


More information about the Haskell-Cafe mailing list