User Portlet User Portlet

Discussions
You expect Mathematica to find the continuation because [Piecewise][1] says in Examples -> Scope Integration constants are chosen to make the result continuous: which is correct in one dimension. In 2 or more dimensions two problems arise...
In[14]:= Simplify[a^b (c^d)^b - a^b c^(d b), b \[Element] Integers && d \[Element] Integers] Out[14]= 0 In[15]:= $Version Out[15]= "10.4.1 for Microsoft Windows (64-bit) (April 11, 2016)"
That's a way ListPlot[RandomReal[{-20, 20}, 100] /. x_Real :> If[Abs[x] > 10., 0, x], PlotRange -> {Automatic, {-11, 11}}] please note, if `angle1` is a list (because it appears in `ListPlot[]`) then `Abs[angle1]` threads over the list...
As it stands (fifth line) `(Exp (\[Phi][x,t])/` it is an syntax error. But even that fixed it runs into clear[\[Phi], \[Chi]]; sol = NDSolve[{-2*D[\[Phi][x, t], t, t] + 2 D[\[Phi][x, t], x, x] + (Exp[\[Phi][x,...
What is the purpose of this question? Mathematica finds the solution with all seven parameters `C2, Bi, k, A1, S, A2, A3` free: assumption free and without values: ![enter image description here][1] as usual > the simplified answer ...
What did you try? This is Manipulate[ Grid[{{Show[splot, ParametricPlot[ Evaluate[ First[{x[t], y[t]} /. NDSolve[{x'[t] == y[t], y'[t] == -Sin[x[t]] - .25 y[t], ...
Make the dependency explicit, please In[31]:= Clear[A] A[b_?NumericQ] := N[{{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, -2 \[Pi], 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0,...
The first line gives already recursion errors In[2]:= op = I*Nest[op, \[CapitalPsi][r, \[Phi]], 3] == 2 \[CapitalPsi][r, \[Phi]]*r^2/Cos[\[Phi]]^5 During evaluation of In[2]:= $RecursionLimit::reclim2: Recursion depth...
As it stands it has also errors with the `Q[]` and `S[]` Clear[OBJ2] OBJ2 = Compile[{{par, _Real, 1}}, Module[{M, Mexp, s, i}, Mexp = MatrixExp[P[par]]; M = ConstantArray[0., {dim, dim}]; For[i = 1, i
Because of [Numeric Quantities][1] and [Arg][2] > Arg[z] is left unevaluated if z is not a numeric quantity. one has In[15]:= Arg[-2 - I GoldenRatio \[Pi]] Out[15]= -\[Pi] + ArcTan[(GoldenRatio \[Pi])/2] but (because x is not a...