[Git][ghc/ghc][master] remove name shadowing
Marge Bot (@marge-bot)
gitlab at gitlab.haskell.org
Wed Oct 12 20:32:44 UTC 2022
Marge Bot pushed to branch master at Glasgow Haskell Compiler / GHC
Commits:
81915089 by Curran McConnell at 2022-10-12T16:32:26-04:00
remove name shadowing
- - - - -
1 changed file:
- ghc/GHCi/UI/Monad.hs
Changes:
=====================================
ghc/GHCi/UI/Monad.hs
=====================================
@@ -1,6 +1,5 @@
{-# LANGUAGE FlexibleInstances, DeriveFunctor, DerivingVia #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
-{-# OPTIONS -fno-warn-name-shadowing #-}
-----------------------------------------------------------------------------
--
@@ -474,10 +473,10 @@ printStats dflags ActionStats{actionAllocs = mallocs, actionElapsedTime = secs}
Just allocs ->
text (separateThousands allocs) <+> text "bytes")))
where
- separateThousands n = reverse . sep . reverse . show $ n
- where sep n'
+ separateThousands n = reverse . separate . reverse . show $ n
+ where separate n'
| n' `lengthAtMost` 3 = n'
- | otherwise = take 3 n' ++ "," ++ sep (drop 3 n')
+ | otherwise = take 3 n' ++ "," ++ separate (drop 3 n')
-----------------------------------------------------------------------------
-- reverting CAFs
@@ -526,13 +525,13 @@ turnOffBuffering_ fhv = do
liftIO $ evalIO interp fhv
mkEvalWrapper :: GhcMonad m => String -> [String] -> m ForeignHValue
-mkEvalWrapper progname args =
+mkEvalWrapper progname' args' =
runInternal $ GHC.compileParsedExprRemote
- $ evalWrapper `GHC.mkHsApp` nlHsString progname
- `GHC.mkHsApp` nlList (map nlHsString args)
+ $ evalWrapper' `GHC.mkHsApp` nlHsString progname'
+ `GHC.mkHsApp` nlList (map nlHsString args')
where
nlHsString = nlHsLit . mkHsString
- evalWrapper =
+ evalWrapper' =
GHC.nlHsVar $ RdrName.mkOrig gHC_GHCI_HELPERS (mkVarOcc "evalWrapper")
-- | Run a 'GhcMonad' action to compile an expression for internal usage.
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/819150893a9af7ee0770aba64b140bf1bc54957b
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/819150893a9af7ee0770aba64b140bf1bc54957b
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/20221012/8510597b/attachment-0001.html>
More information about the ghc-commits
mailing list