Apply hlint 3.4 hints

This commit is contained in:
Tomas Janousek
2022-05-02 00:06:59 +01:00
parent 154388aa20
commit 3adb47235f
5 changed files with 7 additions and 6 deletions

View File

@@ -111,7 +111,7 @@ instance LayoutClass Mosaic a where
nextIx (ov,ix,mix)
| mix <= 0 || ov = fromIntegral $ nls `div` 2
| otherwise = max 0 $ (*fi (pred nls)) $ min 1 $ ix / fi mix
rect = rects !! maybe (nls `div` 2) round (nextIx <$> state)
rect = rects !! maybe (nls `div` 2) (round . nextIx) state
state' = fmap (\x@(ov,_,_) -> (ov,nextIx x,pred nls)) state
`mplus` Just (True,fromIntegral nls / 2,pred nls)
ss' = maybe ss (const ss `either` const ssExt) $ zipRemain ss ssExt

View File

@@ -35,6 +35,7 @@ module XMonad.Layout.MouseResizableTile (
) where
import XMonad hiding (tile, splitVertically, splitHorizontallyBy)
import XMonad.Prelude
import qualified XMonad.StackSet as W
import XMonad.Util.XUtils
import Graphics.X11 as X
@@ -146,7 +147,7 @@ instance LayoutClass MouseResizableTile Window where
(rightFracs st ++ repeat (slaveFrac st)) sr' num drg
rects' = map (mirrorAdjust id mirrorRect . sanitizeRectangle sr') rects
mapM_ deleteDragger $ draggers st
(draggerWrs, newDraggers) <- unzip <$> mapM
(draggerWrs, newDraggers) <- mapAndUnzipM
(createDragger sr . adjustForMirror (isMirrored st))
preparedDraggers
return (draggerWrs ++ zip wins rects', Just $ st { draggers = newDraggers,

View File

@@ -397,7 +397,7 @@ instance forall l. (Read (l Window), Show (l Window), LayoutClass l Window) => L
in fgs $ nxsAdd $ M.insert x zs $ M.delete yf gs
| otherwise = join <$> sequenceA (catchLayoutMess <$> fromMessage m)
| otherwise = join <$> traverse catchLayoutMess (fromMessage m)
where gs = toGroups sls
fgs gs' = do
st <- currentStack