Re: [Haskell-cafe] Re: [Haskell] MR details (was: Implicit type of numeric constants)

2006-09-25 Thread Christian Sievers
description in the MR. Bye Christian Sievers ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell] MR details (was: Implicit type of numeric constants)

2006-09-23 Thread Christian Sievers
but is used in at most one specific overloading and is not exported. How does that relate to the report? Maybe I have to withdraw what I said about haskell being well defined. All the best Christian Sievers ___ Haskell mailing list Haskell@haskell.org http

Re: [Haskell-cafe] Trying to write a TCP proxy

2006-09-23 Thread Christian Sievers
John Ky wrote: I finally realised that hGetLine strips out the \n newline character so when I forward the line to the server, I need to append it again. Or use hPutStrLn instead of hPutStr ? (I may be missing something...) Bye Christian Sievers

Re: [Haskell-cafe] Polymorphism/monomorphism (and the restriction)

2006-09-23 Thread Christian Sievers
in one of my earlier mails. Seems we need a glossary. Bye Christian Sievers ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell] Re: Implicit type of numeric constants

2006-09-21 Thread Christian Sievers
referential transparency. Only if you expect referential transparency for implicitly typed values. All you have to do is say k :: Num a = a k = 2 and everything is fine. Bye Christian Sievers ___ Haskell mailing list Haskell@haskell.org http

Re: [Haskell] Re: Implicit type of numeric constants

2006-09-20 Thread Christian Sievers
, Christian Sievers ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] Re: Implicit type of numeric constants

2006-09-20 Thread Christian Sievers
don't want types to depend on arbitrary other modules - think of seperate compilation. I'm afraid I'm also still not clear about why 2 doesn't default to 2::Integer in the same way that k defaults to k::Integer, It does, that's why show 2 works. Hope that helps Christian Sievers

Re: [Haskell] GHC / Hugs Disagree on Constraints

2004-10-05 Thread Christian Sievers
Dominic Steinitz asked: Is asTypeOf really Haskell 98? Yes, it is in the Prelude. And there is no special magic, it is Haskell-98-implementable, see http://haskell.org/onlinereport/standard-prelude.html#$vasTypeOf Bye Christian Sievers ___ Haskell

Re: In search of: [a-b] - a - [b]

2003-06-20 Thread Christian Sievers
them...) the generalized solution being simply, f mf x = do f - mf return (f x) Or just replace map by fmap in your flist from above. All the best Christian Sievers ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman

Re: avoiding cost of (++)

2003-01-17 Thread Christian Sievers
neutral l = ... If f is not defined for empty lists, you can combine (with a bit more work) the results of scanl1 and scanr1. HTH Christian Sievers ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: precedence bug with derived instances

2002-10-31 Thread Christian Sievers
if there is a special name for it. Bye Christian Sievers ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Question about use of | in a class declaration

2002-08-21 Thread Christian Sievers
...) ^ ^ ^ only one type variable allowed here aren't Haskell 98. All the best Christian Sievers ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: defining (- Bool) as a set

2002-04-23 Thread Christian Sievers
which is in turn just the same as single x = (x==) which is, amazingly, nothing more than single = (==) -- one can debatte whether this is still better style than the first variant, but it's surely interesting to realize. All the best, Christian Sievers

Re: Haskell 98 Report: October release

2001-10-04 Thread Christian Sievers
Simon Peyton-Jones wrote: Feedback please... One typo: In the change for Page 93, Appendix A, Standard Prelude the comment should not talk about a fixtity declaration. ^ Bye Christian Sievers ___ Haskell

Re: FW: Haskell 98 report problem re lexical structure.

2001-07-25 Thread Christian Sievers
... ^ and could as well be Since qualified names are lexemes, no spaces are allowed... All the best Christian Sievers ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: lexical description problem in language report?

2001-07-24 Thread Christian Sievers
| special | reservedop | reservedid | opencom It's all not new. See: http://www.dcs.gla.ac.uk/mail-www/haskell/msg01596.html http://www.dcs.gla.ac.uk/mail-www/haskell/msg01730.html All the best Christian Sievers ___ Haskell mailing list [EMAIL PROTECTED

Re: Typo in haskell98-report/standard-prelude.html

2000-03-07 Thread Christian Sievers
for PreludeList replace "Sum" by "sum". Christian Sievers

Re: concurrency (was OO in Haskell)

1999-10-07 Thread Christian Sievers
enough. "volatile" variables are MVars, and what are non-volatile variables changed in signal handlers? Uncaught type errors? Enough of that. All the best, Christian Sievers

Re: Haskell Wish list: library documentation

1999-09-09 Thread Christian Sievers
impression that "c" is the way to name a Char, so I suggest to change this to unzip [("", 1), ("a", 2), ("aa", 3)] = (["", "a", "aa"], [1, 2, 3]) which even is no longer! All the best, Christian Sievers

Re: Monads in plain english (Was: Re: Licenses and Libraries)

1999-09-01 Thread Christian Sievers
. (But if they are using an interpreter and don't have to write a main function, you can as well leave this out.) But in order to explain monads even to someone who wouldn't define his own, I'd surely not conceal (=). Alll the best, Christian Sievers

Re: Units of measure

1999-08-26 Thread Christian Sievers
? If not, we could use this extra information for less permissive type checking, for example only allowing a square root from an argument that has only even exponents. (Cayenne doesn't happen to have c*n-patterns?) Christian Sievers

Re: Units of measure

1999-08-26 Thread Christian Sievers
in this case?) I really like Cayenne. All the best, Christian Sievers

Re: Haskell MIME types?

1999-08-25 Thread Christian Sievers
, namely | "application/x-haskell". Maybe the Haskell-Version should also go into the MIME type name, as in "application/x-haskell98". All the best, Christian Sievers

Re: The dreaded layout rule

1999-08-03 Thread Christian Sievers
a typo, as I think no one intended to allow expressions like x ` {- look ma -} elem -- comments inside! ` l All the best, Christian Sievers

Re: Strange lexical syntax

1999-06-28 Thread Christian Sievers
says: A nested comment begins with the lexeme "{-" ... There is no such lexeme. We'd need lexeme - ... | opencom What does M.-- mean? All the best, Christian Sievers -- Freeing Software is a good beginning. Now how about people?

Re: Haskell conventions (was: RE: how to write a simple cat)

1999-06-11 Thread Christian Sievers
tion written somewhere. Most of the rest is what is usually used in mathematics or is done in any computer language (such as c for Char). Yes, a list of these things might be helpful. Christian Sievers

Re: Church numerals in Haskell

1999-06-03 Thread Christian Sievers
(\(_,b)-(b,inc b)) (zer,zer)) where zer s z = z Of course, you wouldn't really use built-in pairing, would you? Christian Sievers

RE: non-linear patterns

1999-05-06 Thread Christian Sievers
Frank A. Christoph gave examples for unintended non-linear patterns, among them: Or, even more more common: f (x@(x,y)) = ... --- oops! If I don't oversee something obvious, this just would fail to type-check, so this shouldn't be a problem. Christian Sievers

Re: Haskell-98 Quiz

1999-04-23 Thread Christian Sievers
= fst (show x, show f) I don't see why it should be illegal, but then nor does Hugs 98. It is happy with this definition and gives "1True" for f. So if you found a subtle strange thing in Haskell 98, you also found a bug in Hugs. Christian Sievers

Re: Modifying the monomorphism restriction

1999-02-24 Thread Christian Sievers
-warning version, or even keep the MR - we could make our editors smarter and let them add the types if they change too often or are just too weird for us, rather than introduce new syntax only in order to be able to leave them out. Christian Sievers

Re: Haskell 98 final stuff

1999-01-29 Thread Christian Sievers
dled by the syntax, so I guess this should be done in this case also. Doing that 'exactly uniformly' would mean productions for expressions e:e, patterns (p:p) and the constructor (:). But we surely don't want to loose the sections (e:) and (:e). Please don't forget them! All the best, Christian Sievers

Re: Two prelude/library matters

1998-11-06 Thread Christian Sievers
doing non-hurting class definition changes, let me repeat this: please let succ and pred be Enum class members. Christian Sievers

RE: MonadZero (concluded)

1998-11-06 Thread Christian Sievers
, the library report defines types for zeroOrMore and oneOrMore, which both are (MonadPlus m) = m a - m [a], but doesn't mention them later. Christian Sievers

Re: MonadZero

1998-11-05 Thread Christian Sievers
can't give good (let alone new) reasons for that. Christian Sievers

let succ be an Enum class member

1998-05-12 Thread Christian Sievers
Nat where succ=Succ is not only more natural, but also much more efficient. Of course the same holds for pred. What do you think? Are there any drawbacks? Could it be like this in standard haskell? Christian Sievers

Re: what's wrong with instance C a = D a. Reply

1997-08-25 Thread Christian Sievers
... Buzzz. No, it's not. It does not actually give any instance of D. You have to declare all of them seperately, and you would rather want to just say instance C a = D a but you can't. It's much like the Textual example. Christian Sievers

Re: how about main :: IO Int

1997-08-25 Thread Christian Sievers
Thank you for pointing me to the System library. However, while I was indeed implying that there is no way of returning an exit code, my main question was which type main should have. You seem not to like IO Int (one even for several reasons ;-) but it still looks quite natural to me. Christian

Re: what's wrong with instance C a = D a. Reply

1997-08-22 Thread Christian Sievers
les. Still, I'd prefer if they were allowed... Christian Sievers

what's wrong with instance C a = D a

1997-08-21 Thread Christian Sievers
, then maybe in Curry:). I now only would like to know why this design decission was made, are there any problems with the instance declarations I have in mind? Christian Sievers

buffered output; :s -p%s%s%s

1997-05-06 Thread Christian Sievers
with Linux and SunOS, and the hugs version calls itself 970410. Christian Sievers