(*********************************************************************** Mathematica-Compatible Notebook This notebook can be used on any computer system with Mathematica 3.0, MathReader 3.0, or any compatible application. The data for the notebook starts with the line of stars above. To get the notebook into a Mathematica-compatible application, do one of the following: * Save the data starting with the line of stars above into a file with a name ending in .nb, then open the file inside the application; * Copy the data starting with the line of stars above to the clipboard, then use the Paste menu command inside the application. Data for notebooks contains only printable 7-bit ASCII and can be sent directly in email or through ftp in text mode. Newlines can be CR, LF or CRLF (Unix, Macintosh or MS-DOS style). NOTE: If you modify the data for this notebook not in a Mathematica- compatible application, you must delete the line below containing the word CacheID, otherwise Mathematica-compatible applications may try to use invalid cache data. For more information on notebooks and Mathematica-compatible applications, contact Wolfram Research: web: http://www.wolfram.com email: info@wolfram.com phone: +1-217-398-0700 (U.S.) Notebook reader applications are available free of charge from Wolfram Research. ***********************************************************************) (*CacheID: 232*) (*NotebookFileLineBreakTest NotebookFileLineBreakTest*) (*NotebookOptionsPosition[ 36603, 943]*) (*NotebookOutlinePosition[ 37270, 967]*) (* CellTagsIndexPosition[ 37226, 963]*) (*WindowFrame->Normal*) Notebook[{ Cell[CellGroupData[{ Cell["Variational Calculus", "Subtitle"], Cell["\<\ Written by Lic. Renan Cabrera Lafuente Supported by \"Academia Nacional de Ciencias de Bolivia\" renanbo@hotmail.com rencabla@ceibo.entelnet.bo La Paz Bolivia -2000\ \>", "SmallText"], Cell["\<\ This notebook needs the package versora.m which can be found at: http://www.mathsource.com/Content/Applications/Mathematics/0211-363 \ \>", "SmallText"], Cell[BoxData[{ \(Needs["\", "\"]\), \(<< Calculus`VariationalMethods`\)}], "Input"], Cell[CellGroupData[{ Cell["Lorentz Force", "Section"], Cell["\<\ First of all we define output formats for functions we are going to use\ \>", "Text"], Cell[BoxData[{ \(rP\ = \ x[t]\ \ e[x] + y[t]\ e[y] + z[t]\ e[z]; \n\ \n Format[\[Phi][_, _, _]] = \ \ \[Phi][Vec[r]\ ]; \n\n Format[\ \n\t\t\ \(\(Derivative[\ n___\ ]\)[\[Phi]]\)\ [\ _, _, _]\ \ \n \t\t\ \ \ \ \ \ \ \ \ ]\ := \ \(\(Derivative[n]\)[\[Phi]]\)[Vec[r]]\n \), \(Format[Ax[_, _, _]] = \ \ Ax[Vec[r]\ ]; \n Format[Ay[_, _, _]] = \ \ Ay[Vec[r]]\ ; \n Format[Az[_, _, _]] = \ \ Az[Vec[r]]\ ; \n\n Format[\ \n\t\t\ \(\(Derivative[\ n___\ ]\)[Ax]\)\ [\ _, _, _]\ \ \n \t\t\ \ \ \ \ \ \ \ \ ]\ := \ \(\(Derivative[n]\)[Ax]\)[Vec[r]]\n\), \(Format[\ \n\t\t\ \(\(Derivative[\ n___\ ]\)[Ay]\)\ [\ _, _, _]\ \ \n \t\t\ \ \ \ \ \ \ \ \ ]\ := \ \(\(Derivative[n]\)[Ay]\)[Vec[r]]\n\), \(Format[\ \n\t\t\ \(\(Derivative[\ n___\ ]\)[Az]\)\ [\ _, _, _]\ \ \n \t\t\ \ \ \ \ \ \ \ \ ]\ := \ \(\(Derivative[n]\)[Az]\)[Vec[r]]\n \)}], "Input"], Cell["Now we define the Velocity and the Potential Vector", "Text"], Cell[CellGroupData[{ Cell[BoxData[ \(V\ = \ D[rP, t]; \n A\ = \ Ax[x[t], y[t], z[t]\ \ \ ]\ e[x] + \ Ay[x[t], y[t], z[t]]\ e[y] + \ Az\ [x[t], y[t], z[t]]\ e[z]\)], "Input"], Cell[BoxData[ FormBox[ RowBox[{ RowBox[{ FormBox[ RowBox[{"Ax", "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"], " ", FormBox[\(e\_x\), "TraditionalForm"]}], "+", RowBox[{ FormBox[ RowBox[{"Ay", "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"], " ", FormBox[\(e\_y\), "TraditionalForm"]}], "+", RowBox[{ FormBox[ RowBox[{"Az", "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"], " ", FormBox[\(e\_z\), "TraditionalForm"]}]}], TraditionalForm]], "Output"] }, Open ]], Cell["Here we define the Lagrangian", "Text"], Cell[CellGroupData[{ Cell[BoxData[ \(T\ = \ m/2\ PE[V, V]; \n U\ = \ q\ \[Phi][x[t], y[t], z[t]]\ \ - \((q/c)\)\ PE[\ A\ , \ V\ ]\ ; \n\nLag\ = \ T\ - \ U\)], "Input"], Cell[BoxData[ FormBox[ RowBox[{ RowBox[{\(-q\), " ", FormBox[ RowBox[{"\[Phi]", "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "+", FractionBox[ RowBox[{"q", " ", RowBox[{"(", RowBox[{ RowBox[{ FormBox[ RowBox[{"Ax", "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"], " ", RowBox[{ SuperscriptBox["x", "\[Prime]", MultilineFunction->None], "(", "t", ")"}]}], "+", RowBox[{ FormBox[ RowBox[{"Ay", "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"], " ", RowBox[{ SuperscriptBox["y", "\[Prime]", MultilineFunction->None], "(", "t", ")"}]}], "+", RowBox[{ FormBox[ RowBox[{"Az", "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"], " ", RowBox[{ SuperscriptBox["z", "\[Prime]", MultilineFunction->None], "(", "t", ")"}]}]}], ")"}]}], "c"], "+", RowBox[{\(1\/2\), " ", "m", " ", RowBox[{"(", RowBox[{ SuperscriptBox[ RowBox[{ SuperscriptBox["x", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], "2"], "+", SuperscriptBox[ RowBox[{ SuperscriptBox["y", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], "2"], "+", SuperscriptBox[ RowBox[{ SuperscriptBox["z", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], "2"]}], ")"}]}]}], TraditionalForm]], "Output"] }, Open ]], Cell["And finaly we obtain its Euler Lagrange Equations", "Text"], Cell[CellGroupData[{ Cell[BoxData[ \(Ec\ = \ EulerEquations[Lag, {x[t], y[t], z[t]\ }, t] // ExpandAll\)], "Input"], Cell[BoxData[ FormBox[ RowBox[{"{", RowBox[{ RowBox[{ RowBox[{ RowBox[{\(-m\), " ", RowBox[{ SuperscriptBox["x", "\[DoublePrime]", MultilineFunction->None], "(", "t", ")"}]}], "-", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["z", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ax", TagBox[\((0, 0, 1)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "-", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["y", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ax", TagBox[\((0, 1, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "+", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["y", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ay", TagBox[\((1, 0, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "+", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["z", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Az", TagBox[\((1, 0, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "-", RowBox[{"q", " ", FormBox[ RowBox[{ SuperscriptBox["\[Phi]", TagBox[\((1, 0, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}]}], "==", "0"}], ",", RowBox[{ RowBox[{ RowBox[{\(-m\), " ", RowBox[{ SuperscriptBox["y", "\[DoublePrime]", MultilineFunction->None], "(", "t", ")"}]}], "-", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["z", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ay", TagBox[\((0, 0, 1)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "+", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["x", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ax", TagBox[\((0, 1, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "+", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["z", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Az", TagBox[\((0, 1, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "-", RowBox[{"q", " ", FormBox[ RowBox[{ SuperscriptBox["\[Phi]", TagBox[\((0, 1, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "-", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["x", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ay", TagBox[\((1, 0, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"]}], "==", "0"}], ",", RowBox[{ RowBox[{ RowBox[{\(-m\), " ", RowBox[{ SuperscriptBox["z", "\[DoublePrime]", MultilineFunction->None], "(", "t", ")"}]}], "+", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["x", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ax", TagBox[\((0, 0, 1)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "+", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["y", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ay", TagBox[\((0, 0, 1)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "-", RowBox[{"q", " ", FormBox[ RowBox[{ SuperscriptBox["\[Phi]", TagBox[\((0, 0, 1)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "-", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["y", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Az", TagBox[\((0, 1, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "-", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["x", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Az", TagBox[\((1, 0, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"]}], "==", "0"}]}], "}"}], TraditionalForm]], "Output"] }, Open ]], Cell["\<\ Now lets calculate the above from its direct formula to compare \ \>", "Text"], Cell[BoxData[ \(\(\(LorentzF\ = \ q \((\ \ cE\ + \ \((1/c)\)\ \ PV[v, B]\ \ )\)\ ; \)\n\)\)], "Input"], Cell[BoxData[ \(v\ = \ \(x'\)[t]\ e[x] + \ \(y'\)[t]\ e[y]\ + \ \(z'\)[t]\ e[z]; \n \t\t\nB\ \ \ = \ Rot[Ax[x, y, z]\ e[x] + Ay[x, y, z]\ e[y] + Az[x, y, z]\ e[z]]\ \ /. \ Rot[Cartesian]; \n\n cE\ = \ \ \ \(-Grad[\ \[Phi][x, y, z]\ ]\)\ /. Grad[Cartesian]\ \ ; \)], "Input"], Cell[CellGroupData[{ Cell[BoxData[ \(Collect[ExpandAll[LorentzF], {e[x], e[y], e[z]}]\)], "Input"], Cell[BoxData[ FormBox[ RowBox[{ RowBox[{ FormBox[\(e\_y\), "TraditionalForm"], " ", RowBox[{"(", RowBox[{ RowBox[{"-", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["z", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ay", TagBox[\((0, 0, 1)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"]}], "+", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["x", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ax", TagBox[\((0, 1, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "+", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["z", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Az", TagBox[\((0, 1, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "-", RowBox[{"q", " ", FormBox[ RowBox[{ SuperscriptBox["\[Phi]", TagBox[\((0, 1, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "-", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["x", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ay", TagBox[\((1, 0, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"]}], ")"}]}], "+", RowBox[{ FormBox[\(e\_z\), "TraditionalForm"], " ", RowBox[{"(", RowBox[{ FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["x", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ax", TagBox[\((0, 0, 1)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "+", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["y", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ay", TagBox[\((0, 0, 1)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "-", RowBox[{"q", " ", FormBox[ RowBox[{ SuperscriptBox["\[Phi]", TagBox[\((0, 0, 1)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "-", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["y", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Az", TagBox[\((0, 1, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "-", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["x", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Az", TagBox[\((1, 0, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"]}], ")"}]}], "+", RowBox[{ FormBox[\(e\_x\), "TraditionalForm"], " ", RowBox[{"(", RowBox[{ RowBox[{"-", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["z", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ax", TagBox[\((0, 0, 1)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"]}], "-", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["y", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ax", TagBox[\((0, 1, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "+", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["y", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Ay", TagBox[\((1, 0, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "+", FractionBox[ RowBox[{"q", " ", RowBox[{ SuperscriptBox["z", "\[Prime]", MultilineFunction->None], "(", "t", ")"}], " ", FormBox[ RowBox[{ SuperscriptBox["Az", TagBox[\((1, 0, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}], "c"], "-", RowBox[{"q", " ", FormBox[ RowBox[{ SuperscriptBox["\[Phi]", TagBox[\((1, 0, 0)\), Derivative], MultilineFunction->None], "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}], "TraditionalForm"]}]}], ")"}]}]}], TraditionalForm]], "Output"] }, Open ]] }, Closed]], Cell[CellGroupData[{ Cell["Schrodinger Equation", "Section"], Cell["\<\ Now is the time for the Schrodinger Equation. As later we define output \ formats , but also a rule to reshape the Laplacian\ \>", "Text"], Cell[BoxData[ \(VectorSimplify[w_] := w /. \ {\n\ \ \ \ \ \ \t a_. \(\( Derivative[2, 0, 0, 0]\)[f_]\)[x__] + a_. \(\( Derivative[0, 2, 0, 0]\)[f_]\)[x__] + a_. \(\( Derivative[0, 0, 2, 0]\)[f_]\)[x__] :> a\ Laplacian[f[x]]\n\t\t}\)], "Input"], Cell[BoxData[ \(\(\n\t Format[\ \(\(Derivative[d___]\)[\[Psi]]\)[x, y, z, t]\ ] = \ \ \ \(\(Derivative[d]\)[\[Psi]]\)[Vec[r], t]; \n\n\t Format[\ \(\(Derivative[d___]\)[\[Psi]c]\)[x, y, z, t]\ ] = \ \ \ \(\(Derivative[d]\)[\ Superscript[\[Psi], "\<*\>"]\ ]\)[Vec[r], t]; \n\n \ Format[\ \[Psi][x, y, z, t]\ ] = \[Psi][Vec[r], t]; \n\n\ Format[\ \[Psi]c[x, y, z, t]\ ] = \ Superscript[\[Psi][Vec[r], t], "\<*\>"]; \n\n Format[\ \(\(Derivative[0, 0, 0, 1]\)[\[Psi]]\)[x, y, z, t]\ ] = \ \ \ HoldForm[\ D[\[Psi][Vec[r]], t]]; \n\n Format[\ \(\(Derivative[0, 0, 0, 1]\)[\[Psi]c]\)[x, y, z, t]\ ] = \ \ \n \t\t\ HoldForm[\ \ \ \ \ \n\t\t\t\ \ Superscript[\ \ \ \ \ \ D[\[Psi][Vec[r]], t]\ \ \ \ \ , "\<*\>"\ \ ] \ \ \ \ \n\ \ \ \ \ \ \ \ \ \ \ \ \ ]; \n\)\)], "Input"], Cell["Now we define the Lagarangian", "Text"], Cell[CellGroupData[{ Cell[BoxData[{ \(Clear[V]; \n\n h^2/\((8\ Pi^2\ m\ )\)\ PE[Grad[\[Psi][x, y, z, t]], Grad[\[Psi]c[x, y, z, t]]] + \ V\ \[Psi][x, y, z, t]\ \ \[Psi]c[x, y, z, t] + \ h/\((2 Pi\ I)\) \((\ \[Psi]c[x, y, z, t]\ D[\[Psi][x, y, z, t], t]\ - \[Psi]\ \ D[\ \[Psi]c[x, y, z, t], t]\ )\)\ \n\), \(\(L\ = \ %\ /. \ Grad[Cartesian]; \)\)}], "Input"], Cell[BoxData[ FormBox[ RowBox[{ FractionBox[ RowBox[{ FormBox[ RowBox[{ FormBox[ RowBox[{"\[Del]", FormBox[ RowBox[{"\[Psi]", "(", RowBox[{ FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ",", "t"}], ")"}], "TraditionalForm"]}], "TraditionalForm"], "\[SmallCircle]", FormBox[ RowBox[{"\[Del]", FormBox[ InterpretationBox[ SuperscriptBox[ RowBox[{"\[Psi]", "(", RowBox[{ FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ",", "t"}], ")"}], \("*"\)], Superscript[ \[Psi][ Vec[ r], t], "*"], Editable->False], "TraditionalForm"]}], "TraditionalForm"]}], "TraditionalForm"], " ", \(h\^2\)}], \(8\ m\ \[Pi]\^2\)], "-", FractionBox[ RowBox[{"\[ImaginaryI]", " ", RowBox[{"(", RowBox[{ RowBox[{ FormBox[ InterpretationBox[ SuperscriptBox[ RowBox[{"\[Psi]", "(", RowBox[{ FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ",", "t"}], ")"}], \("*"\)], Superscript[ \[Psi][ Vec[ r], t], "*"], Editable->False], "TraditionalForm"], " ", FormBox[ TagBox[ FractionBox[ RowBox[{"\[PartialD]", RowBox[{"\[Psi]", "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}]}], \(\[PartialD]t\), MultilineFunction->None], HoldForm], "TraditionalForm"]}], "-", RowBox[{"\[Psi]", " ", FormBox[ TagBox[ InterpretationBox[ SuperscriptBox[ RowBox[{"(", FractionBox[ RowBox[{"\[PartialD]", RowBox[{"\[Psi]", "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}]}], \(\[PartialD]t\), MultilineFunction->None], ")"}], \("*"\)], Superscript[ D[ \[Psi][ Vec[ r]], t], "*"], Editable->False], HoldForm], "TraditionalForm"]}]}], ")"}], " ", "h"}], \(2\ \[Pi]\)], "+", RowBox[{"V", " ", FormBox[ RowBox[{"\[Psi]", "(", RowBox[{ FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ",", "t"}], ")"}], "TraditionalForm"], " ", FormBox[ InterpretationBox[ SuperscriptBox[ RowBox[{"\[Psi]", "(", RowBox[{ FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ",", "t"}], ")"}], \("*"\)], Superscript[ \[Psi][ Vec[ r], t], "*"], Editable->False], "TraditionalForm"]}]}], TraditionalForm]], "Output"] }, Open ]], Cell["And finaly we obtain the Schrodinger Equation as we know ", "Text"], Cell[BoxData[ \(\(EC\ = \ EulerEquations[ L, {\[Psi][x, y, z, t], \[Psi]c[x, y, z, t]}, {x, y, z, t}] // ExpandAll; \)\)], "Input"], Cell[CellGroupData[{ Cell[BoxData[ \(\(EC\ // VectorSimplify\ \)\)], "Input"], Cell[BoxData[ FormBox[ RowBox[{"{", RowBox[{ RowBox[{ RowBox[{ RowBox[{"-", FractionBox[ RowBox[{ RowBox[{"(", FormBox[ RowBox[{\("\[Del]"\^2\), " ", FormBox[ InterpretationBox[ SuperscriptBox[ RowBox[{"\[Psi]", "(", RowBox[{ FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ",", "t"}], ")"}], \("*"\)], Superscript[ \[Psi][ Vec[ r], t], "*"], Editable->False], "TraditionalForm"]}], "TraditionalForm"], ")"}], " ", \(h\^2\)}], \(8\ m\ \[Pi]\^2\)]}], "+", FractionBox[ RowBox[{"\[ImaginaryI]", " ", FormBox[ TagBox[ InterpretationBox[ SuperscriptBox[ RowBox[{"(", FractionBox[ RowBox[{"\[PartialD]", RowBox[{"\[Psi]", "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}]}], \(\[PartialD]t\), MultilineFunction->None], ")"}], \("*"\)], Superscript[ D[ \[Psi][ Vec[ r]], t], "*"], Editable->False], HoldForm], "TraditionalForm"], " ", "h"}], \(2\ \[Pi]\)], "+", RowBox[{"V", " ", FormBox[ InterpretationBox[ SuperscriptBox[ RowBox[{"\[Psi]", "(", RowBox[{ FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ",", "t"}], ")"}], \("*"\)], Superscript[ \[Psi][ Vec[ r], t], "*"], Editable->False], "TraditionalForm"]}]}], "==", "0"}], ",", RowBox[{ RowBox[{ RowBox[{"-", FractionBox[ RowBox[{ RowBox[{"(", FormBox[ RowBox[{\("\[Del]"\^2\), " ", FormBox[ RowBox[{"\[Psi]", "(", RowBox[{ FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ",", "t"}], ")"}], "TraditionalForm"]}], "TraditionalForm"], ")"}], " ", \(h\^2\)}], \(8\ m\ \[Pi]\^2\)]}], "-", FractionBox[ RowBox[{"\[ImaginaryI]", " ", FormBox[ TagBox[ FractionBox[ RowBox[{"\[PartialD]", RowBox[{"\[Psi]", "(", FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ")"}]}], \(\[PartialD]t\), MultilineFunction->None], HoldForm], "TraditionalForm"], " ", "h"}], \(2\ \[Pi]\)], "+", RowBox[{"V", " ", FormBox[ RowBox[{"\[Psi]", "(", RowBox[{ FormBox[\(r\&"\[Rule]"\), "TraditionalForm"], ",", "t"}], ")"}], "TraditionalForm"]}]}], "==", "0"}]}], "}"}], TraditionalForm]], "Output"] }, Open ]] }, Closed]] }, Open ]] }, FrontEndVersion->"Microsoft Windows 3.0", ScreenRectangle->{{0, 1024}, {0, 735}}, WindowSize->{898, 568}, WindowMargins->{{0, Automatic}, {Automatic, 5}}, Magnification->2 ] (*********************************************************************** Cached data follows. If you edit this Notebook file directly, not using Mathematica, you must remove the line containing CacheID at the top of the file. The cache data will then be recreated when you save this file from within Mathematica. ***********************************************************************) (*CellTagsOutline CellTagsIndex->{} *) (*CellTagsIndex CellTagsIndex->{} *) (*NotebookFileOutline Notebook[{ Cell[CellGroupData[{ Cell[1731, 51, 40, 0, 107, "Subtitle"], Cell[1774, 53, 194, 7, 174, "SmallText"], Cell[1971, 62, 162, 4, 99, "SmallText"], Cell[2136, 68, 140, 2, 74, "Input"], Cell[CellGroupData[{ Cell[2301, 74, 32, 0, 103, "Section"], Cell[2336, 76, 95, 2, 59, "Text"], Cell[2434, 80, 924, 17, 640, "Input"], Cell[3361, 99, 67, 0, 59, "Text"], Cell[CellGroupData[{ Cell[3453, 103, 171, 3, 101, "Input"], Cell[3627, 108, 837, 26, 62, "Output"] }, Open ]], Cell[4479, 137, 45, 0, 59, "Text"], Cell[CellGroupData[{ Cell[4549, 141, 164, 3, 125, "Input"], Cell[4716, 146, 2219, 56, 148, "Output"] }, Open ]], Cell[6950, 205, 65, 0, 59, "Text"], Cell[CellGroupData[{ Cell[7040, 209, 102, 2, 49, "Input"], Cell[7145, 213, 9324, 220, 510, "Output"] }, Open ]], Cell[16484, 436, 89, 2, 59, "Text"], Cell[16576, 440, 113, 2, 74, "Input"], Cell[16692, 444, 311, 6, 202, "Input"], Cell[CellGroupData[{ Cell[17028, 454, 81, 1, 49, "Input"], Cell[17112, 457, 9095, 218, 567, "Output"] }, Open ]] }, Closed]], Cell[CellGroupData[{ Cell[26256, 681, 39, 0, 59, "Section"], Cell[26298, 683, 148, 3, 90, "Text"], Cell[26449, 688, 307, 6, 153, "Input"], Cell[26759, 696, 845, 14, 510, "Input"], Cell[27607, 712, 45, 0, 59, "Text"], Cell[CellGroupData[{ Cell[27677, 716, 399, 8, 229, "Input"], Cell[28079, 726, 4021, 100, 110, "Output"] }, Open ]], Cell[32115, 829, 73, 0, 59, "Text"], Cell[32191, 831, 162, 4, 100, "Input"], Cell[CellGroupData[{ Cell[32378, 839, 61, 1, 48, "Input"], Cell[32442, 842, 4121, 96, 203, "Output"] }, Open ]] }, Closed]] }, Open ]] } ] *) (*********************************************************************** End of Mathematica Notebook file. ***********************************************************************)