How much MB do I need

1996-02-26 Thread Marc van Dongen
To compile a large Haskell program. I am compiling at the moment without optimization and 55 MB of heap. Still ghc complains that the heap is too small. Any suggestions? Marc van Dongen [EMAIL PROTECTED]

Re: More on randoms

2000-02-04 Thread Marc van Dongen
... : And vectors (with decently uncorrelated elements). Etc. Yes please. But do change the word vector into [Integer]. [...] Regards, Marc van Dongen

Re: Q: Library for (efficient:-) join and projection

2000-03-13 Thread Marc van Dongen
! [...] Regards, Marc van Dongen

Q: Library for (efficient:-) join and projection

2000-03-12 Thread Marc van Dongen
. Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 4903578 University College Cork, NUIC | Fax:+353 21 4903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED]

Ratio: (-1:%1) (-1:%1)?

2000-03-24 Thread Marc van Dongen
to (1) should not be true. According to the language definition (1:%-1) != (-1:%1). Personally I think that built-in data types should obey (1), (2) and (3). Maybe I am missing something. Any comments? Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 4903578 University

Re: Ratio: (-1:%1) (-1:%1)?

2000-03-24 Thread Marc van Dongen
. [...] Regards, Marc -- Marc van Dongen, CS Dept | phone: +353 21 4903578 University College Cork, NUIC | Fax:+353 21 4903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED]

Re: Ratio: (-1:%1) (-1:%1)?

2000-03-24 Thread Marc van Dongen
Lennart Augustsson ([EMAIL PROTECTED]) wrote: : I am not quite sure how to express this in Haskell : terms but here it goes anyway: Why is :% in Ratio : not hidden? : What?!? Of course :% is hidden. It's always been hidden. : If it isn't it's a bug in your implementation or a (new) bug :

Re: Ratio: (-1:%1) (-1:%1)?

2000-03-24 Thread Marc van Dongen
D. Tweed ([EMAIL PROTECTED]) wrote: : If you haven't loaded any modules then hugs is in `module scope' of : prelude and it's possible. If you do, eg, :l List then you end up in that : module scope and it's no longer allowed. That's exactly what happend. I ran hugs and typed in (1:?2). I was

Re: Ratio: (-1:%1) (-1:%1)?

2000-03-24 Thread Marc van Dongen
every other operation that creates a Ratio. It is not possible. As I replied before but you may not have received it yet, I was wrong in assuming that one could use :%. Again, sorry about the confusion. Regards, Marc van Dongen

Re: ServiceShow class for messages

2000-03-31 Thread Marc van Dongen
S.D.Mechveliani ([EMAIL PROTECTED]) wrote: [ error messages printing their aguments ] Printing the argument of a function as part of an error message may lead to infinite error messages. It may even lead to several calls to error which all have to be shown. I don't think a compiler will ever be

Re: Type signatures in instance declarations?

2000-04-10 Thread Marc van Dongen
. : I agree. I posted a similar comment one or two years ago. Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 903578 University College Cork, NUIC | Fax: +353 21 903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED]

Re: Type signatures in instance declarations?

2000-04-10 Thread Marc van Dongen
Koen Claessen ([EMAIL PROTECTED]) wrote: [snip] : * Why can one not have a type declarion in the export : list of a module? Common practice for many people : is to put these types in comments now (which is really : dangerous, since the types might change but not the :

Re: libraries for Integer

2000-04-19 Thread Marc van Dongen
in NTL :http://www.shoup.net/ntl/ Do you have any data about comparisons with this or other packages? Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 903578 University College Cork, NUIC | Fax: +353 21 903113 College Road, Cork, Ireland | Email: [EMAIL

Re: libraries for Integer

2000-04-19 Thread Marc van Dongen
George Russell ([EMAIL PROTECTED]) wrote: [...] : Sorry I can't be more helpful. But there is unlikely to be a simple : answer to the question "Does LIP or GMP multiply numbers fastest?"; : it will depend on how big the numbers are, what platform you are using, : and how much difficult the

Re: doubly linked list

2000-04-28 Thread Marc van Dongen
again; this was years ago. Regards, Marc van Dongen initQueue :: Ix i = (LinkedList s i v) - [(i,v)] - ST s (Maybe i,Maybe i) initQueue _ [] = return (Nothing,Nothing) initQueue marks ((i,v):ivs) = writeArray marks i (Nothing,Nothing,Just v) a2q marks i i ivs addToQueue

Re: basAlgPropos. Why sample argument

2000-05-07 Thread Marc van Dongen
zero p created a zero polynomial with certain ``built-in'' properties like a term-order it inherited from p. Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 4903578 University College Cork, NUIC | Fax:+353 21 4903113 College Road, Cork, Ireland | Email: [EMAIL

Re: sample argument. Dongen's example

2000-05-08 Thread Marc van Dongen
) to the polynomial ring k[X] then you can if you have a polynomial, say p, in k[X] already. Just use: constant p c. Regards, Marc -- Marc van Dongen, CS Dept | phone: +353 21 4903578 University College Cork, NUIC | Fax:+353 21 4903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED]

[dongen@cs.ucc.ie: Re: sample argument. Dongen's example]

2000-05-08 Thread Marc van Dongen
Sorry about this. I thought I group replied when replied Sergey's e-mail. -- Marc van Dongen, CS Dept | phone: +353 21 4903578 University College Cork, NUIC | Fax:+353 21 4903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED] - Forwarded message from Marc van Dongen

Re: sample argument. Dongen's example

2000-05-08 Thread Marc van Dongen
S.D.Mechveliani ([EMAIL PROTECTED]) wrote: [I cc'd this to haskell as well] : this is exactly the Domain conversion proposal, described in : basAlgPropos. class Cast a b where cast :: a - b - a. : The first argument is the sample for domain. The second casts to : `a' after the given sample.

Re: static evaluation of dynamics thing

2000-05-20 Thread Marc van Dongen
' a b | assertAndBelieveMe (b /= 0) = quot a b So that a special version of quot could be used which would not check for b == 0. : Life is short. Are these features that would be useful to lots of people? Yes please. Regards, Marc van Dongen

Prelude in LaTeX

2000-07-05 Thread Marc van Dongen
Hello all, Is there anybody who knows where to find the Prelude typeset in Manuel Chakravarty's haskell.sty? Thanks in advance for any replies. Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 4903578 University College Cork, NUIC | Fax:+353 21 4903113

Re: Group theory

2000-10-24 Thread Marc van Dongen
Mechveliani's docon (algebraic DOmain CONstructor) has facilities for that. Have a look at: http://www.cs.bell-labs.com/who/wadler/realworld/docon.html Regards, Marc van Dongen ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo

Re: `Covertible' class. Reply.

2001-02-08 Thread Marc van Dongen
implemented. You really need this. Regards, Marc van Dongen ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Two Times [was Re: Happy and Macros (was Re: ANNOUNCE: Happy 1.10 released)]

2001-05-11 Thread Marc van Dongen
Manuel M. T. Chakravarty ([EMAIL PROTECTED]) wrote: [received message twice] Am I just the only one or does everybody receive messages posted to [EMAIL PROTECTED] and [EMAIL PROTECTED] twice? I find it a bit (I know I am exaggerating) annoying. Is there a way to avoid this? Regards, Marc

Re: computer language shootout

2001-07-27 Thread Marc van Dongen
Miles Egan ([EMAIL PROTECTED]) wrote: [shootout] Before it starts to explode, can we move this thread to the Haskell Cafe? Regards, Marc -- Marc van Dongen, CS Dept | phone: +353 21 4903578 University College Cork, NUIC | Fax:+353 21 4903113 Western Road, Cork, Ireland | Email

Re: code for exercise 4.10

2001-10-11 Thread Marc van Dongen
rock dwan ([EMAIL PROTECTED]) wrote: : Iam having some difficulties doing exercise 4.10 from craft of fucntional : programming book ..is their a possible solution for this ? Can we please move this thread to the haskell cafe? Thanks in advance, Marc van Dongen

Re: gcd 0 0 = 0

2001-12-14 Thread Marc van Dongen
perfect sense to say that $0$ divides $0$ which is why gcd 0 0 = 0; and gcd 0 0 /= error Blah The gcd of two integers is usually defined as a non-negative number to make it unique. HTH. PS: I am strongly in favour of gcd 0 0 = 0. Regards, Marc van Dongen

Re: gcd 0 0 = 0

2001-12-16 Thread Marc van Dongen
Marc van Dongen ([EMAIL PROTECTED]) wrote: : An integer $a$ divides integer $b$ if there exists an integer : $c$ such that $a c= b$. [snip] : gcd 0 0 = 0; and : gcd 0 0 /= error Blah To make clear why $0$ (and not any other non-zero integer) is the gcd of $0$ and $0$ I should have added

Re: gcd 0 0 = 0

2001-12-18 Thread Marc van Dongen
both a and b). Regards, Marc van Dongen -- Marc van Dongen | [EMAIL PROTECTED] | Computer Science Department | Western Road | () ASCII ribbon campaign University College Cork |Cork, Ireland | /\ against HTML mail phone: +353 (0)21 4903578 | fax: 4903113

Re: gcd 0 0 = 0

2001-12-18 Thread Marc van Dongen
, Here an integer a divides an integer b if there is an integer c such that b = c*a. Note that if you regard an integer a to be greater than another integer b if b divides a then the gcd of two intgerers may also be regarded as the greatest common divisor of a and b. Regards, Marc van Dongen

Re: gcd 0 0 = 0

2001-12-18 Thread Marc van Dongen
have a pretty good idea about what it means for one number to divide another. [snip] Regards, Marc van Dongen -- Marc van Dongen | [EMAIL PROTECTED] | Computer Science Department | Western Road | () ASCII ribbon campaign University College Cork |Cork, Ireland

Big heap for a small program

1997-04-09 Thread Marc van Dongen
I just wanted to report that the erroneous and tiny program added below can not be compiled within 6MB of heap (Admitted it can be compiled with a bigger heap). It was part of a bigger program that could not be compiled within 20MB of heap. Regards, Marc van Dongen [EMAIL PROTECTED

bug report

1997-05-31 Thread Marc van Dongen
Hi, While I was constructing an example for ghc-users, I created the following program which crashed ghc-2.03. module Tmp( g ) where data AB p q = A | B p q g :: (Ord p,Ord q) = (AB p q) - Bool g (B _ _) = g A tmp.lhs:6: Warning: Possibly incomplete patterns in

tcLookupTyVar error (Similar as last one? Don't know.)

1997-05-31 Thread Marc van Dongen
van Dongen module Rings( Group, Ring ) where import qualified Prelude( Ord(..), Eq(..), Num(..) ) import Prelude hiding( Ord(..), Eq(..), Num(..), MonadZero( zero ) ) class Group a where compare

profiling

1997-06-15 Thread Marc van Dongen
Hi all, I have noticed that profiling in ghc-2.03 in combination with -O or -O2 is not possible because of some problems at the linking stage. Also it turns out that profiling combined with tracing results in programs which don't output any trace at all. Are the problems related to profiling an

-fshow-specialisations

1997-06-15 Thread Marc van Dongen
This does not work in ghc-2.03. ghc-2.03: unrecognised option: -fshow-specialisations Hope this helps. Regards, Marc van Dongen

bug report

1997-06-26 Thread Marc van Dongen
I would like to report the following bug in ghc-2.04. Profiling and optimizing with -O2 (I have not and will not try -O) leads to errors like this at link-time: CC_mkZubalancedZ92Z92Z92Zq_struct Blah1.o CC_DICTs_struct Blah2.o CC_mkZubalancedZ92Zq_struct Blah3.o

bug report

1997-07-20 Thread Marc van Dongen
a) buggy omega = g omega 1 g :: (Class a) = (L a) - a - (L a) g omega one = omega I had expected an overloading error because of the use of ``1'' in the definition for ``buggy''. Hope this helps. Regards, Marc van Dongen

bug report

1997-05-30 Thread Marc van Dongen
If my memory serves me right, I haven't seen this one in ghc-2.03: *** Pattern-matching error within GHC! This is a compiler bug; please report it to [EMAIL PROTECTED] Fail: "typecheck/Unify.lhs", line 60: incomplete pattern(s) to match in function "unifyTauTyLists" Caused by the

bugg report (profiling again)

1997-07-16 Thread Marc van Dongen
Module3.o CC_nubZ92Zq_struct Module4.o ld: fatal: Symbol referencing errors. No output written to ModuleMain Compiling without profiling and -O2 or compiling with -O2 but without profiling produces no errors. Regards, Marc van Dongen

bug report

1997-08-01 Thread Marc van Dongen
this helps, Marc van Dongen [EMAIL PROTECTED]

profiling

1997-09-29 Thread Marc van Dongen
-names out of the profiling package? I have looked at the .hp files, but the information does not seem to be available at that level. Any help would be greatly appreciated. Regards, Marc van Dongen [EMAIL PROTECTED]

bug report

1997-11-28 Thread Marc van Dongen=
/usr/local/ghc-2.09/lib/libHS.a(GHCmain__7.o) I have not used the function getBufferMode in my source. I do have a hSetBuffering. Any suggestions how to get around this? Thanks in advance, Marc van Dongen

happy bug

1998-01-21 Thread Marc van Dongen=
.. (let a = 1 b = 2 .. Which isn't proper Haskell. Regards, Marc van Dongen

bug report

1998-02-05 Thread Marc van Dongen=
-} $x0_ts1Kze $x1_ts1Kzd)) PrelBase.Integer{-3g-} If more details are needed please call. Regards, Marc van dongen

Re: ghc-3.00-linux bug in linking

1998-02-11 Thread Marc van Dongen=
spj: : Sergey, Marc : : I've had a look at your Docon thing. It really is Sergey's thing. He deserves all the credit. [snip] Cheers, Marc

Is this a bug?

1998-03-01 Thread Marc van Dongen=
Hi there, I suspect the program included below is incorrect. Nevertheless it compiles fine under ghc-3.01 patchlevel 0. module Main( main ) where import List( genericLength ) main = putStr (show integral) putStr "\n" return () where integral =

Re: Is this a bug?

1998-03-01 Thread Marc van Dongen=
[snip] : module Main( main ) where : import List( genericLength ) : main = putStr (show integral) : putStr "\n" : return () :where integral = genericLength [] [snip] : This is a legal Haskell program. The (ambiguous) type of `integral' is : (Num a

quotes deleted in error messages

1998-03-30 Thread Marc van Dongen=
Hello there, While compiling some source code of mine, containing the following lines (line numbers included): 321 322 minCycleLength :: Vertex - (MarcMap Vertex (MarcMap Vertex v)) - Maybe Int 323 minCycleLength v g 324 = mcl ws g'' 325 where ws = mapDom (rdMap g v) 326

tcLookupGlobalValue

1998-07-23 Thread Marc van Dongen
Hi there, I would like to report the following. After splitting up one module in two seperate modules in two different files, I ended up with something as follows: swift more A.lhs module A( a ) where a = 1 swift more B.lhs module A( b ) where import A( a ) b = a + a The compilation

stranal/SaAbsInt.lhs:668: Non-exhaustive patterns in function `absApply'

1998-08-01 Thread Marc van Dongen
Hi there, module F( f ) where class C a b where f :: a - b - b instance C Bool b where f a b = if a then b else b instance C (IO Bool) (IO b) where f a b = a = \bool - f bool b Leads to a ghc-3.02 crash: stranal/SaAbsInt.lhs:668: Non-exhaustive patterns in function `absApply'

bug report 4.00

1998-11-17 Thread Marc van Dongen
Hi there, While compiling some stuff with 4.00 I get the following output before compilation stops. [snip] GNU CPP version 2.7.2 (sparc) #include "..." search starts here: #include ... search starts here: . /usr/local/ghc-4.00/lib/ghc-4.00/includes /usr/local/ghc-4.00/lib/ghc-4.00/includes

`__ap_9_upd_info' undeclared

1998-12-02 Thread Marc van Dongen
went wrong. If you need more info to know what is going on, please let me know and I may give it a shot to isolate the problem. Regards, Marc van Dongen ** ghc-4.00 -c Filnam.lhs -recomp -v -fglasgow-exts -cpp -hi-diffs -syslib

Pattern match(es) overlapped (again)

1998-12-15 Thread Marc van Dongen
Hi there, This is ghc-4.01 I have not seen an instance of such a message for non-overlapping patterns for non-string types. As part of a where clause I have (modulo renaming) two equations of the following form: f Pat1 p2 p3 p4 = rhs1 f Pat2 p2 p3 p4 = rhs2 where Pat1 and Pat2

Overlapping Patterns (false alarm)

1998-12-15 Thread Marc van Dongen
Hello again, Sorry about my previous ``report'' on overlapping patterns. I overlooked the fact that the first ``ground'' instance appearing in the function definition was, in fact, a variable. GHC really works! Regards, Marc

kind mismatch ($)

1999-01-04 Thread Marc van Dongen
of an identifier suffixed by a one or more quote symbols. Regards, Marc van Dongen

Re^2: Extra output lines from trace.

1999-04-09 Thread Marc van Dongen
Hi there, This is related to at least two earlier messages in this forum which sadly enough I only noticed today. It probably is a feature that since then trace doesn't print Trace on/Trace off anymore. Is there any reason for not doing this anymore? In my opinion it makes tracing very

Proposal for error message improvement

1999-04-15 Thread Marc van Dongen
there are in the definition of a function, the more difficult I have found it to locate the cause of errors resulting in error messages as the one above. Would it be possible to provide an explanation as to what could have caused such errors? Regards, Marc van Dongen

Re: Integer - Int conversion

1999-06-23 Thread Marc van Dongen
Bound-1)*(maxBound-1) outputs: According to ghc-4.02 (1-maxBound)^2 = 4 According to ghc-4.02 (maxBound-1)^2 = 4 Mod maxBound the result of both multiplication should have been 1. Maybe it is better to rely on Integers. Regards, Marc van Dongen

bug with trace

1999-07-01 Thread Marc van Dongen
Fail: Prelude.tail: empty list Regards, Marc van Dongen

Internal Happy Error

1999-08-01 Thread Marc van Dongen
) - return (S# g) Hope that helps. Regards, Marc van Dongen

Re: ghc from CVS (1999/07/31) throws core...

1999-08-02 Thread Marc van Dongen
ore dumped) Regards, Marc van Dongen

Internal Happy Error (another one)

1999-08-02 Thread Marc van Dongen
Hi there, ghc-4.04's parser does not seem to like expressions of the following kind: case a of (#I a) - and blah (# sa, a, #) Upon using these expressions it dies due to an internal Happy error. Hope this helps, Marc van Dongen

make depend

1999-09-09 Thread Marc van Dongen
Hi There, When I noticed that my mkdependHS didn't work any more I noticed that the release notes for ghc-4.04 mentioned that this program had become obsolete and that ghc-4.04 -M should be used instead. The problem I have with ghc-4.04 -M is that is seems to be *very* reluctant to generate

Re: make depend

1999-09-09 Thread Marc van Dongen
. I think I'll wait until I am refered to some form of documentation. Thanks again, Marc van Dongen

Re: make depend

1999-09-09 Thread Marc van Dongen
/command line options) which doesn't make any reference to the -M flag. I'll try again. Thanks. Regards, Marc van Dongen

Segmentation Fault (After installing 2.95.2)

1999-12-16 Thread Marc van Dongen
sem to run fine.) Regards, Marc van Dongen ___ Marc van Dongen, CS Dept | phone: +353 21 903578 University College Cork, NUIC | Fax: +353 21 903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED]

CVS make all failed: RegAllocInfo

2000-01-31 Thread Marc van Dongen
updating today this failed. Any suggestions on how to fix this will be greatly appreciated. Thanks in advance. Marc van Dongen *** log *** ===fptools== Recursively making `all

CVS: make all: [MatchPS.o] Segmentation Fault (core dumped)

2000-02-02 Thread Marc van Dongen
is required. Regards, Marc van Dongen

cvs 4.07 arithmetic errors in Integer arithmetic

2000-02-28 Thread Marc van Dongen
against applying the same fix for 4.06? Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 903578 University College Cork, NUIC | Fax: +353 21 903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED]

cvs: MachCode (undeclared functions)

2000-03-01 Thread Marc van Dongen
Hi there, Make all fails due to the fact that some functions in nativeGen/MachCode are undeclared. Log appended. Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 903578 University College Cork, NUIC | Fax: +353 21 903113 College Road, Cork, Ireland

cvs: Profiling.c:462: strucuture has no member named `emitted'

2000-03-01 Thread Marc van Dongen
Hi there, I just updated cvs and now make fails because of a Profiling.c:462: strucuture has no member named `emitted' thingy. Log appended. Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 903578 University College Cork, NUIC | Fax: +353 21 903113

cvs: make boot fails: mkdependHS-inplace: can't open directory haxml/lib

2000-03-01 Thread Marc van Dongen
Hello again, When carrying out a make boot with cvs this caused a problem because of the following: mkdependHS-inplace: can't open directory haxml/lib I have appended a log. Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 903578 University College Cork, NUIC

Re: make boot fails: mkdependHS-inplace: can't open directory hax ml/lib

2000-03-01 Thread 'Marc van Dongen'
Gunter also pointed me in this right direction. Regards, Marc -- Marc van Dongen, CS Dept | phone: +353 21 903578 University College Cork, NUIC | Fax: +353 21 903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED]

cvs: Profiling.c:462: parse error before `'

2000-03-02 Thread Marc van Dongen
Hello again, When making cvs it halts because of a Profiling.c:462: parse error before `' I have appended a log. Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 903578 University College Cork, NUIC | Fax: +353 21 903113 College Road, Cork, Ireland | Email

Re: Profiling.c:462: parse error before `'

2000-03-02 Thread 'Marc van Dongen'
), then just remove Profiling.c and cvs update to recover : the stock version. Thanks, that solved that problem. Now I get a:-( StixPrim.lhs:6: Could not find valid [boot] interface file `OrdList' Any suggestions? Log appended. Regards, Marc van Dongen -- Marc van Dongen, CS Dept

cvs built ghc creates segmentation fault generating binaries

2000-03-03 Thread Marc van Dongen
to be the cause of the problem. I'll try to locate the error and let you know of my findings. Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 903578 University College Cork, NUIC | Fax: +353 21 903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED]

Re: -O2 == crash

2000-03-09 Thread Marc van Dongen
not. : With -O2-for-C it does not. Hi Macin, I installed gcc-2.95 some months ago and downgraded to 2.8.1 because I couldn't get it running. gcc-2.8.1 seemed to work fine (until a few days ago). Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 903578 University

FastString.lhs:629: parse error on input `#'

2000-03-13 Thread Marc van Dongen
, Marc van Dongen -- ===fptools== Recursively making `all' in glafp-utils ghc hslibs ... PWD = /newdisk/dongen/cvs/fptools

Re: FastString.lhs:629: parse error on input `#'

2000-03-13 Thread Marc van Dongen
George Russell ([EMAIL PROTECTED]) wrote: : Marc van Dongen wrote: [error at line 629] : Odd, because I get (from the anon-cvs repository) : : /usr/local/pub-bkb/ghc/ghc-latest/bin/ghc -cpp -fglasgow-exts -Rghc-timing -I. :-IcodeGen -InativeGen -Iparser

Re: cvs: make all - error PackedString.lhs

2000-03-12 Thread Marc van Dongen
Sven Panne ([EMAIL PROTECTED]) wrote: : Marc van Dongen wrote: : Just to let jou know. I just updated and tried to rebuild : ghc from cvs. I then got: : : PackedString -c PackedString.lhs -o PackedString.o -osuf o : [...] : : I've already fixed that one (and a related bug in ghc

Re: Enum instance for Ratio

2000-03-09 Thread Marc van Dongen
George Russell ([EMAIL PROTECTED]) wrote: : Marc van Dongen wrote: : Wouldn't that make Enum depend on Ord? : Doesn't seem to make sense if classes are : enumerable but not comparable. Of course above I should have said orderable in stead of comparable. : What examples are there of types

Re: Enum instance for Ratio

2000-03-09 Thread Marc van Dongen
George Russell ([EMAIL PROTECTED]) wrote: : A logical definition of Enum (to me wearing a mathematical hat) : would be : : succ x = min { y | y x} : Wouldn't that make Enum depend on Ord? Doesn't seem to make sense if classes are enumerable but not comparable. Regards, Marc

cvs: make all - SocketPrim error

2000-03-15 Thread Marc van Dongen
/parsec make[2]: *** [SocketPrim.o] Error 1 make[1]: *** [all] Error 1 make: *** [all] Error 1 Just to let you know. Log appended. Regards, Marc van Dongen

SocketPrim (more info)

2000-03-15 Thread Marc van Dongen
Regards, Marc van Dongen

Re: Recent Sparc breakage

2000-03-16 Thread 'Marc van Dongen'
me for further info:. Regards, Marc van Dongen

mkdependHS (proposal for improvement)

2000-06-01 Thread Marc van Dongen
Hi there, I don't know if this is a known problem. The ``problem'' with mkdependHS is when it is used in conjunction with happy. The imports in the .ly file are not recognised and one has to rebuild sources by hand. I am surprised I never noticed this before and it isn't a big problem. Just a

Integer arithmetic broken (again)

2000-06-03 Thread Marc van Dongen
free to contact me for further information. Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 4903578 University College Cork, NUIC | Fax:+353 21 4903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED]

Re: Integer arithmetic broken (again)

2000-06-04 Thread Marc van Dongen
Sven Panne ([EMAIL PROTECTED]) wrote: : [EMAIL PROTECTED] might be the more appropriate list. A reader of that list asked me explicitly not to send it to that list because he thought it wasn't appropriate to sent cvs-bug messages to that list:-) I'll send further error messages to cvs-ghc in

ghc-4.08 core dumps: probably parenthesis related

2000-07-05 Thread Marc van Dongen
is not ok. Hope this helps. Regards, Marc van Dongen -- Marc van Dongen, CS Dept | phone: +353 21 4903578 University College Cork, NUIC | Fax:+353 21 4903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED]

Bug report: mkPrimReturnCode: Upd tpl4{-c9vM-}

2000-08-13 Thread Marc van Dongen
] The annotations were added in a file containing type and data definitions only. The compilation of that file went fine. The compilation of another one depending on the types went wrong:-( I have attached a log. Let me know if you need some more info. Regards, Marc van Dongen -- Marc van

Re: 'undefined reference to `_imp__Addr_zdfNumAddrOff_closure' (? ????????)

2000-09-27 Thread Marc van Dongen
, Marc van Dongen

class system

1997-05-28 Thread Marc van Dongen
Dear Group, I want to define two classes called Group and Ring. The Group class is for Abelian Groups (G,+), i.e. groups with a binary commutative operator ``+'' and an identity element normally denoted by ``0''. The Ring class is meant for cummutative rings (R,+,*) with binary operators ``+''

how is this implemented

1998-02-05 Thread Marc van Dongen=
van Dongen, Computer Science Dept | phone: +353 21 903083 University College Cork, NUIC | Fax: +353 21 903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED]

State Interface Description

1998-12-28 Thread Marc van Dongen
Dear All, I am hoping that somebody will be able to help me with this before the hollidays are over:-) I am trying to locate a document with a name state_interface or something similar which is being named in some file in the 4-01 distribution. I have tried to locate it but failed. It seems as

Is there anybody who can help me with this

1998-12-29 Thread Marc van Dongen
be greatly appreciated. Regards, Marc van Dongen Marc van Dongen, Computer Science Dept | phone: +353 21 903084 University College Cork, NUIC | Fax: +353 21 903113 College Road, Cork, Ireland | Email: [EMAIL

gmp.info

1998-12-31 Thread Marc van Dongen
Dear all, According to the user guide (section 6.2) there should be a document calld gmp.info in the distribution. I tried to locate it, but it is not there. Is there anybody who can tell me where to get it. Regards, Marc van Dongen

Re: redirecting *.hi

1999-07-21 Thread Marc van Dongen
Sergey: One small correction: The sed script should be: sed -e 's/.*\/\([^\/][^\/]*\)\.hs/$(E)\/\1.o, $(E)\/\1.hi/' Of course: :g/.*\/\([^\/][^\/]*\)\.hs/s//$(E)\/\1.o, $(E)\/\1.hi/ in vi should also work. Regards, Marc

Re: Scientific uses of Haskell?

1999-11-26 Thread Marc van Dongen
www.theorema.org Regards, Marc van Dongen ___________ Marc van Dongen, CS Dept | phone: +353 21 903578 University College Cork, NUIC | Fax: +353 21 903113 College Road, Cork, Ireland | Email: [EMAIL PROTECTED]

Re: Haskell and Computer Algebra

1999-11-30 Thread Marc van Dongen
[I cc'd this to haskell users since I couldn't find out what the name was of the forum to which the original thread belonged to. Appologies if I have made a mistake and I am upseting somebody.] Jerzy Karczmarczuk: : horrible complexity. Does it answer your question?

  1   2   >