Re: [Haskell-cafe] Re: Haskell Weekly News: Issue 140 - November 22, 2009

2009-11-24 Thread Sean Leather
On Tue, Nov 24, 2009 at 05:46, Richard O'Keefe wrote: For example, ai in Maori means to copulate, Really [1]? It's amazing what Google [2] will tell you these days. ;) [1] http://researchspace.auckland.ac.nz/handle/2292/343 [2] http://www.google.com/search?q=ai+maori Regards, Sean

Re: [Haskell-cafe] Re: Status of TypeDirectedNameResolution proposal?

2009-11-24 Thread Ketil Malde
Robert Greayer robgrea...@gmail.com writes: allow local modules. module Foo where module Bar where data Bar = Bar { x :: Int, y :: Int } module Baz where data Baz = Baz { x :: Int, y :: Int } f a b = Bar.x a + Baz.y b Independent of TDNR I would welcome this.

RE: [Haskell-cafe] Re: Idea for a very simple GUI llibrary

2009-11-24 Thread hask...@kudling.de
I dream of mostly generated bindings for Haskell to the native windowing toolkit. Eclipse's SWT proves, this is a viable path. See my proposal here: http://www.reddit.com/r/haskell_proposals/comments/9w7nk/adjust_the_swt_binding_generators_for_haskell/ Sam Martin sam.mar...@geomerics.com hat am

Re: [Haskell-cafe] Re: Status of TypeDirectedNameResolution proposal?

2009-11-24 Thread Ben Millwood
On Sun, Nov 22, 2009 at 7:13 PM, Ketil Malde ke...@malde.org wrote: E.g. if module Foo.Bar isn't found in Foo/Bar.hs GHC could look in Foo.hs (which would just contain a concatenation of what would currently reside in Foo.hs and Foo/Bar.hs). The obvious question arising here is what if module

[Haskell-cafe] Re: Haskell-Cafe Digest, Vol 75, Issue 51

2009-11-24 Thread Johnny Morrice
1) the uncensored version 2) Monadam* 3) Monada** 4) Monad*** 5) Mona Putting stars in place of letters in no way makes a word less offensive. Consider the word 'ing'. It's about context. I think it's wise that such a word have a star put in it in the weekly news or a journal

[Haskell-cafe] Pointfree rank-2 typed function

2009-11-24 Thread Bas van Dijk
Hello, Given this program: {-# LANGUAGE Rank2Types #-} newtype Region s a = Region a unRegion :: forall a s. Region s a - a unRegion (Region x) = x runRegionPointfull :: forall a. (forall s. Region s a) - a runRegionPointfull r =

Re: [Haskell-cafe] Re: Status of TypeDirectedNameResolution proposal?

2009-11-24 Thread Ketil Malde
Ben Millwood hask...@benmachine.co.uk writes: E.g. if module Foo.Bar isn't found in Foo/Bar.hs GHC could look in Foo.hs (which would just contain a concatenation of what would currently reside in Foo.hs and Foo/Bar.hs). The obvious question arising here is what if module Foo.Bar *is* found

[Haskell-cafe] Re: Haskell Weekly News: Issue 140 - November 22, 2009

2009-11-24 Thread Maurí­cio CA
Incidentally, I've always wondered about the politically correct way of referring to this programming language (and related implementation in the above-mentioned type system) in academic circles; Is this a question of politically correctness? Since there's no discrimination or prejudice

[Haskell-cafe] Re: [Haskell] Announcing Haskell 2010

2009-11-24 Thread Simon Marlow
On 24/11/2009 15:19, David Leimbach wrote: First off congratulations everyone! Second, Oh shit! Graham Hutton's excellent Haskell introduction book is now not valid Haskell 2010 due to N+K patterns? Right, but it's still valid Haskell 98, and we have no immediate plans at least in GHC to

[Haskell-cafe] HOpenGL and freeglut rendering problems

2009-11-24 Thread Eitan Goldshtrom
Hello. I'm new to this mailing list, so I apologize if this question is inappropriate for this list, but I've been looking for a solution to this problem for weeks and I've had no luck. I am trying to write a program with HOpenGL and freeglut, but I can't seem to get it to render. I'm running

RE: [Haskell-cafe] Pointfree rank-2 typed function

2009-11-24 Thread Simon Peyton-Jones
It used to be, because GHC used to implement so-called deep skolemisation. See Section 4.6.2 of http://research.microsoft.com/en-us/um/people/simonpj/papers/higher-rank/putting.pdf Deep skolemisation was an unfortunate casualty of the push to add impredicative polymoprhism. However, as I

Re: [Haskell-cafe] Pointfree rank-2 typed function

2009-11-24 Thread Bas van Dijk
On Tue, Nov 24, 2009 at 6:02 PM, Simon Peyton-Jones simo...@microsoft.com wrote: It used to be, because GHC used to implement so-called deep skolemisation.   See Section 4.6.2 of http://research.microsoft.com/en-us/um/people/simonpj/papers/higher-rank/putting.pdf Deep skolemisation was an

Re: [Haskell-cafe] Pointfree rank-2 typed function

2009-11-24 Thread Martijn van Steenbergen
Simon Peyton-Jones wrote: It used to be, because GHC used to implement so-called deep skolemisation. See Section 4.6.2 of http://research.microsoft.com/en-us/um/people/simonpj/papers/higher-rank/putting.pdf Deep skolemisation was an unfortunate casualty of the push to add impredicative

Re: [Haskell-cafe] Status of TypeDirectedNameResolution proposal?

2009-11-24 Thread Richard O'Keefe
* For record selectors, currently written (x r), writing r.x is exactly right Algol 68 used 'x of r', which I always found rather readable. COBOL has always used 'x of r' and 'x in r' with the same meaning. BCPL uses 'f O§F r' which may I believe also be written 'f::r'. Fortran uses 'r%x'.

Re: [Haskell-cafe] Re: Haskell Weekly News: Issue 140 - November 22, 2009

2009-11-24 Thread Richard O'Keefe
On Nov 24, 2009, at 10:29 PM, Sean Leather wrote: On Tue, Nov 24, 2009 at 05:46, Richard O'Keefe wrote: For example, ai in Maori means to copulate, Really [1]? It's amazing what Google [2] will tell you these days. ;) Really! Check http://www.maoridictionary.co.nz/ In fact if you read

[Haskell-cafe] haskell-mode.el mailing list (+ dpatch)

2009-11-24 Thread Valery V. Vorotyntsev
Is there anybody except me feeling the need for mailing list and issue tracker for emacs' haskell-mode? Mailing list is a forum to discuss ideas _and_ the area of patch authors' self-advertisement. And issue tracker is a TODO list; it may be useful or annoying, and I think we can live without one

[Haskell-cafe] Re: haskell-mode.el mailing list (+ dpatch)

2009-11-24 Thread Valery V. Vorotyntsev
-- Description of the attached dpatch:  * make `inferior-haskell-find-project-root' respect export lists No joke this time. Sorry for the glitch. -- vvv Tue Nov 24 23:48:05 EET 2009 Valery V. Vorotyntsev valery...@gmail.com * make `inferior-haskell-find-project-root' respect export lists

[Haskell-cafe] Where is `newTVarIO` defined ?

2009-11-24 Thread zaxis
I cannot hoogle it. It appears in Pugs: run' (-d:rest) = do info - fmap Just (io $ newTVarIO Map.empty) let ?debugInfo = info run' rest Sincerely! - fac n = foldr (*) 1 [1..n] -- View this message in context:

Re: [Haskell-cafe] Where is `newTVarIO` defined ?

2009-11-24 Thread Ross Mellgren
Control.Concurrent.STM On Nov 24, 2009, at 6:11 PM, zaxis wrote: I cannot hoogle it. It appears in Pugs: run' (-d:rest) = do info - fmap Just (io $ newTVarIO Map.empty) let ?debugInfo = info run' rest Sincerely! - fac n = foldr (*) 1 [1..n] -- View this

Re: [Haskell-cafe] Where is `newTVarIO` defined ?

2009-11-24 Thread Ben Millwood
On Tue, Nov 24, 2009 at 11:11 PM, zaxis z_a...@163.com wrote: I cannot hoogle it. It appears in Pugs: run' (-d:rest)                 = do    info - fmap Just (io $ newTVarIO Map.empty)    let ?debugInfo = info    run' rest Sincerely! - fac n = foldr (*) 1 [1..n] -- View this

[Haskell-cafe] Re: haskell-mode.el mailing list (+ dpatch)

2009-11-24 Thread Jose A. Ortega Ruiz
valery...@gmail.com (Valery V. Vorotyntsev) writes: Is there anybody except me feeling the need for mailing list and issue tracker for emacs' haskell-mode? FWIW, you have my vote too. I'm convinced that a discussion forum and tracker would foster contributions from the many emacs users in the

Re: [Haskell-cafe] Where is `newTVarIO` defined ?

2009-11-24 Thread zaxis
thanks! Maybe the hoogle shoud add it Ross Mellgren wrote: Control.Concurrent.STM On Nov 24, 2009, at 6:11 PM, zaxis wrote: I cannot hoogle it. It appears in Pugs: run' (-d:rest) = do info - fmap Just (io $ newTVarIO Map.empty) let ?debugInfo = info run'

[Haskell-cafe] implementing recursive let

2009-11-24 Thread Ben Franksen
I am trying to write an interpreter for a very simple untyped functional language. I have a problem with mutually recursive let expressions, for which my interpreter loops :( This is a code snippet from the eval function: eval :: Expr - Eval Value eval (Let decls body) = mdo let

Re: [Haskell-cafe] implementing recursive let

2009-11-24 Thread Derek Elkins
The following code works fine for me, so it seems you are missing some details that may help. {-# LANGUAGE RecursiveDo, GeneralizedNewtypeDeriving, TypeSynonymInstances, MultiParamTypeClasses #-} import Control.Monad import Control.Monad.State import Control.Monad.Error import

[Haskell-cafe] ANNOUNCE managing cabal dependencies using nix and hack-nix

2009-11-24 Thread Marc Weber
First of all: This is a release (very) early and often release announcment. So expect that there are some minor glitches [5]. Linux is only supported at this moment. [1] summary: main goal: provide an environment (= list dependencies) to build a haskell package with minimal

[Haskell-cafe] Possible FGL bug

2009-11-24 Thread Ivan Lazar Miljenovic
When developing my QuickCheck-2 test-suite for graphviz, I wrote the following Arbitrary instance for FGL graphs (which needs FlexibleInstances): , | instance (Graph g, Arbitrary n, Arbitrary e, Show n, Show e) = Arbitrary (g n e) where | arbitrary = do ns - liftM nub arbitrary |

[Haskell-cafe] Machine Learning Library (SVM)

2009-11-24 Thread Hector Guilarte
Hello cafe, Does anybody knows if there is a Machine Learning Library for Haskell? I looked in hackage and couldn't find anything but something for Data Mining but that's not what I need, however, googling I saw a ticket for google summer of code for writing such library proposed by Ketil

Re: [Haskell-cafe] surrogate code points in a Char

2009-11-24 Thread Mark Lentczner
On Nov 18, 2009, at 7:28 AM, Manlio Perillo wrote: The Unicode Standard (version 4.0, section 3.9, D31 - pag 76) says: Because surrogate code points are not included in the set of Unicode scalar values, UTF-32 code units in the range D800 .. DFFF are ill-formed The current version

Re: [Haskell-cafe] Machine Learning Library (SVM)

2009-11-24 Thread Ketil Malde
Hector Guilarte hector...@gmail.com writes: Ketil, has any progress been made on that library? Specially in the SVM part which is what I'm really looking for... No, the SoC ticket was not funded, and I am not aware of any other Haskell implementation of SVMs (and if there is one, I'm sure it

RE: [Haskell-cafe] Machine Learning Library (SVM)

2009-11-24 Thread john lask
look at: http://www.cs.utah.edu/~hal/SVMseq/ this works but is a little slow and would benefit by being updated to use the bytestring library. and generic data clustering ... http://www.cs.utah.edu/~hal/GDC/ From: ke...@malde.org To: hector...@gmail.com Subject: Re: [Haskell-cafe]

Re: [Haskell-cafe] Re: haskell-mode.el mailing list (+ dpatch)

2009-11-24 Thread Johan Tibell
On Wed, Nov 25, 2009 at 1:03 AM, Jose A. Ortega Ruiz j...@gnu.org wrote: valery...@gmail.com (Valery V. Vorotyntsev) writes: Is there anybody except me feeling the need for mailing list and issue tracker for emacs' haskell-mode? FWIW, you have my vote too. I'm convinced that a discussion