Re: [Haskell-cafe] [Haskell] ANNOUNCE: haskell-src-exts 1.14.0

2013-08-20 Thread Sean Leather
there? Considered, yes. Done, no. Would love to see the results :-). The crew at OdHac (Roman, Erik, Simon) ensured that the current version handles all of 'base', which is a good start. See: Nikolaos Bezirgiannis, Johan Jeuring and Sean Leather. Usage of Generic Programming on Hackage

Re: [Haskell-cafe] Monadic parser vs. combinator parser

2013-01-31 Thread Sean Leather
On Wed, Jan 30, 2013 at 1:21 PM, Jan Stolarek wrote: I will be writing a parser in Haskell and I wonder how to approach the problem. Utrecht University has a course that covers this, among other things. You might find the slides and lecture notes useful:

Re: [Haskell-cafe] monoid pair of monoids?

2012-12-21 Thread Sean Leather
On Fri, Dec 21, 2012 at 9:27 AM, Christopher Howard wrote: Thank you for your help. An additional question, if I might: For the sake of elegance and simplicity, I modified the class and instances to avoid the tuple aspect: data Socket2 a b = Socket2 a b instance (Monoid a, Monoid b) =

Re: [Haskell-cafe] AST Rewriting

2012-11-21 Thread Sean Leather
On Wed, Nov 21, 2012 at 2:56 PM, Emil Axelsson wrote: This is one of the problem Syntactic aims to solve, but it requires you to use a different representation of expressions (for good or bad). If you want to keep your existing representation, then you have to use a generic programming

Re: [Haskell-cafe] need help with understanding expression

2012-11-16 Thread Sean Leather
Hi Daryoush, Prelude :t 3 2 3 2 :: (Num a, Num (a - t)) = t What does the type mean in plain english? It's important to remember that numeric literals are polymorphic. That is, 3 :: Num a = a. They do not have monomorphic types such as Int or Integer. In the above, GHCi is inferring the

Re: [Haskell-cafe] Transforming a ADT to a GADT

2012-09-14 Thread Sean Leather
On Fri, Sep 14, 2012 at 12:45 PM, Florian Lorenzen wrote: I'd like to transform a value of an ADT to a GADT. Suppose I have the simple expression language data Exp = Lit Int | Succ Exp | IsZero Exp | If Exp Exp Exp and the GADT data Term t where TLit :: Int - Term Int TSucc :: Term

Re: [Haskell-cafe] Transforming a ADT to a GADT

2012-09-14 Thread Sean Leather
On Fri, Sep 14, 2012 at 2:27 PM, Erik Hesselink wrote: I don't think this is safe. What will happen if you evaluate typecheck (Lit 1) :: Maybe (Term Bool) Indeed! Silly me. Caught by the lure again. Thanks. Regards, Sean ___ Haskell-Cafe mailing

Re: [Haskell-cafe] type variable in class instance

2012-09-11 Thread Sean Leather
On Tue, Sep 11, 2012 at 3:39 PM, Corentin Dupontwrote: @Oleg: Yes the set of events is closed and I would be much happier with a GADT! But no matter how hard I tried I couldn't manage. Here is the full problem: *{-# LANGUAGE ExistentialQuantification, TypeFamilies, DeriveDataTypeable #-}

Re: [Haskell-cafe] type variable in class instance

2012-09-11 Thread Sean Leather
On Tue, Sep 11, 2012 at 6:46 PM, David Menendez wrote: Mixing GADTs and Typeable seems like a bad idea. If you really don't want to put viewEvent in the Event typeclass, but the class of events is closed, you could use a GADT to witness the event type. On Tue, Sep 11, 2012 at 7:03 PM,

Re: [Haskell-cafe] type variable in class instance

2012-09-11 Thread Sean Leather
On Tue, Sep 11, 2012 at 9:18 PM, Corentin Dupont wrote: That's very interesting. One problem is, if the set of event is closed, the set of possible data types is not (the user can choose any data type for a Message callback for example). I think this can be solved using a class instead of a

Re: [Haskell-cafe] salvia

2012-08-21 Thread Sean Leather
On Tue, Aug 21, 2012 at 5:02 PM, Sergey Mironov wrote: Hi. Does anybody know anything about Sebastiaan Visser, the maintainer of Salvia-* packages (web server) ? Looks like his email is dead. I responded to Sergey off-list, so others don't have to. Regards, Sean

Re: [Haskell-cafe] [***SPAM***] Parallel Haskell Digest 11

2012-07-06 Thread Sean Leather
Hi Eric (et Café), On Thu, Jul 5, 2012 at 5:13 PM, Eric Kow wrote: *[Everybody should write everything in Go?][m7] (28 May) Ryan Hayes posted a small [snippet of Go][go-snippet] showing how friendly he found it for writing concurrent programs, “No pthread... not stupid

Re: [Haskell-cafe] [***SPAM***] Parallel Haskell Digest 11

2012-07-06 Thread Sean Leather
On Fri, Jul 6, 2012 at 4:03 PM, Eric Kow wrote: Subject line makes me wonder how often the digests get caught in people's spam filters Oops! Should have removed that part before replying. I think it comes from the university's mail server, and it's rather obnoxious. I tend to ignore it.

Re: [Haskell-cafe] Introducing FP Complete

2012-06-06 Thread Sean Leather
On Wed, Jun 6, 2012 at 3:22 AM, Bartosz Milewski wrote: You might have seen a few post by me mentioning FP Complete and asked yourself the question: Who is this guy and what is FP Complete? Yes. ;) I haven't been active in the Haskell community, as I'm a relative newcomer to Haskell. I am

Re: [Haskell-cafe] Announce: Haskell Platform 2012.2.0.0

2012-06-03 Thread Sean Leather
On Sun, Jun 3, 2012 at 6:24 PM, Mark Lentczner wrote: We're pleased to announce the next release of Haskell Platform: a single, standard Haskell distribution for everyone. Awesome! Congratulations! Download Haskell Platform 2012.2.0.0: http://haskell.org/platform/ It's a relatively

Re: [Haskell-cafe] Program for displaying graph state in lambda interpreter?

2012-06-01 Thread Sean Leather
Hi Benjamin, On Fri, Jun 1, 2012 at 9:54 PM, Benjamin Redelings wrote: I have written an interpreter that operates on the lambda calculus augmented with letrec, constructors, case, primitive objects, and builtin operations. I'd like to display the internal state of the intepreter at

Re: [Haskell-cafe] Confused by ghci output

2012-05-31 Thread Sean Leather
On Thu, May 31, 2012 at 6:35 PM, Clark Gaebel wrote: *X 3^40 `mod` 3 == modexp2 3 40 3 False *X modexp2 3 40 3 0 *X 3^40 `mod` 3 0 *X 3^40 `mod` 3 :: Int 1 *X 3^40 `mod` 3 :: Integer 0 I'm confused. Last I checked, 0 == 0. Yes, but 3^40 /= 3^40 when you have arithmetic overflow: *X

Re: [Haskell-cafe] Zipper and Comonad

2012-05-22 Thread Sean Leather
Hi Mathijs, On Tue, May 22, 2012 at 8:42 AM, Mathijs Kwik wrote: After using zippers for a while, I wanted to dig a bit deeper into them. I found there is some relation between Zipper and Comonad, but this confuses me somewhat. You might also take a look at: Comonadic functional attribute

Re: [Haskell-cafe] (+1) vs let inc=(+1)

2012-05-22 Thread Sean Leather
On Tue, May 22, 2012 at 9:34 PM, Artyom Kazak wrote: http://www.haskell.org/**haskellwiki/Monomorphism_**restrictionhttp://www.haskell.org/haskellwiki/Monomorphism_restriction + http://www.haskell.org/ghc/docs/latest/html/users_guide/interactive-evaluation.html#extended-default-rules

Re: [Haskell-cafe] Arithmetic expressions with GADTs: parsing

2012-05-02 Thread Sean Leather
Hi Romildo, On Wed, May 2, 2012 at 3:08 PM, j.romildo wrote: You are right in the sense that I cannot mix Expr Bool and Expr Double in a (O op l r) expression. But the parser should be able to parse any form of expressions. So I rewrite my program to take this into account. The new

[Haskell-cafe] DHD = UHac: Register by April 1 for the DHD

2012-03-30 Thread Sean Leather
, April 1.* Our sponsor for the DHD, Ordina, will use the registration to prepare the (free!) lunch and venue. If you're coming only to UHac and not the DHD, you can register by April 19. http://www.haskell.org/haskellwiki/DHD_UHac/Register See you in Utrecht! The Organizers: Sean Leather

Re: [Haskell-cafe] Adding type annotations to an AST?

2012-03-14 Thread Sean Leather
Hi Stephen, On Mon, Mar 5, 2012 at 08:52, Stephen Tetley wrote: How do I add type annotations to interior locations in an abstract syntax tree? I use an annotated expression tree in my work. The nodes of the AST are annotated with the type, assumption set, and constraint set as described in

[Haskell-cafe] ANNOUNCE: join (UHac $ DHD)

2012-03-13 Thread Sean Leather
to a new location. Actually, it's the same location as on Saturday and Sunday, so that should make things easier. See you in Utrecht! The Organizers: Sean Leather Jurriën Stutterheim Jurriaan Hage P.S. Make sure your Monad is also a Functor. P.P.S. Apologies for multiple copies

Re: [Haskell-cafe] Nico de Bruijn dies at 93

2012-02-20 Thread Sean Leather
More: http://translate.google.com/translate?sl=nltl=enu=http%3A%2F%2Fweb.tue.nl%2Fcursor%2Finternet%2Fjaargang54%2Fcursor11%2Fnieuws%2Findex.php%3Fpage%3Dx34 Background: http://en.wikipedia.org/wiki/Nicolaas_Govert_de_Bruijn ___ Haskell-Cafe mailing

[Haskell-cafe] ANNOUNCE: Registration open for DHD = UHac, April 20 - 22, Utrecht

2012-02-13 Thread Sean Leather
new project or toy. It doesn't have to be research. It doesn't even have to be done. Just email Sean Leather (leat...@cs.uu.nl) with your idea, and we'll talk about it. Also, the wiki has been updated with a lot more information since that last announcement. We'll continue to add more. Let us know

Re: [Haskell-cafe] Switching GHC Version

2012-02-07 Thread Sean Leather
Hi Yusaku, On Tue, Feb 7, 2012 at 00:27, HASHIMOTO, Yusaku wrote: Hi, I wrote a simple shell function for switching GHC version on the system. It works only under Mac OSX, and only switch GHCs installed via .pkg installers. It's useful to experiment newer features without worrying breaking

Re: [Haskell-cafe] Haskellers in Delhi, India

2012-01-24 Thread Sean Leather
On Tue, Jan 24, 2012 at 10:21, Anupam Jain wrote: Are there any haskellers in Delhi or nearby areas interested in a meetup? I've been dabbling in Haskell for a long time I'm not in India, but I am curious about the use of Haskell or other FP languages for teaching/research there. Do you (or

Re: [Haskell-cafe] Not an isomorphism, but what to call it?

2012-01-20 Thread Sean Leather
On Thu, Jan 19, 2012 at 23:21, Dan Doel wrote: A is a retract of B. http://nlab.mathforge.org/nlab/show/retract g is the section, f is the rectraction. You seem to have it already. The definition needn't be biased toward one of the functions. Great! That's what I was looking for.

[Haskell-cafe] Not an isomorphism, but what to call it?

2012-01-19 Thread Sean Leather
I have two types A and B, and I want to express that the composition of two functions f :: B - A and g :: A - B gives me the identity idA = f . g :: A - A. I don't need g . f :: B - B to be the identity on B, so I want a weaker statement than isomorphism. I understand that: (1) If I look at it

Re: [Haskell-cafe] Where is the pairing-with-monoid monad instance?

2012-01-11 Thread Sean Leather
On Wed, Jan 11, 2012 at 03:23, Conal Elliott wrote: Is the standard pair-with-monoid monad instance in some standard place? I see the Applicative instance in Control.Applicative, and the pair-with-monoid Functor instance in Control.Monad.Instances, and the (-) e and Either e monad instances

[Haskell-cafe] ANNOUNCE: DHD = UHac, April 20 - 22, Utrecht

2012-01-07 Thread Sean Leather
of the community of enthusiastic Haskell hackers from around the world. It will start immediately following the DHD and continue to Sunday, April 22. = Call for Speakers = We are looking for speakers for the Dutch HUG Day. If you have something interesting to share, please email Sean Leather (leat

[Haskell-cafe] Type checker for haskell-src-exts (was: Typechecking Using GHC API)

2011-12-15 Thread Sean Leather
On Thu, Dec 15, 2011 at 11:07, Niklas Broberg wrote: Envisioned: The function you ask for can definitely be written for haskell-src-exts, which I know you are currently using. I just need to complete my type checker for haskell-src-exts first. Which is not a small task, but one that has been

Re: [Haskell-cafe] Haskell at University in Munich

2011-12-05 Thread Sean Leather
On Mon, Dec 5, 2011 at 00:18, Bartosz Wójcik wrote: If Munich and 200 km circle do not provide with any offer, perhaps you may know what is available in Europe, limiting language of study to [German, English, Polish]? I believe the following recent thread will help answer this question:

[Haskell-cafe] Tutorial/slides on pretty-printing combinators?

2011-11-16 Thread Sean Leather
Do you know of any tutorial or slides from a talk on one of the pretty-printing libraries? It could be on Text.PrettyPrint.HughesPJ or uulib or any other, similar library. I'm thinking of developing slides for a course, and I'm looking for sources of inspiration. Regards, Sean

[Haskell-cafe] Dutch National FP Day 2012

2011-11-16 Thread Sean Leather
(Sent on behalf of Doaitse Swierstra) Despite some last minute changes to the planning we are happy to announce that the next Dutch functional programming day will take place on January 6, 2012, at the university campus De Uithof of Utrecht University. In case you want to give a presentation

Re: [Haskell-cafe] [Haskell] Dutch National FP Day 2012

2011-11-16 Thread Sean Leather
What is the language of the talks and the participants? English or Dutch? In past years the language of the talks has always been English. Also, most Dutch people speak English pretty well, I think. Yes, what Erik said. Also, even though previous years' websites (below) have been in Dutch,

Re: [Haskell-cafe] compiler construction

2011-11-03 Thread Sean Leather
Hi Timo, Now I look for Universities, which offer compiler construction, since I need that course, preferably in the UK, Ireland, Australia or New Zealand. Ideally it would be in Haskell of course. I currently work in a research group that is well known for their compiler construction

Re: [Haskell-cafe] MonadPlus versus Alternative

2011-10-30 Thread Sean Leather
On Sun, Oct 30, 2011 at 04:02, Gregory Crosswhite wrote: So is there any difference between the interpretation of MonadPlus and Alternative, or is the only difference between them that the former applies to Monad whereas the latter applies to Applicative? Somewhat OT, but this led me to

Re: [Haskell-cafe] What library package fulfills these requirements?

2011-10-28 Thread Sean Leather
Hi Han, On Fri, Oct 28, 2011 at 09:06, Han Joosten wrote: I am planning to give a workshop on FP using Haskell. The audience will be programmers with quite a bit of experience with conventional languages like Java and .net . I want to give them some feeling about FP. And hopefully, they will

Re: [Haskell-cafe] Google Knol and haskellers

2011-10-13 Thread Sean Leather
On Wed, Oct 12, 2011 at 12:35, Yves Parès wrote: I re-head recently about Google Knol, which is IMO some crossing-over between a wiki and a blog. Are there some people that use it here to write haskell-related articles instead of a regular blog? As far as anybody outside Google knows, Knol

Re: [Haskell-cafe] Question: Lazy Incremental Evaluation and Haskell?

2011-10-07 Thread Sean Leather
Hi Benjamin, My question is, roughly, is there already an existing framework for incremental evaluation in Haskell? We at Utrecht have done some work on this: http://people.cs.uu.nl/andres/Incrementalization/ Simply put, if your computation is a fold/catamorphism, then you can easily take

[Haskell-cafe] Type family instances in Haddock?

2011-09-30 Thread Sean Leather
Would it be useful/worthwhile to have type/data family instances show up in Haddock just as type class instances do? Regards, Sean ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Where is SNMap for stable names?

2011-09-24 Thread Sean Leather
using immutability only for performance reasons? In that case, it's not a fundamental difference. Regards, Sean Sent from my iPad On Sep 23, 2011, at 5:33 AM, Sean Leather leat...@cs.uu.nl wrote: Hi Edward, On Thu, Sep 22, 2011 at 16:50, Edward Kmett wrote: I have a stable-maps package

Re: [Haskell-cafe] Where is SNMap for stable names?

2011-09-23 Thread Sean Leather
Hi Edward, On Thu, Sep 22, 2011 at 16:50, Edward Kmett wrote: I have a stable-maps package that provides lookup and inserting into a map via stable names. The paper mentions the need for a mutable finite map, and all the operations are IO. Do you know why this is and what's different with

[Haskell-cafe] Where is SNMap for stable names?

2011-09-22 Thread Sean Leather
There is an abstract type called SNMap for stable names referred to in [1]. This has apparently disappeared from GHC a long time ago. Is it still available somewhere, or is there a suitable replacement for it? Regards, Sean [1] Stretching the storage manager: weak pointers and stable names in

Re: [Haskell-cafe] efficient chop

2011-09-15 Thread Sean Leather
On Wed, Sep 14, 2011 at 17:31, Ivan Lazar Miljenovic wrote: On 15 September 2011 01:24, Sean Leather wrote: On Wed, Sep 14, 2011 at 05:03, Kazu Yamamoto wrote: I would like to have an efficient implementation of the chop function. [...] Are there any more efficient

Re: [Haskell-cafe] efficient chop

2011-09-14 Thread Sean Leather
On Wed, Sep 14, 2011 at 05:03, Kazu Yamamoto wrote: I would like to have an efficient implementation of the chop function. [...] Are there any more efficient implementations of chop? Any suggestions? chop xs = go xs id where go _ = id go (c:cs) ss |

Re: [Haskell-cafe] Idiomatic usage of the fixpoint library

2011-09-05 Thread Sean Leather
On Sun, Sep 4, 2011 at 13:03, Roman Cheplyaka wrote: * Sean Leather [2011-09-04 12:48:38+0200] On Sun, Sep 4, 2011 at 12:31, Roman Cheplyaka wrote: I'm looking for an example of idiomatic usage of the fixpoint library[1]. [1]: http://hackage.haskell.org/package/fixpoint-0.1.1

Re: [Haskell-cafe] Idiomatic usage of the fixpoint library

2011-09-04 Thread Sean Leather
On Sun, Sep 4, 2011 at 12:31, Roman Cheplyaka wrote: I'm looking for an example of idiomatic usage of the fixpoint library[1]. [1]: http://hackage.haskell.org/package/fixpoint-0.1.1 I'm not sure if this counts for idiomatic usage, but you can check out our approach to incrementalization.

Re: [Haskell-cafe] XCode Dependency for HP on Mac

2011-07-27 Thread Sean Leather
On Wed, Jul 27, 2011 at 05:55, Tom Murphy wrote: This may sound ignorant because, well, it is ignorant: I know very little about the underlying mechanics here. Installing the Haskell Platform currently requires XCode developer tools. To get XCode on my 10.6 machine, I... ... will check

Re: [Haskell-cafe] ANNOUNCE: Haskell in the Cloud (http://quid2.org)

2011-07-22 Thread Sean Leather
On Fri, Jul 22, 2011 at 12:00, Pasqualino Titto Assini wrote: Enter Quid2 http://quid2.org [1]: the half baked, barely tested, totally unsafe and spectacularly unoptimised Haskell in the Cloud system. Challenging... https://plus.google.com/104222093009939197511/posts/MpgUUayq78o Sean

Re: [Haskell-cafe] How to install GhC on a Mac without registering?

2011-06-06 Thread Sean Leather
On Mon, Jun 6, 2011 at 16:47, Malcolm Wallace wrote: The ghc team already bundle a copy of gcc in their Windows distribution, precisely because it can be fiddly to get a working copy of gcc for that platform otherwise. I wonder if they would consider the possibility of shipping gcc on Mac

Re: [Haskell-cafe] *GROUP HUG*

2011-05-24 Thread Sean Leather
Hi Gregory, I had a similar experience on the scala-user list some time ago. I found most of the responses to my questions to be rather unproductive and superficial. I love the haskell-cafe community for their helpfulness and analytical approach. I left scala-user not long afterward partly

Re: [Haskell-cafe] Fucntion composing

2011-04-11 Thread Sean Leather
Prelude let h x y = (g 0 (f x y)) How to do pointfree definition of h? See the thread http://thread.gmane.org/gmane.comp.lang.haskell.cafe/70488for related material. Regards, Sean ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org

[Haskell-cafe] mtlx has a nice design but is slow

2011-04-06 Thread Sean Leather
I just refactored my type and transform system prototype (introduced in [1] but changed since then) from using mtlx [2] (type-indexed monad transformers described in [3]) to mtl using RWST. mtlx allowed me to cleanly separate the various monadic components in a convenient way. Unfortunately, I

Re: [Haskell-cafe] Could not deduce ... using functional dependencies with GHC7

2011-03-18 Thread Sean Leather
On Fri, Mar 18, 2011 at 13:35, JP Moresmau wrote: These are GHC types, but here is a self-contained example: {-# LANGUAGE MultiParamTypeClasses, FunctionalDependencies, FlexibleInstances #-} data Id=Id String data Result id =ResultId Id | ResultGen id data Sig id=IdSig Id |

[Haskell-cafe] Writer monad corresponds to synthesized attribute?

2011-01-13 Thread Sean Leather
I have been attempting to translate something I did using UUAG into monadic code. It involved inherited, synthesized, and chained attributes. It has been said that such attributes correspond to the Reader, Writer, and State monads, respectively [1]. The former and latter are straightforward, but

Re: [Haskell-cafe] H98, OOHaskell - getting started with objects in Haskell

2011-01-12 Thread Sean Leather
Phil: I wanted to check whether Haskell offers reasonably easy object oriented programming It depends on what you're looking for, but in general, you won't find the same thing you may be used to in native OO languages. 1. OOHaskell doesn't seem to be available in the HackageDB (cabal) -- so

Re: [Haskell-cafe] identity function

2010-12-20 Thread Sean Leather
I've been reviewing the library, and have come unstuck with the *id*function. What's its purpose and can someone give me an example of its practical use. It's purpose is simply to be the identity function. The type says exactly what it does. Prelude :t id id :: a - a It's often useful in

Re: [Haskell-cafe] Managing multiple installations of GHC

2010-12-02 Thread Sean Leather
On Thu, Dec 2, 2010 at 05:16, Robert Clausecker wrote: How can I install GHC 7 parallel to GHC 6.12 with the option to choose? My OS is GNU/Linux, my Distro is Ubuntu (Lucid). I created this for my Ubuntu VM: https://github.com/spl/multi-ghc Regards, Sean

[Haskell-cafe] Precedence of if then else

2010-11-25 Thread Sean Leather
This may be a silly, but I occasionally run into a situation where I'm wondering what the effective precedence of if then else is. I was finally motivated to do a few experiments, and it seems like the precedence level is reset (below 0) after if, then, and else. λ if not $ False then here else x

Re: [Haskell-cafe] Working Generic/Polytypic Haskell extension

2010-10-26 Thread Sean Leather
Hi Mulhern, I would like to teach a small section on polytypism/genericity in the functional programming using Haskell course I'm teaching. I won't, though, unless I can assign an actual programming exercise in polytypic programming, however brief. Can anybody recommend a functioning compiler

Re: [Haskell-cafe] Retargeting Haskell compiler to embedded/hardware

2010-09-29 Thread Sean Leather
Don Stewart: tomahawkins: A few years ago I attempted to build a Haskell hardware compiler (Haskell - Verilog) based on the Yhc frontent. At the time I was trying to overcome several problems [1] with implementing a hardware description language as a light eDSL, which convinced me a

Re: [Haskell-cafe] Scraping boilerplate deriving?

2010-09-14 Thread Sean Leather
On Tue, Sep 14, 2010 at 10:24, Kevin Jardine wrote: I have a set of wrapper newtypes that are always of the same format: newtype MyType = MyType Obj deriving (A,B,C,D) where Obj, A, B, C, and D are always the same. Only MyType varies. A, B, C, and D are automagically derived by GHC using

Re: [Haskell-cafe] Re: [wxhaskell-users] problems using macports?

2010-09-09 Thread Sean Leather
On Thu, Sep 9, 2010 at 17:44, Eric Y. Kow wrote: On Thu, Sep 09, 2010 at 17:38:40 +0200, S. Doaitse Swierstra wrote: I am in my yearly fightto get a working combination of operating system (Snow Leopard), compiler version (6.12) , wxWidgets and wxHaskell on my Mac . After deleting most of

Re: [Haskell-cafe] Slightly humorous: Headhunters toolbox (example for Germany)

2010-08-28 Thread Sean Leather
On Sat, Aug 28, 2010 at 01:29, Vo Minh Thu wrote: It would be interesting to know some other sources: [...] number of attendees to e.g. Utrecht summer school on FP, ... Just a bit over 30, I think. And it was interesting to see a significant number of non-student participants. Perhaps around

Re: [Haskell-cafe] Academic Haskell Course

2010-08-19 Thread Sean Leather
Can anyone point me towards existing work I could use? Open course material and syllabuses I could use, with the necessary references? At Utrecht University: - http://www.cs.uu.nl/wiki/FP - for first-year bachelors - http://www.cs.uu.nl/wiki/Afp - for first-year masters -

Re: [Haskell-cafe] Re: String vs ByteString

2010-08-14 Thread Sean Leather
Yitzchak Gale wrote: Sean Leather wrote: Which one do you use for strings in HTML or XML in which UTF-8 has become the commonly accepted standard encoding? UTF-8 is only becoming the standard for non-CJK languages. We are told by members of our community in CJK countries that UTF-8

Re: [Haskell-cafe] Re: String vs ByteString

2010-08-13 Thread Sean Leather
Johan Tibell wrote: Here's a rule of thumb: If you have binary data, use Data.ByteString. If you have text, use Data.Text. Those libraries have benchmarks and have been well tuned by experienced Haskelleres and should be the fastest and most memory compact in most cases. There are still a few

Re: [Haskell-cafe] lambdacats

2010-08-06 Thread Sean Leather
On Fri, Aug 6, 2010 at 12:12 AM, Tony Morris wrote: Hello, does anyone happen to have the lambdacats page cached? The domain ( arcanux.org) and server have disappeared and the wayback machine doesn't have the images. On Fri, Aug 6, 2010 at 18:43, John Van Enk wrote: I happened to download

Re: [Haskell-cafe] lambdacats

2010-08-06 Thread Sean Leather
Simon cat and Oleg cat are also missing, unfortunately. Also the 'catamorphism' picture with the banana peel (there may be others I can't recall, too). Well, I found what I could... http://spl.smugmug.com/Humor/Lambdacats/13227630_eKt46#960831913_rhDdG

Re: [Haskell-cafe] Comments on Haskell 2010 Report

2010-07-09 Thread Sean Leather
On Fri, Jul 9, 2010 at 16:23, Steve Schafer wrote: On Fri, 09 Jul 2010 10:07:06 -0400, brandon s. allbery wrote: I don't think I've ever seen them *followed* by commas. Preceded, always. In American English, they're always followed by commas, and preceded by comma, semicolon, dash or left

Re: [Haskell-cafe] Comments on Haskell 2010 Report

2010-07-09 Thread Sean Leather
On Fri, Jul 9, 2010 at 18:35, Steve Schafer wrote: On Fri, 9 Jul 2010 17:14:31 +0200, Sean Leather wrote: One of the nice things about English is that there is often never an always. See http://grammar.quickanddirtytips.com/ie-eg-oh-my.aspx for a discussion. Well, that page pretty much

Re: [Haskell-cafe] How easy is it to hire Haskell programmers

2010-07-05 Thread Sean Leather
On Fri, Jul 2, 2010 at 15:43, Edward Kmett wrote: I've had a fairly easy time of hiring Haskell programmers. Does this mean your company actively uses Haskell in projects? Would you be willing/able to describe this work in more detail for the curious? Sean

[Haskell-cafe] www.haskell.org web server down?

2010-06-01 Thread Sean Leather
It responds to pings but not http. http://downforeveryoneorjustme.com/www.haskell.org Sean ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Parselib sample

2010-06-01 Thread Sean Leather
I've thought about writing an article for The Monad Reader - moving from Graham Hutton's parsers to Parsec, if there's any interest I'll look into doing it. For the time being the main difference is probably that Parsec parsers generally use the TokenParser module for some of the combinators

Re: [Haskell-cafe] Why Either = Left | Right instead of something like Result = Success | Failure

2010-05-30 Thread Sean Leather
I have little experience with Haskell, but I haven't seen Either used in contexts other than error/success. If you could point me to some piece of code that uses it in a different way it would be great. One example use case is datatype-generic programming. {-# LANGUAGE TypeFamilies #-}

[Haskell-cafe] Re: Is anyone using Haddock's support for frames?

2010-05-04 Thread Sean Leather
* We probably want to replace the frames with something more modern (like a sidebar on the same page) in the future * We are rewriting the HTML backend and it would be nice to avoid unnecessary work So if you're using this feature and want to keep it, please speak up! Somewhat OT, but

Re: [Haskell-cafe] MonadPlus or Alternative or ...?

2010-05-02 Thread Sean Leather
On Sun, May 2, 2010 at 12:07, Sebastian Fischer wrote: On May 2, 2010, at 11:10 AM, Sean Leather wrote: Or should I make my own class? Then, there obviously won't be any instances for existing types other than your own (which might be a good or bad thing). You may want to do this, if you

[Haskell-cafe] MonadPlus or Alternative or ...?

2010-05-01 Thread Sean Leather
I want to generalize a set of functions from lists to some functor type. I require the following three operation types. f a a - f a f a - f a - f a Should I choose MonadPlus and use these? mzero return mplus Or should I choose Alternative and use these? empty pure (|) Or

Re: [Haskell-cafe] Confusions about the Haskell Platform (for Mac)

2010-04-18 Thread Sean Leather
On Sun, Apr 18, 2010 at 01:46, Don Stewart wrote: leather: 2. What is the difference between Haskell and the Haskell Platform? I see one or the other in various places. To get from www.haskell.org to downloading the Mac software, I go through Download Haskell, Get the Haskell Platform

Re: [Haskell-cafe] Re: help with Haskell programming

2010-04-18 Thread Sean Leather
This is the annoying part about Haskell . I can not understand composition . One of the ways of understanding composition (and many other functions in Haskell) is by trying to understand its type. Here it is shown by looking at the type in the interpreter GHCi. *Main :t (.) (.) :: (b - c) -

Re: [Haskell-cafe] ANN: haskell-src-exts 1.9.0

2010-04-15 Thread Sean Leather
Hi Niklas, I'm pleased to announce the release of haskell-src-exts-1.9.0! * On hackage: http://hackage.haskell.org/package/haskell-src-exts Any idea why the Haddock docs have not been generated for this version? There's also no built on available. Is it an issue with the server? Regards,

Re: [Haskell-cafe] ANN: haskell-src-exts 1.9.0

2010-04-15 Thread Sean Leather
On Thu, Apr 15, 2010 at 12:00, Ivan Lazar Miljenovic ivan.miljeno...@gmail.com wrote: Sean Leather leat...@cs.uu.nl writes: I'm pleased to announce the release of haskell-src-exts-1.9.0! * On hackage: http://hackage.haskell.org/package/haskell-src-exts Any idea why the Haddock docs

Re: [Haskell-cafe] ANN: haskell-src-exts 1.9.0

2010-04-15 Thread Sean Leather
Hmm, now it does. Apparently, the server saw my email and responded nicely. Well, it takes half an hour or so... Yes, version 1.9.0 of haskell-src-exts was uploaded on Sun Apr 11 10:43:03 UTC 2010, but the ghc build is dated as modified on 15-Apr-2010 02:42 (in some unknown timezone)

[Haskell-cafe] Dutch HUG Day: Program and Call for Participation

2010-04-11 Thread Sean Leather
[Apologies for multiple copies.] --- Dutch HUG Day 24 April 2010 Ordina office Niewegein, The Netherlands --- *** *** Please register! *** *** Email Sean Leather leat...@cs.uu.nl by 20 April

[Haskell-cafe] multi-ghc: Managing Multiple GHC Distributions

2010-04-08 Thread Sean Leather
I created a few tools to help me manage multiple GHC distributions in a Bash shell environment. Perhaps it's useful to others. http://github.com/spl/multi-ghc Feedback welcome. I'd also like to know if something similar exists. Regards, Sean ___

Re: [Haskell-cafe] multi-ghc: Managing Multiple GHC Distributions

2010-04-08 Thread Sean Leather
On Thu, Apr 8, 2010 at 13:49, Bas van Dijk v.dijk@gmail.com wrote: On Thu, Apr 8, 2010 at 11:00 AM, Sean Leather leat...@cs.uu.nl wrote: I created a few tools to help me manage multiple GHC distributions in a Bash shell environment. Perhaps it's useful to others. http://github.com

Re: [Haskell-cafe] multi-ghc: Managing Multiple GHC Distributions

2010-04-08 Thread Sean Leather
On Thu, Apr 8, 2010 at 14:00, Bernie Pope florbit...@gmail.com wrote: On 8 April 2010 19:00, Sean Leather leat...@cs.uu.nl wrote: I created a few tools to help me manage multiple GHC distributions in a Bash shell environment. Perhaps it's useful to others. http://github.com/spl/multi

Re: Haskell+Cassandra was: RE: [Haskell-cafe] Re: Haskell.org re-design

2010-04-06 Thread Sean Leather
On Tue, Apr 6, 2010 at 11:47, Johan Tibell wrote: On Tue, Apr 6, 2010 at 11:41 AM, Dr. Martin Grabmüller martin.grabmuel...@eleven.de wrote: Maybe a bit off-topic, but as Johan mentioned the Cassandra web site... Are there any Haskellers out there using Cassandra with Haskell? Not yet

[Haskell-cafe] Confusions about the Haskell Platform (for Mac)

2010-04-06 Thread Sean Leather
1. Why can't the platform download site be hosted on www.haskell.org instead of hackage.haskell.org? I see that there's a redirect, but (imho) it would be ideal to have www.haskell.org/platform be the standard URL in my browser. It is easier to remember (for typing) and more obvious (for

[Haskell-cafe] Re: Confusions about the Haskell Platform (for Mac)

2010-04-06 Thread Sean Leather
On Tue, Apr 6, 2010 at 13:47, Sean Leather wrote: 1. [...] 7. 8. The binaries do not work on Leopard (10.5.8). $ /usr/local/bin/cabal dyld: unknown required load command 0x8022 Trace/BPT trap This was previously reported at http://thread.gmane.org/gmane.comp.lang.haskell.cafe

Re: [Haskell-cafe] [OT?] Haskell-inspired functions for BASH

2010-04-06 Thread Sean Leather
A question of my own: is there any written design (an academic paper would be perfect) of a functional shell language? A few: http://www.citeulike.org/user/spl/tag/shell More resources: http://www.cse.unsw.edu.au/~pls/thesis-topics/functionalshell.html Regards, Sean

Re: [Haskell-cafe] Confusions about the Haskell Platform (for Mac)

2010-04-06 Thread Sean Leather
Hi Gregory, Thanks for the reply. Gregory Collins wrote: Sean Leather writes: 4. The current link for the Mac image points to http://hackage.haskell.org/platform/2010.1.0.0/haskell-platform-2010.1.0.1-i386.dmg . Note the inconsistency between the version in the directory and file

Re: [Haskell-cafe] Re: Haskell.org re-design

2010-03-29 Thread Sean Leather
On Mon, Mar 29, 2010 at 16:24, Simon Marlow wrote: On 29/03/2010 13:20, Christopher Done wrote: On 29 March 2010 11:19, Simon Marlow wrote: Is the footer necessary? I dislike sites that have too many ways to navigate, and the footer looks superfluous. The footer will probably be off

Re: [Haskell-cafe] Are there any female Haskellers?

2010-03-27 Thread Sean Leather
On Sat, Mar 27, 2010 at 23:09, Leon Smith wrote: I've heard rumors that in the early days of programming, that women were in the majority, or at least they represented a much greater proportion of programmers than they do now. They're not just rumors:

[Haskell-cafe] Call for Praatjes: Dutch HUG Day

2010-03-20 Thread Sean Leather
. You can choose from one of the formats and topics below, or feel free to suggest something different. If you are interested in presenting, please send your proposal to Sean Leather by Saturday, April 3. More details are below. *FORMATS* - Talks (20 min) - Tutorials (25 min

[Haskell-cafe] Re: How do you rewrite your code?

2010-03-03 Thread Sean Leather
*How do you rewrite your code to improve it?* Edward Kmett just introduced one in another thread. Simplifying, it would be this: For all x, y, f: do { x' - x ; y' - y ; return (f x' y') } -- f $ x * y This is a great example, because (1) it reduces clutter and temporary names and (2)

[Haskell-cafe] How do you rewrite your code?

2010-03-02 Thread Sean Leather
There are numerous threads on the Haskell Café involving rewriting, refactoring, refining, and in general improving code (for some definition of improve). I am interested in seeing examples of how Haskell code can be rewritten to make it better. Some general examples are: - Eta-reduce -

[Haskell-cafe] Interested in the Dutch HUG Day (24 April 2010)?

2010-02-25 Thread Sean Leather
In honor of the first anniversary of the Dutch Haskell Users Group (formed at Hac5 in Utrecht), we are planning a mini symposium to bring together Haskell and functional programming enthusiasts in the Netherlands and surrounding area. *The Dutch HUG Day will be held on Saturday, 24 April.* Please

  1   2   3   >