#2573: Illegal polymorphic or qualified type with generics
----------------------------------------+-----------------------------------
Reporter: igloo | Owner:
Type: bug | Status: new
Priority: normal | Milestone: 6.10.1
Component: Compiler (Type checker) | Version: 6.8.3
Severity: normal | Keywords:
Difficulty: Unknown | Testcase: tcrun007
Architecture: Unknown | Os: Unknown
----------------------------------------+-----------------------------------
A cut-down tcrun007:
{{{
{-# LANGUAGE Generics, TypeOperators #-}
import Data.Generics
class Tag a where
nCons :: a -> Int
nCons {| a :*: b |} _ = 1
}}}
is failing with:
{{{
tcrun007.hs:5:0:
Illegal polymorphic or qualified type: forall a b. a :*: b
In the type pattern of a generic definition:
forall a b. a :*: b
In the class declaration for `Tag'
}}}
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/2573>
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