aboutsummaryrefslogtreecommitdiffstats
path: root/WorkspaceDir.hs
blob: 4b04ff0e82f6d95f17ddaf1236a3bb1540b7e5b0 (plain) (blame)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
{-# OPTIONS -fglasgow-exts #-}
module XMonadContrib.WorkspaceDir ( workspaceDir, changeDir ) where

-- to use:

-- import XMonadContrib.WorkspaceDir

-- defaultLayouts = map (workspaceDir "~") [ tiled, ... ]

-- In keybindings:
--  , ((modMask .|. shiftMask, xK_x     ), changeDir ["~","/tmp"])

import System.Directory ( setCurrentDirectory, getCurrentDirectory )
import Data.List ( nub )

import XMonad
import Operations ( sendMessage )
import XMonadContrib.Dmenu ( dmenu, runProcessWithInput )

data Chdir = Chdir String deriving ( Typeable )
instance Message Chdir

workspaceDir :: String -> Layout -> Layout
workspaceDir wd l = l { doLayout = \r x -> scd wd >> doLayout l r x
                      , modifyLayout = ml }
    where ml m | Just (Chdir wd') <- fromMessage m = return $ Just (workspaceDir wd' l)
               | otherwise = fmap (workspaceDir wd) `fmap` modifyLayout l m

scd :: String -> X ()
scd x = do x' <- io (runProcessWithInput "bash" [] ("echo -n " ++ x) `catch` \_ -> return x)
           catchIO $ setCurrentDirectory x'

changeDir :: [String] -> X ()
changeDir dirs = do thisd <- io getCurrentDirectory
                    dir <- dmenu (nub (thisd:dirs))
                    sendMessage (Chdir dir)