ghc
ghc copied to clipboard
GHC hangs on GADT with lifted recursive occurrence
GHC hangs on this:
{-# LANGUAGE GADTs, TypeInType #-}
import Data.Kind
import Data.Proxy
data U :: Type where
C :: Proxy (u :: U) -> U