goldfirere / ghc

Mirror of ghc repository. DO NOT SUBMIT PULL REQUESTS HERE
http://www.haskell.org/ghc/
Other
25 stars 1 forks source link

GHC hangs on GADT with lifted recursive occurrence #65

Open AndrasKovacs opened 8 years ago

AndrasKovacs commented 8 years ago

GHC hangs on this:

{-# LANGUAGE GADTs, TypeInType #-}

import Data.Kind
import Data.Proxy

data U :: Type where
  C :: Proxy (u :: U) -> U