Wolfram Researchfunctions.wolfram.comOther Wolfram Sites
Search Site
Function CategoriesGraphics GalleryNotationsGeneral IdentitiesAbout This Site Email Comments

View Related Information In
The Documentation Center
MathWorld

Download All Formulas For This Function
Mathematica Notebook
PDF File

 

Developed with Mathematica -- Download a Free Trial Version
 











HypergeometricU






Mathematica Notation

Traditional Notation









Hypergeometric Functions > HypergeometricU[a,b,z] > Specific values > Specialized values > For fixed z and with symbolical integers in parameters > For fixed z and a=n, b=1/2+-m





http://functions.wolfram.com/07.33.03.0061.01









  


  










Input Form





HypergeometricU[n, 1/2 + m, z] == ((Sqrt[Pi] (-1)^m)/Gamma[1/2 - m + n]) (Sqrt[Pi] z^(1/2 - m) E^z Erf[Sqrt[z]] Sum[Binomial[-m + n, k] LaguerreL[-1 + k + m, 1/2 - k - m, -z], {k, 0, -m + n}] + z^(1 - m) Sum[Binomial[-m + n, k] Sum[(1/p) (LaguerreL[-1 + k + m - p, 1/2 - k - m + p, -z] LaguerreL[-1 + p, 1/2 - p, z]), {p, 1, -1 + k + m}], {k, 0, -m + n}]) - (-1)^n E^z z^(1/2 - m) Gamma[1/2 + m - n] LaguerreL[-1 + n, 1/2 - m, -z] /; Element[n, Integers] && n > 0 && Element[m, Integers] && m > 0 && m <= n










Standard Form





Cell[BoxData[RowBox[List[RowBox[List[RowBox[List["HypergeometricU", "[", RowBox[List["n", ",", RowBox[List[FractionBox["1", "2"], "+", "m"]], ",", "z"]], "]"]], "\[Equal]", RowBox[List[RowBox[List[FractionBox[RowBox[List[SqrtBox["\[Pi]"], " ", SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], "m"]]], RowBox[List["Gamma", "[", RowBox[List[FractionBox["1", "2"], "-", "m", "+", "n"]], "]"]]], RowBox[List["(", RowBox[List[RowBox[List[SqrtBox["\[Pi]"], " ", SuperscriptBox["z", RowBox[List[FractionBox["1", "2"], "-", "m"]]], " ", SuperscriptBox["\[ExponentialE]", "z"], " ", RowBox[List["Erf", "[", SqrtBox["z"], "]"]], " ", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["k", "=", "0"]], RowBox[List[RowBox[List["-", "m"]], "+", "n"]]], RowBox[List[RowBox[List["Binomial", "[", RowBox[List[RowBox[List[RowBox[List["-", "m"]], "+", "n"]], ",", "k"]], "]"]], " ", RowBox[List["LaguerreL", "[", RowBox[List[RowBox[List[RowBox[List["-", "1"]], "+", "k", "+", "m"]], ",", RowBox[List[FractionBox["1", "2"], "-", "k", "-", "m"]], ",", RowBox[List["-", "z"]]]], "]"]]]]]]]], "+", RowBox[List[SuperscriptBox["z", RowBox[List["1", "-", "m"]]], " ", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["k", "=", "0"]], RowBox[List[RowBox[List["-", "m"]], "+", "n"]]], RowBox[List[RowBox[List["Binomial", "[", RowBox[List[RowBox[List[RowBox[List["-", "m"]], "+", "n"]], ",", "k"]], "]"]], " ", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["p", "=", "1"]], RowBox[List[RowBox[List["-", "1"]], "+", "k", "+", "m"]]], RowBox[List[FractionBox["1", "p"], RowBox[List["(", RowBox[List[RowBox[List["LaguerreL", "[", RowBox[List[RowBox[List[RowBox[List["-", "1"]], "+", "k", "+", "m", "-", "p"]], ",", RowBox[List[FractionBox["1", "2"], "-", "k", "-", "m", "+", "p"]], ",", RowBox[List["-", "z"]]]], "]"]], " ", RowBox[List["LaguerreL", "[", RowBox[List[RowBox[List[RowBox[List["-", "1"]], "+", "p"]], ",", RowBox[List[FractionBox["1", "2"], "-", "p"]], ",", "z"]], "]"]]]], ")"]]]]]]]]]]]]]], ")"]]]], "-", RowBox[List[SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], "n"], " ", SuperscriptBox["\[ExponentialE]", "z"], " ", SuperscriptBox["z", RowBox[List[FractionBox["1", "2"], "-", "m"]]], " ", RowBox[List["Gamma", "[", RowBox[List[FractionBox["1", "2"], "+", "m", "-", "n"]], "]"]], " ", RowBox[List["LaguerreL", "[", RowBox[List[RowBox[List[RowBox[List["-", "1"]], "+", "n"]], ",", RowBox[List[FractionBox["1", "2"], "-", "m"]], ",", RowBox[List["-", "z"]]]], "]"]]]]]]]], "/;", RowBox[List[RowBox[List["n", "\[Element]", "Integers"]], "\[And]", RowBox[List["n", ">", "0"]], "\[And]", RowBox[List["m", "\[Element]", "Integers"]], "\[And]", RowBox[List["m", ">", "0"]], "\[And]", RowBox[List["m", "\[LessEqual]", "n"]]]]]]]]










MathML Form







<math xmlns='http://www.w3.org/1998/Math/MathML' mathematica:form='TraditionalForm' xmlns:mathematica='http://www.wolfram.com/XML/'> <semantics> <mrow> <mrow> <mrow> <semantics> <mi> U </mi> <annotation encoding='Mathematica'> TagBox[&quot;U&quot;, HypergeometricU] </annotation> </semantics> <mo> ( </mo> <mrow> <mi> n </mi> <mo> , </mo> <mrow> <mi> m </mi> <mo> + </mo> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> </mrow> <mo> , </mo> <mi> z </mi> </mrow> <mo> ) </mo> </mrow> <mo> &#63449; </mo> <mrow> <mrow> <mfrac> <mrow> <msqrt> <mi> &#960; </mi> </msqrt> <mo> &#8290; </mo> <msup> <mrow> <mo> ( </mo> <mrow> <mo> - </mo> <mn> 1 </mn> </mrow> <mo> ) </mo> </mrow> <mi> m </mi> </msup> </mrow> <mrow> <mi> &#915; </mi> <mo> &#8289; </mo> <mo> ( </mo> <mrow> <mrow> <mo> - </mo> <mi> m </mi> </mrow> <mo> + </mo> <mi> n </mi> <mo> + </mo> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> </mrow> <mo> ) </mo> </mrow> </mfrac> <mo> &#8290; </mo> <mrow> <mo> ( </mo> <mrow> <mrow> <msup> <mi> z </mi> <mrow> <mn> 1 </mn> <mo> - </mo> <mi> m </mi> </mrow> </msup> <mo> &#8290; </mo> <mrow> <munderover> <mo> &#8721; </mo> <mrow> <mi> k </mi> <mo> = </mo> <mn> 0 </mn> </mrow> <mrow> <mi> n </mi> <mo> - </mo> <mi> m </mi> </mrow> </munderover> <mrow> <semantics> <mrow> <mo> ( </mo> <mtable> <mtr> <mtd> <mrow> <mi> n </mi> <mo> - </mo> <mi> m </mi> </mrow> </mtd> </mtr> <mtr> <mtd> <mi> k </mi> </mtd> </mtr> </mtable> <mo> ) </mo> </mrow> <annotation encoding='Mathematica'> TagBox[RowBox[List[&quot;(&quot;, GridBox[List[List[TagBox[RowBox[List[&quot;n&quot;, &quot;-&quot;, &quot;m&quot;]], Identity, Rule[Editable, True], Rule[Selectable, True]]], List[TagBox[&quot;k&quot;, Identity, Rule[Editable, True], Rule[Selectable, True]]]]], &quot;)&quot;]], InterpretTemplate[Function[Binomial[Slot[1], Slot[2]]]], Rule[Editable, False], Rule[Selectable, False]] </annotation> </semantics> <mo> &#8290; </mo> <mrow> <munderover> <mo> &#8721; </mo> <mrow> <mi> p </mi> <mo> = </mo> <mn> 1 </mn> </mrow> <mrow> <mi> k </mi> <mo> + </mo> <mi> m </mi> <mo> - </mo> <mn> 1 </mn> </mrow> </munderover> <mrow> <mfrac> <mn> 1 </mn> <mi> p </mi> </mfrac> <mo> &#8290; </mo> <mrow> <msubsup> <mi> L </mi> <mrow> <mi> k </mi> <mo> + </mo> <mi> m </mi> <mo> - </mo> <mi> p </mi> <mo> - </mo> <mn> 1 </mn> </mrow> <mrow> <mrow> <mo> - </mo> <mi> k </mi> </mrow> <mo> - </mo> <mi> m </mi> <mo> + </mo> <mi> p </mi> <mo> + </mo> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> </mrow> </msubsup> <mo> ( </mo> <mrow> <mo> - </mo> <mi> z </mi> </mrow> <mo> ) </mo> </mrow> <mo> &#8290; </mo> <mrow> <msubsup> <mi> L </mi> <mrow> <mi> p </mi> <mo> - </mo> <mn> 1 </mn> </mrow> <mrow> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> <mo> - </mo> <mi> p </mi> </mrow> </msubsup> <mo> ( </mo> <mi> z </mi> <mo> ) </mo> </mrow> </mrow> </mrow> </mrow> </mrow> </mrow> <mo> + </mo> <mrow> <msup> <mi> &#8519; </mi> <mi> z </mi> </msup> <mo> &#8290; </mo> <msqrt> <mi> &#960; </mi> </msqrt> <mo> &#8290; </mo> <mrow> <mi> erf </mi> <mo> &#8289; </mo> <mo> ( </mo> <msqrt> <mi> z </mi> </msqrt> <mo> ) </mo> </mrow> <mo> &#8290; </mo> <mtext> </mtext> <msup> <mi> z </mi> <mrow> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> <mo> - </mo> <mi> m </mi> </mrow> </msup> <mo> &#8290; </mo> <mrow> <munderover> <mo> &#8721; </mo> <mrow> <mi> k </mi> <mo> = </mo> <mn> 0 </mn> </mrow> <mrow> <mi> n </mi> <mo> - </mo> <mi> m </mi> </mrow> </munderover> <mrow> <semantics> <mrow> <mo> ( </mo> <mtable> <mtr> <mtd> <mrow> <mi> n </mi> <mo> - </mo> <mi> m </mi> </mrow> </mtd> </mtr> <mtr> <mtd> <mi> k </mi> </mtd> </mtr> </mtable> <mo> ) </mo> </mrow> <annotation encoding='Mathematica'> TagBox[RowBox[List[&quot;(&quot;, GridBox[List[List[TagBox[RowBox[List[&quot;n&quot;, &quot;-&quot;, &quot;m&quot;]], Identity, Rule[Editable, True], Rule[Selectable, True]]], List[TagBox[&quot;k&quot;, Identity, Rule[Editable, True], Rule[Selectable, True]]]]], &quot;)&quot;]], InterpretTemplate[Function[Binomial[Slot[1], Slot[2]]]], Rule[Editable, False], Rule[Selectable, False]] </annotation> </semantics> <mo> &#8290; </mo> <mrow> <msubsup> <mi> L </mi> <mrow> <mi> k </mi> <mo> + </mo> <mi> m </mi> <mo> - </mo> <mn> 1 </mn> </mrow> <mrow> <mrow> <mo> - </mo> <mi> k </mi> </mrow> <mo> - </mo> <mi> m </mi> <mo> + </mo> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> </mrow> </msubsup> <mo> ( </mo> <mrow> <mo> - </mo> <mi> z </mi> </mrow> <mo> ) </mo> </mrow> </mrow> </mrow> </mrow> </mrow> <mo> ) </mo> </mrow> </mrow> <mo> - </mo> <mrow> <msup> <mrow> <mo> ( </mo> <mrow> <mo> - </mo> <mn> 1 </mn> </mrow> <mo> ) </mo> </mrow> <mi> n </mi> </msup> <mo> &#8290; </mo> <msup> <mi> &#8519; </mi> <mi> z </mi> </msup> <mo> &#8290; </mo> <msup> <mi> z </mi> <mrow> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> <mo> - </mo> <mi> m </mi> </mrow> </msup> <mo> &#8290; </mo> <mrow> <mi> &#915; </mi> <mo> &#8289; </mo> <mo> ( </mo> <mrow> <mi> m </mi> <mo> - </mo> <mi> n </mi> <mo> + </mo> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> </mrow> <mo> ) </mo> </mrow> <mo> &#8290; </mo> <mrow> <msubsup> <mi> L </mi> <mrow> <mi> n </mi> <mo> - </mo> <mn> 1 </mn> </mrow> <mrow> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> <mo> - </mo> <mi> m </mi> </mrow> </msubsup> <mo> ( </mo> <mrow> <mo> - </mo> <mi> z </mi> </mrow> <mo> ) </mo> </mrow> </mrow> </mrow> </mrow> <mo> /; </mo> <mrow> <mrow> <mi> n </mi> <mo> &#8712; </mo> <msup> <mi> &#8469; </mi> <mo> + </mo> </msup> </mrow> <mo> &#8743; </mo> <mrow> <mi> m </mi> <mo> &#8712; </mo> <msup> <mi> &#8469; </mi> <mo> + </mo> </msup> </mrow> <mo> &#8743; </mo> <mrow> <mi> m </mi> <mo> &#8804; </mo> <mi> n </mi> </mrow> </mrow> </mrow> <annotation-xml encoding='MathML-Content'> <apply> <ci> Condition </ci> <apply> <eq /> <apply> <ci> HypergeometricU </ci> <ci> n </ci> <apply> <plus /> <ci> m </ci> <cn type='rational'> 1 <sep /> 2 </cn> </apply> <ci> z </ci> </apply> <apply> <plus /> <apply> <times /> <apply> <times /> <apply> <power /> <pi /> <cn type='rational'> 1 <sep /> 2 </cn> </apply> <apply> <power /> <cn type='integer'> -1 </cn> <ci> m </ci> </apply> <apply> <power /> <apply> <ci> Gamma </ci> <apply> <plus /> <apply> <times /> <cn type='integer'> -1 </cn> <ci> m </ci> </apply> <ci> n </ci> <cn type='rational'> 1 <sep /> 2 </cn> </apply> </apply> <cn type='integer'> -1 </cn> </apply> </apply> <apply> <plus /> <apply> <times /> <apply> <power /> <ci> z </ci> <apply> <plus /> <cn type='integer'> 1 </cn> <apply> <times /> <cn type='integer'> -1 </cn> <ci> m </ci> </apply> </apply> </apply> <apply> <sum /> <bvar> <ci> k </ci> </bvar> <lowlimit> <cn type='integer'> 0 </cn> </lowlimit> <uplimit> <apply> <plus /> <ci> n </ci> <apply> <times /> <cn type='integer'> -1 </cn> <ci> m </ci> </apply> </apply> </uplimit> <apply> <times /> <apply> <ci> Binomial </ci> <apply> <plus /> <ci> n </ci> <apply> <times /> <cn type='integer'> -1 </cn> <ci> m </ci> </apply> </apply> <ci> k </ci> </apply> <apply> <sum /> <bvar> <ci> p </ci> </bvar> <lowlimit> <cn type='integer'> 1 </cn> </lowlimit> <uplimit> <apply> <plus /> <ci> k </ci> <ci> m </ci> <cn type='integer'> -1 </cn> </apply> </uplimit> <apply> <times /> <apply> <times /> <cn type='integer'> 1 </cn> <apply> <power /> <ci> p </ci> <cn type='integer'> -1 </cn> </apply> </apply> <apply> <ci> LaguerreL </ci> <apply> <plus /> <ci> k </ci> <ci> m </ci> <apply> <times /> <cn type='integer'> -1 </cn> <ci> p </ci> </apply> <cn type='integer'> -1 </cn> </apply> <apply> <plus /> <apply> <times /> <cn type='integer'> -1 </cn> <ci> k </ci> </apply> <apply> <times /> <cn type='integer'> -1 </cn> <ci> m </ci> </apply> <ci> p </ci> <cn type='rational'> 1 <sep /> 2 </cn> </apply> <apply> <times /> <cn type='integer'> -1 </cn> <ci> z </ci> </apply> </apply> <apply> <ci> LaguerreL </ci> <apply> <plus /> <ci> p </ci> <cn type='integer'> -1 </cn> </apply> <apply> <plus /> <cn type='rational'> 1 <sep /> 2 </cn> <apply> <times /> <cn type='integer'> -1 </cn> <ci> p </ci> </apply> </apply> <ci> z </ci> </apply> </apply> </apply> </apply> </apply> </apply> <apply> <times /> <apply> <power /> <exponentiale /> <ci> z </ci> </apply> <apply> <power /> <pi /> <cn type='rational'> 1 <sep /> 2 </cn> </apply> <apply> <ci> Erf </ci> <apply> <power /> <ci> z </ci> <cn type='rational'> 1 <sep /> 2 </cn> </apply> </apply> <apply> <power /> <ci> z </ci> <apply> <plus /> <cn type='rational'> 1 <sep /> 2 </cn> <apply> <times /> <cn type='integer'> -1 </cn> <ci> m </ci> </apply> </apply> </apply> <apply> <sum /> <bvar> <ci> k </ci> </bvar> <lowlimit> <cn type='integer'> 0 </cn> </lowlimit> <uplimit> <apply> <plus /> <ci> n </ci> <apply> <times /> <cn type='integer'> -1 </cn> <ci> m </ci> </apply> </apply> </uplimit> <apply> <times /> <apply> <ci> Binomial </ci> <apply> <plus /> <ci> n </ci> <apply> <times /> <cn type='integer'> -1 </cn> <ci> m </ci> </apply> </apply> <ci> k </ci> </apply> <apply> <ci> LaguerreL </ci> <apply> <plus /> <ci> k </ci> <ci> m </ci> <cn type='integer'> -1 </cn> </apply> <apply> <plus /> <apply> <times /> <cn type='integer'> -1 </cn> <ci> k </ci> </apply> <apply> <times /> <cn type='integer'> -1 </cn> <ci> m </ci> </apply> <cn type='rational'> 1 <sep /> 2 </cn> </apply> <apply> <times /> <cn type='integer'> -1 </cn> <ci> z </ci> </apply> </apply> </apply> </apply> </apply> </apply> </apply> <apply> <times /> <cn type='integer'> -1 </cn> <apply> <times /> <apply> <power /> <cn type='integer'> -1 </cn> <ci> n </ci> </apply> <apply> <power /> <exponentiale /> <ci> z </ci> </apply> <apply> <power /> <ci> z </ci> <apply> <plus /> <cn type='rational'> 1 <sep /> 2 </cn> <apply> <times /> <cn type='integer'> -1 </cn> <ci> m </ci> </apply> </apply> </apply> <apply> <ci> Gamma </ci> <apply> <plus /> <ci> m </ci> <apply> <times /> <cn type='integer'> -1 </cn> <ci> n </ci> </apply> <cn type='rational'> 1 <sep /> 2 </cn> </apply> </apply> <apply> <ci> LaguerreL </ci> <apply> <plus /> <ci> n </ci> <cn type='integer'> -1 </cn> </apply> <apply> <plus /> <cn type='rational'> 1 <sep /> 2 </cn> <apply> <times /> <cn type='integer'> -1 </cn> <ci> m </ci> </apply> </apply> <apply> <times /> <cn type='integer'> -1 </cn> <ci> z </ci> </apply> </apply> </apply> </apply> </apply> </apply> <apply> <and /> <apply> <in /> <ci> n </ci> <apply> <ci> SuperPlus </ci> <ci> &#8469; </ci> </apply> </apply> <apply> <in /> <ci> m </ci> <apply> <ci> SuperPlus </ci> <ci> &#8469; </ci> </apply> </apply> <apply> <leq /> <ci> m </ci> <ci> n </ci> </apply> </apply> </apply> </annotation-xml> </semantics> </math>










Rule Form





Cell[BoxData[RowBox[List[RowBox[List["HoldPattern", "[", RowBox[List["HypergeometricU", "[", RowBox[List["n_", ",", RowBox[List[FractionBox["1", "2"], "+", "m_"]], ",", "z_"]], "]"]], "]"]], "\[RuleDelayed]", RowBox[List[RowBox[List[FractionBox[RowBox[List[RowBox[List["(", RowBox[List[SqrtBox["\[Pi]"], " ", SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], "m"]]], ")"]], " ", RowBox[List["(", RowBox[List[RowBox[List[SqrtBox["\[Pi]"], " ", SuperscriptBox["z", RowBox[List[FractionBox["1", "2"], "-", "m"]]], " ", SuperscriptBox["\[ExponentialE]", "z"], " ", RowBox[List["Erf", "[", SqrtBox["z"], "]"]], " ", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["k", "=", "0"]], RowBox[List[RowBox[List["-", "m"]], "+", "n"]]], RowBox[List[RowBox[List["Binomial", "[", RowBox[List[RowBox[List[RowBox[List["-", "m"]], "+", "n"]], ",", "k"]], "]"]], " ", RowBox[List["LaguerreL", "[", RowBox[List[RowBox[List[RowBox[List["-", "1"]], "+", "k", "+", "m"]], ",", RowBox[List[FractionBox["1", "2"], "-", "k", "-", "m"]], ",", RowBox[List["-", "z"]]]], "]"]]]]]]]], "+", RowBox[List[SuperscriptBox["z", RowBox[List["1", "-", "m"]]], " ", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["k", "=", "0"]], RowBox[List[RowBox[List["-", "m"]], "+", "n"]]], RowBox[List[RowBox[List["Binomial", "[", RowBox[List[RowBox[List[RowBox[List["-", "m"]], "+", "n"]], ",", "k"]], "]"]], " ", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["p", "=", "1"]], RowBox[List[RowBox[List["-", "1"]], "+", "k", "+", "m"]]], FractionBox[RowBox[List[RowBox[List["LaguerreL", "[", RowBox[List[RowBox[List[RowBox[List["-", "1"]], "+", "k", "+", "m", "-", "p"]], ",", RowBox[List[FractionBox["1", "2"], "-", "k", "-", "m", "+", "p"]], ",", RowBox[List["-", "z"]]]], "]"]], " ", RowBox[List["LaguerreL", "[", RowBox[List[RowBox[List[RowBox[List["-", "1"]], "+", "p"]], ",", RowBox[List[FractionBox["1", "2"], "-", "p"]], ",", "z"]], "]"]]]], "p"]]]]]]]]]]], ")"]]]], RowBox[List["Gamma", "[", RowBox[List[FractionBox["1", "2"], "-", "m", "+", "n"]], "]"]]], "-", RowBox[List[SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], "n"], " ", SuperscriptBox["\[ExponentialE]", "z"], " ", SuperscriptBox["z", RowBox[List[FractionBox["1", "2"], "-", "m"]]], " ", RowBox[List["Gamma", "[", RowBox[List[FractionBox["1", "2"], "+", "m", "-", "n"]], "]"]], " ", RowBox[List["LaguerreL", "[", RowBox[List[RowBox[List[RowBox[List["-", "1"]], "+", "n"]], ",", RowBox[List[FractionBox["1", "2"], "-", "m"]], ",", RowBox[List["-", "z"]]]], "]"]]]]]], "/;", RowBox[List[RowBox[List["n", "\[Element]", "Integers"]], "&&", RowBox[List["n", ">", "0"]], "&&", RowBox[List["m", "\[Element]", "Integers"]], "&&", RowBox[List["m", ">", "0"]], "&&", RowBox[List["m", "\[LessEqual]", "n"]]]]]]]]]]










Date Added to functions.wolfram.com (modification date)





2007-05-02