[Git][ghc/ghc][wip/mi_top_env_serialise] ghci: Serialise mi_top_env
Matthew Pickering (@mpickering)
gitlab at gitlab.haskell.org
Fri Feb 28 13:46:00 UTC 2025
Matthew Pickering pushed to branch wip/mi_top_env_serialise at Glasgow Haskell Compiler / GHC
Commits:
02860e42 by Matthew Pickering at 2025-02-28T13:45:44+00:00
ghci: Serialise mi_top_env
When loading core from interface files (or from a bytecode object in
future) it's important to store what the top-level context of a module
is.
Otherwise, when you load the module into GHCi from the interface files,
only exported identifiers from the top-level module are in scope on the
repl.
See the added test which demonstrates what this enables.
The context at the GHCi prompt is everything that's in-scope in the
TopEnvIface module. Since TopEnvIface imports identifier "a", we can
evaluate "a" in the repl.
In addition to all this, we can use this information in order to
implement reifyModule in a more principled manner.
This becomes even more important when you're debugging and what to set
break-points on functions which are not imported.
- - - - -
16 changed files:
- compiler/GHC/Iface/Make.hs
- compiler/GHC/Iface/Syntax.hs
- compiler/GHC/IfaceToCore.hs
- compiler/GHC/Rename/Env.hs
- compiler/GHC/Rename/Names.hs
- compiler/GHC/Runtime/Eval.hs
- compiler/GHC/Tc/Types.hs
- compiler/GHC/Types/Avail.hs
- compiler/GHC/Types/Name/Reader.hs
- compiler/GHC/Types/PkgQual.hs
- compiler/GHC/Unit/Module/ModIface.hs
- testsuite/tests/ghci/should_run/Makefile
- + testsuite/tests/ghci/should_run/TopEnvIface.hs
- + testsuite/tests/ghci/should_run/TopEnvIface.stdout
- + testsuite/tests/ghci/should_run/TopEnvIface2.hs
- testsuite/tests/ghci/should_run/all.T
Changes:
=====================================
compiler/GHC/Iface/Make.hs
=====================================
@@ -47,7 +47,6 @@ import GHC.Core.RoughMap ( RoughMatchTc(..) )
import GHC.Driver.Config.HsToCore.Usage
import GHC.Driver.Env
-import GHC.Driver.Backend
import GHC.Driver.DynFlags
import GHC.Driver.Plugins
@@ -395,15 +394,12 @@ mkIface_ hsc_env
-- Desugar.addExportFlagsAndRules). The mi_top_env field is used
-- by GHCi to decide whether the module has its full top-level
-- scope available. (#5534)
- maybeGlobalRdrEnv :: GlobalRdrEnv -> Maybe IfaceTopEnv
+ maybeGlobalRdrEnv :: GlobalRdrEnv -> IfaceTopEnv
maybeGlobalRdrEnv rdr_env
- | backendWantsGlobalBindings (backend dflags)
- = Just $! let !exports = forceGlobalRdrEnv (globalRdrEnvLocal rdr_env)
- !imports = mkIfaceImports import_decls
- in IfaceTopEnv exports imports
- -- See Note [Forcing GREInfo] in GHC.Types.GREInfo.
| otherwise
- = Nothing
+ = let !exports = sortAvails $ gresToAvailInfo $ globalRdrEnvElts $ globalRdrEnvLocal rdr_env
+ !imports = mkIfaceImports import_decls
+ in IfaceTopEnv exports imports
ifFamInstTcName = ifFamInstFam
@@ -515,8 +511,8 @@ mkIfaceImports :: [ImportUserSpec] -> [IfaceImport]
mkIfaceImports = map go
where
go (ImpUserSpec decl ImpUserAll) = IfaceImport decl ImpIfaceAll
- go (ImpUserSpec decl (ImpUserExplicit env)) = IfaceImport decl (ImpIfaceExplicit (forceGlobalRdrEnv env))
- go (ImpUserSpec decl (ImpUserEverythingBut ns)) = IfaceImport decl (ImpIfaceEverythingBut ns)
+ go (ImpUserSpec decl (ImpUserExplicit env)) = IfaceImport decl (ImpIfaceExplicit (sortAvails env))
+ go (ImpUserSpec decl (ImpUserEverythingBut ns)) = IfaceImport decl (ImpIfaceEverythingBut (nameSetElemsStable ns))
mkIfaceExports :: [AvailInfo] -> [IfaceExport] -- Sort to make canonical
mkIfaceExports as = case sortAvails as of DefinitelyDeterministicAvails sas -> sas
=====================================
compiler/GHC/Iface/Syntax.hs
=====================================
@@ -26,7 +26,7 @@ module GHC.Iface.Syntax (
IfaceCompleteMatch(..),
IfaceLFInfo(..), IfaceTopBndrInfo(..),
IfaceImport(..),
- ImpIfaceList(..),
+ ImpIfaceList(..), IfaceExport,
-- * Binding names
IfaceTopBndr,
@@ -69,6 +69,7 @@ import GHC.Types.Name.Set
import GHC.Types.Name.Reader
import GHC.Types.CostCentre
import GHC.Types.Literal
+import GHC.Types.Avail
import GHC.Types.ForeignCall
import GHC.Types.Annotations( AnnPayload, AnnTarget )
import GHC.Types.Basic
@@ -112,12 +113,44 @@ infixl 3 &&&
************************************************************************
-}
+type IfaceExport = AvailInfo
+
data IfaceImport = IfaceImport ImpDeclSpec ImpIfaceList
data ImpIfaceList
= ImpIfaceAll -- ^ no user import list
- | ImpIfaceExplicit !IfGlobalRdrEnv
- | ImpIfaceEverythingBut !NameSet
+ | ImpIfaceExplicit !DetOrdAvails
+ | ImpIfaceEverythingBut ![Name]
+
+
+
+instance Binary IfaceImport where
+ put_ bh (IfaceImport declSpec ifaceList) = do
+ put_ bh declSpec
+ put_ bh ifaceList
+ get bh = do
+ declSpec <- get bh
+ ifaceList <- get bh
+ return (IfaceImport declSpec ifaceList)
+
+instance Binary ImpIfaceList where
+ put_ bh ImpIfaceAll = putByte bh 0
+ put_ bh (ImpIfaceExplicit env) = do
+ putByte bh 1
+ put_ bh env
+ put_ bh (ImpIfaceEverythingBut ns) = do
+ putByte bh 2
+ put_ @[Name] bh ns
+ get bh = do
+ tag <- getByte bh
+ case tag of
+ 0 -> return ImpIfaceAll
+ 1 -> do
+ env <- get bh
+ return (ImpIfaceExplicit env)
+ _ -> do
+ ns <- get @[Name] bh
+ return (ImpIfaceEverythingBut ns)
-- | A binding top-level 'Name' in an interface file (e.g. the name of an
-- 'IfaceDecl').
=====================================
compiler/GHC/IfaceToCore.hs
=====================================
@@ -104,6 +104,7 @@ import GHC.Types.SourceText
import GHC.Types.Basic hiding ( SuccessFlag(..) )
import GHC.Types.CompleteMatch
import GHC.Types.SrcLoc
+import GHC.Types.Avail
import GHC.Types.TypeEnv
import GHC.Types.Unique.FM
import GHC.Types.Unique.DSet ( mkUniqDSet )
@@ -114,7 +115,7 @@ import GHC.Types.Literal
import GHC.Types.Var as Var
import GHC.Types.Var.Set
import GHC.Types.Name
-import GHC.Types.Name.Reader
+import GHC.Types.Name.Set
import GHC.Types.Name.Env
import GHC.Types.DefaultEnv ( ClassDefaults(..), defaultEnv )
import GHC.Types.Id
@@ -2242,9 +2243,7 @@ hydrateCgBreakInfo CgBreakInfo{..} = do
-- | This function is only used to construct the environment for GHCi,
-- so we make up fake locations
-tcIfaceImport :: HscEnv -> IfaceImport -> ImportUserSpec
-tcIfaceImport _ (IfaceImport spec ImpIfaceAll) = ImpUserSpec spec ImpUserAll
-tcIfaceImport _ (IfaceImport spec (ImpIfaceEverythingBut ns)) = ImpUserSpec spec (ImpUserEverythingBut ns)
-tcIfaceImport hsc_env (IfaceImport spec (ImpIfaceExplicit gre)) = ImpUserSpec spec (ImpUserExplicit (hydrateGlobalRdrEnv get_GRE_info gre))
- where
- get_GRE_info nm = tyThingGREInfo <$> lookupGlobal hsc_env nm
+tcIfaceImport :: IfaceImport -> ImportUserSpec
+tcIfaceImport (IfaceImport spec ImpIfaceAll) = ImpUserSpec spec ImpUserAll
+tcIfaceImport (IfaceImport spec (ImpIfaceEverythingBut ns)) = ImpUserSpec spec (ImpUserEverythingBut (mkNameSet ns))
+tcIfaceImport (IfaceImport spec (ImpIfaceExplicit gre)) = ImpUserSpec spec (ImpUserExplicit (getDetOrdAvails gre))
=====================================
compiler/GHC/Rename/Env.hs
=====================================
@@ -2015,6 +2015,8 @@ lookupGREInfo hsc_env nm
-- and looks up the TyThing in the type environment.
--
-- See Note [Retrieving the GREInfo from interfaces] in GHC.Types.GREInfo.
+ -- Note: This function is very similar to 'tcIfaceGlobal', it would be better to
+ -- use that if possible.
= case nameModule_maybe nm of
Nothing -> UnboundGRE
Just mod ->
=====================================
compiler/GHC/Rename/Names.hs
=====================================
@@ -1189,7 +1189,7 @@ filterImports hsc_env iface decl_spec (Just (want_hiding, L l import_items))
(gres, imp_user_list) = case want_hiding of
Exactly ->
let gre_env = mkGlobalRdrEnv $ concatMap (gresFromIE decl_spec) items2
- in (gre_env, ImpUserExplicit gre_env)
+ in (gre_env, ImpUserExplicit (gresToAvailInfo $ globalRdrEnvElts $ gre_env))
EverythingBut ->
let hidden_names = mkNameSet $ concatMap (map greName . snd) items2
in (importsFromIface hsc_env iface decl_spec (Just hidden_names), ImpUserEverythingBut hidden_names)
=====================================
compiler/GHC/Runtime/Eval.hs
=====================================
@@ -53,7 +53,7 @@ import GHC.Driver.DynFlags
import GHC.Driver.Ppr
import GHC.Driver.Config
-import GHC.Rename.Names (importsFromIface)
+import GHC.Rename.Names (importsFromIface, gresFromAvails)
import GHC.Runtime.Eval.Types
import GHC.Runtime.Interpreter as GHCi
@@ -113,6 +113,7 @@ import GHC.Types.TyThing
import GHC.Types.Breakpoint
import GHC.Types.Unique.Map
+import GHC.Types.Avail
import GHC.Unit
import GHC.Unit.Module.Graph
import GHC.Unit.Module.ModIface
@@ -122,7 +123,7 @@ import GHC.Unit.Home.PackageTable
import GHC.Tc.Module ( runTcInteractive, tcRnType, loadUnqualIfaces )
import GHC.Tc.Solver (simplifyWantedsTcM)
-import GHC.Tc.Utils.Env (tcGetInstEnvs, lookupGlobal)
+import GHC.Tc.Utils.Env (tcGetInstEnvs) --lookupGlobal)
import GHC.Tc.Utils.Instantiate (instDFunType)
import GHC.Tc.Utils.Monad
import GHC.Tc.Zonk.Env ( ZonkFlexi (SkolemiseFlexi) )
@@ -848,21 +849,25 @@ mkTopLevEnv hsc_env modl
Nothing -> pure $ Left "not a home module"
Just details ->
case mi_top_env (hm_iface details) of
- Nothing -> pure $ Left "not interpreted"
- Just (IfaceTopEnv exports imports) -> do
+ (IfaceTopEnv exports imports) -> do
imports_env <-
runInteractiveHsc hsc_env
$ ioMsgMaybe $ hoistTcRnMessage $ runTcInteractive hsc_env
$ fmap (foldr plusGlobalRdrEnv emptyGlobalRdrEnv)
$ forM imports $ \iface_import -> do
- let ImpUserSpec spec details = tcIfaceImport hsc_env iface_import
+ let ImpUserSpec spec details = tcIfaceImport iface_import
iface <- loadSrcInterface (text "imported by GHCi") (moduleName $ is_mod spec) (is_isboot spec) (is_pkg_qual spec)
pure $ case details of
ImpUserAll -> importsFromIface hsc_env iface spec Nothing
ImpUserEverythingBut ns -> importsFromIface hsc_env iface spec (Just ns)
- ImpUserExplicit x -> x
- let get_GRE_info nm = tyThingGREInfo <$> lookupGlobal hsc_env nm
- let exports_env = hydrateGlobalRdrEnv get_GRE_info exports
+ ImpUserExplicit x ->
+ -- TODO: Not quite right, is_explicit should refer to whether the user wrote A(..) or A(x,y).
+ -- It is only used for error messages. It seems dubious even to add an import context to these GREs as
+ -- they are not "imported" into the top-level scope of the REPL. I changed this for now so that
+ -- the test case produce the same output as before.
+ let spec' = ImpSpec { is_decl = spec, is_item = ImpSome { is_explicit = True, is_iloc = noSrcSpan } }
+ in mkGlobalRdrEnv $ gresFromAvails hsc_env (Just spec') x
+ let exports_env = mkGlobalRdrEnv $ gresFromAvails hsc_env Nothing (getDetOrdAvails exports)
pure $ Right $ plusGlobalRdrEnv imports_env exports_env
where
hpt = hsc_HPT hsc_env
@@ -881,7 +886,7 @@ moduleIsInterpreted modl = withSession $ \h ->
if notHomeModule (hsc_home_unit h) modl
then return False
else liftIO (lookupHpt (hsc_HPT h) (moduleName modl)) >>= \case
- Just details -> return (isJust (mi_top_env (hm_iface details)))
+ Just hmi -> return (isJust $ homeModInfoByteCode hmi)
_not_a_home_module -> return False
-- | Looks up an identifier in the current interactive context (for :info)
=====================================
compiler/GHC/Tc/Types.hs
=====================================
@@ -206,7 +206,7 @@ data ImportUserSpec
data ImpUserList
= ImpUserAll -- ^ no user import list
- | ImpUserExplicit !GlobalRdrEnv
+ | ImpUserExplicit ![AvailInfo]
| ImpUserEverythingBut !NameSet
-- | A 'NameShape' is a substitution on 'Name's that can be used
=====================================
compiler/GHC/Types/Avail.hs
=====================================
@@ -22,7 +22,8 @@ module GHC.Types.Avail (
filterAvails,
nubAvails,
sortAvails,
- DetOrdAvails(DetOrdAvails, DefinitelyDeterministicAvails)
+ DetOrdAvails(DetOrdAvails, getDetOrdAvails, DefinitelyDeterministicAvails),
+ emptyDetOrdAvails
) where
import GHC.Prelude
@@ -74,7 +75,7 @@ type Avails = [AvailInfo]
-- We guarantee a deterministic order by either using the order explicitly
-- given by the user (e.g. in an explicit constructor export list) or instead
-- by sorting the avails with 'sortAvails'.
-newtype DetOrdAvails = DefinitelyDeterministicAvails Avails
+newtype DetOrdAvails = DefinitelyDeterministicAvails { getDetOrdAvails :: Avails }
deriving newtype (Binary, Outputable, NFData)
-- | It's always safe to match on 'DetOrdAvails'
@@ -245,3 +246,7 @@ instance Binary AvailInfo where
instance NFData AvailInfo where
rnf (Avail n) = rnf n
rnf (AvailTC a b) = rnf a `seq` rnf b
+
+-- | Create an empty DetOrdAvails
+emptyDetOrdAvails :: DetOrdAvails
+emptyDetOrdAvails = DefinitelyDeterministicAvails []
=====================================
compiler/GHC/Types/Name/Reader.hs
=====================================
@@ -133,6 +133,7 @@ import GHC.Unit.Module
import GHC.Utils.Misc as Utils
import GHC.Utils.Outputable
import GHC.Utils.Panic
+import GHC.Utils.Binary
import Control.DeepSeq
import Control.Monad ( guard )
@@ -1946,6 +1947,22 @@ data ImpDeclSpec
instance NFData ImpDeclSpec where
rnf = rwhnf -- Already strict in all fields
+instance Binary ImpDeclSpec where
+ put_ bh (ImpDeclSpec mod as pkg_qual qual _dloc isboot) = do
+ put_ bh mod
+ put_ bh as
+ put_ bh pkg_qual
+ put_ bh qual
+ put_ bh isboot
+
+ get bh = do
+ mod <- get bh
+ as <- get bh
+ pkg_qual <- get bh
+ qual <- get bh
+ isboot <- get bh
+ return (ImpDeclSpec mod as pkg_qual qual noSrcSpan isboot)
+
-- | Import Item Specification
--
-- Describes import info a particular Name
=====================================
compiler/GHC/Types/PkgQual.hs
=====================================
@@ -6,6 +6,7 @@ module GHC.Types.PkgQual where
import GHC.Prelude
import GHC.Types.SourceText
import GHC.Unit.Types
+import GHC.Utils.Binary
import GHC.Utils.Outputable
import Data.Data
@@ -38,4 +39,22 @@ instance Outputable PkgQual where
ThisPkg u -> doubleQuotes (ppr u)
OtherPkg u -> doubleQuotes (ppr u)
+instance Binary PkgQual where
+ put_ bh NoPkgQual = putByte bh 0
+ put_ bh (ThisPkg u) = do
+ putByte bh 1
+ put_ bh u
+ put_ bh (OtherPkg u) = do
+ putByte bh 2
+ put_ bh u
+
+ get bh = do
+ tag <- getByte bh
+ case tag of
+ 0 -> return NoPkgQual
+ 1 -> do u <- get bh
+ return (ThisPkg u)
+ _ -> do u <- get bh
+ return (OtherPkg u)
+
=====================================
compiler/GHC/Unit/Module/ModIface.hs
=====================================
@@ -111,7 +111,6 @@ import GHC.Types.Fixity
import GHC.Types.Fixity.Env
import GHC.Types.HpcInfo
import GHC.Types.Name
-import GHC.Types.Name.Reader (IfGlobalRdrEnv)
import GHC.Types.SafeHaskell
import GHC.Types.SourceFile
import GHC.Types.Unique.DSet
@@ -299,7 +298,7 @@ data ModIface_ (phase :: ModIfacePhase)
mi_defaults_ :: [IfaceDefault],
-- ^ default declarations exported by the module
- mi_top_env_ :: !(Maybe IfaceTopEnv),
+ mi_top_env_ :: IfaceTopEnv,
-- ^ Just enough information to reconstruct the top level environment in
-- the /original source/ code for this module. which
-- is NOT the same as mi_exports, nor mi_decls (which
@@ -365,13 +364,23 @@ data ModIface_ (phase :: ModIfacePhase)
-- Enough information to reconstruct the top level environment for a module
data IfaceTopEnv
= IfaceTopEnv
- { ifaceTopExports :: !IfGlobalRdrEnv -- ^ all top level things in this module, including unexported stuff
+ { ifaceTopExports :: !DetOrdAvails -- ^ all top level things in this module, including unexported stuff
, ifaceImports :: ![IfaceImport] -- ^ all the imports in this module
}
instance NFData IfaceTopEnv where
rnf (IfaceTopEnv a b) = rnf a `seq` rnf b
+instance Binary IfaceTopEnv where
+ put_ bh (IfaceTopEnv exports imports) = do
+ put_ bh exports
+ put_ bh imports
+ get bh = do
+ exports <- get bh
+ imports <- get bh
+ return (IfaceTopEnv exports imports)
+
+
{-
Note [Strictness in ModIface]
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
@@ -479,6 +488,7 @@ instance Binary ModIface where
mi_trust_ = trust,
mi_trust_pkg_ = trust_pkg,
mi_complete_matches_ = complete_matches,
+ mi_top_env_ = top_env,
mi_docs_ = docs,
mi_ext_fields_ = _ext_fields, -- Don't `put_` this in the instance so we
-- can deal with it's pointer in the header
@@ -526,6 +536,7 @@ instance Binary ModIface where
put_ bh trust
put_ bh trust_pkg
put_ bh complete_matches
+ lazyPut bh top_env
lazyPutMaybe bh docs
get bh = do
@@ -560,6 +571,7 @@ instance Binary ModIface where
trust <- get bh
trust_pkg <- get bh
complete_matches <- get bh
+ top_env <- lazyGet bh
docs <- lazyGetMaybe bh
return (PrivateModIface {
mi_module_ = mod,
@@ -582,7 +594,6 @@ instance Binary ModIface where
mi_decls_ = decls,
mi_extra_decls_ = extra_decls,
mi_foreign_ = foreign_,
- mi_top_env_ = Nothing,
mi_defaults_ = defaults,
mi_insts_ = insts,
mi_fam_insts_ = fam_insts,
@@ -593,6 +604,7 @@ instance Binary ModIface where
-- And build the cached values
mi_complete_matches_ = complete_matches,
mi_docs_ = docs,
+ mi_top_env_ = top_env,
mi_ext_fields_ = emptyExtensibleFields, -- placeholder because this is dealt
-- with specially when the file is read
mi_final_exts_ = ModIfaceBackend {
@@ -613,8 +625,6 @@ instance Binary ModIface where
}})
--- | The original names declared of a certain module that are exported
-type IfaceExport = AvailInfo
emptyPartialModIface :: Module -> PartialModIface
emptyPartialModIface mod
@@ -638,7 +648,7 @@ emptyPartialModIface mod
mi_decls_ = [],
mi_extra_decls_ = Nothing,
mi_foreign_ = emptyIfaceForeign,
- mi_top_env_ = Nothing,
+ mi_top_env_ = IfaceTopEnv emptyDetOrdAvails [] ,
mi_hpc_ = False,
mi_trust_ = noIfaceTrustInfo,
mi_trust_pkg_ = False,
@@ -817,8 +827,7 @@ addSourceFingerprint val iface = iface { mi_src_hash_ = val }
-- the in-memory byte array buffer 'mi_hi_bytes'.
restoreFromOldModIface :: ModIface_ phase -> ModIface_ phase -> ModIface_ phase
restoreFromOldModIface old new = new
- { mi_top_env_ = mi_top_env_ old
- , mi_hsc_src_ = mi_hsc_src_ old
+ { mi_hsc_src_ = mi_hsc_src_ old
, mi_src_hash_ = mi_src_hash_ old
}
@@ -879,7 +888,7 @@ set_mi_extra_decls val iface = clear_mi_hi_bytes $ iface { mi_extra_decls_ = val
set_mi_foreign :: IfaceForeign -> ModIface_ phase -> ModIface_ phase
set_mi_foreign foreign_ iface = clear_mi_hi_bytes $ iface { mi_foreign_ = foreign_ }
-set_mi_top_env :: Maybe IfaceTopEnv -> ModIface_ phase -> ModIface_ phase
+set_mi_top_env :: IfaceTopEnv -> ModIface_ phase -> ModIface_ phase
set_mi_top_env val iface = clear_mi_hi_bytes $ iface { mi_top_env_ = val }
set_mi_hpc :: AnyHpcUsage -> ModIface_ phase -> ModIface_ phase
@@ -996,7 +1005,7 @@ pattern ModIface ::
[IfaceExport] -> Bool -> [(OccName, Fixity)] -> IfaceWarnings ->
[IfaceAnnotation] -> [IfaceDeclExts phase] ->
Maybe [IfaceBindingX IfaceMaybeRhs IfaceTopBndrInfo] -> IfaceForeign ->
- [IfaceDefault] -> Maybe IfaceTopEnv -> [IfaceClsInst] -> [IfaceFamInst] -> [IfaceRule] ->
+ [IfaceDefault] -> IfaceTopEnv -> [IfaceClsInst] -> [IfaceFamInst] -> [IfaceRule] ->
AnyHpcUsage -> IfaceTrustInfo -> Bool -> [IfaceCompleteMatch] -> Maybe Docs ->
IfaceBackendExts phase -> ExtensibleFields -> Fingerprint -> IfaceBinHandle phase ->
ModIface_ phase
=====================================
testsuite/tests/ghci/should_run/Makefile
=====================================
@@ -7,3 +7,9 @@ T3171:
echo "do Control.Concurrent.threadDelay 3000000; putStrLn \"threadDelay was not interrupted\"" | \
"$(TEST_HC)" $(TEST_HC_OPTS_INTERACTIVE) & \
sleep 2; kill -INT $$!; wait
+
+TopEnvIface:
+ "$(TEST_HC)" $(TEST_HC_OPTS_INTERACTIVE) TopEnvIface -v1 -e "a" -e ":q" -fwrite-if-simplified-core -fwrite-interface
+ # Second compilation starts from interface files, but still can print "a"
+ "$(TEST_HC)" $(TEST_HC_OPTS_INTERACTIVE) TopEnvIface -v1 -e "a" -e ":q" -fwrite-if-simplified-core -fwrite-interface
+
=====================================
testsuite/tests/ghci/should_run/TopEnvIface.hs
=====================================
@@ -0,0 +1,4 @@
+module TopEnvIface where
+
+import TopEnvIface2
+
=====================================
testsuite/tests/ghci/should_run/TopEnvIface.stdout
=====================================
@@ -0,0 +1,8 @@
+[1 of 2] Compiling TopEnvIface2 ( TopEnvIface2.hs, interpreted )
+[2 of 2] Compiling TopEnvIface ( TopEnvIface.hs, interpreted )
+Ok, two modules loaded.
+"I should be printed twice"
+Leaving GHCi.
+Ok, two modules loaded.
+"I should be printed twice"
+Leaving GHCi.
=====================================
testsuite/tests/ghci/should_run/TopEnvIface2.hs
=====================================
@@ -0,0 +1,3 @@
+module TopEnvIface2 where
+
+a = "I should be printed twice"
=====================================
testsuite/tests/ghci/should_run/all.T
=====================================
@@ -96,3 +96,4 @@ test('LargeBCO', [extra_files(['LargeBCO_A.hs']), req_interp, extra_hc_opts("-O
test('T24115', just_ghci + [extra_run_opts("-e ':add T24115.hs'")], ghci_script, ['T24115.script'])
test('T10920', [only_ways(ghci_ways), extra_files(['LocalPrelude/Prelude.hs'])], ghci_script, ['T10920.script'])
+test('TopEnvIface', [only_ways(ghci_ways)], makefile_test, [])
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/02860e424473722a4a8922cae80a2ef49a6a98bf
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/02860e424473722a4a8922cae80a2ef49a6a98bf
You're receiving this email because of your account on gitlab.haskell.org.
-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://mail.haskell.org/pipermail/ghc-commits/attachments/20250228/6749cb72/attachment-0001.html>
More information about the ghc-commits
mailing list