Re: [Haskell-cafe] Haskell and the Software design process

2010-05-04 Thread Colin Paul Adams
> "aditya" == aditya siram writes: aditya> This is awesome! GHC-devs , please mainline the CONTRACT aditya> pragma. I think it needs a LOT more work before it is usable. (I hope I'm wrong, but Dana reckoned it needed about 7 more man-years of work.) Dana sent me a copy of her ghc 6

[Haskell-cafe] Re: ANNOUNCE: happstack 0.5.0

2010-05-04 Thread Michael Snoyman
Hey Jeremy, I see below that you included the experimental WAI support. I'm excited to try it out, but I don't see it in happstack-server (maybe I'm blind). Could you point it out? Thanks, Michael On Mon, May 3, 2010 at 8:57 PM, Jeremy Shaw wrote: > (Note: Reply-to is set to haskell-cafe@haske

Re: [Haskell-cafe] Re: Learning about Programming Languages (specifically Haskell)

2010-05-04 Thread Samuel Williams
Thanks Roel and Kyle for your contributions! On 4/05/2010, at 10:35 PM, Roel van Dijk wrote: > Here is my attempt. I tried to avoid higher concepts like folds and > things like the ($) operator. Most recursions are written explicitly. > > { BEGIN CODE } > > module Main where > > -- Dat

Re: [Haskell-cafe] Re: Why cabal forces reinstallation of happstack-utils?

2010-05-04 Thread Ivan Miljenovic
On 5 May 2010 12:04, Maciej Piechotka wrote: > 1. I downloaded happstack-utile[1] > 2. Edited cabal file > 3. Installed it successfully linking with parsec 3.1 > 4. I tried to run cabal install happstack --constraint 'parsec >= 3' > 5. It complains that happstack-utile needs to be installed agains

Re: [Haskell-cafe] Re: Why cabal forces reinstallation of happstack-utils?

2010-05-04 Thread Maciej Piechotka
On Wed, 2010-05-05 at 02:17 +0200, Daniel Fischer wrote: > On Wednesday 05 May 2010 01:45:29, Maciej Piechotka wrote: > > > > I updated local copy, as shown, but cabal wants to rebuild it anyway. My > > question was rather why the repo is considered at all when the package > > is installed. > > > >

[Haskell-cafe] Re: ANNOUNCE: happstack-hamlet: compile-time HTML templates for the Haskell application server stack

2010-05-04 Thread Michael Snoyman
Very cool Jeremy, great work! Please everyone, give me any feedback you have, *especially* the negative kind. Michael On Wed, May 5, 2010 at 12:46 AM, Jeremy Shaw wrote: > Hello, > > I am pleased to announce the availability of happstack-hamlet: > > http://hackage.haskell.org/package/happstack

Re: [Haskell-cafe] Fwd: Error instaling Happstack on Windows - cabal bug?

2010-05-04 Thread Ivan Miljenovic
On 5 May 2010 08:29, Flavio Botelho wrote: > A Windows prompt shows problems (Application not properly initialized) > with a "perl.exe" program. > Does cabal use perl (that's completely unexpected for me)? GHC does if you use -fvia-C (which is not the default even on Windows AFAIK). -- Ivan Laz

Re: [Haskell-cafe] Re: Why cabal forces reinstallation of happstack-utils?

2010-05-04 Thread Daniel Fischer
On Wednesday 05 May 2010 01:45:29, Maciej Piechotka wrote: > > I updated local copy, as shown, but cabal wants to rebuild it anyway. My > question was rather why the repo is considered at all when the package > is installed. > > Regards Okay, I didn't quite understand your question, sorry. So, wha

Re: [Haskell-cafe] Re: Installing ghc in an OpenSolaris Zone

2010-05-04 Thread Lars Viklund
On Tue, May 04, 2010 at 01:36:27PM +0200, Günther Schmidt wrote: > Hello Lars, > > did you happen to manage ghc-6.10.4 in a zone? > > I suspect there are some packages I failed to install into the zone, but > I'm not certain. No, I've never used zones, I just read up about them in the past. --

[Haskell-cafe] Re: Why cabal forces reinstallation of happstack-utils?

2010-05-04 Thread Maciej Piechotka
On Wed, 2010-05-05 at 01:09 +0200, Daniel Fischer wrote: > On Mittwoch 05 Mai 2010 00:55:38, Maciej Piechotka wrote: > > I try to configure happstack with parsec 3.1. It seems to fail due to > > cabal: > > > > happstack-util.cabal says parsec < 3, so --constraint="parsec > 3" and the > given depe

Re: [Haskell-cafe] Why cabal forces reinstallation of happstack-utils?

2010-05-04 Thread Jeremy Shaw
Hello, Seems that happstack-util had an artificially low upper bounds. I just uploaded happstack-util 0.5.0.1 which bumps it to parsec < 4. Make sure that your version of the 'network' library is compiled against parsec 3, since happstack-server depends on both network and parsec. Thank

Re: [Haskell-cafe] Why cabal forces reinstallation of happstack-utils?

2010-05-04 Thread Daniel Fischer
On Mittwoch 05 Mai 2010 00:55:38, Maciej Piechotka wrote: > I try to configure happstack with parsec 3.1. It seems to fail due to > cabal: > happstack-util.cabal says parsec < 3, so --constraint="parsec > 3" and the given dependencies are incompatible, hence it can't be configured. Probably pars

[Haskell-cafe] Why cabal forces reinstallation of happstack-utils?

2010-05-04 Thread Maciej Piechotka
I try to configure happstack with parsec 3.1. It seems to fail due to cabal: I installed happstack-util editing happstack-util.cabal by hand: % grep parsec ~/.ghc/x86_64-linux-6.12.2/package.conf.d/happstack-util-0.5.0-6e27d5d3ba1c07f259d463ee3036c92b.conf parsec-3.1.0-5842597f447f82b210

[Haskell-cafe] Fwd: Error instaling Happstack on Windows - cabal bug?

2010-05-04 Thread Flavio Botelho
Trying to install on Windows, i am having a strange problem (may actually be some cabal bug?), More specifically trying to install happstack-util [13 of 19] Compiling Happstack.Crypto.MD5 ( src\Happstack\Crypto\MD5.hs, dist\bu ild\Happstack\Crypto\MD5.o ) cabal: Error: some packages failed to ins

[Haskell-cafe] ANNOUNCE: happstack-hamlet: compile-time HTML templates for the Haskell application server stack

2010-05-04 Thread Jeremy Shaw
Hello, I am pleased to announce the availability of happstack-hamlet: http://hackage.haskell.org/package/happstack-hamlet http://patch-tag.com/r/mae/happstack/snapshot/current/content/pretty/happstack-hamlet Happstack is a web application development framework. Hamlet provides HTML templates w

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

2010-05-04 Thread Evan Laforge
On Tue, May 4, 2010 at 1:23 PM, David Waern wrote: > 2010/5/4 Sean Leather : >> Somewhat OT, but is there a place where we can request/review features in >> the new HTML presentation of Haddock. Are there any mockups of what the >> pages might look like? I've had some ideas pop around my head ever

Re: [Haskell-cafe] Haskell and the Software design process

2010-05-04 Thread aditya siram
This is awesome! GHC-devs , please mainline the CONTRACT pragma. -deech On 5/4/10, Edward Kmett wrote: > The papers are available here: http://gallium.inria.fr/~naxu/pub.html > > But in general you can say things like the following: > > (Dana Xu uses a slightly different notation that I can never

Re: [Haskell-cafe] ANN: has-0.4 Entity based records

2010-05-04 Thread HASHIMOTO, Yusaku
I think I missed your point in my last post, and there are more necessary extensions need to be enabled than I wrote before. TypeFamilies, TypeOperator and FlexibleContexts extensions are necessary. So you need to write this at top of the code if you don't choose OPTIONS_GHC pragma. > {-# LANGUAG

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

2010-05-04 Thread David Waern
2010/5/4 Sean Leather : > Somewhat OT, but is there a place where we can request/review features in > the new HTML presentation of Haddock. Are there any mockups of what the > pages might look like? I've had some ideas pop around my head every time I > look at documentation. ;) http://trac.haskell

[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

Re: [Haskell-cafe] Haskell and the Software design process

2010-05-04 Thread Edward Kmett
The papers are available here: http://gallium.inria.fr/~naxu/pub.html But in general you can say things like the following: (Dana Xu uses a slightly different notation that I can never remember). sorted :: Ord a => [a] -> Bool > sorted [] = True > sorted [x] = True > sorted (x:xs) = x < head xs

Re: [Haskell-cafe] Haskell and the Software design process

2010-05-04 Thread Casey McCann
On Tue, May 4, 2010 at 2:43 PM, Gregory Crosswhite wrote: > I definitely like that idea.  :-)  Is this similar to the notion of > dependent types? That's where things tend to wind up eventually, yes. Although, with Haskell as it stands, a great deal of unused information is already present outsid

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

2010-05-04 Thread Thomas Schilling
I think it will no longer be needed once Haddock outputs table-less layout code. Frames caused problems with the back-button, so they weren't really an improvement. A simple CSS float:right + smaller font on the div containing the index would be a lot better. I think it would be best to keep the

Re: [Haskell-cafe] Haskell and the Software design process

2010-05-04 Thread Gregory Crosswhite
I definitely like that idea. :-) Is this similar to the notion of dependent types? Cheers, Greg On May 4, 2010, at 11:21 AM, Kyle Murphy wrote: > This whole thing seems to be touching on something I saw recently and was > quite interested in. I found a site talking about static contract che

Re: [Haskell-cafe] Haskell and the Software design process

2010-05-04 Thread Kyle Murphy
This whole thing seems to be touching on something I saw recently and was quite interested in. I found a site talking about static contract checking in Haskell, unfortunately I can't seem to find it now, but this paper ( http://research.microsoft.com/en-us/um/people/simonpj/papers/verify/haskellcon

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

2010-05-04 Thread David Waern
Hi Since version 2.4.0 Haddock has generated HTML output that uses frames (index-frames.html) in addition to the normal output. We'd like to deprecate this feature unless there is a significant amount of users. The reason is two-fold: * We probably want to replace the frames with something more

Re: [Haskell-cafe] ANN: has-0.4 Entity based records

2010-05-04 Thread HASHIMOTO, Yusaku
I uploaded new version (0.4.0.1) of this package with proper pragmas. On 5 May 2010 02:00, HASHIMOTO, Yusaku wrote: > Hello > >>> I'm pleased to announce the release of my new library, named "has", >>> written to aim to ease pain at inconvinience of Haskell's build-in >>> records. >> >> Hmm, nice

Re: [Haskell-cafe] ANN: has-0.4 Entity based records

2010-05-04 Thread HASHIMOTO, Yusaku
Hello >> I'm pleased to announce the release of my new library, named "has", >> written to aim to ease pain at inconvinience of Haskell's build-in >> records. > > Hmm, nice work, looks interesting. Thanks! >> You can use the has in three steps (without counting installation). >> >> 1. Write {-#

Re: [Haskell-cafe] Haskell and the Software design process

2010-05-04 Thread John Lato
On Tue, May 4, 2010 at 5:31 PM, Gregory Crosswhite wrote: > > Yes, but I think that it is also important to distinguish between cases where > an error is expected to be able to occur at runtime, and cases where an error > could only occur at runtime *if the programmer screwed up*.  If you struct

Re: [Haskell-cafe] ANN: has-0.4 Entity based records

2010-05-04 Thread Luke Palmer
On Tue, May 4, 2010 at 10:18 AM, HASHIMOTO, Yusaku wrote: > Hello, > > I'm pleased to announce the release of my new library, named "has", > written to aim to ease pain at inconvinience of Haskell's build-in > records. Hmm, nice work, looks interesting. > With the has, You can reuse accessors ov

Re: [Haskell-cafe] Haskell and the Software design process

2010-05-04 Thread Gregory Crosswhite
On May 4, 2010, at 5:22 AM, John Lato wrote: > The reason people argue for safeSecondElement over secondElement is > exactly the reason you argue against it. Calling safeSecondElement on > a list with < 2 elements forces the programmer to handle the result > immediately by returning a Maybe, whic

[Haskell-cafe] ANN: has-0.4 Entity based records

2010-05-04 Thread HASHIMOTO, Yusaku
Hello, I'm pleased to announce the release of my new library, named "has", written to aim to ease pain at inconvinience of Haskell's build-in records. With the has, You can reuse accessors over records to write generic function, combine records with another. Repository is at GitHub: http://githu

Re: [Haskell-cafe] Re: Interest in a Mathematics & AI strike force ?

2010-05-04 Thread Alp Mestanogullari
This is a very interesting idea. I consider it to be a long shot compared to "just" writing haskell code to perform these tasks, so I don't think it's a priority, except if someone is willing to work on this. But I'd already be quite satisfied with a more complete and uniform "framework" for mathem

Re: [Haskell-cafe] Set Operations In Haskell's Type System

2010-05-04 Thread Bartek Ćwikłowski
hello, 2010/5/4 John Creighton : > I will continue to try to solve the problem on my own but at the > moment I'm able to get IsSuperSet to work but not the classes Isa, > Child and IsSubSet to work. Unlike set theory IsSubSet is not the same > as switching the order arguments in IsSuperSet because

Re: [Haskell-cafe] Haskell and the Software design process

2010-05-04 Thread John Lato
On Tue, May 4, 2010 at 2:09 PM, Limestraël wrote: > 2010/5/4 John Lato >> >> "Crashing at the point of the error" isn't necessarily useful in >> Haskell due to lazy evaluation.  The code will crash when the result >> of the partial function is evaluated, which may be quite far away (in >> terms o

[Haskell-cafe] Re: Interest in a Mathematics & AI strike force ?

2010-05-04 Thread John Creighton
I know that someone has created a Haskell interpreter for lisp. Perhaps this could server as a starting pointing to creating a translator between lisp and haskell. This is relevant with regards to computer algebra because the computer algebra system Maxima is written is lisp. Their is also a reposi

[Haskell-cafe] Set Operations In Haskell's Type System

2010-05-04 Thread John Creighton
This is partly a continuation from: http://groups.google.ca/group/haskell-cafe/browse_thread/thread/4ee2ca1f5eb88e7a?hl=en# and http://hpaste.org/fastcgi/hpaste.fcgi/view?id=25265 Also of relevance: http://groups.google.ca/group/haskell-cafe/browse_thread/thread/9cc8858a2e51a995?hl=en# http://www

Re: [Haskell-cafe] Haskell and the Software design process

2010-05-04 Thread Casey McCann
On Tue, May 4, 2010 at 9:09 AM, Limestraël wrote: > Are there other methods than Maybe or exceptions to handle the errors in > Haskell? Is the monad Error(T) useful? I believe the usual Error monad is just (Either e), with Left indicating failure. It's the same idea as Maybe, only returning infor

Re[2]: [Haskell-cafe] Haskell and scripting

2010-05-04 Thread Bulat Ziganshin
Hello minh, Tuesday, May 4, 2010, 11:15:03 AM, you wrote: > Numerous games include for instance a complete Lua interpreter, that's just one 100 kb dll :) -- Best regards, Bulatmailto:bulat.zigans...@gmail.com ___ Haske

Re: [Haskell-cafe] Haskell and the Software design process

2010-05-04 Thread Limestraël
2010/5/4 John Lato > "Crashing at the point of the error" isn't necessarily useful in > Haskell due to lazy evaluation. The code will crash when the result > of the partial function is evaluated, which may be quite far away (in > terms of function calls) from where the programmer would expect. >

Re: [Haskell-cafe] Haskell and the Software design process

2010-05-04 Thread John Lato
> From: Rafael Cunha de Almeida > > Ivan Miljenovic disse: >> On 3 May 2010 14:17, aditya siram wrote: >>> I'm a little confused about this too. I've seen many functions defined like: >>> f x = (\s -> ...) >>> which is a partial function because it returns a function and is the same >>> as: >>>

[Haskell-cafe] Re: Installing ghc in an OpenSolaris Zone

2010-05-04 Thread Günther Schmidt
Hello Lars, did you happen to manage ghc-6.10.4 in a zone? I suspect there are some packages I failed to install into the zone, but I'm not certain. Günther Am 29.04.10 23:19, schrieb Lars Viklund: On Thu, Apr 29, 2010 at 09:14:50AM +0200, Christian Maeder wrote: Günther Schmidt schrieb:

Re: [Haskell-cafe] Cabal-install: bus error

2010-05-04 Thread Martijn van Steenbergen
On 5/3/10 23:46, Jason Dagit wrote: This happened to a co-worker on her mac. We used gdb to track the bus errors to the network library. Once we tracked it down to there, we did some combination of deleting $HOME/.cabal, building/installing the latest version of Network and then relinking cabal

Re: [Haskell-cafe] Re: Learning about Programming Languages (specifically Haskell)

2010-05-04 Thread Roel van Dijk
Here is my attempt. I tried to avoid higher concepts like folds and things like the ($) operator. Most recursions are written explicitly. { BEGIN CODE } module Main where -- Data type representing a door which is either Open or Closed. data Door = Open | Closed deriving Show toggle :: D

Re: [Haskell-cafe] Haskell and scripting

2010-05-04 Thread Limestraël
> A complete language needs a complete implementation. No, Minh, I was not talking about re-implementing a whole Lisp/Scheme language interpreter in Haskell. (I know there is BTW a Scheme interpreter made in Haskell : http://jonathan.tang.name/files/scheme_in_48/tutorial/overview.html). But what

Re: [Haskell-cafe] Strict type system allows for a maximum number of programming errors to be caught at compile time.

2010-05-04 Thread Roman Leshchinskiy
On 04/05/2010, at 13:30, Luke Palmer wrote: > On Mon, May 3, 2010 at 11:07 AM, Kyle Murphy wrote: > >> The fact that it doesn't is proof enough that there's a problem >> with it even if that problem is simply that the types you're using aren't >> exactly correct. Further, I'd argue that in the f

Re: [Haskell-cafe] Re: Learning about Programming Languages (specifically Haskell)

2010-05-04 Thread Kyle Murphy
Alright, here's my attempt to add comments, although once again it seems like the choice of algorithm in this example is a little wierd. By checking the output I was able to determine that it results in True for values of n*n-1, but why exactly that is I can't really figure out at the moment. If I

Re: [Haskell-cafe] Interest in a Mathematics & AI strike force ?

2010-05-04 Thread Carter Schonwald
I'd be quite interested in this sort of project . Please keep me in the loop, -Carter On Mon, May 3, 2010 at 11:06 PM, Alp Mestanogullari wrote: > Ok guys, Ivan takes care of graphs =) > > Note that it's more about computational mathematics, for things one would > do for example with Mathematica

Re: [Haskell-cafe] Haskell and scripting

2010-05-04 Thread minh thu
2010/5/4 Limestraël : > ... > > Minh, Kyle, Gwern, the dyre approach seems to be very interesting too. > But if I understood well, we also have to recompile at run-time the > configuration haskell script? > So the final application (Yi, for instance) will need GHC to be installed to > run? Or did I