Binomial
Binomial[n,m]
gives the binomial coefficient .
Details
data:image/s3,"s3://crabby-images/4c906/4c906e0da37b76cd44ccfc40d26faeb2b2d2c342" alt=""
- Integer mathematical function, suitable for both symbolic and numerical manipulation.
- Binomial is also known as combinations and as choose function.
- Binomial gives the symmetric coefficients for negative integer
. Use PascalBinomial for coefficients that preserve Pascal's identity for all integer values. Binomial and PascalBinomial agree except for negative integer
.
- In general,
is defined by
or suitable limits of this.
- When
is a negative integer,
. »
- The particular limit chosen preserves the symmetry rule
for all complex
and
. »
- Pascal's identity
is satisfied for almost all
and
, but violated for
. »
- For integers and certain other special arguments, Binomial automatically evaluates to exact values.
- Binomial is automatically evaluated symbolically for simple cases; FunctionExpand gives results for other cases. »
- Binomial can be evaluated to arbitrary numerical precision.
- Binomial automatically threads over lists.
- Binomial can be used with Interval and CenteredInterval objects. »
Background & Context
- Binomial represents the binomial coefficient function, which returns the binomial coefficient
of
and
. For non-negative integers
and
, the binomial coefficient has value
, where
is the Factorial function. By symmetry,
. The binomial coefficient is important in probability theory and combinatorics and is sometimes also denoted
- For non-negative integers
and
, the binomial coefficient
gives the number of subsets of length
contained in the set
. This is also the number of distinct ways of picking
elements (without replacement and ignoring order) from the first
positive integers and for this reason is often voiced as "
choose
".
- The binomial coefficient lies at the heart of the binomial formula, which states that for any non-negative integer
,
. This interpretation of binomial coefficients is related to the binomial distribution of probability theory, implemented via BinomialDistribution. Another important application is in the combinatorial identity known as Pascal's rule, which relates the binomial coefficient with shifted arguments according to
.
- Expressing factorials as gamma functions generalizes the binomial coefficient to complex
and
as
. Using the symmetry formula
for integer
and
and complex
then allows the definition of the binomial coefficient to be extended to negative integer arguments, making it continuous at all integer arguments as well as continuous for all complex arguments except for negative integer
and noninteger
(in which case it is infinite). This definition for negative
and integer
, given by
if
,
if
and 0 otherwise, is in agreement with both the binomial theorem and most combinatorial identities (with a few special exceptions).
- Binomial coefficients are generalized by multinomial coefficients. Multinomial returns the multinomial coefficient (n;n1,…,nk) of given numbers n1,…,nk summing to
, where
. The binomial coefficient
is the multinomial coefficient (n;k,n-k).
Examples
open allclose allBasic Examples (5)
Scope (35)
Numerical Evaluation (7)
Evaluate for half-integer arguments:
The precision of the output tracks the precision of the input:
Evaluate efficiently at high precision:
Compute worst-case guaranteed intervals using Interval and CenteredInterval objects:
Or compute average-case statistical intervals using Around:
Compute the elementwise values of an array:
Or compute the matrix Binomial function using MatrixFunction:
Specific Values (4)
Visualization (3)
Function Properties (12)
Real domain of Binomial as a function of its parameter n:
Real domain of Binomial as a function of its parameter m:
Function range of Binomial:
Binomial has the mirror property :
Compute sums involving Binomial:
When is positive,
is an analytic function of both variables:
This is not true for negative :
is neither non-decreasing nor non-increasing:
Binomial is neither non-negative nor non-positive:
has singularities and discontinuities where
is a negative integer:
is neither convex nor concave:
TraditionalForm formatting:
Differentiation (3)
Series Expansions (4)
Generalizations & Extensions (2)
Infinite arguments give symbolic results:
Binomial threads elementwise over lists:
Applications (11)
There are ways to choose
elements without replacements from a set of
elements:
Check with direct enumeration:
There are ways to choose
elements with replacement from a set of
elements:
Check with direct enumeration:
There are ways to arrange
indistinguishable objects of one kind, and
indistinguishable objects of another kind:
Illustrate the binomial theorem:
Plot Binomial in the arguments' plane:
Plot the logarithm of the number of ways to pick elements out of
:
Compute higher derivatives of a product of two functions:
PDF of the binomial probability distribution:
Bernstein polynomials are defined in terms of Binomial:
Properties & Relations (11)
On the integers, Binomial[n,m] equals :
This can be expressed as for
and
for
:
An alternative formula on the integers:
Pascal's identity is satisfied almost everywhere:
PascalBinomial satisfies the identity everywhere, including the origin:
The symmetry rule holds for all values of
and
:
PascalBinomial performs simple evaluations for symbolic arguments:
For more complex expressions, it will avoid automatic expansion:
Use FunctionExpand with conditions to achieve appropriate simplifications:
Use FullSimplify to simplify expressions involving binomial coefficients:
Use FunctionExpand to expand into Gamma functions:
Sums involving Binomial:
Find the generating function Binomial:
Binomial can be represented as a DifferenceRoot:
The generating function for Binomial:
The exponential generating function for Binomial:
Possible Issues (3)
Large arguments can give results too large to be computed explicitly:
data:image/s3,"s3://crabby-images/b569c/b569c3e9a1d0d272b03974e2431542731f4c6196" alt=""
Machine-number inputs can give high‐precision results:
As a bivariate function, Binomial is not continuous in both variables at negative integers:
The value of Binomial at negative integers is determined via Binomial[n,m]Binomial[n,n-m]:
Neat Examples (7)
Construct a graphical version of Pascal's triangle:
Extend the triangle to negative integers; unlabeled points indicate a zero value:
PascalBinomial, by contrast, zeroes out the top-left sector where both inputs are negative:
Closed‐form inverse of Hilbert matrices:
Nested binomials over the complex plane:
Plot Binomial at infinity:
Plot Binomial for complex arguments:
Plot Binomial at Gaussian integers:
Text
Wolfram Research (1988), Binomial, Wolfram Language function, https://reference.wolfram.com/language/ref/Binomial.html.
CMS
Wolfram Language. 1988. "Binomial." Wolfram Language & System Documentation Center. Wolfram Research. https://reference.wolfram.com/language/ref/Binomial.html.
APA
Wolfram Language. (1988). Binomial. Wolfram Language & System Documentation Center. Retrieved from https://reference.wolfram.com/language/ref/Binomial.html