#4506: program fails with "Segmentation fault/access violation in generated 
code"
--------------------------------+-------------------------------------------
    Reporter:  HolgerReinhardt  |       Owner:                
        Type:  bug              |      Status:  new           
    Priority:  normal           |   Component:  Runtime System
     Version:  7.0.1            |    Keywords:                
    Testcase:                   |   Blockedby:                
          Os:  Windows          |    Blocking:                
Architecture:  x86              |     Failure:  Runtime crash 
--------------------------------+-------------------------------------------
 I have the following program:

 {{{
 module Main where

 import Control.Concurrent.Chan
 import Control.Concurrent
 import Control.Monad

 main = forever $ do
     c <- newChan
     mapM_ (\ix -> writeChan c "test") [1..500000]
     mapM_ (\ix -> writeChan c "test") [1..500000]

     c <- newChan
     forkIO $ mapM_ (\ix -> writeChan c "test") [1..500000]
     mapM_ (\ix -> readChan c) [1..500000]
 }}}

 Compiling and running I get this behaviour:

 {{{
 I:\haskell>ghc -O error.hs
 [1 of 1] Compiling Main             ( error.hs, error.o )
 Linking error.exe ...

 I:\haskell>error
 Segmentation fault/access violation in generated code
 }}}

 If the program doesn't crash after about 30seconds you may have to cancel
 and restart it, as it sometimes seems to run forever without crashing.

 I have tested the binary on another Windows machine and got the same
 crash, so a hardware problem seems unlikely.

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