#7238: class methods with associated equality constraints panic
--------------------------------+-------------------------------------------
 Reporter:  dmwit               |          Owner:                
     Type:  bug                 |         Status:  new           
 Priority:  normal              |      Component:  Compiler      
  Version:  7.6.1               |       Keywords:                
       Os:  Linux               |   Architecture:  x86_64 (amd64)
  Failure:  Compile-time crash  |       Testcase:                
Blockedby:                      |       Blocking:                
  Related:                      |  
--------------------------------+-------------------------------------------
 The following file causes a panic ("getEqPredTys"):

 {{{
 {-# LANGUAGE ConstraintKinds, TypeFamilies #-}
 import GHC.Exts

 class Pair p where
         type Ctxt p a :: Constraint
         l :: Ctxt p a => p a -> a

 data Unit a = Unit

 instance Pair Unit where
         type Ctxt Unit a = a ~ ()
         l _ = ()
 }}}

-- 
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/7238>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler

_______________________________________________
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Reply via email to