aboutsummaryrefslogtreecommitdiffstats
path: root/WMonad.hs
diff options
context:
space:
mode:
authorDon Stewart <dons@cse.unsw.edu.au>2007-03-10 08:01:52 +0100
committerDon Stewart <dons@cse.unsw.edu.au>2007-03-10 08:01:52 +0100
commit44ffcec3db8f778814d98acbb36f304d8bc6b956 (patch)
treea61c2cab41f7445b9c02bdf1e13b662c1a92546c /WMonad.hs
parentdccc5d7f95a3a0f6219edbbd4868fefdf68234d6 (diff)
downloadxmonad-44ffcec3db8f778814d98acbb36f304d8bc6b956.tar.gz
xmonad-44ffcec3db8f778814d98acbb36f304d8bc6b956.tar.xz
xmonad-44ffcec3db8f778814d98acbb36f304d8bc6b956.zip
XMonad
darcs-hash:20070310070152-9c5c1-f78385326379d5ff19cb3db926c5b02117e433ff.gz
Diffstat (limited to 'WMonad.hs')
-rw-r--r--WMonad.hs71
1 files changed, 0 insertions, 71 deletions
diff --git a/WMonad.hs b/WMonad.hs
deleted file mode 100644
index 4e622c5..0000000
--- a/WMonad.hs
+++ /dev/null
@@ -1,71 +0,0 @@
------------------------------------------------------------------------------
--- |
--- Module : WMonad.hs
--- Copyright : (c) Spencer Janssen 2007
--- License : BSD3-style (see LICENSE)
---
--- Maintainer : sjanssen@cse.unl.edu
--- Stability : unstable
--- Portability : not portable, uses cunning newtype deriving
---
------------------------------------------------------------------------------
---
--- The W monad, a state monad transformer over IO, for the window
--- manager state, and support routines.
---
-
-module WMonad (
- W, WorkSpace, WState(..),runW, withDisplay, io, spawn, trace, whenJust
- ) where
-
-import StackSet (StackSet)
-
-import Control.Monad.State
-import System.IO
-import System.Process (runCommand)
-import Graphics.X11.Xlib (Display,Window)
-
--- | WState, the window manager state.
--- Just the display, width, height and a window list
-data WState = WState
- { display :: Display
- , screenWidth :: {-# UNPACK #-} !Int
- , screenHeight :: {-# UNPACK #-} !Int
- , workspace :: {-# UNPACK #-} !WorkSpace -- ^ workspace list
- }
-
-type WorkSpace = StackSet Window
-
--- | The W monad, a StateT transformer over IO encapuslating the window
--- manager state
-newtype W a = W (StateT WState IO a)
- deriving (Functor, Monad, MonadIO, MonadState WState)
-
--- | Run the W monad, given a chunk of W monad code, and an initial state
--- Return the result, and final state
-runW :: WState -> W a -> IO ()
-runW st (W a) = runStateT a st >> return ()
-
--- | Run a monad action with the current display settings
-withDisplay :: (Display -> W ()) -> W ()
-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 ()
-spawn x = io (runCommand x) >> return ()
-
--- | Run a side effecting action with the current workspace. Like 'when' but
-whenJust :: Maybe a -> (a -> W ()) -> W ()
-whenJust mg f = maybe (return ()) f mg
-
--- | A 'trace' for the W monad. Logs a string to stderr. The result may
--- be found in your .xsession-errors file
-trace :: String -> W ()
-trace msg = io $! do hPutStrLn stderr msg; hFlush stderr