statistics-0.14.0.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 continunous 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 # 
Data ExponentialDistribution Source # 

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 # 
Show ExponentialDistribution Source # 
Generic ExponentialDistribution Source # 
ToJSON ExponentialDistribution Source # 
FromJSON ExponentialDistribution Source # 
Binary ExponentialDistribution Source # 
ContGen ExponentialDistribution Source # 
Entropy ExponentialDistribution Source # 
MaybeEntropy ExponentialDistribution Source # 
Variance ExponentialDistribution Source # 
MaybeVariance ExponentialDistribution Source # 
Mean ExponentialDistribution Source # 
MaybeMean ExponentialDistribution Source # 
ContDistr ExponentialDistribution Source # 
Distribution ExponentialDistribution Source # 
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.

type Rep ExponentialDistribution Source # 
type Rep ExponentialDistribution = D1 (MetaData "ExponentialDistribution" "Statistics.Distribution.Exponential" "statistics-0.14.0.1-5c5AR88qYXNBEkm1yvRri0" True) (C1 (MetaCons "ED" PrefixI True) (S1 (MetaSel (Just Symbol "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