Oops, I initially hit r instead of L...

-- 
Carsten Schultz (2:38, 33:47), FB Mathematik, FU Berlin
http://carsten.codimi.de/
PGP/GPG key on the pgp.net key servers, 
fingerprint on my home page.
--- Begin Message ---
Hi!

On Sun, Jan 16, 2005 at 06:17:24PM -0800, Ashley Yakeley wrote:
> I suspect someone's come across this before, so maybe there's an 
> explanation for it.
> 
> This does not compile:
> 
> module Bug where
> {
>     p :: IO ();
>     p = q >>= id;
> 
>     q :: (Monad m) => m (IO ());
>     q = return p;
> }

A simpler example might be:

    x :: Int
    x = y

    y :: Num a => a
    y = fromIntegral x

I have not studied the report to see if this should be legal.

Take care,

Carsten

-- 
Carsten Schultz (2:38, 33:47), FB Mathematik, FU Berlin
http://carsten.codimi.de/
PGP/GPG key on the pgp.net key servers, 
fingerprint on my home page.

Attachment: pgphY7YRsYKi8.pgp
Description: PGP signature


--- End Message ---

Attachment: pgpQBq4hnq1Jm.pgp
Description: PGP signature

_______________________________________________
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Reply via email to