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

[project @ 1998-06-05 11:16:08 by simonm]

- thread creation test
parent 979cf159
No related merge requests found
module Main where
-- Test thread creation.
-- (from: Einar Wolfgang Karlsen <ewk@Informatik.Uni-Bremen.DE>)
import Concurrent
main :: IO ()
main = spawner forkIO 1000000
spawner :: (IO () -> IO ()) -> Int -> IO ()
spawner c 0 = print "done"
spawner c n = do { c (spawner c (n-1)); return ()}
"done"
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