|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
http://functions.wolfram.com/08.05.06.0064.01
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
EllipticF[z, m] == (-1)^Round[Re[z]/Pi]
Sum[(((-1)^k Pochhammer[1/2, k]^2)/k!^2) (Log[Sec[z] + Tan[z]] +
(Csc[z]/2) Sum[(((-1)^j (j - 1)!)/Pochhammer[1/2, j]) Tan[z]^(2 j),
{j, 1, k}]) (m - 1)^k, {k, 0, Infinity}] -
Round[Re[z]/Pi] (Log[1 - m] Sum[(((-1)^k Pochhammer[1/2, k]^2)/k!^2)
(m - 1)^k, {k, 0, Infinity}] -
2 Sum[(((-1)^k Pochhammer[1/2, k]^2)/k!^2) (-PolyGamma[k + 1/2] +
PolyGamma[k + 1]) (m - 1)^k, {k, 0, Infinity}]) /;
!Element[(Pi + 2 Re[z])/(4 Pi), Integers]
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
Cell[BoxData[RowBox[List[RowBox[List[RowBox[List["EllipticF", "[", RowBox[List["z", ",", "m"]], "]"]], "\[Equal]", " ", RowBox[List[RowBox[List[SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], RowBox[List["Round", "[", FractionBox[RowBox[List["Re", "[", "z", "]"]], "\[Pi]"], "]"]]], RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["k", "=", "0"]], "\[Infinity]"], RowBox[List[FractionBox[RowBox[List[SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], "k"], SuperscriptBox[RowBox[List["Pochhammer", "[", RowBox[List[FractionBox["1", "2"], ",", "k"]], "]"]], "2"], " "]], SuperscriptBox[RowBox[List["(", " ", RowBox[List["k", "!"]], ")"]], "2"]], RowBox[List["(", RowBox[List[RowBox[List["Log", "[", RowBox[List[RowBox[List["Sec", "[", "z", "]"]], "+", RowBox[List["Tan", "[", "z", "]"]]]], "]"]], "+", RowBox[List[FractionBox[RowBox[List["Csc", "[", "z", "]"]], "2"], RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["j", "=", "1"]], "k"], RowBox[List[FractionBox[RowBox[List[SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], "j"], RowBox[List[RowBox[List["(", RowBox[List["j", "-", "1"]], ")"]], "!"]]]], RowBox[List["Pochhammer", "[", RowBox[List[FractionBox["1", "2"], ",", "j"]], "]"]]], SuperscriptBox[RowBox[List["Tan", "[", "z", "]"]], RowBox[List["2", "j"]]]]]]]]]]], ")"]], SuperscriptBox[RowBox[List["(", RowBox[List["m", "-", "1"]], ")"]], "k"]]]]]]], "-", RowBox[List[RowBox[List["Round", "[", FractionBox[RowBox[List["Re", "[", "z", "]"]], "\[Pi]"], "]"]], " ", RowBox[List["(", RowBox[List[RowBox[List[RowBox[List["Log", "[", RowBox[List["1", "-", "m"]], "]"]], RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["k", "=", "0"]], "\[Infinity]"], RowBox[List[FractionBox[RowBox[List[SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], "k"], SuperscriptBox[RowBox[List["Pochhammer", "[", RowBox[List[FractionBox["1", "2"], ",", "k"]], "]"]], "2"]]], SuperscriptBox[RowBox[List["k", "!"]], "2"]], SuperscriptBox[RowBox[List["(", RowBox[List["m", "-", "1"]], ")"]], "k"]]]]]]], "-", RowBox[List["2", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["k", "=", "0"]], "\[Infinity]"], RowBox[List[FractionBox[RowBox[List[SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], "k"], SuperscriptBox[RowBox[List["Pochhammer", "[", RowBox[List[FractionBox["1", "2"], ",", "k"]], "]"]], "2"]]], SuperscriptBox[RowBox[List["k", "!"]], "2"]], RowBox[List["(", RowBox[List[RowBox[List["-", RowBox[List["PolyGamma", "[", RowBox[List["k", "+", FractionBox["1", "2"]]], "]"]]]], "+", RowBox[List["PolyGamma", "[", RowBox[List["k", "+", "1"]], "]"]]]], ")"]], SuperscriptBox[RowBox[List["(", RowBox[List["m", "-", "1"]], ")"]], "k"]]]]]]]]], ")"]]]]]]]], "/;", RowBox[List["Not", "[", RowBox[List[FractionBox[RowBox[List["\[Pi]", "+", RowBox[List["2", " ", RowBox[List["Re", "[", "z", "]"]]]]]], RowBox[List["4", " ", "\[Pi]"]]], "\[Element]", "Integers"]], "]"]]]]]]
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
<math xmlns='http://www.w3.org/1998/Math/MathML' mathematica:form='TraditionalForm' xmlns:mathematica='http://www.wolfram.com/XML/'> <semantics> <mrow> <mrow> <mrow> <mi> F </mi> <mo> ⁡ </mo> <mo> ( </mo> <mrow> <mi> z </mi> <mo> ❘ </mo> <mi> m </mi> </mrow> <mo> ) </mo> </mrow> <mo> ⩵ </mo> <mrow> <mrow> <msup> <mrow> <mo> ( </mo> <mrow> <mo> - </mo> <mn> 1 </mn> </mrow> <mo> ) </mo> </mrow> <mrow> <mo> ⌊ </mo> <mfrac> <mrow> <mi> Re </mi> <mo> ⁡ </mo> <mo> ( </mo> <mi> z </mi> <mo> ) </mo> </mrow> <mi> π </mi> </mfrac> <mo> ⌉ </mo> </mrow> </msup> <mo> ⁢ </mo> <mrow> <munderover> <mo> ∑ </mo> <mrow> <mi> k </mi> <mo> = </mo> <mn> 0 </mn> </mrow> <mi> ∞ </mi> </munderover> <mrow> <mfrac> <mrow> <msup> <mrow> <mo> ( </mo> <mrow> <mo> - </mo> <mn> 1 </mn> </mrow> <mo> ) </mo> </mrow> <mi> k </mi> </msup> <mo> ⁢ </mo> <msup> <semantics> <msub> <mrow> <mo> ( </mo> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> <mo> ) </mo> </mrow> <mi> k </mi> </msub> <annotation encoding='Mathematica'> TagBox[SubscriptBox[RowBox[List["(", FractionBox["1", "2"], ")"]], "k"], Pochhammer] </annotation> </semantics> <mn> 2 </mn> </msup> </mrow> <msup> <mrow> <mo> ( </mo> <mrow> <mi> k </mi> <mo> ! </mo> </mrow> <mo> ) </mo> </mrow> <mn> 2 </mn> </msup> </mfrac> <mo> ⁢ </mo> <mrow> <mo> ( </mo> <mrow> <mrow> <mi> log </mi> <mo> ⁡ </mo> <mo> ( </mo> <mrow> <mrow> <mi> sec </mi> <mo> ⁡ </mo> <mo> ( </mo> <mi> z </mi> <mo> ) </mo> </mrow> <mo> + </mo> <mrow> <mi> tan </mi> <mo> ⁡ </mo> <mo> ( </mo> <mi> z </mi> <mo> ) </mo> </mrow> </mrow> <mo> ) </mo> </mrow> <mo> + </mo> <mrow> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> <mo> ⁢ </mo> <mrow> <mi> csc </mi> <mo> ⁡ </mo> <mo> ( </mo> <mi> z </mi> <mo> ) </mo> </mrow> <mo> ⁢ </mo> <mrow> <munderover> <mo> ∑ </mo> <mrow> <mi> j </mi> <mo> = </mo> <mn> 1 </mn> </mrow> <mi> k </mi> </munderover> <mfrac> <mrow> <mrow> <mo> ( </mo> <mrow> <msup> <mrow> <mo> ( </mo> <mrow> <mo> - </mo> <mn> 1 </mn> </mrow> <mo> ) </mo> </mrow> <mi> j </mi> </msup> <mo> ⁢ </mo> <mrow> <mrow> <mo> ( </mo> <mrow> <mi> j </mi> <mo> - </mo> <mn> 1 </mn> </mrow> <mo> ) </mo> </mrow> <mo> ! </mo> </mrow> </mrow> <mo> ) </mo> </mrow> <mo> ⁢ </mo> <mrow> <msup> <mi> tan </mi> <mrow> <mn> 2 </mn> <mo> ⁢ </mo> <mi> j </mi> </mrow> </msup> <mo> ( </mo> <mi> z </mi> <mo> ) </mo> </mrow> </mrow> <semantics> <msub> <mrow> <mo> ( </mo> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> <mo> ) </mo> </mrow> <mi> j </mi> </msub> <annotation encoding='Mathematica'> TagBox[SubscriptBox[RowBox[List["(", FractionBox["1", "2"], ")"]], "j"], Pochhammer] </annotation> </semantics> </mfrac> </mrow> </mrow> </mrow> <mo> ) </mo> </mrow> <mo> ⁢ </mo> <msup> <mrow> <mo> ( </mo> <mrow> <mi> m </mi> <mo> - </mo> <mn> 1 </mn> </mrow> <mo> ) </mo> </mrow> <mi> k </mi> </msup> </mrow> </mrow> </mrow> <mo> - </mo> <mtext> </mtext> <mrow> <mrow> <mo> ⌊ </mo> <mfrac> <mrow> <mi> Re </mi> <mo> ⁡ </mo> <mo> ( </mo> <mi> z </mi> <mo> ) </mo> </mrow> <mi> π </mi> </mfrac> <mo> ⌉ </mo> </mrow> <mo> ⁢ </mo> <mrow> <mo> ( </mo> <mtext> </mtext> <mrow> <mrow> <mi> log </mi> <mo> ⁢ </mo> <mrow> <mo> ( </mo> <mrow> <mn> 1 </mn> <mo> - </mo> <mi> m </mi> </mrow> <mo> ) </mo> </mrow> <mo> ⁢ </mo> <mrow> <munderover> <mo> ∑ </mo> <mrow> <mi> k </mi> <mo> = </mo> <mn> 0 </mn> </mrow> <mi> ∞ </mi> </munderover> <mrow> <mfrac> <mrow> <msup> <mrow> <mo> ( </mo> <mrow> <mo> - </mo> <mn> 1 </mn> </mrow> <mo> ) </mo> </mrow> <mi> k </mi> </msup> <mo> ⁢ </mo> <msup> <semantics> <msub> <mrow> <mo> ( </mo> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> <mo> ) </mo> </mrow> <mi> k </mi> </msub> <annotation encoding='Mathematica'> TagBox[SubscriptBox[RowBox[List["(", FractionBox["1", "2"], ")"]], "k"], Pochhammer] </annotation> </semantics> <mn> 2 </mn> </msup> </mrow> <msup> <mrow> <mo> ( </mo> <mrow> <mi> k </mi> <mo> ! </mo> </mrow> <mo> ) </mo> </mrow> <mn> 2 </mn> </msup> </mfrac> <mo> ⁢ </mo> <msup> <mrow> <mo> ( </mo> <mrow> <mi> m </mi> <mo> - </mo> <mn> 1 </mn> </mrow> <mo> ) </mo> </mrow> <mi> k </mi> </msup> </mrow> </mrow> </mrow> <mo> - </mo> <mrow> <mn> 2 </mn> <mo> ⁢ </mo> <mrow> <munderover> <mo> ∑ </mo> <mrow> <mi> k </mi> <mo> = </mo> <mn> 0 </mn> </mrow> <mi> ∞ </mi> </munderover> <mrow> <mfrac> <mrow> <msup> <mrow> <mo> ( </mo> <mrow> <mo> - </mo> <mn> 1 </mn> </mrow> <mo> ) </mo> </mrow> <mi> k </mi> </msup> <mo> ⁢ </mo> <msup> <semantics> <msub> <mrow> <mo> ( </mo> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> <mo> ) </mo> </mrow> <mi> k </mi> </msub> <annotation encoding='Mathematica'> TagBox[SubscriptBox[RowBox[List["(", FractionBox["1", "2"], ")"]], "k"], Pochhammer] </annotation> </semantics> <mn> 2 </mn> </msup> <mo> ⁢ </mo> <mrow> <mo> ( </mo> <mrow> <mrow> <semantics> <mi> ψ </mi> <annotation encoding='Mathematica'> TagBox["\[Psi]", PolyGamma] </annotation> </semantics> <mo> ( </mo> <mrow> <mi> k </mi> <mo> + </mo> <mn> 1 </mn> </mrow> <mo> ) </mo> </mrow> <mo> - </mo> <mrow> <semantics> <mi> ψ </mi> <annotation encoding='Mathematica'> TagBox["\[Psi]", PolyGamma] </annotation> </semantics> <mo> ( </mo> <mrow> <mi> k </mi> <mo> + </mo> <mfrac> <mn> 1 </mn> <mn> 2 </mn> </mfrac> </mrow> <mo> ) </mo> </mrow> </mrow> <mo> ) </mo> </mrow> </mrow> <msup> <mrow> <mo> ( </mo> <mrow> <mi> k </mi> <mo> ! </mo> </mrow> <mo> ) </mo> </mrow> <mn> 2 </mn> </msup> </mfrac> <mo> ⁢ </mo> <msup> <mrow> <mo> ( </mo> <mrow> <mi> m </mi> <mo> - </mo> <mn> 1 </mn> </mrow> <mo> ) </mo> </mrow> <mi> k </mi> </msup> </mrow> </mrow> </mrow> </mrow> <mo> ) </mo> </mrow> </mrow> </mrow> </mrow> <mo> /; </mo> <mrow> <mo> ¬ </mo> <mrow> <mfrac> <mrow> <mrow> <mn> 2 </mn> <mo> ⁢ </mo> <mrow> <mi> Re </mi> <mo> ⁡ </mo> <mo> ( </mo> <mi> z </mi> <mo> ) </mo> </mrow> </mrow> <mo> + </mo> <mi> π </mi> </mrow> <mrow> <mn> 4 </mn> <mo> ⁢ </mo> <mi> π </mi> </mrow> </mfrac> <mo> ∈ </mo> <semantics> <mi> ℤ </mi> <annotation encoding='Mathematica'> TagBox["\[DoubleStruckCapitalZ]", Function[List[], Integers]] </annotation> </semantics> </mrow> </mrow> </mrow> <annotation-xml encoding='MathML-Content'> <apply> <ci> FormBox </ci> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <ms> F </ms> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> z </ms> <ms> ❘ </ms> <ms> m </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> ⩵ </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <apply> <ci> SuperscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> - </ms> <ms> 1 </ms> </list> </apply> <ms> ) </ms> </list> </apply> <apply> <ci> ErrorBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ⌊ </ms> <apply> <ci> FractionBox </ci> <apply> <ci> RowBox </ci> <list> <ms> Re </ms> <ms> ( </ms> <ms> z </ms> <ms> ) </ms> </list> </apply> <ms> π </ms> </apply> <ms> ⌉ </ms> </list> </apply> </apply> </apply> <apply> <ci> RowBox </ci> <list> <apply> <ci> UnderoverscriptBox </ci> <ms> ∑ </ms> <apply> <ci> RowBox </ci> <list> <ms> k </ms> <ms> = </ms> <ms> 0 </ms> </list> </apply> <ms> ∞ </ms> </apply> <apply> <ci> RowBox </ci> <list> <apply> <ci> FractionBox </ci> <apply> <ci> RowBox </ci> <list> <apply> <ci> SuperscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> - </ms> <ms> 1 </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> k </ms> </apply> <apply> <ci> SuperscriptBox </ci> <apply> <ci> TagBox </ci> <apply> <ci> SubscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> FractionBox </ci> <ms> 1 </ms> <ms> 2 </ms> </apply> <ms> ) </ms> </list> </apply> <ms> k </ms> </apply> <ci> Pochhammer </ci> </apply> <ms> 2 </ms> </apply> </list> </apply> <apply> <ci> SuperscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> k </ms> <ms> ! </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> 2 </ms> </apply> </apply> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <ms> log </ms> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <ms> sec </ms> <ms> ( </ms> <ms> z </ms> <ms> ) </ms> </list> </apply> <ms> + </ms> <apply> <ci> RowBox </ci> <list> <ms> tan </ms> <ms> ( </ms> <ms> z </ms> <ms> ) </ms> </list> </apply> </list> </apply> <ms> ) </ms> </list> </apply> <ms> + </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> FractionBox </ci> <ms> 1 </ms> <ms> 2 </ms> </apply> <apply> <ci> RowBox </ci> <list> <ms> csc </ms> <ms> ( </ms> <ms> z </ms> <ms> ) </ms> </list> </apply> <apply> <ci> RowBox </ci> <list> <apply> <ci> UnderoverscriptBox </ci> <ms> ∑ </ms> <apply> <ci> RowBox </ci> <list> <ms> j </ms> <ms> = </ms> <ms> 1 </ms> </list> </apply> <ms> k </ms> </apply> <apply> <ci> FractionBox </ci> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> SuperscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> - </ms> <ms> 1 </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> j </ms> </apply> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> j </ms> <ms> - </ms> <ms> 1 </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> ! </ms> </list> </apply> </list> </apply> <ms> ) </ms> </list> </apply> <apply> <ci> RowBox </ci> <list> <apply> <ci> SuperscriptBox </ci> <ms> tan </ms> <apply> <ci> RowBox </ci> <list> <ms> 2 </ms> <ms> j </ms> </list> </apply> </apply> <ms> ( </ms> <ms> z </ms> <ms> ) </ms> </list> </apply> </list> </apply> <apply> <ci> TagBox </ci> <apply> <ci> SubscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> FractionBox </ci> <ms> 1 </ms> <ms> 2 </ms> </apply> <ms> ) </ms> </list> </apply> <ms> j </ms> </apply> <ci> Pochhammer </ci> </apply> </apply> </list> </apply> </list> </apply> </list> </apply> <ms> ) </ms> </list> </apply> <apply> <ci> SuperscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> m </ms> <ms> - </ms> <ms> 1 </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> k </ms> </apply> </list> </apply> </list> </apply> </list> </apply> <ms> - </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <ms> ⌊ </ms> <apply> <ci> FractionBox </ci> <apply> <ci> RowBox </ci> <list> <ms> Re </ms> <ms> ( </ms> <ms> z </ms> <ms> ) </ms> </list> </apply> <ms> π </ms> </apply> <ms> ⌉ </ms> </list> </apply> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <ms> log </ms> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> 1 </ms> <ms> - </ms> <ms> m </ms> </list> </apply> <ms> ) </ms> </list> </apply> <apply> <ci> RowBox </ci> <list> <apply> <ci> UnderoverscriptBox </ci> <ms> ∑ </ms> <apply> <ci> RowBox </ci> <list> <ms> k </ms> <ms> = </ms> <ms> 0 </ms> </list> </apply> <ms> ∞ </ms> </apply> <apply> <ci> RowBox </ci> <list> <apply> <ci> FractionBox </ci> <apply> <ci> RowBox </ci> <list> <apply> <ci> SuperscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> - </ms> <ms> 1 </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> k </ms> </apply> <apply> <ci> SuperscriptBox </ci> <apply> <ci> TagBox </ci> <apply> <ci> SubscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> FractionBox </ci> <ms> 1 </ms> <ms> 2 </ms> </apply> <ms> ) </ms> </list> </apply> <ms> k </ms> </apply> <ci> Pochhammer </ci> </apply> <ms> 2 </ms> </apply> </list> </apply> <apply> <ci> SuperscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> k </ms> <ms> ! </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> 2 </ms> </apply> </apply> <apply> <ci> SuperscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> m </ms> <ms> - </ms> <ms> 1 </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> k </ms> </apply> </list> </apply> </list> </apply> </list> </apply> <ms> - </ms> <apply> <ci> RowBox </ci> <list> <ms> 2 </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> UnderoverscriptBox </ci> <ms> ∑ </ms> <apply> <ci> RowBox </ci> <list> <ms> k </ms> <ms> = </ms> <ms> 0 </ms> </list> </apply> <ms> ∞ </ms> </apply> <apply> <ci> RowBox </ci> <list> <apply> <ci> FractionBox </ci> <apply> <ci> RowBox </ci> <list> <apply> <ci> SuperscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> - </ms> <ms> 1 </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> k </ms> </apply> <apply> <ci> SuperscriptBox </ci> <apply> <ci> TagBox </ci> <apply> <ci> SubscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> FractionBox </ci> <ms> 1 </ms> <ms> 2 </ms> </apply> <ms> ) </ms> </list> </apply> <ms> k </ms> </apply> <ci> Pochhammer </ci> </apply> <ms> 2 </ms> </apply> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <apply> <ci> TagBox </ci> <ms> ψ </ms> <ci> PolyGamma </ci> </apply> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> k </ms> <ms> + </ms> <ms> 1 </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> - </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> TagBox </ci> <ms> ψ </ms> <ci> PolyGamma </ci> </apply> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> k </ms> <ms> + </ms> <apply> <ci> FractionBox </ci> <ms> 1 </ms> <ms> 2 </ms> </apply> </list> </apply> <ms> ) </ms> </list> </apply> </list> </apply> <ms> ) </ms> </list> </apply> </list> </apply> <apply> <ci> SuperscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> k </ms> <ms> ! </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> 2 </ms> </apply> </apply> <apply> <ci> SuperscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> m </ms> <ms> - </ms> <ms> 1 </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> k </ms> </apply> </list> </apply> </list> </apply> </list> </apply> </list> </apply> <ms> ) </ms> </list> </apply> </list> </apply> </list> </apply> </list> </apply> <ms> /; </ms> <apply> <ci> RowBox </ci> <list> <ms> ¬ </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> FractionBox </ci> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <ms> 2 </ms> <apply> <ci> RowBox </ci> <list> <ms> Re </ms> <ms> ( </ms> <ms> z </ms> <ms> ) </ms> </list> </apply> </list> </apply> <ms> + </ms> <ms> π </ms> </list> </apply> <apply> <ci> RowBox </ci> <list> <ms> 4 </ms> <ms> π </ms> </list> </apply> </apply> <ms> ∈ </ms> <apply> <ci> TagBox </ci> <ms> ℤ </ms> <apply> <ci> Function </ci> <list /> <integers /> </apply> </apply> </list> </apply> </list> </apply> </list> </apply> <ci> TraditionalForm </ci> </apply> </annotation-xml> </semantics> </math>
|
|
|
|
|
|
|
|
|
|
| |
|
|
|
|
| Cell[BoxData[RowBox[List[RowBox[List["HoldPattern", "[", RowBox[List["EllipticF", "[", RowBox[List["z_", ",", "m_"]], "]"]], "]"]], "\[RuleDelayed]", RowBox[List[RowBox[List[RowBox[List[SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], RowBox[List["Round", "[", FractionBox[RowBox[List["Re", "[", "z", "]"]], "\[Pi]"], "]"]]], " ", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["k", "=", "0"]], "\[Infinity]"], FractionBox[RowBox[List[RowBox[List["(", RowBox[List[SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], "k"], " ", SuperscriptBox[RowBox[List["Pochhammer", "[", RowBox[List[FractionBox["1", "2"], ",", "k"]], "]"]], "2"]]], ")"]], " ", RowBox[List["(", RowBox[List[RowBox[List["Log", "[", RowBox[List[RowBox[List["Sec", "[", "z", "]"]], "+", RowBox[List["Tan", "[", "z", "]"]]]], "]"]], "+", RowBox[List[FractionBox["1", "2"], " ", RowBox[List["Csc", "[", "z", "]"]], " ", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["j", "=", "1"]], "k"], FractionBox[RowBox[List[RowBox[List["(", RowBox[List[SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], "j"], " ", RowBox[List[RowBox[List["(", RowBox[List["j", "-", "1"]], ")"]], "!"]]]], ")"]], " ", SuperscriptBox[RowBox[List["Tan", "[", "z", "]"]], RowBox[List["2", " ", "j"]]]]], RowBox[List["Pochhammer", "[", RowBox[List[FractionBox["1", "2"], ",", "j"]], "]"]]]]]]]]], ")"]], " ", SuperscriptBox[RowBox[List["(", RowBox[List["m", "-", "1"]], ")"]], "k"]]], SuperscriptBox[RowBox[List["(", RowBox[List["k", "!"]], ")"]], "2"]]]]]], "-", RowBox[List[RowBox[List["Round", "[", FractionBox[RowBox[List["Re", "[", "z", "]"]], "\[Pi]"], "]"]], " ", RowBox[List["(", RowBox[List[RowBox[List[RowBox[List["Log", "[", RowBox[List["1", "-", "m"]], "]"]], " ", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["k", "=", "0"]], "\[Infinity]"], FractionBox[RowBox[List[RowBox[List["(", RowBox[List[SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], "k"], " ", SuperscriptBox[RowBox[List["Pochhammer", "[", RowBox[List[FractionBox["1", "2"], ",", "k"]], "]"]], "2"]]], ")"]], " ", SuperscriptBox[RowBox[List["(", RowBox[List["m", "-", "1"]], ")"]], "k"]]], SuperscriptBox[RowBox[List["(", RowBox[List["k", "!"]], ")"]], "2"]]]]]], "-", RowBox[List["2", " ", RowBox[List[UnderoverscriptBox["\[Sum]", RowBox[List["k", "=", "0"]], "\[Infinity]"], FractionBox[RowBox[List[RowBox[List["(", RowBox[List[SuperscriptBox[RowBox[List["(", RowBox[List["-", "1"]], ")"]], "k"], " ", SuperscriptBox[RowBox[List["Pochhammer", "[", RowBox[List[FractionBox["1", "2"], ",", "k"]], "]"]], "2"]]], ")"]], " ", RowBox[List["(", RowBox[List[RowBox[List["-", RowBox[List["PolyGamma", "[", RowBox[List["k", "+", FractionBox["1", "2"]]], "]"]]]], "+", RowBox[List["PolyGamma", "[", RowBox[List["k", "+", "1"]], "]"]]]], ")"]], " ", SuperscriptBox[RowBox[List["(", RowBox[List["m", "-", "1"]], ")"]], "k"]]], SuperscriptBox[RowBox[List["(", RowBox[List["k", "!"]], ")"]], "2"]]]]]]]], ")"]]]]]], "/;", RowBox[List["!", RowBox[List[FractionBox[RowBox[List["\[Pi]", "+", RowBox[List["2", " ", RowBox[List["Re", "[", "z", "]"]]]]]], RowBox[List["4", " ", "\[Pi]"]]], "\[Element]", "Integers"]]]]]]]]]] |
|
|
|
|
|
|
|
|
|
|
Date Added to functions.wolfram.com (modification date)
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|