Re: [Haskell-cafe] CRIP: the Curiously Reoccuring Instance Pattern

2012-08-01 Thread oleg
> did you see this, and the discussion around that time? > http://www.haskell.org/pipermail/haskell-prime/2012-May/003688.html > > I implemented hDeleteMany without FunDeps -- and it works in Hugs (using > TypeCast -- but looks prettier in GHC with equality constraints). I'm afraid I didn't see

[Haskell-cafe] What Haskell Records Need

2012-08-01 Thread Jonathan Geddes
Greetings, tl;dr - What Haskell Records need are semantic editor combinators for free. I know this is yet another Record proposal among many, but none of them out there strike me as being exactly what I want in Haskell. Take the following types from a contrived example. >type Salary = Integer >

[Haskell-cafe] Proposal: Technique to handle package dependency gridlock

2012-08-01 Thread Tom Murphy
We've got a problem with dependencies: http://cdsmith.wordpress.com/2011/01/21/a-recap-about-cabal-and-haskell-libraries/ http://cdsmith.wordpress.com/2011/01/17/the-butterfly-effect-in-cabal/ http://www.reddit.com/r/haskell/comments/x4knd/what_is_the_reason_for_haskells_cabal_package/ I'd like to

[Haskell-cafe] Haskell Implementors' Workshop 2012: Call for Participation

2012-08-01 Thread Johan Tibell
= Call for Participation ACM SIGPLAN Haskell Implementors' Workshop http://haskell.org/haskellwiki/HaskellImplementorsWorkshop/2012 Copenhagen, Denmark, September 14th, 201

[Haskell-cafe] Haskell Weekly News: Issue 238

2012-08-01 Thread Daniel Santa Cruz
Welcome to issue 238 of the HWN, an issue covering crowd-sourced bits of information about Haskell from around the web. This issue covers the week of July 22 to 28, 2012. Quotes of the Week * clsmith: i find programming in haskell is mostly about reinventing things and then discove

Re: [Haskell-cafe] Key-Parametrized Lookup Table

2012-08-01 Thread Paolino
This is without class :-) {-# LANGUAGE TypeFamilies, ExistentialQuantification, FlexibleContexts #-} import Prelude hiding (lookup) import Data.Typeable type family Value a :: * data Assoc = forall a . (Typeable (Value a), Typeable a) => Assoc a (Value a) insert :: (Typeable (Value a), Typeable

Re: [Haskell-cafe] Key-Parametrized Lookup Table

2012-08-01 Thread Paolino
Hello, I made some trial and error with ghci to make it happy. I'm not really sure this has the type safety you asked. {-# LANGUAGE TypeFamilies, ExistentialQuantification, FlexibleContexts #-} import Prelude hiding (lookup) import Data.Typeable class Typeable a => Key a where type Value a :

Re: [Haskell-cafe] Key-Parametrized Lookup Table

2012-08-01 Thread Heinrich Apfelmus
Alexander Foremny wrote: At first glance I noticed some problems with the vault library for my particular approach. Despite from being unique, Key values don't appear to carry any information like the Label I need. However, it might be possible to work around that. The more grave problem seems

Re: [Haskell-cafe] GHC rendering of non-ASCII characters configurable?

2012-08-01 Thread Erik Hesselink
On Wed, Aug 1, 2012 at 2:35 AM, Richard Cobbe wrote: > Well, I initially went with String because I didn't want to clutter up my > code with all of the calls to 'pack', especially around string literals. > I'm open to being convinced that it's worth it to switch, though. For string literals, you

Re: [Haskell-cafe] specifying using type class

2012-08-01 Thread Patrick Browne
Ertugrul,Thank you for your detailed and helpful reply.I was unaware of the distinction between data/value and type constructors.Regards,PatOn 31/07/12, Ertugrul Söylemez wrote:Patrick Browne wrote:> Thanks for all the very useful feed back on this thread.> I would like to present my possibly in