All hints

All files

Report generated by HLint v1.2 - a tool to suggest improvements to your Haskell code.

./tests/test_SwapWorkspaces.hs:12:1: Warning: Use camelCase
Found
prop_double_swap (ss :: T) (t1 :: NonNegative Int)
  (t2 :: NonNegative Int) = ...
Why not
propDoubleSwap (ss :: T) (t1 :: NonNegative Int)
  (t2 :: NonNegative Int) = ...
./tests/test_SwapWorkspaces.hs:18:1: Warning: Use camelCase
Found
prop_invalid_swap (ss :: T) (t1 :: NonNegative Int)
  (t2 :: NonNegative Int) = ...
Why not
propInvalidSwap (ss :: T) (t1 :: NonNegative Int)
  (t2 :: NonNegative Int) = ...
./tests/test_SwapWorkspaces.hs:34:1: Warning: Use camelCase
Found
prop_swap_only_two (ss :: T) (t1 :: NonNegative Int)
  (t2 :: NonNegative Int) = ...
Why not
propSwapOnlyTwo (ss :: T) (t1 :: NonNegative Int)
  (t2 :: NonNegative Int) = ...
./tests/test_SwapWorkspaces.hs:40:1: Warning: Use camelCase
Found
prop_swap_with_current (ss :: T) (t :: NonNegative Int) = ...
Why not
propSwapWithCurrent (ss :: T) (t :: NonNegative Int) = ...
./tests/test_XPrompt.hs:21:1: Warning: Eta reduce
Found
doubleCheck p = check (defaultConfig{configMaxTest = 1000}) p
Why not
doubleCheck = check (defaultConfig{configMaxTest = 1000})
./tests/test_XPrompt.hs:22:1: Warning: Eta reduce
Found
deepCheck p = check (defaultConfig{configMaxTest = 10000}) p
Why not
deepCheck = check (defaultConfig{configMaxTest = 10000})
./tests/test_XPrompt.hs:23:1: Warning: Eta reduce
Found
deepestCheck p = check (defaultConfig{configMaxTest = 100000}) p
Why not
deepestCheck = check (defaultConfig{configMaxTest = 100000})
./tests/test_XPrompt.hs:26:1: Warning: Use String
Found
[Char]
Why not
String
./tests/test_XPrompt.hs:26:1: Warning: Use camelCase
Found
prop_split (str :: [Char]) = ...
Why not
propSplit (str :: [Char]) = ...
./tests/test_XPrompt.hs:31:1: Warning: Use String
Found
[Char]
Why not
String
./tests/test_XPrompt.hs:31:1: Warning: Use camelCase
Found
prop_spliInSubListsAt (x :: Int) (str :: [Char]) = ...
Why not
propSpliInSubListsAt (x :: Int) (str :: [Char]) = ...
./tests/test_XPrompt.hs:40:1: Warning: Use String
Found
[Char]
Why not
String
./tests/test_XPrompt.hs:40:1: Warning: Use camelCase
Found
prop_skipGetLastWord (str :: [Char]) = ...
Why not
propSkipGetLastWord (str :: [Char]) = ...
./tests/test_XPrompt.hs:45:1: Warning: Use String
Found
Gen [[Char]]
Why not
Gen [String]
./tests/test_XPrompt.hs:56:1: Warning: Use camelCase
Found
prop_newIndex_range = ...
Why not
propNewIndexRange = ...
./tests/test_XPrompt.hs:61:1: Warning: Use camelCase
Found
prop_newCommandIndex = ...
Why not
propNewCommandIndex = ...
./tests/test_XPrompt.hs:62:23: Warning: Redundant brackets
Found
l !! (newIndex c l)
Why not
l !! newIndex c l
./XMonad/Prompt.hs:159:5: Warning: Eta reduce
Found
nextCompletion t c l = getNextOfLastWord t c l
Why not
nextCompletion = getNextOfLastWord
./XMonad/Prompt.hs:164:5: Warning: Eta reduce
Found
commandToComplete _ c = getLastWord c
Why not
commandToComplete _ = getLastWord
./XMonad/Prompt.hs:242:8: Error: Redundant $
Found
liftIO $ readHistory
Why not
liftIO readHistory
./XMonad/Prompt.hs:308:5: Error: Use when
Found
if length c > 1 then modify $ \ s -> s{showComplWin = True} else
  return ()
Why not
when (length c > 1) $ modify $ \ s -> s{showComplWin = True}
./XMonad/Prompt.hs:446:1: Error: Redundant do
Found
do modify $ \ s -> setCommand "" $ s{offset = 0}
Why not
modify $ \ s -> setCommand "" $ s{offset = 0}
./XMonad/Prompt.hs:460:1: Error: Redundant $
Found
liftM insertString $ getSelection
Why not
liftM insertString getSelection
./XMonad/Prompt.hs:491:18: Warning: Redundant brackets
Found
o - (ln reverse f)
Why not
o - ln reverse f
./XMonad/Prompt.hs:492:18: Warning: Redundant brackets
Found
o + (ln id ss)
Why not
o + ln id ss
./XMonad/Prompt.hs:577:1: Warning: Redundant brackets
Found
(completionFunction s) (commandToComplete (xptype s) (command s))
Why not
completionFunction s (commandToComplete (xptype s) (command s))
./XMonad/Prompt.hs:619:7: Warning: Redundant brackets
Found
wh `div` (fi max_compl_len)
Why not
wh `div` fi max_compl_len
./XMonad/Prompt.hs:621:7: Warning: Redundant brackets
Found
(length compl) `divMod` fi columns
Why not
length compl `divMod` fi columns
./XMonad/Prompt.hs:653:7: Warning: Redundant brackets
Found
(length xx) * (length yy)
Why not
length xx * length yy
./XMonad/Prompt.hs:659:1: Warning: Redundant brackets
Found
if (compl /= [] && showComplWin st) then
  case complWin st of
      Just w -> case complWinDim st of
                    Just wi -> if nwi == wi then drawComplWin w compl else recreate
                    Nothing -> recreate
      Nothing -> recreate
  else destroyComplWin
Why not
if compl /= [] && showComplWin st then
  case complWin st of
      Just w -> case complWinDim st of
                    Just wi -> if nwi == wi then drawComplWin w compl else recreate
                    Nothing -> recreate
      Nothing -> recreate
  else destroyComplWin
./XMonad/Util/Dzen.hs:30:1: Warning: Eta reduce
Found
dzen str timeout = dzenWithArgs str [] timeout
Why not
dzen str = dzenWithArgs str []
./XMonad/Util/Dzen.hs:40:9: Warning: Use string literal
Found
['\n']
Why not
"\n"
./XMonad/Util/Dzen.hs:48:58: Warning: Redundant brackets
Found
(fromIntegral n) + 1
Why not
fromIntegral n + 1
./XMonad/Util/CustomKeys.hs:83:1: Warning: Use liftM
Found
asks dels >>= return . foldr M.delete kmap
Why not
liftM (foldr M.delete kmap) (asks dels)
./XMonad/Util/CustomKeys.hs:87:1: Warning: Use liftM
Found
asks ins >>= return . foldr (uncurry M.insert) kmap
Why not
liftM (foldr (uncurry M.insert) kmap) (asks ins)
./XMonad/Util/EZConfig.hs:365:14: Warning: Redundant lambda
Found
on op f = \ x y -> f x `op` f y
Why not
on op f x y = f x `op` f y
./XMonad/Util/EZConfig.hs:397:1: Warning: Redundant brackets
Found
mod1Mask + (read [n])
Why not
mod1Mask + read [n]
./XMonad/Util/EZConfig.hs:431:1: Warning: Use :
Found
"F" ++ show n
Why not
'F' : show n
./XMonad/Util/EZConfig.hs:693:9: Error: Use unwords
Found
concat . intersperse " " . map ((++ "\"") . ("\"" ++))
Why not
unwords . map ((++ "\"") . ("\"" ++))
./XMonad/Util/Dmenu.hs:43:1: Warning: Eta reduce
Found
dmenu opts = menu "dmenu" opts
Why not
dmenu = menu "dmenu"
./XMonad/Util/Dmenu.hs:46:1: Warning: Eta reduce
Found
menu menuCmd opts
  = io $ runProcessWithInput menuCmd [] (unlines opts)
Why not
menu menuCmd = io . runProcessWithInput menuCmd [] . unlines
./XMonad/Util/Dmenu.hs:56:1: Warning: Eta reduce
Found
dmenuMap selectionMap = menuMap "dmenu" selectionMap
Why not
dmenuMap = menuMap "dmenu"
./XMonad/Util/Scratchpad.hs:108:5: Error: Use when
Found
if
  null
    (filter ((== scratchpadWorkspaceTag) . W.tag) (W.workspaces s))
  then addHiddenWorkspace scratchpadWorkspaceTag else return ()
Why not
when
  (null
     (filter ((== scratchpadWorkspaceTag) . W.tag) (W.workspaces s)))
  $ addHiddenWorkspace scratchpadWorkspaceTag
./XMonad/Util/XSelection.hs:49:1: Warning: Use String
Found
Int -> Word8 -> Int -> [Char]
Why not
Int -> Word8 -> Int -> String
./XMonad/Util/XSelection.hs:128:1: Warning: Use String
Found
Display -> Atom -> [Char] -> XEventPtr -> IO ()
Why not
Display -> Atom -> String -> XEventPtr -> IO ()
./XMonad/Util/XSelection.hs:128:1: Error: Redundant do
Found
do forkIO
     ((allocaXEvent $ processEvent dpy ty text) >>
        destroyWindow dpy win)
     >> return ()
Why not
forkIO
  ((allocaXEvent $ processEvent dpy ty text) >>
     destroyWindow dpy win)
  >> return ()
./XMonad/Util/XSelection.hs:128:1: Error: Redundant do
Found
do putStrLn "Unable to obtain ownership of the selection" >>
     destroyWindow dpy win
Why not
putStrLn "Unable to obtain ownership of the selection" >>
  destroyWindow dpy win
./XMonad/Layout/LayoutScreens.hs:61:17: Error: Redundant $
Found
Just $ W.Stack{W.focus = 1, W.up = [], W.down = [1 .. nscr - 1]}
Why not
Just W.Stack{W.focus = 1, W.up = [], W.down = [1 .. nscr - 1]}
./XMonad/Layout/Spiral.hs:58:7: Warning: Redundant brackets
Found
(scale - (1 % 1)) / (fromIntegral len)
Why not
(scale - (1 % 1)) / fromIntegral len
./XMonad/Layout/Spiral.hs:96:33: Warning: Redundant brackets
Found
r1 : (divideRects xs r2)
Why not
r1 : divideRects xs r2
./XMonad/Layout/Spiral.hs:121:18: Warning: Redundant brackets
Found
((fromIntegral n) * (numerator rat)) `div` (denominator rat)
Why not
((fromIntegral n) * (numerator rat)) `div` denominator rat
./XMonad/Layout/Spiral.hs:121:18: Warning: Redundant brackets
Found
(fromIntegral n) * (numerator rat)
Why not
fromIntegral n * numerator rat
./XMonad/Layout/Decoration.hs:61:1: Warning: Eta reduce
Found
decoration s t ds = ModifiedLayout (Decoration (I Nothing) s t ds)
Why not
decoration s t = ModifiedLayout . Decoration (I Nothing) s t
./XMonad/Layout/Decoration.hs:133:5: Warning: Eta reduce
Found
describeDeco ds = show ds
Why not
describeDeco = show
./XMonad/Layout/Decoration.hs:150:5: Warning: Eta reduce
Found
decorationMouseFocusHook _ s e = handleMouseFocusDrag False s e
Why not
decorationMouseFocusHook _ = handleMouseFocusDrag False
./XMonad/Layout/Decoration.hs:155:5: Warning: Eta reduce
Found
decorationMouseDragHook _ s e = handleMouseFocusDrag True s e
Why not
decorationMouseDragHook _ = handleMouseFocusDrag True
./XMonad/Layout/Decoration.hs:171:5: Warning: Eta reduce
Found
decorate ds w h r s wrs wr
  = return $ pureDecoration ds w h r s wrs wr
Why not
decorate ds w h r s wrs = return . pureDecoration ds w h r s wrs
./XMonad/Layout/Decoration.hs:279:14: Warning: Redundant brackets
Found
w `elemIndex` (map (fst . fst) dwrs)
Why not
w `elemIndex` map (fst . fst) dwrs
./XMonad/Layout/Decoration.hs:354:1: Warning: Eta reduce
Found
updateDecos s t f = mapM_ $ updateDeco s t f
Why not
updateDecos s t = mapM_ . updateDeco s t
./XMonad/Layout/Decoration.hs:382:1: Warning: Eta reduce
Found
isInStack s = flip elem (W.integrate s)
Why not
isInStack = flip elem . W.integrate
./XMonad/Layout/FixedColumn.hs:61:5: Error: Redundant $
Found
return $ (zip ws rs, Nothing)
Why not
return (zip ws rs, Nothing)
./XMonad/Layout/FixedColumn.hs:88:9: Warning: Use liftM
Found
f sh >>= return . fromIntegral . fst
Why not
liftM (fromIntegral . fst) (f sh)
./XMonad/Layout/LayoutHints.hs:62:1: Warning: Eta reduce
Found
layoutHintsWithPlacement rs = ModifiedLayout (LayoutHints rs)
Why not
layoutHintsWithPlacement = ModifiedLayout . LayoutHints
./XMonad/Layout/HintedTile.hs:87:5: Warning: Eta reduce
Found
description l = show (orientation l)
Why not
description = show . orientation
./XMonad/Layout/HintedTile.hs:101:1: Warning: Redundant brackets
Found
(Rectangle (align al sx sw w) sy w h) :
  (divide al Tall bhs
     (Rectangle sx (sy + fromIntegral h) sw (sh - h)))
Why not
Rectangle (align al sx sw w) sy w h :
  divide al Tall bhs (Rectangle sx (sy + fromIntegral h) sw (sh - h))
./XMonad/Layout/HintedTile.hs:104:5: Warning: Redundant brackets
Found
1 + (length bhs)
Why not
1 + length bhs
./XMonad/Layout/HintedTile.hs:106:1: Warning: Redundant brackets
Found
(Rectangle sx (align al sy sh h) w h) :
  (divide al Wide bhs
     (Rectangle (sx + fromIntegral w) sy (sw - w) sh))
Why not
Rectangle sx (align al sy sh h) w h :
  divide al Wide bhs (Rectangle (sx + fromIntegral w) sy (sw - w) sh)
./XMonad/Layout/HintedTile.hs:109:5: Warning: Redundant brackets
Found
1 + (length bhs)
Why not
1 + length bhs
./XMonad/Layout/MultiToggle.hs:146:5: Warning: Eta reduce
Found
readsPrec p s = map (first expand) $ readsPrec p s
Why not
readsPrec p = map (first expand) . readsPrec p
./XMonad/Layout/MultiToggle.hs:159:1: Warning: Eta reduce
Found
mkToggle1 t = mkToggle (single t)
Why not
mkToggle1 = mkToggle . single
./XMonad/Layout/Combo.hs:80:35: Error: Use fromMaybe
Found
maybe l1 id
Why not
fromMaybe l1
./XMonad/Layout/Combo.hs:81:35: Error: Use fromMaybe
Found
maybe l2 id
Why not
fromMaybe l2
./XMonad/Layout/Combo.hs:82:38: Error: Use fromMaybe
Found
maybe super id
Why not
fromMaybe super
./XMonad/Layout/Combo.hs:85:36: Error: Use fromMaybe
Found
maybe l1 id
Why not
fromMaybe l1
./XMonad/Layout/Combo.hs:86:36: Error: Use fromMaybe
Found
maybe l2 id
Why not
fromMaybe l2
./XMonad/Layout/Combo.hs:87:39: Error: Use fromMaybe
Found
maybe super id
Why not
fromMaybe super
./XMonad/Layout/Combo.hs:90:15: Error: Use fromMaybe
Found
maybe super id
Why not
fromMaybe super
./XMonad/Layout/Combo.hs:90:15: Error: Use fromMaybe
Found
maybe l1 id
Why not
fromMaybe l1
./XMonad/Layout/Combo.hs:90:15: Error: Use fromMaybe
Found
maybe l2 id
Why not
fromMaybe l2
./XMonad/Layout/Combo.hs:110:34: Error: Use fromMaybe
Found
maybe l1 id
Why not
fromMaybe l1
./XMonad/Layout/Combo.hs:111:34: Error: Use fromMaybe
Found
maybe l2 id
Why not
fromMaybe l2
./XMonad/Layout/Combo.hs:115:37: Error: Use fromMaybe
Found
maybe l1 id
Why not
fromMaybe l1
./XMonad/Layout/Combo.hs:116:37: Error: Use fromMaybe
Found
maybe l2 id
Why not
fromMaybe l2
./XMonad/Layout/Combo.hs:134:25: Error: Redundant $
Found
Just $
  Stack{focus = z, up = reverse $ takeWhile (/= z) xs,
        down = tail $ dropWhile (/= z) xs}
Why not
Just
  Stack{focus = z, up = reverse $ takeWhile (/= z) xs,
        down = tail $ dropWhile (/= z) xs}
./XMonad/Layout/Combo.hs:141:1: Warning: Redundant brackets
Found
(flip maybe) id
Why not
flip maybe id
./XMonad/Layout/SimplestFloat.hs:45:1: Warning: Redundant brackets
Found
(windowArrangeAll $ SF)
Why not
windowArrangeAll $ SF
./XMonad/Layout/SimplestFloat.hs:45:1: Error: Redundant $
Found
windowArrangeAll $ SF
Why not
windowArrangeAll SF
./XMonad/Layout/SimplestFloat.hs:64:5: Warning: Eta reduce
Found
fi x = fromIntegral x
Why not
fi = fromIntegral
./XMonad/Layout/Magnifier.hs:122:21: Warning: Redundant brackets
Found
return . Just $ (Mag (z `addto` 0.1) On t)
Why not
return . Just $ Mag (z `addto` 0.1) On t
./XMonad/Layout/Magnifier.hs:123:21: Warning: Redundant brackets
Found
return . Just $ (Mag (z `addto` (- 0.1)) On t)
Why not
return . Just $ Mag (z `addto` (- 0.1)) On t
./XMonad/Layout/Magnifier.hs:124:21: Warning: Redundant brackets
Found
return . Just $ (Mag (z) Off t)
Why not
return . Just $ Mag (z) Off t
./XMonad/Layout/Magnifier.hs:124:21: Warning: Redundant brackets
Found
Mag (z)
Why not
Mag z
./XMonad/Layout/Magnifier.hs:125:21: Warning: Redundant brackets
Found
return . Just $ (Mag (z) Off t)
Why not
return . Just $ Mag (z) Off t
./XMonad/Layout/Magnifier.hs:125:21: Warning: Redundant brackets
Found
Mag (z)
Why not
Mag z
./XMonad/Layout/Magnifier.hs:128:21: Warning: Redundant brackets
Found
return . Just $ (Mag z On t)
Why not
return . Just $ Mag z On t
./XMonad/Layout/Magnifier.hs:129:21: Warning: Redundant brackets
Found
return . Just $ (Mag z On t)
Why not
return . Just $ Mag z On t
./XMonad/Layout/Magnifier.hs:158:11: Warning: Redundant brackets
Found
x - (max 0 (x + fi w - sx - fi sw))
Why not
x - max 0 (x + fi w - sx - fi sw)
./XMonad/Layout/Magnifier.hs:159:11: Warning: Redundant brackets
Found
y - (max 0 (y + fi h - sy - fi sh))
Why not
y - max 0 (y + fi h - sy - fi sh)
./XMonad/Layout/ResizeScreen.hs:45:1: Warning: Eta reduce
Found
resizeHorizontal i = ModifiedLayout (ResizeScreen L i)
Why not
resizeHorizontal = ModifiedLayout . ResizeScreen L
./XMonad/Layout/ResizeScreen.hs:48:1: Warning: Eta reduce
Found
resizeVertical i = ModifiedLayout (ResizeScreen T i)
Why not
resizeVertical = ModifiedLayout . ResizeScreen T
./XMonad/Layout/ResizeScreen.hs:51:1: Warning: Eta reduce
Found
resizeHorizontalRight i = ModifiedLayout (ResizeScreen R i)
Why not
resizeHorizontalRight = ModifiedLayout . ResizeScreen R
./XMonad/Layout/ResizeScreen.hs:54:1: Warning: Eta reduce
Found
resizeVerticalBottom i = ModifiedLayout (ResizeScreen B i)
Why not
resizeVerticalBottom = ModifiedLayout . ResizeScreen B
./XMonad/Layout/ResizeScreen.hs:57:1: Warning: Eta reduce
Found
withNewRectangle r = ModifiedLayout (WithNewScreen r)
Why not
withNewRectangle = ModifiedLayout . WithNewScreen
./XMonad/Layout/ResizeScreen.hs:73:14: Warning: Eta reduce
Found
resize nr = runLayout ws nr
Why not
resize = runLayout ws
./XMonad/Layout/Named.hs:41:1: Warning: Eta reduce
Found
named s = ModifiedLayout (Named s)
Why not
named = ModifiedLayout . Named
./XMonad/Layout/BoringWindows.hs:47:9: Error: Redundant $
Found
W.modify' $ focusUp'
Why not
W.modify' focusUp'
./XMonad/Layout/Gaps.hs:104:5: Warning: Eta reduce
Found
modifyLayout g w r = runLayout w (applyGaps g r)
Why not
modifyLayout g w = runLayout w . applyGaps g
./XMonad/Layout/Gaps.hs:134:22: Warning: Redundant brackets
Found
d `elem` (map fst conf)
Why not
d `elem` map fst conf
./XMonad/Layout/WorkspaceDir.hs:82:1: Warning: Eta reduce
Found
workspaceDir s = ModifiedLayout (WorkspaceDir s)
Why not
workspaceDir = ModifiedLayout . WorkspaceDir
./XMonad/Layout/HintedGrid.hs:99:13: Error: Redundant $
Found
map ((width' +) . (`div` 2) . (maxw -)) $ ws
Why not
map ((width' +) . (`div` 2) . (maxw -)) ws
./XMonad/Layout/Roledex.hs:47:1: Warning: Redundant brackets
Found
(zip ups tops) ++ (reverse (zip dns bottoms))
Why not
zip ups tops ++ reverse (zip dns bottoms)
./XMonad/Layout/Roledex.hs:64:8: Warning: Redundant brackets
Found
x + (fromIntegral mx)
Why not
x + fromIntegral mx
./XMonad/Layout/Roledex.hs:64:8: Warning: Redundant brackets
Found
y + (fromIntegral my)
Why not
y + fromIntegral my
./XMonad/Layout/Roledex.hs:66:8: Error: Redundant $
Found
map f $ [0 .. (length dns)]
Why not
map f [0 .. (length dns)]
./XMonad/Layout/Roledex.hs:67:8: Warning: Redundant brackets
Found
gw * (fromIntegral n)
Why not
gw * fromIntegral n
./XMonad/Layout/Roledex.hs:67:8: Warning: Redundant brackets
Found
gh * (fromIntegral n)
Why not
gh * fromIntegral n
./XMonad/Layout/Roledex.hs:68:8: Warning: Redundant brackets
Found
(n - 1) : (cd (n - 1) m)
Why not
(n - 1) : cd (n - 1) m
./XMonad/Layout/TabBarDecoration.hs:62:1: Warning: Eta reduce
Found
tabBar s t p = decoration s t (TabBar p)
Why not
tabBar s t = decoration s t . TabBar
./XMonad/Layout/MosaicAlt.hs:162:9: Warning: Redundant brackets
Found
if w < 700 then ((1 / a) * (700 / w)) else 1 / a
Why not
if w < 700 then (1 / a) * (700 / w) else 1 / a
./XMonad/Layout/MosaicAlt.hs:163:9: Warning: Redundant brackets
Found
if w < 700 then a else (a * w / 700)
Why not
if w < 700 then a else a * w / 700
./XMonad/Layout/IM.hs:85:1: Warning: Eta reduce
Found
withIM ratio prop = ModifiedLayout $ AddRoster ratio prop
Why not
withIM ratio = ModifiedLayout . AddRoster ratio
./XMonad/Layout/IM.hs:101:9: Error: Redundant $
Found
S.integrate' $ stack
Why not
S.integrate' stack
./XMonad/Layout/ShowWName.hs:55:1: Warning: Use camelCase
Found
data SWNConfig = SWNC{swn_font :: String, swn_bgcolor :: String,
                      swn_color :: String, swn_fade :: Rational}
               deriving (Read, Show)
Why not
data SWNConfig = SWNC{swnFont :: String, swnBgcolor :: String,
                      swnColor :: String, swnFade :: Rational}
               deriving (Read, Show)
./XMonad/Layout/ShowWName.hs:71:5: Warning: Eta reduce
Found
redoLayout sn r _ wrs = doShow sn r wrs
Why not
redoLayout sn r _ = doShow sn r
./XMonad/Layout/ToggleLayouts.hs:78:55: Error: Use fromMaybe
Found
maybe lt id
Why not
fromMaybe lt
./XMonad/Layout/ToggleLayouts.hs:83:22: Error: Use fromMaybe
Found
maybe lt id
Why not
fromMaybe lt
./XMonad/Layout/ToggleLayouts.hs:89:55: Error: Use fromMaybe
Found
maybe lf id
Why not
fromMaybe lf
./XMonad/Layout/ToggleLayouts.hs:94:22: Error: Use fromMaybe
Found
maybe lf id
Why not
fromMaybe lf
./XMonad/Layout/LayoutModifier.hs:108:5: Warning: Eta reduce
Found
modifyLayout _ w r = runLayout w r
Why not
modifyLayout _ = runLayout
./XMonad/Layout/LayoutModifier.hs:241:25: Error: Use fromMaybe
Found
maybe l id
Why not
fromMaybe l
./XMonad/Layout/LayoutModifier.hs:241:25: Warning: Redundant brackets
Found
(ModifiedLayout m') $ maybe l id ml'
Why not
ModifiedLayout m' $ maybe l id ml'
./XMonad/Layout/LayoutModifier.hs:251:21: Error: Use fromMaybe
Found
maybe l id
Why not
fromMaybe l
./XMonad/Layout/LayoutModifier.hs:251:21: Warning: Redundant brackets
Found
(ModifiedLayout m') $ maybe l id ml'
Why not
ModifiedLayout m' $ maybe l id ml'
./XMonad/Layout/LayoutModifier.hs:252:21: Warning: Redundant brackets
Found
(ModifiedLayout m) `fmap` ml'
Why not
ModifiedLayout m `fmap` ml'
./XMonad/Layout/PerWorkspace.hs:72:1: Warning: Eta reduce
Found
onWorkspaces wsIds l1 l2 = PerWorkspace wsIds False l1 l2
Why not
onWorkspaces wsIds = PerWorkspace wsIds False
./XMonad/Layout/PerWorkspace.hs:120:1: Warning: Eta reduce
Found
mkNewPerWorkspaceT (PerWorkspace wsIds _ lt lf) mlt'
  = (\ lt' -> PerWorkspace wsIds True lt' lf) $ fromMaybe lt mlt'
Why not
mkNewPerWorkspaceT (PerWorkspace wsIds _ lt lf)
  = (\ lt' -> PerWorkspace wsIds True lt' lf) . fromMaybe lt
./XMonad/Layout/PerWorkspace.hs:125:1: Warning: Eta reduce
Found
mkNewPerWorkspaceF (PerWorkspace wsIds _ lt lf) mlf'
  = (\ lf' -> PerWorkspace wsIds False lt lf') $ fromMaybe lf mlf'
Why not
mkNewPerWorkspaceF (PerWorkspace wsIds _ lt lf)
  = (\ lf' -> PerWorkspace wsIds False lt lf') . fromMaybe lf
./XMonad/Layout/LayoutCombinators.hs:254:9: Error: Use fromMaybe
Found
maybe l1 id
Why not
fromMaybe l1
./XMonad/Layout/LayoutCombinators.hs:254:9: Error: Use fromMaybe
Found
maybe l2 id
Why not
fromMaybe l2
./XMonad/Layout/LayoutCombinators.hs:270:1: Error: Use fromMaybe
Found
maybe l id
Why not
fromMaybe l
./XMonad/Prompt/Ssh.hs:57:6: Error: Redundant $
Found
io $ sshComplList
Why not
io sshComplList
./XMonad/Prompt/RunOrRaise.hs:50:30: Error: Redundant $
Found
io $ getCommands
Why not
io getCommands
./XMonad/Prompt/RunOrRaise.hs:58:38: Warning: Redundant brackets
Found
if e then (notExecutable f) else return False
Why not
if e then notExecutable f else return False
./XMonad/Prompt/RunOrRaise.hs:69:74: Error: Redundant $
Found
return $ 0
Why not
return 0
./XMonad/Prompt/RunOrRaise.hs:73:51: Warning: Use liftM
Found
getWindowProperty32 d a w >>= return . getPID'
Why not
liftM getPID' (getWindowProperty32 d a w)
./XMonad/Prompt/Window.hs:71:1: Warning: Eta reduce
Found
windowPromptGoto c = doPrompt Goto c
Why not
windowPromptGoto = doPrompt Goto
./XMonad/Prompt/Window.hs:72:1: Warning: Eta reduce
Found
windowPromptBring c = doPrompt Bring c
Why not
windowPromptBring = doPrompt Bring
./XMonad/Prompt/Window.hs:73:1: Warning: Eta reduce
Found
windowPromptBringCopy c = doPrompt BringCopy c
Why not
windowPromptBringCopy = doPrompt BringCopy
./XMonad/Prompt/Window.hs:97:1: Error: Redundant $
Found
W.currentTag $ ws
Why not
W.currentTag ws
./XMonad/Prompt/AppendFile.hs:64:1: Warning: Eta reduce
Found
doAppend fn s
  = io $ bracket (openFile fn AppendMode) hClose (flip hPutStrLn s)
Why not
doAppend fn
  = io . bracket (openFile fn AppendMode) hClose . flip hPutStrLn
./XMonad/Prompt/Shell.hs:60:10: Error: Redundant $
Found
io $ getCommands
Why not
io getCommands
./XMonad/Prompt/Directory.hs:34:1: Warning: Eta reduce
Found
directoryPrompt c prom job = mkXPrompt (Dir prom) c getDirCompl job
Why not
directoryPrompt c prom = mkXPrompt (Dir prom) c getDirCompl
./XMonad/Actions/MouseResize.hs:75:11: Error: Use mapM_
Found
mapM (deleteInputWin . snd) st
Why not
mapM_ (deleteInputWin . snd) st
./XMonad/Actions/MouseResize.hs:112:1: Error: Redundant do
Found
do case mr of
       Just tr -> withDisplay $
                    \ d ->
                      do tw <- mkInputWindow d tr
                         io $ selectInput d tw (exposureMask .|. buttonPressMask)
                         showWindow tw
                         return ((w, r), Just tw)
       Nothing -> return ((w, r), Nothing)
Why not
case mr of
    Just tr -> withDisplay $
                 \ d ->
                   do tw <- mkInputWindow d tr
                      io $ selectInput d tw (exposureMask .|. buttonPressMask)
                      showWindow tw
                      return ((w, r), Just tw)
    Nothing -> return ((w, r), Nothing)
./XMonad/Actions/CycleWindows.hs:177:9: Warning: Use second
Found
\ (f, s) -> (f, reverse s)
Why not
second reverse
./XMonad/Actions/SpawnOn.hs:85:10: Error: Redundant $
Found
io $ getCommands
Why not
io getCommands
./XMonad/Actions/SpawnOn.hs:91:1: Warning: Eta reduce
Found
shellPromptHere sp = mkPrompt (spawnHere sp)
Why not
shellPromptHere = mkPrompt . spawnHere
./XMonad/Actions/SpawnOn.hs:96:1: Warning: Eta reduce
Found
shellPromptOn sp ws = mkPrompt (spawnOn sp ws)
Why not
shellPromptOn sp = mkPrompt . spawnOn sp
./XMonad/Actions/Search.hs:231:1: Warning: Eta reduce
Found
search browser site query = safeSpawn browser $ site query
Why not
search browser site = safeSpawn browser . site
./XMonad/Actions/Search.hs:246:47: Warning: Redundant brackets
Found
site ++ (escape s)
Why not
site ++ escape s
./XMonad/Actions/Search.hs:305:61: Warning: Redundant brackets
Found
if (fst $ break (== ':') s) `elem` ["http", "https", "ftp"] then s
  else (site s)
Why not
if (fst $ break (== ':') s) `elem` ["http", "https", "ftp"] then s
  else site s
./XMonad/Actions/Search.hs:311:1: Error: Redundant if
Found
if t == p then hasPrefix ts ps else False
Why not
(t == p) && hasPrefix ts ps
./XMonad/Actions/Search.hs:314:1: Warning: Eta reduce
Found
removeColonPrefix str = tail $ snd $ break (== ':') str
Why not
removeColonPrefix = tail . snd . break (== ':')
./XMonad/Actions/Plane.hs:88:1: Error: Redundant $
Found
fromList $
  [((keyMask, keySym), function ln limits direction) |
   (keySym, direction) <- zip [xK_Left .. xK_Down] $ enumFrom ToLeft,
   (keyMask, function) <- [(modm, planeMove),
                           (shiftMask .|. modm, planeShift)]]
Why not
fromList
  [((keyMask, keySym), function ln limits direction) |
   (keySym, direction) <- zip [xK_Left .. xK_Down] $ enumFrom ToLeft,
   (keyMask, function) <- [(modm, planeMove),
                           (shiftMask .|. modm, planeShift)]]
./XMonad/Actions/Plane.hs:168:17: Warning: Eta reduce
Found
mod_ columns_ = compose line $ mod (f column) columns_
Why not
mod_ = compose line . mod (f column)
./XMonad/Actions/WindowNavigation.hs:126:9: Warning: Eta reduce
Found
mapWindows f ss = W.mapWorkspace (mapWindows' f) ss
Why not
mapWindows = W.mapWorkspace . mapWindows'
./XMonad/Actions/WindowNavigation.hs:139:51: Error: Redundant do
Found
do windowRect win >>= flip whenJust (setPosition posRef pos . snd)
Why not
windowRect win >>= flip whenJust (setPosition posRef pos . snd)
./XMonad/Actions/WindowNavigation.hs:143:44: Error: Redundant do
Found
do currentPosition posRef >>= f win
Why not
currentPosition posRef >>= f win
./XMonad/Actions/WindowNavigation.hs:193:33: Error: Redundant $
Found
Just $ (win, Rectangle x y (w + 2 * bw) (h + 2 * bw))
Why not
Just (win, Rectangle x y (w + 2 * bw) (h + 2 * bw))
./XMonad/Actions/UpdatePointer.hs:86:1: Warning: Use guards
Found
moveWithin now lower upper
  = if now < lower then lower else if now > upper then upper else now
Why not
moveWithin now lower upper
  | now < lower = lower
  | now > upper = upper
  | otherwise = now
./XMonad/Actions/CopyWindow.hs:89:11: Warning: Eta reduce
Found
insertUp' a s
  = W.modify (Just $ W.Stack a [] [])
      (\ (W.Stack t l r) ->
         if a `elem` t : l ++ r then Just $ W.Stack t l r else
           Just $ W.Stack a (L.delete a l) (L.delete a (t : r)))
      s
Why not
insertUp' a
  = W.modify (Just $ W.Stack a [] [])
      (\ (W.Stack t l r) ->
         if a `elem` t : l ++ r then Just $ W.Stack t l r else
           Just $ W.Stack a (L.delete a l) (L.delete a (t : r)))
./XMonad/Actions/RotSlaves.hs:43:51: Warning: Redundant brackets
Found
(tail l) ++ [head l]
Why not
tail l ++ [head l]
./XMonad/Actions/RotSlaves.hs:44:51: Warning: Use :
Found
[last l] ++ (init l)
Why not
(last l) : (init l)
./XMonad/Actions/RotSlaves.hs:44:51: Warning: Redundant brackets
Found
[last l] ++ (init l)
Why not
[last l] ++ init l
./XMonad/Actions/RotSlaves.hs:52:12: Warning: Redundant brackets
Found
master : (f ws)
Why not
master : f ws
./XMonad/Actions/RotSlaves.hs:56:45: Warning: Redundant brackets
Found
(tail l) ++ [head l]
Why not
tail l ++ [head l]
./XMonad/Actions/RotSlaves.hs:57:45: Warning: Use :
Found
[last l] ++ (init l)
Why not
(last l) : (init l)
./XMonad/Actions/RotSlaves.hs:57:45: Warning: Redundant brackets
Found
[last l] ++ (init l)
Why not
[last l] ++ init l
./XMonad/Actions/TagWindows.hs:78:28: Warning: Use liftM
Found
catch
  (internAtom d "_XMONAD_TAGS" False >>= getTextProperty d w >>=
     wcTextPropertyToTextList d)
  (\ _ -> return [[]])
  >>= return . words . unwords
Why not
liftM (words . unwords)
  (catch
     (internAtom d "_XMONAD_TAGS" False >>= getTextProperty d w >>=
        wcTextPropertyToTextList d)
     (\ _ -> return [[]]))
./XMonad/Actions/TagWindows.hs:91:1: Error: Use when
Found
if (s `notElem` tags) then setTags (s : tags) w else return ()
Why not
when (s `notElem` tags) $ setTags (s : tags) w
./XMonad/Actions/TagWindows.hs:91:1: Warning: Redundant brackets
Found
if (s `notElem` tags) then setTags (s : tags) w else return ()
Why not
if s `notElem` tags then setTags (s : tags) w else return ()
./XMonad/Actions/TagWindows.hs:141:1: Warning: Eta reduce
Found
withTaggedP t f = withTagged' t (winMap f)
Why not
withTaggedP t = withTagged' t . winMap
./XMonad/Actions/TagWindows.hs:142:1: Warning: Eta reduce
Found
withTaggedGlobalP t f = withTaggedGlobal' t (winMap f)
Why not
withTaggedGlobalP t = withTaggedGlobal' t . winMap
./XMonad/Actions/TagWindows.hs:148:1: Warning: Eta reduce
Found
withTagged t f = withTagged' t (mapM_ f)
Why not
withTagged t = withTagged' t . mapM_
./XMonad/Actions/TagWindows.hs:149:1: Warning: Eta reduce
Found
withTaggedGlobal t f = withTaggedGlobal' t (mapM_ f)
Why not
withTaggedGlobal t = withTaggedGlobal' t . mapM_
./XMonad/Actions/TagWindows.hs:155:1: Error: Use concatMap
Found
concat . map (W.integrate' . W.stack) . W.workspaces
Why not
concatMap (W.integrate' . W.stack) . W.workspaces
./XMonad/Actions/TagWindows.hs:165:1: Warning: Redundant brackets
Found
(W.current s) : (W.visible s)
Why not
W.current s : W.visible s
./XMonad/Actions/TagWindows.hs:181:1: Warning: Use liftM
Found
gets
  (concat . map (W.integrate' . W.stack) . W.workspaces . windowset)
  >>= mapM getTags
  >>= return . nub . concat
Why not
liftM (nub . concat)
  (gets
     (concat . map (W.integrate' . W.stack) . W.workspaces . windowset)
     >>= mapM getTags)
./XMonad/Actions/TagWindows.hs:181:1: Error: Use concatMap
Found
concat . map (W.integrate' . W.stack) . W.workspaces . windowset
Why not
concatMap (W.integrate' . W.stack) . W.workspaces . windowset
./XMonad/Actions/TagWindows.hs:187:1: Error: Use when
Found
if (sc /= []) then
  mkXPrompt TagPrompt c (mkComplFunFromList' sc)
    (\ s -> withFocused (delTag s))
  else return ()
Why not
when (sc /= []) $
  mkXPrompt TagPrompt c (mkComplFunFromList' sc)
    (\ s -> withFocused (delTag s))
./XMonad/Actions/TagWindows.hs:187:1: Warning: Redundant brackets
Found
if (sc /= []) then
  mkXPrompt TagPrompt c (mkComplFunFromList' sc)
    (\ s -> withFocused (delTag s))
  else return ()
Why not
if sc /= [] then
  mkXPrompt TagPrompt c (mkComplFunFromList' sc)
    (\ s -> withFocused (delTag s))
  else return ()
./XMonad/Actions/Commands.hs:63:1: Warning: Eta reduce
Found
commandMap c = M.fromList c
Why not
commandMap = M.fromList
./XMonad/Actions/Commands.hs:86:5: Error: Redundant $
Found
windows $ focusUp
Why not
windows focusUp
./XMonad/Actions/Commands.hs:86:5: Error: Redundant $
Found
windows $ focusDown
Why not
windows focusDown
./XMonad/Actions/Commands.hs:86:5: Error: Redundant $
Found
windows $ swapUp
Why not
windows swapUp
./XMonad/Actions/Commands.hs:86:5: Error: Redundant $
Found
windows $ swapDown
Why not
windows swapDown
./XMonad/Actions/Commands.hs:86:5: Error: Redundant $
Found
windows $ swapMaster
Why not
windows swapMaster
./XMonad/Actions/Submap.hs:61:1: Warning: Eta reduce
Found
submap keys = submapDefault (return ()) keys
Why not
submap = submapDefault (return ())
./XMonad/Actions/Submap.hs:65:1: Error: Use fromMaybe
Found
maybe def id
Why not
fromMaybe def
./XMonad/Actions/FlexibleManipulate.hs:81:19: Warning: Use liftM
Found
getWindowAttributes d w >>= return . winAttrs
Why not
liftM winAttrs (getWindowAttributes d w)
./XMonad/Actions/FlexibleManipulate.hs:83:13: Warning: Use liftM
Found
queryPointer d w >>= return . pointerPos
Why not
liftM pointerPos (queryPointer d w)
./XMonad/Actions/FlexibleManipulate.hs:114:1: Warning: Redundant brackets
Found
(x, y) : (pairUp xs)
Why not
(x, y) : pairUp xs
./XMonad/Actions/WindowBringer.hs:68:1: Warning: Eta reduce
Found
actionMenu action = actionMenu' "dmenu" action
Why not
actionMenu = actionMenu' "dmenu"
./XMonad/Actions/WindowBringer.hs:74:7: Warning: Eta reduce
Found
menuMapFunction selectionMap = menuMap menuCmd selectionMap
Why not
menuMapFunction = menuMap menuCmd
./XMonad/Actions/CycleWS.hs:221:5: Warning: Redundant brackets
Found
(- d)
Why not
- d
./XMonad/Actions/CycleWS.hs:232:9: Error: Redundant $
Found
filter wsPred $ pivoted
Why not
filter wsPred pivoted
./XMonad/Actions/CycleWS.hs:243:1: Warning: Eta reduce
Found
findWsIndex ws wss = findIndex ((== tag ws) . tag) wss
Why not
findWsIndex ws = findIndex ((== tag ws) . tag)
./XMonad/Actions/FocusNth.hs:41:33: Warning: Redundant brackets
Found
length (ls)
Why not
length ls
./XMonad/Actions/FocusNth.hs:41:33: Warning: Redundant brackets
Found
length (rs)
Why not
length rs
./XMonad/Hooks/ServerMode.hs:92:18: Error: Use zipWith
Found
map (uncurry (++)) .
  zip (map show ([1 ..] :: [Int])) . map ((++) " - " . fst)
Why not
zipWith (++) (map show ([1 ..] :: [Int])) . map ((++) " - " . fst)
./XMonad/Hooks/SetWMName.hs:75:5: Warning: Eta reduce
Found
latin1StringToCCharList str = map (fromIntegral . ord) str
Why not
latin1StringToCCharList = map (fromIntegral . ord)
./XMonad/Hooks/ManageDocks.hs:156:1: Warning: Eta reduce
Found
avoidStrutsOn ss = ModifiedLayout (AvoidStruts ss)
Why not
avoidStrutsOn = ModifiedLayout . AvoidStruts
./XMonad/Hooks/ManageDocks.hs:169:5: Warning: Use >>=
Found
do nr <- fmap ($ r) (calcGap ss)
   runLayout w nr
Why not
fmap ($ r) (calcGap ss) >>= runLayout w
./XMonad/Hooks/UrgencyHook.hs:202:1: Warning: Eta reduce
Found
withUrgencyHook hook conf
  = withUrgencyHookC hook urgencyConfig conf
Why not
withUrgencyHook hook = withUrgencyHookC hook urgencyConfig
./XMonad/Hooks/UrgencyHook.hs:283:1: Warning: Eta reduce
Found
adjustUrgents f = io $ modifyIORef urgents f
Why not
adjustUrgents = io . modifyIORef urgents
./XMonad/Hooks/UrgencyHook.hs:304:1: Warning: Eta reduce
Found
adjustReminders f = io $ modifyIORef reminders f
Why not
adjustReminders = io . modifyIORef reminders
./XMonad/Hooks/UrgencyHook.hs:327:7: Error: Redundant do
Found
do when (t == propertyNotify && a == wM_HINTS) $
     withDisplay $
       \ dpy ->
         do WMHints{wmh_flags = flags} <- io $ getWMHints dpy w
            if (testBit flags urgencyHintBit) then
              do adjustUrgents (\ ws -> if elem w ws then ws else w : ws)
                 callUrgencyHook wuh w
              else clearUrgency w
            userCodeDef () =<< asks (logHook . config)
Why not
when (t == propertyNotify && a == wM_HINTS) $
  withDisplay $
    \ dpy ->
      do WMHints{wmh_flags = flags} <- io $ getWMHints dpy w
         if (testBit flags urgencyHintBit) then
           do adjustUrgents (\ ws -> if elem w ws then ws else w : ws)
              callUrgencyHook wuh w
           else clearUrgency w
         userCodeDef () =<< asks (logHook . config)
./XMonad/Hooks/UrgencyHook.hs:328:72: Warning: Redundant brackets
Found
if (testBit flags urgencyHintBit) then
  do adjustUrgents (\ ws -> if elem w ws then ws else w : ws)
     callUrgencyHook wuh w
  else clearUrgency w
Why not
if testBit flags urgencyHintBit then
  do adjustUrgents (\ ws -> if elem w ws then ws else w : ws)
     callUrgencyHook wuh w
  else clearUrgency w
./XMonad/Hooks/DynamicLog.hs:175:1: Warning: Eta reduce
Found
xmobar conf = statusBar "xmobar" xmobarPP toggleStrutsKey conf
Why not
xmobar = statusBar "xmobar" xmobarPP toggleStrutsKey
./XMonad/Hooks/DynamicLog.hs:247:12: Error: Use mapM
Found
sequence $ map (flip catchX (return Nothing)) $ ppExtras pp
Why not
mapM (flip catchX (return Nothing)) (ppExtras pp)
./XMonad/Hooks/DynamicLog.hs:309:14: Warning: Redundant brackets
Found
(take (n - length end) xs) ++ end
Why not
take (n - length end) xs ++ end
./XMonad/Hooks/DynamicLog.hs:357:8: Warning: Use :
Found
"," ++ bg
Why not
',' : bg
./XMonad/Hooks/ManageHelpers.hs:109:1: Warning: Redundant brackets
Found
if b then (f m) else mempty
Why not
if b then f m else mempty
./XMonad/Hooks/ManageHelpers.hs:166:5: Warning: Eta reduce
Found
move mw = maybe idHook (doF . move') mw
Why not
move = maybe idHook (doF . move')
./XMonad/Hooks/FadeInactive.hs:65:1: Warning: Eta reduce
Found
fadeOut amt = flip setOpacity amt
Why not
fadeOut = flip setOpacity
./XMonad/Hooks/FadeInactive.hs:75:1: Warning: Eta reduce
Found
fadeInactiveLogHook amt = fadeOutLogHook isUnfocused amt
Why not
fadeInactiveLogHook = fadeOutLogHook isUnfocused
./XMonad/Hooks/EwmhDesktops.hs:98:63: Error: Redundant do
Found
do setWindowDesktop win curr
Why not
setWindowDesktop win curr
./XMonad/Hooks/EwmhDesktops.hs:104:58: Error: Redundant do
Found
do setWindowDesktop win wn
Why not
setWindowDesktop win wn
./XMonad/Hooks/EwmhDesktops.hs:129:29: Error: Redundant do
Found
do windows $ W.focusWindow w
Why not
windows $ W.focusWindow w
./XMonad/Hooks/EwmhDesktops.hs:129:29: Error: Redundant do
Found
do killWindow w
Why not
killWindow w
./XMonad/Hooks/EwmhDesktops.hs:129:29: Error: Redundant do
Found
do return ()
Why not
return ()
./XMonad/Hooks/EwmhDesktops.hs:178:9: Warning: Use string literal
Found
['\NUL']
Why not
"\NUL"
./XMonad/Hooks/XPropManage.hs:79:16: Error: Use concatMap
Found
concat . map splitAtNull
Why not
concatMap splitAtNull
./XMonad/Hooks/DynamicHooks.hs:73:1: Warning: Redundant brackets
Found
newIORef (DynamicHooks{transients = [], permanent = idHook})
Why not
newIORef DynamicHooks{transients = [], permanent = idHook}
./XMonad/Hooks/DynamicHooks.hs:90:7: Error: Use fromMaybe
Found
maybe (Endo id) id
Why not
fromMaybe (Endo id)
./XMonad/Hooks/DynamicHooks.hs:118:13: Warning: Redundant brackets
Found
(q, a) : (transients dh)
Why not
(q, a) : transients dh
./XMonad/Config/Kde.hs:45:1: Error: Redundant $
Found
M.fromList $
  [((modm, xK_p), spawn "dcop kdesktop default popupExecuteCommand"),
   ((modm .|. shiftMask, xK_q), spawn "dcop kdesktop default logout")]
Why not
M.fromList
  [((modm, xK_p), spawn "dcop kdesktop default popupExecuteCommand"),
   ((modm .|. shiftMask, xK_q), spawn "dcop kdesktop default logout")]
./XMonad/Config/Kde.hs:50:1: Error: Redundant $
Found
M.fromList $
  [((modm, xK_p), spawn "krunner"),
   ((modm .|. shiftMask, xK_q),
    spawn
      "dbus-send --print-reply --dest=org.kde.ksmserver /KSMServer org.kde.KSMServerInterface.logout int32:1 int32:0 int32:1")]
Why not
M.fromList
  [((modm, xK_p), spawn "krunner"),
   ((modm .|. shiftMask, xK_q),
    spawn
      "dbus-send --print-reply --dest=org.kde.ksmserver /KSMServer org.kde.KSMServerInterface.logout int32:1 int32:0 int32:1")]
./XMonad/Config/Azerty.hs:41:1: Warning: Use :
Found
[((modm, xK_semicolon), sendMessage (IncMasterN (- 1)))] ++
  [((m .|. modm, k), windows $ f i) |
   (i, k) <- zip (workspaces conf)
               [38, 233, 34, 39, 40, 45, 232, 95, 231, 224],
   (f, m) <- [(W.greedyView, 0), (W.shift, shiftMask)]]
Why not
((modm, xK_semicolon), sendMessage (IncMasterN (- 1))) :
  [((m .|. modm, k), windows $ f i) |
   (i, k) <- zip (workspaces conf)
               [38, 233, 34, 39, 40, 45, 232, 95, 231, 224],
   (f, m) <- [(W.greedyView, 0), (W.shift, shiftMask)]]
./XMonad/Config/Sjanssen.hs:31:28: Error: Redundant $
Found
M.fromList $
  [((modm, button1), (\ w -> focus w >> mouseMoveWindow w)),
   ((modm, button2), (\ w -> focus w >> windows W.swapMaster)),
   ((modm .|. shiftMask, button1),
    (\ w -> focus w >> mouseResizeWindow w))]
Why not
M.fromList
  [((modm, button1), (\ w -> focus w >> mouseMoveWindow w)),
   ((modm, button2), (\ w -> focus w >> windows W.swapMaster)),
   ((modm .|. shiftMask, button1),
    (\ w -> focus w >> mouseResizeWindow w))]
./XMonad/Config/Sjanssen.hs:49:5: Error: Redundant $
Found
M.fromList $
  [((modm, xK_p), shellPromptHere sp myPromptConfig),
   ((modm .|. shiftMask, xK_c), kill1),
   ((modm .|. shiftMask .|. controlMask, xK_c), kill),
   ((modm .|. shiftMask, xK_0), windows $ \ w -> foldr copy w ws),
   ((modm, xK_z), layoutScreens 2 $ TwoPane 0.5 0.5),
   ((modm .|. shiftMask, xK_z), rescreen)]
Why not
M.fromList
  [((modm, xK_p), shellPromptHere sp myPromptConfig),
   ((modm .|. shiftMask, xK_c), kill1),
   ((modm .|. shiftMask .|. controlMask, xK_c), kill),
   ((modm .|. shiftMask, xK_0), windows $ \ w -> foldr copy w ws),
   ((modm, xK_z), layoutScreens 2 $ TwoPane 0.5 0.5),
   ((modm .|. shiftMask, xK_z), rescreen)]
./XMonad/Config/Xfce.hs:38:1: Error: Redundant $
Found
M.fromList $
  [((modm, xK_p), spawn "xfrun4"),
   ((modm .|. shiftMask, xK_p), spawn "xfce4-appfinder"),
   ((modm .|. shiftMask, xK_q), spawn "xfce4-session-logout")]
Why not
M.fromList
  [((modm, xK_p), spawn "xfrun4"),
   ((modm .|. shiftMask, xK_p), spawn "xfce4-appfinder"),
   ((modm .|. shiftMask, xK_q), spawn "xfce4-session-logout")]
./XMonad/Config/Desktop.hs:33:1: Error: Redundant $
Found
M.fromList $ [((modm, xK_b), sendMessage ToggleStruts)]
Why not
M.fromList [((modm, xK_b), sendMessage ToggleStruts)]
./XMonad/Config/Desktop.hs:36:1: Warning: Eta reduce
Found
desktopLayoutModifiers layout = avoidStruts layout
Why not
desktopLayoutModifiers = avoidStruts
./XMonad/Config/Monad.hs:47:1: Error: Redundant $
Found
Layout $ Full
Why not
Layout Full