#5296: Compile succeeds without signature, but fails with the signature 
suggested
by GHC
-------------------------------+--------------------------------------------
    Reporter:  dsf             |       Owner:                           
        Type:  bug             |      Status:  new                      
    Priority:  normal          |   Component:  Compiler (Type checker)  
     Version:  7.0.3           |    Keywords:                           
    Testcase:                  |   Blockedby:                           
          Os:  Linux           |    Blocking:                           
Architecture:  x86_64 (amd64)  |     Failure:  GHC rejects valid program
-------------------------------+--------------------------------------------
 This example is derived from code in my application.  It works, but I
 can't add a signature to it.  In other places it is preventing some code
 from compiling at all.

 {{{
 {-# LANGUAGE KindSignatures, MultiParamTypeClasses, RankNTypes #-}
 {-# OPTIONS -Wall #-}
 module Test where

 class C t1 t2 m where method :: Int -> m t2

 f :: forall t1 t2 (m :: * -> *). C t1 t2 m => Int -> m t2
 f x = method x
 }}}

-- 
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/5296>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler

_______________________________________________
Glasgow-haskell-bugs mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Reply via email to