Skip to content
Merged
Show file tree
Hide file tree
Changes from all commits
Commits
Show all changes
94 commits
Select commit Hold shift + click to select a range
9dd4315
Support for 9.10
wz1000 May 7, 2024
6818217
Remove indexed-traversable allow-newer
jhrcek May 16, 2024
d188e46
Fix couple of warnings
jhrcek May 16, 2024
adebee5
Fix flags job for hls-graph
jhrcek May 16, 2024
263bd98
foldl' exposed from Prelude since base 4.20
jhrcek May 16, 2024
cd5d313
Fix flags job for hls-plugin-api
jhrcek May 16, 2024
d650b8a
Fix ghcide hover test
jhrcek May 16, 2024
2a6da3c
Fix flags job for hls-eval-plugin
jhrcek May 16, 2024
998a62a
unzip since 4.19
jhrcek May 16, 2024
3c738e3
More pedantic fixes
jhrcek May 16, 2024
125286e
Don't CPP in tests, fix another test
jhrcek May 16, 2024
55975ce
Switch to ghc-exactprint and witherable from hackage
jhrcek May 17, 2024
c4bd43c
Fix all warnings in hls-refactor-plugin
jhrcek May 17, 2024
8bfb302
Remove more no longer necessary allow newers
jhrcek May 17, 2024
0f86666
Fix all warnings in hls-gadp-plugin and hls-qualify-imported-names-pl…
jhrcek May 17, 2024
83da672
Remove allow-newer for boring
jhrcek May 17, 2024
9cd79b3
Bump to lsp 2.6, remove more allow-newers
jhrcek May 17, 2024
ed044ce
outline tests
wz1000 May 17, 2024
c7fa870
disable simple plugin on 9.10
wz1000 May 17, 2024
f29a55c
Remove allow-newer for ghc-trace-events
jhrcek May 18, 2024
31ff952
Merge master, resolve merge conflicts
jhrcek May 18, 2024
2746b1f
fix appendConstraint
soulomoon May 18, 2024
24e7831
stylish
soulomoon May 18, 2024
190894d
Remove commutative-semigroups and monoid-subclasses from allow-newer
jhrcek May 19, 2024
0e61fa3
Remove free from allow-newer
jhrcek May 19, 2024
f72f2d9
Fix 'type wilcard actions' tests
jhrcek May 19, 2024
b0e117b
Remove hie-bios from allow-newer
jhrcek May 19, 2024
2f3300e
Fix suggestNewDefinition tests
jhrcek May 19, 2024
86f28b7
Revert "Fix suggestNewDefinition tests"
jhrcek May 19, 2024
2be2b20
Remove makeDeltaAst breaking tests unrelated to addArgument
jhrcek May 20, 2024
cebd20d
Merge master
jhrcek May 21, 2024
d45aa21
Fix 79 code action tests
jhrcek May 21, 2024
be89b2d
Fix 12 more tests
jhrcek May 21, 2024
b8b0f1c
Remove co-log-core from allow-newer
jhrcek May 21, 2024
79b6eba
Fix 21 more tests
jhrcek May 21, 2024
a9d4b4b
Fix 8 import disambiguation tests
jhrcek May 22, 2024
5a4405d
fix windows ghcide tests
wz1000 May 22, 2024
5bf9e7d
Fix adding argument to function body
jhrcek May 23, 2024
45ee5ea
update retrie commit, progress in add argument tests
jhrcek May 23, 2024
e7b14fc
Fix few stylish-haskell parse errors
jhrcek May 23, 2024
80dd20f
Fix remaining redundant constraint tests
jhrcek May 26, 2024
5849e23
Merge branch 'master' into wip/9.10
soulomoon May 27, 2024
ba58c22
Remove allow-newer for constraint-extras
jhrcek May 28, 2024
d955f9a
Fix warnings after master merge
jhrcek May 28, 2024
0655fcc
Fix most add argument tests except for one
jhrcek May 28, 2024
625190d
Remove dependent-map from allow-newer
jhrcek May 28, 2024
6f60029
Try removing some allow-newers from lsp
michaelpj May 28, 2024
c4e607e
Ormolu is updated, add links for other tool dependencies
michaelpj May 28, 2024
cfdf0d7
Revert "Try removing some allow-newers from lsp"
michaelpj May 28, 2024
ebf876e
Try this
michaelpj May 28, 2024
7a8b116
Fix all gadt plugin and most class plugin tests, enable 2 tests for g…
jhrcek May 28, 2024
bf53e20
Undo spurious changes
jhrcek May 28, 2024
7530af8
Update eval plugin tests
jhrcek May 29, 2024
fca8500
Disable broken refactor plugin test for now
jhrcek May 29, 2024
cabdbfd
Merge branch 'master' into wip/9.10
jhrcek May 29, 2024
aee8cd6
Fix warnings
jhrcek May 29, 2024
d25ea19
Add source-repository-package to unblock floskell
jhrcek May 29, 2024
28cce35
Make call hierarchy plugin tests green
jhrcek May 29, 2024
de01710
fix semantic tokens 9.10
soulomoon May 29, 2024
7649381
Merge branch 'master' into wip/9.10
soulomoon May 29, 2024
07087f2
Fix remaining class plugin test
jhrcek May 30, 2024
91646e5
Merge branch 'master' into wip/9.10
jhrcek May 30, 2024
58aa714
Update hls-change-type tests
jhrcek May 30, 2024
ec02b11
Make class plugin more robust
jhrcek May 31, 2024
faf6ac2
Merge branch 'master' into wip/9.10
jhrcek Jun 1, 2024
3283c6b
Fix stylish parse errors, simplify CPP
jhrcek Jun 1, 2024
750ee5b
Cleanups
jhrcek Jun 1, 2024
07080c0
Remove retrie dep from hls-refactor-plugin
wz1000 Jun 3, 2024
61403b1
More retrie fixes
wz1000 Jun 3, 2024
ea62173
Fix cabal-plugin-tests by respecting maxCompletions client cfg + a bi…
jhrcek Jun 8, 2024
1350419
Merge branch 'master' into wip/9.10
jhrcek Jun 8, 2024
2923ac3
Merge branch 'master' into wip/9.10
soulomoon Jun 9, 2024
f687205
Fixup ghcide-tests
michaelpj Jun 10, 2024
4efb898
disable retrie, splice and floskell plugins for 9.10
wz1000 Jun 10, 2024
03fff2c
Merge branch 'master' into wip/9.10
jhrcek Jun 11, 2024
1b405cc
Update tested-with + fix import warning
jhrcek Jun 11, 2024
9d45176
Fix stylish
jhrcek Jun 11, 2024
b1447b6
Fix compilation with 9.2.8, fix stack jobs
jhrcek Jun 11, 2024
0a746f3
Remove no longer relevant :type +v test
jhrcek Jun 11, 2024
de8a315
Disable tests of disabled plugins in CI
jhrcek Jun 11, 2024
e1e3085
Try a better broken specifier?
michaelpj Jun 11, 2024
e64e117
Fix invalid CI config
jhrcek Jun 11, 2024
4f92fbf
Use getClientConfigAction instead of introducing new HandlerM action
jhrcek Jun 11, 2024
747b1c7
Move CPPd imports to prevent stylish from evaluating CPP
jhrcek Jun 11, 2024
8267cad
Disable stan tests with ghc 9.10 in CI
jhrcek Jun 11, 2024
efad46c
attempt fixing exactprint <9.10
wz1000 Jun 12, 2024
7142686
Try enabling fourmolu now
michaelpj Jun 12, 2024
eafeda8
Revert "Try enabling fourmolu now"
michaelpj Jun 12, 2024
dfe720d
Update code-range-plugin tests
jhrcek Jun 13, 2024
35a0002
Fix No newline at the end of file
jhrcek Jun 13, 2024
db3aa95
Use more recent cabal-gild
jhrcek Jun 13, 2024
333d5b0
Try setting some linker flags for macos
michaelpj Jun 13, 2024
acf9667
Merge branch 'master' into wip/9.10
michaelpj Jun 13, 2024
531b198
Ignore non-local variable completion test on windows for GHC 9.8
fendor Jun 13, 2024
File filter

Filter by extension

Filter by extension


Conversations
Failed to load comments.
Loading
Jump to
Jump to file
Failed to load files.
Loading
Diff view
Diff view
2 changes: 1 addition & 1 deletion .github/workflows/supported-ghc-versions.json
Original file line number Diff line number Diff line change
@@ -1 +1 @@
[ "9.8", "9.6", "9.4" , "9.2" ]
["9.10", "9.8", "9.6", "9.4" , "9.2" ]
23 changes: 15 additions & 8 deletions .github/workflows/test.yml
Original file line number Diff line number Diff line change
Expand Up @@ -98,7 +98,7 @@ jobs:
- uses: ./.github/actions/setup-build
with:
ghc: ${{ matrix.ghc }}
os: ${{ runner.os }}
os: ${{ runner.os }}

- name: Build
run: cabal build all
Expand Down Expand Up @@ -141,7 +141,8 @@ jobs:
name: Test hls-refactor-plugin
run: cabal test hls-refactor-plugin-tests || cabal test hls-refactor-plugin-tests

- if: matrix.test
# TODO enable when it supports 9.10
- if: matrix.test && matrix.ghc != '9.10'
name: Test hls-floskell-plugin
run: cabal test hls-floskell-plugin-tests || cabal test hls-floskell-plugin-tests

Expand All @@ -157,23 +158,27 @@ jobs:
name: Test hls-eval-plugin
run: cabal test hls-eval-plugin-tests || cabal test hls-eval-plugin-tests

- if: matrix.test
# TODO enable when it supports 9.10
- if: matrix.test && matrix.ghc != '9.10'
name: Test hls-splice-plugin
run: cabal test hls-splice-plugin-tests || cabal test hls-splice-plugin-tests

- if: matrix.test && matrix.ghc != '9.2'
# TODO enable when it supports 9.10
- if: matrix.test && matrix.ghc != '9.2' && matrix.ghc != '9.10'
name: Test hls-stan-plugin
run: cabal test hls-stan-plugin-tests || cabal test hls-stan-plugin-tests

- if: matrix.test
# TODO enable when it supports 9.10
- if: matrix.test && matrix.ghc != '9.10'
name: Test hls-stylish-haskell-plugin
run: cabal test hls-stylish-haskell-plugin-tests || cabal test hls-stylish-haskell-plugin-tests

- if: matrix.test
name: Test hls-ormolu-plugin
run: cabal test hls-ormolu-plugin-tests || cabal test hls-ormolu-plugin-tests

- if: matrix.test
# TODO enable when it supports 9.10
- if: matrix.test && matrix.ghc != '9.10'
name: Test hls-fourmolu-plugin
run: cabal test hls-fourmolu-plugin-tests || cabal test hls-fourmolu-plugin-tests

Expand All @@ -189,7 +194,8 @@ jobs:
name: Test hls-rename-plugin test suite
run: cabal test hls-rename-plugin-tests || cabal test hls-rename-plugin-tests

- if: matrix.test
# TODO enable when it supports 9.10
- if: matrix.test && matrix.ghc != '9.10'
name: Test hls-hlint-plugin test suite
run: cabal test hls-hlint-plugin-tests || cabal test hls-hlint-plugin-tests

Expand Down Expand Up @@ -238,7 +244,8 @@ jobs:
name: Test hls-cabal-plugin test suite
run: cabal test hls-cabal-plugin-tests || cabal test hls-cabal-plugin-tests

- if: matrix.test
# TODO enable when it supports 9.10
- if: matrix.test && matrix.ghc != '9.10'
name: Test hls-retrie-plugin test suite
run: cabal test hls-retrie-plugin-tests || cabal test hls-retrie-plugin-tests

Expand Down
31 changes: 28 additions & 3 deletions cabal.project
Original file line number Diff line number Diff line change
Expand Up @@ -7,12 +7,12 @@ packages:
./hls-plugin-api
./hls-test-utils

index-state: 2024-06-07T00:00:00Z
index-state: 2024-06-10T12:08:58Z

tests: True
test-show-details: direct

benchmarks: True
-- benchmarks: True

write-ghc-environment-files: never

Expand Down Expand Up @@ -40,4 +40,29 @@ constraints:
-- the flag '-fopen-simd', which blocked the release 2.2.0.0.
-- We want to be able to benefit from the performance optimisations
-- in the future, thus: TODO: remove this flag.
bitvec -simd
bitvec -simd,


if impl(ghc >= 9.9)
benchmarks: False
constraints:
lens >= 5.3.2,
-- See
-- https://github.com/haskell/stylish-haskell/issues/479
-- https://github.com/fourmolu/fourmolu/issues/412
-- https://github.com/ennocramer/floskell/pull/82
-- https://github.com/ndmitchell/hlint/pull/1594
haskell-language-server -stylishHaskell -fourmolu -hlint -retrie -splice -floskell,
allow-newer:
entropy:base,
entropy:directory,
entropy:filepath,
entropy:process,
haddock-library:base,
haddock-library:containers,
-- These can be removed when we get a new lsp release
quickcheck-instances:base,
quickcheck-instances:containers,
uuid-types:template-haskell,
else
benchmarks: True
2 changes: 1 addition & 1 deletion ghcide/ghcide.cabal
Original file line number Diff line number Diff line change
Expand Up @@ -14,7 +14,7 @@ homepage:
https://github.com/haskell/haskell-language-server/tree/master/ghcide#readme

bug-reports: https://github.com/haskell/haskell-language-server/issues
tested-with: GHC ==9.8.2 || ==9.6.5 || ==9.4.8 || ==9.2.8
tested-with: GHC ==9.10.1 || ==9.8.2 || ==9.6.5 || ==9.4.8 || ==9.2.8
extra-source-files:
CHANGELOG.md
README.md
Expand Down
2 changes: 1 addition & 1 deletion ghcide/src/Development/IDE/Core/Compile.hs
Original file line number Diff line number Diff line change
Expand Up @@ -76,7 +76,7 @@ import Development.IDE.Core.Shake
import Development.IDE.Core.Tracing (withTrace)
import Development.IDE.GHC.Compat hiding (loadInterface,
parseHeader, parseModule,
tcRnModule, writeHieFile)
tcRnModule, writeHieFile, assert)
import qualified Development.IDE.GHC.Compat as Compat
import qualified Development.IDE.GHC.Compat as GHC
import qualified Development.IDE.GHC.Compat.Util as Util
Expand Down
2 changes: 1 addition & 1 deletion ghcide/src/Development/IDE/Core/ProgressReporting.hs
Original file line number Diff line number Diff line change
Expand Up @@ -129,7 +129,7 @@ progressReporting (Just lspEnv) optProgressStyle = do
when (nextPct == prevPct) retry
pure (todo, done, nextPct)

update (ProgressAmount (Just nextPct) (Just $ T.pack $ show done <> "/" <> show todo))
_ <- update (ProgressAmount (Just nextPct) (Just $ T.pack $ show done <> "/" <> show todo))
loop update nextPct
updateStateForFile inProgress file = actionBracket (f succ) (const $ f pred) . const
-- This functions are deliberately eta-expanded to avoid space leaks.
Expand Down
8 changes: 4 additions & 4 deletions ghcide/src/Development/IDE/Core/RuleTypes.hs
Original file line number Diff line number Diff line change
Expand Up @@ -16,7 +16,7 @@ module Development.IDE.Core.RuleTypes(
) where

import Control.DeepSeq
import Control.Exception (assert)
import qualified Control.Exception as E
import Control.Lens
import Data.Aeson.Types (Value)
import Data.Hashable
Expand Down Expand Up @@ -188,9 +188,9 @@ hiFileFingerPrint HiFileResult{..} = hirIfaceFp <> maybe "" snd hirCoreFp

mkHiFileResult :: ModSummary -> ModIface -> ModDetails -> ModuleEnv ByteString -> Maybe (CoreFile, ByteString) -> HiFileResult
mkHiFileResult hirModSummary hirModIface hirModDetails hirRuntimeModules hirCoreFp =
assert (case hirCoreFp of Just (CoreFile{cf_iface_hash}, _)
-> getModuleHash hirModIface == cf_iface_hash
_ -> True)
E.assert (case hirCoreFp of
Just (CoreFile{cf_iface_hash}, _) -> getModuleHash hirModIface == cf_iface_hash
_ -> True)
HiFileResult{..}
where
hirIfaceFp = fingerprintToBS . getModuleHash $ hirModIface -- will always be two bytes
Expand Down
8 changes: 7 additions & 1 deletion ghcide/src/Development/IDE/GHC/CPP.hs
Original file line number Diff line number Diff line change
Expand Up @@ -34,6 +34,10 @@ import qualified GHC.Driver.Pipeline.Execute as Pipeline
import qualified GHC.SysTools.Cpp as Pipeline
#endif

#if MIN_VERSION_ghc(9,11,0)
import qualified GHC.SysTools.Tasks as Pipeline
#endif

addOptP :: String -> DynFlags -> DynFlags
addOptP f = alterToolSettings $ \s -> s
{ toolSettings_opt_P = f : toolSettings_opt_P s
Expand All @@ -52,7 +56,9 @@ doCpp env input_fn output_fn =
#if MIN_VERSION_ghc(9,5,0)
let cpp_opts = Pipeline.CppOpts
{ cppLinePragmas = True
#if MIN_VERSION_ghc(9,9,0)
#if MIN_VERSION_ghc(9,11,0)
, sourceCodePreprocessor = Pipeline.SCPHsCpp
#elif MIN_VERSION_ghc(9,10,0)
, useHsCpp = True
#else
, cppUseCc = False
Expand Down
13 changes: 10 additions & 3 deletions ghcide/src/Development/IDE/GHC/Compat.hs
Original file line number Diff line number Diff line change
Expand Up @@ -335,7 +335,11 @@ myCoreToStg logger dflags ictxt

return (stg_binds2, denv, cost_centre_info)


#if MIN_VERSION_ghc(9,9,0)
reLocA :: (HasLoc (GenLocated a e), HasAnnotation b)
=> GenLocated a e -> GenLocated b e
reLocA = reLoc
#endif

getDependentMods :: ModIface -> [ModuleName]
#if MIN_VERSION_ghc(9,3,0)
Expand Down Expand Up @@ -515,13 +519,16 @@ data GhcVersion
| GHC94
| GHC96
| GHC98
deriving (Eq, Ord, Show)
| GHC910
deriving (Eq, Ord, Show, Enum)

ghcVersionStr :: String
ghcVersionStr = VERSION_ghc

ghcVersion :: GhcVersion
#if MIN_VERSION_GLASGOW_HASKELL(9,8,0,0)
#if MIN_VERSION_GLASGOW_HASKELL(9,10,0,0)
ghcVersion = GHC910
#elif MIN_VERSION_GLASGOW_HASKELL(9,8,0,0)
ghcVersion = GHC98
#elif MIN_VERSION_GLASGOW_HASKELL(9,6,0,0)
ghcVersion = GHC96
Expand Down
37 changes: 33 additions & 4 deletions ghcide/src/Development/IDE/GHC/Compat/Core.hs
Original file line number Diff line number Diff line change
Expand Up @@ -197,7 +197,9 @@ module Development.IDE.GHC.Compat.Core (
pattern RealSrcLoc,
SrcLoc.SrcLoc(SrcLoc.UnhelpfulLoc),
BufSpan,
#if !MIN_VERSION_ghc(9,9,0)
GHC.SrcAnn,
#endif
SrcLoc.leftmost_smallest,
SrcLoc.containsSpan,
SrcLoc.mkGeneralSrcSpan,
Expand Down Expand Up @@ -494,8 +496,11 @@ import Data.Foldable (toList)
import GHC.Core.Multiplicity (scaledThing)
import GHC.Data.Bag
import GHC.Driver.Env
import GHC.Hs (HsModule (..), SrcSpanAnn')
import GHC.Hs.Decls hiding (FunDep)
import GHC.Hs (HsModule (..))
#if !MIN_VERSION_ghc(9,9,0)
import GHC.Hs (SrcSpanAnn')
#endif
import GHC.Hs.Decls hiding (FunDep)
import GHC.Hs.Doc
import GHC.Hs.Expr
import GHC.Hs.Extension
Expand Down Expand Up @@ -651,20 +656,36 @@ instance HasSrcSpan SrcSpan where
instance HasSrcSpan (SrcLoc.GenLocated SrcSpan a) where
getLoc = GHC.getLoc

#if MIN_VERSION_ghc(9,9,0)
instance HasSrcSpan (EpAnn a) where
getLoc = GHC.getHasLoc
#endif

#if MIN_VERSION_ghc(9,9,0)
instance HasSrcSpan (SrcLoc.GenLocated (EpAnn ann) a) where
getLoc (L l _) = getLoc l
#else
instance HasSrcSpan (SrcSpanAnn' ann) where
getLoc = GHC.locA
instance HasSrcSpan (SrcLoc.GenLocated (SrcSpanAnn' ann) a) where
getLoc (L l _) = l
#endif

pattern L :: HasSrcSpan a => SrcSpan -> e -> SrcLoc.GenLocated a e
pattern L l a <- GHC.L (getLoc -> l) a
{-# COMPLETE L #-}

-- This is from the old api, but it still simplifies
pattern ConPatIn :: SrcLoc.Located (ConLikeP GhcPs) -> HsConPatDetails GhcPs -> Pat GhcPs
#if MIN_VERSION_ghc(9,9,0)
pattern ConPatIn con args <- ConPat _ (L _ (SrcLoc.noLoc -> con)) args
where
ConPatIn con args = ConPat GHC.noAnn (GHC.noLocA $ SrcLoc.unLoc con) args
#else
pattern ConPatIn con args <- ConPat EpAnnNotUsed (L _ (SrcLoc.noLoc -> con)) args
where
ConPatIn con args = ConPat EpAnnNotUsed (GHC.noLocA $ SrcLoc.unLoc con) args
#endif

conPatDetails :: Pat p -> Maybe (HsConPatDetails p)
conPatDetails (ConPat _ _ args) = Just args
Expand All @@ -680,8 +701,16 @@ initObjLinker env =
GHCi.initObjLinker (GHCi.hscInterp env)

loadDLL :: HscEnv -> String -> IO (Maybe String)
loadDLL env =
GHCi.loadDLL (GHCi.hscInterp env)
loadDLL env str = do
res <- GHCi.loadDLL (GHCi.hscInterp env) str
#if MIN_VERSION_ghc(9,11,0)
pure $
case res of
Left err_msg -> Just err_msg
Right _ -> Nothing
#else
pure res
#endif

unload :: HscEnv -> [Linkable] -> IO ()
unload hsc_env linkables =
Expand Down
9 changes: 7 additions & 2 deletions ghcide/src/Development/IDE/GHC/Orphans.hs
Original file line number Diff line number Diff line change
Expand Up @@ -109,14 +109,19 @@ instance NFData ModSummary where
instance Ord FastString where
compare a b = if a == b then EQ else compare (fs_sbs a) (fs_sbs b)


#if MIN_VERSION_ghc(9,9,0)
instance NFData (EpAnn a) where
rnf = rwhnf
#else
instance NFData (SrcSpanAnn' a) where
rnf = rwhnf
deriving instance Functor SrcSpanAnn'
#endif

instance Bifunctor GenLocated where
bimap f g (L l x) = L (f l) (g x)

deriving instance Functor SrcSpanAnn'

instance NFData ParsedModule where
rnf = rwhnf

Expand Down
4 changes: 3 additions & 1 deletion ghcide/src/Development/IDE/LSP/Outline.hs
Original file line number Diff line number Diff line change
Expand Up @@ -271,7 +271,9 @@ hsConDeclsBinders cons

get_flds_gadt :: HsConDeclGADTDetails GhcPs
-> [LFieldOcc GhcPs]
#if MIN_VERSION_ghc(9,3,0)
#if MIN_VERSION_ghc(9,9,0)
get_flds_gadt (RecConGADT _ flds) = get_flds (reLoc flds)
#elif MIN_VERSION_ghc(9,3,0)
get_flds_gadt (RecConGADT flds _) = get_flds (reLoc flds)
#else
get_flds_gadt (RecConGADT flds) = get_flds (reLoc flds)
Expand Down
9 changes: 0 additions & 9 deletions ghcide/test/cabal/Development/IDE/Test/Runfiles.hs

This file was deleted.

1 change: 0 additions & 1 deletion ghcide/test/exe/BootTests.hs
Original file line number Diff line number Diff line change
Expand Up @@ -17,7 +17,6 @@ import Language.LSP.Protocol.Types hiding
mkRange)
import Language.LSP.Test
import System.FilePath ((</>))
import Test.Hls.FileSystem (toAbsFp)
import Test.Tasty
import Test.Tasty.HUnit

Expand Down
6 changes: 2 additions & 4 deletions ghcide/test/exe/ClientSettingsTests.hs
Original file line number Diff line number Diff line change
@@ -1,8 +1,7 @@
{-# LANGUAGE GADTs #-}
module ClientSettingsTests (tests) where

import Config (lspTestCaps, testWithConfig,
testWithDummyPluginEmpty)
import Config (testWithDummyPluginEmpty)
import Control.Applicative.Combinators
import Control.Monad
import Data.Aeson (toJSON)
Expand All @@ -16,8 +15,7 @@ import Language.LSP.Protocol.Types hiding
SemanticTokensEdit (..),
mkRange)
import Language.LSP.Test
import Test.Hls (testConfigCaps,
waitForProgressDone)
import Test.Hls (waitForProgressDone)
import Test.Tasty

tests :: TestTree
Expand Down
6 changes: 5 additions & 1 deletion ghcide/test/exe/CodeLensTests.hs
Original file line number Diff line number Diff line change
Expand Up @@ -88,7 +88,11 @@ addSigLensesTests =
, ("symbolKindTest = Proxy @\"qwq\"", "symbolKindTest :: Proxy \"qwq\"")
, ("promotedKindTest = Proxy @Nothing", if ghcVersion >= GHC96 then "promotedKindTest :: Proxy Nothing" else "promotedKindTest :: Proxy 'Nothing")
, ("typeOperatorTest = Refl", "typeOperatorTest :: forall {k} {a :: k}. a :~: a")
, ("notInScopeTest = mkCharType", "notInScopeTest :: String -> Data.Data.DataType")
, ("notInScopeTest = mkCharType"
, if ghcVersion < GHC910
then "notInScopeTest :: String -> Data.Data.DataType"
else "notInScopeTest :: String -> GHC.Internal.Data.Data.DataType"
)
, ("aVeryLongSignature a b c d e f g h i j k l m n = a && b && c && d && e && f && g && h && i && j && k && l && m && n", "aVeryLongSignature :: Bool -> Bool -> Bool -> Bool -> Bool -> Bool -> Bool -> Bool -> Bool -> Bool -> Bool -> Bool -> Bool -> Bool -> Bool")
]
in testGroup
Expand Down
Loading