|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
http://functions.wolfram.com/06.06.06.0016.02
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
Gamma[a, z] == Residue[(Gamma[s + a] (1/s))/z^s, {s, 0}] +
Sum[Residue[(1/(z^s s)) Gamma[s + a], {s, -a - j}], {j, 0, Infinity}]
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
Cell[BoxData[RowBox[List[RowBox[List["Gamma", "[", RowBox[List["a", ",", "z"]], "]"]], "\[Equal]", RowBox[List[RowBox[List["Residue", "[", RowBox[List[RowBox[List[RowBox[List["Gamma", "[", RowBox[List["s", "+", "a"]], "]"]], SuperscriptBox["z", RowBox[List["-", "s"]]], FractionBox["1", "s"]]], ",", RowBox[List["{", RowBox[List["s", ",", "0"]], "}"]]]], "]"]], "+", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["j", "=", "0"]], "\[Infinity]"], RowBox[List["Residue", "[", RowBox[List[RowBox[List[FractionBox[SuperscriptBox["z", RowBox[List["-", "s"]]], "s"], RowBox[List["Gamma", "[", RowBox[List["s", "+", "a"]], "]"]]]], ",", RowBox[List["{", RowBox[List["s", ",", RowBox[List[RowBox[List["-", "a"]], "-", "j"]]]], "}"]]]], "]"]]]]]]]]]]
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
<math xmlns='http://www.w3.org/1998/Math/MathML' mathematica:form='TraditionalForm' xmlns:mathematica='http://www.wolfram.com/XML/'> <semantics> <mrow> <mrow> <mi> Γ </mi> <mo> ⁡ </mo> <mo> ( </mo> <mrow> <mi> a </mi> <mo> , </mo> <mi> z </mi> </mrow> <mo> ) </mo> </mrow> <mo> ⩵ </mo> <mrow> <mrow> <mrow> <msub> <mi> res </mi> <mi> s </mi> </msub> <mo> ( </mo> <mrow> <mrow> <mi> Γ </mi> <mo> ⁡ </mo> <mo> ( </mo> <mrow> <mi> a </mi> <mo> + </mo> <mi> s </mi> </mrow> <mo> ) </mo> </mrow> <mo> ⁢ </mo> <msup> <mi> z </mi> <mrow> <mo> - </mo> <mi> s </mi> </mrow> </msup> <mo> ⁢ </mo> <mfrac> <mn> 1 </mn> <mi> s </mi> </mfrac> </mrow> <mo> ) </mo> </mrow> <mo> ⁢ </mo> <mrow> <mo> ( </mo> <mn> 0 </mn> <mo> ) </mo> </mrow> </mrow> <mo> + </mo> <mrow> <munderover> <mo> ∑ </mo> <mrow> <mi> j </mi> <mo> = </mo> <mn> 0 </mn> </mrow> <mi> ∞ </mi> </munderover> <mrow> <mrow> <msub> <mi> res </mi> <mi> s </mi> </msub> <mo> ( </mo> <mrow> <mfrac> <msup> <mi> z </mi> <mrow> <mo> - </mo> <mi> s </mi> </mrow> </msup> <mi> s </mi> </mfrac> <mo> ⁢ </mo> <mrow> <mi> Γ </mi> <mo> ⁡ </mo> <mo> ( </mo> <mrow> <mi> a </mi> <mo> + </mo> <mi> s </mi> </mrow> <mo> ) </mo> </mrow> </mrow> <mo> ) </mo> </mrow> <mo> ⁢ </mo> <mrow> <mo> ( </mo> <mrow> <mrow> <mo> - </mo> <mi> a </mi> </mrow> <mo> - </mo> <mi> j </mi> </mrow> <mo> ) </mo> </mrow> </mrow> </mrow> </mrow> </mrow> <annotation-xml encoding='MathML-Content'> <apply> <eq /> <apply> <ci> Gamma </ci> <ci> a </ci> <ci> z </ci> </apply> <apply> <plus /> <apply> <times /> <apply> <apply> <ci> Subscript </ci> <ci> res </ci> <ci> s </ci> </apply> <apply> <times /> <apply> <ci> Gamma </ci> <apply> <plus /> <ci> a </ci> <ci> s </ci> </apply> </apply> <apply> <power /> <ci> z </ci> <apply> <times /> <cn type='integer'> -1 </cn> <ci> s </ci> </apply> </apply> <apply> <times /> <cn type='integer'> 1 </cn> <apply> <power /> <ci> s </ci> <cn type='integer'> -1 </cn> </apply> </apply> </apply> </apply> <cn type='integer'> 0 </cn> </apply> <apply> <sum /> <bvar> <ci> j </ci> </bvar> <lowlimit> <cn type='integer'> 0 </cn> </lowlimit> <uplimit> <infinity /> </uplimit> <apply> <times /> <apply> <apply> <ci> Subscript </ci> <ci> res </ci> <ci> s </ci> </apply> <apply> <times /> <apply> <times /> <apply> <power /> <ci> z </ci> <apply> <times /> <cn type='integer'> -1 </cn> <ci> s </ci> </apply> </apply> <apply> <power /> <ci> s </ci> <cn type='integer'> -1 </cn> </apply> </apply> <apply> <ci> Gamma </ci> <apply> <plus /> <ci> a </ci> <ci> s </ci> </apply> </apply> </apply> </apply> <apply> <plus /> <apply> <times /> <cn type='integer'> -1 </cn> <ci> a </ci> </apply> <apply> <times /> <cn type='integer'> -1 </cn> <ci> j </ci> </apply> </apply> </apply> </apply> </apply> </apply> </annotation-xml> </semantics> </math>
|
|
|
|
|
|
|
|
|
|
| |
|
|
|
|
| Cell[BoxData[RowBox[List[RowBox[List["HoldPattern", "[", RowBox[List["Gamma", "[", RowBox[List["a_", ",", "z_"]], "]"]], "]"]], "\[RuleDelayed]", RowBox[List[RowBox[List["Residue", "[", RowBox[List[FractionBox[RowBox[List[RowBox[List["Gamma", "[", RowBox[List["s", "+", "a"]], "]"]], " ", SuperscriptBox["z", RowBox[List["-", "s"]]]]], "s"], ",", RowBox[List["{", RowBox[List["s", ",", "0"]], "}"]]]], "]"]], "+", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["j", "=", "0"]], "\[Infinity]"], RowBox[List["Residue", "[", RowBox[List[FractionBox[RowBox[List[SuperscriptBox["z", RowBox[List["-", "s"]]], " ", RowBox[List["Gamma", "[", RowBox[List["s", "+", "a"]], "]"]]]], "s"], ",", RowBox[List["{", RowBox[List["s", ",", RowBox[List[RowBox[List["-", "a"]], "-", "j"]]]], "}"]]]], "]"]]]]]]]]]] |
|
|
|
|
|
|
|
|
|
|
Date Added to functions.wolfram.com (modification date)
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|