From 2ccdb6b9f9a618a5615c0fe9e42414def4ae7cf0 Mon Sep 17 00:00:00 2001 From: Shachaf Ben-Kiki Date: Mon, 19 Nov 2007 00:03:19 +0100 Subject: Miscellaneous spell-checking darcs-hash:20071118230319-bffde-6c56202afece4ecc55d48d37bde3f80edaff66f7.gz --- XMonad/Actions/CopyWindow.hs | 2 +- XMonad/Actions/FloatKeys.hs | 2 +- XMonad/Actions/TagWindows.hs | 2 +- XMonad/Hooks/DynamicLog.hs | 4 ++-- XMonad/Hooks/ManageDocks.hs | 2 +- XMonad/Layout/Combo.hs | 10 +++++----- XMonad/Layout/MultiToggle.hs | 2 +- XMonad/Prompt.hs | 8 ++++---- XMonad/Util/EZConfig.hs | 2 +- XMonad/Util/Run.hs | 2 +- XMonad/Util/XUtils.hs | 2 +- 11 files changed, 19 insertions(+), 19 deletions(-) diff --git a/XMonad/Actions/CopyWindow.hs b/XMonad/Actions/CopyWindow.hs index cb6a619..08c5126 100644 --- a/XMonad/Actions/CopyWindow.hs +++ b/XMonad/Actions/CopyWindow.hs @@ -64,7 +64,7 @@ copy n = copy' insertUp' a s = modify (Just $ Stack a [] []) (\(Stack t l r) -> Just $ Stack a (L.delete a l) (L.delete a (t:r))) s --- | Remove the focussed window from this workspace. If it's present in no +-- | Remove the focused window from this workspace. If it's present in no -- other workspace, then kill it instead. If we do kill it, we'll get a -- delete notify back from X. -- diff --git a/XMonad/Actions/FloatKeys.hs b/XMonad/Actions/FloatKeys.hs index 52ca90e..31784d1 100644 --- a/XMonad/Actions/FloatKeys.hs +++ b/XMonad/Actions/FloatKeys.hs @@ -53,7 +53,7 @@ import Graphics.X11.Xlib.Extras -- keysResizeWindow (-10, -10) (0, 1) shrinks the window in direction of the bottom-left corner -- -- keysAbsResizeWindow (dx, dy) (ax, ay) changes the width by dx and the height by dy leaving the screen --- absolut point (ax, ay) fixed +-- absolute point (ax, ay) fixed -- -- examples on a 1024x768 screen: keysAbsResizeWindow (10, 10) (0, 0) enlarge the window and if it is not in the top-left corner it will also be moved away -- diff --git a/XMonad/Actions/TagWindows.hs b/XMonad/Actions/TagWindows.hs index 938eb10..d28aeeb 100644 --- a/XMonad/Actions/TagWindows.hs +++ b/XMonad/Actions/TagWindows.hs @@ -59,7 +59,7 @@ import XMonad hiding (workspaces) -- > , ((modWinMask .|. shiftMask, xK_g ), tagPrompt defaultXPConfig (\s -> withTaggedGlobalP s shiftHere)) -- > , ((modWinMask .|. controlMask, xK_g), tagPrompt defaultXPConfig (\s -> focusUpTaggedGlobal s)) -- --- NOTE: Tags are saved as space seperated string and split with 'unwords' thus +-- NOTE: Tags are saved as space separated string and split with 'unwords' thus -- if you add a tag "a b" the window will have the tags "a" and "b" but not "a b". -- %import XMonad.Actions.TagWindows diff --git a/XMonad/Hooks/DynamicLog.hs b/XMonad/Hooks/DynamicLog.hs index 66c897f..db24655 100644 --- a/XMonad/Hooks/DynamicLog.hs +++ b/XMonad/Hooks/DynamicLog.hs @@ -79,7 +79,7 @@ makeSimpleDzenConfig = do -- -- > main = dzen xmonad -- --- The intent is that the avove config file should provide a nice status +-- The intent is that the above config file should provide a nice status -- bar with minimal effort. -- dzen :: (XConfig (Choose Tall (Choose (Mirror Tall) Full)) -> IO ()) -> IO () @@ -192,7 +192,7 @@ dzenColor fg bg = wrap (fg1++bg1) (fg2++bg2) (bg1,bg2) | null bg = ("","") | otherwise = ("^bg(" ++ bg ++ ")","^bg()") --- | Escape any dzen metacharaters. +-- | Escape any dzen metacharacters. dzenEscape :: String -> String dzenEscape = concatMap (\x -> if x == '^' then "^^" else [x]) diff --git a/XMonad/Hooks/ManageDocks.hs b/XMonad/Hooks/ManageDocks.hs index fedca64..e5774a9 100644 --- a/XMonad/Hooks/ManageDocks.hs +++ b/XMonad/Hooks/ManageDocks.hs @@ -55,7 +55,7 @@ import Foreign.C.Types (CLong) import Data.Maybe (catMaybes) -- $usage --- Add the imports to your configuration file and add the mangeHook: +-- Add the imports to your configuration file and add the manageHook: -- -- > import XMonad.Hooks.ManageDocks -- diff --git a/XMonad/Layout/Combo.hs b/XMonad/Layout/Combo.hs index 9924be4..547a35e 100644 --- a/XMonad/Layout/Combo.hs +++ b/XMonad/Layout/Combo.hs @@ -55,11 +55,11 @@ import qualified XMonad.StackSet as W ( differentiate ) -- These bindings will move a window into the sublayout that is -- up/down/left/right of its current position. Note that there is some --- weirdness in combineTwo, in that the mod-tab focus order is not very --- closely related to the layout order. This is because we're forced to --- keep track of the window positions sparately, and this is ugly. If you --- don't like this, lobby for hierarchical stacks in core xmonad or go --- reimelement the core of xmonad yourself. +-- weirdness in combineTwo, in that the mod-tab focus order is not very closely +-- related to the layout order. This is because we're forced to keep track of +-- the window positions separately, and this is ugly. If you don't like this, +-- lobby for hierarchical stacks in core xmonad or go reim:lement the core of +-- xmonad yourself. -- %import XMonad.Layout.Combo -- %layout , combineTwo (TwoPane 0.03 0.5) (tabbed shrinkText defaultTConf) (tabbed shrinkText defaultTConf) diff --git a/XMonad/Layout/MultiToggle.hs b/XMonad/Layout/MultiToggle.hs index 0cd6ab4..e0ab8ba 100644 --- a/XMonad/Layout/MultiToggle.hs +++ b/XMonad/Layout/MultiToggle.hs @@ -159,7 +159,7 @@ data EOT = EOT deriving (Read, Show) data HCons a b = HCons a b deriving (Read, Show) infixr 0 ?? --- | Prepend an element to a heterogenuous list. Used to build transformer +-- | Prepend an element to a heterogeneous list. Used to build transformer -- tables for 'mkToggle'. (??) :: (HList b w) => a -> b -> HCons a b (??) = HCons diff --git a/XMonad/Prompt.hs b/XMonad/Prompt.hs index 05c5cd4..8330316 100644 --- a/XMonad/Prompt.hs +++ b/XMonad/Prompt.hs @@ -90,10 +90,10 @@ data XPState = data XPConfig = XPC { font :: String -- ^ Font - , bgColor :: String -- ^ Backgroud color + , bgColor :: String -- ^ Background color , fgColor :: String -- ^ Font color , fgHLight :: String -- ^ Font color of a highlighted completion entry - , bgHLight :: String -- ^ Backgroud color of a highlighted completion entry + , bgHLight :: String -- ^ Background color of a highlighted completion entry , borderColor :: String -- ^ Border color , promptBorderWidth :: Dimension -- ^ Border width , position :: XPPosition -- ^ Position: 'Top' or 'Bottom' @@ -336,7 +336,7 @@ startOfLine :: XP () startOfLine = modify $ \s -> s { offset = 0 } --- | Flush the command string and reset the offest +-- | Flush the command string and reset the offset flushString :: XP () flushString = do modify $ \s -> s { command = "", offset = 0} @@ -438,7 +438,7 @@ printPrompt drw = do let (gc,(c,(d,fs))) = (gcon &&& config &&& dpy &&& fontS) st (prt,(com,off)) = (show . xptype &&& command &&& offset) st str = prt ++ com - -- scompose the string in 3 part: till the cursor, the cursor and the rest + -- compose the string in 3 parts: till the cursor, the cursor and the rest (f,p,ss) = if off >= length com then (str, " ","") -- add a space: it will be our cursor ;-) else let (a,b) = (splitAt off com) diff --git a/XMonad/Util/EZConfig.hs b/XMonad/Util/EZConfig.hs index 1003dff..543f5a1 100644 --- a/XMonad/Util/EZConfig.hs +++ b/XMonad/Util/EZConfig.hs @@ -42,7 +42,7 @@ additionalKeys conf keysList = conf { keys = \cnf -> M.union (M.fromList keysList) (keys conf cnf) } -- | --- Remove standard keybidings you're not using. Example use: +-- Remove standard keybindings you're not using. Example use: -- -- > main = xmonad $ defaultConfig { terminal = "urxvt" } -- > `removeKeys` [(mod1Mask .|. shiftMask, n) | n <- [xK_1 .. xK_9]] diff --git a/XMonad/Util/Run.hs b/XMonad/Util/Run.hs index f013ea8..95e0415 100644 --- a/XMonad/Util/Run.hs +++ b/XMonad/Util/Run.hs @@ -10,7 +10,7 @@ -- -- This modules provides several commands to run an external process. -- It is composed of functions formerly defined in "XMonad.Util.Dmenu" (by --- Spencer Jannsen), "XMonad.Util.Dzen" (by glasser\@mit.edu) and +-- Spencer Janssen), "XMonad.Util.Dzen" (by glasser\@mit.edu) and -- XMonad.Util.RunInXTerm (by Andrea Rossato). -- ----------------------------------------------------------------------------- diff --git a/XMonad/Util/XUtils.hs b/XMonad/Util/XUtils.hs index af7aea4..9f4bc69 100644 --- a/XMonad/Util/XUtils.hs +++ b/XMonad/Util/XUtils.hs @@ -107,7 +107,7 @@ paintAndWrite w fs wh ht bw bc borc ffc fbc al str = do paintWindow' w (Rectangle x y wh ht) bw bc borc ms where ms = Just (fs,ffc,fbc,str) --- This stuf is not exported +-- This stuff is not exported paintWindow' :: Window -> Rectangle -> Dimension -> String -> String -> Maybe (XMonadFont,String,String,String) -> X () paintWindow' win (Rectangle x y wh ht) bw color b_color str = do -- cgit v1.2.3