#3884: killThread documentation
---------------------------------+------------------------------------------
Reporter: Roel van Dijk | Owner:
Type: proposal | Status: new
Priority: normal | Component: Documentation
Version: 6.12.1 | Keywords: killThread throwTo
Os: Unknown/Multiple | Testcase:
Architecture: Unknown/Multiple | Failure: None/Unknown
---------------------------------+------------------------------------------
The documentation for killThread states that:
> killThread terminates the given thread (GHC only).
However, this is not unconditionally true. It is possible to create a
thread that is unkillable. The following fails to terminate:
{{{
module Main where
import Control.Concurrent ( forkIO, killThread )
import Control.Exception ( block )
main :: IO ()
main = do tid <- block $ forkIO $ let x = x in x
killThread tid
}}}
This is not unexpected, but could be made a bit clearer in the
documentation. Perhaps something like: "killThread attempts to terminate
the given thread (GHC only)".
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/3884>
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