Maple 2016 Questions and Posts

These are Posts and Questions associated with the product, Maple 2016

 

 

 

So I'm doing homework when I get maple to plot a graph. I realize now that the graph is actually incorrect by comparing it to a graph in another program(try it yourself).  I honestly have no clue why the plotting isn't correct which is why I need your guys help.

Here is the function that I have to plot:

I am having hard time understading how a style sheet works with Maple. I am trying to use the "document mode" and would like to change the font used for math.

The first question I have is: How does one determine which style sheet is being used for the current open document?

Second: I have followed instructions on how to make a custom style sheet, as shown here: https://www.maplesoft.com/support/faqs/detail.aspx?sid=87675 and saved the style sheet on some location on my PC.

But it seems to have no effect at all. Since when I load it again using Format->Manage style sheet->User defined style set, then using the Browse... and select the file my_style.mw which I created using above instructions, I notice that fonts remain the same. I also close Maple and start again, and select my_style.mw again, but when I start typing in document mode, the font is still italic, even though in the XML I see it says  talic="false" (when I open the file in text editor):

<Font name="2D Math" background="[255,255,255]" bold="false" executable="true" family="Times New Roman" foreground="[0,0,0]" italic="false" opaque="false" readonly="false" size="12" subscript="false" superscript="false" underline="false" placeholder="false"/>

I even tried editing the style sheet I think Maple is using, by hand (it is an XML, and modified the font to be not italic) and reloaded it, and no effect. I even added invalid entries in there, and invalid font names, just to see the effect, and nothing happens, no error or anything. It is as if Maple does not even read the style sheet I just saved.

All what I want to do it to make the math 2D input, be _not_ italic font. I spend one hr on this, and nothing seems to make any difference, Maple insist on using italic for math input when in document mode.

Why is it that the style sheet says talic="false" for 2D math, but when I start to type, it types as italic?

 

As you can see, when I type, it switch to italic, even though the style sheet I just set, it clearly saying italic=false. There is not one single italic=true in the whole XML file. Why is Maple insisting on using italic?

 

I am using Maple 2016 on windows. 

hi....how i can extract Coefficients  (i.e. {f1[2],f2[2],f2[3],f3[2],.....f3[6]}) from every algebric equations and create matrix A ,in form AX=0, (X are f1[2],f2[2],f2[3],f3[2],.....f3[6] ) then the determinant of the matrix of coefficients (A) set to zero for obtaining unknown parameter omega.?

Note that  if m=3 then 6 equations is appeare and if m=4 then 9 equations is appeare.thus i need a procedure that works for every arbitary value of ''m''.

in attached file below m=4 thus we have 9 equations, i.e. 3 for eq1[k_] and 3 for eq2[k_] and so on...

also we should use boundary conditions for some amount of fi[j] (i=1,2,3 and j=2,3,...,7)

be extacting above Coefficients for example from first equation ,

''**:= (1/128)*f1[2]*omega^2-(1/4)*f2[2]-(1/2)*f2[3]+(1/4)*f2[4]+(1/4)*f3[2]-(1/2)*f3[3]+(1/4)*f3[4]+140*f1[2]-80*f1[3]+20*f1[4]'''

must compute

coeff(**, f1[2]); coeff(**, f2[2]) and so on...

 

 

 

 

 

fdm-maple.mw

 

 ############################Define some parameters

 

 
restart; Digits := 15; A1 := 10; A2 := 10; A3 := 10; A4 := 1; A5 := 1; A6 := 1; A7 := 1; A8 := 1; A9 := 1; A10 := 1; A11 := 1; B1 := 10; B2 := 10; B3 := 10; B4 := 1; B5 := 1; B6 := 1; B7 := 1; B8 := 1; B9 := 1; B10 := 1; B11 := 1; C1 := 10; C2 := 10; C3 := 10; C4 := 1; C5 := 1; C6 := 1; C7 := 1; C8 := 1; C9 := 1; C10 := 1; C11 := 1; C12 := 1; C13 := 1; C14 := 1; C15 := 1; C16 := 1; A12 := 1; B12 := 1; C18 := 1; C17 := 1; C19 := 1; n := 1; U := proc (x, theta) options operator, arrow; f1(x)*cos(n*theta) end proc; V := proc (x, theta) options operator, arrow; f2(x)*sin(n*theta) end proc; W := proc (x, theta) options operator, arrow; f3(x)*cos(n*theta) end proc; n := 1; m := 4; len := 1; h := len/m; nn := m+1
 ############################Define some equation

eq1[k_] := -2*f1[k]*(-A11*n^4+A10*n^2+A12*omega^2)*h^4+(A6*(f2[k-1]-f2[k+1])*n^3+A9*(f3[k-1]-f3[k+1])*n^2-A5*(f2[k-1]-f2[k+1])*n-A8*(f3[k-1]-f3[k+1]))*h^3+(4*(f1[k]-(1/2)*f1[k-1]-(1/2)*f1[k+1]))*(A3*n^2-A2)*h^2+(-A4*(f2[k-2]-2*f2[k-1]+2*f2[k+1]-f2[k+2])*n-A7*(f3[k-2]-2*f3[k-1]+2*f3[k+1]-f3[k+2]))*h+12*A1*(f1[k]+(1/6)*f1[k-2]-(2/3)*f1[k-1]-(2/3)*f1[k+1]+(1/6)*f1[k+2]):
  ``

 

 

 

 

                                     ######################################  APPLY BOUNDARY CONDITIONS

f1[nn+1] := f1[m]:
 

for k from 2 to m do eq1[k_]; eq2[k_]; eq3[k_] end do

-(1/64)*f2[4]+(1/128)*f2[3]+(1/64)*(f3[4]-(1/2)*f3[3])*(omega^2-1)-(1/64)*f1[2]+(1/32)*f1[3]+(1/64)*f1[4]-280*f3[4]-120*f3[2]+300*f3[3]+20*f3[7]

(1)

``



Download fdm-maple.mw

 

Hello people in Mapleprimes,

I want to factor

g^((2*(-sigma+k+1))/(-1+sigma))-tau^2

as

(g^((-sigma+k+1)/(-1+sigma)) -tau)*(g^((-sigma+k+1)/(-1+sigma))+tau);

 

I know that the following code works:

subs(g^((2*(-sigma+k+1))/(-1+sigma))=(g^((-sigma+k+1)/(-1+sigma)))^2,g^((2*(-sigma+k+1))/(-1+sigma))-tau^2);

factor(%);

 

Isn't there another better way than this?

I will be very glad if you teach me about this.

Thanks in advance.

taro

Hi,

In the following example I introduce some commutation rules that are standard in Quantum Mechanics. A major feature of the Maple Physics Package, is that it is possible to define tensors as Quantum Operators. This is of great interest because powerful tensor simplification rules can then be used in Quantum Mechanics. For an example, see the commutation rules of the components of the angular momentum operator in ?Physics,Examples. Here, I focus on a possible issue: when destroying all quantum operators, the pre-defined commutation rules still apply, which should not be the case. As shown in the post, this is link to the fact that these operators are also tensors.
 

NULL

 

Physics:-Version()[2]

`2016, August 16, 18:56 hours`

(1)

NULL

NULL

restart; with(Physics); interface(imaginaryunit = I)

First, set a 3D Euclidian space

Setup(mathematicalnotation = true, dimension = 3, signature = `+`, spacetimeindices = lowercaselatin, quiet)

[dimension = 3, mathematicalnotation = true, signature = `+ + +`, spacetimeindices = lowercaselatin]

(2)

Define two rank 1 tensors

Define(x[k], p[k])

`Defined objects with tensor properties`

 

{Physics:-Dgamma[a], Physics:-Psigma[a], Physics:-d_[a], Physics:-g_[a, b], p[k], x[k], Physics:-KroneckerDelta[a, b], Physics:-LeviCivita[a, b, c]}

(3)

Now, further define these tensors as quantum operators and gives the usual commutation rule between position and momentum operators (Quantum Mechanics).

Setup(hermitianoperators = {p, x}, algebrarules = {%Commutator(p[k], p[n]) = 0, %Commutator(x[k], p[l]) = I*`&hbar;`*KroneckerDelta[k, l], %Commutator(x[k], x[l]) = 0}, realobjects = {`&hbar;`})

[algebrarules = {%Commutator(p[k], p[n]) = 0, %Commutator(x[k], p[l]) = I*`&hbar;`*Physics:-KroneckerDelta[k, l], %Commutator(x[k], x[l]) = 0}, hermitianoperators = {p, x}, realobjects = {`&hbar;`}]

(4)

As expected:

(%Commutator = Commutator)(p[a], x[b])

%Commutator(p[a], x[b]) = -I*`&hbar;`*Physics:-KroneckerDelta[a, b]

(5)

Now, reset all the Hermitian operators, so that all quantum operators are destroyed. This is useful if, for instance, one needs to compare some the result with the commutative case.

Setup(redo, hermitianoperators = {})

[hermitianoperators = none]

(6)

As expected, there are no quantum operators anymore...

Setup(quantumoperators)

[quantumoperators = {}]

(7)

...so that the following expressions should commute (result should be true)

Library:-Commute(p[a], x[b])

false

(8)

Result should be 0NULL

Commutator(p[a], x[b])

-I*`&hbar;`*Physics:-KroneckerDelta[a, b]

(9)

p[a], x[b]

p[a], x[b]

(10)

NULL

NULL

``

NULLNULL

Below is just a copy & paste of the above section. The only difference, is that "Define(x[k], p[k])" has been commented, so that x[k]and p[k] are not a tensor. In that case, everything behaves as expected (but of course, the interesting feature of tensors is not available).

````

NULL

restart; with(Physics); interface(imaginaryunit = I)

First, set a 3D Euclidian space

Physics:-Setup(mathematicalnotation = true, dimension = 3, signature = `+`, spacetimeindices = lowercaselatin, quiet)

[dimension = 3, mathematicalnotation = true, signature = `+ + +`, spacetimeindices = lowercaselatin]

(11)

#Define two rank 1 tensors

Now, further define these tensors as quantum operators and gives the usual commutation rule between position and momentum operators (Quantum Mechanics)

Physics:-Setup(hermitianoperators = {p, x}, algebrarules = {%Commutator(p[k], p[n]) = 0, %Commutator(x[k], p[l]) = Physics:-`*`(Physics:-`*`(I, `&hbar;`), Physics:-KroneckerDelta[k, l]), %Commutator(x[k], x[l]) = 0}, realobjects = {`&hbar;`})

[algebrarules = {%Commutator(p[k], p[n]) = 0, %Commutator(x[k], p[l]) = I*`&hbar;`*Physics:-KroneckerDelta[k, l], %Commutator(x[k], x[l]) = 0}, hermitianoperators = {p, x}, realobjects = {`&hbar;`}]

(12)

As expected:

(%Commutator = Physics:-Commutator)(p[a], x[b])

%Commutator(p[a], x[b]) = -I*`&hbar;`*Physics:-KroneckerDelta[a, b]

(13)

Now, reset all the Hermitian operators, so that all quantum operators are destroyed.

Physics:-Setup(redo, hermitianoperators = {})

[hermitianoperators = none]

(14)

As expected, there are no quantum operators anymore...

Physics:-Setup(quantumoperators)

[quantumoperators = {}]

(15)

...so that the following expressions should commute (result should be true)

Physics:-Library:-Commute(p[a], x[b])

true

(16)

Result should be 0``

Physics:-Commutator(p[a], x[b])

0

(17)

p[a], x[b]

p[a], x[b]

(18)

NULL

``

NULL``

NULL


Download Quantum_operator_as_Tensors_August_23_2016.mw

hi .may every one help me for pdsolve this differential equations?

all initial boundary condition are zero

thanks...

pdeSol_(1).mw

 

#
# Define some parameters
#
  sigma := 10; N := 0; beta := 1; alpha := 1; PDE1 := diff(w(X, theta, t), X, X, X, X)+2*alpha^2*(diff(w(X, theta, t), theta, theta, X, X))+alpha^4*(diff(w(X, theta, t), theta, theta, theta, theta))-N*(diff(w(X, theta, t), X, X))+diff(w(X, theta, t), t, t)-beta*w(X, theta, t)-sigma = 0

10

 

0

 

1

 

1

 

diff(diff(diff(diff(w(X, theta, t), X), X), X), X)+2*(diff(diff(diff(diff(w(X, theta, t), X), X), theta), theta))+diff(diff(diff(diff(w(X, theta, t), theta), theta), theta), theta)-10+diff(diff(w(X, theta, t), t), t)-w(X, theta, t) = 0

(1)

#
# Define the PDES
#
  PDEs:= { diff(w(X, theta, t), X, X, X, X)+2*alpha^2*(diff(w(X, theta, t), theta, theta, X, X))+alpha^4*(diff(w(X, theta, t), theta, theta, theta, theta))-N*(diff(w(X, theta, t), X, X))+diff(w(X, theta, t), t, t)-beta*w(X, theta, t)-sigma = 0
   };

{diff(diff(diff(diff(w(X, theta, t), X), X), X), X)+2*(diff(diff(diff(diff(w(X, theta, t), X), X), theta), theta))+diff(diff(diff(diff(w(X, theta, t), theta), theta), theta), theta)-10+diff(diff(w(X, theta, t), t), t)-w(X, theta, t) = 0}

(2)

#
# Set of boundary conditions at x=1.
#
   bcs1:= { D[1](w)(1,theta, t) = 0,
              w(1,theta, t) = 0
         };

{w(1, theta, t) = 0, (D[1](w))(1, theta, t) = 0}

(3)

#
# Set of boundary conditions at x=0
#
  bcs2:= {    w(0,theta, t)=0,
           D[1](w)(0,theta, t)=0
         };

{w(0, theta, t) = 0, (D[1](w))(0, theta, t) = 0}

(4)

#
# Set of boundary conditions at t=0
#
  bcs3:= { w(x,theta,0)=0,
          
           D[2](w)(x,theta,0)=0 };
           

{w(x, theta, 0) = 0, (D[2](w))(x, theta, 0) = 0}

(5)

 


  pdsolve( PDEs, `union`(bcs1, bcs2, bcs3), numeric);

Error, (in pdsolve/numeric/process_PDEs) can only numerically solve PDE with two independent variables, got {X, t, theta}

 

 

 

Download pdeSol_(1).mw

Hello everybody, I'm an engineer student and I'm having quite some troubles with Maple. See my teacher told us to program a homework using Maple, problem is I've never used Maple in my life and it's not that hard, but I'm having some trouble with my homework.

 

My homework is about a 4-bar mechanism (grashof's condition) which will define the type of movement my mechanism will have depending on the data I input:

we define 4 variables expressed lenght measurments:

L= (largest link in the mechanism) 
S= (smallest link in the mechanism)

P and Q= other 2 links in the 4 bar mechanism

also 

L0: the link of the mechanism which is FIXED (frame)

L1: the link of the mechanism which is moves (driver)

L2: coupler link

L3: follower link

4 bar mechanism

here 1 will be the fram, 2 the driver, 3 the coupler and 4 the follower

grashofs condition consist on the following:

1. IF L + S < P + Q

and S is the frame, then the program should print that the mechanism presents a rotatory-rotatory movement

or L+S < P+Q and the FRAME is the opposite link of the shortest link, then the program should print that the mechanism presents oscilatory-oscilatory movement

or L+S<P+Q and S is the driver and the frame is adyacent to the driver, then the program should print that the mechanism presents two rotatory movement.

2. IF   L + S > P + Q

the program should print that the mechanism doesn't follow grashof condition and the movement is roker-rocker (doesnt matter what link is the driver and what link is the frame)

3. IF L+S=P+Q

the program should print that the mechanism doesn't follow grashof condition and the mechanism will have deadpoints.

I'm sorry, im a mechanical engineer student and I have very few experience programming (I only learned python like 2 years ago) and I'm having trouble with maple's language (which i know is very simple)

If someone could help me or guide me I would really appreciate it

Thanks alot 

PD. excuse my english

 

In a Maple Primes reply by Joel Riel on Sept. 14, 2011 he included the following command referring to warnings issued from a dsolve, numeric command having events containing a halt action:

_Env_in_maplet := true:  # incantation to suppress integrator warnings

Where can if find explanatory help for his command and any others of a similar nature?

I am trying to solve an equation using surd and I get a strange result.

solve(surd(x^4,8)=-2)
    4, -4, 4 I, -4 I

These solutions are clearly wrong.

The equation (x^4)^(1/8) = -2 has no solution.

This problem is equivalent to asking the computer to solve sqrt(x) = -2

which has no solution in R or C.

 

However if I type

solve((x^4)^(1/8) = -2) , then I get no answer, which is what I expected.

Why does surd behave in this unexpected way.

 

Also another thing I am wondering, why doesn't Maple simplify (x^4)^(1/8) to x^(1/2).

I tried the simplify command it didn't work.

 

Here's a short tensor manipulation which goes totally bananas. Basically I have a metric, and I define a vector k, and right at the end I calcualte the covariant derivative of it. In the metric and elsewhere I have a constant epsilon, a function of time a(t), and 2 functions of all coords, Phi and psi. Then at the end it gives the covariant derivative of k, but now with epsilon and a as functions of all coordinates. 

Any idea what's going on??

 

code:

 

restart;
with(Physics);with(PDEtools):
Setup(coordinatesystems=spherical);

ds2:=expand(a(t)^2*(-(1+2*epsilon*Phi(r,theta,phi,t))*dt^2+(1-2*epsilon*psi(r,theta,phi,t))*(dr^2+r^2*dtheta^2+r^2*sin(theta)^2*dphi^2)));
declare(%,(H)(t),(k0,k1,k2,k3)(X));
Setup(metric = ds2);

Define(k[~mu]=[-1/a(t)^2+epsilon*k1(X),epsilon*k2(X),epsilon*k3(X),1/a(t)^2+epsilon*k0(X)]);

Define(NullGDE[nu]=(k[~mu](X)*D_[mu](k[nu](X))),OpticalDeformationMatrix[mu,nu]=(D_[mu](k[nu](X))));

(OpticalDeformationMatrix[1,1,nonzero]);

 

the final output is Matrix(1, 1, [[(-(2*((diff(epsilon(X), r))*(psi(X))(X))+2*epsilon(X)*(diff((psi(X))(X), r)))*(epsilon(X)*(k1(X))(X)*((a(t))(X)^2)-1)*a(t)-(2*epsilon(X)*(psi(X))(X)-1)*((diff(epsilon(X), r))*(k1(X))(X)*((a(t))(X)^2)+epsilon(X)*((diff((k1(X))(X), r))*((a(t))(X)^2))+2*epsilon(X)*(k1(X))(X)*(a(t))(X)*(diff((a(t))(X), r)))*a(t)+epsilon*psi[r]*(epsilon*k1(X)*(a(t)^2)-1)*a(t)-epsilon^2*psi[theta]*(a(t)^3)*k2(X)-epsilon^2*psi[phi]*(a(t)^3)*k3(X)-(2*(diff(a(t), t))*psi(X)*epsilon+psi[t]*a(t)*epsilon-(diff(a(t), t)))*(epsilon*k0(X)*(a(t)^2)+1))*(1/a(t))]])

where epsilon is now a function!

 

 

 

The help text for dsolve,numeric,events describes many kinds of triggers and actions and other event specifications, but shows only a very limited selection of examples of these possibilities.

Please tell me of any sources containing extensive examples of the wide variety of available specifications and the problems they are useful in solving.

I was learning about Maple, but I do not understand this code below. This does not look correct.

http://www.maplesoft.com/support/help/Maple/view.aspx?path=Task/ConvertExpressionToFunction

When I type it on my worksheet, I get these errors

 

 

Sometimes I wonder if any one at Maplesoft actually looks at their own help web pages and try to use them, or is just the poor users who do that.

 

 

I noticed Maple gives different order of term (but still correct) when variable y or z is used, vs. other letters in this computation.

In this example below, integral results are given, using one letter of the alphabet at a time in the integrand. 

Only when the variable is y or z, Maple shows expression in different form from all the others (negative sign pulled out). The result are correct ofcourse, but was wondering why this hapens only for these two variables? I would have expected that variable name (letter used) should not make any difference to the final form.

restart;
interface(rtablesize=infinity):
chars:=[seq(parse(StringTools:-Char(i)),i=97..122)]: #generate a..z variables, may be there is better way?
Matrix([seq([chars[i0],simplify(int((c0^2 - c1^2)/(chars[i0] - x0+I*c3), x0))],i0=1..nops(chars))]);


Gives (this below. Notice the very last 2 entries below)

Is this something common in Maple? Does it depend on the computation being performed? Can a user do something to tell Maple not to change order/form of expression depending on what variable letter is used?

 

hi

please help me for dsolve differential equations...after much time dont answer!!!

thanks..

dsolve.mw

Digits := 15; SYS := [.16783*h1(theta)-0.96238e-3*(diff(h1(theta), theta, theta))+0.61603e-1*(diff(h2(theta), theta))+0.14870e-4*(diff(h2(theta), theta, theta, theta))-.23703*h3(theta)-0.84431e-3*(diff(h3(theta), theta, theta))+3.4919*10^(-7)*(diff(h1(theta), theta, theta, theta, theta)) = 0, 2.3940*h2(theta)-.35329*(diff(h2(theta), theta, theta))-0.68260e-1*(diff(h1(theta), theta))-0.16526e-4*(diff(h1(theta), theta, theta, theta))+3.0808*(diff(h3(theta), theta))-0.17833e-2*(diff(h3(theta), theta, theta, theta)) = 0, 9.4813*10^(-7)/((1.+1.5802*10^(-8)*h3(theta))*ln(10.+1.5802*10^(-7)*h3(theta))^2)-3.1867/((1.-0.26556e-1*h3(theta))*ln(10.-.26556*h3(theta))^2)-7.6530/((1.-0.31888e-1*h3(theta))*ln(10.-.31888*h3(theta))^2)-4.2551/((1.-0.35459e-1*h3(theta))*ln(10.-.35459*h3(theta))^2)-9.0315/((1.-0.37632e-1*h3(theta))*ln(10.-.37632*h3(theta))^2)-4.6587/((1.-0.38822e-1*h3(theta))*ln(10.-.38822*h3(theta))^2)-9.4520/((1.-0.39384e-1*h3(theta))*ln(10.-.39384*h3(theta))^2)+0.74999e-1/((1.+0.12500e-2*h3(theta))*ln(10.+0.12500e-1*h3(theta))^2)-.69143/((1.-0.28810e-2*h3(theta))*ln(10.-0.28810e-1*h3(theta))^2)-.12945/(1.-0.38836e-1*h3(theta))^4-0.38260e-1/(1.-0.11478e-1*h3(theta))^4-0.24826e-1/(1.-0.37240e-2*h3(theta))^4+0.74712e-3*(diff(h3(theta), theta, theta, theta, theta))+2.6337*10^(-8)/(1.+1.5802*10^(-8)*h3(theta))^4-0.27242e-1*(diff(h3(theta), theta, theta))-3.0707*(diff(h2(theta), theta))+0.17833e-2*(diff(h2(theta), theta, theta, theta))-.23618*h1(theta)-0.84126e-3*(diff(h1(theta), theta, theta))-0.89222e-1/(1.-0.26767e-1*h3(theta))^4-.21340/(1.-0.32010e-1*h3(theta))^4-.13154/(1.-0.19732e-1*h3(theta))^4-0.88519e-1/(1.-0.26556e-1*h3(theta))^4-4.7454/((1.-0.39545e-1*h3(theta))*ln(10.-.39545*h3(theta))^2)-0.36390e-1/(1.-0.10917e-1*h3(theta))^4-1.3100/((1.-0.10917e-1*h3(theta))*ln(10.-.10917*h3(theta))^2)-.89374/((1.-0.37240e-2*h3(theta))*ln(10.-0.37240e-1*h3(theta))^2)-1.3773/((1.-0.11478e-1*h3(theta))*ln(10.-.11478*h3(theta))^2)-.11820/(1.-0.35459e-1*h3(theta))^4-.26259/(1.-0.39388e-1*h3(theta))^4-4.7356/((1.-0.19732e-1*h3(theta))*ln(10.-.19732*h3(theta))^2)+28.586*h3(theta)-.21258/(1.-0.31888e-1*h3(theta))^4-9.4531/((1.-0.39388e-1*h3(theta))*ln(10.-.39388*h3(theta))^2)-4.6603/((1.-0.38836e-1*h3(theta))*ln(10.-.38836*h3(theta))^2)-9.0393/((1.-0.37664e-1*h3(theta))*ln(10.-.37664*h3(theta))^2)-4.2631/((1.-0.35526e-1*h3(theta))*ln(10.-.35526*h3(theta))^2)-7.6824/((1.-0.32010e-1*h3(theta))*ln(10.-.32010*h3(theta))^2)-.25088/(1.-0.37632e-1*h3(theta))^4-.12919/(1.-0.19378e-1*h3(theta))^4-.11842/(1.-0.35526e-1*h3(theta))^4-.12941/(1.-0.38822e-1*h3(theta))^4+0.20833e-2/(1.+0.12500e-2*h3(theta))^4-0.19206e-1/(1.-0.28810e-2*h3(theta))^4-4.6507/((1.-0.19378e-1*h3(theta))*ln(10.-.19378*h3(theta))^2)-.26255/(1.-0.39384e-1*h3(theta))^4-.13182/(1.-0.39545e-1*h3(theta))^4-.25109/(1.-0.37664e-1*h3(theta))^4-3.2120/((1.-0.26767e-1*h3(theta))*ln(10.-.26767*h3(theta))^2) = 0]

ode2 := diff(SYS[2], theta); SYS2 := {ode2, SYS[1], SYS[3]}; bcs2 := {h1(0) = 0, h1(1) = 0, h2(0) = 0, h2(1) = 0, h3(0) = 0, h3(1) = 0, ((D@@1)(h1))(0) = 0, ((D@@1)(h1))(1) = 0, ((D@@1)(h3))(0) = 0, ((D@@1)(h3))(1) = 0}; bcs22 := eval[recurse](convert(SYS[2], D), `union`({theta = 1}, bcs2)); res2 := dsolve(`union`(`union`(SYS2, bcs2), {bcs22}), 'maxmesh' = 2024, numeric, method = bvp[middefer], range = 0 .. 1, abserr = 0.1e-3, output = listprocedure)

NULL



Download dsolve.mw

 

First 49 50 51 52 53 54 55 Last Page 51 of 61