[Git][ghc/ghc][wip/js-taginference] Lint
Josh Meredith (@JoshMeredith)
gitlab at gitlab.haskell.org
Thu Jan 25 15:12:10 UTC 2024
Josh Meredith pushed to branch wip/js-taginference at Glasgow Haskell Compiler / GHC
Commits:
7805aa56 by Josh Meredith at 2024-01-26T02:11:57+11:00
Lint
- - - - -
2 changed files:
- compiler/GHC/Stg/InferTags/Rewrite.hs
- compiler/GHC/StgToJS/Utils.hs
Changes:
=====================================
compiler/GHC/Stg/InferTags/Rewrite.hs
=====================================
@@ -15,7 +15,7 @@
{-# LANGUAGE TupleSections #-}
{-# LANGUAGE TypeFamilies #-}
-module GHC.Stg.InferTags.Rewrite (rewriteTopBinds)
+module GHC.Stg.InferTags.Rewrite (rewriteTopBinds, rewriteOpApp)
where
import GHC.Prelude
@@ -396,6 +396,7 @@ rewriteId v = do
if is_tagged then return $! setIdTagSig v (TagSig TagProper)
else return v
+rewriteExpr :: GenStgExpr 'InferTaggedBinders -> RM (GenStgExpr 'CodeGen)
rewriteExpr (e at StgCase {}) = rewriteCase e
rewriteExpr (e at StgLet {}) = rewriteLet e
rewriteExpr (e at StgLetNoEscape {}) = rewriteLetNoEscape e
=====================================
compiler/GHC/StgToJS/Utils.hs
=====================================
@@ -434,7 +434,7 @@ isInlineExpr = \case
-> primOpIsReallyInline op
StgOpApp (StgPrimCallOp _c) _ _
-> True
- StgCase e b _ alts
+ StgCase e _ _ alts
->let ie = isInlineExpr e
ias = map isInlineExpr (fmap alt_rhs alts)
in ie && and ias
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/7805aa562dafea0a0654dfcb5aa7d10e7479bfc3
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/7805aa562dafea0a0654dfcb5aa7d10e7479bfc3
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/20240125/3b4ada68/attachment-0001.html>
More information about the ghc-commits
mailing list