1
+ {-# LANGUAGE TemplateHaskell #-}
1
2
module Rules
2
3
( loadGhcSession
3
4
, cradleToSession
@@ -13,33 +14,31 @@ import qualified Crypto.Hash.SHA1 as H
13
14
import Data.ByteString.Base16 (encode )
14
15
import qualified Data.ByteString.Char8 as B
15
16
import Data.Functor ((<&>) )
16
- import Data.Maybe ( fromMaybe )
17
- import Data.Text ( pack , Text )
17
+ import Data.Text ( Text , pack )
18
+ import Data.Version ( Version )
18
19
import Development.IDE.Core.Rules (defineNoFile )
19
20
import Development.IDE.Core.Service (getIdeOptions )
20
21
import Development.IDE.Core.Shake (actionLogger , sendEvent , define , useNoFile_ )
21
22
import Development.IDE.GHC.Util
22
23
import Development.IDE.Types.Location (fromNormalizedFilePath )
23
24
import Development.IDE.Types.Options (IdeOptions (IdeOptions , optTesting ))
24
25
import Development.Shake
25
- import DynFlags (gopt_set , gopt_unset ,
26
- updOptLevel )
27
26
import GHC
28
- import qualified GHC.Paths
27
+ import GHC.Check ( runTimeVersion , compileTimeVersionFromLibdir )
29
28
import HIE.Bios
30
29
import HIE.Bios.Cradle
31
30
import HIE.Bios.Environment (addCmdOpts )
32
31
import HIE.Bios.Types
33
32
import Linker (initDynLinker )
34
33
import RuleTypes
35
34
import qualified System.Directory.Extra as IO
36
- import System.Environment (lookupEnv )
37
35
import System.FilePath.Posix (addTrailingPathSeparator ,
38
36
(</>) )
39
37
import qualified Language.Haskell.LSP.Messages as LSP
40
38
import qualified Language.Haskell.LSP.Types as LSP
41
39
import Data.Aeson (ToJSON (toJSON ))
42
40
import Development.IDE.Types.Logger (logDebug )
41
+ import Util
43
42
44
43
-- Prefix for the cache path
45
44
cacheDir :: String
@@ -103,55 +102,33 @@ getComponentOptions cradle = do
103
102
-- That will require some more changes.
104
103
CradleNone -> fail " 'none' cradle is not yet supported"
105
104
105
+ compileTimeGhcVersion :: Version
106
+ compileTimeGhcVersion = $$ (compileTimeVersionFromLibdir getLibdir)
107
+
108
+ checkGhcVersion :: Ghc (Maybe HscEnvEq )
109
+ checkGhcVersion = do
110
+ v <- runTimeVersion
111
+ return $ if v == Just compileTimeGhcVersion
112
+ then Nothing
113
+ else Just GhcVersionMismatch {compileTime = compileTimeGhcVersion, runTime = v}
114
+
106
115
createSession :: ComponentOptions -> IO HscEnvEq
107
116
createSession (ComponentOptions theOpts _) = do
108
117
libdir <- getLibdir
109
118
110
119
cacheDir <- getCacheDir theOpts
111
120
112
- env <- runGhc (Just libdir) $ do
121
+ runGhc (Just libdir) $ do
113
122
dflags <- getSessionDynFlags
114
123
(dflags', _targets) <- addCmdOpts theOpts dflags
115
- _ <- setSessionDynFlags $
116
- -- disabled, generated directly by ghcide instead
117
- flip gopt_unset Opt_WriteInterface $
118
- -- disabled, generated directly by ghcide instead
119
- -- also, it can confuse the interface stale check
120
- dontWriteHieFiles $
121
- setHiDir cacheDir $
122
- setDefaultHieDir cacheDir $
123
- setIgnoreInterfacePragmas $
124
- setLinkerOptions $
125
- disableOptimisation dflags'
126
- getSession
127
- initDynLinker env
128
- newHscEnvEq env
129
-
130
- -- Set the GHC libdir to the nix libdir if it's present.
131
- getLibdir :: IO FilePath
132
- getLibdir = fromMaybe GHC.Paths. libdir <$> lookupEnv " NIX_GHC_LIBDIR"
133
-
134
- -- we don't want to generate object code so we compile to bytecode
135
- -- (HscInterpreted) which implies LinkInMemory
136
- -- HscInterpreted
137
- setLinkerOptions :: DynFlags -> DynFlags
138
- setLinkerOptions df = df {
139
- ghcLink = LinkInMemory
140
- , hscTarget = HscNothing
141
- , ghcMode = CompManager
142
- }
143
-
144
- setIgnoreInterfacePragmas :: DynFlags -> DynFlags
145
- setIgnoreInterfacePragmas df =
146
- gopt_set (gopt_set df Opt_IgnoreInterfacePragmas ) Opt_IgnoreOptimChanges
147
-
148
- disableOptimisation :: DynFlags -> DynFlags
149
- disableOptimisation df = updOptLevel 0 df
150
-
151
- setHiDir :: FilePath -> DynFlags -> DynFlags
152
- setHiDir f d =
153
- -- override user settings to avoid conflicts leading to recompilation
154
- d { hiDir = Just f}
124
+ setupDynFlags cacheDir dflags'
125
+ versionMismatch <- checkGhcVersion
126
+ case versionMismatch of
127
+ Just mismatch -> return mismatch
128
+ Nothing -> do
129
+ env <- getSession
130
+ liftIO $ initDynLinker env
131
+ liftIO $ newHscEnvEq env
155
132
156
133
getCacheDir :: [String ] -> IO FilePath
157
134
getCacheDir opts = IO. getXdgDirectory IO. XdgCache (cacheDir </> opts_hash)
0 commit comments