module DataSketches.Quantiles.RelativeErrorQuantile.Internal.Constants where
-- Constants
import Data.Word

sqrt2 :: Double 
sqrt2 :: Double
sqrt2 = Double -> Double
forall a. Floating a => a -> a
sqrt Double
2

initNumberOfSections :: Num a => a
initNumberOfSections :: a
initNumberOfSections = a
3

minK :: Num a => a
minK :: a
minK = a
4

nomCapMulti :: Num a => a
nomCapMulti :: a
nomCapMulti = a
2

relRseFactor :: Double
relRseFactor :: Double
relRseFactor = Double -> Double
forall a. Floating a => a -> a
sqrt (Double
0.0512 Double -> Double -> Double
forall a. Fractional a => a -> a -> a
/ Integer -> Double
forall a b. (Integral a, Num b) => a -> b
fromIntegral Integer
forall a. Num a => a
initNumberOfSections)

fixRseFactor :: Double
fixRseFactor :: Double
fixRseFactor = Double
0.084