Re: MD5 in Haskell

2001-01-18 Thread Ian Lynagh
On Wed, Jan 17, 2001 at 07:11:40PM +, Ian Lynagh wrote: I've put the code at http://c93.keble.ox.ac.uk/~ian/md5/ License is GPL. 0.1.1 now there which changes the license to GPL/BSD so it can be used as a drop-in replacement for the GHC code. Ian

Doing IO in foldr repeats lines?

2001-01-20 Thread Ian Lynagh
Hi all The following code: module Main (main) where import IO main :: IO()

Re: Doing IO in foldr repeats lines?

2001-01-20 Thread Ian Lynagh
On Sat, Jan 20, 2001 at 05:08:48PM -0500, Scott Turner wrote: At 21:17 2001-01-20 +, Ian Lynagh wrote: main = do _ - foldl foo (return 14) ["qq\n", "ww\n", "ee\n"] putStr ""

Prelude and (:) and []((:), []) bugs?

2001-09-19 Thread Ian Lynagh
As far as I can tell, the report doesn't allow (:) or []((:), []) in the export list, yet the hugs prelude has the first and the GHC prelude has the second. Have I missed something that allows them or is this a bug in the preludes or the report? Thanks Ian

Re: Prelude and (:) and []((:), []) bugs?

2001-09-20 Thread Ian Lynagh
On Thu, Sep 20, 2001 at 01:32:54PM +0100, Simon Marlow wrote: As far as I can tell, the report doesn't allow (:) or []((:), []) in the export list, yet the hugs prelude has the first and the GHC prelude has the second. Have I missed something that allows them or is this a bug in

Layout rule

2001-09-30 Thread Ian Lynagh
Hi all The report says The layout rule matches only those open braces that it has inserted in the lexical structure section. However, in the syntax section function L starts L (t:ts) (m:ms) = } : (L (t:ts) ms) if parse-error(t) (Note 1) which AFAICT will implicitly close an explicit open

Lexical syntax and context free grammar in report

2001-10-04 Thread Ian Lynagh
I've just looked at the revised lexical syntax and qop is a production of lexeme, but qop is still defined in the context free grammar rather than the lexical syntax. Also, in the context free grammar, the last production for aexp is aexp_{qcon} { fbind1 , ... , fbindn } but I believe

Report with lots of hyperlinks

2001-10-05 Thread Ian Lynagh
Hi I've rewritten the syntax section (appendix B) in docbook, slightly hacked the nwalsh style sheets and produced http://c93.keble.ox.ac.uk/~ian/report/html/ The lexical Structure section is also just started more as proof-of-concept for linking back into the rest of the report. As well as

Re: Haskell 98 Revised

2001-11-02 Thread Ian Lynagh
On Fri, Nov 02, 2001 at 09:30:36AM -0800, Simon Peyton-Jones wrote: Haskellers! Hi Simon :-) It's that time of the month. I'm putting out the November release of the Revised Haskell 98 Report. As ever, I earnestly seek your feedback. Especially I'd like to know whether I have stumbled

Re: Haskell 98 Revised

2001-11-03 Thread Ian Lynagh
Hi Simon It's that time of the month. I'm putting out the November release of the Revised Haskell 98 Report. As ever, I earnestly seek your feedback. In appendix B (syntax), B.3 (layout) says * A stream of tokens as specified by the lexical syntax in the Haskell report, with the

Re: GUI Library Task Force

2001-09-27 Thread Ian Lynagh
On Wed, Sep 26, 2001 at 10:59:55PM +1000, Manuel M. T. Chakravarty wrote: Currently, there doesn't seem to be much interest in going for a completely new version of Haskell. The idea of adding addenda to H98 and so slowly and in incremental steps move to more functionality seems to be more

Library report examples

2001-11-26 Thread Ian Lynagh
Hi guys, The library report defines -- Diagonal of a square matrix diag :: (Ix a) = Array (a,a) b - Array a b diag x = ixmap (l,u) (\i-(i,i)) x where ((l,l'),(u,u')) | l == l' u == u' = bounds x but ghc, hugs and nhc98 all loop (trying to get and test the value of l I believe). I

List module in library report exports []((:), [])

2001-11-26 Thread Ian Lynagh
Hiyas A few more things I'm afraid :-( The List module in the library report exports []((:), []) which, as I mentioned in a previous thread WRT the GHC prelude, the report doesn't allow in the exports list. The block at the top listing the exports and types has been split into 2 at an

Re: Library report examples

2001-11-27 Thread Ian Lynagh
Simon, On Tue, Nov 27, 2001 at 02:28:45AM -0800, Simon Peyton-Jones wrote: | I am also curious why, for example, | | row :: (Ix a, Ix b) = a - Array (a,b) c - Array b c | row i x = ixmap (l',u') (\j-(i,j)) x where ((l,l'),(u,u')) | = bounds x | | isn't written as | | row ::

IO library report

2001-11-28 Thread Ian Lynagh
The report has the following example: import IO main = do hSetBuffering stdout NoBuffering putStr Enter an integer: x1 - readNum putStr Enter another integer: x2 - readNum

IO errors

2001-11-28 Thread Ian Lynagh
Hi guys, Me again I'm afraid... A quick look at the source looks like both GHC and NHC will simply pass on errors from the OS, so for example with module Main where import IO import Directory main :: IO() main = do catch (createDirectory this/does/not/exist/foo)

Confused about Random

2001-11-29 Thread Ian Lynagh
With the following module: module Main where import Random data Foo = Foo StdGen main :: IO() main = do let rs = randoms (Foo (mkStdGen 39)) :: [Int] rRs = randomRs (0,9) (Foo (mkStdGen 39)) :: [Int] putStrLn $ show $ take 100 rs

Re: --+ not treated as a start of a comment

2001-12-09 Thread Ian Lynagh
On Sun, Dec 09, 2001 at 09:50:18PM +0100, Feliks Kluzniak wrote: while the report (and hugs) believe --+ 1 is a comment. If a bystander is allowed to comment... Actually, the newer versions of the report say you can use -- to begin a legal lexeme (Sec. 2.3, p. 6). Euch. Is --- the

Re: Clarification of \begin{code} ... \end{code} stuff

2001-12-10 Thread Ian Lynagh
On Mon, Dec 10, 2001 at 04:03:27PM +, Ian Lynagh wrote: In the thread Literate scripts not handled correctly Simon Marlow said: Yes, it looks like GHC's unlit program removes whitespace when looking for \begin{code}, but not for \end{code}. The report isn't explicit about whether

Layout rule (again)

2001-12-11 Thread Ian Lynagh
I'm afraid it doesn't seem to be quite right yet :-( Consider instance Foo Maybe where foo = 5 = {4}instance Foo Maybe where {4}foo = 5 = {instance Foo Maybe where {}}foo = 5 The second {4} has meant there is no 4 to cause an implicit semicolon to be inserted.

Confused about default

2001-12-14 Thread Ian Lynagh
Hi all I am rather confused about default. In section 4.3.4 the report says each ti must be a monotype for which Num ti holds but according to grep this is the only place monotype appears in the report. If I have the module module TT (Foo(..)) where default (Foo, [Foo], Foo -

Re: Confused about default

2001-12-17 Thread Ian Lynagh
On Mon, Dec 17, 2001 at 08:57:28AM -0800, Simon Peyton-Jones wrote: Well, Foo *is* an instance of Num, so a correct Haskell impl should pick that instance always. I was looking at what the implementations would allow, the module wasn't supposed to be useful. Since you don't define the

unsafePerformIO to give warnings

2001-12-20 Thread Ian Lynagh
Hi all If I want to give warnings when doing something and I don't care too much about the order they appear in, can I use this? foo x = if success x then Just x else warn Working out x went wrong Nothing warn :: String - a - a warn s x = unsafePerformIO

Re: unsafePerformIO to give warnings

2001-12-21 Thread Ian Lynagh
On Fri, Dec 21, 2001 at 10:21:06AM -, Simon Marlow wrote: If I want to give warnings when doing something and I don't care too much about the order they appear in, can I use this? foo x = if success x then Just x else warn Working out x went wrong

vim syntax highlighting file for TeX and Haskell in the same file

2002-01-24 Thread Ian Lynagh
Hi all I have written a vim syntax highlighting file which, given a literate script with TeX markup surrounding the Haskell code, will highlight both the TeX and Haskell. lhaskell.vim is at http://c93.keble.ox.ac.uk/~ian/haskell-vim/lhaskell.vim along with haskell.vim and tex.vim, but

#s causing errors when -cpp not given

2002-01-26 Thread Ian Lynagh
Hi all I've just been looking at using cpp in Haskell scripts and I am rather confused. I can't see anything in the report which gives special meaning to # in the surrounding text of literate scripts, yet if I put such things in (both cpp directives and random things) both nhc98 and ghc give me

Non-determinism in newline in the Haskell report

2002-02-02 Thread Ian Lynagh
Hi all, The report says whitechar- newline | return | linefeed | vertab | formfeed | space | tab | uniWhite newline - a newline (system dependent) return - a carriage return linefeed - a line feed so, if your system defines a newline to be a line feed, an

Re: syntax difference between Hugs and GHC

2002-02-02 Thread Ian Lynagh
On Fri, Feb 01, 2002 at 02:32:37PM -0500, Dean Herington wrote: GHC accepts the declaration: (a # b) = a ++ b but Hugs rejects it, saying: Syntax error in input (unexpected `=') Who's right? hugs I believe. Ian ___

Re: Non-determinism in newline in the Haskell report

2002-02-04 Thread Ian Lynagh
On Mon, Feb 04, 2002 at 03:15:40AM -0800, Simon Peyton-Jones wrote: | I propose replacing the above with the following. It does | mean that CRLF creates 2 newlines, but I don't believe | this should be a problem. | | whitechar- newline | vertab | formfeed | space | tab | uniWhite |

Re: H98 Report: expression syntax glitch

2002-02-27 Thread Ian Lynagh
On Mon, Feb 25, 2002 at 04:30:24PM +, Malcolm Wallace wrote: Yes, but it reports type errors for the variants f x = (\x - x*x .) g x = (if x then 1 else 2 +) and it accepts h = (let op x y = y in 3 `op`) so I suspect it's misparsing these as f x = (\x - (x*x .))

Re: H98 Report: expression syntax glitch

2002-02-27 Thread Ian Lynagh
On Mon, Feb 25, 2002 at 04:27:56PM -, Simon Marlow wrote: This is a known problem with the Haskell grammar. Another example in a similar vein is let x = 3 in x == 4 == True which should parse as (let x = 3 in x == 4) == True according to the extends as far to the

Layout indentation marking

2002-03-10 Thread Ian Lynagh
Given this module module Main where main :: IO() main = putStrLn $ show $ foo foo :: Int foo = x + y where x = 6 s = foo\ \bar y = 7 nhc98 and hugs correctly (as per the revised report) print 13. ghc gives q.lhs:11: parse error on input `=' I

Haskell2LaTeX

2002-10-26 Thread Ian Lynagh
Hi all, This is just a quick note to let you know that Haskell2LaTeX, my undergraduate project, is available from http://web.comlab.ox.ac.uk/oucl/work/ian.lynagh/Haskell2LaTeX/ In a nutshell it parses the code in a literate Haskell script and then writes it out again with the embedded Haskell

Re: MD5 in Haskell

2002-11-19 Thread Ian Lynagh
On Mon, Nov 11, 2002 at 09:39:08AM +, Ganesh Sittampalam wrote: On Fri, 08 Nov 2002 09:57:08 +0100, Peter Thiemann [EMAIL PROTECTED] wrote: there used to be a Haskell implementation of MD5 and other cryptographic hashes available on http://c93.keble.ox.ac.uk/~ian/haskell/

IO confusion

2002-12-18 Thread Ian Lynagh
Hi all, With Foo in the file c.out and the module \begin{code} module Main (main) where import IO (openFile, hGetContents, hClose, IOMode(ReadMode)) import System (getArgs) import Monad (when) main :: IO () main = do [x] - getArgs let you_want_it_to_work = read x cout -

Re: IO confusion

2002-12-18 Thread Ian Lynagh
On Wed, Dec 18, 2002 at 02:51:48PM -, Simon Marlow wrote: in fact, any prefix of Foo, including the empty string, would be correct. See section 21.2.2 in the (revised) Haskell 98 report. Aha, thanks. I've kludged around it with last (' ':s) `seq` hClose cout Ian

Re: ANNOUNCE: GHC version 6.0.1

2003-08-04 Thread Ian Lynagh
On Wed, Jul 30, 2003 at 01:06:02PM +0100, Simon Marlow wrote: = The (Interactive) Glasgow Haskell Compiler -- version 6.0.1 = We are pleased to announce a new

Re: ANNOUNCE: GHC version 6.2

2003-12-24 Thread Ian Lynagh
On Tue, Dec 16, 2003 at 02:05:14PM -, Simon Marlow wrote: The (Interactive) Glasgow Haskell Compiler -- version 6.2 And, for Christmas, we at Debian bring

Re: [Haskell] vim syntax files for GHC-style .lhs, .hs + cpp

2004-02-09 Thread Ian Lynagh
On Mon, Feb 09, 2004 at 12:56:43PM +1100, Donald Bruce Stewart wrote: Hey all, - Vim syntax highlighting for GHC-style .lhs and .hs + cpp - Rather than

Re: [Haskell] vim syntax files for GHC-style .lhs, .hs + cpp

2004-02-09 Thread Ian Lynagh
On Mon, Feb 09, 2004 at 04:20:59PM +, Ian Lynagh wrote: I've put mine here: http://urchin.cipe/~ian/vim/ Or, more usefully, http://urchin.earth.li/~ian/vim/ Ian ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo

Re: [Haskell] hscpp

2004-09-28 Thread Ian Lynagh
On Tue, Sep 28, 2004 at 12:53:00PM +0200, Wolfgang Jeltsch wrote: Is there any effort to package this as a Debian package? Or has this already be done? As far as I know it hasn't been done yet. It would be very good if cpphs would enter the next stable Debian release (3.1). I'm told

[Haskell] Unnamed fields

2004-11-16 Thread Ian Lynagh
Hi all, Is there a good reason why I can't say data Bar = Bar { _ :: Int, _ :: Char, x :: Bool } ? (Or data Bar = Bar { Int, Char, x :: Bool } if you prefer, but that's susceptible to typos of the x, y, z :: Int syntax causing confusion). I have a large datastructure in which there is one

Re: [Haskell] Unnamed fields

2004-11-16 Thread Ian Lynagh
On Tue, Nov 16, 2004 at 04:07:48PM +, Malcolm Wallace wrote: On Tue, 16 Nov 2004 15:04:02 +, Ian Lynagh [EMAIL PROTECTED] wrote: Is there a good reason why I can't say data Bar = Bar { _ :: Int, _ :: Char, x :: Bool } In case it wasn't clear, there is an x :: Bool in lots

[Haskell] runProcess with out=err

2005-07-28 Thread Ian Lynagh
Hi, With the below code (compiled by ghc) I get a.out: thread blocked indefinitely. Changing the second (Just hout) to Nothing makes it run as expected. If I dup fdout to get an fderr and then try to also convert that to a handle then I get a.out: openFile: resource busy (file is locked). Is

Re: [Haskell] Re: runProcess with out=err

2005-07-28 Thread Ian Lynagh
On Thu, Jul 28, 2005 at 04:35:10PM +0200, Peter Simons wrote: Ian Lynagh writes: With the below code (compiled by ghc) I get a.out: thread blocked indefinitely. You need to compile with '-threaded' to avoid this problem. Unfortunately, this doesn't mean that your program

Re: [Haskell] GHC and GLUT

2006-01-06 Thread Ian Lynagh
On Fri, Jan 06, 2006 at 10:12:34PM +0100, Wolfgang Jeltsch wrote: Installing the libsm-dev package resulted in ld outputting a similar error message for -lXmu. After also installing libxmu-dev, linking was possible. Are libsm-dev and/or libxmu-dev needed for every Haskell GLUT application

Re: [Haskell] Re: License for haskell.org content

2006-01-09 Thread Ian Lynagh
On Sun, Jan 08, 2006 at 10:16:45PM -0800, Ashley Yakeley wrote: In article [EMAIL PROTECTED], Ian Lynagh [EMAIL PROTECTED] wrote: Why not use the GPL, then? FWIW, the GFDL is considered non-free by Debian[1], so that would mean any documentation or anything derived from the wiki

Re: [Haskell] Optimistic Evaluation?

2006-08-27 Thread Ian Lynagh
On Sun, Aug 27, 2006 at 05:51:34PM -0400, Lajos Nagy wrote: I remember once reading a paper by SPJ about Optimistic Evaluation that is somewhere between lazy and strict. If I remember correctly, they even implemented it in GHC. Now, it seems that current version of GHC doesn't support

[Haskell] Re: compiler-independent core libraries infrastructure

2006-09-15 Thread Ian Lynagh
Hi Bulat, Just a partial answer for now: On Wed, Sep 13, 2006 at 12:29:58PM +0400, Bulat Ziganshin wrote: Friday, September 8, 2006, 5:52:57 AM, you wrote: what is a 'base' library now? it is the library that implements common set of operations for latest versions of ghc, hugs and nhc.

Re: [Haskell] Performance, Optimization and Code Generation

2006-09-26 Thread Ian Lynagh
On Fri, Sep 22, 2006 at 08:30:20PM -0400, George Beshers wrote: This starts out with my being interested in darcs - git related issues. Since git uses sha1 I wanted to have the ability to calculate sha1 in an application where I was intending to use darcs as a back-end. The performance gap

[Haskell] Re: compiler-independent core libraries infrastructure

2006-09-27 Thread Ian Lynagh
On Fri, Sep 15, 2006 at 05:20:36PM +0100, Ian Lynagh wrote: As it happens I was working on getting GHC to use cabal to build base et al on the plane the other day, and I had a brief look at this. See my comment in http://hackage.haskell.org/trac/ghc/ticket/710 for the results of my longer

[Haskell] HaWiki closing in one month; migrate content to HaskellWiki now!

2006-10-01 Thread Ian Lynagh
Hi all, HaWiki[1] has been deprecated since the beginning of this year[2] when the new HaskellWiki[3] was introduced. However, we are now in the situation where we have both wikis running in parallel, which occasionally causes confusion to users, and means we have outdated information lying

[Haskell] ANNOUNCE: GHC version 6.6

2006-10-11 Thread Ian Lynagh
=== The (Interactive) Glasgow Haskell Compiler -- version 6.6 === The GHC Team is pleased to announce a new release of GHC. There have been many changes since the 6.4.2

[Haskell] ANNOUNCE: GHC version 6.6.1

2007-04-26 Thread Ian Lynagh
= The (Interactive) Glasgow Haskell Compiler -- version 6.6.1 = The GHC Team is pleased to announce a new patchlevel release of GHC. This release contains a

Re: [Haskell] Building extra-libs

2007-06-08 Thread Ian Lynagh
On Mon, Jun 04, 2007 at 08:53:41PM +0100, bft wrote: I want to build and install some extralibs using Cabal. I have the Cabal-1.1.6.2 version installed. When I run the command $ runghc Setup.hs configure --ghc --user --prefix=$HOME it fails with the message Setup.hs:17:30: Couldn't

Re: [Haskell] Cabal, Haddock, and the location of documentation

2007-07-08 Thread Ian Lynagh
On Sun, Jul 08, 2007 at 06:22:43PM +0100, Duncan Coutts wrote: On Sun, 2007-07-08 at 19:08 +0200, Matthias Kilian wrote: Or do I have to patch Cabal? If so, what about adding just another FilePath like docdir to Distribution.SimpleLocalBuildInfo and use it for the documentation? I

Re: [Haskell] Swapping parameters and type classes

2007-09-17 Thread Ian Lynagh
On Sun, Sep 16, 2007 at 01:59:02PM -0700, Stefan O'Rear wrote: {-# OPTIONS_GHC -XTypeFamilies -XEmptyDataDecls -XTypeSynonymInstances #-} {-# LANGUAGE TypeFamilies, EmptyDataDecls, TypeSynonymInstances #-} (Ian/Simon: I've seen this several times now. Maybe there should be a warning

Re: [Haskell] Swapping parameters and type classes

2007-09-18 Thread Ian Lynagh
On Tue, Sep 18, 2007 at 03:48:06PM +0100, Andrzej Jaworski wrote: Responding to Simon Peyton-Jones' reminder that this is a low-bandwidth list I was obscure and commited a blunder. This one and many other threads here are started undoubtedly by experts [sorry guys:-)] and coffee brake

[Haskell] downtime for monk ({darcs, hackage, cvs}.haskell.org) Monday from 3pm UTC

2007-09-18 Thread Ian Lynagh
Hi all, The machine called monk, which serves as darcs.haskell.org hackage.haskell.org cvs.haskell.org haskell.galois.com will be down from 3pm UTC on Monday 24th for an OS and RAM upgrade. If you know of any important services run on the machine other than darcs, CVS, trac,

[Haskell] Re: [Haskell-cafe] PROPOSAL: Rename haskell@ to haskell-announce@

2007-09-24 Thread Ian Lynagh
On Mon, Sep 24, 2007 at 01:00:40PM +0100, Claus Reinke wrote: in other words, people were meant to subscribe either to haskell or to haskell+haskell-cafe, and posting to haskell was meant to be a flag able to raise a topic briefly over the general din in haskell-cafe. Do people think that

Re: [Haskell] downtime for monk ({darcs, hackage, cvs}.haskell.org) Monday from 3pm UTC

2007-09-24 Thread Ian Lynagh
On Wed, Sep 19, 2007 at 02:38:05AM +0100, Ian Lynagh wrote: The machine called monk will be down from 3pm UTC on Monday 24th for an OS and RAM upgrade. The OS upgrade is now done (the RAM upgrade unfortunately failed). I believe everything is back up and working again now; please shout

Re: [Haskell] Re: Trying to install binary-0.4

2007-10-14 Thread Ian Lynagh
Hi Udo, On Fri, Oct 12, 2007 at 01:27:11AM +0200, Udo Stenzel wrote: - Provide a replacement configuration for GHC 6.6 and 6.4 (yes, that one is still alive!) that removes the conflict between 'base' and 'bytestring' and pretends to provide bytestring, containers, array, etc. People

Re: [Haskell] Re: Trying to install binary-0.4

2007-10-14 Thread Ian Lynagh
On Sun, Oct 14, 2007 at 05:19:31PM +0200, Udo Stenzel wrote: Ian Lynagh wrote: People interested in making it easy to use new versions of packages with old compiler releases can make a small script that installs empty Cabal packages called bytestring, containers, array, etc

[Haskell] ANNOUNCE: GHC version 6.8.1

2007-11-03 Thread Ian Lynagh
= The (Interactive) Glasgow Haskell Compiler -- version 6.8.1 = The GHC Team is pleased to announce a new major release of GHC. There have been a number of

[Haskell] ANNOUNCE: GHC version 6.8.2

2007-12-12 Thread Ian Lynagh
= The (Interactive) Glasgow Haskell Compiler -- version 6.8.2 = The GHC Team is pleased to announce a new patchlevel release of GHC. This release contains a number of

[Haskell] Downtime, Sat 2008-02-16 1500-1600 UTC: {darcs, hackage, cvs}.haskell.org

2008-02-15 Thread Ian Lynagh
Hi all, On Saturday 2008-02-16 (tomorrow), monk, which serves as darcs.haskell.org hackage.haskell.org cvs.haskell.org will go down for maintenance sometime probably between 1500 and 1600 UTC. All going well, the outage should be short. Sorry for any inconcenience caused. Thanks

[Haskell] ANNOUNCE: Well-Typed LLP - The Haskell Consultants

2008-04-06 Thread Ian Lynagh
Fellow Haskellers, We (Björn Bringert, Duncan Coutts and Ian Lynagh) are pleased to announce that we have recently set up a Haskell consultancy company, Well-Typed LLP (http://www.well-typed.com/). Our services include application development, library and tool maintenance, project advice

Re: [Haskell] making inits less strict

2008-04-23 Thread Ian Lynagh
On Mon, Apr 07, 2008 at 03:11:16PM -0400, John Tromp wrote: An improved version is: inits l = [] : case l of [] - [] (x:xs) - map (x:) inits xs For information on how to propose this, please see http://www.haskell.org/haskellwiki/Library_submissions Thanks

Re: [Haskell] A problem with overlapping instances and super-classes

2008-06-10 Thread Ian Lynagh
On Mon, Jun 09, 2008 at 09:21:02AM +0100, Simon Peyton-Jones wrote: This isn't great, but it's not really different than is the case for non-overlapping instances. Suppose module B1 declares 'instance C T', and uses that instance; and module B2 declares a *different* 'instance C T', and

[Haskell] ANNOUNCE: trac for projects on community.haskell.org

2008-06-14 Thread Ian Lynagh
Hi all, It is now possible for projects on community.haskell.org to create themselves a trac (which provides a bug tracking system and wiki). Please see http://community.haskell.org/admin/using_project.html#trac for details of how to do so. Thanks Ian

[Haskell] ANNOUNCE: GHC version 6.8.3

2008-06-17 Thread Ian Lynagh
= The (Interactive) Glasgow Haskell Compiler -- version 6.8.3 = The GHC Team is pleased to announce a new patchlevel release of GHC. This release contains a number of

[Haskell] ANNOUNCE: GHC version 6.10.1

2008-11-04 Thread Ian Lynagh
== The (Interactive) Glasgow Haskell Compiler -- version 6.10.1 == The GHC Team is pleased to announce a new major release of GHC. There have been a number of

[Haskell] ANN: new community.haskell.org features: webspace, mailing lists

2008-11-07 Thread Ian Lynagh
Hi all, The Community server, http://community.haskell.org/, has two new features for hosted projects. The first is project webspace. You can now make a website for your project visible at http://projects.haskell.org/yourproject/ See

Re: [Haskell] possible bug in pretty-1.0.1.0

2009-01-05 Thread Ian Lynagh
Hi John, On Mon, Dec 15, 2008 at 08:17:56AM -0800, John MacFarlane wrote: I noticed a difference in how hang works between pretty-1.0.0.0 and pretty-1.0.1.0. I think it's a bug. If this isn't the right place to report it, please let me know where I should. The best place at the moment is in

[Haskell] ANNOUNCE: GHC version 6.10.2

2009-04-01 Thread Ian Lynagh
== The (Interactive) Glasgow Haskell Compiler -- version 6.10.2 == The GHC Team is pleased to announce a new patchlevel release of GHC. This release contains a number

[Haskell] ANNOUNCE: GHC version 6.10.3

2009-05-09 Thread Ian Lynagh
== The (Interactive) Glasgow Haskell Compiler -- version 6.10.3 == The GHC Team is pleased to announce a new patchlevel release of GHC. This release contains a

Re: [Haskell] Re: Top Level

2009-06-19 Thread Ian Lynagh
On Thu, Jun 18, 2009 at 06:03:03PM +0200, Wolfgang Jeltsch wrote: Am Mittwoch, 17. Juni 2009 11:05 schrieb Malcolm Wallace: The problem with a top-level namespace like FRP is that it is a cryptic acronym: it means nothing to a novice, and may be easily confused with other acronyms by an

[Haskell] ANNOUNCE: GHC version 6.12.1

2009-12-14 Thread Ian Lynagh
== The (Interactive) Glasgow Haskell Compiler -- version 6.12.1 == The GHC Team is pleased to announce a new major release of GHC. There have been a number of

[Haskell] Re: ANNOUNCE: GHC version 6.12.1

2009-12-15 Thread Ian Lynagh
On Mon, Dec 14, 2009 at 03:24:05PM +0100, Bas van Dijk wrote: There's a broken link to the Haskell Platform in: http://haskell.org/ghc/docs/6.12.1/html/users_guide/release-6-12-1.html#id2890234 Thanks; fixed with a redirect. Thanks Ian ___

[Haskell] {darcs,hackage,cvs}.haskell.org, monk.galois.com

2010-01-22 Thread Ian Lynagh
Hi all, As you may be aware, the server monk.galois.com has had hardware problems recently, and has now been replaced with a new server abbot.galois.com (thanks to the summer of code people for buying the replacement, to Galois for hosting it, and for Galois's sysadmin Paul for setting it up).

[Haskell] {darcs,hackage,cvs}.haskell.org, monk.galois.com

2010-02-20 Thread Ian Lynagh
Hi all, monk is just days away from being turned off, so if you want to get anything off of it before that happens, you need to do it now. More information here: http://www.haskell.org/pipermail/haskell/2010-January/021861.html Thanks Ian ___

Re: [Haskell] trouble with the random number generator

2010-04-08 Thread Ian Lynagh
On Thu, Apr 08, 2010 at 10:20:25AM -0400, Garrett Mitchener wrote: 1/2 - 2^31/(2^32-1) = 2^31( 1/2^32 - 1/(2^32-1) ) = -1.164e-10 0 which is outside the required range. Yup, looks like a bug to me. Even if it were fixed so that the maths seemed to show no bug, I wouldn't be surprised if

[Haskell] ANNOUNCE: GHC version 6.12.2

2010-04-21 Thread Ian Lynagh
== The (Interactive) Glasgow Haskell Compiler -- version 6.12.2 == The GHC Team is pleased to announce a new patchlevel release of GHC. This release contains a number

Re: [Haskell] Re: [Haskell-cafe] Please check your dependencies on fgl

2010-06-08 Thread Ian Lynagh
On Mon, Jun 07, 2010 at 11:50:44AM -0700, Donald Bruce Stewart wrote: ivan.miljenovic: Thomas Bereknyei are currently re-writing fgl (just about completely from scratch) and we plan to make an initial release to get feedback on the API in the next few weeks. However, I'm sending this

[Haskell] ANNOUNCE: Industrial Haskell Group round 2

2010-08-31 Thread Ian Lynagh
of what the IHG does and how it works, please see the website: http://industry.haskell.org/status and feel free to drop us an e-mail if you have any questions. -- Ian Lynagh, Haskell Consultant Well-Typed LLP, http://www.well-typed.com/ ___ Haskell

[Haskell] Proposal: Form a haskell.org committee

2010-09-05 Thread Ian Lynagh
currently de-facto end up making the decisions currently: Duncan Coutts, Isaac Jones, Ian Lynagh, Don Stewart and Malcolm Wallace. These 5 would still be elligible to nominate themselves. Two of the initial members will stand down after one year, and two after two years, in order to bootstrap rolling

Re: [Haskell] Proposal: Form a haskell.org committee

2010-09-09 Thread Ian Lynagh
On Mon, Sep 06, 2010 at 07:27:35AM +, Simon Peyton-Jones wrote: I think that's an excellent idea. I think there should be a web page describing what the committee does, who is in it, how to contact it, etc. Yes, definitely. I've created:

[Haskell] New haskell.org server

2010-09-09 Thread Ian Lynagh
Hi all, We will shortly be replacing the haskell.org server with a more modern, commercially hosted machine. For now, the new server is available as http://new-www.haskell.org/ The ghc, hugs and nhc98 websites have been copied across, and there is a copy of the wiki (although that will be

[Haskell] haskell.org committee: Call for nominations

2010-09-15 Thread Ian Lynagh
Dear Haskellers, The recent discussion indicates there is consensus for forming a haskell.org committee. We are therefore calling for nominations for members of the initial committee. To nominate yourself, please send an e-mail to commit...@haskell.org by 29 September 2010. Please feel free to

[Haskell] ANNOUNCE: GHC version 7.0.1

2010-11-15 Thread Ian Lynagh
= The (Interactive) Glasgow Haskell Compiler -- version 7.0.1 = The GHC Team is pleased to announce a new major release of GHC. Since the 6.12 branch we are delighted

[Haskell] haskell.org downtime: Tuesday Nov 30th

2010-11-25 Thread Ian Lynagh
Hi all, We plan to have some haskell.org downtime on Tuesday Nov 30th, while we migrate to the new server. If you think something is missing from http://new-www.haskell.org/ then please let us know as soon as possible! Thanks Ian ___ Haskell

Re: [Haskell] haskell.org downtime: Tuesday Nov 30th

2010-11-25 Thread Ian Lynagh
On Thu, Nov 25, 2010 at 04:08:51PM +0100, Claus Reinke wrote: If you think something is missing from http://new-www.haskell.org/ then please let us know as soon as possible! I thought new-www was an experimental (mostly static) preview, copied long ago. Has it now been updated? The

[Haskell] haskell.org migration complete

2010-11-30 Thread Ian Lynagh
Hi all, The haskell.org server migration is now complete. Please let us know if you have any problems. Thanks Ian ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] haskell.org migration complete

2010-12-04 Thread Ian Lynagh
On Thu, Dec 02, 2010 at 12:58:34PM +0300, kyra wrote: Now we have neither http://haskell.org/ghc/dist/current nor http://haskell.org/ghc/dist/stable. Ta, fixed. Thanks Ian ___ Haskell mailing list Haskell@haskell.org

Re: [Haskell] haskell.org migration complete

2010-12-04 Thread Ian Lynagh
On Fri, Dec 03, 2010 at 12:48:58AM +0100, Claus Reinke wrote: The haskell.org server migration is now complete. Please let us know if you have any problems. Beginning this week, the majority of mails from haskell.org lists seem to end up in my ISP's spam filter. Legitimate list mails, rather

Re: [Haskell] haskell.org migration complete

2010-12-04 Thread Ian Lynagh
On Thu, Dec 02, 2010 at 09:09:20AM +0100, David Virebayre wrote: The gtk2hs homepage isn't accessible now : http://www.haskell.org/gtk2hs These pages will need to be moved to the commnuity server. Please let us know if you'd like us to set up HTTP redirects on www. Thanks Ian

Re: [Haskell] Please help me to reconstruct the Yarrow website! Re: New haskell.org server

2010-12-13 Thread Ian Lynagh
Hi Paul, On Mon, Dec 13, 2010 at 11:01:49AM -0500, Hudak, Paul wrote: indeed, I had hoped that we could have turned off the machine by now. Sorry it's taken us so long to get there. I propose that we shut down the old server on Jan 31, 2011. We were actually talking about this last night

Re: [Haskell] reference to DoCon

2010-12-13 Thread Ian Lynagh
Hi Serge, On Mon, Dec 13, 2010 at 09:52:17PM +0300, Serge D. Mechveliani wrote: maybe, it is appropriate to somehow also set a link in the old place? I've added a redirect from http://www.haskell.org/docon/ to http://botik.ru/pub/local/Mechveliani/docon/ Please update any links you can,

[Haskell] Well-Typed are hiring: Haskell consultant

2011-02-15 Thread Ian Lynagh
are interested, please apply via i...@well-typed.com. Tell us why you are interested and why you would be a good fit for the job, and attach your CV. We are more than happy to answer informal enquiries. Contact Duncan Coutts, Ian Lynagh or Andres Löh for further information, either by email or IRC

[Haskell] ANNOUNCE: GHC version 7.0.2

2011-03-03 Thread Ian Lynagh
= The (Interactive) Glasgow Haskell Compiler -- version 7.0.2 = The GHC Team is pleased to announce a new patchlevel release of GHC. This release contains a number of

  1   2   3   4   5   6   7   8   9   10   >