mirror of
https://github.com/xmonad/xmonad-contrib.git
synced 2025-07-31 20:21:51 -07:00
Import X.Prelude unqualified if necessary
This gets rid of, for example, The import of ‘liftA2’ from module ‘XMonad.Prelude’ is redundant -type warnings.
This commit is contained in:
@@ -47,7 +47,7 @@ module XMonad.Actions.MessageFeedback
|
||||
import XMonad ( Window )
|
||||
import XMonad.Core ( X(), Message, SomeMessage(..), LayoutClass(..), windowset, catchX, WorkspaceId, Layout, whenJust )
|
||||
import XMonad.Operations ( updateLayout, windowBracket, modifyWindowSet )
|
||||
import XMonad.Prelude ( isJust, liftA2, void )
|
||||
import XMonad.Prelude
|
||||
import XMonad.StackSet ( Workspace, current, workspace, layout, tag )
|
||||
|
||||
import Control.Monad.State ( gets )
|
||||
|
@@ -31,14 +31,8 @@ module XMonad.Actions.MostRecentlyUsed (
|
||||
) where
|
||||
|
||||
-- base
|
||||
import Data.Maybe (fromMaybe)
|
||||
import Data.List.NonEmpty (NonEmpty(..), nonEmpty)
|
||||
import Data.Monoid (All(..), Any)
|
||||
import Data.Foldable (for_)
|
||||
import Data.Functor (($>))
|
||||
import Data.List.NonEmpty (nonEmpty)
|
||||
import Data.IORef (newIORef, readIORef, writeIORef, modifyIORef)
|
||||
import Control.Applicative (liftA2)
|
||||
import Control.Monad (when, unless, join)
|
||||
import Control.Monad.IO.Class (MonadIO)
|
||||
|
||||
-- mtl
|
||||
@@ -68,7 +62,7 @@ import XMonad.Util.PureX
|
||||
(handlingRefresh, curScreenId, curTag, greedyView, view, peek, focusWindow)
|
||||
import XMonad.Util.History (History, origin, event, erase, ledger)
|
||||
import XMonad.Actions.Repeatable (repeatableSt)
|
||||
import XMonad.Prelude (Stream (..), cycleS)
|
||||
import XMonad.Prelude
|
||||
|
||||
-- }}}
|
||||
|
||||
|
@@ -50,7 +50,7 @@ import XMonad.Layout.LayoutModifier(ModifiedLayout(..),
|
||||
import XMonad(Message, WorkspaceId, X, XState(windowset),
|
||||
fromMessage, sendMessage, windows, gets)
|
||||
import XMonad.Util.Stack (reverseS)
|
||||
import XMonad.Prelude (find, fromJust, guard, liftA2, toList, when, (<=<))
|
||||
import XMonad.Prelude
|
||||
|
||||
-- $usage
|
||||
--
|
||||
|
Reference in New Issue
Block a user