(* Content-type: application/mathematica *) (*** Wolfram Notebook File ***) (* http://www.wolfram.com/nb *) (* CreatedBy='Mathematica 6.0' *) (*CacheID: 234*) (* Internal cache information: NotebookFileLineBreakTest NotebookFileLineBreakTest NotebookDataPosition[ 145, 7] NotebookDataLength[ 49209, 1184] NotebookOptionsPosition[ 8925, 322] NotebookOutlinePosition[ 47868, 1138] CellTagsIndexPosition[ 47730, 1130] WindowFrame->Normal ContainsDynamic->False*) (* Beginning of Notebook Content *) Notebook[{ Cell[CellGroupData[{ Cell["\<\ Mathematica Version 6 Compatibility Information (continued)\ \>", "Title"], Cell["\<\ This notebook continues Chapter by Chapter observations. Don't forget to look \ at the introduction in the first notebook! There are no issues with Chapter \ 24.\ \>", "Text"] }, Open ]], Cell[CellGroupData[{ Cell["22 Tiling the Euclidean and hyperbolic planes", "Title", CellTags->"c:1"], Cell[CellGroupData[{ Cell["\<\ 22.2 \[MathematicaIcon] Tiling the Euclidean plane with triangles\ \>", "Section", CellTags->"c:4"], Cell[TextData[{ StyleBox["FontForm", FontFamily->"Courier", FontWeight->"Bold"], " is now obsolete but the author could not figure out how to use ", StyleBox["StyleForm", FontFamily->"Courier", FontWeight->"Bold"], " here. As the early plots with labels are not critcal to most of what \ follows I suggest you just use the following instead of what is in the \ printed text. " }], "Text"], Cell[BoxData[ StyleBox[ RowBox[{ StyleBox[ RowBox[{"pointLabels", "[", RowBox[{ RowBox[{"{", RowBox[{"a_", ",", "la_"}], "}"}], ",", RowBox[{"{", RowBox[{"b_", ",", "lb_"}], "}"}]}], "]"}], FontFamily->"Courier"], StyleBox[":=", FontFamily->"Courier"], "\n", RowBox[{ StyleBox["Module", FontFamily->"Courier"], StyleBox["[", FontFamily->"Courier"], RowBox[{ StyleBox[ RowBox[{"{", RowBox[{"theta", ",", "disp"}], "}"}], FontFamily->"Courier"], StyleBox[",", FontFamily->"Courier"], "\n", RowBox[{ StyleBox[ RowBox[{"theta", "=", RowBox[{"Arg", "[", RowBox[{ RowBox[{ RowBox[{"(", RowBox[{ RowBox[{"First", "[", "#", "]"}], "+", RowBox[{"I", " ", RowBox[{"Last", "[", "#", "]"}]}]}], ")"}], " ", "&"}], " ", "[", RowBox[{"a", "-", "b"}], "]"}], "]"}]}], FontFamily->"Courier"], StyleBox[";", FontFamily->"Courier"], "\n", StyleBox[ RowBox[{"disp", "=", RowBox[{"0.25", "*", RowBox[{"{", RowBox[{ RowBox[{"Cos", "[", RowBox[{"theta", "-", RowBox[{"Pi", "/", "2"}]}], "]"}], ",", RowBox[{"Sin", "[", RowBox[{"theta", "-", RowBox[{"Pi", "/", "2"}]}], "]"}]}], "}"}]}]}], FontFamily->"Courier"], StyleBox[";", FontFamily->"Courier"], "\n", RowBox[{ StyleBox["{", FontFamily->"Courier"], RowBox[{ StyleBox[ RowBox[{"Text", "[", RowBox[{"la", ",", RowBox[{"a", "+", "disp"}]}], "]"}], FontFamily->"Courier"], StyleBox[",", FontFamily->"Courier"], "\n", StyleBox[ RowBox[{"Text", "[", RowBox[{"lb", ",", RowBox[{"b", "+", "disp"}]}], "]"}], FontFamily->"Courier"]}], StyleBox["}", FontFamily->"Courier"]}]}]}], StyleBox["]", FontFamily->"Courier"]}]}], FontWeight->"Bold"]], "Input", GroupPageBreakWithin->Automatic, CellLabel->"In[59]:="], Cell["Everything else in this chapter works fine. ", "Text"] }, Open ]] }, Open ]], Cell[CellGroupData[{ Cell["23 Physics in three and four dimensions I", "Title", CellTags->"c:1"], Cell[CellGroupData[{ Cell[TextData[{ "23.7 \[MathematicaIcon] Warping with ", StyleBox["Mathematica", FontSlant->"Italic"], " " }], "Section", CellTags->"c:12"], Cell["The ExtendGraphics files are located at", "Text"], Cell["http://library.wolfram.com/infocenter/Books/3753/", "Text"], Cell["\<\ where there are download links at the bottom of that web page. Apart from a \ few moans from the kernel, everything here works fine. The window to the \ spaceship is now coloured in but it has a nice feel to it \[LongDash] rather \ like being inside a nebula. At the end of this Section you should do the \ animation as follows:\ \>", "Text"], Cell[BoxData[ RowBox[{"Manipulate", "[", RowBox[{ RowBox[{"Show", "[", RowBox[{"HemiSphere", ",", " ", RowBox[{"abberplota", "[", "m", "]"}], ",", " ", RowBox[{"abberplotb", "[", "m", "]"}]}], "]"}], ",", " ", RowBox[{"{", RowBox[{"m", ",", " ", "0", ",", " ", "9", ",", " ", "1"}], "}"}]}], "]"}]], "Input", CellLabel->"In[185]:=", GroupPageBreakWithin->Automatic] }, Open ]], Cell[CellGroupData[{ Cell["\<\ 23.10 \[MathematicaIcon] Minimal surfaces and null curves II: minimal \ surfaces and visualization in three dimensions\ \>", "Section", CellTags->"c:19"], Cell["\<\ This is definitely a place to use some of the new 3D graphics features!! At \ the very least, given the way these surfaces fold over themselves, try out \ the opacity controls and then use the real time rotation commands. You can \ also zoom in on the hole in the catenoid for example.\ \>", "Text"], Cell["\<\ NullCurve[G_][w_] := Module[{ww, temp, one, two}, one = D[G[ww], ww]; two = D[G[ww], {ww, 2}]; temp = {-2*G[ww]+2*ww*one + (1-ww^2)*two, I*(2*G[ww]-2*ww*one+(1+ww^2)*two), 2*ww*two - 2*one}; Simplify[temp /. ww->w] ]\ \>", "Input", CellLabel->"In[60]:="], Cell["\<\ Let's check it is working by giving it a trivial quadratic \[Dash] we should \ get a point back:\ \>", "Text"], Cell["NullCurve[-1/4((x+I y) + 2 z #-(x - I y)#^2)&][w]", "Input", CellLabel->"In[61]:="], Cell["\<\ Next we wish to write out the real part of these null curves, based on a \ convenient parametrization: \ \>", "Text"], Cell[BoxData[ RowBox[{"Clear", "[", "w", "]"}]], "Input", CellChangeTimes->{{3.394186476867834*^9, 3.3941864785154343`*^9}}, CellLabel->"In[62]:="], Cell["\<\ MinimalSurface[G_, w_, params_] := Module[{null}, null = NullCurve[G][w]; ComplexExpand[Re[null /. w-> params]]]\ \>", "Input", CellLabel->"In[63]:="], Cell[BoxData[ RowBox[{"MinimalSurface", "[", RowBox[{ RowBox[{ RowBox[{"#", "^", "3"}], "&"}], ",", " ", "w", ",", " ", RowBox[{"u", " ", "+", " ", RowBox[{"I", " ", "v"}]}]}], "]"}]], "Input", CellChangeTimes->{{3.394186440346778*^9, 3.394186451642063*^9}, { 3.394186652330577*^9, 3.394186656984037*^9}}, CellLabel->"In[64]:="], Cell["\<\ Next we wish to generate some automatic plotting routines. We also want the \ flexibility to use either Cartesian or Polar coodinates, or possibly a \ hybrid. Let's do a Cartesian version first:\ \>", "Text"], Cell["\<\ CartesianMinimalSurface[G_, w_, {umin_, umax_}, {vmin_, vmax_}, options___] \ := Module[{ms, u, v}, ms = MinimalSurface[G, w, u + I v]; ParametricPlot3D[Evaluate[ms], {u, umin, umax}, {v, vmin, vmax}, options]]\ \>", "Input", CellLabel->"In[65]:="], Cell["Here are some versions for other coordinates:", "Text"], Cell["\<\ PolarMinimalSurface[G_, w_, {umin_, umax_}, {vmin_, vmax_}, options___] := Module[{ms, u, v}, ms = MinimalSurface[G, w, u*Exp[I v]]; ParametricPlot3D[Evaluate[ms], {u, umin, umax}, {v, vmin, vmax}, options]]\ \>", "Input", CellLabel->"In[66]:="], Cell["\<\ ExponentialMinimalSurface[G_, w_, {umin_, umax_}, {vmin_, vmax_}, options___] \ := Module[{ms, u, v}, ms = MinimalSurface[G, w, Exp[u+I v]]; ParametricPlot3D[Evaluate[ms], {u, umin, umax}, {v, vmin, vmax}, options]]\ \>", "Input", CellLabel->"In[67]:="], Cell["\<\ CartesianMinimalSurface[#^3&, w, {-4, 4}, {-4, 4}, PlotPoints -> 30]\ \>", "Input", GroupPageBreakWithin->Automatic, CellLabel->"In[68]:="], Cell["\<\ ExponentialMinimalSurface[#*Log[#]&, w, {-2, 2}, {0, 2 Pi}, PlotPoints -> 30, PlotStyle -> Opacity[0.7]]\ \>", "Input", PageBreakAbove->False, PageBreakWithin->Automatic, GroupPageBreakWithin->Automatic, CellLabel->"In[69]:="], Cell[BoxData[ RowBox[{"CartesianMinimalSurface", "[", RowBox[{ RowBox[{ RowBox[{"1", "/", RowBox[{ RowBox[{"(", RowBox[{"10", "-", RowBox[{"#", "^", "3"}]}], ")"}], "^", RowBox[{"(", RowBox[{"1", "/", "3"}], ")"}]}]}], "&"}], ",", "w", ",", RowBox[{"{", RowBox[{ RowBox[{"-", "1"}], ",", "1"}], "}"}], ",", RowBox[{"{", RowBox[{ RowBox[{"-", "1"}], ",", "1"}], "}"}], ",", RowBox[{"PlotPoints", "\[Rule]", "30"}], ",", RowBox[{"PlotStyle", "\[Rule]", RowBox[{"Opacity", "[", "0.7", "]"}]}]}], "]"}]], "Input", CellLabel->"In[70]:="] }, Open ]] }, Open ]] }, AutoGeneratedPackage->None, ScreenStyleEnvironment->"Printout", WindowToolbars->{"RulerBar", "EditBar"}, WindowSize->{877, 1018}, WindowMargins->{{70, Automatic}, {Automatic, 0}}, PrintingCopies->1, PrintingStartingPageNumber->105, PrintingPageRange->{1, Automatic}, PageHeaders->{{Inherited, Inherited, Cell[ TextData[{"Complex Analysis with Mathematica"}], FontSlant -> "Italic"]}, { Cell[ TextData[{"6 The Mandelbrot set"}], FontSlant -> "Italic"], Inherited, Inherited}}, PageHeaderLines->{False, False}, PrintingOptions->{"PrintCellBrackets"->False, "PrintMultipleHorizontalPages"->False, "PrintRegistrationMarks"->False, "PrintingMargins"->{{67.5625, 67.5625}, {59.5, 59.5}}}, ShowSelection->True, TaggingRules:>{ "PaginationCache" -> {{2003, 11, 9, 15, 46, 39}, {101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 101, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 102, 103, 103, 103, 103, 103, 103, 103, 103, 103, 103, 103, 103, 103, 103, 103, 103, 104, 104, 104, 104, 104, 104, 104, 104, 104, 104, 104, 104, 105, 105, 105, 105, 105, 105, 105, 105, 105, 105, 105, 105, 105, 105, 105, 105, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 106, 107, 107, 107, 107, 107, 107, 107, 107, 107, 107, 107, 107, 107, 107, 108, 108, 108, 108, 108, 108, 108, 108, 108, 108, 108, 108, 108, 108, 108, 109, 109, 109, 109, 109, 109, 109, 109, 109, 109, 109, 110, 110, 110, 110, 111, 111, 111, 111, 112, 112, 112, 112, 112, 112, 112, 112, 112, 112, 112, 113, 113, 113, 113, 113, 113, 113, 113, 113, 114, 114, 114, 114, 114, 114, 115, 115, 115, 115, 115, 115, 115, 115, 116, 116, 116, 116, 116, 116, 116, 117, 117, 117, 117, 117, 117, 117, 118, 118, 118, 118, 118, 118, 118, 118, 118, 118, 118, 119, 119, 119, 119, 119, 119, 119, 120, 120, 120, 120, 120, 120, 120, 120, 121, 121, 121, 121, 122, 122, 122, 122, 122, 122, 122, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 123, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 124, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 125, 126, 126, 126, 126, 127, 127, 127, 127, 127, 127, 127, 127, 127, 128, 128, 128, 129, 129, 129, 130, 130, 130, 130, 130, 130, 131, 132, 132, 132, 132, 132, 132, 132, 132, 132, 133, 133, 133, 133, 133, 133, 133}}}, ShowCellLabel->False, Magnification->1.25, FrontEndVersion->"6.0 for Mac OS X PowerPC (32-bit) (June 19, 2007)", StyleDefinitions->Notebook[{ Cell[ CellGroupData[{ Cell[ "Style Definitions", "Subtitle", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ "Modify the definitions below to change the default appearance of all \ cells in a given styl e. Make modifications to any definition using commands \ in the Format menu.", "Text", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ CellGroupData[{ Cell[ "Style Environment Names", "Section", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ StyleData[All, "Working"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, ScriptMinSize -> 9], Cell[ StyleData[All, "Printout"], PageWidth -> PaperWidth, CellMargins -> {{0, 4}, {Inherited, Inherited}}, ShowCellLabel -> False, ImageSize -> {200, 200}, PrivateFontOptions -> {"FontType" -> "Outline"}]}, Open]], Cell[ CellGroupData[{ Cell[ "Notebook Options", "Section", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ "The options defined for the style below will be used at the \ Notebook level.", "Text", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ StyleData["Notebook"], PageHeaders -> {{ Cell[ TextData[{ CounterBox["Page"]}], "PageNumber"], None, Cell[ TextData[{ ValueBox["FileName"]}], "Header"]}, { Cell[ TextData[{ ValueBox["FileName"]}], "Header"], None, Cell[ TextData[{ CounterBox["Page"]}], "PageNumber"]}}, PageHeaderLines -> {True, True}, PrintingOptions -> { "FacingPages" -> True, "FirstPageHeader" -> False}, CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, CellLabelAutoDelete -> False, CellFrameLabelMargins -> 6, StyleMenuListing -> None]}, Open]], Cell[ CellGroupData[{ Cell[ "Styles for Headings", "Section", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ CellGroupData[{ Cell[ StyleData["Title"], CellFrame -> {{0, 0}, {0, 0.25}}, CellMargins -> {{0, 4}, {4, 20}}, CellOpen -> True, CellGroupingRules -> {"TitleGrouping", 0}, PageBreakBelow -> False, CellFrameMargins -> 9, InputAutoReplacements -> {"TeX" -> StyleBox[ RowBox[{"T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "LaTeX" -> StyleBox[ RowBox[{"L", StyleBox[ AdjustmentBox[ "A", BoxMargins -> {{-0.36, -0.1}, {0, 0}}, BoxBaselineShift -> -0.2], FontSize -> Smaller], "T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "mma" -> "Mathematica", "Mma" -> "Mathematica", "MMA" -> "Mathematica", "webMathematica" -> FormBox[ RowBox[{"web", AdjustmentBox[ StyleBox["Mathematica", FontSlant -> "Italic"], BoxMargins -> {{-0.175, 0}, {0, 0}}]}], TextForm], Inherited}, LineSpacing -> {0.95, 11}, CounterIncrements -> "Title", CounterAssignments -> {{"Section", 0}, {"Equation", 0}, { "Figure", 0}}, FontSize -> 36], Cell[ StyleData["Title", "Printout"], CellMargins -> {{0, 4}, {4, 0}}, CellFrameMargins -> 4, FontSize -> 20]}, Open]], Cell[ CellGroupData[{ Cell[ StyleData["Subtitle"], CellMargins -> {{0, 4}, {0, 10}}, CellOpen -> True, CellGroupingRules -> {"TitleGrouping", 10}, PageBreakBelow -> False, InputAutoReplacements -> {"TeX" -> StyleBox[ RowBox[{"T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "LaTeX" -> StyleBox[ RowBox[{"L", StyleBox[ AdjustmentBox[ "A", BoxMargins -> {{-0.36, -0.1}, {0, 0}}, BoxBaselineShift -> -0.2], FontSize -> Smaller], "T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "mma" -> "Mathematica", "Mma" -> "Mathematica", "MMA" -> "Mathematica", "webMathematica" -> FormBox[ RowBox[{"web", AdjustmentBox[ StyleBox["Mathematica", FontSlant -> "Italic"], BoxMargins -> {{-0.175, 0}, {0, 0}}]}], TextForm], Inherited}, LineSpacing -> {1, 0}, CounterIncrements -> "Subtitle", CounterAssignments -> {{"Section", 0}, {"Equation", 0}, { "Figure", 0}}, FontSize -> 24, FontSlant -> "Italic"], Cell[ StyleData["Subtitle", "Printout"], CellMargins -> {{0, 4}, {0, 10}}, FontSize -> 16]}, Open]], Cell[ CellGroupData[{ Cell[ StyleData["SectionFirst"], CellFrame -> {{0, 0}, {0, 3}}, CellMargins -> {{0, 4}, {4, 30}}, CellOpen -> True, CellGroupingRules -> {"SectionGrouping", 40}, PageBreakBelow -> False, CellFrameMargins -> 3, InputAutoReplacements -> {"TeX" -> StyleBox[ RowBox[{"T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "LaTeX" -> StyleBox[ RowBox[{"L", StyleBox[ AdjustmentBox[ "A", BoxMargins -> {{-0.36, -0.1}, {0, 0}}, BoxBaselineShift -> -0.2], FontSize -> Smaller], "T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "mma" -> "Mathematica", "Mma" -> "Mathematica", "MMA" -> "Mathematica", "webMathematica" -> FormBox[ RowBox[{"web", AdjustmentBox[ StyleBox["Mathematica", FontSlant -> "Italic"], BoxMargins -> {{-0.175, 0}, {0, 0}}]}], TextForm], Inherited}, CounterIncrements -> "Section", CounterAssignments -> {{"Subsection", 0}, {"Subsubsection", 0}}, FontSize -> 18, FontWeight -> "Bold"], Cell[ StyleData["SectionFirst", "Printout"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, FontSize -> 14]}, Open]], Cell[ CellGroupData[{ Cell[ StyleData["Section"], CellMargins -> {{0, 4}, {3, 20}}, CellOpen -> True, CellGroupingRules -> {"SectionGrouping", 40}, PageBreakBelow -> False, InputAutoReplacements -> {"TeX" -> StyleBox[ RowBox[{"T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "LaTeX" -> StyleBox[ RowBox[{"L", StyleBox[ AdjustmentBox[ "A", BoxMargins -> {{-0.36, -0.1}, {0, 0}}, BoxBaselineShift -> -0.2], FontSize -> Smaller], "T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "mma" -> "Mathematica", "Mma" -> "Mathematica", "MMA" -> "Mathematica", "webMathematica" -> FormBox[ RowBox[{"web", AdjustmentBox[ StyleBox["Mathematica", FontSlant -> "Italic"], BoxMargins -> {{-0.175, 0}, {0, 0}}]}], TextForm], Inherited}, CounterIncrements -> "Section", CounterAssignments -> {{"Subsection", 0}, {"Subsubsection", 0}}, FontSize -> 18, FontWeight -> "Bold"], Cell[ StyleData["Section", "Printout"], CellMargins -> {{0, 4}, {4, 18}}, FontSize -> 14]}, Open]], Cell[ CellGroupData[{ Cell[ StyleData["Subsection"], CellDingbat -> "\[FilledSquare]", CellMargins -> {{0, 4}, {4, 18}}, CellOpen -> True, CellGroupingRules -> {"SectionGrouping", 50}, PageBreakBelow -> False, InputAutoReplacements -> {"TeX" -> StyleBox[ RowBox[{"T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "LaTeX" -> StyleBox[ RowBox[{"L", StyleBox[ AdjustmentBox[ "A", BoxMargins -> {{-0.36, -0.1}, {0, 0}}, BoxBaselineShift -> -0.2], FontSize -> Smaller], "T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "mma" -> "Mathematica", "Mma" -> "Mathematica", "MMA" -> "Mathematica", "webMathematica" -> FormBox[ RowBox[{"web", AdjustmentBox[ StyleBox["Mathematica", FontSlant -> "Italic"], BoxMargins -> {{-0.175, 0}, {0, 0}}]}], TextForm], Inherited}, CounterIncrements -> "Subsection", CounterAssignments -> {{"Subsubsection", 0}}, FontSize -> 14, FontWeight -> "Bold"], Cell[ StyleData["Subsection", "Printout"], CellMargins -> {{Inherited, Inherited}, {4, 14}}, FontSize -> 12]}, Open]], Cell[ CellGroupData[{ Cell[ StyleData["Subsubsection"], CellDingbat -> "\[FilledSmallSquare]", CellMargins -> {{0, 4}, {4, 12}}, CellOpen -> True, CellGroupingRules -> {"SectionGrouping", 60}, PageBreakBelow -> False, InputAutoReplacements -> {"TeX" -> StyleBox[ RowBox[{"T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "LaTeX" -> StyleBox[ RowBox[{"L", StyleBox[ AdjustmentBox[ "A", BoxMargins -> {{-0.36, -0.1}, {0, 0}}, BoxBaselineShift -> -0.2], FontSize -> Smaller], "T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "mma" -> "Mathematica", "Mma" -> "Mathematica", "MMA" -> "Mathematica", "webMathematica" -> FormBox[ RowBox[{"web", AdjustmentBox[ StyleBox["Mathematica", FontSlant -> "Italic"], BoxMargins -> {{-0.175, 0}, {0, 0}}]}], TextForm], Inherited}, CounterIncrements -> "Subsubsection", FontSize -> 12, FontWeight -> "Bold"], Cell[ StyleData["Subsubsection", "Printout"], CellMargins -> {{0, 4}, {Inherited, 10}}, FontSize -> 11]}, Open]]}, Open]], Cell[ CellGroupData[{ Cell[ "Styles for Body Text", "Section", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ CellGroupData[{ Cell[ StyleData["Text"], CellMargins -> {{0, 4}, {Inherited, 6}}, CellOpen -> True, InputAutoReplacements -> {"TeX" -> StyleBox[ RowBox[{"T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "LaTeX" -> StyleBox[ RowBox[{"L", StyleBox[ AdjustmentBox[ "A", BoxMargins -> {{-0.36, -0.1}, {0, 0}}, BoxBaselineShift -> -0.2], FontSize -> Smaller], "T", AdjustmentBox[ "E", BoxMargins -> {{-0.075, -0.085}, {0, 0}}, BoxBaselineShift -> 0.5], "X"}]], "mma" -> "Mathematica", "Mma" -> "Mathematica", "MMA" -> "Mathematica", "webMathematica" -> FormBox[ RowBox[{"web", AdjustmentBox[ StyleBox["Mathematica", FontSlant -> "Italic"], BoxMargins -> {{-0.175, 0}, {0, 0}}]}], TextForm], Inherited}, TextJustification -> 1, Hyphenation -> True, LineSpacing -> {1, 2}, CounterIncrements -> "Text", FontSize -> 10], Cell[ StyleData["Text", "Printout"], CellMargins -> {{0, 4}, {Inherited, 4}}, LineSpacing -> {1, 3}]}, Open]], Cell[ CellGroupData[{ Cell[ StyleData["Caption"], CellMargins -> {{0, 4}, {5, 5}}, CellOpen -> True, PageBreakAbove -> False, Hyphenation -> True, FontSize -> 10], Cell[ StyleData["Caption", "Printout"], CellMargins -> {{0, 4}, {5, 2}}, FontSize -> 8]}, Closed]]}, Open]], Cell[ CellGroupData[{ Cell[ "Styles for Input/Output", "Section", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ "The cells in this section define styles used for input and output \ to the kernel. Be careful when modifying, renaming, or removing these \ styles, because the front end associates special meanings with these style \ names.", "Text", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ CellGroupData[{ Cell[ StyleData["Input"], CellMargins -> {{0, 4}, {5, 8}}, Evaluatable -> True, CellOpen -> True, CellGroupingRules -> "InputGrouping", CellHorizontalScrolling -> True, PageBreakWithin -> False, GroupPageBreakWithin -> False, CellLabelMargins -> {{26, Inherited}, {Inherited, Inherited}}, DefaultFormatType -> DefaultInputFormatType, "TwoByteSyntaxCharacterAutoReplacement" -> True, HyphenationOptions -> { "HyphenationCharacter" -> "\[Continuation]"}, AutoItalicWords -> {}, LanguageCategory -> "Formula", FormatType -> InputForm, ShowStringCharacters -> True, NumberMarks -> True, LinebreakAdjustments -> {0.85, 2, 10, 0, 1}, CounterIncrements -> "Input", FontSize -> 12, FontWeight -> "Bold"], Cell[ StyleData["Input", "Printout"], CellMargins -> {{25, 4}, {4, 7}}, ShowCellLabel -> False, LinebreakAdjustments -> {0.85, 2, 10, 1, 1}, FontSize -> 10]}, Open]], Cell[ CellGroupData[{ Cell[ StyleData["Output"], CellMargins -> {{0, 4}, {7, 5}}, CellEditDuplicate -> True, CellOpen -> True, CellGroupingRules -> "OutputGrouping", CellHorizontalScrolling -> True, PageBreakWithin -> False, GroupPageBreakWithin -> False, GeneratedCell -> True, CellAutoOverwrite -> True, CellLabelPositioning -> Left, CellLabelMargins -> {{26, Inherited}, {Inherited, Inherited}}, DefaultFormatType -> DefaultOutputFormatType, "TwoByteSyntaxCharacterAutoReplacement" -> True, HyphenationOptions -> { "HyphenationCharacter" -> "\[Continuation]"}, AutoItalicWords -> {}, LanguageCategory -> "Formula", FormatType -> InputForm, CounterIncrements -> "Output"], Cell[ StyleData["Output", "Printout"], CellMargins -> {{35, 4}, {5, 4}}, ShowCellLabel -> False, FontSize -> 9.5]}, Open]], Cell[ CellGroupData[{ Cell[ StyleData["Message"], CellDingbat -> "\[LongDash]", CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, CellGroupingRules -> "OutputGrouping", PageBreakWithin -> False, GroupPageBreakWithin -> False, GeneratedCell -> True, CellAutoOverwrite -> True, ShowCellLabel -> False, CellLabelMargins -> {{26, Inherited}, {Inherited, Inherited}}, DefaultFormatType -> DefaultOutputFormatType, "TwoByteSyntaxCharacterAutoReplacement" -> True, HyphenationOptions -> { "HyphenationCharacter" -> "\[Continuation]"}, AutoItalicWords -> {}, FormatType -> InputForm, CounterIncrements -> "Message", StyleMenuListing -> None, FontSize -> 10, FontSlant -> "Italic"], Cell[ StyleData["Message", "Printout"], CellMargins -> {{0, 4}, {0, 3}}, FontSize -> 8]}, Closed]], Cell[ CellGroupData[{ Cell[ StyleData["Print"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, CellGroupingRules -> "OutputGrouping", CellHorizontalScrolling -> True, PageBreakWithin -> False, GroupPageBreakWithin -> False, GeneratedCell -> True, CellAutoOverwrite -> True, ShowCellLabel -> False, CellLabelMargins -> {{26, Inherited}, {Inherited, Inherited}}, DefaultFormatType -> DefaultOutputFormatType, "TwoByteSyntaxCharacterAutoReplacement" -> True, TextAlignment -> Left, HyphenationOptions -> { "HyphenationCharacter" -> "\[Continuation]"}, AutoItalicWords -> {}, FormatType -> InputForm, CounterIncrements -> "Print", StyleMenuListing -> None], Cell[ StyleData["Print", "Printout"], CellMargins -> {{0, 4}, {2, 10}}, FontSize -> 8]}, Closed]], Cell[ CellGroupData[{ Cell[ StyleData["Graphics"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, CellGroupingRules -> "GraphicsGrouping", CellHorizontalScrolling -> True, PageBreakWithin -> False, GeneratedCell -> True, CellAutoOverwrite -> True, ShowCellLabel -> False, DefaultFormatType -> DefaultOutputFormatType, FormatType -> InputForm, CounterIncrements -> "Graphics", StyleMenuListing -> None], Cell[ StyleData["Graphics", "Printout"], CellMargins -> {{0, 4}, {0, 15}}, ImageSize -> {0.0625, 0.0625}, ImageMargins -> {{35, Inherited}, {Inherited, 0}}, FontSize -> 8]}, Closed]], Cell[ CellGroupData[{ Cell[ StyleData["CellLabel"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, StyleMenuListing -> None, FontFamily -> "Helvetica", FontSize -> 9, FontSlant -> "Oblique"], Cell[ StyleData["CellLabel", "Printout"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, FontSize -> 8]}, Closed]]}, Open]], Cell[ CellGroupData[{ Cell[ "Unique Styles", "Section", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ CellGroupData[{ Cell[ StyleData["Author"], CellMargins -> {{0, 4}, {2, 20}}, CellOpen -> True, CellGroupingRules -> {"TitleGrouping", 20}, PageBreakBelow -> False, CounterAssignments -> {{"Section", 0}, {"Equation", 0}, { "Figure", 0}}, FontSize -> 14, FontWeight -> "Bold"], Cell[ StyleData["Author", "Printout"], CellMargins -> {{0, 4}, {2, 30}}, FontSize -> 12]}, Closed]], Cell[ CellGroupData[{ Cell[ StyleData["Address"], CellMargins -> {{0, 4}, {2, 2}}, CellOpen -> True, CellGroupingRules -> {"TitleGrouping", 30}, PageBreakBelow -> False, LineSpacing -> {1, 1}, CounterAssignments -> {{"Section", 0}, {"Equation", 0}, { "Figure", 0}}, FontSize -> 12, FontSlant -> "Italic"], Cell[ StyleData["Address", "Printout"], CellMargins -> {{0, 4}, {2, 2}}, FontSize -> 10]}, Closed]], Cell[ CellGroupData[{ Cell[ StyleData["Abstract"], CellMargins -> {{0, 4}, {Inherited, 30}}, CellOpen -> True, Hyphenation -> True, LineSpacing -> {1, 0}], Cell[ StyleData["Abstract", "Printout"], CellMargins -> {{0, 4}, {Inherited, 50}}, FontSize -> 10]}, Closed]], Cell[ CellGroupData[{ Cell[ StyleData["Reference"], CellMargins -> {{0, 4}, {2, 2}}, CellOpen -> True, TextJustification -> 1, Hyphenation -> True, LineSpacing -> {1, 0}], Cell[ StyleData["Reference", "Printout"], CellMargins -> {{0, 4}, {Inherited, 0}}, FontSize -> 8]}, Closed]]}, Open]], Cell[ CellGroupData[{ Cell[ "Hyperlink Styles", "Section", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ "The cells below define styles useful for making hypertext \ ButtonBoxes. The \"Hyperlink\" style is for links within the same Notebook, \ or between Notebooks.", "Text", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ CellGroupData[{ Cell[ StyleData["Hyperlink"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, StyleMenuListing -> None, ButtonStyleMenuListing -> Automatic, FontVariations -> {"Underline" -> True}, FontColor -> RGBColor[0, 0, 1], ButtonBoxOptions -> { Active -> True, ButtonFunction :> (FrontEndExecute[{ FrontEnd`NotebookLocate[#2]}]& ), ButtonNote -> ButtonData}], Cell[ StyleData["Hyperlink", "Printout"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, FontSize -> 10, FontVariations -> {"Underline" -> False}, FontColor -> GrayLevel[0]]}, Closed]], Cell[ "The following styles are for linking automatically to the on-line \ help system.", "Text", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ CellGroupData[{ Cell[ StyleData["MainBookLink"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, StyleMenuListing -> None, ButtonStyleMenuListing -> Automatic, FontVariations -> {"Underline" -> True}, FontColor -> RGBColor[0, 0, 1], ButtonBoxOptions -> { Active -> True, ButtonFrame -> "None", ButtonFunction :> (FrontEndExecute[{ FrontEnd`HelpBrowserLookup["MainBook", #]}]& )}], Cell[ StyleData["MainBookLink", "Printout"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, FontSize -> 10, FontVariations -> {"Underline" -> False}, FontColor -> GrayLevel[0]]}, Closed]], Cell[ CellGroupData[{ Cell[ StyleData["AddOnsLink"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, StyleMenuListing -> None, ButtonStyleMenuListing -> Automatic, FontFamily -> "Courier", FontVariations -> {"Underline" -> True}, FontColor -> RGBColor[0, 0, 1], ButtonBoxOptions -> { Active -> True, ButtonFrame -> "None", ButtonFunction :> (FrontEndExecute[{ FrontEnd`HelpBrowserLookup["AddOns", #]}]& )}], Cell[ StyleData["AddOnsLink", "Printout"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, FontSize -> 10, FontVariations -> {"Underline" -> False}, FontColor -> GrayLevel[0]]}, Closed]], Cell[ CellGroupData[{ Cell[ StyleData["RefGuideLink"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, StyleMenuListing -> None, ButtonStyleMenuListing -> Automatic, FontFamily -> "Courier", FontVariations -> {"Underline" -> True}, FontColor -> RGBColor[0, 0, 1], ButtonBoxOptions -> { Active -> True, ButtonFrame -> "None", ButtonFunction :> (FrontEndExecute[{ FrontEnd`HelpBrowserLookup["RefGuide", #]}]& )}], Cell[ StyleData["RefGuideLink", "Printout"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, FontSize -> 10, FontVariations -> {"Underline" -> False}, FontColor -> GrayLevel[0]]}, Closed]], Cell[ CellGroupData[{ Cell[ StyleData["GettingStartedLink"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, StyleMenuListing -> None, ButtonStyleMenuListing -> Automatic, FontVariations -> {"Underline" -> True}, FontColor -> RGBColor[0, 0, 1], ButtonBoxOptions -> { Active -> True, ButtonFrame -> "None", ButtonFunction :> (FrontEndExecute[{ FrontEnd`HelpBrowserLookup["GettingStarted", #]}]& )}], Cell[ StyleData["GettingStartedLink", "Printout"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, FontSize -> 10, FontVariations -> {"Underline" -> False}, FontColor -> GrayLevel[0]]}, Closed]], Cell[ CellGroupData[{ Cell[ StyleData["OtherInformationLink"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, StyleMenuListing -> None, ButtonStyleMenuListing -> Automatic, FontVariations -> {"Underline" -> True}, FontColor -> RGBColor[0, 0, 1], ButtonBoxOptions -> { Active -> True, ButtonFrame -> "None", ButtonFunction :> (FrontEndExecute[{ FrontEnd`HelpBrowserLookup["OtherInformation", #]}]& )}], Cell[ StyleData["OtherInformationLink", "Printout"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, FontSize -> 10, FontVariations -> {"Underline" -> False}, FontColor -> GrayLevel[0]]}, Closed]]}, Open]], Cell[ CellGroupData[{ Cell[ "Palette Styles", "Section", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ "The cells below define styles that define standard ButtonFunctions, \ for use in palette buttons.", "Text", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ StyleData["Paste"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, StyleMenuListing -> None, ButtonStyleMenuListing -> Automatic, ButtonBoxOptions -> {ButtonFunction :> (FrontEndExecute[{ FrontEnd`NotebookApply[ FrontEnd`InputNotebook[], #, After]}]& )}], Cell[ StyleData["Evaluate"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, StyleMenuListing -> None, ButtonStyleMenuListing -> Automatic, ButtonBoxOptions -> {ButtonFunction :> (FrontEndExecute[{ FrontEnd`NotebookApply[ FrontEnd`InputNotebook[], #, All], SelectionEvaluate[ FrontEnd`InputNotebook[], All]}]& )}], Cell[ StyleData["EvaluateCell"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, StyleMenuListing -> None, ButtonStyleMenuListing -> Automatic, ButtonBoxOptions -> {ButtonFunction :> (FrontEndExecute[{ FrontEnd`NotebookApply[ FrontEnd`InputNotebook[], #, All], FrontEnd`SelectionMove[ FrontEnd`InputNotebook[], All, Cell, 1], FrontEnd`SelectionEvaluateCreateCell[ FrontEnd`InputNotebook[], All]}]& )}], Cell[ StyleData["CopyEvaluate"], CellMargins -> {{0, 4}, {20, Inherited}}, CellOpen -> True, StyleMenuListing -> None, ButtonStyleMenuListing -> Automatic, ButtonBoxOptions -> {ButtonFunction :> (FrontEndExecute[{ FrontEnd`SelectionCreateCell[ FrontEnd`InputNotebook[], All], FrontEnd`NotebookApply[ FrontEnd`InputNotebook[], #, All], FrontEnd`SelectionEvaluate[ FrontEnd`InputNotebook[], All]}]& )}], Cell[ StyleData["CopyEvaluateCell"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, CellOpen -> True, StyleMenuListing -> None, ButtonStyleMenuListing -> Automatic, ButtonBoxOptions -> {ButtonFunction :> (FrontEndExecute[{ FrontEnd`SelectionCreateCell[ FrontEnd`InputNotebook[], All], FrontEnd`NotebookApply[ FrontEnd`InputNotebook[], #, All], FrontEnd`SelectionEvaluateCreateCell[ FrontEnd`InputNotebook[], All]}]& )}]}, Open]], Cell[ CellGroupData[{ Cell[ "Styles for Automatic Numbering", "Section", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ "The following styles are useful for numbered equations, figures, \ etc. They automatically give the cell a FrameLabel containing a reference to \ a particular counter, and also increment that counter.", "Text", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ CellGroupData[{ Cell[ StyleData["NumberedEquation"], CellMargins -> {{25, 4}, {Inherited, Inherited}}, CellOpen -> True, CellFrameLabels -> {{None, Cell[ TextData[{"(6.", CounterBox["NumberedEquation"], ")"}]]}, {None, None}}, DefaultFormatType -> DefaultInputFormatType, "TwoByteSyntaxCharacterAutoReplacement" -> True, HyphenationOptions -> { "HyphenationCharacter" -> "\[Continuation]"}, CounterIncrements -> "NumberedEquation", FormatTypeAutoConvert -> False], Cell[ StyleData["NumberedEquation", "Printout"], CellMargins -> {{25, 4}, {4, 4}}, FontSize -> 10]}, Open]], Cell[ CellGroupData[{ Cell[ StyleData["NumberedFigure"], CellMargins -> {{0, 4}, {2, 10}}, CellOpen -> True, CellHorizontalScrolling -> True, CellFrameLabels -> {{None, None}, { Cell[ TextData[{"Figure ", CounterBox["NumberedFigure"]}], FontWeight -> "Bold"], None}}, CounterIncrements -> "NumberedFigure", FormatTypeAutoConvert -> False], Cell[ StyleData["NumberedFigure", "Printout"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, FontSize -> 10]}, Open]], Cell[ CellGroupData[{ Cell[ StyleData["NumberedTable"], CellMargins -> {{0, 4}, {2, 10}}, CellOpen -> True, CellFrameLabels -> {{None, None}, { Cell[ TextData[{"Table ", CounterBox["NumberedTable"]}], FontWeight -> "Bold"], None}}, TextAlignment -> Center, CounterIncrements -> "NumberedTable", FormatTypeAutoConvert -> False], Cell[ StyleData["NumberedTable", "Printout"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, FontSize -> 10]}, Closed]]}, Open]], Cell[ CellGroupData[{ Cell[ "Formulas and Programming", "Section", CellMargins -> {{0, 4}, {Inherited, Inherited}}], Cell[ CellGroupData[{ Cell[ StyleData["DisplayFormula"], CellMargins -> {{0, 4}, {2, 10}}, CellOpen -> True, CellHorizontalScrolling -> True, DefaultFormatType -> DefaultInputFormatType, "TwoByteSyntaxCharacterAutoReplacement" -> True, HyphenationOptions -> { "HyphenationCharacter" -> "\[Continuation]"}, LanguageCategory -> "Formula", ScriptLevel -> 0, SingleLetterItalics -> True, UnderoverscriptBoxOptions -> {LimitsPositioning -> True}], Cell[ StyleData["DisplayFormula", "Printout"], CellMargins -> {{25, 4}, {4, 4}}, FontSize -> 10]}, Open]], Cell[ CellGroupData[{ Cell[ StyleData["ChemicalFormula"], CellMargins -> {{0, 4}, {2, 10}}, CellOpen -> True, DefaultFormatType -> DefaultInputFormatType, "TwoByteSyntaxCharacterAutoReplacement" -> True, HyphenationOptions -> { "HyphenationCharacter" -> "\[Continuation]"}, LanguageCategory -> "Formula", AutoSpacing -> False, ScriptBaselineShifts -> {0.6, Automatic}, ScriptLevel -> 1, SingleLetterItalics -> False, ZeroWidthTimes -> True], Cell[ StyleData["ChemicalFormula", "Printout"], CellMargins -> {{0, 4}, {Inherited, Inherited}}, FontSize -> 10]}, Closed]], Cell[ CellGroupData[{ Cell[ StyleData["Program"], CellMargins -> {{0, 4}, {Inherited, 6}}, CellOpen -> True, Hyphenation -> False, LanguageCategory -> "Formula", FontFamily -> "Courier"], Cell[ StyleData["Program", "Printout"], CellMargins -> {{0, 4}, {Inherited, 4}}, FontSize -> 9.5]}, Closed]]}, Open]]}, Open]]}, Visible -> False, FrontEndVersion -> "6.0 for Mac OS X PowerPC (32-bit) (June 19, 2007)", StyleDefinitions -> "Default.nb"] ] (* End of Notebook Content *) (* Internal cache information *) (*CellTagsOutline CellTagsIndex->{ "c:1"->{ Cell[899, 37, 80, 1, 35, "Title", CellTags->"c:1"], Cell[3861, 145, 76, 1, 35, "Title", CellTags->"c:1"]}, "c:4"->{ Cell[1004, 42, 110, 3, 44, "Section", CellTags->"c:4"]}, "c:12"->{ Cell[3962, 150, 145, 6, 44, "Section", CellTags->"c:12"]}, "c:19"->{ Cell[5031, 186, 164, 4, 62, "Section", CellTags->"c:19"]} } *) (*CellTagsIndex CellTagsIndex->{ {"c:1", 47368, 1113}, {"c:4", 47495, 1118}, {"c:12", 47568, 1121}, {"c:19", 47643, 1124} } *) (*NotebookFileOutline Notebook[{ Cell[CellGroupData[{ Cell[590, 23, 84, 3, 72, "Title"], Cell[677, 28, 185, 4, 37, "Text"] }, Open ]], Cell[CellGroupData[{ Cell[899, 37, 80, 1, 35, "Title", CellTags->"c:1"], Cell[CellGroupData[{ Cell[1004, 42, 110, 3, 44, "Section", CellTags->"c:4"], Cell[1117, 47, 400, 11, 53, "Text"], Cell[1520, 60, 2229, 77, 101, "Input"], Cell[3752, 139, 60, 0, 22, "Text"] }, Open ]] }, Open ]], Cell[CellGroupData[{ Cell[3861, 145, 76, 1, 35, "Title", CellTags->"c:1"], Cell[CellGroupData[{ Cell[3962, 150, 145, 6, 44, "Section", CellTags->"c:12"], Cell[4110, 158, 55, 0, 22, "Text"], Cell[4168, 160, 65, 0, 22, "Text"], Cell[4236, 162, 352, 6, 53, "Text"], Cell[4591, 170, 403, 11, 41, "Input"] }, Open ]], Cell[CellGroupData[{ Cell[5031, 186, 164, 4, 62, "Section", CellTags->"c:19"], Cell[5198, 192, 309, 5, 53, "Text"], Cell[5510, 199, 266, 11, 131, "Input"], Cell[5779, 212, 120, 3, 22, "Text"], Cell[5902, 217, 90, 1, 25, "Input"], Cell[5995, 220, 127, 3, 22, "Text"], Cell[6125, 225, 150, 3, 25, "Input"], Cell[6278, 230, 161, 6, 65, "Input"], Cell[6442, 238, 352, 9, 25, "Input"], Cell[6797, 249, 218, 4, 37, "Text"], Cell[7018, 255, 259, 7, 65, "Input"], Cell[7280, 264, 61, 0, 22, "Text"], Cell[7344, 266, 256, 6, 65, "Input"], Cell[7603, 274, 264, 7, 65, "Input"], Cell[7870, 283, 151, 4, 25, "Input"], Cell[8024, 289, 241, 7, 39, "Input", PageBreakAbove->False, PageBreakWithin->Automatic], Cell[8268, 298, 629, 20, 41, "Input"] }, Open ]] }, Open ]] } ] *) (* End of internal cache information *)