aboutsummaryrefslogtreecommitdiffstats
diff options
context:
space:
mode:
-rw-r--r--WMonad.hs1
1 files changed, 1 insertions, 0 deletions
diff --git a/WMonad.hs b/WMonad.hs
index 0b48cac..29e68ef 100644
--- a/WMonad.hs
+++ b/WMonad.hs
@@ -56,6 +56,7 @@ withDisplay f = gets display >>= f
-- | Lift an IO action into the W monad
io :: IO a -> W a
io = liftIO
+{-# INLINE io #-}
-- | spawn. Launch an external application
spawn :: String -> W ()