#2780: C stack overflow on Windows
---------------------------------+------------------------------------------
    Reporter:  NeilMitchell      |       Owner:          
        Type:  bug               |      Status:  new     
    Priority:  normal            |   Component:  Compiler
     Version:  6.9               |    Severity:  normal  
    Keywords:                    |    Testcase:          
Architecture:  Unknown/Multiple  |          Os:  Windows 
---------------------------------+------------------------------------------
 {{{
 $ ghc --make Main.hs
 [1 of 1] Compiling Main             ( Main.hs, Main.o )
 Linking Main.exe ...

 $ Main
 C stack overflow in generated code

 $ type Main.hs

 module Main where

 main = error $ show f
     where
         f = r
             where
                 r = r `seq` ()
 }}}

 It should go {{{<loop>}}}, and in some circumstances it does, but in this
 particular configuration it crashes C. Windows XP, using GHC 6.9.20080916.
 If run from GHCi then GHCi silently aborts.

-- 
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/2780>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
_______________________________________________
Glasgow-haskell-bugs mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Reply via email to