From 05e26cbe48377fc5038915130c9966e5b1b359b0 Mon Sep 17 00:00:00 2001 From: Don Stewart Date: Wed, 7 Mar 2007 07:15:32 +0100 Subject: derive MonadState, removes most accessors darcs-hash:20070307061532-9c5c1-9a125c44f0e63442f53f2d7cd9609a419cbb2c1d.gz --- Main.hs | 20 ++++++++++---------- W.hs | 26 +++----------------------- 2 files changed, 13 insertions(+), 33 deletions(-) diff --git a/Main.hs b/Main.hs index 19aed78..69735a2 100644 --- a/Main.hs +++ b/Main.hs @@ -78,23 +78,23 @@ handle :: Event -> W () handle (MapRequestEvent {window = w}) = manage w handle (DestroyWindowEvent {window = w}) = do - ws <- getWindows + ws <- gets windows when (elem w ws) (unmanage w) handle (UnmapEvent {window = w}) = do - ws <- getWindows + ws <- gets windows when (elem w ws) (unmanage w) handle (KeyEvent {event_type = t, state = mod, keycode = code}) | t == keyPress = do - dpy <- getDisplay + dpy <- gets display sym <- io $ keycodeToKeysym dpy code 0 case filter (\(mod', sym', _) -> mod == mod' && sym == sym') keys of [] -> return () ((_, _, act):_) -> act handle e@(ConfigureRequestEvent {}) = do - dpy <- getDisplay + dpy <- gets display io $ configureWindow dpy (window e) (value_mask e) $ WindowChanges { wcX = x e @@ -121,7 +121,7 @@ withWindows f = do -- | Run an action on the currently focused window withCurrent :: (Window -> W ()) -> W () withCurrent f = do - ws <- getWindows + ws <- gets windows case ws of [] -> return () (w:_) -> f w @@ -132,9 +132,9 @@ withCurrent f = do -- refresh :: W () refresh = withCurrent $ \w -> do - d <- getDisplay - sw <- getScreenWidth - sh <- getScreenHeight + d <- gets display + sw <- gets screenWidth + sh <- gets screenHeight io $ do moveResizeWindow d w 0 0 (fromIntegral sw) (fromIntegral sh) raiseWindow d w @@ -144,7 +144,7 @@ refresh = withCurrent $ \w -> do manage :: Window -> W () manage w = do trace "manage" - d <- getDisplay + d <- gets display withWindows $ \ws -> if w `elem` ws then ws else w:ws -- a set io $ mapWindow d w @@ -153,7 +153,7 @@ manage w = do -- unmanage :: Window -> W () unmanage w = do - dpy <- getDisplay + dpy <- gets display io $ grabServer dpy modifyWindows (filter (/= w)) io $ sync dpy False diff --git a/W.hs b/W.hs index deed0e6..88af0d3 100644 --- a/W.hs +++ b/W.hs @@ -34,7 +34,7 @@ type Windows = [Window] -- | The W monad, a StateT transformer over IO encapuslating the window -- manager state newtype W a = W { unW :: StateT WState IO a } - deriving (Functor, Monad, MonadIO) + 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 @@ -59,29 +59,9 @@ trace msg = io $ do -- --------------------------------------------------------------------- -- Getting at the window manager state --- | Return the current dispaly -getDisplay :: W Display -getDisplay = W (gets display) - --- | Return the current windows -getWindows :: W Windows -getWindows = W (gets windows) - --- | Return the screen width -getScreenWidth :: W Int -getScreenWidth = W (gets screenWidth) - --- | Return the screen height -getScreenHeight :: W Int -getScreenHeight = W (gets screenHeight) - --- | Set the current window list -setWindows ::Windows -> W () -setWindows x = W (modify (\s -> s {windows = x})) - -- | Modify the current window list -modifyWindows :: (Windows -> Windows) -> W () -modifyWindows f = W (modify (\s -> s {windows = f (windows s)})) +modifyWindows :: (Windows -> Windows) -> W () +modifyWindows f = modify $ \s -> s {windows = f (windows s)} -- --------------------------------------------------------------------- -- Generic utilities -- cgit v1.2.3