#959: Debugging info(?) leaks out: "Urk! Inventing strangely-kinded void TyCon"
----------------------------------------+-----------------------------------
    Reporter:  igloo                    |       Owner:         
        Type:  bug                      |      Status:  new    
    Priority:  normal                   |   Milestone:  6.6.1  
   Component:  Compiler (Type checker)  |     Version:  6.6    
    Severity:  normal                   |    Keywords:         
  Difficulty:  Unknown                  |    Testcase:         
Architecture:  Unknown                  |          Os:  Unknown
----------------------------------------+-----------------------------------
With GHC 6.6, this module:
 {{{
 module G where

 testL = foo undefined

 class Foo t where
     foo :: m a -> t m a
 }}}
 leaks some debugging info(?):
 {{{
 Urk! Inventing strangely-kinded void TyCon:
     :t{tc ae2}
     (* -> *) -> * -> *

 tmp.hs:4:8:
     Ambiguous type variable `t' in the constraint:
       `Foo t' arising from use of `foo' at tmp.hs:4:8-20
     Possible cause: the monomorphism restriction applied to the following:
       testL :: forall (m :: * -> *) a. t m a (bound at tmp.hs:4:0)
     Probable fix: give these definition(s) an explicit type signature
                   or use -fno-monomorphism-restriction
 }}}

 I haven't managed to get this message in an acceptable program.

 (found by fasta on IRC)

-- 
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/959>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
_______________________________________________
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Reply via email to