Binomial Distribution
The binomial distribution gives the discrete probability distribution P_p(n|N) of obtaining exactly n successes out of N Bernoulli trials (where the result of each Bernoulli trial is true with probability p and false with probability q=1-p). The binomial distribution is therefore given by
where (N; n) is a binomial coefficient. The above plot shows the distribution of n successes out of N=20 trials with p=q=1/2.
The binomial distribution is implemented in the Wolfram Language as BinomialDistribution [n, p].
The probability of obtaining more successes than the n observed in a binomial distribution is
where
B(a,b) is the beta function, and B(x;a,b) is the incomplete beta function.
The characteristic function for the binomial distribution is
| phi(t)=(q+pe^(it))^N |
(5)
|
(Papoulis 1984, p. 154). The moment-generating function M for the distribution is
The mean is
The moments about 0 are
so the moments about the mean are
The skewness and kurtosis excess are
The first cumulant is
| kappa_1=np, |
(26)
|
and subsequent cumulants are given by the recurrence relation
The mean deviation is given by
For the special case p=q=1/2, this is equal to
where N!! is a double factorial. For N=1, 2, ..., the first few values are therefore 1/2, 1/2, 3/4, 3/4, 15/16, 15/16, ... (OEIS A086116 and A086117). The general case is given by
Steinhaus (1999, pp. 25-28) considers the expected number of squares S(n,N,s) containing a given number of grains n on board of size s after random distribution of N of grains,
| S(n,N,s)=sP_(1/s)(n|N). |
(32)
|
Taking N=s=64 gives the results summarized in the following table.
An approximation to the binomial distribution for large N can be obtained by expanding about the value n^~ where P(n) is a maximum, i.e., where dP/dn=0. Since the logarithm function is monotonic, we can instead choose to expand the logarithm. Let n=n^~+eta, then
| ln[P(n)]=ln[P(n^~)]+B_1eta+1/2B_2eta^2+1/(3!)B_3eta^3+..., |
(33)
|
where
But we are expanding about the maximum, so, by definition,
This also means that B_2 is negative, so we can write B_2=-|B_2|. Now, taking the logarithm of (◇) gives
| ln[P(n)]=lnN!-lnn!-ln(N-n)!+nlnp+(N-n)lnq. |
(36)
|
For large n and N-n we can use Stirling's approximation
| ln(n!) approx nlnn-n, |
(37)
|
so
and
To find n^~, set this expression to 0 and solve for n,
| [画像: ln((N-n^~)/(n^~)p/q)=0 ] |
(44)
|
| [画像: (N-n^~)/(n^~)p/q=1 ] |
(45)
|
| (N-n^~)p=n^~q |
(46)
|
| n^~(q+p)=n^~=Np, |
(47)
|
since p+q=1. We can now find the terms in the expansion
Now, treating the distribution as continuous,
Since each term is of order 1/N∼1/sigma^2 smaller than the previous, we can ignore terms higher than B_2, so
| P(n)=P(n^~)e^(-|B_2|eta^2/2). |
(61)
|
The probability must be normalized, so
and
Defining sigma^2=Npq,
which is a normal distribution. The binomial distribution is therefore approximated by a normal distribution for any fixed p (even if p is small) as N is taken to infinity.
If N->infty and p->0 in such a way that Np->lambda, then the binomial distribution converges to the Poisson distribution with mean lambda.
Let x and y be independent binomial random variables characterized by parameters n,p and m,p. The conditional probability of x given that x+y=k is
Note that this is a hypergeometric distribution.
See also
Binomial, de Moivre-Laplace Theorem, Galton Board, Hypergeometric Distribution, Negative Binomial Distribution, Normal Distribution, Poisson Distribution, Random Walk--1-Dimensional Explore this topic in the MathWorld classroomExplore with Wolfram|Alpha
References
Beyer, W. H. CRC Standard Mathematical Tables, 28th ed. Boca Raton, FL: CRC Press, p. 531, 1987.Papoulis, A. Probability, Random Variables, and Stochastic Processes, 2nd ed. New York: McGraw-Hill, pp. 102-103, 1984.Press, W. H.; Flannery, B. P.; Teukolsky, S. A.; and Vetterling, W. T. "Incomplete Beta Function, Student's Distribution, F-Distribution, Cumulative Binomial Distribution." §6.2 in Numerical Recipes in FORTRAN: The Art of Scientific Computing, 2nd ed. Cambridge, England: Cambridge University Press, pp. 219-223, 1992.Spiegel, M. R. Theory and Problems of Probability and Statistics. New York: McGraw-Hill, pp. 108-109, 1992.Steinhaus, H. Mathematical Snapshots, 3rd ed. New York: Dover, 1999.Referenced on Wolfram|Alpha
Binomial DistributionCite this as:
Weisstein, Eric W. "Binomial Distribution." From MathWorld--A Wolfram Resource. https://mathworld.wolfram.com/BinomialDistribution.html