[ ghc-Bugs-995658 ] hReady always returns True when used on win32 non-Console

2005-01-18 Thread SourceForge.net
Bugs item #995658, was opened at 2004-07-22 03:00 Message generated for change (Comment added) made by simonmar You can respond by visiting: https://sourceforge.net/tracker/?func=detailatid=108032aid=995658group_id=8032 Category: libraries/haskell98 Group: 6.2.1 Status: Closed Resolution: Fixed

ghc-pkg -g fails on Solaris

2005-01-18 Thread Duncan Coutts
Hi, On all Unix platforms except Darwin, ghc-pkg calls: ld -r -x -o HSfoo.o --whole-archive libHSfoo.a See: ghc/utils/ghc-pkg/Main.hs, function autoBuildGHCiLib This works for the GNU linker. For the Solaris linker (which takes the name ld, GNU ld gets gld if it's installed) this does not work.

[ ghc-Bugs-1105067 ] -ffi poorly documented

2005-01-18 Thread SourceForge.net
Bugs item #1105067, was opened at 2005-01-19 00:25 Message generated for change (Tracker Item Submitted) made by Item Submitter You can respond by visiting: https://sourceforge.net/tracker/?func=detailatid=108032aid=1105067group_id=8032 Category: Documentation Group: 6.4 Status: Open Resolution:

[ ghc-Bugs-1105067 ] -ffi poorly documented

2005-01-18 Thread SourceForge.net
Bugs item #1105067, was opened at 2005-01-19 00:25 Message generated for change (Settings changed) made by wightnoise You can respond by visiting: https://sourceforge.net/tracker/?func=detailatid=108032aid=1105067group_id=8032 Category: Documentation Group: 6.2.2 Status: Open Resolution: None

RE: self-import

2005-01-18 Thread Simon Peyton-Jones
| It would be useful to be able to do a | | module Doc.Pretty.Long.Name where | | import Doc.Pretty.Long.Name as This | | so within the module we can refer to itself as 'This' without having to | write out the full name, however ghc complains that the hi file for the | module it is trying to

RE: self-import

2005-01-18 Thread Duncan Coutts
On Tue, 2005-01-18 at 10:13 +, Simon Peyton-Jones wrote: I think what you want is actually more directly stated thus: module Doc.Pretty.Long( ... ) as M where ... The 'as M' in the module header gives an alias for Doc.Pretty.Long just as it does for an import statement.

RE: self-import

2005-01-18 Thread Simon Peyton-Jones
| And if it turns out we are in the mood to look at extending the | inport/export/module syntax perhaps we could also consider the qualified | export idea posted a few weeks ago. | | That was so that you could say: | | import Graphics.UI.Gtk | | and then use Button.setText (rather than

RE: self-import

2005-01-18 Thread Duncan Coutts
On Tue, 2005-01-18 at 10:43 +, Simon Peyton-Jones wrote: | And if it turns out we are in the mood to look at extending the | inport/export/module syntax perhaps we could also consider the qualified | export idea posted a few weeks ago. | | That was so that you could say: | | import

Re: Contents of Glasgow-haskell-users Digest, Vol 17, Issue 8

2005-01-18 Thread Jost Berthold
Hi Bill, In order to force the *complete* evaluation of your result, you could use Evaluation Strategies. Strategies are a concept introduced for increasing parallelism in Glasgow parallel Haskell. Parallelism and lazy evaluation are in a way contrary aims, since you want your parallel evaluation

Re: Contents of Glasgow-haskell-users Digest, Vol 17, Issue 8

2005-01-18 Thread Keean Schupke
Jost Berthold wrote: In order to force the *complete* evaluation of your result, you could use Evaluation Strategies. Strategies are a concept introduced for increasing parallelism in Glasgow parallel Haskell. Parallelism and lazy evaluation are in a way contrary aims, since you want your parallel

package installation

2005-01-18 Thread Sean Bowman
hello, I'm trying to install HUnit to use with ghci and hugs and having some trouble. It works if I use the -i option with ghci, but I'd rather not have to specify that on the command line every time. Putting it in a ~/.ghci file doesn't seem to work. How can I set the search path for 3rd

[ ghc-Feature Requests-1104381 ] Add wxHaskell link to homepage

2005-01-18 Thread SourceForge.net
Feature Requests item #1104381, was opened at 2005-01-18 03:27 Message generated for change (Tracker Item Submitted) made by Item Submitter You can respond by visiting: https://sourceforge.net/tracker/?func=detailatid=358032aid=1104381group_id=8032 Category: None Group: None Status: Open

Re: Timing Functions

2005-01-18 Thread Georg Martius
Hi Bill, please note that null list just forces the first cell to be evaluated. I.e. the list (x: xs), just x is evaluated, but not xs. That means, that just the code in you function is evaluated that is really required for x. If your return type is a list, then you might get away with

[ ghc-Feature Requests-1104381 ] Add wxHaskell link to homepage

2005-01-18 Thread SourceForge.net
Feature Requests item #1104381, was opened at 2005-01-18 11:27 Message generated for change (Comment added) made by simonmar You can respond by visiting: https://sourceforge.net/tracker/?func=detailatid=358032aid=1104381group_id=8032 Category: None Group: None Status: Closed Priority: 5

Re: Contents of Glasgow-haskell-users Digest, Vol 17, Issue 8

2005-01-18 Thread Jost Berthold
Hi Keean, Keean Schupke wrote: Jost Berthold wrote: In order to force the *complete* evaluation of your result, you could use Evaluation Strategies. Strategies are a concept introduced for increasing parallelism in Glasgow parallel Haskell. Parallelism and lazy evaluation are in a way contrary

Re: [ ghc-Feature Requests-1104381 ] Add wxHaskell link to homepage

2005-01-18 Thread Ketil Malde
I seem to be getting messages from Sourceforge from this mailing list. Is that an intended use for ghc-users? -kzm -- If I haven't seen further, it is by standing in the footprints of giants ___ Glasgow-haskell-users mailing list

Re: [ ghc-Feature Requests-1104381 ] Add wxHaskell link to homepage

2005-01-18 Thread Duncan Coutts
On Tue, 2005-01-18 at 06:09 -0800, SourceForge.net wrote: Initial Comment: Hi, I am a user of wxHaskell, a wxWidgets binding for haskell. The product is very useful to me. Adding it to the homepage will ensure that more contribution is added to it though. Haskell community has to stay

Re: Contents of Glasgow-haskell-users Digest, Vol 17, Issue 8

2005-01-18 Thread Keean Schupke
Jost Berthold wrote: execution unit to do something more useful. Yes: the compiler could do a strictness analysis and hopefully (safe analysis) tell wether neededList is needed by mungeForResult. In the case of algebraic data structures (like lists), things get a bit more complex (different

RE: [ ghc-Feature Requests-1104381 ] Add wxHaskell link to homepage

2005-01-18 Thread Simon Marlow
On 18 January 2005 14:52, Duncan Coutts wrote: While we're thinking about it, could a link to Gtk2Hs be added: http://gtk2hs.sourceforge.net/ . Our web page has been updated to be rather more current. Done. Simon ___ Glasgow-haskell-users mailing

RE: [ ghc-Feature Requests-1104381 ] Add wxHaskell link to homepage

2005-01-18 Thread Simon Marlow
On 18 January 2005 14:42, Ketil Malde wrote: I seem to be getting messages from Sourceforge from this mailing list. Is that an intended use for ghc-users? It's intentional, but it can be easily turned off. Do people want to see feature-requests, task-list entries and so forth on this mailing

RE: debian ghci on sparc64

2005-01-18 Thread Simon Marlow
On 15 December 2004 14:46, William Lee Irwin III wrote: There seems to be some trouble with the debian ghci on sparc64. I can dredge up more information if given an idea of what to look for. $ ghci ___ ___ _ / _ \ /\ /\/ __(_) / /_\// /_/ / / | | GHC Interactive,

Re: debian ghci on sparc64

2005-01-18 Thread William Lee Irwin III
On 15 December 2004 14:46, William Lee Irwin III wrote: There seems to be some trouble with the debian ghci on sparc64. I can dredge up more information if given an idea of what to look for. On Tue, Jan 18, 2005 at 04:41:02PM -, Simon Marlow wrote: This turned out to be relatively

Re: self-import

2005-01-18 Thread Thomas Hallgren
Simon Peyton-Jones wrote: I quite liked this idea until I thought of this: module Doc.Pretty.Long( M.f, f ) where import qualified M( f ) import Doc.Pretty.Long as M f x = x The second import decl imports all the things exported by Doc.Pretty.Long. But what

Re: [Haskell] Re: Why is getArgs in the IO monad?

2005-01-18 Thread Tomasz Zielonka
On Tue, Jan 18, 2005 at 01:31:19AM -0500, Jim Apple wrote: Tomasz Zielonka wrote: I like to think that pure functions don't change between executions. I'd like to think they wouldn't change within executions. Is there a pure haskell way to check the value of a function between exections?

Re: [Haskell] Re: Why is getArgs in the IO monad?

2005-01-18 Thread Jules Bean
On 18 Jan 2005, at 06:31, Jim Apple wrote: Tomasz Zielonka wrote: I like to think that pure functions don't change between executions. I'd like to think they wouldn't change within executions. Is there a pure haskell way to check the value of a function between exections? In principle, a haskell

Re: [Haskell] Re: Why is getArgs in the IO monad?

2005-01-18 Thread Ben Rudiak-Gould
Conal Elliott wrote: The meaning of length getArgs would then have to be a value whose type is the meaning of Haskell's Int, i.e. either bottom or a 32-bit integer. I'm guessing that none of those 2^32+1 values is what you'd mean by length getArgs. On the other hand, the IO monad is a much

[Haskell] Re: Why is getArgs in the IO monad?

2005-01-18 Thread Jim Apple
I still think I'm missing your point, but let me take a stab at it. Conal Elliott wrote: I'm suggesting you might better understand the why of Haskell if you think denotationally (here about the meaning of the [String] type), rather than operationally. The meaning of a type seems to be about what

Re: [Haskell] Re: Why is getArgs in the IO monad?

2005-01-18 Thread Tomasz Zielonka
On Tue, Jan 18, 2005 at 08:12:42AM -0800, Ben Rudiak-Gould wrote: Even if you want to disallow explicit recompilation (and how do you define compilation denotationally?), an automatic rollout of a new version of Hugs could lead to successive invocations of a script using different values of

Re: [Haskell] Re: Why is getArgs in the IO monad?

2005-01-18 Thread Jules Bean
On 18 Jan 2005, at 16:12, Ben Rudiak-Gould wrote: I'm not strongly convinced by this argument. I don't think you can tell me which particular Char value you mean by the expression (maxBound :: Char) either, yet you probably wouldn't argue for changing maxBound's type. I think Jim's claim is

RE: [Haskell] Typeable and Data instances for Double, FiniteMap, ...

2005-01-18 Thread Simon Peyton-Jones
| I was playing around with Scap you Boilerplate and realised some missing instances of Typeable and | Data. Is there a particular reason why there is no Data Double instance? | Furthermore I was wondering why no instance for the collection types such as FiniteMap, Set and | HashTable is provided.

[Haskell] ANNOUNCE: Happy 1.15

2005-01-18 Thread Simon Marlow
ANNOUNCING Happy 1.15 - The LALR(1) Parser Generator for Haskell I'm pleased to announce version 1.15 of Happy, the parser generator system for Haskell. Changes from version 1.14 to 1.15 * New %expect directive * the list of tokens passed to happyError now includes the current

[Haskell] PhD Position in Technical University of Valencia (Spain)

2005-01-18 Thread Santiago Escobar
Please, pass on to interested students. Apologies for multiple copies. -- PhD Position (DEADLINE 4 February 2004! See How to apply below.) Departamento de Sistemas Informaticos y Computacion Technical University of Valencia

Re: [Haskell] Typeable and Data instances for Double, FiniteMap, ...

2005-01-18 Thread Ralf Laemmel
Georg Martius wrote: I was playing around with Scap you Boilerplate and realised some missing instances of Typeable and Data. Is there a particular reason why there is no Data Double instance? There has been a Double instance under CVS (GHC HEAD) since March 2004. It will be included in GHC

RE: [Haskell] Typeable and Data instances for Double, FiniteMap, ...

2005-01-18 Thread Simon Peyton-Jones
| Yes, once you start to use the SYB library you end up wanting it to | cover almost all your types. | I will make an effort *now* hoping that all the instance can still make | it into GHC 6,4. | (There are indeed a few more unsupported types that make obviously sense.) Yes, anything in the HEAD

RE: [Haskell] Re: Why is getArgs in the IO monad?

2005-01-18 Thread Conal Elliott
Jim Apple wrote: Even if this is denotationally different from a value like zero :: Int, I think it is also different from getLine :: IO String. It seems to mean something between these. I think I understand your point better now: Do you want another denotational distinction, somewhere

RE: [Haskell] Re: Why is getArgs in the IO monad?

2005-01-18 Thread Conal Elliott
Oh! I hope that Haskell language and library semantics are defined independently from any particular Haskell implementation. - Conal -Original Message- From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] On Behalf Of Ben Rudiak-Gould Sent: Tuesday, January 18, 2005 8:13 AM To: Conal

Re: [Haskell] ANNOUNCE: Happy 1.15

2005-01-18 Thread Brian Smith
parser name directive This has no effect at present. It will probably remain this way: if you want to control names, you could use qualified import. ... The driver file exports a function doParse :: [[UserDefTok]] - GLRResult Does this mean that it is not possible to put multiple

[Haskell] Implicit parallel functional programming

2005-01-18 Thread Satnam Singh
I'm trying to find out about existing work on implicit parallel functional programming. I see that the Glasgow Haskell compiler has a parallel mode which can be used with PVM and there is interesting work with pH at MIT. Does anyone know of any other work on implicitly parallelizing functional

Re: [Haskell] Implicit parallel functional programming

2005-01-18 Thread Sebastian Sylvan
On Tue, 18 Jan 2005 12:53:18 -0800, Satnam Singh [EMAIL PROTECTED] wrote: I'm trying to find out about existing work on implicit parallel functional programming. I see that the Glasgow Haskell compiler has a parallel mode which can be used with PVM and there is interesting work with pH at

[Haskell] Functional and Declarative Programming in Education 2005

2005-01-18 Thread S.J.Thompson
Functional and Declarative Programming in Education (FDPE05) A one day workshop at ICFP05 Sunday, 25 September 2005, Tallin, Estonia http://www.cs.kent.ac.uk/~sjt/fdpe05/ FIRST CALL FOR SUBMISSIONS Overview Functional and declarative programming plays an important role in computing

Re: [Haskell] ANNOUNCE: Happy 1.15

2005-01-18 Thread P.C.Callaghan
Hello, Does this mean that it is not possible to put multiple entry points into a GLR parser? Correct: the GLR parser doesn't provide this standard Happy functionality. There is the work-around that you mention. I decided to leave %name out this time, mainly because of the possibility of

Re: [Haskell] Running haskell from within Haskell

2005-01-18 Thread Donald Bruce Stewart
vivian.mcphail: Dear All, I have a parser which has entries for each word, such as: ate = s \ np / np : ^x y.did(eat y x); so each word has a type (s \ np / np) and a semantics (the lambda term ^x y.did(eat y x)). Currently I parse the semantics into lambda terms

Re: [Haskell] Implicit parallel functional programming

2005-01-18 Thread mgross
On Tue, 18 Jan 2005, Satnam Singh wrote: I'm trying to find out about existing work on implicit parallel functional programming. I see that the Glasgow Haskell compiler has a parallel mode which can be used with PVM and there is interesting work with pH at MIT. Does anyone know of any

[Haskell] [ANNOUNCE] New version of unicode CWString library with extras

2005-01-18 Thread John Meacham
A while ago I wrote a glibc specific implementation of the CWString library. I have since made several improvements: * No longer glibc specific, should compile and work on any system with iconv (which is unix standard) (but there are still glibc specific optimizations) * general iconv library

Re: [Haskell-cafe] performance question

2005-01-18 Thread John Meacham
On Mon, Jan 17, 2005 at 08:54:38PM -0800, Ben Rudiak-Gould wrote: If performance is the main concern, I would flatten the data structure: data Interval = IlII Double Double | IlIE Double Double | IlEI Double Double | IlEE Double Double

[Haskell-cafe] RE: Answers to Exercises in Craft of FP

2005-01-18 Thread David Owen
Gour ([EMAIL PROTECTED]) wrote RE- : Do you know if there are solutions to exersises available somewhere? Have you gone through the whole book, i.e. all the exercises? Sincerely, Gour Hi Gour, Unfortuantely I don't know of anywhere that the exercise answers can be found, even after some google

[Haskell-cafe] Math libraries for Haskell

2005-01-18 Thread Dmitri Pissarenko
Hello! Is there a math library for Haskell, using which one can calculate eigenvalues of matrices? Thanks in advance Dmitri Pissarenko -- Dmitri Pissarenko Software Engineer http://dapissarenko.com ___ Haskell-Cafe mailing list

Re: [Haskell-cafe] Math libraries for Haskell

2005-01-18 Thread John Meacham
On Tue, Jan 18, 2005 at 08:25:46PM +0100, Dmitri Pissarenko wrote: Hello! Is there a math library for Haskell, using which one can calculate eigenvalues of matrices? There is a binding to BLAS/LAPACK at http://www.isi.edu/~hdaume/HBlas/ but it might be too heavyweight for just calculating

Re: [Haskell-cafe] Math libraries for Haskell

2005-01-18 Thread Dmitri Pissarenko
Are you interested in seeing Haskell implementation of these algorithms, or are you interested in using eignevalues in some Haskell program? I am interested in using eigenvalues in a Haskell program. This seems like a perfect candidate for using FFI if you're just looking for fast eigenvalue

Re: [Haskell-cafe] Math libraries for Haskell

2005-01-18 Thread Sebastian Sylvan
On Tue, 18 Jan 2005 20:41:28 +0100, Dmitri Pissarenko [EMAIL PROTECTED] wrote: Are you interested in seeing Haskell implementation of these algorithms, or are you interested in using eignevalues in some Haskell program? I am interested in using eigenvalues in a Haskell program. This

[Haskell-cafe] About instance

2005-01-18 Thread Ulises Juarez Martinez
Hi. I have the next definitions: type Ocurrence = (String, Int) type Inside = [Ocurrence] data Pattern = Return Inside | Abort | Filter (Ocurrence - Bool) Pattern beyond :: Pattern - Pattern beyond (Filter pred Abort) = Abort -- more definitions of beyond optimous :: Pattern - Pattern optimous p

Re: [Haskell-cafe] About instance

2005-01-18 Thread Jules Bean
On 18 Jan 2005, at 21:45, Ulises Juarez Martinez wrote: Who can I do an instance of Eq (Ocurrence - Bool)? Is there another option to avoid the error? In general, you can't define one. To define equality on functions you want to check the value on every possible input, and since Ocurrence is

[Haskell-cafe] Re: Why is getArgs in the IO monad?

2005-01-18 Thread Ashley Yakeley
In article [EMAIL PROTECTED], Keean Schupke [EMAIL PROTECTED] wrote: Surely both requirements can be satisfied if the programs arguments are made parameters of main: main :: [String] - IO () Keean. Better yet, it should be an implicit parameter so as not to break existing programs.

Re: [Haskell-cafe] Re: Hugs vs GHC (again)was: Re: Somerandomnewbiequestions

2005-01-18 Thread Duncan Coutts
On Tue, 2005-01-18 at 22:52 +, Glynn Clements wrote: Ben Rudiak-Gould wrote: Essentially, reading data from regular files is always deemed to occur soon, so the usual mechanisms for dealing with slow I/O (i.e. pipes, FIFOs, character devices, sockets) don't work. This applies equally to

[Haskell-cafe] Re: [Haskell] Re: Why is getArgs in the IO monad?

2005-01-18 Thread Marcin 'Qrczak' Kowalczyk
Keean Schupke [EMAIL PROTECTED] writes: Surely both requirements can be satisfied if the programs arguments are made parameters of main: main :: [String] - IO () From info '(libc)Error Messages', about program_invocation_name and program_invocation_short_name: *Portability Note:* These

Re: [Haskell-cafe] Re: Books on Haskell

2005-01-18 Thread Matthew Roberts
Haskell wiki pages for this stuff? I presume you would need the authors/publishers permission. I am 62 pages into Implementing Functional Languages: a tutorial and would be happy to put up the solutions I have so far (with appropriate permission of course). The advantage of the wiki is that

[Haskell-cafe] styles

2005-01-18 Thread Matthew Roberts
Haskell seems to be a language that allows for lots of different programming styles. The most obvious being pointed v.s. point free. As a programmer born and raised on OO - I have found the pointed style to suit me better. However, there are other distinctions. I heavily use let in and

[Haskell-cafe] Re: performance question (John Meacham)

2005-01-18 Thread Stijn De Saeger
thanks Ben and John, your ideas looked like they may speed up things indeed, so i went along with them and reimplemented the whole thing to my surprise, the program got considerably slower even ! here is the new code. data ILtype = II | IE | EI | EE | NII | NIE | NEI | NEE deriving (Eq,