aboutsummaryrefslogtreecommitdiffstats
path: root/XMonad/Util
diff options
context:
space:
mode:
Diffstat (limited to '')
-rw-r--r--XMonad/Util/Anneal.hs (renamed from Anneal.hs)6
-rw-r--r--XMonad/Util/Dmenu.hs (renamed from Dmenu.hs)10
-rw-r--r--XMonad/Util/Dzen.hs (renamed from Dzen.hs)8
-rw-r--r--XMonad/Util/Invisible.hs (renamed from Invisible.hs)4
-rw-r--r--XMonad/Util/NamedWindows.hs (renamed from NamedWindows.hs)4
-rw-r--r--XMonad/Util/Run.hs (renamed from Run.hs)16
-rw-r--r--XMonad/Util/XSelection.hs (renamed from XSelection.hs)4
-rw-r--r--XMonad/Util/XUtils.hs (renamed from XUtils.hs)4
8 files changed, 28 insertions, 28 deletions
diff --git a/Anneal.hs b/XMonad/Util/Anneal.hs
index d30c4d9..6852308 100644
--- a/Anneal.hs
+++ b/XMonad/Util/Anneal.hs
@@ -1,6 +1,6 @@
-----------------------------------------------------------------------------
-- |
--- Module : XMonadContrib.Anneal
+-- Module : XMonad.Util.Anneal
-- Copyright : (c) David Roundy
-- License : BSD-style (see LICENSE)
--
@@ -12,13 +12,13 @@
--
-----------------------------------------------------------------------------
-module XMonadContrib.Anneal ( Rated(Rated), the_value, the_rating
+module XMonad.Util.Anneal ( Rated(Rated), the_value, the_rating
, anneal, annealMax ) where
import System.Random ( StdGen, Random, mkStdGen, randomR )
import Control.Monad.State ( State, runState, put, get, gets, modify )
--- %import XMonadContrib.Anneal
+-- %import XMonad.Util.Anneal
data Rated a b = Rated !a !b
deriving ( Show )
diff --git a/Dmenu.hs b/XMonad/Util/Dmenu.hs
index 51cca67..8eeb0d9 100644
--- a/Dmenu.hs
+++ b/XMonad/Util/Dmenu.hs
@@ -1,6 +1,6 @@
-----------------------------------------------------------------------------
-- |
--- Module : XMonadContrib.Dmenu
+-- Module : XMonad.Util.Dmenu
-- Copyright : (c) Spencer Janssen <sjanssen@cse.unl.edu>
-- License : BSD-style (see LICENSE)
--
@@ -14,7 +14,7 @@
--
-----------------------------------------------------------------------------
-module XMonadContrib.Dmenu (
+module XMonad.Util.Dmenu (
-- * Usage
-- $usage
dmenu, dmenuXinerama, dmenuMap
@@ -24,14 +24,14 @@ import XMonad
import qualified XMonad.StackSet as W
import qualified Data.Map as M
import Control.Monad.State
-import XMonadContrib.Run
+import XMonad.Util.Run
-- $usage
-- You can use this module with the following in your Config.hs file:
--
--- > import XMonadContrib.Dmenu
+-- > import XMonad.Util.Dmenu
--- %import XMonadContrib.Dmenu
+-- %import XMonad.Util.Dmenu
-- | Starts dmenu on the current screen. Requires this patch to dmenu:
-- <http://www.jcreigh.com/dmenu/dmenu-3.2-xinerama.patch>
diff --git a/Dzen.hs b/XMonad/Util/Dzen.hs
index 5853ace..02fce05 100644
--- a/Dzen.hs
+++ b/XMonad/Util/Dzen.hs
@@ -1,6 +1,6 @@
-----------------------------------------------------------------------------
-- |
--- Module : XMonadContrib.Dzen
+-- Module : XMonad.Util.Dzen
-- Copyright : (c) glasser@mit.edu
-- License : BSD
--
@@ -12,7 +12,7 @@
--
-----------------------------------------------------------------------------
-module XMonadContrib.Dzen (dzen, dzenWithArgs, dzenScreen,
+module XMonad.Util.Dzen (dzen, dzenWithArgs, dzenScreen,
dzenUrgencyHook, dzenUrgencyHookWithArgs,
seconds) where
@@ -24,8 +24,8 @@ import Graphics.X11.Types (Window)
import qualified XMonad.StackSet as W
import XMonad
-import XMonadContrib.NamedWindows (getName)
-import XMonadContrib.Run (runProcessWithInputAndWait, seconds)
+import XMonad.Util.NamedWindows (getName)
+import XMonad.Util.Run (runProcessWithInputAndWait, seconds)
-- | @dzen str timeout@ pipes @str@ to dzen2 for @timeout@ microseconds.
-- Example usage:
diff --git a/Invisible.hs b/XMonad/Util/Invisible.hs
index 5ee9c25..f387158 100644
--- a/Invisible.hs
+++ b/XMonad/Util/Invisible.hs
@@ -2,7 +2,7 @@
-----------------------------------------------------------------------------
-- |
--- Module : XMonadContrib.Invisible
+-- Module : XMonad.Util.Invisible
-- Copyright : (c) 2007 Andrea Rossato, David Roundy
-- License : BSD-style (see xmonad/LICENSE)
--
@@ -14,7 +14,7 @@
--
-----------------------------------------------------------------------------
-module XMonadContrib.Invisible (
+module XMonad.Util.Invisible (
-- * Usage:
-- $usage
Invisible (..)
diff --git a/NamedWindows.hs b/XMonad/Util/NamedWindows.hs
index 9237255..05613b2 100644
--- a/NamedWindows.hs
+++ b/XMonad/Util/NamedWindows.hs
@@ -1,6 +1,6 @@
-----------------------------------------------------------------------------
-- |
--- Module : XMonadContrib.NamedWindows
+-- Module : XMonad.Util.NamedWindows
-- Copyright : (c) David Roundy <droundy@darcs.net>
-- License : BSD3-style (see LICENSE)
--
@@ -13,7 +13,7 @@
--
-----------------------------------------------------------------------------
-module XMonadContrib.NamedWindows (
+module XMonad.Util.NamedWindows (
-- * Usage
-- $usage
NamedWindow,
diff --git a/Run.hs b/XMonad/Util/Run.hs
index 2e0258c..39a653a 100644
--- a/Run.hs
+++ b/XMonad/Util/Run.hs
@@ -1,6 +1,6 @@
-----------------------------------------------------------------------------
-- |
--- Module : XMonadContrib.Run
+-- Module : XMonad.Util.Run
-- Copyright : (C) 2007 Spencer Janssen, Andrea Rossato, glasser@mit.edu
-- License : BSD-style (see LICENSE)
--
@@ -9,13 +9,13 @@
-- Portability : unportable
--
-- This modules provides several commands to run an external process.
--- It is composed of functions formerly defined in XMonadContrib.Dmenu (by
--- Spenver Jannsen), XMonadContrib.Dzen (by glasser@mit.edu) and
--- XMonadContrib.RunInXTerm (by Andrea Rossato).
+-- It is composed of functions formerly defined in XMonad.Util.Dmenu (by
+-- Spenver Jannsen), XMonad.Util.Dzen (by glasser@mit.edu) and
+-- XMonad.Util.RunInXTerm (by Andrea Rossato).
--
-----------------------------------------------------------------------------
-module XMonadContrib.Run (
+module XMonad.Util.Run (
-- * Usage
-- $usage
runProcessWithInput,
@@ -38,12 +38,12 @@ import System.Process (runInteractiveProcess, waitForProcess)
import XMonad
-- $usage
--- For an example usage of runInTerm see XMonadContrib.SshPrompt
+-- For an example usage of runInTerm see XMonad.Prompt.Ssh
--
-- For an example usage of runProcessWithInput see
--- XMonadContrib.{DirectoryPrompt,Dmenu,ShellPrompt,WmiiActions,WorkspaceDir}
+-- XMonad.Prompt.{DirectoryPrompt,Dmenu,ShellPrompt,WmiiActions,WorkspaceDir}
--
--- For an example usage of runProcessWithInputAndWait see XMonadContrib.Dzen
+-- For an example usage of runProcessWithInputAndWait see XMonad.Util.Dzen
-- | Returns Just output if the command succeeded, and Nothing if it didn't.
-- This corresponds to dmenu's notion of exit code 1 for a cancelled invocation.
diff --git a/XSelection.hs b/XMonad/Util/XSelection.hs
index 78d70fe..00d6723 100644
--- a/XSelection.hs
+++ b/XMonad/Util/XSelection.hs
@@ -15,7 +15,7 @@
-- $ darcs get "http:\/\/gorgias.mine.nu\/repos\/xmonad-utils"
-----------------------------------------------------------------------------
-module XMonadContrib.XSelection (
+module XMonad.Util.XSelection (
-- * Usage
-- $usage
getSelection,
@@ -38,7 +38,7 @@ import Control.Monad(Monad (return, (>>)), Functor(..), liftM, join)
import Data.Char (chr, ord)
import Data.Maybe (fromMaybe)
import Foreign(Word8, Data.Bits.Bits (shiftL, (.&.), (.|.)))
-import XMonadContrib.Run (safeSpawn, unsafeSpawn)
+import XMonad.Util.Run (safeSpawn, unsafeSpawn)
import XMonad (X, io)
{- $usage
diff --git a/XUtils.hs b/XMonad/Util/XUtils.hs
index 15c89b2..3986389 100644
--- a/XUtils.hs
+++ b/XMonad/Util/XUtils.hs
@@ -1,6 +1,6 @@
-----------------------------------------------------------------------------
-- |
--- Module : XMonadContrib.XUtils
+-- Module : XMonad.Util.XUtils
-- Copyright : (c) 2007 Andrea Rossato
-- License : BSD-style (see xmonad/LICENSE)
--
@@ -12,7 +12,7 @@
--
-----------------------------------------------------------------------------
-module XMonadContrib.XUtils (
+module XMonad.Util.XUtils (
-- * Usage:
-- $usage
stringToPixel