{-# LANGUAGE Safe #-}
{-# OPTIONS_HADDOCK not-home #-}
module GHC.Real
(
Real(..)
, Integral(..)
, Fractional(..)
, RealFrac(..)
, fromIntegral
, realToFrac
, showSigned
, even
, odd
, (^)
, (^^)
, gcd
, lcm
, Ratio(..)
, Rational
, infinity
, notANumber
, numericEnumFrom
, numericEnumFromThen
, numericEnumFromTo
, numericEnumFromThenTo
, integralEnumFrom
, integralEnumFromThen
, integralEnumFromTo
, integralEnumFromThenTo
, (%)
, numerator
, denominator
, reduce
, ratioPrec
, ratioPrec1
, divZeroError
, ratioZeroDenominatorError
, overflowError
, underflowError
, mkRationalBase2
, mkRationalBase10
, FractionalExponentBase(..)
, (^%^)
, (^^%^^)
, mkRationalWithExponentBase
, powImpl
, powImplAcc
) where
import GHC.Internal.Real