[GHC] #9971: GHC 7.10 dies with "out of memory"

GHC ghc-devs at haskell.org
Wed Jan 14 09:18:15 UTC 2015


#9971: GHC 7.10 dies with "out of memory"
-------------------------------------+-------------------------------------
        Reporter:  albertov          |                   Owner:
            Type:  bug               |                  Status:  new
        Priority:  normal            |               Milestone:
       Component:  Compiler          |                 Version:  7.10.1-rc1
      Resolution:                    |                Keywords:
Operating System:  Linux             |            Architecture:  x86_64
 Type of failure:  Compile-time      |  (amd64)
  crash                              |               Test Case:
      Blocked By:                    |                Blocking:
 Related Tickets:                    |  Differential Revisions:
-------------------------------------+-------------------------------------

Comment (by albertov):

 I've just attached a simple project that reproduces the bug. The module is
 essentially this:

 {{{
 {-# LANGUAGE TemplateHaskell
            , MultiParamTypeClasses
            , TypeFamilies
            #-}
 module Demo9971 where

 import qualified Data.Vector.Unboxed as U
 import Data.Vector.Unboxed.Deriving (derivingUnbox)

 type Vertex v = v Double

 newtype Point v = Point {_pVertex:: Vertex v}

 class U.Unbox (Vertex v) => VectorSpace v where

 derivingUnbox "Point"
     [t| VectorSpace v => Point v -> Vertex v |]
     [| \(Point v) -> v |]
     [| \v -> Point v|]
 }}}

 To reproduce just create a sandbox, install dependencies and build. GHC
 will begin to consume all memory until it is killed when building
 `Demo9971.hs`

--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/9971#comment:12>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler


More information about the ghc-tickets mailing list