Skip to content
Snippets Groups Projects
Commit f3c489de authored by Ben Gamari's avatar Ben Gamari Committed by Marge Bot
Browse files

base: Add export list to GHC.Real

parent 2ac15233
No related branches found
No related tags found
No related merge requests found
......@@ -18,7 +18,72 @@
--
-----------------------------------------------------------------------------
module GHC.Real where
module GHC.Real
( -- * Classes
Real(..)
, Integral(..)
, Fractional(..)
, RealFrac(..)
-- * Conversion
, fromIntegral
, realToFrac
-- * Formatting
, showSigned
-- * Predicates
, even
, odd
-- * Arithmetic
, (^)
, (^^)
, gcd
, lcm
-- * 'Ratio'
, Ratio(..)
, Rational
, infinity
, notANumber
-- * 'Enum' helpers
, numericEnumFrom
, numericEnumFromThen
, numericEnumFromTo
, numericEnumFromThenTo
, integralEnumFrom
, integralEnumFromThen
, integralEnumFromTo
, integralEnumFromThenTo
-- ** Construction
, (%)
-- ** Projection
, numerator
, denominator
-- ** Operations
, reduce
-- * Internal
, ratioPrec
, ratioPrec1
, divZeroError
, ratioZeroDenominatorError
, overflowError
, underflowError
, mkRationalBase2
, mkRationalBase10
, FractionalExponentBase(..)
, (^%^)
, (^^%^^)
, mkRationalWithExponentBase
, powImpl
, powImplAcc
) where
#include "MachDeps.h"
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment