Skip to content

Instantly share code, notes, and snippets.

@lpeterse
Created March 25, 2016 11:45
Show Gist options
  • Star 0 You must be signed in to star a gist
  • Fork 0 You must be signed in to fork a gist
  • Save lpeterse/da7b574da5c7a0dc9794 to your computer and use it in GitHub Desktop.
Save lpeterse/da7b574da5c7a0dc9794 to your computer and use it in GitHub Desktop.
An example application showing how to use `concurrent-rpc`
module MissileLauncher where
import Control.Exception
import Control.Monad
import Control.Concurrent
import Control.Concurrent.Async
import Control.Concurrent.RPC
import Data.Word
import System.Random
type Missile = Word
type LaunchSite = String
main :: IO ()
main = do
(launchMissile, withMissile) <- newRPC
runMissileProduction launchMissile
`race_` runLaunchSite withMissile "Redmond"
`race_` runLaunchSite withMissile "Cambridge"
runLaunchSite :: WithRPC Missile LaunchSite -> LaunchSite -> IO ()
runLaunchSite withMissile site = forever $ do
sleepRandom
catch
( withMissile $ \missile-> do
r <- random100
if r < 10
then error $ "bad weather in " ++ site
else do
printThread $ site ++ ": LAUNCH THE MISSILE!"
return site
)
( \e-> do
let _ = e :: SomeException
printThread $ site ++ ": Couldn't launch. Waiting for next missile."
)
runMissileProduction :: RPC Missile LaunchSite -> IO ()
runMissileProduction launchMissile =
produce `race_` produce `race_` produce `race_` produce
where
produce = forever $ do
sleepRandom
missile <- randomIO :: IO Missile
catch
( do
printThread $ "Production: Ready to launch missile " ++ show missile
site <- launchMissile missile
printThread $ "Production: Missile " ++ show missile ++ " launched in " ++ site
)
( \e->
printThread $ "Production: Missile " ++ show missile ++
" failed to launch due to " ++ show (e :: SomeException)
)
printThread :: Show a => a -> IO ()
printThread x = do
threadId <- myThreadId
random100 >>= \x-> threadDelay (x * 100)
putStrLn $ show threadId ++ ": " ++ show x
random100 :: IO Int
random100 = (`mod` 100) <$> randomIO
sleepRandom :: IO ()
sleepRandom = random100 >>= \x-> threadDelay (x * 100000)
Sign up for free to join this conversation on GitHub. Already have an account? Sign in to comment