Skip to content

Commit 3dfd2f0

Browse files
committed
remove unused imports from various modules
1 parent df6a8f4 commit 3dfd2f0

File tree

6 files changed

+5
-11
lines changed

6 files changed

+5
-11
lines changed

hls-graph/src/Development/IDE/WorkerThread.hs

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -32,7 +32,7 @@ import qualified Data.Text as T
3232

3333
import Control.Concurrent
3434
import Control.Exception (catch)
35-
import Control.Monad (void, when)
35+
import Control.Monad (when)
3636
import Debug.Trace (traceM)
3737
import Prettyprinter
3838

@@ -130,7 +130,7 @@ runInThreadStmInNewThreads getStep deliver (TaskQueue q) tthreads acts = do
130130
-- use barrier to wait for the result
131131
writeTQueue q (uninterruptibleMask $ \restore -> do
132132
curStep <- atomically getStep
133-
traceM ("runInThreadStmInNewThreads: current step: " ++ show curStep ++ " deliver step: " ++ show deliver)
133+
-- traceM ("runInThreadStmInNewThreads: current step: " ++ show curStep ++ " deliver step: " ++ show deliver)
134134
when (curStep == deliverStep deliver) $ do
135135
syncs <- mapM (\(act, handler) ->
136136
async (handler =<< (restore $ Right <$> act) `catch` \e@(SomeException _) -> return (Left e))) acts

plugins/hls-class-plugin/src/Ide/Plugin/Class/ExactPrint.hs

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -6,7 +6,6 @@ module Ide.Plugin.Class.ExactPrint where
66

77
import Control.Monad.Trans.Maybe
88
import Data.Either.Extra (eitherToMaybe)
9-
import Data.Functor.Identity (Identity)
109
import qualified Data.Text as T
1110
import Development.IDE.GHC.Compat
1211
import GHC.Parser.Annotation

plugins/hls-class-plugin/src/Ide/Plugin/Class/Types.hs

Lines changed: 2 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -22,7 +22,6 @@ import Development.IDE
2222
import Development.IDE.Core.PluginUtils (useMT)
2323
import qualified Development.IDE.Core.Shake as Shake
2424
import Development.IDE.GHC.Compat hiding (newUnique, (<+>))
25-
import Development.IDE.GHC.Compat.Util (bagToList)
2625
import Development.IDE.Graph.Classes
2726
import GHC.Generics
2827
import Ide.Plugin.Class.Utils
@@ -226,9 +225,8 @@ getInstanceBindTypeSigsRule recorder = do
226225
whenMaybe (isBindingName name) $ do
227226
env <- tcInitTidyEnv
228227
#if MIN_VERSION_ghc(9,11,0)
229-
let ty =
228+
let ty = tidyOpenType env (idType id)
230229
#else
231-
let (_, ty) =
230+
let (_, ty) = tidyOpenType env (idType id)
232231
#endif
233-
tidyOpenType env (idType id)
234232
pure $ InstanceBindTypeSig name ty

plugins/hls-explicit-record-fields-plugin/src/Ide/Plugin/ExplicitFields.hs

Lines changed: 1 addition & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -57,8 +57,7 @@ import Development.IDE.GHC.Compat (FieldLabel (flSelector),
5757
HsConDetails (RecCon),
5858
HsExpr (HsApp, HsVar, XExpr),
5959
HsFieldBind (hfbLHS),
60-
HsRecFields (..),
61-
HsWrap (HsWrap), LPat,
60+
HsRecFields (..), LPat,
6261
Located,
6362
NamedThing (getName),
6463
Outputable,

plugins/hls-notes-plugin/src/Ide/Plugin/Notes.hs

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -5,7 +5,6 @@ import Control.Monad.Except (ExceptT, MonadError,
55
throwError)
66
import Control.Monad.IO.Class (liftIO)
77
import qualified Data.Array as A
8-
import Data.Foldable (foldl')
98
import Data.HashMap.Strict (HashMap)
109
import qualified Data.HashMap.Strict as HM
1110
import qualified Data.HashSet as HS

plugins/hls-stylish-haskell-plugin/src/Ide/Plugin/StylishHaskell.hs

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -25,7 +25,6 @@ import Ide.PluginUtils
2525
import Ide.Types hiding (Config)
2626
import Language.Haskell.Stylish
2727
import Language.LSP.Protocol.Types as LSP
28-
import System.Directory
2928
import System.FilePath
3029

3130
data Log

0 commit comments

Comments
 (0)