ghc icon indicating copy to clipboard operation
ghc copied to clipboard

GHC hangs on GADT with lifted recursive occurrence

Open AndrasKovacs opened this issue 10 years ago • 0 comments

GHC hangs on this:

{-# LANGUAGE GADTs, TypeInType #-}

import Data.Kind
import Data.Proxy

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

AndrasKovacs avatar Dec 22 '15 13:12 AndrasKovacs