Skip to content

Commit

Permalink
Remove the call to singleton
Browse files Browse the repository at this point in the history
  • Loading branch information
jecaro authored and geekosaur committed May 20, 2024
1 parent d014d7a commit da3e4be
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions XMonad/Layout/Columns.hs
Original file line number Diff line number Diff line change
Expand Up @@ -47,7 +47,7 @@ import Control.Monad (guard)
import Control.Monad.State (modify)
import Control.Monad.Trans.Maybe (MaybeT (..))
import Data.Foldable (Foldable (..))
import Data.List (scanl', singleton)
import Data.List (scanl')
import Data.Maybe (listToMaybe)
import Data.Ratio ((%))
import XMonad
Expand Down Expand Up @@ -358,7 +358,7 @@ mapWindow :: (Window -> Window) -> Columns -> Columns
mapWindow = fmap . fmap . fmap . fmap

columnsToWindows :: Columns -> [Window]
columnsToWindows = foldMap (singleton . snd) . foldMap snd
columnsToWindows = foldMap ((:[]) . snd) . foldMap snd

swapWindowBetween ::
Window ->
Expand Down

0 comments on commit da3e4be

Please sign in to comment.