aboutsummaryrefslogtreecommitdiffstats
path: root/DynamicWorkspaces.hs
diff options
context:
space:
mode:
authorSpencer Janssen <sjanssen@cse.unl.edu>2007-11-01 21:10:59 +0100
committerSpencer Janssen <sjanssen@cse.unl.edu>2007-11-01 21:10:59 +0100
commit4866f2e367dfcf22a9591231ba40948826a1b438 (patch)
tree7a245caee3f146826b267d773b7eaa80386a818e /DynamicWorkspaces.hs
parent47589e1913fb9530481caedb543978a30d4323ea (diff)
downloadXMonadContrib-4866f2e367dfcf22a9591231ba40948826a1b438.tar.gz
XMonadContrib-4866f2e367dfcf22a9591231ba40948826a1b438.tar.xz
XMonadContrib-4866f2e367dfcf22a9591231ba40948826a1b438.zip
Hierarchify
darcs-hash:20071101201059-a5988-fc1f1262bec1b69e13ba18ae7cefeafc8c4471d4.gz
Diffstat (limited to 'DynamicWorkspaces.hs')
-rw-r--r--DynamicWorkspaces.hs107
1 files changed, 0 insertions, 107 deletions
diff --git a/DynamicWorkspaces.hs b/DynamicWorkspaces.hs
deleted file mode 100644
index 34f57f1..0000000
--- a/DynamicWorkspaces.hs
+++ /dev/null
@@ -1,107 +0,0 @@
------------------------------------------------------------------------------
--- |
--- Module : XMonadContrib.DynamicWorkspaces
--- Copyright : (c) David Roundy <droundy@darcs.net>
--- License : BSD3-style (see LICENSE)
---
--- Maintainer : David Roundy <droundy@darcs.net>
--- Stability : unstable
--- Portability : unportable
---
--- Provides bindings to add and delete workspaces. Note that you may only
--- delete a workspace that is already empty.
---
------------------------------------------------------------------------------
-
-module XMonadContrib.DynamicWorkspaces (
- -- * Usage
- -- $usage
- addWorkspace, removeWorkspace,
- selectWorkspace, renameWorkspace,
- toNthWorkspace, withNthWorkspace
- ) where
-
-import Control.Monad.State ( gets )
-import Data.List ( sort )
-
-import XMonad ( X, XState(..), Layout, WorkspaceId, WindowSet )
-import XMonad.Operations
-import XMonad.StackSet hiding (filter, modify, delete)
-import Graphics.X11.Xlib ( Window )
-import XMonadContrib.WorkspacePrompt
-import XMonadContrib.XPrompt ( XPConfig )
-
--- $usage
--- You can use this module with the following in your Config.hs file:
---
--- > import XMonadContrib.DynamicWorkspaces
---
--- > , ((modMask .|. shiftMask, xK_n), selectWorkspace defaultXPConfig layoutHook)
--- > , ((modMask .|. shiftMask, xK_BackSpace), removeWorkspace)
--- > , ((modMask .|. shiftMask .|. controlMask, xK_r), renameWorkspace defaultXPConfig)
---
--- > -- mod-[1..9] %! Switch to workspace N
--- > -- mod-shift-[1..9] %! Move client to workspace N
--- > ++
--- > zip (zip (repeat modMask) [xK_1..xK_9]) (map (withNthWorkspace W.greedyView) [0..])
--- > ++
--- > zip (zip (repeat (modMask .|. shiftMask)) [xK_1..xK_9]) (map (withNthWorkspace W.shift) [0..])
-
-allPossibleTags :: [WorkspaceId]
-allPossibleTags = map (:"") ['0'..]
-
-renameWorkspace :: XPConfig -> X ()
-renameWorkspace conf = workspacePrompt conf $ \w ->
- windows $ \s -> let sett wk = wk { tag = w }
- setscr scr = scr { workspace = sett $ workspace scr }
- sets q = q { current = setscr $ current q }
- in sets $ removeWorkspace' w s
-
-toNthWorkspace :: (String -> X ()) -> Int -> X ()
-toNthWorkspace job wnum = do ws <- gets (sort . map tag . workspaces . windowset)
- case drop wnum ws of
- (w:_) -> job w
- [] -> return ()
-
-withNthWorkspace :: (String -> WindowSet -> WindowSet) -> Int -> X ()
-withNthWorkspace job wnum = do ws <- gets (sort . map tag . workspaces . windowset)
- case drop wnum ws of
- (w:_) -> windows $ job w
- [] -> return ()
-
-selectWorkspace :: XPConfig -> Layout Window -> X ()
-selectWorkspace conf l = workspacePrompt conf $ \w ->
- windows $ \s -> if tagMember w s
- then greedyView w s
- else addWorkspace' w l s
-
-addWorkspace :: Layout Window -> X ()
-addWorkspace l = do s <- gets windowset
- let newtag:_ = filter (not . (`tagMember` s)) allPossibleTags
- windows (addWorkspace' newtag l)
-
-removeWorkspace :: X ()
-removeWorkspace = do s <- gets windowset
- case s of
- StackSet { current = Screen { workspace = torem }
- , hidden = (w:_) }
- -> do windows $ view (tag w)
- windows (removeWorkspace' (tag torem))
- _ -> return ()
-
-addWorkspace' :: i -> l -> StackSet i l a sid sd -> StackSet i l a sid sd
-addWorkspace' newtag l s@(StackSet { current = scr@(Screen { workspace = w })
- , hidden = ws })
- = s { current = scr { workspace = Workspace newtag l Nothing }
- , hidden = w:ws }
-
-removeWorkspace' :: (Eq i) => i -> StackSet i l a sid sd -> StackSet i l a sid sd
-removeWorkspace' torem s@(StackSet { current = scr@(Screen { workspace = wc })
- , hidden = (w:ws) })
- | tag w == torem = s { current = scr { workspace = wc { stack = meld (stack w) (stack wc) } }
- , hidden = ws }
- where meld Nothing Nothing = Nothing
- meld x Nothing = x
- meld Nothing x = x
- meld (Just x) (Just y) = differentiate (integrate x ++ integrate y)
-removeWorkspace' _ s = s