> 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
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
>
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
=
Call for Participation
ACM SIGPLAN Haskell Implementors' Workshop
http://haskell.org/haskellwiki/HaskellImplementorsWorkshop/2012
Copenhagen, Denmark, September 14th, 201
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
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
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 :
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
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
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
10 matches
Mail list logo