time-to-botec

Benchmark sampling in different programming languages
Log | Files | Refs | README

repl.txt (2153B)


      1 
      2 {{alias}}( [k, λ] )
      3     Returns an Erlang distribution object.
      4 
      5     Parameters
      6     ----------
      7     k: number (optional)
      8         Shape parameter. Must be a positive integer. Default: `1.0`.
      9 
     10     λ: number (optional)
     11         Rate parameter. Must be greater than `0`. Default: `1.0`.
     12 
     13     Returns
     14     -------
     15     erlang: Object
     16         Distribution instance.
     17 
     18     erlang.k: number
     19         Shape parameter. If set, the value must be a positive integer.
     20 
     21     erlang.lambda: number
     22         Rate parameter. If set, the value must be greater than `0`.
     23 
     24     erlang.entropy: number
     25         Read-only property which returns the differential entropy.
     26 
     27     erlang.kurtosis: number
     28         Read-only property which returns the excess kurtosis.
     29 
     30     erlang.mean: number
     31         Read-only property which returns the expected value.
     32 
     33     erlang.mode: number
     34         Read-only property which returns the mode.
     35 
     36     erlang.skewness: number
     37         Read-only property which returns the skewness.
     38 
     39     erlang.stdev: number
     40         Read-only property which returns the standard deviation.
     41 
     42     erlang.variance: number
     43         Read-only property which returns the variance.
     44 
     45     erlang.cdf: Function
     46         Evaluates the cumulative distribution function (CDF).
     47 
     48     erlang.logpdf: Function
     49         Evaluates the natural logarithm of the probability density function
     50         (PDF).
     51 
     52     erlang.mgf: Function
     53         Evaluates the moment-generating function (MGF).
     54 
     55     erlang.pdf: Function
     56         Evaluates the probability density function (PDF).
     57 
     58     erlang.quantile: Function
     59         Evaluates the quantile function at probability `p`.
     60 
     61     Examples
     62     --------
     63     > var erlang = {{alias}}( 6, 5.0 );
     64     > erlang.k
     65     6
     66     > erlang.lambda
     67     5.0
     68     > erlang.entropy
     69     ~0.647
     70     > erlang.kurtosis
     71     1.0
     72     > erlang.mean
     73     1.2
     74     > erlang.mode
     75     1.0
     76     > erlang.skewness
     77     ~0.816
     78     > erlang.stdev
     79     ~0.49
     80     > erlang.variance
     81     0.24
     82     > erlang.cdf( 3.0 )
     83     ~0.997
     84     > erlang.logpdf( 3.0 )
     85     ~-4.638
     86     > erlang.mgf( -0.5 )
     87     ~0.564
     88     > erlang.pdf( 3.0 )
     89     ~0.01
     90     > erlang.quantile( 0.8 )
     91     ~1.581
     92 
     93     See Also
     94     --------
     95