Difference between revisions of "Xmonad/Config archive/Gwern's xmonad.hs"

From HaskellWiki
Jump to navigation Jump to search
(update)
(update for 2014)
Line 3: Line 3:
 
import XMonad
 
import XMonad
 
import XMonad.Actions.GridSelect (defaultGSConfig, goToSelected)
 
import XMonad.Actions.GridSelect (defaultGSConfig, goToSelected)
import XMonad.Actions.Search (google, scholar, wikipedia, wiktionary, selectSearch, promptSearch)
+
import XMonad.Actions.Search (google, scholar, wikipedia, selectSearch, promptSearch)
 
import XMonad.Actions.WindowGo (raiseMaybe, raiseBrowser, raiseEditor, runOrRaise)
 
import XMonad.Actions.WindowGo (raiseMaybe, raiseBrowser, raiseEditor, runOrRaise)
 
import XMonad.Config.Gnome (gnomeConfig)
 
import XMonad.Config.Gnome (gnomeConfig)
Line 27: Line 27:
 
, normalBorderColor = "grey"
 
, normalBorderColor = "grey"
 
, terminal = "urxvtc"
 
, terminal = "urxvtc"
, XMonad.workspaces = ["web", "irc", "code", "4"] }
+
, XMonad.workspaces = ["web", "irc", "code", "background"] }
 
where tiled = Tall 1 0.03 0.5
 
where tiled = Tall 1 0.03 0.5
   
Line 35: Line 35:
 
gnome-panel; Firefox/Emacs/Irssi go to their designated workspaces. -}
 
gnome-panel; Firefox/Emacs/Irssi go to their designated workspaces. -}
 
myManageHook :: ManageHook
 
myManageHook :: ManageHook
myManageHook = composeAll [moveT "Amphetype" "code",
+
myManageHook = composeAll [moveC "Emacs" "code",
moveT "Brain Workshop 4.8.1" "code",
 
moveC "Emacs" "code",
 
 
moveC "Iceweasel" "web",
 
moveC "Iceweasel" "web",
 
moveC "Gimp" "irc",
 
moveC "Gimp" "irc",
moveC "gscan2pdf" "code",
 
 
moveC "Mnemosyne" "code",
 
moveC "Mnemosyne" "code",
 
moveT "irssi" "irc",
 
moveT "irssi" "irc",
 
className =? "defcon.bin.x86" --> unfloat,
 
className =? "defcon.bin.x86" --> unfloat,
className =? "Darwinia" --> unfloat,
 
 
className =? "gnome-panel" --> doIgnore,
 
className =? "gnome-panel" --> doIgnore,
 
className =? "Mnemosyne" --> unfloat,
 
className =? "Mnemosyne" --> unfloat,
Line 62: Line 58:
 
-- Custom bindings and commands
 
-- Custom bindings and commands
 
, ((m, xK_s), goToSelected defaultGSConfig)
 
, ((m, xK_s), goToSelected defaultGSConfig)
, ((m ,xK_a), safeSpawnProg "/home/gwern/bin/bin/amphetype")
 
 
, ((m, xK_b), safePrompt "firefox" greenXPConfig)
 
, ((m, xK_b), safePrompt "firefox" greenXPConfig)
 
, ((m .|. shiftMask,xK_b), safePromptSelection "firefox")
 
, ((m .|. shiftMask,xK_b), safePromptSelection "firefox")
 
, ((m, xK_c), safeSpawnProg term)
 
, ((m, xK_c), safeSpawnProg term)
 
, ((m .|. shiftMask,xK_c), prompt (term ++ " -e") greenXPConfig)
 
, ((m .|. shiftMask,xK_c), prompt (term ++ " -e") greenXPConfig)
, ((m .|. shiftMask,xK_d), raiseMaybe (runInTerm "-title elinks" "elinks") (title =? "elinks"))
 
 
, ((m, xK_e), raiseEditor)
 
, ((m, xK_e), raiseEditor)
 
, ((m .|. shiftMask,xK_e), prompt "emacs" greenXPConfig)
 
, ((m .|. shiftMask,xK_e), prompt "emacs" greenXPConfig)
Line 76: Line 70:
 
, ((m, xK_y), promptSearch greenXPConfig scholar)
 
, ((m, xK_y), promptSearch greenXPConfig scholar)
 
, ((m .|. shiftMask,xK_y), selectSearch scholar)
 
, ((m .|. shiftMask,xK_y), selectSearch scholar)
, ((m .|. shiftMask,xK_w), selectSearch wiktionary)
 
 
, ((m, xK_w), safeSpawnProg "/home/gwern/bin/bin/brainworkshop")
 
, ((m, xK_w), safeSpawnProg "/home/gwern/bin/bin/brainworkshop")
 
, ((m, xK_Print), unsafeSpawn "import -quality 90 -window root png:$HOME/xwd-$(date +%s)$$.png; nice optipng ~/*.png")
 
, ((m, xK_Print), unsafeSpawn "import -quality 90 -window root png:$HOME/xwd-$(date +%s)$$.png; nice optipng ~/*.png")
Line 85: Line 78:
 
, ((m, xK_d), raiseBrowser)
 
, ((m, xK_d), raiseBrowser)
 
, ((m, xK_x), spawn ("date>>"++lg) >> appendFilePrompt greenXPConfig lg)]
 
, ((m, xK_x), spawn ("date>>"++lg) >> appendFilePrompt greenXPConfig lg)]
where lg = "/home/gwern/doc/2013/log.txt"
+
where lg = "/home/gwern/doc/2014/log.txt"
 
</haskell>
 
</haskell>

Revision as of 20:45, 18 January 2014

import Data.Map as M (fromList,union, Map())
import XMonad
import XMonad.Actions.GridSelect (defaultGSConfig, goToSelected)
import XMonad.Actions.Search (google, scholar, wikipedia, selectSearch, promptSearch)
import XMonad.Actions.WindowGo (raiseMaybe, raiseBrowser, raiseEditor, runOrRaise)
import XMonad.Config.Gnome (gnomeConfig)
import XMonad.Hooks.EwmhDesktops (ewmhDesktopsLogHook)
import XMonad.Hooks.ManageDocks (avoidStruts, manageDocks)
import XMonad.Hooks.UrgencyHook (withUrgencyHook, FocusHook(..))
import XMonad.Layout.NoBorders (smartBorders)
import XMonad.Prompt (greenXPConfig)
import XMonad.Prompt.Shell (shellPrompt, prompt, safePrompt)
import XMonad.StackSet as W (focusUp, focusDown, sink)
import XMonad.Util.Run (unsafeSpawn, runInTerm, safeSpawnProg)
import XMonad.Util.XSelection (safePromptSelection)
import XMonad.Prompt.AppendFile

main :: IO ()
main = spawn "killall unclutter;unclutter;" >> spawn "killall urxvtd;urxvtd -q -f -o" >> xmonad myConfig
 where myConfig = withUrgencyHook FocusHook $ gnomeConfig { focusedBorderColor = "red"
                         , keys = \c -> myKeys c `M.union` keys defaultConfig c
                         , layoutHook =  avoidStruts $ smartBorders (Full ||| tiled ||| Mirror tiled)
                         , logHook    = ewmhDesktopsLogHook
                         , manageHook = myManageHook
                         , modMask = mod4Mask
                         , normalBorderColor  = "grey"
                         , terminal = "urxvtc"
                         , XMonad.workspaces = ["web", "irc", "code", "background"] }
           where tiled = Tall 1 0.03 0.5

{- Important things to note: We specifically don't use 'managehook
   defaultConfig, since I don't like floating mplayer and I don't use the other
   specified applications. Otherwise, we have manageDocks there to allow use of
   gnome-panel; Firefox/Emacs/Irssi go to their designated workspaces. -}
myManageHook :: ManageHook
myManageHook = composeAll [moveC "Emacs"     "code",
                           moveC "Iceweasel" "web",
                           moveC "Gimp"      "irc",
                           moveC "Mnemosyne" "code",
                           moveT "irssi"     "irc",
                           className =? "defcon.bin.x86" --> unfloat,
                           className =? "gnome-panel" --> doIgnore,
                           className =? "Mnemosyne" --> unfloat,
                           title     =? "Brain Workshop 4.8.6" --> unfloat]
                           <+> manageDocks
          where moveC c w = className =? c --> doShift w
                moveT t w = title     =? t --> doShift w
                unfloat = ask >>= doF . W.sink

myKeys :: XConfig t -> M.Map (KeyMask, KeySym) (X ())
myKeys (XConfig {modMask = m, terminal = term}) = M.fromList [ -- rebind standard keys
            ((m .|. shiftMask,xK_p), shellPrompt greenXPConfig)
          , ((m,              xK_k), kill)
          , ((m,              xK_n), windows W.focusDown)
          , ((m,              xK_p), windows W.focusUp)
          , ((m,              xK_z), withFocused $ windows . W.sink) -- unfloat
          -- Custom bindings and commands
          , ((m,              xK_s), goToSelected defaultGSConfig)
          , ((m,              xK_b), safePrompt "firefox" greenXPConfig)
          , ((m .|. shiftMask,xK_b), safePromptSelection "firefox")
          , ((m,              xK_c), safeSpawnProg term)
          , ((m .|. shiftMask,xK_c), prompt (term ++ " -e") greenXPConfig)
          , ((m,              xK_e), raiseEditor)
          , ((m .|. shiftMask,xK_e), prompt "emacs" greenXPConfig)
          , ((m,              xK_g), promptSearch greenXPConfig google)
          , ((m .|. shiftMask,xK_g), selectSearch google)
          , ((m,              xK_t), promptSearch greenXPConfig wikipedia)
          , ((m .|. shiftMask,xK_t), selectSearch wikipedia)
          , ((m,              xK_y), promptSearch greenXPConfig scholar)
          , ((m .|. shiftMask,xK_y), selectSearch scholar)
          , ((m,              xK_w), safeSpawnProg "/home/gwern/bin/bin/brainworkshop")
          , ((m,          xK_Print), unsafeSpawn "import -quality 90 -window root png:$HOME/xwd-$(date +%s)$$.png; nice optipng ~/*.png")
          , ((m,              xK_i), raiseMaybe (runInTerm "-title irssi" "sh -c 'screen -r irssi'") (title =? "irssi"))
          , ((m .|. shiftMask,xK_i), spawn "xclip -o|tr '\n' ' '|sed -e 's/- //' -e 's/^ *//' -e 's/ *$//' > /tmp/z.txt && screen -S irssi -X readbuf /tmp/z.txt && screen -S irssi -X paste .;rm /tmp/z.txt")
          , ((m,              xK_m), runOrRaise "/home/gwern/bin/bin/mnemosyne" (className =? "Mnemosyne"))
          , ((m,              xK_r), raiseMaybe (runInTerm "-title rtorrent" "sh -c 'screen -r rtorrent'") (title =? "rtorrent"))
          , ((m,              xK_d), raiseBrowser)
          , ((m,              xK_x), spawn ("date>>"++lg) >> appendFilePrompt greenXPConfig lg)]
  where lg = "/home/gwern/doc/2014/log.txt"