Re: Thanks, and new question re existensials

1999-11-08 Thread Fergus Henderson
.) -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: behaviour of System.system?

1999-11-16 Thread Fergus Henderson
he current set of restrictions on errors does not seem very satisfactory, IMHO. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: Making argv a constant

1997-01-18 Thread Fergus Henderson
see my .sig ;-) P.S. Is this list archived anywhere? -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED] | -- the last words of T. S. Garp.

Re: Making argv a constant

1997-01-18 Thread Fergus Henderson
. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED] | -- the last words of T. S. Garp.

Re: Making argv a constant

1997-01-18 Thread Fergus Henderson
implementing Haskell slightly more difficult and (b) reduce efficiency, for interpreters and JIT compilers. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL

global type inference

1997-02-26 Thread Fergus Henderson
ble to all Haskell implementations? Also, what is the situation in this regard with respect to the existing Haskell implementations? -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: fin

vagiaries of computer arithmetic

1997-03-09 Thread Fergus Henderson
. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED] | -- the last words of T. S. Garp.

Re: polymorphic higher-order terms

1997-03-14 Thread Fergus Henderson
, String, F) - (Int, String) foo (i, s, MkF f) = (f i, f s) -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED] | -- the last words of T. S. Garp.

Re: haskell operator precedence

1997-03-19 Thread Fergus Henderson
Ambiguous use of operator "foo" with "bar" Ah. Thank you for reading my mind. Now why can't ghc and Hugs do that? ;-) ;-) Sorry about that. (I really should think a bit harder before mailing this list, lest I make a habit of looking really silly...) -- Fergus Henderson

Re: Preliminary Haskell 1.3 report now available

1996-03-08 Thread Fergus Henderson
-flow. I find this very confusing. -- Fergus Henderson | Designing grand concepts is fun; [EMAIL PROTECTED] | finding nitty little bugs is just work. http://www.cs.mu.oz.au/~fjh | -- Brooks, in "The Mythical Man-Month". PGP key fingerprint: 00 D7 A2 27 65 09

Re: Debugging Haskell

1996-07-13 Thread Fergus Henderson
-- see http://www.cs.mu.oz.au/mercury. Unfortunately there aren't any great debugging environments for Mercury yet either... though we hope to be able to remedy that situation sometime in the not-to-distant future. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursui

local definitions of `=' etc.

1997-05-26 Thread Fergus Henderson
sugar expand to code that uses plain `' or `Prelude.'? The Haskell 1.4 report is not clear on this point, IMHO. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL

Re: Standard Haskell

1997-08-22 Thread Fergus Henderson
. C++ doesn't have an ISO/ANSI standard, yet C++ does seem to be pretty widely used in industry. The same is true for Delphi. (Well, Delphi is not used nearly as much as C++, but it is probably used much much more than Haskell.) -- Fergus Henderson [EMAIL PROTECTED] | "I have always

Re: Standard Haskell

1997-08-22 Thread Fergus Henderson
ng ISO of this would be a significant hurdle to overcome. In any case, I agree with Dave Barton that ISO standardization for Haskell should not be considered until after the current effort at defining "Standard Haskell" is complete. -- Fergus Henderson [EMAIL PROTECTED] | "I hav

Re: sorting graph traversal. Reply.

1997-08-23 Thread Fergus Henderson
implementing a graph structure, and efficient traversal is just pointer dereferencing. Another example of something that is common in C/C++ but which in difficult to do efficiently in Haskell is hash tables. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW:

Re: standard Haskell

1997-12-12 Thread Fergus Henderson
g instance declarations, in an arguably clearer way. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED] | -- the last words of T. S. Garp.

Re: Xmas fun

1997-12-20 Thread Fergus Henderson
ading underscores, I suppose you could use `v2_'). So, sing ho for regression tests, but sing louder for static analysis ;-) -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit"

Re: Standard Haskell: Typecasts (Another message from Alastair)

1998-03-13 Thread Fergus Henderson
this problem is unsafe_cast :: a - b However, this is of course less safe, and prone to abuse ;-) -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL

Re: FP Naming/Directory Service

1998-03-26 Thread Fergus Henderson
Technical Report 96/45, Department of Computer Science, University of Melbourne, December 1996, http://www.cs.mu.OZ.AU/publications/tr_db/mu_96_45.ps.gz Obviously there will be some differences in Haskell, but I think quite a bit of the interface could carry over into Haskell. -- Fergus

Re: Design Methodologies

1998-02-03 Thread Fergus Henderson
design documentation for the Mercury compiler, which are available at http://www.cs.mu.oz.au/mercury/developer/compiler_design.html, you will find almost nothing that is specific to the implementation language. The compiler could just as easily have been implemented in C using the exact same high-level

Re: Multiple Parameter Class in Hugs -- Please!

1998-04-02 Thread Fergus Henderson
) was written in C for efficiency. ghc was written in Haskell, and hence is big, fat, and slow. Please correct me if I am wrong ;-) -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" P

Re: Characterizations of H-M type inference?

1998-04-26 Thread Fergus Henderson
of constraints, and type inference is the process of solving those constraints. This is a pretty declarative, non-operational way of viewing things, IMHO. (Sorry, I don't have any specific references to hand -- maybe someone else can assist.) -- Fergus Henderson [EMAIL PROTECTED] | "I have always

Re: Pattern Match Success Changes Types

1998-05-08 Thread Fergus Henderson
allocating the full size even for data that doesn't occupy the full size. Thus I think it unlikely that an implementation would adopt such a strategy. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal

Re: quicksort and compiler optimization

1998-05-08 Thread Fergus Henderson
, such as median-of-three partitioning. For descriptions of that and other ways to speed up quicksort, see Sedgewicks "Algorithms in C" or "Algorithms in Pascal" (I'm afraid Sedgewick didn't write an "Algorithms in Haskell" ;-). -- Fergus Henderson [EMAIL PROTE

Re: Pattern Match Success Changes Types

1998-05-12 Thread Fergus Henderson
method is called. Note that writing foo _ r@(Right c) = classmethod (Right c) would result in compile error (or worse) due to an uninstantiated type variable. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au

Re: Pattern Match Success Changes Types

1998-05-12 Thread Fergus Henderson
are very common, so it's probably worth optimizing these cases. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: C to Haskell

1998-05-13 Thread Fergus Henderson
also does a conservative scan of the C stack, so the same would apply there. However, for implementations such as ghc, you may not be able to get away with this. Instead, you might have to explicitly register and unregister any pointers to Haskell data structures from the C data areas. -- Fergus Hender

Re: quicksort and compiler optimization

1998-05-13 Thread Fergus Henderson
On 10-May-1998, S. Alexander Jacobson [EMAIL PROTECTED] wrote: On Fri, 8 May 1998, Fergus Henderson wrote: Note that consolidating multiple passes into single passes is not always a win. For example, if your machine has 10 available registers, and each pass uses 8 of them, then combining

Re: Wadler's prettier printer

1998-05-15 Thread Fergus Henderson
modified code below. Wouldn't it be a good idea for the modified code to actually disallow the use of | directly, then? A module system that can enforce encapsulation is a wonderful thing. But of course it can't do any good if no-one uses it! ;-) -- Fergus Henderson [EMAIL PROTECTED] | "I

Re: Pattern Match Success Changes Types

1998-05-29 Thread Fergus Henderson
plications. I think I've seen this. It didn't seem to go down to well if my memory is correct. True, but maybe considerations such as these will sway the balance a bit! ;-) -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh |

Re: data or class inheritance

1998-06-06 Thread Fergus Henderson
ethod such as name :: Organization a = a - String you can do things like orgnames :: [String] orgnames = map name orgs Does that help? I'm about to put existentials into GHC. I'm glad to see it. We're currently in the process of putting existentials into Mercury :-) -- Fergus Hend

Re: data or class inheritance

1998-06-07 Thread Fergus Henderson
? Quantifiers can be very confusing even if everyone agrees on the same terminology. Are you sure you want to go against the established terminology here? -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a let

Re: data or class inheritance

1998-06-07 Thread Fergus Henderson
* laziness! ;-) -- Fergus Henderson [EMAIL PROTECTED] | "The three principal virtues of a WWW: http://www.cs.mu.oz.au/~fjh | programmer are Laziness, Impatience, PGP: finger [EMAIL PROTECTED]| and Hubris." --Larry Wall.

Re: Exceptions and return

1998-06-11 Thread Fergus Henderson
s are rare, so there's no need to go to that effort, and even if you did, the increased space costs and resulting decreased locality would probably make it not worthwhile. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | o

Re: Exceptions and return

1998-06-11 Thread Fergus Henderson
On 10-Jun-1998, Hans Aberg [EMAIL PROTECTED] wrote: At 01:09 +1000 98/06/11, Fergus Henderson wrote: There's little point trying to implement C++-like so-called "zero-overhead" exceptions in any language with garbage collection. It would probably result in a perfor

Re: FW: Exceptions are too return values!

1998-06-11 Thread Fergus Henderson
y functional code, and is much easier to implement efficienctly. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: FW: Exceptions are too return values!

1998-06-11 Thread Fergus Henderson
On 10-Jun-1998, S. Alexander Jacobson [EMAIL PROTECTED] wrote: On Thu, 11 Jun 1998, Fergus Henderson wrote: It would make debugging easier if the exception picked was consistent accross implementations. It doesn't matter which one, but it does matter that it is the same. (maybe you

Re: FW: Exceptions are too return values!

1998-06-12 Thread Fergus Henderson
ast time I looked, I think implementations of Java for those platforms simply didn't conform to the spec. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]

Re: Exceptions are too return values!

1998-06-15 Thread Fergus Henderson
`hyperstrict handle` (const (return [])) print list P.S. Is there any reason why something like `HyperEval' isn't built in to Haskell, or at least include in the Haskell Library report? Is there any implementation-specific precedent for something like this in say ghc

Re: Exceptions are too return values!

1998-06-15 Thread Fergus Henderson
things like this. But generally covert communication channels are not an issue. So in general it's enough to say that whether or not you get a HeapOverflow resource failure is nondeterministic. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW:

Re: FW: Exceptions are too return values!

1998-06-15 Thread Fergus Henderson
On 12-Jun-1998, Alastair Reid [EMAIL PROTECTED] wrote: Fergus Henderson [EMAIL PROTECTED] points out that our exception handling scheme hits problems if you hit an infinite loop instead of an exception. Yes, this is a problem - and not a pretty one. Fixes: ... 3) Add timeouts (and ctrl

Re: Exceptions are too return values!

1998-06-16 Thread Fergus Henderson
On 15-Jun-1998, Peter White peter@galois wrote: On June 15, Fergus Henderson writes As noted earlier, things like heap overflow, and stack overflow are different from other kinds of exceptions. They can't be modelled using the domain-theoretic semantics. Rather, they reflect

Re: Exceptions are too return values!

1998-06-16 Thread Fergus Henderson
On 15-Jun-1998, Fergus Henderson [EMAIL PROTECTED] wrote: On 12-Jun-1998, Scott Turner [EMAIL PROTECTED] wrote: At 14:40 1998-06-10 +0100, you wrote: Here's a reasonable design for exceptions in Haskell: * handle :: (String - IO a) - IO a - IO a You probably realized more

Re: FW: Exceptions are too return values!

1998-06-16 Thread Fergus Henderson
n constitute program bugs, this is not so much of a worry. The nondeterminism doesn't make testing any more difficult, for example. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit"

Re: Exceptions and functions. Second round?

1998-06-17 Thread Fergus Henderson
allowing mutually recursive handlers? This is also allowed by the current proposal -- it's quite straightforward: handler1 e = stuff1 `handle` handler2 handler2 e = stuff2 `handle` handler1 -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW:

Re: Floating point

1998-06-18 Thread Fergus Henderson
lled here yet. But I don't have an implementation for the exception handling primitives I proposed, so I haven't actually tested it. Thus it is quite possible that it may contain the odd bug or two. Cheers, Fergus. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pur

Re: Interprocess communications

1998-06-19 Thread Fergus Henderson
= grep(blah) h = wc(-l) then the line above is h(g(f)). Or `h $ g $ f'. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last wor

Re: Standard Haskell: More lexical/syntactic issues (from Alastair Reid)

1998-06-24 Thread Fergus Henderson
1 with n=0 in the grammar rule for import. This one I support. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: Standard Haskell: More lexical/syntactic issues (from Alastair Reid)

1998-06-24 Thread Fergus Henderson
It may be reasonable to require module headers, but I don't think poor compiler diagnostics is a sufficiently good reason, since it really isn't that hard to just fix the compiler diagnostics. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: ht

Re: multi param type classes

1998-07-09 Thread Fergus Henderson
the ones that would otherwise be ambiguous. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: multi param type classes

1998-07-09 Thread Fergus Henderson
be disambiguated by the context, and in fact even if you don't even make use of the overloaded name at all. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -

Re: Instance contexts.

1998-07-16 Thread Fergus Henderson
examples are enough to make my point ;-) -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: Instance contexts.

1998-07-16 Thread Fergus Henderson
? There will still be problems with things like instance Foo [m] = Foo m Fergus Henderson writes of: the monomorphism restriction (which exists for a similar reason, to ensure termination of type inference). Is this true? Well, I had assumed that was the reason. I could be wrong

the monomorphism restriction (was: instance contexts)

1998-07-17 Thread Fergus Henderson
On 15-Jul-1998, Alex Ferguson [EMAIL PROTECTED] wrote: Fergus Henderson writes of: the monomorphism restriction (which exists for a similar reason, to ensure termination of type inference). Is this true? The rationale normally given for it by its advocates (boo, hiss) seems invariably

Re: GHC/Hugs Status (was Re: simple interface to web?)

1998-07-17 Thread Fergus Henderson
ated tasks. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: GHC/Hugs Status (was Re: simple interface to web?)

1998-07-16 Thread Fergus Henderson
the possibility that accessing the page may fail... or at least put off dealing with such failures until Haskell has better exception support. So I don't think it should affect your interface. But I think it would be better for the interface to use the IO Monad anyway. -- Fergus Henderson [EMAIL

Re: GHC licence

1998-07-22 Thread Fergus Henderson
s should be spelled out in the copyright notice, I think. Definitely. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: GHC licence

1998-07-22 Thread Fergus Henderson
On 21-Jul-1998, Hans Aberg [EMAIL PROTECTED] wrote: At 23:28 +1000 98/07/21, Fergus Henderson wrote: I ANAL, but I believe the phrase "public domain" is a well-defined concept. It does not mean why Simon L Peyton Jones means by it, though. If something is public domain, then anyo

Re: avoiding repeated use of show

1998-07-23 Thread Fergus Henderson
eld(mktag(0), Univ, UNIV_OFFSET_FOR_TYPEINFO); Value = field(mktag(0), Univ, UNIV_OFFSET_FOR_DATA); "). %-% :- end_module format. %-% -- Fergus Henderson [EMAIL PROTECTED] | "I have always known

Re: first-argument approach. Reply.

1998-07-29 Thread Fergus Henderson
e only uses the type of the sample, not the value. Of course, if you provide it this way, then you need an explicit type annotation on the sample, which sort of defeats the purpose... -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.

Re: Rambling on numbers in Haskell

1998-08-03 Thread Fergus Henderson
that supports such types. Of course, no-one is stopping you from writing such a package ;-) -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: Rambling on numbers in Haskell

1998-08-04 Thread Fergus Henderson
t;. Or better, just leave out the definition for "/=". The default definition, which is x /= y = not (x==y) should work fine. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is

Re: Straw Poll (name)

1998-09-10 Thread Fergus Henderson
g a winner from a preferential votes using the Quota Preferential method is available at http://www.cs.mu.oz.au/~lee/prsa/count/count_form.html. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal hab

Re: Fixing imports for and namespaces (was: Simon's H98 Notes)

1998-10-21 Thread Fergus Henderson
y simple, but turned out to be a bit trickier than I had originally thought -- the current development version still has several unfixed bugs relating to nested modules. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of exc

Re: Fixing imports for and namespaces (was: Simon's H98 Notes)

1998-10-22 Thread Fergus Henderson
istributed in precompiled binary format rather than as source code. In general it requires architecture-specific complicated munging of the generated library files (`.a', `.so', `.DLL', etc.). -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.c

Re: Fixing imports for and namespaces (was: Simon's H98 Notes)

1998-10-23 Thread Fergus Henderson
by the CC system. Perhaps, but standard configuration systems such as RCS and CVS don't provide that sort of control -- they only provide per-user access control similar to (and with the same problems as) Unix permissions. -- Fergus Henderson [EMAIL PROTECTED] | "I have always

Re: Polymorphic recursion

1998-11-03 Thread Fergus Henderson
this. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: Polymorphic recursion

1998-11-04 Thread Fergus Henderson
that it does what it says. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: ad hoc polymorphism

1998-11-05 Thread Fergus Henderson
tax. Am I mistaken in thinking that overloading, for overloading's sake, isn't what is wanted; what is wanted is to be able to easily differentiate between two functions that happen to be named the same? Why should I have to explicitly differentiate if the meaning is clear from the context

Re: Monolithic and Large prelude

1998-11-05 Thread Fergus Henderson
collision between field names or constructor names. In those cases, the compiler often has enough information to resolve the ambiguity without even needing any explicit type declarations or type qualifications, but Haskell doesn't allow it. -- Fergus Henderson [EMAIL PROTECTED] | "I have a

Re: MonadZero

1998-11-05 Thread Fergus Henderson
inventing a lot of names; I find the resulting namespace polution can be a bit ugly. It is bad style to have trivial definitions for class methods, in which case you are lying to the user. I don't know what you mean here. Could you explain this in more detail? -- Fergus Henderson [EMAIL PROTECTED

Re: Haskell 98 progress

1998-11-05 Thread Fergus Henderson
error", why shouldn't Monads have "mfail"? -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: finger [EMAIL PROTECTED]| -- the last words of T. S. Garp.

Re: ad hoc polymorphism

1998-11-05 Thread Fergus Henderson
ng "hiding": instead of import Foo renaming bar as baz you have import Foo hiding bar baz = Foo.bar -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit"

Re: Haskell 98 progress

1998-11-05 Thread Fergus Henderson
On 05-Nov-1998, Lennart Augustsson [EMAIL PROTECTED] wrote: If Integers can have "error", why shouldn't Monads have "mfail"? I'm objecting less to mfail then mzero. OK, in that case I agree with you. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known t

Re: Note from (deputy) maintainer

1998-11-06 Thread Fergus Henderson
]. BTW, this is easily done using majordomo -- you just set the "subject_prefix" variable in the configuration file. -- Fergus Henderson [EMAIL PROTECTED] | "I have always known that the pursuit WWW: http://www.cs.mu.oz.au/~fjh | of excellence is a lethal habit" PGP: fin

Re: derive conflicts with multiply-defined and module level import

1998-11-10 Thread Fergus Henderson
On 09-Nov-1998, S. Alexander Jacobson [EMAIL PROTECTED] wrote: On Sat, 7 Nov 1998, Fergus Henderson wrote: But if we have to add new syntax to make it work then it is getting to be more trouble than its worth. Since the application is code generation, I don't think the extra syntax

Re: monomorphism etc.

1998-11-13 Thread Fergus Henderson
On 12-Nov-1998, Lennart Augustsson [EMAIL PROTECTED] wrote: [...] if you dislike tuples you can use nested pairs At the cost of losing a little type-safety. -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives forever

Re: tuple types

1998-11-13 Thread Fergus Henderson
On 12-Nov-1998, D. Tweed [EMAIL PROTECTED] wrote: On Fri, 13 Nov 1998, Fergus Henderson wrote: It would avoid the nastiness of a special definition for each tuple type and and lead to more flexibility. I want each tuple arity to be a different type, so that I get a compile error

Re: Reduction count as efficiency measure?

1998-11-25 Thread Fergus Henderson
not) give you reasonable results for comparing List and Random Access List, but for comparisons with Array I'd advise you use something that is close to what you will use for the final implementation. -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au

Re: Efficiencies of containers

1998-12-04 Thread Fergus Henderson
ous memory, at least for optimizing compilers. Implementations using association lists would IMHO only be suitable only for non-optimizing compilers. -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives forever" PGP: fin

Re: syntactic sugar for arrows

1999-01-28 Thread Fergus Henderson
be pretty useful. Maybe the same will be true of arrows. -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives forever" PGP: finger [EMAIL PROTECTED]| -- leaked Microsoft memo.

Re: Hugs: How to neutralize Prelude and to have it?

1999-02-02 Thread Fergus Henderson
specific implementation. -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives forever" PGP: finger [EMAIL PROTECTED]| -- leaked Microsoft memo.

Re: Goals for Haskell 2 - and a proposal

1999-02-15 Thread Fergus Henderson
kAnyFoo 1.0] == [1,2] -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives forever" PGP: finger [EMAIL PROTECTED]| -- leaked Microsoft memo.

Re: A plea for a little Haskell help.

1999-02-17 Thread Fergus Henderson
to accomplish what I want by using a bit of a kludge: What's wrong with class Foo a b where write :: a - b - IO () ? -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives forever" PGP: fin

Re: Haskell 2 -- Dependent types?

1999-02-17 Thread Fergus Henderson
Gofer, ghc, Mercury, etc. all seems to confirm this. So if undecidability per se is used as an argument against any particular proposal for extending the type system, I think that argument should be considerd a rather a weak one. -- Fergus Henderson [EMAIL PROTECTED] | "Binaries ma

Re: how to exploit existentials

1999-02-18 Thread Fergus Henderson
lkp = lookupFM ... or perhaps this class Tab t k where lkp :: t - k - Maybe Value addT :: t - k - Value - t -- instance definition same as before ? -- Fergus Henderson [EMAIL PROTECTED

Re: Haskell 2 -- Dependent types?

1999-02-19 Thread Fergus Henderson
typename ZeroIfEqualtypename FactorialFive::t, HundredAndTwenty::t res2; typedef typename res2::check_is_zero checkme2; -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives forever

Re: Do Existential Types make Algebraic Types obsolete? (was Re: how to exploit existential types)

1999-02-21 Thread Fergus Henderson
tCoord = MkRect Float Float class Coord t where ... instance Coord PolarCoord where ... instance Coord RectCoord where ... -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives forever" PGP: finger [EMAIL PROTECTED]| -- leaked Microsoft memo.

Re: Haskell 2 -- Dependent types?

1999-02-21 Thread Fergus Henderson
to create very complicated type systems. But when it comes to things like proving that `==' is reflexive, symmetric, and transitive, I think it may well be much clearer if these kinds of properties are expressed more directly, rather than by cleverly encoding them in the type system. -- Fergus

Re: Haskell 2 -- Dependent types?

1999-02-22 Thread Fergus Henderson
this correctly? -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives forever" PGP: finger [EMAIL PROTECTED]| -- leaked Microsoft memo.

Re: Haskell 2 -- Dependent types?

1999-02-22 Thread Fergus Henderson
believe "//" here is a C++/Java/C9X-style comment. Just read it as if "//" were "--". Everything from the "//" until the end of line is a comment. -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but

Re: Haskell 2 -- Dependent types?

1999-02-21 Thread Fergus Henderson
wrong -- I think Cayenne is a very interesting language, and it's a very promising line of research. I'm just saying that I think we should be very cautious about adopting this kind of thing into Haskell-2. -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au

Re: Haskell 2 -- Dependent types?

1999-02-23 Thread Fergus Henderson
separation would not allow min2, would it? It would allow min3, above. I'm not sure what min2 buys you over min3. If the `Sorted' type is defined in terms of `sorted', then a compiler ought to be able to optimize min3 just as well as min2, I think. -- Fergus Henderson [EMAIL PROTECTED] | &qu

Re: Modifying the monomorphism restriction

1999-02-25 Thread Fergus Henderson
operator... ;-) Seriously, I like John Hughes' proposal. -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives forever" PGP: finger [EMAIL PROTECTED]| -- leaked Microsoft memo.

Re: Monomorphism

1999-02-25 Thread Fergus Henderson
in Haskell 2? -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives forever" PGP: finger [EMAIL PROTECTED]| -- leaked Microsoft memo.

Re: Modifying the monomorphism restriction

1999-02-25 Thread Fergus Henderson
in my previous post. But this idea is growing on me. Implementations could resolve things statically where possible and using memoing only in cases that can't easily be resolved statically. -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au

Re: Haskell 2 -- Dependent types?

1999-02-22 Thread Fergus Henderson
tion of sort, then no it won't type check. But if you return a proof defined as e.g. proof = proof then if I understand things correctly it will type check. -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives fo

Re: Haskell 2 -- Dependent types?

1999-02-25 Thread Fergus Henderson
On 24-Feb-1999, Carl R. Witty [EMAIL PROTECTED] wrote: Fergus Henderson [EMAIL PROTECTED] writes: What if the body of min2 were defined so that it returned something different in the two cases? Your code has no proof that the code for the two cases is equivalent. If it's

Re: Haskell 2 -- Dependent types?

1999-02-26 Thread Fergus Henderson
On 25-Feb-1999, Carl R. Witty [EMAIL PROTECTED] wrote: Fergus Henderson [EMAIL PROTECTED] writes: Certainly a language with dependent types should define exactly what types the type checker will infer. But when generating code, the compiler ought to be able to make use of more accurate

Re: Haskell 2 -- Dependent types?

1999-02-26 Thread Fergus Henderson
possible to preserve the desirable property that adding type declarations won't change the program's behaviour. -- Fergus Henderson [EMAIL PROTECTED] | "Binaries may die WWW: http://www.cs.mu.oz.au/~fjh | but source code lives forever" PGP: finger [EMAIL PROTECTED]|

  1   2   3   4   >