[GHC] #7601: Internal error with kind annotation on associated type family
GHC
cvs-ghc at haskell.org
Thu Jan 17 17:01:38 CET 2013
#7601: Internal error with kind annotation on associated type family
-----------------------------+----------------------------------------------
Reporter: dreixel | Owner:
Type: bug | Status: new
Priority: normal | Component: Compiler
Version: 7.7 | Keywords: polykinds
Os: Unknown/Multiple | Architecture: Unknown/Multiple
Failure: None/Unknown | Blockedby:
Blocking: | Related:
-----------------------------+----------------------------------------------
The following module:
{{{
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE TypeFamilies #-}
module Bug where
class C (a :: k) where
type F (a :: k)
}}}
Makes GHC raise an internal error:
{{{
GHC internal error: `k' is not in scope during type checking, but it
passed the renamer
tcl_env of environment: [(reB,
AThing forall (k :: BOX). k -> Constraint),
(reC, AThing forall (k :: BOX) (k :: BOX). k
-> k)]
In the kind `k'
In the class declaration for `C'
}}}
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/7601>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
More information about the ghc-tickets
mailing list