diff options
author | glasser <glasser@mit.edu> | 2007-05-23 17:58:55 +0200 |
---|---|---|
committer | glasser <glasser@mit.edu> | 2007-05-23 17:58:55 +0200 |
commit | bea0345abfee66e10b0b5444f139ea8ac59690e0 (patch) | |
tree | 30909ff487dfe47281434d12c71aee76d6bc0e65 | |
parent | ab5d6ed970317c336ab1ac476b6829b53723bcd7 (diff) | |
download | XMonadContrib-bea0345abfee66e10b0b5444f139ea8ac59690e0.tar.gz XMonadContrib-bea0345abfee66e10b0b5444f139ea8ac59690e0.tar.xz XMonadContrib-bea0345abfee66e10b0b5444f139ea8ac59690e0.zip |
Extract NamedWindow support from Mosaic into its own module
darcs-hash:20070523155855-64353-c23049efec2d620ede1e7acfcc5f1f979148c6fe.gz
-rw-r--r-- | Mosaic.hs | 23 | ||||
-rw-r--r-- | NamedWindows.hs | 31 |
2 files changed, 33 insertions, 21 deletions
@@ -26,12 +26,8 @@ module XMonadContrib.Mosaic ( mosaic, expandWindow, shrinkWindow, squareWindow, -- , ((modMask .|. shiftMask, xK_s ), withNamedWindow (sendMessage . squareWindow)) -- , ((modMask .|. shiftMask, xK_o ), withNamedWindow (sendMessage . clearWindow)) -import Control.Monad.Reader ( asks ) -import Control.Monad.State ( gets ) -import qualified StackSet as W ( peek ) import Data.Ratio import Graphics.X11.Xlib -import Graphics.X11.Xlib.Extras ( fetchName ) import XMonad import Operations ( Resize(Shrink, Expand) ) import qualified Data.Map as M @@ -39,6 +35,8 @@ import Data.List ( sort ) import Data.Typeable ( Typeable ) import Control.Monad ( mplus ) +import XMonadContrib.NamedWindows + import System.IO.Unsafe data HandleWindow = ExpandWindow NamedWindow | ShrinkWindow NamedWindow @@ -91,12 +89,6 @@ add_rater r w = M.alter f w where f Nothing= Just r type WindowRater = NamedWindow -> Rectangle -> Rational -data NamedWindow = NW !String !Window -instance Eq NamedWindow where - (NW s _) == (NW s' _) = s == s' -instance Ord NamedWindow where - compare (NW s _) (NW s' _) = compare s s' - mosaicL :: Rational -> M.Map NamedWindow WindowRater -> M.Map NamedWindow Area -> Rectangle -> [Window] -> X [(Window, Rectangle)] mosaicL _ _ _ _ [] = return [] @@ -195,14 +187,3 @@ allsplits (x:xs) = (map ([x]:) splitsrest) ++ maphead :: (a->a) -> [a] -> [a] maphead f (x:xs) = f x : xs maphead _ [] = [] - -getName :: Window -> X NamedWindow -getName w = asks display >>= \d -> do n <- maybe "" id `fmap` io (fetchName d w) - return $ NW n w - -unName :: NamedWindow -> Window -unName (NW _ w) = w - -withNamedWindow :: (NamedWindow -> X ()) -> X () -withNamedWindow f = do ws <- gets windowset - whenJust (W.peek ws) $ \w -> getName w >>= f diff --git a/NamedWindows.hs b/NamedWindows.hs new file mode 100644 index 0000000..71f8fe9 --- /dev/null +++ b/NamedWindows.hs @@ -0,0 +1,31 @@ +module XMonadContrib.NamedWindows ( NamedWindow, getName, withNamedWindow, unName ) where + +-- This module allows you to associate the X titles of windows with +-- them. See XMonadContrib.Mosaic for an example of its use. + +import Control.Monad.Reader ( asks ) +import Control.Monad.State ( gets ) + +import qualified StackSet as W ( peek ) + +import Graphics.X11.Xlib +import Graphics.X11.Xlib.Extras ( fetchName ) + +import XMonad + +data NamedWindow = NW !String !Window +instance Eq NamedWindow where + (NW s _) == (NW s' _) = s == s' +instance Ord NamedWindow where + compare (NW s _) (NW s' _) = compare s s' + +getName :: Window -> X NamedWindow +getName w = asks display >>= \d -> do n <- maybe "" id `fmap` io (fetchName d w) + return $ NW n w + +unName :: NamedWindow -> Window +unName (NW _ w) = w + +withNamedWindow :: (NamedWindow -> X ()) -> X () +withNamedWindow f = do ws <- gets windowset + whenJust (W.peek ws) $ \w -> getName w >>= f |