[xmonad] Removing Actions.WmiiAction in favor of Prompt.DirExec

Juraj Hercek juhe_xmonad at hck.sk
Wed Mar 5 06:28:20 EST 2008


Don Stewart wrote:
> juhe_xmonad: 
>   
>> No one objected yet. Anyways what we might do is to mark WmiiActions 
>> obsolete and remove it when there is a darcs cleanup step performed in 
>> contrib. Question is whether there is  a "regular" cleanup step 
>> happening at all...
>>     
>
> Please proceed.
>   

Attached is the darcs patch which adds DirExec module (2 sub-patches) 
and removes wmii actions (1 sub-patch).

-- Juraj
-------------- next part --------------

New patches:

[Import of new DirExec module.
Juraj Hercek <juhe_xmonad at hck.sk>**20080229212257
   - allows execution of executable files from specific directory
] {
addfile ./XMonad/Prompt/DirExec.hs
hunk ./XMonad/Prompt/DirExec.hs 1
+-----------------------------------------------------------------------------
+-- |
+-- Module      :  XMonad.Prompt.DirExec
+-- Copyright   :  (C) 2008 Juraj Hercek
+-- License     :  BSD3
+--
+-- Maintainer  :  juhe_xmonad at hck.sk
+-- Stability   :  unstable
+-- Portability :  unportable
+--
+-- A directory file executables prompt for XMonad. This might be useful if you
+-- don't want to have scripts in your PATH environment variable (same
+-- executable names, different behavior) - otherwise you might want to use
+-- "XMonad.Prompt.Shell" instead - but you want to have easy access to these
+-- executables through the xmonad's prompt.
+--
+-----------------------------------------------------------------------------
+
+module XMonad.Prompt.DirExec
+    ( -- * Usage
+      -- $usage
+      dirExecPrompt
+    , dirExecPromptWithName
+    ) where
+
+import System.Directory
+import Control.Monad
+import Data.List
+import XMonad
+import XMonad.Prompt
+
+-- $usage
+-- 1. In your @~\/.xmonad\/xmonad.hs@:
+--
+-- > import XMonad.Prompt.DirExec
+--
+-- 2. In your keybindings add something like:
+--
+-- >   , ("M-C-x", dirExecPrompt defaultXPConfig "/home/joe/.scipts")
+--
+-- or
+--
+-- >   , ("M-C-x", dirExecPromptWithName defaultXPConfig "/home/joe/.scripts"
+-- >                                                     "My Scripts: ")
+--
+-- The first alternative uses the last element of the directory path for
+-- a name of prompt. The second alternative uses the provided string
+-- for the name of the prompt.
+--
+-- For detailed instruction on editing the key binding see
+-- "XMonad.Doc.Extending#Editing_key_bindings".
+
+data DirExec = DirExec String
+
+instance XPrompt DirExec where
+    showXPrompt (DirExec name) = name
+
+-- | Function 'dirExecPrompt' starts the prompt with list of all executable
+-- files in directory specified by 'FilePath'. The name of the prompt is taken
+-- from the last element of the path. If you specify root directory - @/@ - as
+-- the path, name @Root:@ will be used as the name of the prompt instead. The
+-- 'XPConfig' parameter can be used to customize visuals of the prompt.
+dirExecPrompt :: XPConfig -> FilePath -> X ()
+dirExecPrompt cfg path = do
+    let name = (++ ": ") . last
+                         . (["Root"] ++) -- handling of "/" path parameter
+                         . words
+                         . map (\x -> if x == '/' then ' ' else x)
+                         $ path
+    dirExecPromptWithName cfg path name
+
+-- | Function 'dirExecPromptWithName' does the same as 'dirExecPrompt' except
+-- the name of the prompt is specified by 'String' parameter.
+dirExecPromptWithName :: XPConfig -> FilePath -> String -> X ()
+dirExecPromptWithName cfg path name = do
+    let path' = path ++ "/"
+    cmds <- io $ getDirectoryExecutables path'
+    mkXPrompt (DirExec name) cfg (compList cmds) (spawn . (path' ++))
+    where
+        compList cmds s = return . filter (isInfixOf s) $ cmds
+
+getDirectoryExecutables :: FilePath -> IO [String]
+getDirectoryExecutables path =
+    (getDirectoryContents path >>=
+        filterM (\x -> let x' = path ++ x in
+            liftM2 (&&)
+                (doesFileExist x')
+                (liftM executable (getPermissions x'))))
+    `catch` (return . return . show)
+
hunk ./xmonad-contrib.cabal 149
+                        XMonad.Prompt.DirExec
}

[Adjusted signature of DirExec module functions.
Juraj Hercek <juhe_xmonad at hck.sk>**20080301171905
   - added parameter for function which executes the selected program
   - renamed dirExecPromptWithName to dirExecPromptNamed
] {
hunk ./XMonad/Prompt/DirExec.hs 23
-    , dirExecPromptWithName
+    , dirExecPromptNamed
hunk ./XMonad/Prompt/DirExec.hs 39
--- >   , ("M-C-x", dirExecPrompt defaultXPConfig "/home/joe/.scipts")
+-- >   , ("M-C-x", dirExecPrompt defaultXPConfig spawn "/home/joe/.scipts")
hunk ./XMonad/Prompt/DirExec.hs 43
--- >   , ("M-C-x", dirExecPromptWithName defaultXPConfig "/home/joe/.scripts"
--- >                                                     "My Scripts: ")
+-- >   , ("M-C-x", dirExecPromptNamed defaultXPConfig spawn
+-- >                                  "/home/joe/.scripts" "My Scripts: ")
+--
+-- or add this after your default bindings:
+--
+-- >   ++
+-- >   [ ("M-x " ++ key, dirExecPrompt defaultXPConfig fn "/home/joe/.scripts")
+-- >     | (key, fn) <- [ ("x", spawn), ("M-x", runInTerm "-hold") ]
+-- >   ]
+-- >   ++
hunk ./XMonad/Prompt/DirExec.hs 56
--- for the name of the prompt.
+-- for the name of the prompt. The third alternative defines 2 key bindings,
+-- first one spawns the program by shell, second one runs the program in
+-- terminal
hunk ./XMonad/Prompt/DirExec.hs 73
-dirExecPrompt :: XPConfig -> FilePath -> X ()
-dirExecPrompt cfg path = do
+-- The runner parameter specifies the function used to run the program - see
+-- usage for more information
+dirExecPrompt :: XPConfig -> (String -> X ()) -> FilePath -> X ()
+dirExecPrompt cfg runner path = do
hunk ./XMonad/Prompt/DirExec.hs 82
-    dirExecPromptWithName cfg path name
+    dirExecPromptNamed cfg runner path name
hunk ./XMonad/Prompt/DirExec.hs 84
--- | Function 'dirExecPromptWithName' does the same as 'dirExecPrompt' except
+-- | Function 'dirExecPromptNamed' does the same as 'dirExecPrompt' except
hunk ./XMonad/Prompt/DirExec.hs 86
-dirExecPromptWithName :: XPConfig -> FilePath -> String -> X ()
-dirExecPromptWithName cfg path name = do
+dirExecPromptNamed :: XPConfig -> (String -> X ()) -> FilePath -> String -> X ()
+dirExecPromptNamed cfg runner path name = do
hunk ./XMonad/Prompt/DirExec.hs 90
-    mkXPrompt (DirExec name) cfg (compList cmds) (spawn . (path' ++))
+    mkXPrompt (DirExec name) cfg (compList cmds) (runner . (path' ++))
}

[Removed WmiiActions module.
Juraj Hercek <juhe_xmonad at hck.sk>**20080305082336] {
hunk ./XMonad/Actions/WmiiActions.hs 1
------------------------------------------------------------------------------
--- |
--- Module       : XMonad.Actions.WmiiActions
--- Copyright    : (c) Juraj Hercek <juhe_xmonad at hck.sk>
--- License      : BSD3
---
--- Maintainer   : Juraj Hercek <juhe_xmonad at hck.sk>
--- Stability    : unstable
--- Portability  : unportable
---
--- Provides \"actions\" as in the Wmii window manager
--- (<http://wmii.suckless.org>). It also provides a slightly better
--- interface for running dmenu on xinerama screens. If you want to use
--- xinerama functions, you have to apply the following patch (see the
--- "XMonad.Util.Dmenu" module):
--- <http://www.jcreigh.com/dmenu/dmenu-3.2-xinerama.patch>.  Don't
--- forget to recompile dmenu afterwards ;-).
------------------------------------------------------------------------------
-
-module XMonad.Actions.WmiiActions (
-                                 -- * Usage
-                                 -- $usage
-                                   wmiiActions
-                                 , wmiiActionsXinerama
-                                 , executables
-                                 , executablesXinerama
-                                 ) where
-
-import XMonad
-import XMonad.Util.Dmenu (dmenu, dmenuXinerama)
-import XMonad.Util.Run (runProcessWithInput)
-
-import Control.Monad (filterM, liftM, liftM2)
-import System.Directory (getDirectoryContents, doesFileExist, getPermissions, executable)
-
--- $usage
---
--- You can use this module with the following in your @~\/.xmonad\/xmonad.hs@ file:
---
--- > import XMonad.Actions.WmiiActions
---
---  and add something like the following to your key bindings:
---
--- > ,((modMask x, xK_a), wmiiActions "/home/joe/.wmii-3.5/")
---
--- or, if you are using xinerama, you can use
---
--- > ,((modMask x, xK_a), wmiiActionsXinerama "/home/joe/.wmii-3.5/")
---
--- However, make sure you also have the xinerama build of dmenu (for more
--- information see the "XMonad.Util.Dmenu" extension).
---
--- For detailed instructions on editing your key bindings, see
--- "XMonad.Doc.Extending#Editing_key_bindings".
-
--- | The 'wmiiActions' function takes the file path as a first argument and
--- executes dmenu with all the executables found in the provided path.
-wmiiActions :: FilePath -> X ()
-wmiiActions path =
-        wmiiActionsDmenu path dmenu
-
--- | The 'wmiiActionsXinerama'  does the same as 'wmiiActions', but it shows
--- dmenu only on the currently focused workspace.
-wmiiActionsXinerama :: FilePath -> X ()
-wmiiActionsXinerama path =
-        wmiiActionsDmenu path dmenuXinerama
-
-wmiiActionsDmenu :: FilePath -> ([String] -> X String) -> X ()
-wmiiActionsDmenu path dmenuBrand =
-        let path' = path ++ "/" in
-        getExecutableFileList path' >>= dmenuBrand >>= spawn . (path' ++)
-
-getExecutableFileList :: FilePath -> X [String]
-getExecutableFileList path =
-        io $ getDirectoryContents path >>=
-             filterM (\x -> let x' = path ++ x in
-                            liftM2 (&&)
-                              (doesFileExist x')
-                              (liftM executable (getPermissions x')))
-
-{-
-getExecutableFileList :: FilePath -> X [String]
-getExecutableFileList path =
-        io $ getDirectoryContents path >>=
-             filterM (doesFileExist . (path ++)) >>=
-             filterM (liftM executable . getPermissions . (path ++))
--}
-
--- | The 'executables' function runs the dmenu_path script, providing list of
--- executable files accessible from the $PATH variable.
-executables :: X ()
-executables = executablesDmenu dmenu
-
--- | The 'executablesXinerama' function does the same as the
--- 'executables' function, but on the workspace which currently has focus.
-executablesXinerama :: X ()
-executablesXinerama = executablesDmenu dmenuXinerama
-
-executablesDmenu :: ([String] -> X String) -> X ()
-executablesDmenu dmenuBrand =
-        getExecutablesList >>= dmenuBrand >>= spawn
-
-getExecutablesList :: X [String]
-getExecutablesList =
-        io $ liftM lines $ runProcessWithInput "dmenu_path" [] ""
-
rmfile ./XMonad/Actions/WmiiActions.hs
hunk ./xmonad-contrib.cabal 87
-                        XMonad.Actions.WmiiActions
}

Context:

[XMonad.Layout.Simplest: add FlexibleInstances pragma
Lukas Mai <l.mai at web.de>**20080301061714] 
[XMonad.Layout.ScratchWorkspace: avoid warnings, make tests compile again
Lukas Mai <l.mai at web.de>**20080301061625] 
[implement ScratchWorkspace.
David Roundy <droundy at darcs.net>**20080229224316] 
[in Prompt.Workspace sort by official workspace order.
David Roundy <droundy at darcs.net>**20080229223047] 
[simplify Simplest--allow it to apply to non-Windows.
David Roundy <droundy at darcs.net>**20080229221326] 
[XMonad.Actions.MouseGestures.mkCollect: generalize type
Lukas Mai <l.mai at web.de>**20080229211732] 
[Add bottom-tabbed layout.
Roman Cheplyaka <roma at ro-che.info>**20080229155120] 
[XMonad.Actions.MouseGestures: refactoring, code simplification
Lukas Mai <l.mai at web.de>**20080229002136
 
 It is now possible to get "live" status updates while the gesture handler
 is running. I use this in my xmonad.hs to print the current gesture to my
 status bar. Because collecting movements is now the callback's job, the
 implementation of mouseGestureH got quite a bit simpler. The interface is
 incompatible with the previous mouseGestureH but the old mouseGesture
 function works as before.
 
] 
[EZConfig: additional documentation
Brent Yorgey <byorgey at gmail.com>**20080227164602] 
[XMonad.Util.Scratchpad: change 'XConfig Layout' to 'XConfig l', to avoid type mismatches; the exact layout type doesn't actually matter
Brent Yorgey <byorgey at gmail.com>**20080227014201] 
[EZConfig: add an emacs-style keybinding parser!
Brent Yorgey <byorgey at gmail.com>**20080226222723
 Now, instead of writing out incredibly dull things like
 
   ((modMask conf .|. controlMask .|. shiftMask, xK_F2), ...)
 
 you can just write
 
   ("M-C-S-<F2>", ...)
 
 Hooray!
] 
[Xmonad.Actions.MouseGestures: generalize interface, allow hooks
Lukas Mai <l.mai at web.de>**20080226202639] 
[update inactive debugging code in MouseGestures; no visible changes
Lukas Mai <l.mai at web.de>**20071109020755] 
[Scratchpad terminal
Braden Shepherdson <Braden.Shepherdson at gmail.com>**20080225183633
 
 Key binding and ManageHook to pop up a small, floating terminal window for a few quick commands.
 
 Combined with a utility like detach[1], makes a great X application launcher.
 
 Requires my two new ManageHooks (doRectFloat, specifically).
 
 [1] http://detach.sourceforge.net
] 
[Two new floating window ManageHooks.
Braden Shepherdson <Braden.Shepherdson at gmail.com>**20080225183337
 
 Adds doRectFloat, which floats the new window in the given rectangle; and doCenterFloat, which floats the 
 new window with its original size, but centered.
] 
[Fix usage doc.
Roman Cheplyaka <roma at ro-che.info>**20080225062330] 
[Fix haddock hyperlink.
Roman Cheplyaka <roma at ro-che.info>**20080224205416] 
[Add XMonad.Layout.IM
Roman Cheplyaka <roma at ro-che.info>**20080221085752] 
[Export XMonad.Layout.Grid.arrange (for use in XMonad.Layout.IM)
Roman Cheplyaka <roma at ro-che.info>**20080221062204] 
[Decoration: some haddock updates
Andrea Rossato <andrea.rossato at unibz.it>**20080220214934] 
[Small refactoring.
Nils Anders Danielsson <nils.anders.danielsson at gmail.com>**20080210224756] 
[Fixed off-by-one error which broke strut handling for some panels.
Nils Anders Danielsson <nils.anders.danielsson at gmail.com>**20080210222600] 
[Decoration: fix an issue with decoration window creation and more
Andrea Rossato <andrea.rossato at unibz.it>**20080220204355
 - fix a bug reported by Roman Cheplyaka: when decorate returned
   Nothing the window was never going to be created, even if decorate
   was reporting a Just Rectangle in the next run. Quite a deep issue,
   still visible only with TabbedDecoration at the present time.
 - remove decorateFirst (decorate has enough information to decide
   whether a window is the first one or not, am I right, David?)
 - some point free.
] 
[DynamicLog.hs: haddock fix
Andrea Rossato <andrea.rossato at unibz.it>**20080220204033
 
 Someone forgot to check if her patch was going to break haddock docs
 generation or not. So, while I was recording a patch with quite a long
 description I had to manually write - sound strange? -, I found out
 that my patch did not pass the tests, because of this haddock problem
 left behind.
 
 And so I fixed it, recorded this patch, with the hope the my next
 description of the next patch I'm going to record will survive the
 test suite we created to avoid this kind of problems for.
] 
[improvements to XMonad.Hooks.DynamicLog, and new contrib module XMonad.Util.Loggers
Brent Yorgey <byorgey at gmail.com>**20080219210128
 Improvements to DynamicLog include:
   * Greatly expanded and improved documentation and examples
   * remove seemingly useless makeSimpleDzenConfig function
   * factor out xmobarPP
   * add new ppExtras field to PP record, for specifying 'extra'
     loggers which can supply information other than window title,
     layout, and workspace status to a status bar (for example, time and date,
     battery status, mail status, etc.)
 
 The new XMonad.Util.Loggers module provides some example loggers that 
 can be used in the new ppExtras field of the PP record.  Create your own,
 add them to this module, go crazy! =)
 
] 
[LayoutHints: fix a wrong fix
Andrea Rossato <andrea.rossato at unibz.it>**20080219165127
 The case analisys of my fix should be the other way around... this is
 the real fix.
] 
[Arossato: updated to latest changes
Andrea Rossato <andrea.rossato at unibz.it>**20080219163058] 
[Decoration: comment only
Andrea Rossato <andrea.rossato at unibz.it>**20080219161339
 This is a detailed commentary of all the code.
] 
[Decoratione: generate rectangles first, and create windows accordingly
Andrea Rossato <andrea.rossato at unibz.it>**20080219122115
 With this patch Decoration will first generate a rectangle and only if
 there is a rectangle available a window will be created.
 
 This makes the Decoration state a bit more difficult to process, but
 should reduce resource consumption.
] 
[Fix doc for Tabbed
Roman Cheplyaka <roma at ro-che.info>**20080219055650] 
[Tabbed and TabBarDecoration: no need to implement decorateFirst (the default is used)
Andrea Rossato <andrea.rossato at unibz.it>**20080218184950] 
[TabBarDecoration: simpleTabBar automatically applies resizeVertical
Andrea Rossato <andrea.rossato at unibz.it>**20080218180922
 Added some comments too.
] 
[DwmStyle: comment fix only
Andrea Rossato <andrea.rossato at unibz.it>**20080218180727] 
[ResizeScreen: add resizeHorizontalRight and resizeVerticalBottom
Andrea Rossato <andrea.rossato at unibz.it>**20080218180504] 
[Add TabBarDecoration, a layout modifier to add a bar of tabs to any layout
Andrea Rossato <andrea.rossato at unibz.it>**20080218161121
 ... and port DecorationMadness to the new system.
] 
[add Eq superclass to DecorationStyle and change styles in order not to decorate non managed windows
Andrea Rossato <andrea.rossato at unibz.it>**20080218131320] 
[Refactor MouseResize, remove isDecoration and introduce isInStack, isVisible, isInvisible
Andrea Rossato <andrea.rossato at unibz.it>**20080218105726
 This patch includes several changes, which are strictly related and
 cannot be recorded separately:
 - remove Decoraion.isDecoartion and introduce Decoration.isInStack
   (with the related change to LayoutHints)
 - in Decoration introduce useful utilities: isVisible, isInvisible,
   isWithin and lookFor'
 - MouseResize: - invisible inputOnly windows will not be created;
 	       - fix a bug in the read instance which caused a failure
                  in the state deserialization.
] 
[Prompt: regenerate completion list if there's just one completion
Andrea Rossato <andrea.rossato at unibz.it>**20080217132734] 
[Prompt.Theme: use mkComplFunFromList' to generate completions
Andrea Rossato <andrea.rossato at unibz.it>**20080217124453] 
[some code formatting
Andrea Rossato <andrea.rossato at unibz.it>**20080217124434] 
[Prompt: comment only (clafiry completionToCommand uses)
Andrea Rossato <andrea.rossato at unibz.it>**20080216181620] 
[Prompt: comment only (remove confusing remarks about commandToComplete)
Andrea Rossato <andrea.rossato at unibz.it>**20080216180412] 
[Prompt: haddock fixes only
Andrea Rossato <andrea.rossato at unibz.it>**20080216172331] 
[Prompt.XMonad: use mkComplFunFromList' to get all the completions with an empty command line
Andrea Rossato <andrea.rossato at unibz.it>**20080216133949] 
[Prompt.Window: remove unneeded and ugly escaping/unescaping
Andrea Rossato <andrea.rossato at unibz.it>**20080216133842] 
[Theme: move theme's nextCompletion implementation to Prompt.getNextCompletion
Andrea Rossato <andrea.rossato at unibz.it>**20080216133738] 
[Shell: escape the string in the command line only
Andrea Rossato <andrea.rossato at unibz.it>**20080216133651] 
[Prompt: add some methods to make completions more flexible
Andrea Rossato <andrea.rossato at unibz.it>**20080216133454
 - now it is possible to decide if the prompt will complete the last
   word of the command line or the whole line (default is the last
   word);
 - completing the last word can be fine tuned by implementing
   'commandToComplete' and 'completionToCommand': see comments for
   details;
 - move mkComplFunFromList' from TagWindows to Prompt.
] 
[Prompt.Theme: display all theme information and handle completion accordingly
Andrea Rossato <andrea.rossato at unibz.it>**20080216114159] 
[Prompt.Shell: if there's just one completion and it is a directory add a trailing slash
Andrea Rossato <andrea.rossato at unibz.it>**20080216114005] 
[Prompt: added nextCompletion and commandToComplete methods to fine tune prompts' completion functions
Andrea Rossato <andrea.rossato at unibz.it>**20080216113723] 
[Util.Themes: add ppThemeInfor to render the theme info
Andrea Rossato <andrea.rossato at unibz.it>**20080216113635] 
[DecorationMadness: resizable layouts now use MouseResize too
Andrea Rossato <andrea.rossato at unibz.it>**20080212173645] 
[SimpleFloat now uses MouseResize
Andrea Rossato <andrea.rossato at unibz.it>**20080212173615] 
[Add Actions.MouseResize: a layout modifier to resize windows with the mouse
Andrea Rossato <andrea.rossato at unibz.it>**20080212173455] 
[Decoration: remove mouse resize and more
Andrea Rossato <andrea.rossato at unibz.it>**20080212165306
 - since mouse resize is not related to decoration, I removed the code
   from here. Mouse resize will be handled by a separated layout
   modifier (in a separated module)
 - now also stacked decoration will be removed (I separated insert_dwr
   from remove_stacked)
] 
[Decoration.hs: variable names consistency only
Andrea Rossato <andrea.rossato at unibz.it>**20080211123056] 
[Tabbed and SimpleTabbed (in DecorationMadness) define their own decorationMouseDragHook method
Andrea Rossato <andrea.rossato at unibz.it>**20080211114043
 ... to disable mouse drag in tabbed layouts
] 
[Decoration: DecorationStyle class cleanup and focus/drag unification
Andrea Rossato <andrea.rossato at unibz.it>**20080211113650
 - moved decoEventHook to decorationEventHook
 - added decorationMouseFocusHook, decorationMouseDragHook,
   decorationMouseResizeHook methods
 - added a handleMouseFocusDrag to focus and drag a window (which makes
   it possible to focus *and* drag unfocused windows too
] 
[Refactor XMonad.Hooks.DynamicLog
Roman Cheplyaka <roma at ro-che.info>**20080210222406
 This allows using DynamicLog not only for statusbar.
] 
[DecorationMadness: comment only
Andrea Rossato <andrea.rossato at unibz.it>**20080210131427] 
[DecorationMadness: added a few floating layouts
Andrea Rossato <andrea.rossato at unibz.it>**20080210122523] 
[SimpleFloat: export SimpleFloat and add documentation
Andrea Rossato <andrea.rossato at unibz.it>**20080210113159] 
[Move DefaultDecoration from DecorationMadness to Decoration
Andrea Rossato <andrea.rossato at unibz.it>**20080210104304] 
[Themes: added robertTheme and donaldTheme
Andrea Rossato <andrea.rossato at unibz.it>**20080210083016] 
[DecorationMadness: make tunable tabbed layouts respect the Theme decoHeight field
Andrea Rossato <andrea.rossato at unibz.it>**20080210075322] 
[ScreenResize: vertical and horizontal now respond to SetTheme
Andrea Rossato <andrea.rossato at unibz.it>**20080210074544
 And so they will change the screen dimension accordingly.
] 
[WindowGo.hs: fix syntax in example
Brent Yorgey <byorgey at gmail.com>**20080209225135] 
[+doc for WindowGo.hs: I've discovered a common usecase for me for raiseMaybe
gwern0 at gmail.com**20080205032155] 
[Run.hs: add an option to runinterms
gwern0 at gmail.com**20080205031824
 It turns out that for urxvt, and most terminal, apparently, once you give a '-e' option, that's it.
 They will not interpret anything after that as anything but input for /bin/sh, so if you wanted to go 'runInTerm "'screen -r session' -title IRC"',
 you were SOL - the -title would not be seen by urxvt. This, needless to say, is bad, since then you can't do stuff like set the title which means
 various hooks and extensions are helpless. This patch adds an extra options argument which is inserted *before* the -e. If you want the old behaivour,
 you can just go 'runInTerm "" "executable"', but now if you need to do something extra, 'runInTerm "-title mutt" "mutt"' works fine.
 
 This patch also updates callers.
] 
[Add DecorationMadness: a repository of weirdnesses
Andrea Rossato <andrea.rossato at unibz.it>**20080209182515] 
[Decoration: change mouseEventHook to decoEventHook and more
Andrea Rossato <andrea.rossato at unibz.it>**20080209165101
 Fix also the problem with window's movement when the grabbing starts
] 
[Tabbed: add simpleTabbed and fx documentation
Andrea Rossato <andrea.rossato at unibz.it>**20080209163917
 simpleTabbed is just a version of tabbed with default theme and
 default srhinker.
] 
[Arossato: update to latest changes
Andrea Rossato <andrea.rossato at unibz.it>**20080208140604] 
[Decoration: enable mouse dragging of windows
Andrea Rossato <andrea.rossato at unibz.it>**20080208083602] 
[WindowArranger: add a SetGeometry message - needed to enable mouseDrag
Andrea Rossato <andrea.rossato at unibz.it>**20080208083413] 
[Decoration: add a mouseEventHook methohd and move mouse button event there
Andrea Rossato <andrea.rossato at unibz.it>**20080208073514] 
[Util.Thems: some more typos in comments
Andrea Rossato <andrea.rossato at unibz.it>**20080207233341] 
[Util.Themes: documentation and export list (added themes that have been left out)
Andrea Rossato <andrea.rossato at unibz.it>**20080207232251] 
[Prompt.Theme: comments and some point-free
Andrea Rossato <andrea.rossato at unibz.it>**20080207232155] 
[oxymor00nTheme
<its.sec at gmx.net>**20080207213100] 
[add swapScreen to CycleWS
<its.sec at gmx.net>**20080206191032
 * add support for swapping the workspaces on screens to CycleWS
] 
[Decoration: consistency of variable names
Andrea Rossato <andrea.rossato at unibz.it>**20080207191442
 Since the configuration is now called Theme, the variable 'c' is now a
 't'
] 
[Add Prompt.Theme: a prompt for dynamically applying a theme to the current workspace
Andrea Rossato <andrea.rossato at unibz.it>**20080207184321] 
[Decoration: add a SetTheme message and releaseResources
Andrea Rossato <andrea.rossato at unibz.it>**20080207184048
 ...which should make it harder to forget to release the font structure.
] 
[cabal file: respect alphabetic order for modules
Andrea Rossato <andrea.rossato at unibz.it>**20080207183153] 
[Add Util.Themes to collect user contributed themes
Andrea Rossato <andrea.rossato at unibz.it>**20080207182843] 
[SimpleFloat: comment only
Andrea Rossato <andrea.rossato at unibz.it>**20080207182438] 
[Update to safer initColor api
Don Stewart <dons at galois.com>**20080206192232] 
[use Util.WorkspaceCompare in Prompt.Workspace.
David Roundy <droundy at darcs.net>**20080206004057] 
[roll back to previous version of Droundy.hs.
David Roundy <droundy at darcs.net>**20080205204043
 
 A cleaner WindowNavigation fix made the separation of tabbed and addTabs
 not strictly necessary (but still a desireable possibility in my opinion,
 as it allows pretty decoration of non-composite layouts that might want to
 have some of their windows tabbed.
] 
[make WindowNavigation ignore decorations.
David Roundy <droundy at darcs.net>**20080205203556] 
[make tabbed work nicely with LayoutCombinators and WindowNavigation.
David Roundy <droundy at darcs.net>**20080205202343
 The problem is that WindowNavigation assumes all windows are navigable, and
 it was getting confused by decorations.  With a bit of work, we can
 decorate windows *after* combining layouts just fine.
] 
[make WindowNavigation work when windows are stacked.
David Roundy <droundy at darcs.net>**20080205202027] 
[ XMonad.Actions.WindowGo: add a runOrRaise module for Joseph Garvin with the help of Spencer Janssen
gwern0 at gmail.com**20080204173402] 
[enable proper handling of panels in droundy config.
David Roundy <droundy at darcs.net>**20080204030843] 
[enable button click for focus in tabbed.
David Roundy <droundy at darcs.net>**20080204010536
 Note that this patch doesn't work with
 
 Thu Dec 27 03:03:56 EST 2007  Spencer Janssen <sjanssen at cse.unl.edu>
   * Broadcast button events to all layouts, fix for issue #111
 
 but this isn't a regression, since button events have never worked with
 tabbed and this change.
] 
[in Decoration, remove windows that are precisely hidden underneath other windows.
David Roundy <droundy at darcs.net>**20080204005413
 This is needed for WindowNavigation to work properly with the new
 Decorations framework.
] 
[switch tabbed back to using Simplest (so tabs will be shown).
David Roundy <droundy at darcs.net>**20080204005350] 
[CycleWS: change example binding for toggleWS from mod-t to mod-z.  example bindings shouldn't conflict with default key bindings.
Brent Yorgey <byorgey at gmail.com>**20080201202126] 
[REMOVE RotView: use CycleWS instead.
Brent Yorgey <byorgey at gmail.com>**20080201180618
 See CycleWS docs for info on switching, or just look at the changes to
 XMonad.Config.Droundy.
] 
[CycleWS: add more general functionality that now subsumes the functionality of RotView.  Now with parameterized workspace sorting and predicates!
Brent Yorgey <byorgey at gmail.com>**20080201121524] 
[WorkspaceCompare: some refactoring.
Brent Yorgey <byorgey at gmail.com>**20080201120430
   * Export WorkspaceCompare and WorkspaceSort types.
   * Extract commonality in sort methods into mkWsSort, which creates
     a workspace sort from a workspace comparison function.
   * Rename getSortByTag to getSortByIndex, since it did not actually sort
     by tag at all; it sorts by index of workspace tags in the user's config.
   * Create a new getSortByTag function which actually does sort
     lexicographically by tag.
   * Enhance documentation.
] 
[Search.hs: haddock cleanup
Brent Yorgey <byorgey at gmail.com>**20080131161948] 
[Added a handy tip to the documentation of XMonad.Actions.Search
v.dijk.bas at gmail.com**20080131122620
 The tip explains how to use the submap action to create a handy submap of keybindings for searching.
] 
[Make LayoutHints a decoration aware layout modifier
Andrea Rossato <andrea.rossato at unibz.it>**20080131082314] 
[Remove LayoutCombinator class and revert PerWorkspace to its Maybe Bool state
Andrea Rossato <andrea.rossato at unibz.it>**20080131063929
 As I said in order to have a CombinedLayout type instace of
 LayoutClass and a class for easily writing pure and impure combinators
 to be feeded to the CombinedLayout together with the layouts to be
 conbined, there's seems to be the need to change the type of the
 LayoutClass.description method from l a -> String to l a -> X String.
 
 Without that "ugly" change - loosing the purity of the description
 (please note the *every* methods of that class unless description
 operates in the X monad) - I'm plainly unable to write something
 really useful and maintainable. If someone can point me in the right
 direction I would really really appreciate.
 
 Since, in the meantime, PerWorkspace, which has its users, is broken
 and I broke it, I'm reverting it to it supposedly more beautiful
 PerWorkspac [WorkspaceId] (Maybe Bool) (l1 a) (l2 a) type.
] 
[Extending.hs: documentation update
Brent Yorgey <byorgey at gmail.com>**20080131012728] 
[DynamicLog: lots of additional documentation; add byorgeyPP as an example dzen config
Brent Yorgey <byorgey at gmail.com>**20080130205219] 
[SimpleDecoration: export defaultTheme
Andrea Rossato <andrea.rossato at unibz.it>**20080130124609] 
[Various decorations related updates
Spencer Janssen <sjanssen at cse.unl.edu>**20080130064624
  * remove deprecated TConf stuff
  * Remove 'style' from DeConf
  * Change DeConf to Theme
  * share defaultTheme across all decorations
] 
[TwoPane: add description string
Joachim Fasting <joachim.fasting at gmail.com>**20080126141332] 
[add XMonad.Actions.CycleSelectedLayouts
Roman Cheplyaka <roma at ro-che.info>**20080116205020] 
[Search.hs: add documentation and two more search engines (MathWorld and Google Scholar)
Brent Yorgey <byorgey at gmail.com>**20080128190443] 
[xmonad-contrib.cabal: add build-type field to get rid of Cabal warning
Brent Yorgey <byorgey at gmail.com>**20080128190137] 
[LayoutCombinator class: code clean up
Andrea Rossato <andrea.rossato at unibz.it>**20080129224952
 - ComboType becomes CombboChooser
 - removed the stupid doFirst
 - better comboDescription default implemenation
] 
[Add a LayoutCombinator class and a CombinedLayout and port PerWorkspace to the new system
Andrea Rossato <andrea.rossato at unibz.it>**20080129192903] 
[Named: reimplemented as a LayoutModifier and updated Config.Droundy accordingly
Andrea Rossato <andrea.rossato at unibz.it>**20080128161343] 
[LayoutModifier: add modifyDescription for completely override the modified layout description
Andrea Rossato <andrea.rossato at unibz.it>**20080128160614] 
[Make ToggleLayouts and Named implement emptyLayout
Andrea Rossato <andrea.rossato at unibz.it>**20080128151535] 
[Decoration: the fontset must be released even when we don't decorate the first window
Andrea Rossato <andrea.rossato at unibz.it>**20080128004411
 This is quite an old bug! It affected Tabbed since the very beginning..;)
] 
[Decoration: I forgot we need to release the fontset too!
Andrea Rossato <andrea.rossato at unibz.it>**20080127233521] 
[Decoration: after deleting the windows we must update the layout modifier
Andrea Rossato <andrea.rossato at unibz.it>**20080127231815
 Thanks to Feuerbach for reporting this.
] 
[Reflect: reimplemented as a layout modifier (which makes it compatible with windowArranger and decoration)
Andrea Rossato <andrea.rossato at unibz.it>**20080127165854] 
[SimpleFLoat: change the description to Float (Simple is the decoration description)
Andrea Rossato <andrea.rossato at unibz.it>**20080127144556] 
[ManageDocks: implement AvoidStruts as a layout modifier
Andrea Rossato <andrea.rossato at unibz.it>**20080127144301] 
[ResizeScreen has been rewritten as a layout modifier
Andrea Rossato <andrea.rossato at unibz.it>**20080127140837] 
[LayoutModifier add a modifyLayout
Andrea Rossato <andrea.rossato at unibz.it>**20080127140219
 Many layouts are written as layout modifiers because they need to
 change the stack of the rectangle before executing doLayout.
 
 This is a major source of bugs. all layout modifiers should be using the
 LayoutModifier class. This method (modifyLayout) can be used to
 manipulate the rectangle and the stack before running doLayout by the
 layout modifier.
] 
[Make LayoutCombinators deal with emptyLayout
Andrea Rossato <andrea.rossato at unibz.it>**20080127092415] 
[Add ResizeScreen, a layout modifier for modifing the screen geometry
Andrea Rossato <andrea.rossato at unibz.it>**20080127010755] 
[WindowArranger can now arrange all windows
Andrea Rossato <andrea.rossato at unibz.it>**20080126233053
 This is useful for SimpleFloat, whose state can now persists across
 layout switches.
] 
[Arossato: updated my config to recent changes
Andrea Rossato <andrea.rossato at unibz.it>**20080126205638] 
[Add SimpleFloat a very basic floating layout that will place windows according to their size hints
Andrea Rossato <andrea.rossato at unibz.it>**20080126205410] 
[WindoWrranger: export the WindowArranger type (see the upcoming SimpleFloat)
Andrea Rossato <andrea.rossato at unibz.it>**20080126204605] 
[ShowWName: show the name of empty layouts too
Andrea Rossato <andrea.rossato at unibz.it>**20080126190214] 
[ManageDocks: add emptyLayout definition for supporting the new decoration framework
Andrea Rossato <andrea.rossato at unibz.it>**20080126185936] 
[Decoration: code formatting only
Andrea Rossato <andrea.rossato at unibz.it>**20080126101354] 
[export DeConfig to avoid importing Decoration
Andrea Rossato <andrea.rossato at unibz.it>**20080126101049] 
[Prompt: code formatting only
Andrea Rossato <andrea.rossato at unibz.it>**20080126093234] 
[Don't export TConf anymore and export DeConfig instead
Andrea Rossato <andrea.rossato at unibz.it>**20080126092141
 WARNING: this patch may be breaking your configuration. While it is
 still possible to use:
 
 tabbed shrinkText defaultTConf
 
 updating the fields of the defaultTConf record is not possible
 anymore, since the type TConf is now hidden.
 
 WARNING: "tabSize" has been substituted by "decoHeight"
 
 You can change your configuration this way:
 myTConf :: TConf
 myTConf = defaultTConf
        { tabSize = 15
        , etc....
 
 becomes:
 myTConf :: DeConfig TabbedDecoration Window
 myTConf = defaultTabbedConfig
        { decoHeight = 15
        , etc....
 
 and
 tabbed shrinkText myTConf
 
 becomes:
 tabDeco shrinkText myTConf
 
] 
[Tabbed now uses Decoration
Andrea Rossato <andrea.rossato at unibz.it>**20080125152311] 
[Add DwmStyle, a layout modifier to add dwm-style decorations to windows in any layout
Andrea Rossato <andrea.rossato at unibz.it>**20080125152152] 
[Adde SimpleDecoration, a layout modifier to add simple decorations to windows in any layout
Andrea Rossato <andrea.rossato at unibz.it>**20080125152106] 
[Add Layout.Simplest, the simplest layout
Andrea Rossato <andrea.rossato at unibz.it>**20080125152015] 
[Add Decoration, a layout modifier and a class for easily writing decorated layouts
Andrea Rossato <andrea.rossato at unibz.it>**20080125151726] 
[Add WindowArranger, a layout modifier to move and resize windows with the keyboard
Andrea Rossato <andrea.rossato at unibz.it>**20080125151633] 
[ShowWName: moved fi to XUtils
Andrea Rossato <andrea.rossato at unibz.it>**20080124134725] 
[XUtils: add functions for operating on lists of windows and export fi
Andrea Rossato <andrea.rossato at unibz.it>**20080124134638] 
[LayoutModifier: add emptyLayoutMod for dealing with empty workspaces
Andrea Rossato <andrea.rossato at unibz.it>**20080124015605] 
[LayoutModifier: add pureMess and pureModifier to the LayoutModifier class
Andrea Rossato <andrea.rossato at unibz.it>**20080122111319] 
[Layout.ShowWName: generalize the instance
Andrea Rossato <andrea.rossato at unibz.it>**20080115045139] 
[add emptyLayout to MultiToggle
Lukas Mai <l.mai at web.de>**20080128175313] 
[grammar fix
Lukas Mai <l.mai at web.de>**20080128175059] 
[TAG 0.6
Spencer Janssen <sjanssen at cse.unl.edu>**20080127222114] 
[depend on xmonad-0.6
Spencer Janssen <sjanssen at cse.unl.edu>**20080127221101] 
[Bump version to 0.6
Spencer Janssen <sjanssen at cse.unl.edu>**20080127211504] 
[I use urxvtc now
Spencer Janssen <sjanssen at cse.unl.edu>**20080127211452] 
[Update the test hook
Spencer Janssen <sjanssen at cse.unl.edu>**20080127205148] 
[add 'single' helper function
Lukas Mai <l.mai at web.de>**20080117234550] 
[documentation fix
Lukas Mai <l.mai at web.de>**20080117234401] 
[style assimilation
Lukas Mai <l.mai at web.de>**20080117234059] 
[Extended PP with sorting algorithm specification and added xinerama sorting
Juraj Hercek <juhe_xmonad at hck.sk>**20080109154923
   algorithm
   - idea is to specify sorting algorithm from user's xmonad.hs
   - xinerama sorting algorithm produces same ordering as
     pprWindowSetXinerama
   - default ppSort is set to getSortByTag, so the default functionality
     is the same as it was before
] 
[cleared up transience to better highlight how to use ManageHooks properly
xmonad-contrib at hexago.nl**20080102074810
 
 The initial patch that extended the EDSL for writing ManageHook rules did not come with a good example on how to use it.  This patch ammends that. 'move' is an example of how to write a rule to resolve a Query (Maybe a) into something tangible.  'move'' is an example of how to write a rule isolating window managing code from the rest ofthe mess the EDSL creates.
] 
[expands the EDSL for performing actions on windows
xmonad-contrib at hexago.nl**20080101174446
 
 This patch adds a few types of relationships and operators for managing windows with rules.  It provides grouping operators so the X action can access the quantifier that was matched or not matched.  It provides a formalism for predicates that work in both grouping and non grouping rules.  It could do with some classes, so that there are fewer operators that always do the Right Thing (TM), but the Haskell Type system currently has some problems resolving types.  Since I don't know enough about these high level things, it would be hard to create a GHC patch just to make it all work.
] 
[-Werror when flag(testing) only
Spencer Janssen <sjanssen at cse.unl.edu>**20080118015207] 
[Timer: some code cleanup
Andrea Rossato <andrea.rossato at unibz.it>**20080114211114] 
[Use doubleFork instead of manual double fork, or buggy single fork.
nicolas.pouillard at gmail.com**20080114202833
 
 This fixes showWName because Timer was leaking zombie processes.
 You should update xmonad, since doubleFork was not exported.
] 
[Reflect.hs: minor haddock fix
Brent Yorgey <byorgey at gmail.com>**20080116203546] 
[Reflect.hs: use -fglasgow-exts for now instead of LANGUAGE pragmas, for compatibility with ghc 6.6
Brent Yorgey <byorgey at gmail.com>**20080115194811] 
[Reflect.hs: add MultiToggle support
Brent Yorgey <byorgey at gmail.com>**20080115193519] 
[MultiToggle.hs: improve 'description' implementation in LayoutClass instance to display the current transformed layout rather than just 'MultiToggle'
Brent Yorgey <byorgey at gmail.com>**20080115193311] 
[Layout.Reflect: new contrib module for reflecting layouts horizontally/vertically
Brent Yorgey <byorgey at gmail.com>**20080115030947] 
[ShowWName.hs: switch color/bgcolor in call to paintAndWrite
Brent Yorgey <byorgey at gmail.com>**20080114153821] 
[Prompt: clean up and optimize moveWord a bit
Andrea Rossato <andrea.rossato at unibz.it>**20080113164745] 
[Prompt: added moveWord to move the cursor to the word boundaries
Andrea Rossato <andrea.rossato at unibz.it>**20080113123529
 The actions have been bound to ctrl+Left and Right
] 
[Doc.Extending: added links and description of recent module addition
Andrea Rossato <andrea.rossato at unibz.it>**20080113093211] 
[Action.Search: small haddock fixes
Andrea Rossato <andrea.rossato at unibz.it>**20080113092646] 
[ShowWName now uses Timer and XUtils to display the workspace name
Andrea Rossato <andrea.rossato at unibz.it>**20080113091107] 
[Add XMonad.Util.Timer, a module to set up timers and to handle them
Andrea Rossato <andrea.rossato at unibz.it>**20080113090140] 
[de-obfuscate the initState and set the init offset to the length of the default text
Andrea Rossato <andrea.rossato at unibz.it>**20080110140951] 
[prompt: Allow to provide a default text in the prompt config.
nicolas.pouillard at gmail.com**20080109213916] 
[Correct caps in module header.
Joachim Fasting <joachim.fasting at gmail.com>**20071230061920] 
[Use LANGUAGE pragma.
Joachim Fasting <joachim.fasting at gmail.com>**20071230061817] 
[shiftPrevScreen and shiftNextScreen, to make CycleWS consistent
mail at joachim-breitner.de**20071231171609] 
[formatting
Don Stewart <dons at galois.com>**20071204174920] 
[PerWorkspace.hs: add an explanatory note
Brent Yorgey <byorgey at gmail.com>**20071231135806] 
[Add ShowWName a layout modifier to show the workspace name
Andrea Rossato <andrea.rossato at unibz.it>**20071231130441
 This module requires dzen
] 
[ManageDocks: some documentation fixes
Andrea Rossato <andrea.rossato at unibz.it>**20071231101820] 
[-Wall police (again)
Spencer Janssen <sjanssen at cse.unl.edu>**20071228061841] 
[-Wall police
Spencer Janssen <sjanssen at cse.unl.edu>**20071228061822] 
[Fulfill the EWMH specification by listing the supported ATOMs, doesnt really make a differene AFAIK
mail at joachim-breitner.de**20071227215607] 
[display all visible windows on the current desktop in the pager
mail at joachim-breitner.de**20071227204349
 This is my best shot at modeling xmonad’s WM behaviour in a way that
 the Extended Window Manager Hints specification allows.
 
 Unfortunately, we can not tell the panel what size and position it should
 think the apps are.
] 
[Although I do not need the curr variable after all, this is nicer
mail at joachim-breitner.de**20071227190113] 
[Add support for cycling through screens to CycleWS
mail at joachim-breitner.de**20071227182635] 
[Clear _NET_ACTIVE_WINDOW when nothing is focused
mail at joachim-breitner.de**20071228154222] 
[textExtentsXMF doesn't require the display
Andrea Rossato <andrea.rossato at unibz.it>**20071228125913] 
[Don't bother checking executable bits of items in $PATH, yields a significant speed-up
Spencer Janssen <sjanssen at cse.unl.edu>**20071226032412] 
[ResizableTile.hs: fix resizing to work in the presence of floating windows (resolves issue #100)
Brent Yorgey <byorgey at gmail.com>**20071225135839] 
[LayoutScreens: haddock fixes
Andrea Rossato <andrea.rossato at unibz.it>**20071225105316] 
[XMonad.Actions.Search: haddock fix
Andrea Rossato <andrea.rossato at unibz.it>**20071224171115] 
[Fix isssue 105
Andrea Rossato <andrea.rossato at unibz.it>**20071224171020
 issue 105 was due to the fact that tab windows created when
 bootstrapping the windowset after a restart where managed. Setting the
 override_redirect attributes to True fixes the issue.
 
 Added the possibility to set the override_redirect attribute with
 XMonad.Util.XUtils.creationNewWindow
] 
[Prompt.hs: mv .xmonad_history into .xmonad/
gwern0 at gmail.com**20071224054610
 See my email to mailing list. This will slightly break anyone who upgrades while running and expects to see their prompt history, and leave a stray file, I think, but nothing else, and it'll permanently improve tab-completion, and is tidier.
] 
[Search.hs: +docs, and export simpleEngine so users can define their own
gwern0 at gmail.com**20071224043828] 
[Search.hs: mv into Actions/ per IRC suggestion
gwern0 at gmail.com**20071224043735] 
[add XMonad.Actions.NoBorders
Lukas Mai <l.mai at web.de>**20071220203953] 
[AvoidStruts: add support for partial struts
Spencer Janssen <sjanssen at cse.unl.edu>**20071222133425] 
[Search.hs: add hoogle
Brent Yorgey <byorgey at gmail.com>**20071222184912] 
[ManageDocks: ignore desktop windows also
Spencer Janssen <sjanssen at cse.unl.edu>**20071222113808] 
[Wibble
Spencer Janssen <sjanssen at cse.unl.edu>**20071222110641] 
[EwmhDesktops: add _NET_ACTIVE_WINDOW support
Spencer Janssen <sjanssen at cse.unl.edu>**20071222110552] 
[A few short comments for WorkspaceCompare
Spencer Janssen <sjanssen at cse.unl.edu>**20071222105045] 
[EwmhDesktops: drop 'Workspace' from displayed workspace names
Spencer Janssen <sjanssen at cse.unl.edu>**20071222104559] 
[Factor workspace sorting into a separate module
Spencer Janssen <sjanssen at cse.unl.edu>**20071222104114] 
[No more tabs
Spencer Janssen <sjanssen at cse.unl.edu>**20071222050439] 
[Refactor Search.hs
Spencer Janssen <sjanssen at cse.unl.edu>**20071222044714] 
[Generalize XSelection functions to MonadIO
Spencer Janssen <sjanssen at cse.unl.edu>**20071222044514] 
[Search.hs: +imdb & amazon engines for unk_red
gwern0 at gmail.com**20071222035837] 
[Search.hs: cleanup and refactor
gwern0 at gmail.com**20071220174001] 
[Update various restart bindings
Spencer Janssen <sjanssen at cse.unl.edu>**20071219220634] 
[Fix typo.
Roman Cheplyaka <roma at ro-che.info>**20071219073857] 
[Doc/Developing.hs: add some information about Haddock documentation.
Brent Yorgey <byorgey at gmail.com>**20071219215300] 
[require haddock documentation to build successfully in order to record a patch.
Brent Yorgey <byorgey at gmail.com>**20071219215217] 
[Remove inaccurate comment about 'banish'
Spencer Janssen <sjanssen at cse.unl.edu>**20071217231540] 
[Warp.hs: haddock fixes
Brent Yorgey <byorgey at gmail.com>**20071217224712] 
[Warp.hs: +doc
gwern0 at gmail.com**20071216030015
 Describe how to emulate Ratpoison's 'banish' functionality on one's config
] 
[Util/Search.hs: a few updates/fixes
Brent Yorgey <byorgey at gmail.com>**20071217222930
   * fix shadowing warning (ghc 6.8.2 complains)
   * export a few more of the functions
   * re-de-obfuscate generated URLs by not escaping alphanumerics or punct.
] 
[Util.Search: import escapeURIString, and fall back on the ugly const false hack to avoid copy-pasting even more
gwern0 at gmail.com**20071215211638] 
[update Config.Droundy to use a few nice hooks.
David Roundy <droundy at darcs.net>**20071216185653] 
[Add UrgencyHook support to Tabbed
Shachaf Ben-Kiki <shachaf at gmail.com>**20071215171617] 
[DynamicLog.hs: some documentation updates.
Brent Yorgey <byorgey at gmail.com>**20071215143727] 
[DynamicLog.hs: fix shadowing warning
Brent Yorgey <byorgey at gmail.com>**20071215143227] 
[Add UrgencyHook support to DynamicLog
Shachaf Ben-Kiki <shachaf at gmail.com>**20071214043528
 Someone with Xinerama should look at this -- I don't know exactly how that
 should behave.
] 
[Depend on X11-1.4.1, it has crucial bugfixes
Spencer Janssen <sjanssen at cse.unl.edu>**20071215022151] 
[Remove network dependency, potentially breaking XMonad.Util.Search
Spencer Janssen <sjanssen at cse.unl.edu>**20071214231859] 
[Search.hs: fix shadowing warning and haddock errors
Brent Yorgey <byorgey at gmail.com>**20071214163119] 
[+cabal support for XMonad.Util.Search
gwern0 at gmail.com**20071213205654] 
[+XMonad.Util.Search: new module
gwern0 at gmail.com**20071213205159
 This module is intended to provide helpful functions for easily running web searchs; just hit a bound key, enter your query, and up opens a new tab/browser/window with the search results. In theory anyway; the Wikipedia and Google ones work fine for me, but the Internet Archive's docs on how to do don't necessarily seem to be correct. If you were, like me, previously running shell commands to call Surfraw or similar shell scripts to do the same thing, you can now scrap them and replace them.
 
 There aren't too many search engines defined here; new ones would be good, and they're easy to add!
] 
[Add support for _NET_WM_STRUT_PARTIAL
Spencer Janssen <sjanssen at cse.unl.edu>**20071213021704] 
[ManageDocks: when there are struts on opposing edges, the right/bottom strut
Spencer Janssen <sjanssen at cse.unl.edu>**20071210021030
 was ignored.  TODO: quickchecks
] 
[Run.hs: fix documentation, cleanup whitespace
"Valery V. Vorotyntsev" <valery.vv at gmail.com>**20071212091516] 
[Man.hs: input speedup
"Valery V. Vorotyntsev" <valery.vv at gmail.com>**20071212090256
 
 Descend manpage directories once -- when `manPrompt' is called.
 (Previous version used to search directories upon each character
 arrival.)
] 
[new XMonad.Hooks.ManageHelpers module
Lukas Mai <l.mai at web.de>**20071211183040] 
[Magnifier: custom zoom ratio for magnifier' too
intrigeri at boum.org**20071211015554] 
[Magnifier.hs: minor haddock fixes
Brent Yorgey <byorgey at gmail.com>**20071211011154] 
[fix haddock on Magnifier
tim.thelion at gmail.com**20071210231942] 
[Custom zoom levels for magnifier
tim.thelion at gmail.com**20071208230844] 
[TAG 0.5
Spencer Janssen <sjanssen at cse.unl.edu>**20071209233056] 
Patch bundle hash:
4d56d43a399135a901d755b0e6a30fac378eb221


More information about the xmonad mailing list