MaplePrimes Questions

Hi

just downloaded maple on my windows computer with AMD processor but I can't get it to work!!!!

The program opens up but as soon as I start to write, the program freezes. When the program is frozen there is nothing I can do I can't even close it.

I have tried just about everything ( antivirus, deleting the program, updating the computer) u name it.

if anyone has any suggestions, please write to me!!!

Hi everyone, I have copied soem code from a paper. I hope to try and manupiluate some of the varables. However it seems while I am coping the code I get this error Error, (in dsolve/numeric/process_input) system must be entered as a set/list of expressions/equations .I have checked online but it seems that there is nothing I can find to fix this problem. My code is posted below 

Thanks for your time and help!

restart

with(VariationalCalculus)

with(ODEtools)

Error, invalid input: with expects its 1st argument, pname, to be of type {`module`, package}, but received ODEtools

 

with(DEtools)

with(plots); with(plottools); PDEtools[declare]((theta, phi, psi)(t), prime = t)

`derivatives with respect to`*t*`of functions of one variable will now be displayed with '`

(1)

with(linalg)

We will now declare our first equations

 

 

x[1] := l[1]*sin(theta(t))

y[1] := -l[1]*cos(theta(t))``

x[2] := -l[2]*sin(theta(t)); y[2] := l[2]*cos(theta(t))

x[4] := x[1]-l[4]*sin(theta(t)+phi(t)); y[4] := y[1]+l[4]*cos(theta(t)+phi(t)); x[3] := x[2]+l[3]*sin(theta(t)-psi(t)); y[3] := y[2]-l[3]*cos(theta(t)-psi(t))

R[1] := vector(2, [x[1], y[1]]); R[2] := vector(2, [x[2], y[2]]); R[4] := vector(2, [x[4], y[4]]); R[3] := vector(2, [x[3], y[3]])

`\`R`[1]*` ≔ map`(diff, R[1], t); `\`R`[2]*` ≔ map`(diff, R[2], t); `\`R`[4]*` ≔ map`(diff, R[4], t); `\`R`[3]*`≔map`(diff, R[3], t)

NULL

NULL

T := combine(simplify(collect((1/2)*m[1]*innerprod(`\`R`[4]*`,`*R[4]*`)+m[2]/2*
innerprod(\`R[3]\`,\`R[3]`), [l[1], l[2], l[3], l[4], m[1], m[2], diff(theta(t), t), diff(phi(t), t), diff(psi(t), t), cos(psi(t)), sin(psi(t))])), trig)

NULL

U := collect(simplify(expand(g*m[1]*y[4]+g*m[2]*y[3])), [l[1], l[2], l[3], l[4], m[1], m[2], diff(theta(t), t), diff(phi(t), t), diff(psi(t), t), cos(psi(t)), sin(psi(t)), g])

NULL

L := simplify(collect(T-U, [l[1], l[2], l[3], l[4], m[1], m[2], diff(theta(t), t), diff(phi(t), t), diff(psi(t), t), cos(psi(t)), sin(psi(t))]))

NULL

NULL

NULL

Eul := remove(has, EulerLagrange(L, t, [theta(t), phi(t), psi(t)]), K[1]); eq1 := op(select(has, Eul, (diff(psi(t), t))^2)); eq2 := op(select(has, remove(has, Eul, (diff(psi(t), t))^2), sin(psi(t)))); eq3 := op(remove(has, remove(has, Eul, (diff(psi(t), t))^2), sin(psi(t))))

NULL

NULL

INITS := {phi(0) = (1/4)*Pi, psi(0) = (1/4)*Pi, theta(0) = 3*Pi*(1/4), (D(phi))(0) = 0, (D(psi))(0) = 0, (D(theta))(0) = 0}

NULL

PARAM := [g = 9.8, l[1] = 10, l[2] = 100, l[3] = 100, l[4] = 21, m[1] = 1000, m[2] = 1]

NULL

sys := eval([eq1, eq2, eq3], PARAM)

NULL

sol := dsolve([op(sys), op(INITS)], numeric, output = listprocedure)

Error, (in dsolve/numeric/process_input) system must be entered as a set/list of expressions/equations

 

NULL``

 

 

NULL

NULL

``

Download Test_1.mw

Is there any method to handle the huge expression of A where it is given that sigma+x=a, sigma*x=b

It is huge. I tryed with

B := mtaylor(A, [sigma, x], 8)

Unable to handle. I know that the expression can be written in powers in sigma^ix^j and thereafter sigma+x=a, sigma*x=b could be substituted..

Any help.

A := -sigma*(sigma^2+2*sigma*(alpha-1)+alpha*beta+1-alpha)*(alpha+sigma-1)^2*(sigma*theta+delta)*(gamma1*(alpha+sigma-1)+(1-sigma)*(beta+sigma))*alpha*(1-x)^2*(beta+x)^3*((theta*x+delta-gamma1)*(alpha+x-1)-(1-x)*(beta+x))+alpha*(1-sigma)^2*(beta+sigma)^3*((sigma*theta+delta-gamma1)*(alpha+sigma-1)-(1-sigma)*(beta+sigma))*x*(x^2+2*x*(alpha-1)+alpha*beta+1-alpha)*(alpha+x-1)^2*(theta*x+delta)*(gamma1*(alpha+x-1)+(1-x)*(beta+x))

-sigma*(sigma^2+2*sigma*(alpha-1)+alpha*beta+1-alpha)*(alpha+sigma-1)^2*(sigma*theta+delta)*(gamma1*(alpha+sigma-1)+(1-sigma)*(beta+sigma))*alpha*(1-x)^2*(beta+x)^3*((theta*x+delta-gamma1)*(alpha+x-1)-(1-x)*(beta+x))+alpha*(1-sigma)^2*(beta+sigma)^3*((sigma*theta+delta-gamma1)*(alpha+sigma-1)-(1-sigma)*(beta+sigma))*x*(x^2+2*x*(alpha-1)+alpha*beta+1-alpha)*(alpha+x-1)^2*(theta*x+delta)*(gamma1*(alpha+x-1)+(1-x)*(beta+x))

(1)

NULL``

``

Download 1.mw1.mw

Hi, everyone! I am a new user to maple and I need to import some code I have found from a paper, just so I can manupluate some of the variables. However when I have copied and pasted my code, I keep getting the error Error, mismatched or missing bracket/operator.  I did check online and it seems to be a bracket missing but I have copied without errors from the source. 

I have attached a picture and did a copy paste of the code that is giving me an error below. 

Thanks for your help 

x[1] := l[1]*sin(theta(t));
y[1] := -l[1]*cos(theta(t));

x[2] := -l[2]*sin(theta(t));
y[2] := l[2]*cos(theta(t));
R[1] := vector(2, [x[1], y[1]]);
R[2] := vector(2, [x[2], y[2]]);
'R[1]'':=map(diff,R[1],t):

 

polysols(diff(u(x), x) = u(x)^2 - 1) produces no results, while it can be verified by direct observation that u(x) = 1 is a polynomial solution.

Hi
Can someone help me write the program for this equation?
I really need this program.
With respect

 

I was experimenting on and found coeff and degrees  do not work with algebraic type powers. So I set aboud dismanteling  a example polynomial. I certainly went around the houses doing this. I wanted to put the powers and coefficinets of x in an array.

I sure there must be a simpler way.

restart

NULLNULL

r := proc (x) options operator, arrow; a[0]+a[1]*x-a[2]*x^2+a[8]*x^(8/5)-a[h]*x^h+k*x^(-b/a) end proc

proc (x) options operator, arrow; a[0]+a[1]*x-a[2]*x^2+a[8]*x^(8/5)-a[h]*x^h+k*x^(-b/a) end proc

mnmls := [op(r(x))]

[a[0], a[1]*x, -a[2]*x^2, a[8]*x^(8/5), -a[h]*x^h, k*x^(-b/a)]

A := Array(1 .. 2, 1 .. nops(mnmls))

Array(%id = 36893489621187187044)

mnmls, x0 := selectremove(has, mnmls, x)

[a[1]*x, -a[2]*x^2, a[8]*x^(8/5), -a[h]*x^h, k*x^(-b/a)], [a[0]]

NULL

A[2, 1] := op(x0)

a[0]

coeff(r(x), x, 2)

Error, unable to compute coeff

coeffs(r(x), x)

Error, invalid arguments to coeffs

degree(mnmls[1], x)

1

degree(mnmls[4], x)

FAIL

degree(mnmls[5], x)

FAIL

indets(r(x))

{a, b, h, k, x, a[0], a[1], a[2], a[8], a[h], x^h, x^(-b/a), x^(8/5)}

bits := [seq([op(mnmls[i])], i = 1 .. nops(mnmls))]

[[a[1], x], [-1, a[2], x^2], [a[8], x^(8/5)], [-1, a[h], x^h], [k, x^(-b/a)]]

deeperbits := [seq(op(op(bits)[i]), i = 1 .. nops(bits))]

[a[1], x, -1, a[2], x^2, a[8], x^(8/5), -1, a[h], x^h, k, x^(-b/a)]

varpwrs, cofsl := selectremove(has, deeperbits, x)

[x, x^2, x^(8/5), x^h, x^(-b/a)], [a[1], -1, a[2], a[8], -1, a[h], k]

is(nops(vars) = nops(cofsl))

false

cofs := convert(cofsl, Array)

Array(%id = 36893489621220545228)

for i to numelems(cofs)-1 do if cofs[i] = -1 then cofs[i] := 0; cofs[i+1] := -cofs[i+1]; i = i+2 end if end do; cofs; cofs := remove[flatten](has, cofs, 0)

Array(%id = 36893489621220530764)

cofs

Array(%id = 36893489621220530764)

is(nops(vars) = numelems(cofs))

false

NULL

pwrs := `assuming`([simplify(`~`[log[x]](varpwrs))], [x > 0, a::'real', b::'real', h::'real'])

[1, 2, 8/5, h, -b/a]

A

Array(%id = 36893489621187187044)

for i to nops(mnmls) do A[1, i+1] := pwrs[i]; A[2, i+1] := cofs[i] end do; A

Array(%id = 36893489621187187044)

 

NULL


Download Q_11-9-22_monomial_powers_and_coeffs.mw

restart;

pde := diff(u(x,t),t) + u(x,t)*diff(u(x,t),x) = 0;

diff(u(x, t), t)+u(x, t)*(diff(u(x, t), x)) = 0

These are all wrong:

pdsolve({pde,u(x,0)=f(x)});
pdsolve({pde,u(x,0)=sin(x)});
pdsolve({pde,u(x,0)=erf(x)});

u(x, t) = 0

u(x, t) = 0

u(x, t) = 0

But these ones are correct:

pdsolve({pde,u(x,0)=exp(x)});
pdsolve({pde,u(x,0)=x});

u(x, t) = LambertW(t*exp(x))/t

u(x, t) = x/(t+1)

Download mw.mw

in a worksheet, typing

r:=(x^2 - 2*x - 1)/4;

Maple returns

But when typing

r:=(x^2 - 2*x - 1)/(4*x);

Now it does not expand terms and gives what is expected

Is there a way to make the first example remain unexpanded? Same with Mathematica:

I know this only affects the display only. But it is annoying, as I want to see the numerator and denominator on the screen as I put them there and not have them change.

I tried changing the typesetting level, but this had no effect.

I used to like Maple becuase it does not change anything unless asked to, and everything is explicit, which is better.

Now I am starting to change my mind on this aspect of Maple.

Hello. Is there any way to plot 2+ oscillators as shown in the image below?

Thanks for any help.

Hi,

Newbie here....

I'm struggling to see with the default font size, I'm also struggling with readability of the text/charactors in the left hand paletetes/workbook pull down menus.  I can see that there are style choice options in format>styles but it seems that I need to set every single permutation separately to acheive readability nirvana which seems unlikely to be the best route.

Is there a global setting for font size?  Alternatively are there style files somewhere that the nearly blind can download?

I am really struggling with this.

Cheers

Please, how do I use surface or contour to plot discontinous function?

z = f(x,y) := x-.8193318913*sin(x)*cos(x)/(cos(x)^2+sinh(y)^2)-(0.2931044702e-2*(0.7500000000e-3*x^2-0.7500000000e-3*y^2+0.1622336517e-1))*sin(x)*cos(x)/(((0.7500000000e-3*x^2-0.7500000000e-3*y^2+0.1622336517e-1)^2+0.2250000000e-5*x^2*y^2)*(cos(x)^2+sinh(y)^2))-0.4396567053e-5*x*y*sinh(y)*cosh(y)/(((0.7500000000e-3*x^2-0.7500000000e-3*y^2+0.1622336517e-1)^2+0.2250000000e-5*x^2*y^2)*(cos(x)^2+sinh(y)^2)):

How should I handle the limit in the integration answe?. I don't see why it is necessary.

restart

_local(gamma)

p := `assuming`([proc (alpha) options operator, arrow; alpha^m end proc], [m]); LinearAlgebra:-Transpose(integer)

integer

q := `assuming`([proc (alpha) options operator, arrow; alpha^n end proc], [n]); LinearAlgebra:-Transpose(integer)

integer

Sa := eval((1/2)*(int(simplify(p(alpha)*(D(q))(alpha)), alpha = 0 .. 1)))

-(1/2)*(limit(alpha^(m+n), alpha = 0, right)-1)*n/(m+n)

s1 := eval((1/2)*(int(simplify(p(alpha)*(D(q))(alpha)), alpha)))

(1/2)*alpha^(m+n)*n/(m+n)

eval(s1, alpha = 1)-(eval(s1, alpha = 0))

(1/2)*n/(m+n)

NULL

Download Q_9-9-22_limit_in_integral.mw

What is the best and accurate way to export a large symbolic matrix (200*300) from Maple to Matlab? The Marix have a lot of variables, symbols and operators such as diiff, int, ....

Here is a simple example:

NULL

restart

NULL

A := Matrix(2, 6, {(1, 1) = x*y*z, (1, 2) = (1/2)*tau[2], (1, 3) = sin(x*y*z), (1, 4) = ln(x*y*z), (1, 5) = tau[1]*exp(x*y*z), (1, 6) = sin(x+y)+cos(x+y), (2, 1) = x^2+1, (2, 2) = x^2+1/sin(x*y*z), (2, 3) = 2*exp(y), (2, 4) = tau[1], (2, 5) = diff(f(x, y, z), x), (2, 6) = int(f(x, y, z), x)})

A := 1/sin(protected)

(1)

``

CodeGeneration[Matlab](codegen[makeproc](A, [x, y, tau[1], tau[2]]))

Error, (in codegen/makeproc) optional arguments must be equations [x, y, tau[1], tau[2]]

 

``

``

``

``

``

``

Download export.mw

I would appreciate any recommendation on these games and puzzles with maple implementation. The purpose is to inspire the math interest of children (say 16-) . Benefits from the assistance of Maple:

1. Learn and build the habit of math modelling: eg by playing with this n-queen problem - https://www.maplesoft.com/Applications/Detail.aspx?id=154482

Children can realize that, for many problems, modelling is doable for them - question formation in math/programming and finding all the constraints - while solution method is simply a small step if done by computer. This is already a big step forward for them and they may enjoy the modelling process. For more math-eager kids, they may start to explore the documentation behind the solution methods.

2. Learn the art of automatic proof by witnessing the efficiency gain by themselves - I don't think I have to explain such to the community here. I note Doron Zeilberger has collected many in such a spirit on his website.

I have read some in the Application Center (eg under the tag game) and by searching here by the "puzzle". Is there some more systematic collection/books? The applications I have seen is mostly on logical/combinatorial problems. Love to see the games/puzzles under a broader range of math fields good for children.

First 63 64 65 66 67 68 69 Last Page 65 of 2212