acer

32562 Reputation

29 Badges

20 years, 26 days
Ontario, Canada

Social Networks and Content at Maplesoft.com

MaplePrimes Activity


These are answers submitted by acer

In your previous Question the Answer by vv contained a link to an older thread.

   https://mapleprimes.com/posts/214347-Multibyte-Characters

In that older posting there is code for another routine by vv, named SS, which leverages vv's LEN procedure to get substring functionality.

So, your current attached worksheet could be easily revised as, say,

restart

LEN := proc (s::string) Python:-EvalFunction("len", s) end proc

SS := proc (s::string, mn::{integer, range({integer, identical()})}) local m, n; if type(mn, integer) then m, n := `$`(mn, 2) else m := lhs(mn); n := rhs(mn) end if; if m = NULL then m := 1 end if; if n = NULL then n := -1 end if; if n = -1 then n := LEN(s) elif n < 0 then n := n+1 end if; if m = -1 then m := LEN(s) elif m < 0 then m := m+1 end if; Python:-EvalString(cat("\"", s, "\"", "[", m-1, ":", n, "]")) end proc

str := "tølkæi"

LEN(str) = 6NULL

NULL

SS(str, 1) = "t"NULL

SS(str, 2) = "ø"NULL

SS(str, 3) = "l"NULL

SS(str, 4) = "k"NULL

SS(str, 5) = "æ"NULL

SS(str, 6) = "i"NULL

Download substrings_ac.mw

It offers additional functionality, eg.

SS(str, 1 .. ()), SS(str, 1 .. -3), SS(str, 1 .. 2), SS(str, -3 .. -1), SS(str, -1)

"tølkæi", "tølk", "tø", "kæi", "i"

NULL

It's not much of a stretch to imagine that "SS" stands for SubString.

Are you just trying to compute this?

   convert( p(x)/q(x), parfrac, x )

 

If that's the case then could it really be that you didn't try entering the term partialfraction into Maple's Help search box?

1) It may work. Solving equations using the numerators could also produce some solutions which don't satisfy equations obtained from the original expressions, since it's possible that some solutions (of the new system) could make both numerator and denominator (in the original system) be zero. You don't want solutions which make any of the denominators zero. That might be unlikely. It's a general statement.

2) Where did you get this command which you are trying to use but don't understand? (If from another of your several threads on a common problem, why not ask there and keep the content sensibly close?)

It's mostly a composition. I don't know why its author included the evala@Norm since that does not have major effect on this example. You could more quickly just use numer(Eqs) , which produces a similar result as before if compared via normal. In that case you would not need the elementwise ~ here. The numer command gets mapped across the set of expressions automatically.

3) Your three expressions are sums of products. The numer command is performing expansion, when reforming over a common denominator. As illustration, notice for the following that the result from numer has greater length than the original,

expr := 1/(a+b)^5 + 1/(c+d);

1/(a+b)^5+1/(c+d)

foo := numer(expr);

a^5+5*a^4*b+10*a^3*b^2+10*a^2*b^3+5*a*b^4+b^5+c+d

length(expr), length(foo);

33, 75

normal(expr);

(a^5+5*a^4*b+10*a^3*b^2+10*a^2*b^3+5*a*b^4+b^5+c+d)/((a+b)^5*(c+d))

Download num_ex.mw

It's not clear why you want these numer results in more compact form, since the next step is to pass them on to some system solver which will need to manipulate/reform as it needs.

Is this adequate for your goal?

L := diff(q1(t), t) + 2*diff(q2(t), t) + 3*q1(t);

diff(q1(t), t)+2*(diff(q2(t), t))+3*q1(t)

Physics:-diff(L, q1(t));

3

Download ph_diff_ex.mw

Here is a shorter example of the underlying error occurring during evaluation at some kind of point of some kind of piecewise.

restart;
piecewise(abs((HFloat(infinity)+HFloat(infinity)*I)*2^(1/2)
              + HFloat(infinity)+HFloat(infinity)*I) < 1,
          1, undefined);
Error, (in sprintf) too many levels of recursion

That error relates to this:

restart;
radnormal(abs((HFloat(infinity)+HFloat(infinity)*I)*2^(1/2)
              +HFloat(infinity)+HFloat(infinity)*I)-1);
Error, (in sprintf) too many levels of recursion

And that in turn tries the following:

`radnormal/ToRadical`(abs((infinity+infinity*I)*2^(1/2)+infinity+infinity*I)-1);
Error, (in sprintf) too many levels of recursion

And here is how that error can occur for your expression assigned to ff, (the plotting internal process will construct a procedure from the expression)

FF := unapply(ff, x):
FF(HFloat(1.9954019196875001));
Error, (in sprintf) too many levels of recursion

subs(x=HFloat(1.9954019196875001),ff):
eval(%);
Error, (in sprintf) too many levels of recursion

bug_plot_may_29_2023_pw_ac.mw


note. So far I'm seeing this problem in Maple 2019.2.1 and after, but not in 2018.2 and earlier.

I will submit a bug report.

A smooth plot can be obtained reasonably quickly in Maple 2023.0 with,
   plot(evala(ff),x=-3..3);
That skirts around issues near 2 for, say,
   plot(X->eval(ff,x=X),-3..3);

I can see that rationalize computation go away for a long time, even in earlier versions.

If you need to get around this, how about one of,

   radnormal(expr,':-rationalized')

   simplify(radnormal(expr,':-rationalized'),size)

   simplify(radnormal(expr,':-rationalized'))

For example, in under 2sec on my Maple 2023.0,

restart;

kernelopts(version);

`Maple 2023.0, X86 64 LINUX, Mar 06 2023, Build ID 1689885`

 

expr:=1/(3*2^(2/3)*((2^(1/3)*(1+(256*u^3+1)^(1/2))^(2/3)-8*u)/(1+(256*u^3+1)^(1/2))^(1/3))^(1/2)+3*(1/(1+(256*u^3+1)^(1/2))^(1/3)*((8*2^(1/6)*u-2^(1/2)*(1+(256*u^3+1)^(1/2))^(2/3))*((2^(1/3)*(1+(256*u^3+1)^(1/2))^(2/3)-8*u)/(1+(256*u^3+1)^(1/2))^(1/3))^(1/2)-4*2^(1/6)*(1+(256*u^3+1)^(1/2))^(1/3))/((2^(1/3)*(1+(256*u^3+1)^(1/2))^(2/3)-8*u)/(1+(256*u^3+1)^(1/2))^(1/3))^(1/2))^(1/2)*2^(7/12)-16*u):

 

mein := CodeTools:-Usage( simplify(radnormal(expr,':-rationalized')) );

memory used=147.31MiB, alloc change=70.00MiB, cpu time=1.74s, real time=1.58s, gc time=392.02ms

(1/8192)*(3*(96*u*((3/8)*u*2^(1/3)*(1+(256*u^3+1)^(1/2))^(2/3)+(3/64)*2^(2/3)*((256*u^3+1)^(1/2)-1)*(1+(256*u^3+1)^(1/2))^(1/3)+u^2)*(((-(256*u^3+1)^(1/2)+1)*(1+(256*u^3+1)^(1/2))^(2/3)+32*2^(1/3)*u^2*(1+(256*u^3+1)^(1/2))^(1/3))/u^2)^(1/2)+9*2^(1/6)*((256*u^3+1)^(1/2)-1)*(1+(256*u^3+1)^(1/2))^(2/3)-1024*u^4*2^(5/6)-288*u^2*2^(1/2)*(1+(256*u^3+1)^(1/2))^(1/3))*((-64*u*((1/8)*u*2^(5/6)*(1+(256*u^3+1)^(1/2))^(2/3)+(1/32)*2^(1/6)*((256*u^3+1)^(1/2)-1)*(1+(256*u^3+1)^(1/2))^(1/3)+2^(1/2)*u^2)*(((-(256*u^3+1)^(1/2)+1)*(1+(256*u^3+1)^(1/2))^(2/3)+32*2^(1/3)*u^2*(1+(256*u^3+1)^(1/2))^(1/3))/u^2)^(1/2)+2^(2/3)*((256*u^3+1)^(1/2)-1)*(1+(256*u^3+1)^(1/2))^(2/3)-64*(1+(256*u^3+1)^(1/2))^(1/3)*u^2)/u^2)^(1/2)+3*(3*2^(1/2)*(256*u^3-3*(256*u^3+1)^(1/2)+3)*(1+(256*u^3+1)^(1/2))^(2/3)+4096*u^2*((3/128)*2^(5/6)*((256*u^3+1)^(1/2)+2)*(1+(256*u^3+1)^(1/2))^(1/3)+u^2*2^(1/6)))*(((-(256*u^3+1)^(1/2)+1)*(1+(256*u^3+1)^(1/2))^(2/3)+32*2^(1/3)*u^2*(1+(256*u^3+1)^(1/2))^(1/3))/u^2)^(1/2)-131072*u^5-13824*u^2)/(256*u^6-135*u^3)

Download nm_rdnm.mw

The maximize command can handle this example,

maximize( (x-4*y)^9+3*z, x=0..3, y=0..14, z=0..17 );

             19734

You could get that output if lessthan had been given its own alias, earlier.

In the sixth bullet point on the Help-page for topic alias, there is the sentence, "Finally, a sequence of all existing aliases is returned as the function value."

(You've added a .mw file Document, since I answered. If I open and rexecute it then I don't see that same output. Perhaps you had an original with prior commmands?)

Your code for it currently attempts it like,

Grading:-Quiz("Calculer la limite :",
   proc(Resp, Ans)
      evalb(limit(Ans, x = 0) = Resp);
   end proc,
   proc() local r;
      r := rand(1 .. 7)();
      sin(r()*x)/(3 + r());
   end proc);

A serious weakness of that is that it doesn't actually typeset it as a limit, and it doesn't indicate the limit point (ie, x=0).

Perhaps you could start with this adjustment to your code,

Grading:-Quiz(
   "Calculer la limite :",
   proc(Resp, Ans)
      evalb(value(Ans) - Resp = 0);
   end proc,
   proc() local r;
      r := rand(1 .. 7)();
      Limit(sin(r()*x)/(3 + r()), x = 0);
   end proc)

I presume that you plan on trying to come up with more inspired examples whose answers are not all zero.

There is a tricky issue, to many such quizzes: what are you willing to accept as the answer? Is it only the identical expression?

Suppose the answer is exact zero. Would you accept the float 0.00? What about 12^(1/2)/2 - 3^(1/2) ? What about sin(2)^2+cos(2)^2-1 ?

If the answer to another example were sqrt(3) would you accept 12^(1/2)/2 ?

If the answer to another example were x-1, would you accept (x^2-1)/(x+1) ?

There are more insidious examples of seemingly harmless variations that could get the wrong grade.

Note that it's not generally practical to attempt any simplification as strong as, say,
   evalb(simplify( limit(Ans, x = 0) = Resp ));
because for various classes of problem (integration, say) that could give the response "Correct" even if one merely entered the unsolved problem as the response!

Also unsatisfactory is, say,
   evalb(limit(Ans, x = 0) = simplify(Resp));
because there may be more than one acceptable form, and (more seriously) different accpectable forms might not simplify to the same simplified form.

Given a particular validation scheme, it's often possible to come up with an innocuous looking example for which the grading is not right.

Is this the kind of thing that you are trying to do?

note: here, you may compare,
   CharacteristicPolynomial(A,lambda);
   Determinant(A-lambda);

restart;

with(LinearAlgebra):

 

A := <<3|2>,<-1|4>>;
CharacteristicPolynomial(A,lambda);
Determinant(A-lambda);
eval(%,lambda=A);

Matrix(2, 2, {(1, 1) = 3, (1, 2) = 2, (2, 1) = -1, (2, 2) = 4})

lambda^2-7*lambda+14

lambda^2-7*lambda+14

Matrix(%id = 36893628834902374868)

A:= <<2|1>,<-3|-1>>;
CharacteristicPolynomial(A,lambda);
eval(%,lambda=A);

Matrix(2, 2, {(1, 1) = 2, (1, 2) = 1, (2, 1) = -3, (2, 2) = -1})

lambda^2-lambda+1

Matrix(%id = 36893628834902364276)

A := <<2|1|-1>,<0|1|0>,<-1|0|1>>;
CharacteristicPolynomial(A,lambda);
eval(%,lambda=A);

Matrix(3, 3, {(1, 1) = 2, (1, 2) = 1, (1, 3) = -1, (2, 1) = 0, (2, 2) = 1, (2, 3) = 0, (3, 1) = -1, (3, 2) = 0, (3, 3) = 1})

lambda^3-4*lambda^2+4*lambda-1

Matrix(%id = 36893628834902356084)

A := <<-2|1|-1>,<0|1|5>,<-1|5|2>>;
CharacteristicPolynomial(A,lambda);
eval(%,lambda=A);

Matrix(3, 3, {(1, 1) = -2, (1, 2) = 1, (1, 3) = -1, (2, 1) = 0, (2, 2) = 1, (2, 3) = 5, (3, 1) = -1, (3, 2) = 5, (3, 3) = 2})

lambda^3-lambda^2-30*lambda-40

Matrix(%id = 36893628834902348252)

Download cpoly.mw

(check for typos)

restart;

ps := PolyhedralSets:-PolyhedralSet([[1,1,0],[-1,1,0],[-1,-1,0],
                                     [-1/2,0,1],[1/2,-1/2,0]],[x,y,z]):

 

PolyhedralSets:-Volume(ps);

1

PolyhedralSets:-Plot(ps);

Relations(ps);

[-z <= 0, y+z <= 1, (1/2)*z-x <= 1, x+(5/2)*z-3*y <= 2, -(1/3)*y+(7/6)*z+x <= 2/3]

Download ps_volume.mw

It's not clear whether you want, say, one of the edges of the result to be along a common ray as one of the edges of the original.

It's also unclear whether you want to produce only the transformed result directly, or whether you want to produce both (transforming the original into the result).

For example, using an orientation so as to get a view down onto the triangles,

restart;

P := plot3d(v^3,u=0..1-v, v=0..1,
            orientation=[-90,0,0], style=surface);

plots:-display(
  plottools:-transform((x,y,z)->[x+y/2,y*sqrt(3)/2,z])(P),
  view=[0..1,0..1,0..1], labels=[u,v,""],
  orientation=[-90,0,0], style=surface);

 

Download 3d_tri_transf.mw

Of course you can still rotate those; they are 3d plots of surfaces.

What you've stated about reading in names containing such characters is not true. Code with assignments to such can be read in via .mpl files.

But you can run into difficulties when you try to refer to them in new input lines in the GUI. In a roundabout way you can access those assigned names, and their values, via anames(user).

However, what will usually happen is that if you copy&paste such a name into the GUI what will actually be input are more like the names,
   `&zeta;X1``&zeta;X2`

So, when you write, "...shows as unassigned" be careful that you're actually using/entering the name you intend to access. Having difficult entering the intended names does not mean that the names are unassigned.

Now, those specially formed ASCII names also happen to both pretty-print in output in the manner you've shown, in the GUI, with typeset Greek prefixes.

You can even enter those in the GUI without having to make all those extra keystrokes, by using the appropriate GUI palette for the Greek letter while in 2D Input mode.

So, one solution is to use the names like `&zeta;X1` for your plaintext .mpl files, instead of utf-8 unicode.

In other words, use the intended mechanisms that the GUI supports and is designed for.

In the following worksheet, I read in the code you showed from a plaintext file which I named "foo.mpl". This is just an illustration of the fact that the names you originally gave can indeed (contrary to your claim) be read in via .mpl text format and assigned to.

restart;

read "foo.mpl";

nms := anames(user);

`&zeta;X2`, `&zeta;X1`

nms;

(1/3)*Pi, 0

lprint(eval(nms,1));

`ζX2`, `ζX1`

`&zeta;X2`, `&zeta;X1`

`&zeta;X2`, `&zeta;X1`

eval(nms,1)[1];

`&zeta;X2`

These are not the same thing.

`&zeta;X2` - eval(nms,1)[1];

`&zeta;X2`-`&zeta;X2`

Download uni_nms.mw

Some earlier postings by you indicated that you might still be using Maple 2022.

The following works in Maple 2022.2 (and several earlier versions as well, including Maple 2018.2 and Maple 16.02).

expr := sin(theta)^(A - 2)*cos(theta)^2
        - sin(theta)^(A - 2) + sin(theta)^A:

 

simplify(expand(expr));

0

Download trig_simp_ex2.mw

In Maple 2023.0 your example is handled directly by the simplify command.

If it's of interest, one can observe why expanding wrt powers helps here. After the expand, the result can be factored, with one of the factors being zero by simple Pythagorean trig identity.

expr := sin(theta)^(A - 2)*cos(theta)^2
        - sin(theta)^(A - 2) + sin(theta)^A:

expand(expr);

sin(theta)^A*cos(theta)^2/sin(theta)^2-sin(theta)^A/sin(theta)^2+sin(theta)^A

factor(%);

sin(theta)^A*(sin(theta)^2+cos(theta)^2-1)/sin(theta)^2

You could make the following kinds of checks, using the is command.

restart;

is( -7.5 in RealRange(Open(-10),-5) )

true

is( -7.5 in RealRange(Open(-6),infinity) )

false

is( -7.5 in Or(RealRange(Open(-6),infinity),
               RealRange(Open(-10),-5)) );

true

is( A in Or(RealRange(Open(-6),infinity),
               RealRange(Open(-10),-5)) )
  assuming A>-9;

true

is( A in Or(RealRange(Open(-6),infinity),
               RealRange(Open(-10),-5)) )
  assuming A>-11;

false

coulditbe( A in Or(RealRange(Open(-6),infinity),
               RealRange(Open(-10),-5)) )
  assuming A>-11;

true

coulditbe( A in Or(RealRange(Open(-6),infinity),
               RealRange(Open(-10),-5)) )
  assuming A<-11;

false

Download RR_is.mw

You could also assign your disjunction (or other logical operator construction) to a name, and re-use it. Eg,

Dis := Or(RealRange(Open(-6),infinity),
          RealRange(Open(-10),-5)):

 

is( -7 in Dis );

true

is( A in Dis ) assuming A<-11;

false

is( A::Dis ) assuming A>-9;

true

 

It is unfortunate that Maple 2023.0 does not have cross-reference links from the Help page for topic RealRange to the Help pages with topics assume (is) and property.

First 45 46 47 48 49 50 51 Last Page 47 of 338