MathGroup Archive 2011

[Date Index] [Thread Index] [Author Index]

Search the Archive

a bug in Mathematica 7.0?

  • To: mathgroup at smc.vnet.net
  • Subject: [mg115836] a bug in Mathematica 7.0?
  • From: yaqi <yaqiwang at gmail.com>
  • Date: Sat, 22 Jan 2011 03:22:13 -0500 (EST)

Hello,

I was shocked by the integration result of spherical harmonics given
by Mathematica 7.0. The notebook conducting these evaluations is
attached at the end of this post.

Basically, I create a vector of real harmonics Y={Y_{n,k},k=-
n,n;n=0,4} and then integrate Y_{n,k}*Y_{n,k}*Omega_y over the entire
2D sphere. The integral should be zero for Y_{2,2}*Y_{4,-4}*Omega_y
but Mathematica 7.0 gives me -55*Sqrt[21]/512. Similar for Y_{4,2}
*Y_{4,-4}*Omega_y, it should be zero but I get 99*Sqrt[7]/2048.

So I create another vector of normal spherical harmonics by using
'SphericalHarmonicY' and then map it to the real harmonics and do the
integral mentioned above. The only difference is that I have a change
of variable in this integral; instead of using the cosine of the polor
angle, I used the polor angle for the intergal directly. This time,
Mathematica 7.0 gives me correct results.

The only different between the two results are the two terms I
mentioned above. I did the similar thing with Mathematica 5.0.
Everything is correct.

So can somebody take a look on the notebook, see if I messed up some
variable usages or this is indeed a bug in Mathematica 7.0? I use
Mathematica 7.0 for my regular derivations, this really shocked me!

I do not know how to attach a file, so I copy and paste the entire
notebook and attached below.

Many thanks.


=======The attached notebook file=======

In[1]:= RY[n_, k_, mu_, tht_] :=
 If[k == 0, Sqrt[(2*n + 1)/4/Pi]*LegendreP[n, mu],
  If[k > 0,
   Sqrt[2*(2*n + 1)/4/Pi*Factorial[n - k]/Factorial[n + k]]*
    LegendreP[n, k, mu]*Cos[k*tht],
   Sqrt[2*(2*n + 1)/4/Pi*Factorial[n + k]/Factorial[n - k]]*
    LegendreP[n, -k, mu]*Sin[-k*tht]]]

In[2]:= rsph1 = {Flatten[
   Table[RY[n, k, mu, tht], {n, 0, 4}, {k, -n, n}]]}

Out[2]= {{1/(
  2 Sqrt[\[Pi]]), -(1/2) Sqrt[1 - mu^2] Sqrt[3/\[Pi]] Sin[tht],
  1/2 mu Sqrt[3/\[Pi]], -(1/2) Sqrt[1 - mu^2] Sqrt[3/\[Pi]]
    Cos[tht], -(1/4) (-1 + mu^2) Sqrt[15/\[Pi]]
    Sin[2 tht], -(1/2) mu Sqrt[1 - mu^2] Sqrt[15/\[Pi]] Sin[tht],
  1/4 (-1 + 3 mu^2) Sqrt[5/\[Pi]], -(1/2) mu Sqrt[1 - mu^2] Sqrt[
   15/\[Pi]] Cos[tht], -(1/4) (-1 + mu^2) Sqrt[15/\[Pi]]
    Cos[2 tht], -(1/4) (1 - mu^2)^(3/2) Sqrt[35/(2 \[Pi])]
    Sin[3 tht], -(1/4) mu (-1 + mu^2) Sqrt[105/\[Pi]]
    Sin[2 tht], -(1/4) Sqrt[1 - mu^2] (-1 + 5 mu^2) Sqrt[21/(2 \[Pi])]
    Sin[tht],
  1/4 (-3 mu + 5 mu^3) Sqrt[7/\[Pi]], -(1/4) Sqrt[
   1 - mu^2] (-1 + 5 mu^2) Sqrt[21/(2 \[Pi])]
    Cos[tht], -(1/4) mu (-1 + mu^2) Sqrt[105/\[Pi]]
    Cos[2 tht], -(1/4) (1 - mu^2)^(3/2) Sqrt[35/(2 \[Pi])] Cos[3 tht],
   3/16 (-1 + mu^2)^2 Sqrt[35/\[Pi]]
    Sin[4 tht], -(3/4) mu (1 - mu^2)^(3/2) Sqrt[35/(2 \[Pi])]
    Sin[3 tht], -(3/8) (-1 + mu^2) (-1 + 7 mu^2) Sqrt[5/\[Pi]]
    Sin[2 tht], -(3/4) Sqrt[1 - mu^2] (-3 mu + 7 mu^3) Sqrt[5/(
   2 \[Pi])] Sin[tht], (3 (3 - 30 mu^2 + 35 mu^4))/(
  16 Sqrt[\[Pi]]), -(3/4) Sqrt[1 - mu^2] (-3 mu + 7 mu^3) Sqrt[5/(
   2 \[Pi])] Cos[tht], -(3/8) (-1 + mu^2) (-1 + 7 mu^2) Sqrt[5/\[Pi]]
    Cos[2 tht], -(3/4) mu (1 - mu^2)^(3/2) Sqrt[35/(2 \[Pi])]
    Cos[3 tht], 3/16 (-1 + mu^2)^2 Sqrt[35/\[Pi]] Cos[4 tht]}}

In[3]:= omegay = rsph1[[1, 4]]*2/Sqrt[3/Pi]

Out[3]= -Sqrt[1 - mu^2] Cos[tht]

In[4]:= int2 =
 Integrate[
   Transpose[rsph1].rsph1*omegay, {mu, -1, 1}, {tht, 0, 2*Pi}] //
  MatrixForm

Out[4]//MatrixForm= \!\(\*
TagBox[
RowBox[{"(", "", GridBox[{
{"0", "0", "0",
FractionBox["1",
SqrtBox["3"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0",
FractionBox["1",
SqrtBox["5"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["5"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0", "0"},
{
FractionBox["1",
SqrtBox["3"]], "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["15"]]}], "0",
FractionBox["1",
SqrtBox["5"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0"},
{"0",
FractionBox["1",
SqrtBox["5"]], "0", "0", "0", "0", "0", "0", "0",
SqrtBox[
FractionBox["3", "14"]], "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["70"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["7"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0"},
{"0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["15"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0",
SqrtBox[
FractionBox["6", "35"]], "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0"},
{"0", "0",
FractionBox["1",
SqrtBox["5"]], "0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
SqrtBox[
FractionBox["3", "35"]]}], "0",
FractionBox["1",
SqrtBox["7"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0",
FractionBox["1",
SqrtBox["5"]], "0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["70"]]}], "0",
SqrtBox[
FractionBox["3", "14"]],
RowBox[{"-",
FractionBox[
RowBox[{"55", " ",
SqrtBox["21"]}], "512"]}], "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0",
SqrtBox[
FractionBox["3", "14"]], "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0",
FractionBox[
SqrtBox["2"], "3"], "0",
RowBox[{"-",
FractionBox["1",
RowBox[{"3", " ",
SqrtBox["14"]}]]}], "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["7"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["6"]], "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["42"]]}], "0", "0", "0", "0", "0"},
{"0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["70"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0",
SqrtBox[
FractionBox["5", "42"]], "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
SqrtBox[
FractionBox["3", "35"]]}], "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0",
FractionBox[
SqrtBox[
FractionBox["10", "7"]], "3"], "0", "0", "0"},
{"0", "0", "0", "0", "0", "0",
SqrtBox[
FractionBox["6", "35"]], "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["70"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0",
RowBox[{"-",
SqrtBox[
FractionBox["2", "21"]]}], "0",
SqrtBox[
FractionBox["5", "42"]], "0", "0"},
{"0", "0", "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["7"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["42"]]}], "0",
FractionBox["1",
SqrtBox["6"]], "0"},
{"0", "0", "0", "0", "0", "0", "0", "0",
SqrtBox[
FractionBox["3", "14"]], "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
RowBox[{"3", " ",
SqrtBox["14"]}]]}], "0",
FractionBox[
SqrtBox["2"], "3"]},
{"0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox[
RowBox[{"55", " ",
SqrtBox["21"]}], "512"]}],
FractionBox[
SqrtBox["2"], "3"], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0",
FractionBox[
RowBox[{"99", " ",
SqrtBox["7"]}], "2048"], "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["6"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
RowBox[{"3", " ",
SqrtBox["14"]}]]}], "0",
SqrtBox[
FractionBox["5", "42"]], "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["42"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
SqrtBox[
FractionBox["2", "21"]]}], "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
FractionBox[
SqrtBox[
FractionBox["10", "7"]], "3"], "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["42"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
SqrtBox[
FractionBox["5", "42"]], "0",
RowBox[{"-",
FractionBox["1",
RowBox[{"3", " ",
SqrtBox["14"]}]]}],
FractionBox[
RowBox[{"99", " ",
SqrtBox["7"]}], "2048"], "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
"0",
FractionBox["1",
SqrtBox["6"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0",
FractionBox[
SqrtBox["2"], "3"], "0", "0", "0", "0", "0", "0", "0", "0", "0"}
},
GridBoxAlignment->{
      "Columns" -> {{Center}}, "ColumnsIndexed" -> {},
       "Rows" -> {{Baseline}}, "RowsIndexed" -> {}},
GridBoxSpacings->{"Columns" -> {
Offset[0.27999999999999997`], {
Offset[0.7]},
Offset[0.27999999999999997`]}, "ColumnsIndexed" -> {}, "Rows" -> {
Offset[0.2], {
Offset[0.4]},
Offset[0.2]}, "RowsIndexed" -> {}}], "", ")"}],
Function[BoxForm`e$,
MatrixForm[BoxForm`e$]]]\)

In[5]:= isph = {Flatten[
   Table[SphericalHarmonicY[n, k, mu, tht], {n, 0, 4}, {k, -n, n}]]}

Out[5]= {{1/(2 Sqrt[\[Pi]]), 1/2 E^(-I tht) Sqrt[3/(2 \[Pi])] Sin[mu],
   1/2 Sqrt[3/\[Pi]] Cos[mu], -(1/2) E^(I tht) Sqrt[3/(2 \[Pi])]
    Sin[mu], 1/4 E^(-2 I tht) Sqrt[15/(2 \[Pi])] Sin[mu]^2,
  1/2 E^(-I tht) Sqrt[15/(2 \[Pi])] Cos[mu] Sin[mu],
  1/4 Sqrt[5/\[Pi]] (-1 + 3 Cos[mu]^2), -(1/2) E^(I tht) Sqrt[15/(
   2 \[Pi])] Cos[mu] Sin[mu],
  1/4 E^(2 I tht) Sqrt[15/(2 \[Pi])] Sin[mu]^2,
  1/8 E^(-3 I tht) Sqrt[35/\[Pi]] Sin[mu]^3,
  1/4 E^(-2 I tht) Sqrt[105/(2 \[Pi])] Cos[mu] Sin[mu]^2,
  1/8 E^(-I tht) Sqrt[21/\[Pi]] (-1 + 5 Cos[mu]^2) Sin[mu],
  1/4 Sqrt[7/\[Pi]] (-3 Cos[mu] + 5 Cos[mu]^3), -(1/8) E^(I tht) Sqrt[
   21/\[Pi]] (-1 + 5 Cos[mu]^2) Sin[mu],
  1/4 E^(2 I tht) Sqrt[105/(2 \[Pi])] Cos[mu] Sin[mu]^2, -(1/8) E^(
   3 I tht) Sqrt[35/\[Pi]] Sin[mu]^3,
  3/16 E^(-4 I tht) Sqrt[35/(2 \[Pi])] Sin[mu]^4,
  3/8 E^(-3 I tht) Sqrt[35/\[Pi]] Cos[mu] Sin[mu]^3,
  3/8 E^(-2 I tht) Sqrt[5/(2 \[Pi])] (-1 + 7 Cos[mu]^2) Sin[mu]^2,
  3/8 E^(-I tht) Sqrt[5/\[Pi]] Cos[mu] (-3 + 7 Cos[mu]^2) Sin[mu], (
  3 (3 - 30 Cos[mu]^2 + 35 Cos[mu]^4))/(
  16 Sqrt[\[Pi]]), -(3/8) E^(I tht) Sqrt[5/\[Pi]]
    Cos[mu] (-3 + 7 Cos[mu]^2) Sin[mu],
  3/8 E^(2 I tht) Sqrt[5/(
   2 \[Pi])] (-1 + 7 Cos[mu]^2) Sin[mu]^2, -(3/8) E^(3 I tht) Sqrt[
   35/\[Pi]] Cos[mu] Sin[mu]^3,
  3/16 E^(4 I tht) Sqrt[35/(2 \[Pi])] Sin[mu]^4}}

In[6]:= rsph = Simplify[rsph1 /. mu -> Cos[mu], Sin[mu] > 0]

Out[6]= {{1/(2 Sqrt[\[Pi]]), -(1/2) Sqrt[3/\[Pi]] Sin[mu] Sin[tht],
  1/2 Sqrt[3/\[Pi]] Cos[mu], -(1/2) Sqrt[3/\[Pi]] Cos[tht] Sin[mu],
  1/2 Sqrt[15/\[Pi]] Cos[tht] Sin[mu]^2 Sin[tht], -(1/4) Sqrt[
   15/\[Pi]] Sin[2 mu] Sin[tht],
  1/8 Sqrt[5/\[Pi]] (1 + 3 Cos[2 mu]), -(1/4) Sqrt[15/\[Pi]]
    Cos[tht] Sin[2 mu],
  1/4 Sqrt[15/\[Pi]] Cos[2 tht] Sin[mu]^2, -(1/4) Sqrt[35/(2 \[Pi])]
    Sin[mu]^3 Sin[3 tht],
  1/2 Sqrt[105/\[Pi]]
    Cos[mu] Cos[tht] Sin[mu]^2 Sin[tht], -(1/8) Sqrt[21/(
   2 \[Pi])] (3 + 5 Cos[2 mu]) Sin[mu] Sin[tht],
  1/16 Sqrt[7/\[Pi]] (3 Cos[mu] + 5 Cos[3 mu]), -(1/8) Sqrt[21/(
   2 \[Pi])] (3 + 5 Cos[2 mu]) Cos[tht] Sin[mu],
  1/4 Sqrt[105/\[Pi]] Cos[mu] Cos[2 tht] Sin[mu]^2, -(1/4) Sqrt[35/(
   2 \[Pi])] Cos[3 tht] Sin[mu]^3,
  3/16 Sqrt[35/\[Pi]] Sin[mu]^4 Sin[4 tht], -(3/4) Sqrt[35/(2 \[Pi])]
    Cos[mu] Sin[mu]^3 Sin[3 tht],
  3/16 Sqrt[
   5/\[Pi]] (5 + 7 Cos[2 mu]) Sin[mu]^2 Sin[2 tht], -(3/16) Sqrt[5/(
   2 \[Pi])] (9 Cos[mu] + 7 Cos[3 mu]) Sin[mu] Sin[tht], (
  3 (9 + 20 Cos[2 mu] + 35 Cos[4 mu]))/(
  128 Sqrt[\[Pi]]), -(3/16) Sqrt[5/(
   2 \[Pi])] (9 Cos[mu] + 7 Cos[3 mu]) Cos[tht] Sin[mu],
  3/16 Sqrt[
   5/\[Pi]] (5 + 7 Cos[2 mu]) Cos[2 tht] Sin[mu]^2, -(3/4) Sqrt[35/(
   2 \[Pi])] Cos[mu] Cos[3 tht] Sin[mu]^3,
  3/16 Sqrt[35/\[Pi]] Cos[4 tht] Sin[mu]^4}}

In[14]:= (mp =
   Integrate[
    Transpose[rsph].Conjugate[isph]*Sin[mu], {mu, 0, Pi}, {tht, 0,
     2*Pi}]) // MatrixForm

Out[14]//MatrixForm= \!\(\*
TagBox[
RowBox[{"(", "", GridBox[{
{"1", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "1", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0",
RowBox[{"-",
FractionBox["1",
SqrtBox["2"]]}], "0",
FractionBox["1",
SqrtBox["2"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0",
FractionBox["I",
SqrtBox["2"]], "0", "0", "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "1", "0", "0", "0", "0", "0", "0", "0",
        "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["2"]]}], "0",
FractionBox["1",
SqrtBox["2"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0",
FractionBox["1",
SqrtBox["2"]], "0", "0", "0",
FractionBox["1",
SqrtBox["2"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
FractionBox["I",
SqrtBox["2"]], "0", "0", "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "1", "0",
        "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["2"]]}], "0",
FractionBox["1",
SqrtBox["2"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["2"]], "0", "0", "0",
FractionBox["1",
SqrtBox["2"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["2"]]}], "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["2"]], "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0", "0",
FractionBox["I",
SqrtBox["2"]], "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}]},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0", "0", "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0", "0", "0", "0",
FractionBox["I",
SqrtBox["2"]], "0", "0", "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0",
RowBox[{"-",
FractionBox["I",
SqrtBox["2"]]}], "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0", "0", "0", "0", "0", "0", "1", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["2"]]}], "0",
FractionBox["1",
SqrtBox["2"]], "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0", "0", "0", "0",
FractionBox["1",
SqrtBox["2"]], "0", "0", "0",
FractionBox["1",
SqrtBox["2"]], "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["2"]]}], "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["2"]], "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0", "0",
FractionBox["1",
SqrtBox["2"]], "0", "0", "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["2"]]}
},
GridBoxAlignment->{
      "Columns" -> {{Center}}, "ColumnsIndexed" -> {},
       "Rows" -> {{Baseline}}, "RowsIndexed" -> {}},
GridBoxSpacings->{"Columns" -> {
Offset[0.27999999999999997`], {
Offset[0.7]},
Offset[0.27999999999999997`]}, "ColumnsIndexed" -> {}, "Rows" -> {
Offset[0.2], {
Offset[0.4]},
Offset[0.2]}, "RowsIndexed" -> {}}], "", ")"}],
Function[BoxForm`e$,
MatrixForm[BoxForm`e$]]]\)

In[16]:= int1 =
 Integrate[
   Conjugate[mp.Transpose[isph]].isph.Transpose[
      mp]*(SphericalHarmonicY[1, 1, mu, tht] -
       SphericalHarmonicY[1, -1, mu, tht])/Sqrt[2]*2/Sqrt[3/\[Pi]]*
    Sin[mu], {mu, 0, Pi}, {tht, 0, 2*Pi}] // MatrixForm

Out[16]//MatrixForm= \!\(\*
TagBox[
RowBox[{"(", "", GridBox[{
{"0", "0", "0",
FractionBox["1",
SqrtBox["3"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0",
FractionBox["1",
SqrtBox["5"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["5"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0", "0"},
{
FractionBox["1",
SqrtBox["3"]], "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["15"]]}], "0",
FractionBox["1",
SqrtBox["5"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0"},
{"0",
FractionBox["1",
SqrtBox["5"]], "0", "0", "0", "0", "0", "0", "0",
SqrtBox[
FractionBox["3", "14"]], "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["70"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["7"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0"},
{"0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["15"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0",
SqrtBox[
FractionBox["6", "35"]], "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0"},
{"0", "0",
FractionBox["1",
SqrtBox["5"]], "0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
SqrtBox[
FractionBox["3", "35"]]}], "0",
FractionBox["1",
SqrtBox["7"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0",
FractionBox["1",
SqrtBox["5"]], "0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["70"]]}], "0",
SqrtBox[
FractionBox["3", "14"]], "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0",
SqrtBox[
FractionBox["3", "14"]], "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0",
FractionBox[
SqrtBox["2"], "3"], "0",
RowBox[{"-",
FractionBox["1",
RowBox[{"3", " ",
SqrtBox["14"]}]]}], "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["7"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["6"]], "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["42"]]}], "0", "0", "0", "0", "0"},
{"0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["70"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0",
SqrtBox[
FractionBox["5", "42"]], "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
SqrtBox[
FractionBox["3", "35"]]}], "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0",
FractionBox[
SqrtBox[
FractionBox["10", "7"]], "3"], "0", "0", "0"},
{"0", "0", "0", "0", "0", "0",
SqrtBox[
FractionBox["6", "35"]], "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["70"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0",
RowBox[{"-",
SqrtBox[
FractionBox["2", "21"]]}], "0",
SqrtBox[
FractionBox["5", "42"]], "0", "0"},
{"0", "0", "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["7"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["42"]]}], "0",
FractionBox["1",
SqrtBox["6"]], "0"},
{"0", "0", "0", "0", "0", "0", "0", "0",
SqrtBox[
FractionBox["3", "14"]], "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
RowBox[{"3", " ",
SqrtBox["14"]}]]}], "0",
FractionBox[
SqrtBox["2"], "3"]},
{"0", "0", "0", "0", "0", "0", "0", "0", "0",
FractionBox[
SqrtBox["2"], "3"], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
FractionBox["1",
SqrtBox["6"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
RowBox[{"3", " ",
SqrtBox["14"]}]]}], "0",
SqrtBox[
FractionBox["5", "42"]], "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["42"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
RowBox[{"-",
SqrtBox[
FractionBox["2", "21"]]}], "0", "0", "0", "0", "0", "0", "0", "0",
       "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
FractionBox[
SqrtBox[
FractionBox["10", "7"]], "3"], "0",
RowBox[{"-",
FractionBox["1",
SqrtBox["42"]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
SqrtBox[
FractionBox["5", "42"]], "0",
RowBox[{"-",
FractionBox["1",
RowBox[{"3", " ",
SqrtBox["14"]}]]}], "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
"0",
FractionBox["1",
SqrtBox["6"]], "0", "0", "0", "0", "0", "0", "0", "0", "0", "0"},
{"0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0", "0",
        "0",
FractionBox[
SqrtBox["2"], "3"], "0", "0", "0", "0", "0", "0", "0", "0", "0"}
},
GridBoxAlignment->{
      "Columns" -> {{Center}}, "ColumnsIndexed" -> {},
       "Rows" -> {{Baseline}}, "RowsIndexed" -> {}},
GridBoxSpacings->{"Columns" -> {
Offset[0.27999999999999997`], {
Offset[0.7]},
Offset[0.27999999999999997`]}, "ColumnsIndexed" -> {}, "Rows" -> {
Offset[0.2], {
Offset[0.4]},
Offset[0.2]}, "RowsIndexed" -> {}}], "", ")"}],
Function[BoxForm`e$,
MatrixForm[BoxForm`e$]]]\)


  • Prev by Date: Re: Simple n-tuple problem - with no simple solution
  • Next by Date: Re: Compilation options question
  • Previous by thread: Re: Do I need MathLink to run finite-difference fast enough for
  • Next by thread: Re: a bug in Mathematica 7.0?