2 % (c) The University of Glasgow 2006
3 % (c) The GRASP/AQUA Project, Glasgow University, 1992-1998
6 The Desugarer: turning HsSyn into Core.
10 -- The above warning supression flag is a temporary kludge.
11 -- While working on this module you are encouraged to remove it and fix
12 -- any warnings in the module. See
13 -- http://hackage.haskell.org/trac/ghc/wiki/Commentary/CodingStyle#Warnings
16 module Desugar ( deSugar, deSugarExpr ) where
18 #include "HsVersions.h"
35 import DsExpr () -- Forces DsExpr to be compiled; DsBinds only
36 -- depends on DsExpr.hi-boot.
58 %************************************************************************
60 %* The main function: deSugar
62 %************************************************************************
65 deSugar :: HscEnv -> ModLocation -> TcGblEnv -> IO (Maybe ModGuts)
66 -- Can modify PCS by faulting in more declarations
70 tcg_env@(TcGblEnv { tcg_mod = mod,
72 tcg_type_env = type_env,
73 tcg_imports = imports,
74 tcg_exports = exports,
76 tcg_inst_uses = dfun_uses_var,
79 tcg_rdr_env = rdr_env,
80 tcg_fix_env = fix_env,
81 tcg_inst_env = inst_env,
82 tcg_fam_inst_env = fam_inst_env,
83 tcg_deprecs = deprecs,
88 tcg_fam_insts = fam_insts,
89 tcg_hpc = other_hpc_info })
91 = do { let dflags = hsc_dflags hsc_env
92 ; showPass dflags "Desugar"
94 -- Desugar the program
95 ; let export_set = availsToNameSet exports
96 ; let auto_scc = mkAutoScc mod export_set
97 ; let target = hscTarget dflags
98 ; let hpcInfo = emptyHpcInfo other_hpc_info
99 ; mb_res <- case target of
100 HscNothing -> return (Just ([], [], NoStubs, hpcInfo, emptyModBreaks))
101 _ -> do (binds_cvr,ds_hpc_info, modBreaks)
103 || target == HscInterpreted)
104 && (not (isHsBoot hsc_src))
105 then addCoverageTicksToBinds dflags mod mod_loc (typeEnvTyCons type_env) binds
106 else return (binds, hpcInfo, emptyModBreaks)
107 initDs hsc_env mod rdr_env type_env $ do
108 { core_prs <- dsTopLHsBinds auto_scc binds_cvr
109 ; (ds_fords, foreign_prs) <- dsForeigns fords
110 ; let all_prs = foreign_prs ++ core_prs
111 local_bndrs = mkVarSet (map fst all_prs)
112 ; ds_rules <- mappM (dsRule mod local_bndrs) rules
113 ; return (all_prs, catMaybes ds_rules, ds_fords, ds_hpc_info, modBreaks)
116 Nothing -> return Nothing ;
117 Just (all_prs, ds_rules, ds_fords,ds_hpc_info, modBreaks) -> do
119 { -- Add export flags to bindings
120 keep_alive <- readIORef keep_var
121 ; let final_prs = addExportFlags target export_set
122 keep_alive all_prs ds_rules
123 ds_binds = [Rec final_prs]
124 -- Notice that we put the whole lot in a big Rec, even the foreign binds
125 -- When compiling PrelFloat, which defines data Float = F# Float#
126 -- we want F# to be in scope in the foreign marshalling code!
127 -- You might think it doesn't matter, but the simplifier brings all top-level
128 -- things into the in-scope set before simplifying; so we get no unfolding for F#!
130 -- Lint result if necessary
131 ; endPass dflags "Desugar" Opt_D_dump_ds ds_binds
134 ; doIfSet (dopt Opt_D_dump_ds dflags)
135 (printDump (ppr_ds_rules ds_rules))
137 ; dfun_uses <- readIORef dfun_uses_var -- What dfuns are used
138 ; th_used <- readIORef th_var -- Whether TH is used
139 ; let used_names = allUses dus `unionNameSets` dfun_uses
140 pkgs | th_used = insertList thPackageId (imp_dep_pkgs imports)
141 | otherwise = imp_dep_pkgs imports
143 dep_mods = eltsUFM (delFromUFM (imp_dep_mods imports) (moduleName mod))
144 -- M.hi-boot can be in the imp_dep_mods, but we must remove
145 -- it before recording the modules on which this one depends!
146 -- (We want to retain M.hi-boot in imp_dep_mods so that
147 -- loadHiBootInterface can see if M's direct imports depend
148 -- on M.hi-boot, and hence that we should do the hi-boot consistency
151 dir_imp_mods = imp_mods imports
153 ; usages <- mkUsageInfo hsc_env dir_imp_mods dep_mods used_names
156 -- Modules don't compare lexicographically usually,
157 -- but we want them to do so here.
158 le_mod :: Module -> Module -> Bool
159 le_mod m1 m2 = moduleNameFS (moduleName m1)
160 <= moduleNameFS (moduleName m2)
161 le_dep_mod :: (ModuleName, IsBootInterface) -> (ModuleName, IsBootInterface) -> Bool
162 le_dep_mod (m1,_) (m2,_) = moduleNameFS m1 <= moduleNameFS m2
164 deps = Deps { dep_mods = sortLe le_dep_mod dep_mods,
165 dep_pkgs = sortLe (<=) pkgs,
166 dep_orphs = sortLe le_mod (imp_orphs imports),
167 dep_finsts = sortLe le_mod (imp_finsts imports) }
168 -- sort to get into canonical order
172 mg_boot = isHsBoot hsc_src,
173 mg_exports = exports,
176 mg_dir_imps = [m | (m, _) <- moduleEnvElts dir_imp_mods],
177 mg_rdr_env = rdr_env,
178 mg_fix_env = fix_env,
179 mg_deprecs = deprecs,
182 mg_fam_insts = fam_insts,
183 mg_inst_env = inst_env,
184 mg_fam_inst_env = fam_inst_env,
187 mg_foreign = ds_fords,
188 mg_hpc_info = ds_hpc_info,
189 mg_modBreaks = modBreaks,
190 mg_vect_info = noVectInfo
192 ; return (Just mod_guts)
195 mkAutoScc :: Module -> NameSet -> AutoScc
196 mkAutoScc mod exports
197 | not opt_SccProfilingOn -- No profiling
199 | opt_AutoSccsOnAllToplevs -- Add auto-scc on all top-level things
200 = AddSccs mod (\id -> True)
201 | opt_AutoSccsOnExportedToplevs -- Only on exported things
202 = AddSccs mod (\id -> idName id `elemNameSet` exports)
207 deSugarExpr :: HscEnv
208 -> Module -> GlobalRdrEnv -> TypeEnv
210 -> IO (Maybe CoreExpr)
211 -- Prints its own errors; returns Nothing if error occurred
213 deSugarExpr hsc_env this_mod rdr_env type_env tc_expr
214 = do { let dflags = hsc_dflags hsc_env
215 ; showPass dflags "Desugar"
218 ; mb_core_expr <- initDs hsc_env this_mod rdr_env type_env $
221 ; case mb_core_expr of {
222 Nothing -> return Nothing ;
226 dumpIfSet_dyn dflags Opt_D_dump_ds "Desugared" (pprCoreExpr expr)
228 ; return (Just expr) } } }
231 -- Set the no-discard flag if either
232 -- a) the Id is exported
233 -- b) it's mentioned in the RHS of an orphan rule
234 -- c) it's in the keep-alive set
236 -- It means that the binding won't be discarded EVEN if the binding
237 -- ends up being trivial (v = w) -- the simplifier would usually just
238 -- substitute w for v throughout, but we don't apply the substitution to
239 -- the rules (maybe we should?), so this substitution would make the rule
242 -- You might wonder why exported Ids aren't already marked as such;
243 -- it's just because the type checker is rather busy already and
244 -- I didn't want to pass in yet another mapping.
246 addExportFlags target exports keep_alive prs rules
247 = [(add_export bndr, rhs) | (bndr,rhs) <- prs]
250 | dont_discard bndr = setIdExported bndr
253 orph_rhs_fvs = unionVarSets [ ruleRhsFreeVars rule
255 not (isLocalRule rule) ]
256 -- A non-local rule keeps alive the free vars of its right-hand side.
257 -- (A "non-local" is one whose head function is not locally defined.)
258 -- Local rules are (later, after gentle simplification)
259 -- attached to the Id, and that keeps the rhs free vars alive.
261 dont_discard bndr = is_exported name
262 || name `elemNameSet` keep_alive
263 || bndr `elemVarSet` orph_rhs_fvs
267 -- In interactive mode, we don't want to discard any top-level
268 -- entities at all (eg. do not inline them away during
269 -- simplification), and retain them all in the TypeEnv so they are
270 -- available from the command line.
272 -- isExternalName separates the user-defined top-level names from those
273 -- introduced by the type checker.
274 is_exported :: Name -> Bool
275 is_exported | target == HscInterpreted = isExternalName
276 | otherwise = (`elemNameSet` exports)
278 ppr_ds_rules [] = empty
280 = text "" $$ text "-------------- DESUGARED RULES -----------------" $$
286 %************************************************************************
288 %* Desugaring transformation rules
290 %************************************************************************
293 dsRule :: Module -> IdSet -> LRuleDecl Id -> DsM (Maybe CoreRule)
294 dsRule mod in_scope (L loc (HsRule name act vars lhs tv_lhs rhs fv_rhs))
296 do { let bndrs = [var | RuleBndr (L _ var) <- vars]
297 ; lhs' <- dsLExpr lhs
298 ; rhs' <- dsLExpr rhs
300 ; case decomposeRuleLhs (occurAnalyseExpr lhs') of {
301 Nothing -> do { warnDs msg; return Nothing } ;
302 Just (fn_id, args) -> do
304 -- Substitute the dict bindings eagerly,
305 -- and take the body apart into a (f args) form
306 { let local_rule = isLocalId fn_id
307 -- NB: isLocalId is False of implicit Ids. This is good becuase
308 -- we don't want to attach rules to the bindings of implicit Ids,
309 -- because they don't show up in the bindings until just before code gen
310 fn_name = idName fn_id
312 rule = Rule { ru_name = name, ru_fn = fn_name, ru_act = act,
313 ru_bndrs = bndrs, ru_args = args, ru_rhs = rhs',
314 ru_rough = roughTopNames args,
315 ru_local = local_rule }
319 msg = hang (ptext SLIT("RULE left-hand side too complicated to desugar; ignored"))