#5853: Out-of-memory crash when using RULES and type families
--------------------------------+-------------------------------------------
 Reporter:  porges              |          Owner:                
     Type:  bug                 |         Status:  new           
 Priority:  normal              |      Component:  Compiler      
  Version:  7.4.1               |       Keywords:                
       Os:  Windows             |   Architecture:  x86_64 (amd64)
  Failure:  Compile-time crash  |       Testcase:                
Blockedby:                      |       Blocking:                
  Related:                      |  
--------------------------------+-------------------------------------------
 GHC(i) 7.4.1 crashes with an OOM error on the following code:

 {{{
 {-# LANGUAGE NoImplicitPrelude, TypeFamilies #-}

 import Prelude (undefined,Bool(..),Show(..),(.))

 type family Elem f :: *
 type family Subst f b :: *

 class (Subst fa (Elem fa) ~ fa) => F fa where
         (<$>) :: (Elem fa ~ a, Elem fb ~ b,
                   Subst fa b ~ fb, Subst fb a ~ fa) =>
                          (a -> b) -> (fa -> fb)

 {-# RULES
 "map/map" forall f g xs. f <$> (g <$> xs) = (f.g) <$> xs
         #-}
 }}}

-- 
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/5853>
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