summaryrefslogtreecommitdiff
path: root/compiler/GHC/Core
diff options
context:
space:
mode:
Diffstat (limited to 'compiler/GHC/Core')
-rw-r--r--compiler/GHC/Core/Lint.hs6
-rw-r--r--compiler/GHC/Core/Opt/DmdAnal.hs4
-rw-r--r--compiler/GHC/Core/Opt/Exitify.hs4
-rw-r--r--compiler/GHC/Core/Opt/SpecConstr.hs2
-rw-r--r--compiler/GHC/Core/Opt/WorkWrap.hs8
-rw-r--r--compiler/GHC/Core/Opt/WorkWrap/Utils.hs5
-rw-r--r--compiler/GHC/Core/Utils.hs6
7 files changed, 17 insertions, 18 deletions
diff --git a/compiler/GHC/Core/Lint.hs b/compiler/GHC/Core/Lint.hs
index b9ca990f3d..6390d83b1e 100644
--- a/compiler/GHC/Core/Lint.hs
+++ b/compiler/GHC/Core/Lint.hs
@@ -1119,9 +1119,9 @@ checkCanEtaExpand (Var fun_id) args app_ty
check_args :: [Type] -> [Type]
check_args = go (nb_val_args + 1)
where
- go :: Int -- ^ index of the argument (starting from 1)
- -> [Type] -- ^ arguments
- -> [Type] -- ^ value argument types that could not be
+ go :: Int -- index of the argument (starting from 1)
+ -> [Type] -- arguments
+ -> [Type] -- value argument types that could not be
-- determined to have a fixed runtime representation
go i _
| i > arity
diff --git a/compiler/GHC/Core/Opt/DmdAnal.hs b/compiler/GHC/Core/Opt/DmdAnal.hs
index 347cc4228d..945af5ea9e 100644
--- a/compiler/GHC/Core/Opt/DmdAnal.hs
+++ b/compiler/GHC/Core/Opt/DmdAnal.hs
@@ -97,7 +97,7 @@ dmdAnalProgram opts fam_envs rules binds
add_exported_uses :: AnalEnv -> DmdType -> [Id] -> DmdType
add_exported_uses env = foldl' (add_exported_use env)
- -- | If @e@ is denoted by @dmd_ty@, then @add_exported_use _ dmd_ty id@
+ -- If @e@ is denoted by @dmd_ty@, then @add_exported_use _ dmd_ty id@
-- corresponds to the demand type of @(id, e)@, but is a lot more direct.
-- See Note [Analysing top-level bindings].
add_exported_use :: AnalEnv -> DmdType -> Id -> DmdType
@@ -959,7 +959,7 @@ unboxedWhenSmall :: AnalEnv -> RecFlag -> Maybe Type -> SubDemand -> SubDemand
unboxedWhenSmall _ _ Nothing sd = sd
unboxedWhenSmall env rec_flag (Just ret_ty) sd = go 1 ret_ty sd
where
- -- | Magic constant, bounding the depth of optimistic 'Unboxed' flags. We
+ -- Magic constant, bounding the depth of optimistic 'Unboxed' flags. We
-- might want to minmax in the future.
max_depth | isRec rec_flag = 3 -- So we get at most something as deep as !P(L!P(L!L))
| otherwise = 1 -- Otherwise be unbox too deep in T18109, T18174 and others and get a bunch of stack overflows
diff --git a/compiler/GHC/Core/Opt/Exitify.hs b/compiler/GHC/Core/Opt/Exitify.hs
index 164d7119f4..ac4df91f97 100644
--- a/compiler/GHC/Core/Opt/Exitify.hs
+++ b/compiler/GHC/Core/Opt/Exitify.hs
@@ -131,11 +131,11 @@ exitifyRec in_scope pairs
-- variables bound on the way and lifts it out as a join point.
--
-- ExitifyM is a state monad to keep track of floated binds
- go :: [Var] -- ^ Variables that are in-scope here, but
+ go :: [Var] -- Variables that are in-scope here, but
-- not in scope at the joinrec; that is,
-- we must potentially abstract over them.
-- Invariant: they are kept in dependency order
- -> CoreExprWithFVs -- ^ Current expression in tail position
+ -> CoreExprWithFVs -- Current expression in tail position
-> ExitifyM CoreExpr
-- We first look at the expression (no matter what it shape is)
diff --git a/compiler/GHC/Core/Opt/SpecConstr.hs b/compiler/GHC/Core/Opt/SpecConstr.hs
index a5579108e6..90f492ffea 100644
--- a/compiler/GHC/Core/Opt/SpecConstr.hs
+++ b/compiler/GHC/Core/Opt/SpecConstr.hs
@@ -2454,7 +2454,7 @@ argToPat1 _env _in_scope _val_env arg _arg_occ arg_str
setStrUnfolding :: Id -> StrictnessMark -> Id
-- setStrUnfolding id str = id
setStrUnfolding id str
- -- | pprTrace "setStrUnfolding"
+ -- pprTrace "setStrUnfolding"
-- (ppr id <+> ppr (isMarkedCbv str) $$
-- ppr (idType id) $$
-- text "boxed:" <> ppr (isBoxedType (idType id)) $$
diff --git a/compiler/GHC/Core/Opt/WorkWrap.hs b/compiler/GHC/Core/Opt/WorkWrap.hs
index a6e583a210..93c4c31995 100644
--- a/compiler/GHC/Core/Opt/WorkWrap.hs
+++ b/compiler/GHC/Core/Opt/WorkWrap.hs
@@ -556,15 +556,15 @@ tryWW ww_opts is_rec fn_id rhs
-- CPR information in GHC.Core.Opt.CprAnal.cprAnalBind, it actually
-- isn't. That is because we would still perform w/w when:
--
- -- * An argument is used strictly, and -fworker-wrapper-cbv is
+ -- - An argument is used strictly, and -fworker-wrapper-cbv is
-- enabled, or,
- -- * When demand analysis marks an argument as absent.
+ -- - When demand analysis marks an argument as absent.
--
-- In a debug build we do assert that boxity and CPR information
-- are actually stripped, since we want to prevent callers of OPAQUE
-- things to do reboxing. See:
- -- * Note [The OPAQUE pragma and avoiding the reboxing of arguments]
- -- * Note [The OPAQUE pragma and avoiding the reboxing of results]
+ -- - Note [The OPAQUE pragma and avoiding the reboxing of arguments]
+ -- - Note [The OPAQUE pragma and avoiding the reboxing of results]
| isOpaquePragma (inlinePragInfo fn_info)
= assertPpr (onlyBoxedArguments (dmdSigInfo fn_info) &&
isTopCprSig (cprSigInfo fn_info))
diff --git a/compiler/GHC/Core/Opt/WorkWrap/Utils.hs b/compiler/GHC/Core/Opt/WorkWrap/Utils.hs
index 298bb3202a..6bb751d803 100644
--- a/compiler/GHC/Core/Opt/WorkWrap/Utils.hs
+++ b/compiler/GHC/Core/Opt/WorkWrap/Utils.hs
@@ -661,7 +661,7 @@ wantToUnboxResult fam_envs ty cpr
= StopUnboxing
where
- -- | See Note [non-algebraic or open body type warning]
+ -- See Note [non-algebraic or open body type warning]
open_body_ty_warning = warnPprTrace True "wantToUnboxResult: non-algebraic or open body type" (ppr ty) Nothing
isLinear :: Scaled a -> Bool
@@ -1296,8 +1296,7 @@ isRecDataCon fam_envs fuel orig_dc
go_tc_app :: IntWithInf -> TyConSet -> TyCon -> [Type] -> IsRecDataConResult
go_tc_app fuel visited_tcs tc tc_args =
case tyConDataCons_maybe tc of
- --- | pprTrace "tc_app" (vcat [ppr tc, ppr tc_args]) False -> undefined
-
+ --- | pprTrace "tc_app" (vcat [ppr tc, ppr tc_args]) False = undefined
_ | Just (HetReduction (Reduction _ rhs) _) <- topReduceTyFamApp_maybe fam_envs tc tc_args
-- This is the only place where we look at tc_args, which might have
-- See Note [Detecting recursive data constructors], point (C) and (5)
diff --git a/compiler/GHC/Core/Utils.hs b/compiler/GHC/Core/Utils.hs
index da13a346d8..5100f958e6 100644
--- a/compiler/GHC/Core/Utils.hs
+++ b/compiler/GHC/Core/Utils.hs
@@ -332,9 +332,9 @@ mkTick t orig_expr = mkTick' id id orig_expr
-- non-counting part having laxer placement properties.
canSplit = tickishCanSplit t && tickishPlace (mkNoCount t) /= tickishPlace t
- mkTick' :: (CoreExpr -> CoreExpr) -- ^ apply after adding tick (float through)
- -> (CoreExpr -> CoreExpr) -- ^ apply before adding tick (float with)
- -> CoreExpr -- ^ current expression
+ mkTick' :: (CoreExpr -> CoreExpr) -- apply after adding tick (float through)
+ -> (CoreExpr -> CoreExpr) -- apply before adding tick (float with)
+ -> CoreExpr -- current expression
-> CoreExpr
mkTick' top rest expr = case expr of