Event does not match Event

Sigbjorn Finne sof@galois.com
Wed, 11 Dec 2002 17:09:04 -0800


That would be my guess too. Use ":set +Q" to
have the interpreter qualify names when printing.

--sigbjorn

----- Original Message ----- 
From: "Tom Pledger" <Tom.Pledger@peace.com>
To: <b.i.mills@massey.ac.nz>
Cc: <hugs-users@haskell.org>
Sent: Wednesday, December 11, 2002 17:06
Subject: Event does not match Event


> b.i.mills@massey.ac.nz writes:
>  :
>  | ERROR - Type error in application
>  | *** Expression     : openWindow "a" (100,100) >>= getEvent >>= process
>  | *** Term           : openWindow "a" (100,100) >>= getEvent
>  | *** Type           : IO Event
>  | *** Does not match : IO Event
> 
> Could they have been imported from different modules?
> 
> Some graphics libraries do things like this:
> 
>     module Bar where
>     import qualified Foo
>     data Event = ... something involving Foo.Event ...
>     ...
> 
> meaning that there are two incompatible Event types around, which will
> look the same in error messages which don't show fully qualified
> names.
> 
> Regards,
> Tom