[Git][ghc/ghc][master] base: Fix incorrect mentions of GHC.Internal.Numeric
Marge Bot (@marge-bot)
gitlab at gitlab.haskell.org
Wed Nov 27 16:43:19 UTC 2024
Marge Bot pushed to branch master at Glasgow Haskell Compiler / GHC
Commits:
c3fc9b86 by Ben Gamari at 2024-11-27T11:42:39-05:00
base: Fix incorrect mentions of GHC.Internal.Numeric
These were incorrectly changed by the automated refactoring of the
`ghc-internal` migration.
Fixes #25521.
- - - - -
8 changed files:
- compiler/GHC/Builtin/Names.hs
- libraries/base/src/Data/Char.hs
- libraries/base/src/Data/Semigroup.hs
- libraries/base/src/Prelude.hs
- libraries/ghc-internal/src/GHC/Internal/Base.hs
- libraries/ghc-internal/src/GHC/Internal/Foreign/C/Types.hs
- libraries/ghc-internal/src/GHC/Internal/Read.hs
- libraries/ghc-internal/src/GHC/Internal/Real.hs
Changes:
=====================================
compiler/GHC/Builtin/Names.hs
=====================================
@@ -279,7 +279,7 @@ basicKnownKeyNames
-- Dynamic
toDynName,
- -- GHC.Internal.Numeric stuff
+ -- Numeric stuff
negateName, minusName, geName, eqName,
mkRationalBase2Name, mkRationalBase10Name,
=====================================
libraries/base/src/Data/Char.hs
=====================================
@@ -42,7 +42,7 @@ module Data.Char
, digitToInt
, intToDigit
- -- * GHC.Internal.Numeric representations
+ -- * Numeric representations
, ord
, chr
=====================================
libraries/base/src/Data/Semigroup.hs
=====================================
@@ -89,7 +89,7 @@ module Data.Semigroup (
, First(..)
, Last(..)
, WrappedMonoid(..)
- -- * Re-exported monoids from GHC.Internal.Data.Monoid
+ -- * Re-exported monoids
, Dual(..)
, Endo(..)
, All(..)
=====================================
libraries/base/src/Prelude.hs
=====================================
@@ -47,11 +47,11 @@ module Prelude (
-- ** Numbers
- -- *** GHC.Internal.Numeric types
+ -- *** Numeric types
Int, Integer, Float, Double,
Rational, Word,
- -- *** GHC.Internal.Numeric type classes
+ -- *** Numeric type classes
Num((+), (-), (*), negate, abs, signum, fromInteger),
Real(toRational),
Integral(quot, rem, div, mod, quotRem, divMod, toInteger),
@@ -63,7 +63,7 @@ module Prelude (
encodeFloat, exponent, significand, scaleFloat, isNaN,
isInfinite, isDenormalized, isIEEE, isNegativeZero, atan2),
- -- *** GHC.Internal.Numeric functions
+ -- *** Numeric functions
subtract, even, odd, gcd, lcm, (^), (^^),
fromIntegral, realToFrac,
=====================================
libraries/ghc-internal/src/GHC/Internal/Base.hs
=====================================
@@ -2355,7 +2355,7 @@ getTag :: forall {lev :: Levity} (a :: TYPE (BoxedRep lev))
getTag = dataToTag#
----------------------------------------------
--- GHC.Internal.Numeric primops
+-- Numeric primops
----------------------------------------------
-- Definitions of the boxed PrimOps; these will be
=====================================
libraries/ghc-internal/src/GHC/Internal/Foreign/C/Types.hs
=====================================
@@ -47,7 +47,7 @@ module GHC.Internal.Foreign.C.Types
, CLLong(..), CULLong(..), CBool(..)
, CIntPtr(..), CUIntPtr(..), CIntMax(..), CUIntMax(..)
- -- ** GHC.Internal.Numeric types
+ -- ** Numeric types
-- | These types are represented as @newtype at s of basic
-- foreign types, and are instances of
-- 'Prelude.Eq', 'Prelude.Ord', 'Prelude.Num', 'Prelude.Read',
=====================================
libraries/ghc-internal/src/GHC/Internal/Read.hs
=====================================
@@ -551,7 +551,7 @@ instance Read L.Lexeme where
readList = readListDefault
--------------------------------------------------------------
--- GHC.Internal.Numeric instances of Read
+-- Numeric instances of Read
--------------------------------------------------------------
readNumber :: Num a => (L.Lexeme -> ReadPrec a) -> ReadPrec a
=====================================
libraries/ghc-internal/src/GHC/Internal/Real.hs
=====================================
@@ -360,7 +360,7 @@ numericEnumFrom :: (Fractional a) => a -> [a]
{-# INLINE numericEnumFrom #-} -- See Note [Inline Enum method helpers] in GHC.Internal.Enum
numericEnumFrom n = go 0
where
- -- See Note [GHC.Internal.Numeric Stability of Enumerating Floating Numbers]
+ -- See Note [Numeric Stability of Enumerating Floating Numbers]
go !k = let !n' = n + k
in n' : go (k + 1)
@@ -369,7 +369,7 @@ numericEnumFromThen :: (Fractional a) => a -> a -> [a]
numericEnumFromThen n m = go 0
where
step = m - n
- -- See Note [GHC.Internal.Numeric Stability of Enumerating Floating Numbers]
+ -- See Note [Numeric Stability of Enumerating Floating Numbers]
go !k = let !n' = n + k * step
in n' : go (k + 1)
@@ -386,7 +386,7 @@ numericEnumFromThenTo e1 e2 !e3
!predicate | e2 >= e1 = (<= e3 + mid)
| otherwise = (>= e3 + mid)
-{- Note [GHC.Internal.Numeric Stability of Enumerating Floating Numbers]
+{- Note [Numeric Stability of Enumerating Floating Numbers]
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
When enumerate floating numbers, we could add the increment to the last number
at every run (as what we did previously):
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/c3fc9b861fd00a85a4fcbd9960b8242d9fabe04b
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/c3fc9b861fd00a85a4fcbd9960b8242d9fabe04b
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/20241127/20931b07/attachment-0001.html>
More information about the ghc-commits
mailing list