Skip to content
Snippets Groups Projects
Commit bc7468fa authored by Simon Marlow's avatar Simon Marlow
Browse files

comments

parent 7bdf62ee
No related branches found
No related tags found
No related merge requests found
{-# OPTIONS_GHC -fffi #-} {-# OPTIONS_GHC -fffi #-}
-- This benchmark is also ffi014 in the test suite. -- This benchmark is also ffi014 in the test suite.
-- This program behaves unpredictably with the non-threaded RTS,
-- because depending on when the context switches happen it might end
-- up building a deep stack of callbacks. When this happens, the run
-- queue gets full of threads that have finished but cannot exit
-- because they do not belong to the topmost call to schedule(), and
-- the scheduler repeatedly traverses the run queue full of these
-- zombie threads.
module Main where module Main where
import Control.Concurrent import Control.Concurrent
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment