#3938: Data growth issue in System.Timeout
------------------------+---------------------------------------------------
    Reporter:  leimy    |       Owner:                         
        Type:  bug      |      Status:  new                    
    Priority:  normal   |   Component:  libraries (other)      
     Version:  6.12.1   |    Keywords:                         
          Os:  MacOS X  |    Testcase:                         
Architecture:  x86      |     Failure:  Runtime performance bug
------------------------+---------------------------------------------------
 (This bug is lhs)

 The following seemingly simple code causes infinite data growth and
 resource exhaustion when the code for System.Timeout does not immediately
 appear to have a bug with respect to resource utilization.

 > module Main where

 > import System.Timeout
 > import Control.Monad

 > timeoutval :: Int
 > timeoutval = 12 * 10 ^ 6  -- 12 seconds

 > doit :: IO (Maybe ())
 > doit = timeout (-1) $ return ()


 > main :: IO ()
 > main = forever $ return ()

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