|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
http://functions.wolfram.com/04.10.17.0005.01
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
Limit[Log[LCM @@ (h + Range[n] k)]/n, n -> Infinity] ==
(k/EulerPhi[k]) Plus @@ (1/Select[Range[k],
Function[m, GCD[m, k] == 1]]) /; Element[h, Integers] && h > 0 &&
Element[k, Integers] && Element[k > 0 n, Integers] && n > 0 &&
GCD[h, k] == 1
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
Cell[BoxData[RowBox[List[RowBox[List[RowBox[List["Limit", "[", RowBox[List[FractionBox[RowBox[List["Log", "[", RowBox[List["LCM", "@@", RowBox[List["(", RowBox[List["h", "+", RowBox[List[RowBox[List["Range", "[", "n", "]"]], " ", "k"]]]], ")"]]]], "]"]], "n"], ",", RowBox[List["n", "\[Rule]", "\[Infinity]"]]]], "]"]], "\[Equal]", RowBox[List[FractionBox["k", RowBox[List["EulerPhi", "[", "k", "]"]]], " ", RowBox[List["Plus", "@@", FractionBox["1", RowBox[List["Select", "[", RowBox[List[RowBox[List["Range", "[", "k", "]"]], ",", RowBox[List["Function", "[", RowBox[List["m", ",", RowBox[List[RowBox[List["GCD", "[", RowBox[List["m", ",", "k"]], "]"]], "\[Equal]", "1"]]]], "]"]]]], "]"]]]]]]]]], "/;", RowBox[List[RowBox[List["h", "\[Element]", "Integers"]], "\[And]", RowBox[List["h", ">", "0"]], "\[And]", RowBox[List["k", "\[Element]", "Integers"]], "\[And]", RowBox[List[RowBox[List["k", ">", RowBox[List["0", " ", "n"]]]], "\[Element]", "Integers"]], "\[And]", RowBox[List["n", ">", "0"]], "\[And]", RowBox[List[RowBox[List["GCD", "[", RowBox[List["h", ",", "k"]], "]"]], "\[Equal]", "1"]]]]]]]]
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
<math xmlns='http://www.w3.org/1998/Math/MathML' mathematica:form='TraditionalForm' xmlns:mathematica='http://www.wolfram.com/XML/'> <semantics> <mrow> <mrow> <munder> <mi> lim </mi> <mrow> <mi> n </mi> <semantics> <mo> → </mo> <annotation encoding='Mathematica'> "\[Rule]" </annotation> </semantics> <mi> ∞ </mi> </mrow> </munder> <mo> ⁢ </mo> <mfrac> <mrow> <mi> log </mi> <mo> ⁡ </mo> <mo> ( </mo> <mrow> <mi> lcm </mi> <mo> ⁡ </mo> <mo> ( </mo> <mrow> <mrow> <mi> h </mi> <mo> + </mo> <mi> k </mi> </mrow> <mo> , </mo> <mrow> <mi> h </mi> <mo> + </mo> <mrow> <mn> 2 </mn> <mo> ⁢ </mo> <mi> k </mi> </mrow> </mrow> <mo> , </mo> <mo> … </mo> <mo> , </mo> <mrow> <mi> h </mi> <mo> + </mo> <mrow> <mi> n </mi> <mo> ⁢ </mo> <mi> k </mi> </mrow> </mrow> </mrow> <mo> ) </mo> </mrow> <mo> ) </mo> </mrow> <mi> n </mi> </mfrac> </mrow> <mo> ⩵ </mo> <mrow> <mfrac> <mi> k </mi> <mrow> <semantics> <mi> ϕ </mi> <annotation encoding='Mathematica'> TagBox["\[Phi]", EulerPhi] </annotation> </semantics> <mo> ( </mo> <mi> k </mi> <mo> ) </mo> </mrow> </mfrac> <mo> ⁢ </mo> <mrow> <munderover> <mo> ∑ </mo> <munder> <mrow> <mi> m </mi> <mo> = </mo> <mn> 1 </mn> </mrow> <mrow> <mrow> <mi> gcd </mi> <mo> ⁡ </mo> <mo> ( </mo> <mrow> <mi> m </mi> <mo> , </mo> <mi> k </mi> </mrow> <mo> ) </mo> </mrow> <mo> ⩵ </mo> <mn> 1 </mn> </mrow> </munder> <mi> k </mi> </munderover> <mfrac> <mn> 1 </mn> <mi> m </mi> </mfrac> </mrow> </mrow> </mrow> <annotation-xml encoding='MathML-Content'> <apply> <ci> FormBox </ci> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <apply> <ci> UnderscriptBox </ci> <ms> lim </ms> <apply> <ci> RowBox </ci> <list> <ms> n </ms> <ms>  </ms> <ms> ∞ </ms> </list> </apply> </apply> <apply> <ci> FractionBox </ci> <apply> <ci> RowBox </ci> <list> <ms> log </ms> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> lcm </ms> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <ms> h </ms> <ms> + </ms> <ms> k </ms> </list> </apply> <ms> , </ms> <apply> <ci> RowBox </ci> <list> <ms> h </ms> <ms> + </ms> <apply> <ci> RowBox </ci> <list> <ms> 2 </ms> <ms> k </ms> </list> </apply> </list> </apply> <ms> , </ms> <ms> … </ms> <ms> , </ms> <apply> <ci> RowBox </ci> <list> <ms> h </ms> <ms> + </ms> <apply> <ci> RowBox </ci> <list> <ms> n </ms> <ms> k </ms> </list> </apply> </list> </apply> </list> </apply> <ms> ) </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> n </ms> </apply> </list> </apply> <ms> ⩵ </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> FractionBox </ci> <ms> k </ms> <apply> <ci> RowBox </ci> <list> <apply> <ci> TagBox </ci> <ms> ϕ </ms> <ci> EulerPhi </ci> </apply> <ms> ( </ms> <ms> k </ms> <ms> ) </ms> </list> </apply> </apply> <apply> <ci> RowBox </ci> <list> <apply> <ci> ErrorBox </ci> <apply> <ci> UnderoverscriptBox </ci> <ms> ∑ </ms> <apply> <ci> UnderscriptBox </ci> <apply> <ci> RowBox </ci> <list> <ms> m </ms> <ms> = </ms> <ms> 1 </ms> </list> </apply> <apply> <ci> RowBox </ci> <list> <apply> <ci> RowBox </ci> <list> <ms> gcd </ms> <ms> ( </ms> <apply> <ci> RowBox </ci> <list> <ms> m </ms> <ms> , </ms> <ms> k </ms> </list> </apply> <ms> ) </ms> </list> </apply> <ms> ⩵ </ms> <ms> 1 </ms> </list> </apply> </apply> <ms> k </ms> </apply> </apply> <apply> <ci> FractionBox </ci> <ms> 1 </ms> <ms> m </ms> </apply> </list> </apply> </list> </apply> </list> </apply> <ci> TraditionalForm </ci> </apply> </annotation-xml> </semantics> </math>
|
|
|
|
|
|
|
|
|
|
| |
|
|
|
|
| Cell[BoxData[RowBox[List[RowBox[List["HoldPattern", "[", RowBox[List["Limit", "[", RowBox[List[FractionBox[RowBox[List["Log", "[", RowBox[List["LCM", "@@", RowBox[List["(", RowBox[List["h_", "+", RowBox[List[RowBox[List["Range", "[", "n_", "]"]], " ", "k_"]]]], ")"]]]], "]"]], "n_"], ",", RowBox[List["n_", "\[Rule]", "\[Infinity]"]]]], "]"]], "]"]], "\[RuleDelayed]", RowBox[List[FractionBox[RowBox[List["k", " ", RowBox[List["Plus", "@@", FractionBox["1", RowBox[List["Select", "[", RowBox[List[RowBox[List["Range", "[", "k", "]"]], ",", RowBox[List["Function", "[", RowBox[List["m", ",", RowBox[List[RowBox[List["GCD", "[", RowBox[List["m", ",", "k"]], "]"]], "\[Equal]", "1"]]]], "]"]]]], "]"]]]]]]], RowBox[List["EulerPhi", "[", "k", "]"]]], "/;", RowBox[List[RowBox[List["h", "\[Element]", "Integers"]], "&&", RowBox[List["h", ">", "0"]], "&&", RowBox[List["k", "\[Element]", "Integers"]], "&&", RowBox[List[RowBox[List["k", ">", RowBox[List["0", " ", "n"]]]], "\[Element]", "Integers"]], "&&", RowBox[List["n", ">", "0"]], "&&", RowBox[List[RowBox[List["GCD", "[", RowBox[List["h", ",", "k"]], "]"]], "\[Equal]", "1"]]]]]]]]]] |
|
|
|
|
|
|
|
|
|
|
Date Added to functions.wolfram.com (modification date)
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|