Re: [Haskell-cafe] Ideas

2007-08-25 Thread Philippa Cowderoy
On Sat, 25 Aug 2007, Andrew Coppin wrote: Neil Mitchell wrote: - A wiki program. (Ditto.) Flippi (google: Haskell Flippi) ...and yet haskell.org uses WikiMedia? (Which is written in something bizzare like Perl...) Flippi is... rather minimalistic. And fugly. You

Re: [Haskell-cafe] Ideas

2007-08-25 Thread Philippa Cowderoy
On Sat, 25 Aug 2007, Neil Mitchell wrote: Hi Flippi (google: Haskell Flippi) ...and yet haskell.org uses WikiMedia? (Which is written in something bizzare like Perl...) Yes, but WikiMedia is a result of years of work, Flippi is a lot less. The original version was the result of a

Re: [Haskell-cafe] Building production stable software in Haskell

2007-09-17 Thread Philippa Cowderoy
On Mon, 17 Sep 2007, Adrian Hey wrote: Ideally the way to deal with this is via standardised interfaces (using type classes with Haskell), not standardised implementations. Even this level of standardisation is not a trivial clear cut design exercise. e.g we currently have at least two

Re: [Haskell-cafe] Shouldnt this be lazy too?

2007-09-24 Thread Philippa Cowderoy
On Mon, 24 Sep 2007, Vimal wrote: Hi all, I was surprised to find out that the following piece of code: length [1..] 10 isnt lazily evaluated! I wouldnt expect this to be a bug, but in this case, shouldnt the computation end when the length function evaluation goes something like:

Re: [Haskell-cafe] Shouldnt this be lazy too?

2007-09-24 Thread Philippa Cowderoy
On Mon, 24 Sep 2007, Vimal wrote: Wow, half an hour, about 7 replies :) I dont know which one to quote! Okay. So, why is GHC finding it difficult to conclude that length is always 0? Suppose I define length like: length [] = 0 length (x:xs) = 1 + length xs Hmm, well, I think the fact

Re: [Haskell-cafe] Very crazy

2007-09-25 Thread Philippa Cowderoy
On Tue, 25 Sep 2007, Lennart Augustsson wrote: It's reasonably easy to read. But you could make it more readable. Type signatures, naming the first lambda... It might be reasonable to define something like mapMatrix that happens to be map . map, too. Along with at least a type synonym for

Re: [Haskell-cafe] Pierce on type theory and category theory

2007-09-25 Thread Philippa Cowderoy
On Tue, 25 Sep 2007, Seth Gordon wrote: Are Benjamin C. Pierce's _Types and Programming Languages_ and/or _Basic Category Theory for Computer Scientists_ suitable for self-study? Basic Category Theory depends on your mindset somewhat. TaPL is great though, and frequently recommended. The

Re: [Haskell-cafe] Re: symbol type?

2007-10-10 Thread Philippa Cowderoy
On Wed, 10 Oct 2007, Yitzchak Gale wrote: I wrote: Perhaps Data.HashTable is what you are looking for then? Jerzy Karczmarczuk wrote: extract from Data.Hash what you need... why not try tries? apfelmus wrote: There's always Data.Map Those are log n. I would personally use

Re: [Haskell-cafe] New slogan for haskell.org

2007-10-10 Thread Philippa Cowderoy
On Wed, 10 Oct 2007, Andrew Coppin wrote: (I'm less sold on whether you really need to learn a particular dialect well enough to *program* in it...) If you don't then you won't be able to see how complicated things actually get done. It's also an important exercise in abstracting things

Re: [Haskell-cafe] Re: Type-level arithmetic

2007-10-12 Thread Philippa Cowderoy
On Fri, 12 Oct 2007, Steve Schafer wrote: On Fri, 12 Oct 2007 13:25:28 -0700, you wrote: I'm not sure what sanity has to do with it. Presumably we all agree that it's a good idea for the compiler to know, at compile-time, that head is only applied to lists. Why not also have the compiler

Re: [Haskell-cafe] Re: Type-level arithmetic

2007-10-12 Thread Philippa Cowderoy
On Fri, 12 Oct 2007, Steve Schafer wrote: On Fri, 12 Oct 2007 21:51:46 +0100 (GMT Daylight Time), you wrote: Which is nevertheless the kind of power you need in order to also be able to prove precise properties. We're not talking about POWER, we're talking about SYNTAX. Which has no

Re: [Haskell-cafe] On the verge of ... giving up!

2007-10-14 Thread Philippa Cowderoy
On Sun, 14 Oct 2007, David Stigant wrote: However, most widely-used programs (ex: web browsers, word processors, email programs, data bases, IDEs) tend to be 90% IO and 10% (or less) computation. No, they don't. They look it, but there's always a fair amount of computation going on to

Re: [Haskell-cafe] Do you trust Wikipedia?

2007-10-18 Thread Philippa Cowderoy
On Thu, 18 Oct 2007, PR Stanley wrote: Hi Do you trust mathematical materials on Wikipedia? Paul To a first approximation - trust but verify. -- [EMAIL PROTECTED] I think you mean Philippa. I believe Phillipa is the one from an alternate universe, who has a beard and programs in BASIC,

Re: [Haskell-cafe] On the verge of ... giving up!

2007-10-18 Thread Philippa Cowderoy
On Thu, 18 Oct 2007, [EMAIL PROTECTED] wrote: Felipe Lessa writes: On 10/17/07, Andrew Coppin [EMAIL PROTECTED] wrote: ... And it frustrates the hell out of me that 100% of the human population consider Haskell to be an irrelevant joke language. ... I feel this way as well,

Re: [Haskell-cafe] Functions are first class values in C

2007-12-22 Thread Philippa Cowderoy
On Sat, 22 Dec 2007, Cristian Baboi wrote: On Sat, 22 Dec 2007 16:55:08 +0200, Miguel Mitrofanov [EMAIL PROTECTED] wrote: In Haskell I cannot pass a function to a function, only its expansion. What do you mean by expansion? Can you clarify this? f1=\x-x+1 f2=\x-2*x

Re: [Haskell-cafe] Functions are first class values in C

2007-12-22 Thread Philippa Cowderoy
On Sat, 22 Dec 2007, Cristian Baboi wrote: On Sat, 22 Dec 2007 17:13:55 +0200, Philippa Cowderoy [EMAIL PROTECTED] wrote: Here's a trivial example that does so: (\x - x) (\x - x) A lambda calculus classic that doesn't typecheck in Haskell: (\x - x x) (\x - x x) Feel free

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

2010-03-28 Thread Philippa Cowderoy
On 27/03/2010 21:27, Günther Schmidt wrote: Hi guys (and I mean it), so, in short, no female haskellers ... Bare one which sent me an email directly, but it looks like she's not ready to come out of the closet yet. And those of us already named for you. And there're a few others around

Re: [Haskell-cafe] Re: Are there any gay haskelleres?

2010-03-28 Thread Philippa Cowderoy
On 28/03/2010 21:38, Günther Schmidt wrote: Hi guys, judging by the responses so far it seems that the gay haskellers have more balls than the female haskellers to come out of the closet. Uhm. So we can expect childish comments for not displaying ourselves on demand now? Good to know.

Re: [Haskell-cafe] Re: Are there any gay haskelleres?

2010-03-28 Thread Philippa Cowderoy
On 28/03/2010 22:07, Günther Schmidt wrote: Hi Fraser, hi all, one thing I did notice is the total absence of a sense of humor on this list. The only funny thing that on this list was Don't play with your monads ... Yes, us humourless feminists have clearly poisoned the list as a whole.

Re: [Haskell-cafe] Simple game: a monad for each player

2010-04-10 Thread Philippa Cowderoy
On 10/04/2010 13:57, Yves Parès wrote: I answered my own question by reading this monad-prompt example: http://paste.lisp.org/display/53766 But one issue remains: those examples show how to make play EITHER a human or an AI. I don't see how to make a human player and an AI play SEQUENTIALLY (to

[Haskell-cafe] Anglohaskell preparations?

2010-05-05 Thread Philippa Cowderoy
Hi everyone. It's just over three months until the traditional time for Anglohaskell, so I wanted to ask: is anyone willing to step up and run it this year? We had a volunteer at last year's event, but I've forgotten who. It was also suggested that emails about the organisation and planning of

Re: [Haskell-cafe] Terminology

2010-06-14 Thread Philippa Cowderoy
On 14/06/2010 23:17, Ivan Lazar Miljenovic wrote: Emmanuel Castroemmanuel.cas...@laposte.net writes: In practice, g is an optimised version of f when working on large amount of elements. It's a list, and map is lazy; not too sure you can get anything more optimised than that for

Re: [Haskell-cafe] What is the point of many and some functions in Control.Applicative (for Alternative?)

2010-07-03 Thread Philippa Cowderoy
On 03/07/2010 21:11, Stephen Tetley wrote: For an applicative parser - many is the same combinator as Parsec's many and some is many1. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Re: Trying to write a TCP proxy

2006-09-20 Thread Philippa Cowderoy
On Wed, 20 Sep 2006, John Ky wrote: Actually, it blocks on: putStrLn contents It even blocks if I replace it with: print $ length contents Is there some kind of magic happening here? No, but you're trying to do magic - it can't get all of contents until the connection's

[Haskell-cafe] Quantifying Partial Type Annotations

2006-10-11 Thread Philippa Cowderoy
I've done a bit more thinking about partial type annotations (as proposed on the Haskell' list), and I have a somewhat more concrete proposals for some of the extensions to them that perhaps also makes more sense of the original basic idea as well. I'm sending it to the Cafe this time as it's

Re[2]: [Haskell-cafe] New Name for MissingH?

2006-11-30 Thread Philippa Cowderoy
On Thu, 30 Nov 2006, Bulat Ziganshin wrote: there is one idea: one shouldn't have internet access to be able to use Haskell effectively. so, good organization and proper names would be useful In that vein, Hoogle as an offline tool probably helps. I should play with it sometime. --

Re: [Haskell-cafe] computational time always 0.0 in this example...

2006-12-07 Thread Philippa Cowderoy
On Thu, 7 Dec 2006, Lennart wrote: Hi, with the following code, I want to measure the time being needed to execute the algorithm. But the result is always 0.0. You need to do something to force the result of a, or it'll never actually get evaluated. Depending on the type in question, seq

Re: [Haskell-cafe] Writing Haskell For Dummies Or At Least For People Who Feel Like Dummies When They See The Word 'Monad'

2006-12-11 Thread Philippa Cowderoy
On Mon, 11 Dec 2006, Andrew Wagner wrote: I think there are some great ideas here, and it would be a fantastic project to do as a community, via a wikibook. I, for one, have been studying haskell for several months, and am just starting to see a little bit of light when it comes to monads. I

Re: [Haskell-cafe] Aim Of Haskell

2006-12-15 Thread Philippa Cowderoy
On Fri, 15 Dec 2006, John Meacham wrote: One of the things I notice happens a lot on the lists is that it is very difficult to answer questions without knowing the background of the person asking it. snip Perhaps we as a community need to avoid the urge (it is hard to resist) to give

Re: [Haskell-cafe] Re: [Haskell] [Fwd: Re: Computer Language Shootout]

2007-01-25 Thread Philippa Cowderoy
On Thu, 25 Jan 2007, Kirsten Chevalier wrote: Anything better than staring at intermediate code would be an improvement, since time spent staring at intermediate code usually is time spent narrowing down the 2 lines out of 1000 that are relevant. Maybe it's possible to design tools that could

Re: [Haskell-cafe] parsec3 pre-release [attempt 2]

2008-02-02 Thread Philippa Cowderoy
On Sat, 2 Feb 2008, Antoine Latter wrote: I'm not a fan of parameterizing the Stream class over the monad parameter `m': snip I looked through the sources and I didn't see anywhere where this parameterization gained anything. As a proof of this I did a mechanical re-write removing the

Re: [Haskell-cafe] parsec3 pre-release [attempt 2]

2008-02-02 Thread Philippa Cowderoy
On Sat, 2 Feb 2008, Antoine Latter wrote: To expand on this point, side-effect instances of Stream don't play nice with the backtracking in Text.Parsec.Prim.try: import Text.Parsec import Text.Parsec.Prim import System.IO import Control.Monad type Parser a = (Stream s m Char) =

Re: [Haskell-cafe] parsec3 pre-release [attempt 2]

2008-02-04 Thread Philippa Cowderoy
On Sun, 3 Feb 2008, Antoine Latter wrote: Another picky nit: The monad transformer type is defined as such: data ParsecT s u m a = ParsecT { runParsecT :: State s u - m (Consumed (m (Reply s u a))) } with the Consumed and reply types as: data Consumed a = Consumed a

[Haskell-cafe] Parsec3 stream properties

2008-02-05 Thread Philippa Cowderoy
I'm having a little difficulty finding full properties for Parsec3's Stream class, largely because I don't want to overspecify it with regard to side-effects. Here's the class: class Stream s m t | s - t where uncons :: s - m (Maybe (t,s)) The idea is that: * unfoldM uncons gives the

Re: [Haskell-cafe] parsec3 pre-release [attempt 2]

2008-02-09 Thread Philippa Cowderoy
On Thu, 7 Feb 2008, Albert Y. C. Lai wrote: Is it good or bad to add: instance (MonadIO m) = MonadIO (ParsecT s u m) I don't see any reason not to add it - it's not as if we can prevent people lifting to IO! Good catch. -- [EMAIL PROTECTED] A problem that's all in your head is still a

Re: [Haskell-cafe] Doubting Haskell

2008-02-16 Thread Philippa Cowderoy
On Sat, 16 Feb 2008, Alan Carter wrote: I'm a Haskell newbie, and this post began as a scream for help. Extremely understandable - to be blunt, I don't really feel that Haskell is ready as a general-purpose production environment unless users are willing to invest considerably more than

Re: [Haskell-cafe] Doubting Haskell

2008-02-17 Thread Philippa Cowderoy
On Sun, 17 Feb 2008, Anton van Straaten wrote: Is there a benefit to reusing a generic Either type for this sort of thing? For code comprehensibility, wouldn't it be better to use more specific names? If I want car and cdr, I know where to find it. It's Haskell's standard sum type, with a

[Haskell-cafe] More powerful error handling

2008-02-17 Thread Philippa Cowderoy
For a while I've been meaning to propose something along the lines of this class: class (MonadError m e, MonadError m' e') = MonadErrorRelated m e m' e' | m - e, m' - e', m e' - m' where catch' :: m a - (e - m' a) - m' a rethrow :: m a - (e - e') - m' a with an example instance

Re: [Haskell-cafe] haskellwiki and Project Euler

2008-02-24 Thread Philippa Cowderoy
On Sun, 24 Feb 2008, Daniel Fischer wrote: Agreed, and the page with the code may indeed be considered a valid contribution. However, it certainly would be more valuable if it wasn't bare code, but also included explanations of the mathematical or programmatical ideas behind it. The

Re: [Haskell-cafe] haskellwiki and Project Euler

2008-02-24 Thread Philippa Cowderoy
On Sun, 24 Feb 2008, Daniel Fischer wrote: b) posting C/C++ code there indicates that the reason for that is to be a spoil-sport, not to further learning/thinking Haskell. No, it doesn't. It provides code that people can port - an obvious step in building a more complete wiki page. --

Re: [Haskell-cafe] haskellwiki and Project Euler

2008-02-24 Thread Philippa Cowderoy
On Sun, 24 Feb 2008, Daniel Fischer wrote: Hi all, I try not to be too rude, although I'm rather disgusted. I know there are several sites out on the web where solutions to PE problems are given. That is of course absolutely against the sporting spirit of Project Euler, but hey, not all

Re: [Haskell-cafe] noob question

2008-02-25 Thread Philippa Cowderoy
On Mon, 25 Feb 2008, Ben wrote: interactive:1:8: Ambiguous type variable `t' in the constraints: `Fractional t' arising from a use of `/' at interactive:1:8-10 `Integral t' arising from a use of `^' at interactive:1:7-15 Probable fix: add a type signature that fixes these

Re: [Haskell-cafe] Re: Proving my point

2008-05-16 Thread Philippa Cowderoy
On Fri, 16 May 2008, Achim Schneider wrote: Andrew Coppin [EMAIL PROTECTED] wrote: Wait... unexpected end of input; expecting [...] end of input [...] That's just *wrong*...! ;-) But don't despaire - show us your parser and what it's supposed to parse, and I'm sure somebody

Re: [Haskell-cafe] Re: Proving my point

2008-05-16 Thread Philippa Cowderoy
On Fri, 16 May 2008, Philippa Cowderoy wrote: Confusing, isn't it? It's almost the right message, too. I'm pretty sure the misbehaviour's because eof doesn't consume - see what happens if you put an error message on all of whiteSpace? It is indeed, and because the error merging code can't

Re: [Haskell-cafe] Re: Proving my point

2008-05-16 Thread Philippa Cowderoy
On Fri, 16 May 2008, Achim Schneider wrote: Philippa Cowderoy [EMAIL PROTECTED] wrote: On Fri, 16 May 2008, Achim Schneider wrote: Guess who ran into that with a separate token for layout-inserted braces? It can't be me, as I attempted to be as lazy as possible, not going

Re: [Haskell-cafe] Re: Write Haskell as fast as C. [Was: Re: GHC predictability]

2008-05-16 Thread Philippa Cowderoy
On Fri, 16 May 2008, Don Stewart wrote: I don't understand what's ugly about: go s l x | x m = s / fromIntegral l | otherwise = go (s+x) (l+1) (x+1) I suspect you've been looking at low-level code too long. How about the total lack of domain concepts?

Re: [Haskell-cafe] Re: Proving my point

2008-05-16 Thread Philippa Cowderoy
On Fri, 16 May 2008, Achim Schneider wrote: My problem is that realTopLevel = expr, and that I get into an infinite recursion, never closing enough parens, never hitting eof. Have you run into the left-recursion trap, by any chance? This doesn't work: expr = do expr; ... You can cover

Re: [Haskell-cafe] Re: Write Haskell as fast as C. [Was: Re: GHC predictability]

2008-05-16 Thread Philippa Cowderoy
On Fri, 16 May 2008, Andrew Coppin wrote: Obviously most people would prefer to write declarative code and feel secure that the compiler is going to produce something efficient. Ultimately the only way to do this is to stick to Einstein's advice - make things as simple as possible but no

Re: [Haskell-cafe] Re: Proving my point

2008-05-16 Thread Philippa Cowderoy
On Sat, 17 May 2008, Achim Schneider wrote: There's at least one token before any recursion, so I guess not. After all, it terminates. It's my state that does not succeed in directing the parser not to mess up, so I'm reimplementing the thing as a two-pass but stateless parser now. In most

Re: [Haskell-cafe] Re: Aren't type system extensions fun? [Further analysis]

2008-05-27 Thread Philippa Cowderoy
Warning for Andrew: this post explains a new-to-you typed lambda calculus and a significant part of the innards of Hindley-Milner typing in order to answer your questions. Expect to bang your head a little! On Tue, 27 May 2008, Andrew Coppin wrote: - A function starts out with a polymorphic

[Haskell-cafe] Applicative do?

2009-10-09 Thread Philippa Cowderoy
I do a lot of work with parsers, and want to do more using Applicatives. That said, I'm finding it a little tedious being forced to use pointless style for a task that's well-suited to having a few names around. The idea of an applicative do notation's been kicked around on #haskell a few

Re: [Haskell-cafe] Applicative do?

2009-10-09 Thread Philippa Cowderoy
Robert Atkey wrote: On Fri, 2009-10-09 at 18:06 +0100, Philippa Cowderoy wrote: This leads us to the bikeshed topic: what's the concrete syntax? I implemented a simple Camlp4 syntax extension for Ocaml to do this. I chose the syntax: applicatively let x = foo let y = bar

Re: [Haskell-cafe] Applicative do?

2009-10-09 Thread Philippa Cowderoy
Nicolas Pouillard wrote: Excerpts from Edward Kmett's message of Fri Oct 09 20:04:08 +0200 2009: I have idiom brackets in that toy library already, but the ado syntax is fairly useful if you want to refer to several intermediate results by name. To work with idiom brackets you need to

[Haskell-cafe] GHCi's :t misbehaving

2009-11-17 Thread Philippa Cowderoy
I have some mildly complicated parsing code, that uses parsec to return a computation (in a state monad) that handles operator precedence - so I can handle scoped precedence/fixities, much like in Haskell. I just spent a while bolting on some new features. More time than I'd like, I'd left it

Re: [Haskell-cafe] GHCi's :t misbehaving

2009-11-18 Thread Philippa Cowderoy
Luke Palmer wrote: It's very hard to tell what is going on without more details. If you *at least* give the ghci session, and possibly the whole code (while it might be too much to read, it is not to much to load and try ourselves). This looks like a monomorphism restriction, which shouldn't

Re: [Haskell-cafe] Parsec online resource

2005-02-21 Thread Philippa Cowderoy
On Mon, 21 Feb 2005, Edwin Eyan Moragas wrote: however, i can't dig how i can use the result of the parsing. There's a group of functions runParser, parse, parseFromFile and parseTest all of which 'run' Parsec parsers on input given by one of their parameters and return the result of parsing.

RE: [Haskell-cafe] RFE: Extensible algebraic user-defined data types?

2005-04-29 Thread Philippa Cowderoy
On Fri, 29 Apr 2005, Simon Peyton-Jones wrote: 2. Use sub-typing, so that a value (Left x) is *both* in type Either and in type NEither. This opens a very large and complicated design space, as Ben mentioned. I've been playing with this design space for a while and think there's at least one

Re: [Haskell-cafe] Practical introduction to monads

2005-08-02 Thread Philippa Cowderoy
On Tue, 2 Aug 2005, Paul Moore wrote: I've started learning Haskell, and I'm going through all the tutorial material I can find - there's a lot of good stuff available. One thing I haven't found a really good discussion of, is practical examples of building monads. I've not really seen any.

Re: [Haskell-cafe] Haskell poker server

2005-08-30 Thread Philippa Cowderoy
On Tue, 30 Aug 2005, Tomasz Zielonka wrote: On Tue, Aug 30, 2005 at 12:41:20PM +0200, Joel Reymont wrote: Erlang does this nicely, I replied to the LtU thread. I positively got the impression that nobody was parsing binary data in Haskell ;). I am doing this quite often, I apologize for not

Re: [Haskell-cafe] Autrijus Tang interviewed by Perl.com

2005-09-15 Thread Philippa Cowderoy
On Thu, 15 Sep 2005, Joel Reymont wrote: What is the meaning of xxs@(x:xs) in the code below? I understand that x:xs is a list /head:tail/ but a tuple of (x:xs) does not make sense. It's not a tuple, it's just the usual meaning for parens. -- [EMAIL PROTECTED] The task of the academic

Re: [Haskell-cafe] Really confused

2005-09-21 Thread Philippa Cowderoy
On Wed, 21 Sep 2005, Mark Carter wrote: I get the idea that data SM a = SM (S - (a,S)) maps a state to a result, and a new state. OTOH, looking at instance Monad SM where -- defines state propagation SM c1 = fc2 = SM (\s0 - let (r,s1) = c1 s0 SM

Re: [Haskell-cafe] Re: Interest in helping w/ Haskell standard

2005-10-14 Thread Philippa Cowderoy
On Fri, 14 Oct 2005, Stephane Bortzmeyer wrote: On Fri, Oct 14, 2005 at 04:20:24PM +0200, Wolfgang Jeltsch [EMAIL PROTECTED] wrote a message of 23 lines which said: By the way, it should be possible to handle regular expressions in an Haskell-like way. If you like so, but as one more

Re: [Haskell-cafe] Parsing in Practice

2005-10-18 Thread Philippa Cowderoy
On Tue, 18 Oct 2005, Tom Hawkins wrote: However, I have a few concerns with Parsec. First is performance; what factor of slow-down should I expect? Second is bug prevention. I don't have much experience writing LL(n) grammars, so how easy is it to introduce bugs in a Parsec grammar? Even

Re: [Haskell-cafe] How to use a wiki to annotate GHC Docs? was Re: [Haskell] Re: Making Haskell more open

2005-11-16 Thread Philippa Cowderoy
On Wed, 16 Nov 2005, Arthur van Leeuwen wrote: A nicer solution might be to have the server generate a distorted image of a key (as is done with user registration to combat automated user generation) that should be typed in for an edit to be accepted (if you are not logged in). This comes

Re: [Haskell-cafe] Re: layout problem

2005-11-17 Thread Philippa Cowderoy
On Wed, 16 Nov 2005, Cale Gibbard wrote: If your editor is a little smarter still, it can do the Haskell layout without braces automatically too. The emacs mode helps with this. Yi/hIDE should be able to do it perfectly once it's in a generally usable state. :) The one I'm looking forward

RE: [Haskell-cafe] Records

2005-11-20 Thread Philippa Cowderoy
On Sun, 20 Nov 2005, Simon Marlow wrote: I'm assuming you don't consider the distinction between '::' and ': :' to be a problem - the justification for this is simple and logical: a double colon '::' is a reserved symbol, in the same way that 'then' is a reserved identifier. I have to

Re: [Haskell-cafe] records proposals list

2005-11-21 Thread Philippa Cowderoy
On Mon, 21 Nov 2005, David Roundy wrote: (b) Create some sort of class that allows getter and/or setter functions for field access. (a) involves the creation of a non-function syntax for something that is essentially a function--and means you'll need boiler-plate code if you want to

Re: R: [Haskell-cafe] Hacking Haskell in Nightclubs?

2005-11-29 Thread Philippa Cowderoy
On Tue, 29 Nov 2005, Santoemma Enrico wrote: Doing music is a hard low level problem, a concurrency problem and is also an interesting problem for intelligent and behavioural computation. If it's true that Haskell can do its best on the second and third aspect, the undertaking seems to

Re: [Haskell-cafe] Can't Haskell catch up with Clean's uniqueness typing?

2005-12-08 Thread Philippa Cowderoy
On Thu, 8 Dec 2005, Duncan Coutts wrote: For example it's not currently convenient to find out the strictness that ghc infers for functions (though it is possible). Ideally an IDE or something would be able to present this sort of information along with the inferred type etc. It'd be nice

Re: [Haskell-cafe] Re: Tutorial uploaded

2005-12-21 Thread Philippa Cowderoy
On Wed, 21 Dec 2005, Peter Simons wrote: Some example for writing a text the IO oriented way: do putStrLn bla replicateM 5 (putStrLn blub) putStrLn end whereas the lazy way is putStr (unlines ([bla] ++ replicate 5 blub ++ [end])) Um, maybe it's just me, but I

Re: [Haskell-cafe] Layout rule (was Re: PrefixMap: code review request)

2006-02-28 Thread Philippa Cowderoy
On Wed, 1 Mar 2006, Brian Hulley wrote: Ben Rudiak-Gould wrote: Brian Hulley wrote: Here is my proposed layout rule: snip and whose indentation is accomplished *only* by tabs You can't be serious. This would cause far more problems than the current rule. Why? Surely typing

Re: Pragmatic concurrency Re: [Haskell-cafe] multiple computations, same input

2006-03-29 Thread Philippa Cowderoy
On Wed, 29 Mar 2006, Brian Hulley wrote: This sounds good. The only thing I'm wondering is what do we actually gain by using Haskell in the first place instead of just a strict language? It seems that Haskell's lazyness gives a succinct but too inefficient program which then needs extra code

[Haskell-cafe] Rebindable record syntax

2010-11-11 Thread Philippa Cowderoy
I stood up and suggested rebindable record syntax at Anglohaskell earlier this year, but never got round to posting a proposal. Given the TDNR discussion, it seems timely to link everyone to what I'd got round to writing: http://flippac.org/RebindableRecordSyntax.html Apologies for the lack

Re: [Haskell-cafe] Kind of confusing

2009-05-12 Thread Philippa Cowderoy
already?), but IIRC they're part of how GHC handles boxing. -- Philippa Cowderoy fli...@flippac.org ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Anglohaskell?

2009-05-25 Thread Philippa Cowderoy
who're new or don't remember, http://www.haskell.org/haskellwiki/AngloHaskell contains links to info from previous years - the idea's a get-together with lots of talks from hobbyist to academic, and plenty of chat. -- Philippa Cowderoy fli...@flippac.org

[Haskell-cafe] ANN: Anglohaskell 2009

2009-06-02 Thread Philippa Cowderoy
! If anyone wants to offer a talk, help with running the event, accomodation for haskellers from out of town or some ideas, please feel free to edit the wiki page appropriately and/or give us a yell in #anglohaskell. -- Philippa Cowderoy fli...@flippac.org

Re: [Haskell-cafe] web musing

2009-06-05 Thread Philippa Cowderoy
. -- Philippa Cowderoy fli...@flippac.org ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Wiki user accounts

2009-06-12 Thread Philippa Cowderoy
has an account) have to make edits on others' behalf, which is a serious inconvenience for both myself and attendees, as well as something of a barrier to entry. What's going on, and how can we speed things up? -- Philippa Cowderoy fli...@flippac.org

Re: [Haskell-cafe] Re: Wiki user accounts

2009-06-15 Thread Philippa Cowderoy
email and let the requester pick who to send the request to? A mailing list, possibly attached to a ticketing/queue system, seems a good idea? If it's just a list, admins should ack when they've added someone to avoid duplicated effort. -- Philippa Cowderoy fli...@flippac.org

Re: [Haskell-cafe] Re: Wiki user accounts

2009-06-16 Thread Philippa Cowderoy
, and it provides OpenID. They may not be exploited for the OpenID account yet, but I imagine they will be sooner rather than later - OpenID is more useful to tie in people's existing identities. -- Philippa Cowderoy fli...@flippac.org ___ Haskell-Cafe

Re: [Haskell-cafe] Re: Wiki user accounts

2009-06-17 Thread Philippa Cowderoy
heavy-weight. We want people to create a login (for the ML) and go through the ML, just to get wiki access? Who said anything about creating mailing list logins? Probably the easiest-for-user thing us a form that sends the mail for them. -- Philippa Cowderoy fli...@flippac.org

[Haskell-cafe] Anglohaskell - wifi signups

2009-07-20 Thread Philippa Cowderoy
Wifi signups are Anglohaskell are now on the wiki - please add your details by the 31st of July if you want a wifi account at MS Research for the Friday. Alternatively, reply to this email with your full name, institution, country of residence and email address. The Anglohaskell wiki page can

Re: [Haskell-cafe] Re: [Haskell] Compiler Construction course using Haskell?

2008-08-20 Thread Philippa Cowderoy
On Wed, 20 Aug 2008, Johannes Waldmann wrote: On parsers: yes, LL/LR theory and table-based parsers have been developed for a reason and it's no easy decision to throw them out. Still, even Parsec kind of computes the FIRST sets? No, it doesn't. That's not actually possible for monadic

Re: [Haskell-cafe] Re: [Haskell] Top Level -

2008-08-28 Thread Philippa Cowderoy
it, and if it's not fixed this time it may never get fixed. -- Philippa Cowderoy [EMAIL PROTECTED] ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] language proposal: ad-hoc overloading

2008-08-31 Thread Philippa Cowderoy
Oops, forgot to send to list. On Mon, 2008-09-01 at 01:27 +0100, Philippa Cowderoy wrote: On Mon, 2008-09-01 at 01:11 +0100, David House wrote: 2008/8/31 Ryan Ingram [EMAIL PROTECTED]: My proposal is to allow ad-hoc overloading of names; if a name is ambiguous in a scope, attempt to type

Re: [Haskell-cafe] Parsec 3 Description

2008-09-04 Thread Philippa Cowderoy
On Thu, 4 Sep 2008, John Van Enk wrote: I'm looking for a document describing the differences between Parsec 3 and Parsec 2. My google-foo must be off because I can't seem to find one. Does any one know where to find that information? Unfortunately there isn't currently a good one - in

Re: [Haskell-cafe] Parsec 3 Description

2008-09-04 Thread Philippa Cowderoy
On Thu, 2008-09-04 at 20:38 +, Duncan Coutts wrote: On Thu, 2008-09-04 at 19:41 +0100, Philippa Cowderoy wrote: On Thu, 4 Sep 2008, John Van Enk wrote: I'm looking for a document describing the differences between Parsec 3 and Parsec 2. My google-foo must be off because I can't

Re: [Haskell-cafe] Line noise

2008-09-21 Thread Philippa Cowderoy
On Sun, 21 Sep 2008, Andrew Coppin wrote: Actually, none of these things were mentioned. The things people have *actually* complained to me about are: - Haskell expressions are difficult to parse. This is partly an it's not braces, semicolons and function(application) complaint, though not

Re: [Haskell-cafe] Re: Hmm, what license to use?

2008-10-01 Thread Philippa Cowderoy
On Wed, 1 Oct 2008, Don Stewart wrote: malcolm.wallace: Just a small nuance to what Don wrote: so opinion seems to be that LGPL licensed *Haskell libaries* are unsuitable for any projects you want to ship commercially, without source code. Unless you use a

Re: [Haskell-cafe] An irritating Parsec problem

2008-10-15 Thread Philippa Cowderoy
On Wed, 15 Oct 2008, Andrew Coppin wrote: Suppose this is the top-level parser for my language. snip Does anybody know how to fix this irratiting quirk? I can see why it happens, but not how to fix it. One of: expressions = many1 (try expression | myFail) where myFail = {- eat your way

Re: [Haskell-cafe] An irritating Parsec problem

2008-10-15 Thread Philippa Cowderoy
On Wed, 15 Oct 2008, Andrew Coppin wrote: Suppose this is the top-level parser for my language. Now suppose the user supplies an expression with a syntax error half way through it. What I *want* to happen is for an error to be raised. What *actually* happens is that Parsec just ignores all

Re: [Haskell-cafe] An irritating Parsec problem

2008-10-15 Thread Philippa Cowderoy
On Wed, 15 Oct 2008, Andrew Coppin wrote: Philippa Cowderoy wrote: expressions = do es - many1 expression eof return es Ah - so eof fails if it isn't the end of the input? eof = notFollowedBy anyChar (assuming I've got the identifiers right

Re: [Haskell-cafe] An irritating Parsec problem

2008-10-16 Thread Philippa Cowderoy
On Thu, 16 Oct 2008, Andrew Coppin wrote: Actually, I added this to my real parser, and it actually seems to do exactly what I want. Give it an invalid expression and it immediately pinpoints exactly where the problem is, why it's a problem, and what you should be doing instead. Neat! Yep.

Re[2]: [Haskell-cafe] is 256M RAM insufficient for a 20 million element Int/Int map?

2008-10-19 Thread Philippa Cowderoy
On Sun, 19 Oct 2008, Bulat Ziganshin wrote: Hello Bertram, Sunday, October 19, 2008, 6:19:31 AM, you wrote: That's 5 words per elements ... that, like everything else, should be multiplied by 2-3 to account GC effect Unless I'm much mistaken, that isn't the case when you're looking

Re[3]: [Haskell-cafe] is 256M RAM insufficient for a 20 million element Int/Int map?

2008-10-19 Thread Philippa Cowderoy
On Sun, 19 Oct 2008, Bulat Ziganshin wrote: Hello Philippa, Sunday, October 19, 2008, 3:25:26 PM, you wrote: ... that, like everything else, should be multiplied by 2-3 to account GC effect Unless I'm much mistaken, that isn't the case when you're looking at the minimum heap size

Re: [Haskell-cafe] Template Haskell

2008-10-21 Thread Philippa Cowderoy
On Tue, 21 Oct 2008, Andrew Coppin wrote: If I'm understanding this correctly, Template Haskell is a way to auto-generate repetative Haskell source code. Amongst other things, yes. It's also a way to perform repetitive transformations on code, for example. The thing that worries me is...

Re: [Haskell-cafe] Template Haskell

2008-10-21 Thread Philippa Cowderoy
On Wed, 22 Oct 2008, Ariel J. Birnbaum wrote: This is the part when the Lisp hackers in the audience chuckle, as one of them raises a hand and asks What happens when you grow tired of writing TH boilerplate? Wait for another extension? And what after that?. To be fair, the TH

Re: [Haskell-cafe] Interactive

2008-11-12 Thread Philippa Cowderoy
On Wed, 12 Nov 2008, Andrew Coppin wrote: I have a small question... Given that interactivity is Really Hard to do in Haskell, and that mutable state is to be strongly avoided, how come Frag exists? (I.e., how did they successfully solve these problems?) Because the givens are bull :-)

Re: [Haskell-cafe] Haskell newbie

2004-02-08 Thread Philippa Cowderoy
On Sun, 8 Feb 2004, Justin Walsh wrote: Can anyone recommend a very thin Linux/Haskell setup for DHCP cable? Jus. Do a Debian net install, upgrade to testing and apt-get a recent GHC and your preferred text editor? -- [EMAIL PROTECTED] ___

Re: Haskell and sound (was: [Haskell-cafe] Toy application advice wanted)

2004-05-07 Thread Philippa Cowderoy
On Fri, 7 May 2004, Claus Reinke wrote: for graphics, we've got OpenGL, and a nice Haskell binding to it, so I wonder whether there's a similar option for sound? e.g., does anyone have experience with PortAudio/PortMusic/PortMidi? Looking over the PortAudio specs it's good for a software

  1   2   >