> "Simon Marlow" <[EMAIL PROTECTED]> writes:
>
> > The snapshot source distribution has now been updated to include the
> > file mk/package.mk which was missing the first time around.
>
> Thanks.
>
> Btw, does ghc build with "make -j2"? I tried building the
> snapshot just now with it but got
to import whichever module has the definition of Int in it).
Hope this helps..
--KW 8-)
--
Keith Wansbrough <[EMAIL PROTECTED]>
http://www.cl.cam.ac.uk/users/kw217/
University of Cambridge Computer Laboratory.
___
Glasgow-haskell-
Rafael writes:
> Well, I may be wrong, but I think booting .hc files doesn't avoid
> mangling step ...
The .hc files used for bootstrapping should be *unregisterised*, which
means that they use the mini-interpreter and do not rely on mangling.
I think. Over to you, Simon/Julian... :-)
--KW 8-)
Rafael writes:
> I'm trying to run GHC in a mips-SGI-irix platform, more accurately Irix
> 6.
>
> The last binary version avalaible
> (ftp://ftp.dcs.glasgow.ac.uk/pub/haskell/glasgow/) is for ghc-2.10
> (ghc-2.10-mips-sgi-irix6.tar.gz) .
>
>
> In order to reach the actual ghc-5-XX step by step
e call is known.
http://wombat.doc.ic.ac.uk/foldoc/foldoc.cgi?tail+recursion
Of course, laziness may well bite you and you may run out of *heap*, but that's
another story for another evening!
--KW 8-)
--
Keith Wansbrough <[EMAIL PROTECTED]>
http://www.cl.cam.
> I'll get a strange result if the file contains the character 1A-hexadecimal
> (or 26-decimal): all characters beyond this point won't be printed on the
> screen.
I think this is correct behaviour for a text file under
Windows/DOS... you should open the file as binary instead.
--KW 8-)
__
d "module C where..." then the hi file would be
C.hi.
--KW 8-)
--
Keith Wansbrough <[EMAIL PROTECTED]>
http://www.cl.cam.ac.uk/users/kw217/
Cambridge University Computer Laboratory.
___
Glasgow-haskell-users mailing list
[EMAIL PROTECTE
ll accept to get a socket for that con-
nection.
So I imagine if you passed the socket as the first arg to Select.hSelect, you'd get
what you want. SocketPrim.socketToHandle claims to do the required conversion.
disclaimer: I haven't tried this.
--KW 8-)
--
Keith Wansbrough
erface. You can read about cost centres in chapter 4 of the
manual.
My apologies for not having put this properly in the manual yet!
HTH..
--KW 8-)
--
Keith Wansbrough <[EMAIL PROTECTED]>
http://www.cl.cam.ac.uk/users/kw217/
Cambridge University Computer Laboratory.
_
/www-i2.informatik.RWTH-Aachen.de/~chitil/",
status="copy,unverified",
}
--KW 8-)
--
Keith Wansbrough <[EMAIL PROTECTED]>
http://www.cl.cam.ac.uk/users/kw217/
Cambridge University Computer Laboratory.
___
Glasgow-haskell-users mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users
lf I
was doing the right thing by noticing all the 2.x.x version numbers on the libgmp
source I'd compiled.
It does link. Haven't tried any fancy math, though, so maybe it's broken.
--KW 8-)
--
Keith Wansbrough <[EMAIL PROTECTED]>
http://www.cl.cam.ac.uk/users/kw217/
Cambridge
hasn't already been asked, and (b)
that people don't have to go to extraordinary effort to ensure you see
their replies.
> -kzm
--KW 8-)
--
Keith Wansbrough <[EMAIL PROTECTED]>
http://www.cl.cam.ac.uk/users/kw217/
Cambridge University Computer Laboratory.
> > {-# RULES
> > "lookupFM.range check" forall m key . rdMap m key =
> > maybe (lookupFmError #LINE #FILE)
> >id
> >(#lookupFM m key)
> > #-} --
[..]
> Actually, when using cpp, the __LINE__ and __FILE__ macros should expand to
> the right thing (this is what GHC itsel
What you really need is a type lambda:
type Func2 a b = /\c. a->(b->c)
but this isn't provided in Haskell.
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) ---:
: PhD Student, Computer Laboratory, University of Cambridge, UK. :
: Native of Antipodean Auckland, New Zealand: 174d47'E, 36d55'S. :
: http://www.cl.cam.ac.uk/users/kw217/ mailto:[EMAIL PROTECTED] :
::
RCS))
or
OBJS=$(patsubst %.lhs,%.o,$(patsubst %.hs,%.o,$(SRCS)))
instead) and then type `make depend' to automatically append the dependencies.
HTH.
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) ---:
: PhD Student, Computer Laboratory, University of Cambridge, U
here's no way to compile such code and avoid the
depencdency.
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) ---:
: PhD Student, Computer Laboratory, University of Cambridge, UK. :
: Native of Antipodean Auckland, New Zealand: 174d47'E, 36d55'S. :
: http:/
> main: fatal error: No threads to run! Deadlock?
[..]
> It was mentioned to me that trace can cause this problem. However, I am not
> using trace. Does anyone know any other causes?
>
> One last thing, I am not doing any kind of multithreading on my own, but I
> am using a lot of infinite lis
onal string manipulation (RE matching,
substrings etc) with much less copying than PackedString or [Char]
require.
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) ---:
: PhD Student, Computer Laboratory, University of Cambridge, UK. :
: Native of Antipode
On Fri, May 26, 2000 at 03:40:28PM -0400, Keith Wansbrough wrote:
> > Recently GPH was installed on my Universities beowulf cluster. PVM3 is
> > installed (as well as Lam MPI). Ghc appears to be correctly installed; it
> > compiles non-parallel programs fine. However when I t
eginning, we have:
foldr :: __forall [a b] => (a -> b -> b) -> b -> [a] -> b
which should be clear enough. Quantification is explicit, and contexts appear a
little differently.
More on interface files:
http://www.haskell.org/ghc/docs/latest/users_guide/separat
[copied to the list as it is likely of general interest / worth
putting on the Wiki?]
[EMAIL PROTECTED] writes:
> Yes it does, thank you. Since I never looked at this stuff before, it was quite
> hard to decode. But I'm still puzzled about some cases:
[..]
> It also lacks __S . Does the absenc
On the Haskell list, Bill Halchin writes:
> I am trying to build the HaXML stuff and the linker (ld) is
> looking for an archive, gmp.a, which I don't have installed. Can
> anybody lead me in the right direction??
[queries like this should really go to
[EMAIL PROTECTED] or [EMAIL PROTECTED],
ould still be useful anyway.
JAP\010HH...
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) ---:
: PhD Student, Computer Laboratory, University of Cambridge, UK. :
: Native of Antipodean Auckland, New Zealand: 174d47'E, 36d55'S. :
: http://www.cl.cam.ac.uk/users/kw217/ mailto:[EMAIL PROTECTED] :
::
d be `Pseudo'... the others are correct though.
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) ---:
: PhD Student, Computer Laboratory, University of Cambridge, UK. :
: Native of Antipodean Auckland, New Zealand: 174d47'E, 36d55'S. :
: http://www.cl.ca
is greater than 2^64-1 then simply
pass NULL to select(): I think 595 000 years is near enough forever
given current operating systems...
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) ---:
: PhD Student, Computer Laboratory, University of Cambridge, UK. :
: Native o
t-by-hierarchy/sci/astro/
includes the sci.astro Time FAQ
Surely the problem must have been addressed before...
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) ---:
: PhD Student, Computer Laboratory, University of Cambridge, UK. :
: Native of Antipodean Auckland, New Ze
houldn't be too hard to
figure out. The implementation is currently experimental; it would be
better if the info was only displayed for uncaught exceptions, but this
is harder to implement.
Enjoy!
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) ---:
: PhD Student,
; cvs tag -F lastRel
> cd ..
> cvs -q rel -d ghc.old
> cvs -q rel -d ghc
A lot easier than that, of course:
cvs co fptools
cd fptools
cvs diff -Nc -r lastRel -D now ghc > ghc.diffs
(*warning* untested)
HTH.
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) ---
hat I can do to put it on some website publicaly accessible.
Noel Winstanley at Glasgow has already done this; see
http://www.dcs.gla.ac.uk/~nww/TkHaskell/TkHaskell.html
> Marc van Dongen
--KW 8-)
PS: I replied to Scott's message on the Haskell list, not noticing it
was posted to
y web site in case anyone else finds it of use...
please try it out and tell me what you think.
URL: http://www.cl.cam.ac.uk/users/kw217/hackery/index.html
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) :
: PhD Student, Computer Laboratory, University of Camb
bad programming style to cause these warnings, because unused identifiers should
be given names beginning with underscore, for which warnings should be suppressed
(according to sec 2.4 of the H98 report).
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) :
: PhD S
ler machine shouldn't be being transmitted, though,
for exactly the reason you describe.
--KW 8-)
--KW 8-)
--
: Keith Wansbrough, MSc, BSc(Hons) (Auckland) :
: PhD Student, Computer Laboratory, University of Cambridge, England. :
: (and recently of the Un
h list: rewriting hscpp (currently a Perl
wrapper for GNU cpp in ghc/utils/hscpp/) to do proper Haskell macro
preprocessing. Anyone care to specify what this should look like? I suggest
we don't want it much fancier than cpp, or it will never get written; but it
should at least respect Ha
33 matches
Mail list logo