(* Content-type: application/vnd.wolfram.mathematica *) (*** Wolfram Notebook File ***) (* http://www.wolfram.com/nb *) (* CreatedBy='Mathematica 10.0' *) (*CacheID: 234*) (* Internal cache information: NotebookFileLineBreakTest NotebookFileLineBreakTest NotebookDataPosition[ 158, 7] NotebookDataLength[ 53631, 1363] NotebookOptionsPosition[ 50802, 1270] NotebookOutlinePosition[ 51180, 1286] CellTagsIndexPosition[ 51137, 1283] WindowFrame->Normal*) (* Beginning of Notebook Content *) Notebook[{ Cell["Quizfile_7_MatrixMultiplication", "Text", CellChangeTimes->{{3.6158179124766865`*^9, 3.615817937639531*^9}}], Cell[CellGroupData[{ Cell["Functions", "Subsubsection", InitializationCell->True, CellChangeTimes->{{3.6229214053891983`*^9, 3.6229214067292*^9}}], Cell[BoxData[ RowBox[{ RowBox[{"FormatVector", "[", "v_", "]"}], ":=", RowBox[{"Module", "[", RowBox[{ RowBox[{"{", RowBox[{"i", ",", "t"}], "}"}], ",", "\[IndentingNewLine]", RowBox[{ RowBox[{"t", "=", RowBox[{"Flatten", "[", RowBox[{"Join", "[", RowBox[{ RowBox[{"{", "\"\<<\>\"", "}"}], ",", RowBox[{ RowBox[{ RowBox[{"{", RowBox[{"#", ",", "\"\<,\>\""}], "}"}], "&"}], "/@", RowBox[{"Drop", "[", RowBox[{"v", ",", RowBox[{"-", "1"}]}], "]"}]}]}], "]"}], "]"}]}], ";", "\[IndentingNewLine]", RowBox[{"AppendTo", "[", RowBox[{"t", ",", RowBox[{"Last", "[", "v", "]"}]}], "]"}], ";", "\[IndentingNewLine]", RowBox[{"AppendTo", "[", RowBox[{"t", ",", "\"\<>\>\""}], "]"}], ";", "\[IndentingNewLine]", RowBox[{"Return", "[", RowBox[{"DisplayForm", "[", RowBox[{"RowBox", "[", "t", "]"}], "]"}], "]"}]}]}], "\[IndentingNewLine]", "]"}]}]], "Input"], Cell[BoxData[ RowBox[{ RowBox[{"VectorSymbol", "[", "v_", "]"}], ":=", RowBox[{"DisplayForm", "[", RowBox[{"Overscript", "[", RowBox[{"v", ",", "\"\<\[RightVector]\>\""}], "]"}], "]"}]}]], "Input"], Cell[BoxData[ RowBox[{ RowBox[{ RowBox[{"VectorAssign", "[", RowBox[{"v_", ",", "u_"}], "]"}], ":=", RowBox[{"{", RowBox[{ RowBox[{"VectorSymbol", "[", "v", "]"}], ",", "\"\< = \>\"", ",", RowBox[{"FormatVector", "[", "u", "]"}]}], "}"}]}], ";"}]], "Input"], Cell["\<\ We put a + sign before a positive term, the negative terms carry their own - \ sign\ \>", "Text", CellChangeTimes->{{3.620212606605792*^9, 3.6202126340288305`*^9}}, FontColor->RGBColor[0, 0, 1]], Cell[BoxData[ RowBox[{ RowBox[{"PlsMin", "[", "u_", "]"}], ":=", RowBox[{ RowBox[{ RowBox[{"If", "[", RowBox[{ RowBox[{"#", "<", "0"}], ",", "\"\< \>\"", ",", "\"\< + \>\""}], "]"}], "&"}], "/@", RowBox[{"DeleteCases", "[", RowBox[{"u", ",", "0"}], "]"}]}]}]], "Input", CellChangeTimes->{{3.6202099355600395`*^9, 3.620209972953092*^9}, { 3.620210067453225*^9, 3.6202100766132383`*^9}, {3.62021014938034*^9, 3.6202101536903462`*^9}}], Cell[TextData[{ "Use Riffle to interleave the + signs between the terms\nThe last element of \ ", Cell[BoxData[ FormBox["u", TraditionalForm]]], " represents the constant term on the right hand side of\n ", Cell[BoxData[ FormBox[ RowBox[{ RowBox[{ RowBox[{ RowBox[{ RowBox[{ SubscriptBox["u", "1"], " ", SubscriptBox["x", "1"]}], "+", RowBox[{ SubscriptBox["u", "2"], SubscriptBox["x", "2"]}], "+"}], "..."}], "+", RowBox[{ SubscriptBox["u", "n"], SubscriptBox["x", "n"]}]}], "=", SubscriptBox["u", RowBox[{"n", "+", "1"}]]}], TraditionalForm]]] }], "Text", CellChangeTimes->{{3.620212643408844*^9, 3.620212729736965*^9}}, FontColor->RGBColor[0, 0, 1]], Cell[BoxData[ RowBox[{ RowBox[{ RowBox[{"xs", "[", "i_", "]"}], ":=", RowBox[{"Subscript", "[", RowBox[{"x", ",", "i"}], "]"}]}], ";"}]], "Input", CellChangeTimes->{{3.622921865269844*^9, 3.622921882440868*^9}}], Cell[BoxData[ RowBox[{ RowBox[{ RowBox[{"LHS", "[", "u_", "]"}], ":=", RowBox[{"Riffle", "[", RowBox[{ RowBox[{"DeleteCases", "[", RowBox[{ RowBox[{"Table", "[", RowBox[{ RowBox[{ RowBox[{"u", "[", RowBox[{"[", "i", "]"}], "]"}], " ", RowBox[{"Subscript", "[", RowBox[{"x", ",", "i"}], "]"}]}], ",", RowBox[{"{", RowBox[{"i", ",", RowBox[{ RowBox[{"Length", "[", "u", "]"}], "-", "1"}]}], "}"}]}], "]"}], ",", "0"}], "]"}], ",", RowBox[{"Rest", "@", RowBox[{"PlsMin", "[", RowBox[{"Drop", "[", RowBox[{"u", ",", RowBox[{"-", "1"}]}], "]"}], "]"}]}]}], "]"}]}], ";"}]], "Input", CellChangeTimes->{{3.6229239864828606`*^9, 3.622924010817896*^9}}], Cell[BoxData[ RowBox[{ RowBox[{"R2E", "[", "u_", "]"}], ":=", RowBox[{"Row", "@", RowBox[{"Join", "[", RowBox[{ RowBox[{"LHS", "[", "u", "]"}], ",", RowBox[{"{", RowBox[{"\"\< = \>\"", ",", RowBox[{"Last", "[", "u", "]"}]}], "}"}]}], "]"}]}]}]], "Input", CellChangeTimes->{{3.620208293110732*^9, 3.6202083793988533`*^9}, { 3.6202084123408995`*^9, 3.620208431222926*^9}, {3.620208461665969*^9, 3.6202084641659727`*^9}, {3.620208503369027*^9, 3.6202085120600395`*^9}, { 3.6202085557531013`*^9, 3.6202085946571555`*^9}, {3.6202088480795116`*^9, 3.620208848799513*^9}, {3.62021004242019*^9, 3.6202100517412033`*^9}, { 3.6202101835933886`*^9, 3.6202101847533903`*^9}, {3.6202102469484773`*^9, 3.6202103305655947`*^9}, {3.620210383289669*^9, 3.6202103886006765`*^9}, { 3.6202105085328445`*^9, 3.6202105163238554`*^9}, {3.6202106214520035`*^9, 3.620210648805042*^9}, {3.6229240375899334`*^9, 3.6229240416609387`*^9}}], Cell["Form a linear equation for each row", "Text", CellChangeTimes->{{3.6202130126213627`*^9, 3.620213024292379*^9}}, FontColor->RGBColor[0, 0, 1]], Cell[BoxData[ RowBox[{ RowBox[{ RowBox[{"MatrixToEquations", "[", "m_", "]"}], ":=", RowBox[{"R2E", "/@", "m"}]}], ";"}]], "Input", CellChangeTimes->{{3.620207354859414*^9, 3.6202073926324673`*^9}, { 3.620207844750102*^9, 3.6202078893341646`*^9}, {3.6202104305437355`*^9, 3.6202104316737366`*^9}, {3.6202104769798*^9, 3.6202104890208173`*^9}, { 3.620210521703863*^9, 3.6202105477359*^9}, {3.6202107851362333`*^9, 3.620210816009277*^9}, {3.6202109609414806`*^9, 3.62021096784249*^9}}], Cell[BoxData[ RowBox[{ RowBox[{"VectorEquation", "[", "m_", "]"}], ":=", RowBox[{"Join", "[", RowBox[{ RowBox[{"Riffle", "[", RowBox[{ RowBox[{"Flatten", "[", RowBox[{ RowBox[{"Table", "[", RowBox[{ RowBox[{"{", RowBox[{ RowBox[{"Subscript", "[", RowBox[{"x", ",", "i"}], "]"}], ",", RowBox[{"m", "[", RowBox[{"[", RowBox[{"All", ",", RowBox[{"{", "i", "}"}]}], "]"}], "]"}]}], "}"}], ",", RowBox[{"{", RowBox[{"i", ",", RowBox[{ RowBox[{"Length", "[", RowBox[{"m", "\[Transpose]"}], "]"}], "-", "1"}]}], "}"}]}], "]"}], ",", "1"}], "]"}], ",", "\"\< + \>\"", ",", "3"}], "]"}], ",", RowBox[{"{", RowBox[{"\"\< = \>\"", ",", RowBox[{"m", "[", RowBox[{"[", RowBox[{"All", ",", RowBox[{"{", RowBox[{"Length", "[", RowBox[{"m", "\[Transpose]"}], "]"}], "}"}]}], "]"}], "]"}]}], "}"}]}], "]"}]}]], "Input", CellChangeTimes->{{3.622922477503704*^9, 3.6229226462219777`*^9}, { 3.6229227198790812`*^9, 3.6229227323300986`*^9}, {3.622922796507189*^9, 3.6229229541404104`*^9}}], Cell[BoxData[ RowBox[{ RowBox[{ RowBox[{"MatrixEquation", "[", "m_", "]"}], ":=", RowBox[{"Module", "[", RowBox[{ RowBox[{"{", RowBox[{"r", ",", "c"}], "}"}], ",", "\[IndentingNewLine]", RowBox[{ RowBox[{ RowBox[{"{", RowBox[{"r", ",", "c"}], "}"}], "=", RowBox[{"Dimensions", "[", "m", "]"}]}], ";", "\[IndentingNewLine]", RowBox[{"Return", "[", RowBox[{"{", RowBox[{ RowBox[{ RowBox[{"Drop", "[", RowBox[{ RowBox[{"m", "\[Transpose]"}], ",", RowBox[{"-", "1"}]}], "]"}], "\[Transpose]"}], ",", RowBox[{"Table", "[", RowBox[{ RowBox[{"{", RowBox[{"Subscript", "[", RowBox[{"x", ",", "i"}], "]"}], "}"}], ",", RowBox[{"{", RowBox[{"i", ",", "1", ",", RowBox[{"c", "-", "1"}]}], "}"}]}], "]"}], ",", "\"\< = \>\"", ",", RowBox[{"m", "[", RowBox[{"[", RowBox[{"All", ",", RowBox[{"{", "c", "}"}]}], "]"}], "]"}]}], "}"}], "]"}]}]}], "\[IndentingNewLine]", "]"}]}], ";"}]], "Input", CellChangeTimes->{{3.622923148287683*^9, 3.6229234425260963`*^9}, { 3.622923524153211*^9, 3.6229235421942368`*^9}}], Cell[BoxData[ RowBox[{ RowBox[{ RowBox[{"MatrixOfEquations", "[", "m_", "]"}], ":=", RowBox[{"Module", "[", RowBox[{ RowBox[{"{", RowBox[{"r", ",", "c", ",", "a"}], "}"}], ",", "\[IndentingNewLine]", RowBox[{ RowBox[{ RowBox[{"{", RowBox[{"r", ",", "c"}], "}"}], "=", RowBox[{"Dimensions", "[", "m", "]"}]}], ";", "\[IndentingNewLine]", RowBox[{"a", "=", RowBox[{ RowBox[{ RowBox[{"Row", "[", RowBox[{"LHS", "[", "#", "]"}], "]"}], "&"}], "/@", RowBox[{"(", RowBox[{ RowBox[{"Drop", "[", RowBox[{ RowBox[{"m", "\[Transpose]"}], ",", RowBox[{"-", "1"}]}], "]"}], "\[Transpose]"}], ")"}]}]}], ";", "\[IndentingNewLine]", RowBox[{"Return", "[", RowBox[{"{", RowBox[{ RowBox[{ RowBox[{"{", "a", "}"}], "\[Transpose]"}], ",", "\"\< = \>\"", ",", RowBox[{"m", "[", RowBox[{"[", RowBox[{"All", ",", RowBox[{"{", "c", "}"}]}], "]"}], "]"}]}], "}"}], "]"}]}]}], "\[IndentingNewLine]", "]"}]}], ";"}]], "Input", CellChangeTimes->{{3.622923826049635*^9, 3.6229238777037077`*^9}, { 3.622923949819809*^9, 3.6229239557208176`*^9}, {3.6229241657521133`*^9, 3.622924229678203*^9}, {3.62292428449228*^9, 3.6229243028643055`*^9}, { 3.622924360649387*^9, 3.622924385931422*^9}, {3.6229244170844665`*^9, 3.6229244436175036`*^9}, 3.6229245847397017`*^9, 3.622925328580747*^9}], Cell[BoxData[ RowBox[{ RowBox[{ RowBox[{"MatrixLHS", "[", "m_", "]"}], ":=", RowBox[{"Module", "[", RowBox[{ RowBox[{"{", RowBox[{"r", ",", "c"}], "}"}], ",", "\[IndentingNewLine]", RowBox[{ RowBox[{ RowBox[{"{", RowBox[{"r", ",", "c"}], "}"}], "=", RowBox[{"Dimensions", "[", "m", "]"}]}], ";", "\[IndentingNewLine]", RowBox[{"Return", "[", RowBox[{"{", RowBox[{ RowBox[{ RowBox[{"Drop", "[", RowBox[{ RowBox[{"m", "\[Transpose]"}], ",", RowBox[{"-", "1"}]}], "]"}], "\[Transpose]"}], ",", RowBox[{"Table", "[", RowBox[{ RowBox[{"{", RowBox[{"Subscript", "[", RowBox[{"x", ",", "i"}], "]"}], "}"}], ",", RowBox[{"{", RowBox[{"i", ",", "1", ",", RowBox[{"c", "-", "1"}]}], "}"}]}], "]"}]}], "}"}], "]"}]}]}], "\[IndentingNewLine]", "]"}]}], ";"}]], "Input", CellChangeTimes->{{3.6229245951807165`*^9, 3.6229246666588173`*^9}, 3.6229255324630337`*^9}], Cell[BoxData[ RowBox[{ RowBox[{"m", "=", RowBox[{"(", GridBox[{ {"1", "2", "3", "4"}, {"5", "0", "7", "8"}, { RowBox[{"-", "7"}], RowBox[{"-", "6"}], RowBox[{"-", "5"}], "4"} }], ")"}]}], ";"}]], "Input", CellChangeTimes->{{3.622922742072112*^9, 3.6229227690441504`*^9}, { 3.6229241398500767`*^9, 3.622924143601082*^9}}], Cell[CellGroupData[{ Cell[BoxData[ RowBox[{"Dimensions", "[", "m", "]"}]], "Input", CellChangeTimes->{{3.6229234808391504`*^9, 3.622923483400154*^9}}], Cell[BoxData[ FormBox[ RowBox[{"{", RowBox[{"3", ",", "4"}], "}"}], TraditionalForm]], "Output", CellChangeTimes->{3.622923483690154*^9, 3.62292476106695*^9, 3.6229248293830457`*^9, 3.622925122300457*^9, 3.6229253966978426`*^9, 3.6229255638870783`*^9, 3.6229258742585144`*^9, 3.6229260053896985`*^9, 3.6229261959879665`*^9, 3.6229263935972443`*^9, 3.6229906885783806`*^9}] }, Open ]], Cell[CellGroupData[{ Cell[BoxData[ RowBox[{"Row", "[", RowBox[{"MatrixOfEquations", "[", "m", "]"}], "]"}]], "Input", CellChangeTimes->{{3.622924235288211*^9, 3.622924239859217*^9}, { 3.622924317655327*^9, 3.6229243242763357`*^9}, {3.6229243903414288`*^9, 3.622924392821432*^9}, {3.6229244565785217`*^9, 3.6229244590595255`*^9}}], Cell[BoxData[ FormBox[ TemplateBox[{RowBox[{"(", "\[NoBreak]", GridBox[{{ TemplateBox[{ SubscriptBox["x", "1"], "\" + \"", RowBox[{"2", " ", SubscriptBox["x", "2"]}]}, "RowDefault"]}, { TemplateBox[{ RowBox[{"5", " ", SubscriptBox["x", "1"]}]}, "RowDefault"]}, { TemplateBox[{ RowBox[{ RowBox[{"-", "7"}], " ", SubscriptBox["x", "1"]}], "\" \"", RowBox[{ RowBox[{"-", "6"}], " ", SubscriptBox["x", "2"]}]}, "RowDefault"]}}, RowSpacings -> 1, ColumnSpacings -> 1, RowAlignments -> Baseline, ColumnAlignments -> Center], "\[NoBreak]", ")"}],"\" = \"",RowBox[{"(", "\[NoBreak]", GridBox[{{"4"}, {"8"}, {"4"}}, RowSpacings -> 1, ColumnSpacings -> 1, RowAlignments -> Baseline, ColumnAlignments -> Center], "\[NoBreak]", ")"}]}, "RowDefault"], TraditionalForm]], "Output", CellChangeTimes->{ 3.6229242401692176`*^9, {3.62292430598431*^9, 3.6229243246863365`*^9}, 3.6229243945014343`*^9, {3.622924452918517*^9, 3.6229244593495255`*^9}, 3.6229247610869493`*^9, 3.6229248294030457`*^9, 3.622925122310457*^9, 3.622925396717843*^9, 3.622925563917078*^9, 3.622925874268514*^9, 3.6229260054096985`*^9, 3.6229261959979663`*^9, 3.622926393607244*^9, 3.6229906886251802`*^9}] }, Open ]], Cell[CellGroupData[{ Cell[BoxData[ RowBox[{"Column", "[", RowBox[{"MatrixToEquations", "[", "m", "]"}], "]"}]], "Input", CellChangeTimes->{{3.6229240677529755`*^9, 3.6229240834539976`*^9}, { 3.622924117118045*^9, 3.622924119399048*^9}}], Cell[BoxData[ FormBox[ TagBox[GridBox[{ { TemplateBox[{SubscriptBox["x", "1"],"\" + \"",RowBox[{"2", " ", SubscriptBox["x", "2"]}],"\" + \"",RowBox[{"3", " ", SubscriptBox["x", "3"]}],"\" = \"","4"}, "RowDefault"]}, { TemplateBox[{RowBox[{"5", " ", SubscriptBox["x", "1"]}],"\" + \"",RowBox[{"7", " ", SubscriptBox["x", "3"]}],"\" = \"","8"}, "RowDefault"]}, { TemplateBox[{RowBox[{ RowBox[{"-", "7"}], " ", SubscriptBox["x", "1"]}],"\" \"",RowBox[{ RowBox[{"-", "6"}], " ", SubscriptBox["x", "2"]}],"\" \"",RowBox[{ RowBox[{"-", "5"}], " ", SubscriptBox["x", "3"]}],"\" = \"","4"}, "RowDefault"]} }, DefaultBaseStyle->"Column", GridBoxAlignment->{"Columns" -> {{Left}}}, GridBoxItemSize->{"Columns" -> {{Automatic}}, "Rows" -> {{Automatic}}}], "Column"], TraditionalForm]], "Output", CellChangeTimes->{{3.6229240741439843`*^9, 3.622924083794998*^9}, { 3.6229241224690523`*^9, 3.622924146341086*^9}, 3.6229247610969496`*^9, 3.6229248294330454`*^9, 3.622925122330457*^9, 3.622925396727843*^9, 3.6229255639270782`*^9, 3.622925874288514*^9, 3.6229260054296985`*^9, 3.6229261960079665`*^9, 3.622926393627244*^9, 3.622990688671981*^9}] }, Open ]], Cell[CellGroupData[{ Cell[BoxData[ RowBox[{"Row", "[", RowBox[{"VectorEquation", "[", "m", "]"}], "]"}]], "Input", CellChangeTimes->{{3.6229227816451683`*^9, 3.622922786965175*^9}, { 3.622922850962265*^9, 3.622922853502269*^9}}], Cell[BoxData[ FormBox[ TemplateBox[{SubscriptBox["x", "1"],RowBox[{"(", "\[NoBreak]", GridBox[{{"1"}, {"5"}, { RowBox[{"-", "7"}]}}, RowSpacings -> 1, ColumnSpacings -> 1, RowAlignments -> Baseline, ColumnAlignments -> Center], "\[NoBreak]", ")"}],"\" + \"",SubscriptBox["x", "2"],RowBox[{"(", "\[NoBreak]", GridBox[{{"2"}, {"0"}, { RowBox[{"-", "6"}]}}, RowSpacings -> 1, ColumnSpacings -> 1, RowAlignments -> Baseline, ColumnAlignments -> Center], "\[NoBreak]", ")"}],"\" + \"",SubscriptBox["x", "3"],RowBox[{"(", "\[NoBreak]", GridBox[{{"3"}, {"7"}, { RowBox[{"-", "5"}]}}, RowSpacings -> 1, ColumnSpacings -> 1, RowAlignments -> Baseline, ColumnAlignments -> Center], "\[NoBreak]", ")"}],"\" = \"",RowBox[{"(", "\[NoBreak]", GridBox[{{"4"}, {"8"}, {"4"}}, RowSpacings -> 1, ColumnSpacings -> 1, RowAlignments -> Baseline, ColumnAlignments -> Center], "\[NoBreak]", ")"}]}, "RowDefault"], TraditionalForm]], "Output", CellChangeTimes->{{3.6229227873451757`*^9, 3.622922807148204*^9}, { 3.6229228479612613`*^9, 3.6229228830353107`*^9}, 3.6229229575214148`*^9, 3.6229247611169496`*^9, 3.622924829453046*^9, 3.622925122350457*^9, 3.6229253967378426`*^9, 3.6229255639470778`*^9, 3.6229258743085146`*^9, 3.622926005439698*^9, 3.6229261960279665`*^9, 3.622926393637244*^9, 3.6229906886875806`*^9}] }, Open ]], Cell[CellGroupData[{ Cell[BoxData[ RowBox[{"Row", "[", RowBox[{"MatrixEquation", "[", "m", "]"}], "]"}]], "Input", CellChangeTimes->{{3.6229234566771164`*^9, 3.622923457417117*^9}, { 3.622923556035256*^9, 3.6229235593862605`*^9}}], Cell[BoxData[ FormBox[ TemplateBox[{RowBox[{"(", "\[NoBreak]", GridBox[{{"1", "2", "3"}, {"5", "0", "7"}, { RowBox[{"-", "7"}], RowBox[{"-", "6"}], RowBox[{"-", "5"}]}}, RowSpacings -> 1, ColumnSpacings -> 1, RowAlignments -> Baseline, ColumnAlignments -> Center], "\[NoBreak]", ")"}],RowBox[{"(", "\[NoBreak]", GridBox[{{ SubscriptBox["x", "1"]}, { SubscriptBox["x", "2"]}, { SubscriptBox["x", "3"]}}, RowSpacings -> 1, ColumnSpacings -> 1, RowAlignments -> Baseline, ColumnAlignments -> Center], "\[NoBreak]", ")"}],"\" = \"",RowBox[{"(", "\[NoBreak]", GridBox[{{"4"}, {"8"}, {"4"}}, RowSpacings -> 1, ColumnSpacings -> 1, RowAlignments -> Baseline, ColumnAlignments -> Center], "\[NoBreak]", ")"}]}, "RowDefault"], TraditionalForm]], "Output", CellChangeTimes->{ 3.622923457768118*^9, {3.6229235465152426`*^9, 3.622923559706261*^9}, 3.6229247611369495`*^9, 3.6229248294630456`*^9, 3.6229251223604574`*^9, 3.622925396757843*^9, 3.622925563957078*^9, 3.6229258743185143`*^9, 3.6229260054596987`*^9, 3.6229261960379667`*^9, 3.622926393647244*^9, 3.6229906887031803`*^9}] }, Open ]], Cell[BoxData[ RowBox[{"Clear", "[", RowBox[{ "a", ",", "b", ",", "c", ",", "d", ",", "S", ",", "A", ",", "F", ",", "U", ",", "V", ",", "x", ",", "y", ",", "z"}], "]"}]], "Input", CellChangeTimes->{{3.6158212497352457`*^9, 3.6158212621259546`*^9}, { 3.6163018083757024`*^9, 3.616301813168977*^9}, {3.619852622240489*^9, 3.619852622880489*^9}, {3.6198526570034885`*^9, 3.6198526587934885`*^9}}] }, Closed]], Cell[CellGroupData[{ Cell["Questions", "Subsubsection", CellChangeTimes->{{3.6198349977327547`*^9, 3.619835001423829*^9}, { 3.6229214210402203`*^9, 3.6229214222702217`*^9}}], Cell[BoxData[ RowBox[{ RowBox[{"Q1", "=", RowBox[{"{", RowBox[{ RowBox[{"Row", "[", RowBox[{"{", RowBox[{ RowBox[{"TraditionalForm", "[", RowBox[{"Inactivate", "[", RowBox[{"S", "=", RowBox[{"(", GridBox[{ {"9"}, {"1"}, {"0"} }], ")"}]}], "]"}], "]"}], ",", RowBox[{"Spacer", "[", "20", "]"}], ",", RowBox[{"TraditionalForm", "[", RowBox[{"Inactivate", "[", RowBox[{"A", "=", RowBox[{"(", GridBox[{ {"1", "3", "0"}, {"5", "2", "9"} }], ")"}]}], "]"}], "]"}], ",", " ", "\"\< \\n Evaluate \>\"", ",", RowBox[{"HoldForm", "[", RowBox[{"A", " ", "S"}], "]"}]}], "}"}], "]"}], ",", RowBox[{"{", RowBox[{"3", ",", "\"\\""}], "}"}], ",", "\[IndentingNewLine]", RowBox[{"{", RowBox[{ RowBox[{"{", RowBox[{ RowBox[{"Row", "[", RowBox[{"{", RowBox[{"TraditionalForm", "[", RowBox[{"(", GridBox[{ {"12"}, {"47"} }], ")"}], "]"}], "}"}], "]"}], ",", "True", ",", "\"\\""}], "}"}], ",", "\[IndentingNewLine]", RowBox[{"{", RowBox[{ "\"\\"", ",", "False", ",", "\"\\""}], "}"}], ",", "\[IndentingNewLine]", RowBox[{"{", RowBox[{ RowBox[{"Row", "[", RowBox[{"{", RowBox[{"TraditionalForm", "[", RowBox[{"(", "59", ")"}], "]"}], "}"}], "]"}], ",", "False", ",", " ", "\"\\""}], "}"}], ",", "\[IndentingNewLine]", RowBox[{"{", RowBox[{ RowBox[{"Row", "[", RowBox[{"{", RowBox[{"TraditionalForm", "[", RowBox[{"(", GridBox[{ {"9", "27", "0"}, {"5", "2", "9"} }], ")"}], "]"}], "}"}], "]"}], ",", "False", ",", "\"\\""}], "}"}], ",", "\[IndentingNewLine]", RowBox[{"{", RowBox[{ RowBox[{"Row", "[", RowBox[{"{", RowBox[{"TraditionalForm", "[", RowBox[{"(", GridBox[{ {"0", "3", "0"}, {"0", "2", "81"} }], ")"}], "]"}], "}"}], "]"}], ",", " ", "False", ",", "\"\\""}], "}"}]}], "\[IndentingNewLine]", "}"}]}], "}"}]}], ";"}]], "Input", CellChangeTimes->{{3.6158179914752254`*^9, 3.615817993019628*^9}, 3.615818204182599*^9, {3.6158182448362703`*^9, 3.6158184133165665`*^9}, { 3.6158185048692484`*^9, 3.6158186068340807`*^9}, {3.615818662758279*^9, 3.615818696712221*^9}, {3.6158187996691103`*^9, 3.6158191230196047`*^9}, { 3.6197997926624465`*^9, 3.6197998265918393`*^9}, {3.61980067773141*^9, 3.61980067896341*^9}, {3.6198345224522457`*^9, 3.619834525043298*^9}, { 3.619835790557618*^9, 3.6198358372475533`*^9}, {3.619852416144489*^9, 3.6198524230154886`*^9}, {3.6198535219076276`*^9, 3.619853524928688*^9}, 3.6198536766537237`*^9, {3.619853725368698*^9, 3.6198537275787396`*^9}, 3.619853789994364*^9, {3.622990577995386*^9, 3.6229905823165936`*^9}}], Cell[BoxData[ RowBox[{ RowBox[{"Q2", "=", RowBox[{"{", RowBox[{ RowBox[{"Column", "[", RowBox[{"{", "\[IndentingNewLine]", RowBox[{ RowBox[{"Row", "[", RowBox[{ "{", "\"\\"", "}"}], "]"}], ",", "\[IndentingNewLine]", RowBox[{"Row", "[", RowBox[{"{", RowBox[{"TraditionalForm", "[", RowBox[{"R2E", "[", RowBox[{"{", RowBox[{"2", ",", RowBox[{"-", "3"}], ",", "10", ",", RowBox[{"-", "2"}]}], "}"}], "]"}], "]"}], "}"}], "]"}], " ", ",", "\[IndentingNewLine]", RowBox[{"Row", "[", RowBox[{"{", RowBox[{"TraditionalForm", "[", RowBox[{"R2E", "[", RowBox[{"{", RowBox[{"1", ",", RowBox[{"-", "2"}], ",", "3", ",", RowBox[{"-", "2"}]}], "}"}], "]"}], "]"}], "}"}], "]"}], ",", "\[IndentingNewLine]", RowBox[{"Row", "[", RowBox[{"{", RowBox[{"TraditionalForm", "[", RowBox[{"R2E", "[", RowBox[{"{", RowBox[{ RowBox[{"-", "1"}], ",", "3", ",", "1", ",", "4"}], "}"}], "]"}], "]"}], "}"}], "]"}]}], "\[IndentingNewLine]", "}"}], "]"}], ",", RowBox[{"{", RowBox[{"3", ",", "\"\\""}], "}"}], " ", RowBox[{"(*", RowBox[{"*", "value", " ", "of", " ", "question"}], "**)"}], ",", "\[IndentingNewLine]", RowBox[{"{", RowBox[{ RowBox[{"{", RowBox[{ RowBox[{"Row", "[", RowBox[{"{", RowBox[{"TraditionalForm", "[", RowBox[{"(", GridBox[{ {"2", RowBox[{"-", "3"}], "10", RowBox[{"-", "2"}]}, {"1", RowBox[{"-", "2"}], "3", RowBox[{"-", "2"}]}, { RowBox[{"-", "1"}], "3", "1", "4"} }], ")"}], "]"}], "}"}], "]"}], ",", "True", ",", "\"\\""}], "}"}], ",", "\[IndentingNewLine]", RowBox[{"{", RowBox[{ "\"\\"", ",", "False", ",", "\"\\""}], "}"}], ",", "\[IndentingNewLine]", RowBox[{"{", RowBox[{ RowBox[{"Row", "[", RowBox[{"{", RowBox[{"TraditionalForm", "[", RowBox[{"(", GridBox[{ { RowBox[{"-", "4"}], "6", RowBox[{"-", "20"}], RowBox[{"-", "2"}]}, { RowBox[{"-", "2"}], "4", "6", RowBox[{"-", "2"}]}, { RowBox[{"-", "4"}], "12", "4", "4"} }], ")"}], "]"}], "}"}], "]"}], ",", " ", "False", ",", " ", "\"\\""}], "}"}], ",", "\[IndentingNewLine]", RowBox[{"{", RowBox[{ RowBox[{"Row", "[", RowBox[{"{", RowBox[{"TraditionalForm", "[", RowBox[{"(", GridBox[{ {"2", "1", RowBox[{"-", "1"}]}, { RowBox[{"-", "3"}], RowBox[{"-", "2"}], "3"}, {"10", "3", "1"}, { RowBox[{"-", "2"}], RowBox[{"-", "2"}], "4"} }], ")"}], "]"}], "}"}], "]"}], ",", " ", "False", ",", "\"\\""}], "}"}], ",", "\[IndentingNewLine]", RowBox[{"{", RowBox[{ RowBox[{"Row", "[", RowBox[{"{", RowBox[{"TraditionalForm", "[", RowBox[{"(", GridBox[{ {"2", RowBox[{"-", "3"}], "10", "2"}, {"1", RowBox[{"-", "2"}], "3", "2"}, { RowBox[{"-", "1"}], "3", "1", RowBox[{"-", "4"}]} }], ")"}], "]"}], "}"}], "]"}], ",", " ", "False", ",", "\"\\""}], "}"}], ",", "\[IndentingNewLine]", RowBox[{"{", RowBox[{ RowBox[{"Row", "[", RowBox[{"{", RowBox[{"TraditionalForm", "[", "m8", "]"}], "}"}], "]"}], ",", " ", "False", ",", "\"\\""}], "}"}], ",", "\[IndentingNewLine]", RowBox[{"{", RowBox[{ RowBox[{"TraditionalForm", "@", RowBox[{"Row", "[", RowBox[{"MatrixLHS", "[", "m8", "]"}], "]"}]}], ",", " ", "False", ",", "\"\