Unanswered Questions

This page lists MaplePrimes questions that have not yet received an answer

As I am trying to solve this integration:

restart; with(linalg); with(stats); with(plots); with(Statistics); with(LinearAlgebra); with(Optimization);
lambda0 := proc (t) options operator, arrow; gamma0+gamma1*t+gamma2*t^2 end proc;
lambda := lambda0(t)*exp(beta*s);
t1 := 145; t3 := 250; t2 := (t1+t3)*(1/2);
s := 1/(273.16+50); s1 := 1/(273.16+t1); s3 := 1/(273.16+t3); s2 := 1/(273.16+t2); gamma0 := 0.1e-3; gamma1 := .5; gamma2 := 0; beta := -3800;
c := 300; n := 200;
Theta := solve(1-exp(-(gamma0*tau1+(1/2)*gamma1*tau1^2+(1/3)*gamma2*tau1^3)*exp(beta*s1)) = 1-exp(-(gamma0*a+(1/2)*gamma1*a^2+(1/3)*gamma2*a^3)*exp(beta*s2)), a);

a := Theta[1];

Delta := solve(1-exp(-(gamma0*(a+tau2-tau1)+(1/2)*gamma1*(a+tau2-tau1)^2+(1/3)*gamma2*(a+tau2-tau1)^3)*exp(beta*s2)) = 1-exp(-(gamma0*b+(1/2)*gamma1*b^2+(1/3)*gamma2*b^3)*exp(beta*s3)), b);

b := Delta[1];

A1 := `assuming`([unapply(int(exp(beta*s1)*exp(-(gamma0*t+(1/2)*gamma1*t^2+(1/3)*gamma2*t^3)*exp(beta*s1))/(gamma0+gamma1*t+gamma2*t^`2`), t = N .. M), N, M)], [N > 0, M > 0]);
A2 := unapply(int(exp(beta*s2)*exp(-(gamma0*(a+t-tau1)+(1/2)*gamma1*(a+t-tau1)^2+(1/3)*gamma2*(a+t-tau1)^3)*exp(beta*s2))/(gamma0+gamma1*(a+t-tau1)+gamma2*(a+t-tau1)^2), t = N .. M), N, M);
A3 := unapply(int(exp(beta*s3)*exp(-(gamma0*(b+t-tau2)+(1/2)*gamma1*(b+t-tau2)^2+(1/3)*gamma2*(b+t-tau2)^3)*exp(beta*s3))/(gamma0+gamma1*(b+t-tau2)+gamma2*(b+t-tau2)^2), t = N .. M), N, M);
B1 := `assuming`([unapply(int(t^2*exp(beta*s1)*exp(-(gamma0*t+(1/2)*gamma1*t^2+(1/3)*gamma2*t^3)*exp(beta*s1))/(gamma2*t^2+gamma1*t+gamma0), t = N .. M), N, M)], [N > 0, M > 0]);
B2 := unapply(int((a+t-tau1)^2*exp(beta*s2)*exp(-(gamma0*(a+t-tau1)+(1/2)*gamma1*(a+t-tau1)^2+(1/3)*gamma2*(a+t-tau1)^3)*exp(beta*s2))/(gamma0+gamma1*(a+t-tau1)+gamma2*(a+t-tau1)^2), t = N .. M), N, M);
B3 := unapply(int((b+t-tau2)^2*exp(beta*s3)*exp(-(gamma0*(b+t-tau2)+(1/2)*gamma1*(b+t-tau2)^2+(1/3)*gamma2*(b+t-tau2)^3)*exp(beta*s3))/(gamma0+gamma1*(b+t-tau2)+gamma2*(b+t-tau2)^2), t = N .. M), N, M);

F0 := A1(0, tau1)+A2(tau1, tau2)+A3(tau2, c);
F1 := B1(0, tau1)+B2(tau1, tau2)+B3(tau2, c);

NLPSolve(1/(n^3*(F0*F1-F1)), tau1 = 115 .. 201, tau2 = 237 .. 273);

I need to have tau1 tau2 as varibles to get there optimal values ..

But this error keeps coming :


Error, (in Optimization:-NLPSolve) integration range or variable must be specified in the second argument, got HFloat(1.0) = HFloat(158.0) .. HFloat(255.0)

Please Help ..

I am a problem with solve differential equation, please help me: THANKS 

g := (y^2-1)^2; I4 := int(g^4, y = -1 .. 1); I5 := 2*(int(g^3*(diff(g, y, y)), y = -1 .. 1)); I6 := int(g^3*(diff(g, y, y, y, y)), y = -1 .. 1); with(Student[Calculus1]); I10 := ApproximateInt(6/(1-f(x)*g)^2, y = -1 .. 1, method = simpson);

dsys3 := {I4*f(x)^2*(diff(f(x), x, x, x, x))+I5*f(x)^2*(diff(f(x), x, x))+I6*f(x)^3 = I10, f(-1) = 0, f(1) = 0, ((D@@1)(f))(-1) = 0, ((D@@1)(f))(1) = 0};

dsol5 := dsolve(dsys3, numeric, output = array([0.]));

              Error, (in dsolve/numeric/bvp) system is singular at left endpoint, use midpoint method instead

****************FORMAT TWO ********************************************************

g := (y^2-1)^2; I4 := int(g^4, y = -1 .. 1); I5 := 2*(int(g^3*(diff(g, y, y)), y = -1 .. 1)); I6 := int(g^3*(diff(g, y, y, y, y)), y = -1 .. 1); with(Student[Calculus1]); I10 := ApproximateInt(6/(1-f(x)*g)^2, y = -1 .. 1, method = simpson);
dsys3 := {I4*f(x)^2*(diff(f(x), x, x, x, x))+I5*f(x)^2*(diff(f(x), x, x))+I6*f(x)^3 = I10, f(-1) = 0, f(1) = 0, ((D@@1)(f))(-1) = 0, ((D@@1)(f))(1) = 0};

dsol5 := dsolve(dsys3, method = bvp[midrich], output = array([0.]));
%;
                                   Error, (in dsolve) too many levels of recursion

I DONT KNOW ABOUT THIS ERROR

PLEASE HELP ME

THANKS A LOT

 

what conditions are necessary that a group G has stabilisers?

Hi,

 

Say I run a procedure, it could take about 3 minutes to run, or maybe hours, or longer.

Is it possible to trigger a sound, like "ding", after it's finished?

I may like to read something while the program is running, but I want to see the results immediately.

It would be nice to have such function.

 

Also, for procedures that runs for a "long" time, could I get 10 (or 15) minutes sound notice?

 

Thanks,

 

casper

I'd like to try the new Maple IDE

http://www.maplesoft.com/products/toolboxes/IDE/index.aspx

Maple IDE - Integrated Development Environment

Is there a way to obtain a trial version even for a week just to try it out? I do not want to spend all this money then find out it does not work well.

any one here uses this and can recommend it or comment on how well it works? For example, can one run Maple code directly from it and have the code execute in Maple, or must one load the file manually from the editor into Maple to run it each time they make any changes to the code?

Hi all

I have a mathematical problem and I asked it in various sites but the answers till yet are not correct.

Assume that we have:

T[m]:=t->t^m:
b[n,m]:=unapply(piecewise(t>=(n-1)*tj/N and t<n*tj/N, T[m](N*t-(n-1)*tj), 0), t):

where n,N,tj are known constants. furthermore assume that we want to comute the following integral:

for following approximations:

I have written the following code but it seems to be incorrect:

V1:=Vector([seq(seq(b[n,m](t),m=0..1),n=1..3)]);
V:=evalf(V1.Transpose(V1));

the original program is :

taaylor.mws

I will be so grateful if any one can help me to solve it by maple

Mahmood   Dadkhah

Ph.D Candidate

Applied Mathematics Department

Hi all

 

I am trying to maximize a function f(x,y,z,w) in terms of x. (Only x is treated as a variable, and the others are treated as parameters).

However, all I know is that y,z,w they are parameters and they are non-negative. I have already tried with the "optmization help page" from maplesoft's website, and it looks like it will search the range of x,y,z,w, and it will return numerical values at which this function is maximized. 

 

 

However, what I want is instead a close-form solution of x=g(y,z,w) that will maximize the function.   In other words, I would like to keep the parameter in symbolic forms. 

 

Can Maple do that?

How can I get the Automorphism Group of a group G as a Permutationgroup?

 

Best regards

 

Kurt Ewald

Hello,

this is the second time I'm writing.

I posted this question in June http://www.mapleprimes.com/questions/201781-System-Of-Parametric-Equations.

This time I have  a similar problem because I'm trying to find a solution for a parametric system of equations but the number of equations and parameters is much bigger and using the tips you gave me last time I couldn't reach any result.

Here is the system:

1) alpha[1]=v*a*u*b ;
2) alpha[2]=v*a*u*(1-b);
3) alpha[3]= v*z*c*(1-a) ;
4) alpha[4]=v*z*(1-a)*(1-c) ;
5) alpha[11]=1/2*v*a* u* b* (-p*u*b+p*u*b*a+b*g-g);
6) alpha[22]=1/2*v*a*u*(1-b)* (p u b-p u b a-b g-p u+p u a);
7) alpha[33] =1/2*v*c*z*(1-a)* (c* (-z*p*a+q)-q);
8) alpha[44]=1/2*v*z*((1-a)*(1-c)* (c*z*p*a-z*p*a-q*c);
9) alpha[12]=v*a*u*b*(1- b)*(-p*u+p*u*a+g) ;
10) alpha[13]=v*a*u*b*z*c*p*(1-a) ;
11) alpha[14]=a*u*b*z*(1-a)*(1-c) ;
12) alpha[23]=a*u*z*c*(1-a)*(1-b);
13) alpha[24]=v*a*u*z*p*(1-a)*(1-b)*(1-c);
14) alpha[34]= v*c*z*(1-a)*(1-c)*(-z*p*a+q);

 

I have 14 equations/unknowns and 8 parameters (a, b, c, u, v, z, p, q).

I would like to write this system only in terms of alphas. In order to do so, I usually try to find the value for the parameters and the substitute them into the equations (and I have already found b,c,g,q using this technique) but I couldn't manage to find all of them. 

Howveer, as you suggested me, with Maple there is the command "eliminate" that implement exactly what I'm looking for but I can't make it work.

This is my code:

> sys := {alpha[1] = v*a*u*(1-b), alpha[2] = v*a*u*b, alpha[3] = v*z*c*(1-a), alpha[4] = v*z*(1-a)*(1-c), alpha[11] = (1/2)*v*a*u*(1-b)*(p*u*b-p*u*b*a-b*g-p*u+p*u*a), alpha[12] = v*a*u*b*(1-b)*(-p*u+p*u*a+g), alpha[13] =      z*c*a*u*(1-a)*(1-b), alpha[14] = v*z*a*u*p*(1-a)*(1-b)*(1-c), alpha[22] = (1/2)*v*a*u*b*(-p*u*b+p*u*b*a+b*g-g), alpha[23] = v*z*c*a*u*b*p*(1-a), alpha[24] = z*a*u*b*(1-a)*(1-c), alpha[33] = (1/2)*v*c*z*(1-a)*(c*(-z*p*a+q)-q), alpha[34] = v*c*z*(1-a)*(1-c)*(-z*p*a+q), alpha[44] = (1/2)*v*z*(1-a)*(1-c)*(c*z*p*a-z*p*a-q*c)};

> eliminate(sys, {a,b,c, p, q, u, v, z});

> simplify(%, size);

 

I also tries to substitute in the system the four parameters I already found but still I can't find a solution.

What am I doing wrong? Or the problem is that it is too complicated?

 

Thank you for your attention,

Elena

I have a Maple program that fits a nonlinear function with 9 parameters to a dataset that contains multiple records; each record gets fitted separately. The records are ordered by a certain experimental variable (an angle of a target). The initial parameters for each fit are the solutions of the previous fit; in this case I get relatively good initial estimates and not too much trouble fitting. I use Statistics:-NonLinearFit to do the actual fitting.

Since this is a bit time consuming and I need to do this a fair amount of times, I'd like to see if I can't speed his up by employing parallel programming.

One way to speed up a fit is to compute the sum of residuals in parallel; is there a way to do this in Maple?

Another way would be to run several fits at the same time. The problem I have with that in this case is that I use the results of the previous fit as starting values for the next fit. I might be able to increase the stride of this scheme; i.e. for 4 processes, use the result of fit 1 as starting point for fit 5; fit 2 for fit 6 etc. But before I embark on this non-trivial change; can Statistics:-NonLinearFit even be used in this way (i.e. is it thread safe)?? My fitting function is an actual function (as opposed to a procedure with local variables) so I don't think the function itself would cause trouble.

I could also contemplate the Grid package; except that I am concerned about the overhead moving the data over to each node (although it would all sit on one machine with 4 processors).

I realize that I may have to do some experimentation by myself, but if there is any experience out there I'd like to know about it...

Mac Dude

my int is in below.

my_int.mw

my int has hyperbolic and trigonal parts thus when they are multiplied , Maple is not able to integrate!

 

Now, How can I solve this integral?

thank you for help

my int is:

 

``

restart

eq1 := m*(diff(diff(w(x, t), t), t))+diff(diff(EIy*(diff(diff(w(x, t), x), x))+(EIz-EIy)*(diff(diff(w(x, t), x), x))*(theta(x)+phi(x, t))^2, x), x)-Pz = 0

l := 16; m := .75; EIy := 0.2e5; EIz := 0.400e7; GJ := 0.1e5; mj := .1; Pz := 5000; Mz := 0; theta := proc (x) options operator, arrow; 0 end proc

w := proc (x, t) options operator, arrow; q[1](t)*(cosh(1.8751*x/l)-cos(1.8751*x/l)+(-1)*.734096*(sinh(1.8751*x/l)-sin(1.8751*x/l)))+q[2](t)*(cosh(4.6941*x/l)-cos(4.6941*x/l)+(-1)*1.01847*(sinh(4.6941*x/l)-sin(4.6941*x/l)))+q[3](t)*(cosh(7.8548*x/l)-cos(7.8548*x/l)+(-1)*.999224*(sinh(7.8548*x/l)-sin(7.8548*x/l))) end proc

phi := proc (x, t) options operator, arrow; q[4](t)*sqrt(2)*sin(1.5708*x/l)+q[5](t)*sqrt(2)*sin(4.7124*x/l)+q[6](t)*sqrt(2)*sin(7.8540*x/l) end proc

NULL

f[1] := int(lhs(eq1)*(cosh(1.8751*x/l)-cos(1.8751*x/l)-.734096*(sinh(1.8751*x/l)-sin(1.8751*x/l))), x = 0 .. l)

``

restart;
eq:=diff(y(x),x) - y(x)^2 - x*y(x) - x + 1;
r:=dsolve(eq,y(x));
latex(r);

Gives an error "(in fprintf) string expected for string format". The problem seems when the math contains "erf"? Both examples below fail with result that contains this.

Maple 18, on windows 7.

Another example:

restart;
eq:=diff(y(x),x) + a*y(x)*(y(x)-x) - 1;
r:=dsolve(eq,y(x));
latex(r);

Another example, which seems to fail for different reason

restart;
eq:=diff(y(x),x) + a*x*y(x)^3+b*y(x)^2;
r:=dsolve(eq,y(x));
latex(r);

hello

we have an exam next week and I want to know

how I can write (fordo) in maple for numerical integration

in different methods such as trapezoid , newton cotes and so on.

thanks

This integral is defined as

Where

 

Now, How can I solve this integral?

tnx for your help.

 

 

Hi,

First 229 230 231 232 233 234 235 Last Page 231 of 334