Skip to content

Commit d351ef4

Browse files
committed
remove leftover comments from old impl
1 parent e0810dd commit d351ef4

File tree

1 file changed

+1
-30
lines changed

1 file changed

+1
-30
lines changed

XMonad/Layout/PerScreen.hs

Lines changed: 1 addition & 30 deletions
Original file line numberDiff line numberDiff line change
@@ -113,33 +113,4 @@ ifWider :: (LayoutClass l1 a, LayoutClass l2 a)
113113
-> l2 a -- ^ layout to use otherwise
114114
-> BW.PerScreen l1 l2 a
115115
ifWider = BW.ifWider
116-
{-# DEPRECATED ifWider "Use XMonad.Layout.ByWidth.ifWider instead" #-}
117-
118-
{-
119-
data ByWidth l1 l2 a = ByWidth Dimension Bool (l1 a) (l2 a) deriving (Read, Show)
120-
121-
-- | Construct new ByWidth values with possibly modified layouts.
122-
mkNewByWidthT :: ByWidth l1 l2 a -> Maybe (l1 a) ->
123-
ByWidth l1 l2 a
124-
mkNewByWidthT (ByWidth w _ lt lf) mlt' =
125-
(\lt' -> ByWidth w True lt' lf) $ fromMaybe lt mlt'
126-
127-
mkNewByWidthF :: ByWidth l1 l2 a -> Maybe (l2 a) ->
128-
ByWidth l1 l2 a
129-
mkNewByWidthF (ByWidth w _ lt lf) mlf' =
130-
ByWidth w False lt $ fromMaybe lf mlf'
131-
132-
instance (LayoutClass l1 a, LayoutClass l2 a, Show a) => LayoutClass (ByWidth l1 l2) a where
133-
runLayout (W.Workspace i p@(ByWidth w _ lt lf) ms) r
134-
| rect_width r > w = do (wrs, mlt') <- runLayout (W.Workspace i lt ms) r
135-
return (wrs, Just $ mkNewByWidthT p mlt')
136-
| otherwise = do (wrs, mlt') <- runLayout (W.Workspace i lf ms) r
137-
return (wrs, Just $ mkNewByWidthF p mlt')
138-
139-
handleMessage (ByWidth w bool lt lf) m
140-
| bool = handleMessage lt m >>= maybe (return Nothing) (\nt -> return . Just $ ByWidth w bool nt lf)
141-
| otherwise = handleMessage lf m >>= maybe (return Nothing) (return . Just . ByWidth w bool lt)
142-
143-
description (ByWidth _ True l1 _) = description l1
144-
description (ByWidth _ _ _ l2) = description l2
145-
-}
116+
{-# DEPRECATED ifWider "Use XMonad.Layout.ByWidth.ifWider instead" #-}

0 commit comments

Comments
 (0)