statistics-0.15.1.1: A library of statistical types, data, and functions

Copyright(c) 2009 Bryan O'Sullivan
LicenseBSD3
Maintainerbos@serpentine.com
Stabilityexperimental
Portabilityportable
Safe HaskellNone
LanguageHaskell98

Statistics.Distribution.Exponential

Contents

Description

The exponential distribution. This is the continuous probability distribution of the times between events in a poisson process, in which events occur continuously and independently at a constant average rate.

Synopsis

Documentation

data ExponentialDistribution Source #

Instances
Eq ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

Data ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExponentialDistribution -> c ExponentialDistribution #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExponentialDistribution #

toConstr :: ExponentialDistribution -> Constr #

dataTypeOf :: ExponentialDistribution -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExponentialDistribution) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExponentialDistribution) #

gmapT :: (forall b. Data b => b -> b) -> ExponentialDistribution -> ExponentialDistribution #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExponentialDistribution -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExponentialDistribution -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExponentialDistribution -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExponentialDistribution -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExponentialDistribution -> m ExponentialDistribution #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExponentialDistribution -> m ExponentialDistribution #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExponentialDistribution -> m ExponentialDistribution #

Read ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

Show ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

Generic ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

Associated Types

type Rep ExponentialDistribution :: Type -> Type #

ToJSON ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

FromJSON ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

Binary ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

ContGen ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

Entropy ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

MaybeEntropy ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

Variance ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

MaybeVariance ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

Mean ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

MaybeMean ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

ContDistr ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

Distribution ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

FromSample ExponentialDistribution Double Source #

Create exponential distribution from sample. Returns Nothing if sample is empty or contains negative elements. No other tests are made to check whether it truly is exponential.

Instance details

Defined in Statistics.Distribution.Exponential

type Rep ExponentialDistribution Source # 
Instance details

Defined in Statistics.Distribution.Exponential

type Rep ExponentialDistribution = D1 (MetaData "ExponentialDistribution" "Statistics.Distribution.Exponential" "statistics-0.15.1.1-90JrJCHkRC71X5S11QgEYW" True) (C1 (MetaCons "ED" PrefixI True) (S1 (MetaSel (Just "edLambda") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Double)))

Constructors

exponential Source #

Arguments

:: Double

Rate parameter.

-> ExponentialDistribution 

Create an exponential distribution.

exponentialE Source #

Arguments

:: Double

Rate parameter.

-> Maybe ExponentialDistribution 

Create an exponential distribution.

Accessors