Applications, Examples and Libraries

Share your work here

      Method for solving underdetermined systems of nonlinear equations. The idea of the method is to find a connected subset of a set of solutions of the system by moving along this subset from one point in different directions. The direction of movement can be changed in each point.

      Very simple example of  single equation with three variables:

                                   (x1 ^ 4 + x2 ^ 4 - 2) ^ 2 + x3 ^ 4 - 1 = 0;

      From the point (0, -1.31607, 0) or (0, 1., 0) or any point if it is a solution, we first move for a variety of solutions along a curve parallel to the axis Ox3, and then from each point of this curve is moving in a direction parallel to x1Ox2 or vice versa. So we get all the solutions.
      This works for any space of any number of the equations when the number of equations is less than the number of variables.
underdetermined_system.mw

 

 

 

The procedure  Partition  significantly generalizes the standard procedure  combinat[partition]  in several ways. The user specifies the number of parts of the partition, and can also set different limitations on parts partition.

Required parameters:  n - a nonnegative integer, - a positive integer or a range (k  specifies the number of parts of the partition). The parameter  res  is the optional parameter (by default  res is  ). If  res  is a number, all elements of  k-tuples must be greater than or equal  res .  If  res  is a range  a .. b ,   all elements of  k-tuples must be greater than or equal  a  and  less than or equal  b . The optional parameter  S  - set, which includes elements of the partition. By default  S = {$ 0.. n} .

The code of the procedure:

Partition:=proc(n::nonnegint, k::{posint,range}, res::{range, nonnegint} := 1, S::set:={$0..n})  # Generates a list of all partitions of an integer n into k parts

local k_Partition, n1, k1, L;

 

k_Partition := proc (n, k::posint, res, S)

local m, M, a, b, S1, It, L0;

m:=S[1]; M:=S[-1];

if res::nonnegint then a := max(res,m); b := min(n-(k-1)*a,M)  else a := max(lhs(res),m); b := min(rhs(res),M) fi;

S1:={$a..b} intersect S;

if b < a or b*k < n or a*k > n  then return [ ] fi;

It := proc (L)

local m, j, P, R, i, N;

m := nops(L[1]); j := k-m; N := 0;

for i to nops(L) do

R := n-`+`(op(L[i]));

if R <= b*j and a*j <= R then N := N+1;

P[N] := [seq([op(L[i]), s], s = {$ max(a, R-b*(j-1)) .. min(R, b)} intersect select(t->t>=L[i,-1],S1) )] fi;

od;

[seq(op(P[s]), s = 1 .. N)];

end proc;

if k=1 then [[b]] else (It@@(k-1))(map(t->[t],S1))  fi;

end proc;

 

if k::posint then return k_Partition(n,k,res,S) else n1:=0;

for k1 from lhs(k) to rhs(k) do

n1:=n1+1; L[n1]:=k_Partition(n,k1,res,S)

od;

L:=convert(L,list);

[seq(op(L[i]), i=1..n1)] fi;

 

end proc:

 

Examples of use:

Partition(15, 3);

 

 

Partition(15, 3..5, 1..5);  # The number of parts from 3 to 5, and each summand from 1 to 5

 

 

Partition(15, 5, {seq(2*n-1, n=1..8)});  # 5 summands and all are odd numbers 

 

 

A more interesting example.
There are  k banknotes in possible denominations of 5, 10, 20, 50, 100 dollars. At what number of banknotes  k  the number of variants of exchange  $140  will be maximum?

n:=0:

for k from 3 to 28 do

n:=n+1: V[n]:=[k, nops(Partition(140, k, {5,10,20,50,100}))];

od:

V:=convert(V, list);

max(seq(V[i,2], i=1..nops(V)));

select(t->t[2]=8, V);

 

Here are these variants:

Partition(140, 10, {5,10,20,50,100});

Partition(140, 13, {5,10,20,50,100});

 

 Partition.mws

 

 

 

A heart shape in 3d:

 

 

The code of the animation:

A := plots[animate](plot3d, [[16*sin(t)^3*cos(s), 16*sin(t)^3*sin(s), 13*cos(t)-5*cos(2*t)-2*cos(3*t)-cos(4*t)], t = 0 .. u, s = 0 .. 2*Pi, color = red, style = surface, axes = none], u = 0 .. Pi, frames = 100):

B := plots[animate](plot3d, [[16*sin(t)^3*cos(s), 16*sin(t)^3*sin(s), 13*cos(t)-5*cos(2*t)-2*cos(3*t)-cos(4*t)], t = u .. Pi, s = 0 .. 2*Pi, color = "LightBlue", style = surface, axes = none], u = 0 .. Pi, frames = 100):

plots[display](A, B);

 

Edited. The direction of painting changed.

 

 

This post aims at summarizing the developments of the last 12 months of the Physics package, which were focused on: Vector Analysis, symbolic Tensor manipulations, Quantum Mechanics, and General Relativity including a new Tetrads subpackage. Besides that, there is a new command, Assume with valuable new features, and a new computing modality: automaticsimplification, as well as an enlargement of the database of solutions to Einstein's equations with more than 100 new metrics. As is always the case, there is still a lot more to do, of course. But It has been an year of tremendous developments, worth recapping.

I would also like to acknowledge and specially thank Pascal Szriftgiser, Directeur de recherche CNRS from the "Laboratoire de Physique des Lasers Atomes et Molécules" (Lille, France), and Denitsa Staicova from the Bulgarian Academy of Science, "Institute for Nuclear Research and Nuclear Energy", for their constant, constructive and valuable feedback along the year, respectively in the areas of Quantum Mechanics and General Relativity. Thanks also to all of you who reported bugs and emailed suggestions as physics@maplesoft.com; this kind of feedback is a pillar of the development of this Physics project.

As usual, the latest version of the package including the developments mentioned below can be downloaded from the Maple Physics: Research and Development web site. Some examples illustrating the use of the new capabilities in the context of more general problems are found in the 2014 MaplePrimes post Computer Algebra for Theoretical Physics. (At the end of this post there are two links: a pdf file with all the sections open, and this worksheet itself for whoever wants to play around).

Simplification

 

Simplification is perhaps the most common operation performed in a computer algebra system. In Physics, this typically entails simplifying tensorial expressions, or expressions involving noncommutative operators that satisfy certain commutator/anticommutator rules, or sums and integrals involving quantum operators and Dirac delta functions in the summands and integrands. Relevant enhancements were introduced for all these cases, including enhancements in the simplification of:

• 

Products of LeviCivita  tensors in curved spacetimes when LeviCivita represents the Galilean pseudo-tensor (related to Setup(levicivita = Galilean) ), instead of its generalization to curved spaces (related to Setup(levicivita = nongalilean) ).

• 

Tensorial expressions in general that have spacetime, space, and/or tetrad contracted indices, possibly at the same time.

• 

New option tryhard, that resolves zero recognition in an important number of nontrivial situations.

• 

Expressions involving the Dirac function.

• 

Vectorial expressions involving cylindrical or spherical coordinates and related unit vectors.

• 

Expressions simplified with respect to side relations (equations) in the presence of quantum vectorial equations.

• 

Expressions involving products of quantum operators entering parameterized algebra rules.

• 

Expressions involving vectorial quantum operators simplified with respect to other vectorial equations.

• 

Add support for the simplification and integration of spherical harmonics ( SphericalY ) relevant in quantum mechanics.

Examples

   

 

Tensors

 

A number of relevant changes happened in the tensor routines of the Physics package, towards making the routines pack more functionality, the simplification more powerful, and the handling of symmetries, substitutions, and other operations more flexible and natural.

• 

Physics now works with four kinds of Minkowski spaces (different signatures) to accommodate the typical situations seen in textbooks; to these, correspond the signatures +---, ---+, -+++ and +++-.

• 

Allow setting the metric by specifying the signature directly, as in g_[`-`] or g_[`+---`], or Setup(metric = `---+`) or Setup(g[mu, nu] = `---+`).

• 

The signature keyword of the Physics Setup  is now in use, to set the metric and to indicate the form of the orthonormal tetrad, in turn used to derive the form of a null tetrad.

• 

Automatic detection of the position of t as the time variable when you set the coordinates automatically sets the signature of the default Minkowski spacetime metric accordingly to ---+ or +---.

• 

New keywords with special meaning when indexing the Physics (also the user defined) tensors:
· `~`; for example g_[`~`] returns the all-contravariant matrix form of the metric.
· definition; for example Ricci[definition] returns the definition of the Ricci tensor; works also with user-defined tensors.
· scalars; for example Weyl[scalars] and Ricci[scalars] return the five Weyl and seven Ricci scalars used to perform a Petrof classification and in the Newman-Penrose formalism.
· scalarsdefinition, and invariantsdefinition; for example Weyl[scalarsdefinition] or Riemann[invariantsdefinition] return the corresponding definitions for the scalars and invariants.
· nullvectors; for example, when the new Tetrads  subpackage is loaded, e_[nullvectors] returns a sequence of null vectors with their products normalized according to the Newman-Penrose formalism.
· matrix; this keyword was introduced in previous releases, and now it can appear after a space index (not spacetime), in which case a matrix with only the space components is returned.

• 

Tensorial expressions can now have spacetime indices (related to a global system of references) and tetrad indices (related to a local system of references) at the same time, or they be rewritten in one (spacetime) or the other (tetrad) frames.

• 

The matrix keyword can be used with spacetime, space, or tetrad indices, resulting in the corresponding matrix

• 

Implement automatic determination of symmetry under permutation of tensor indices when the tensor is defined as a matrix.

• 

New conversions from the Weyl to the Ricci tensors, and from Weyl to the Christoffel symbols.

• 

New option evaluatetrace = true or false within convert/Ricci, to avoid automatically evaluating the Ricci trace when performing conversions that involve this trace.

• 

New option 'evaluate' to convert/g_, convert/Christoffel and convert/Ricci. With this option set to false, it is possible to see the algebraic form of the result (that is, of the tensors involved) before evaluating it.

• 

The Maple 18 Library:-SubstituteTensor  command, got enhanced and transformed into one of the main Physics commands, that substitutes tensorial equation(s) Eqs into an expression, taking care of the free and repeated indices, such that: 1) equations in Eqs are interpreted as mappings having the free indices as parameters, 2) repeated indices in Eqs do not clash with repeated indices in the expression and 3) spacetime, space, and tetrad indices are handled independently, so they can all be present in Eqs and in the expression at the same time. This new command can also substitute algebraic sub-expressions of type product or sum within the expression, generalizing and unifying the functionality of the subs and algsubs  commands for algebraic tensor expressions.

Examples

   

 

Tetrads in General Relativity

 

The formalism of tetrads in general relativity got implemented within Physics  as a new package, Physics:-Tetrads , with 13 commands, mainly the null vectors of the Newman-Penrose formalism, the tetrad tensors `&efr;`[a, mu], eta[a, b], gamma[a, b, c], lambda[a, b, c], respectively: the tetrad, the tetrad metric, the Ricci rotation coefficients, and the lambda tensor, plus five algebraic manipulation commands: IsTetrad , NullTetrad , OrthonormalTetrad , SimplifyTetrad , and TransformTetrad  to construct orthonormal and null tetrads of different forms and using different methods.

Examples

   

 

More Metrics in the Database of Solutions to Einstein's Equations

 

A database of solutions to Einstein's equations  was added to the Maple library in Maple 15 with a selection of metrics from "Stephani, H.; Kramer, D.; MacCallum, M.; Hoenselaers, C.; and Herlt, E.,  Exact Solutions to Einstein's Field Equations" and "Hawking, Stephen; and Ellis, G. F. R., The Large Scale Structure of Space-Time". More metrics from these two books were added for Maple 16, Maple 17, and Maple 18. These metrics can be searched using g_  (the Physics command representing the spacetime metric that also sets the metric to your choice in one go) or using the command DifferentialGeometry:-Library:-MetricSearch .

• 

New, one hundred and four more metrics were added to the database from various Chapters of the aforementioned book entitled "Exact Solutions to Einstein's Field Equations". Among new metrics for other chapters, with this addition, the solutions found in the literature and collected in Chapters 13 and 14 of this book are all present as well in database of solutions to Einstein's equations.

• 

It is now possible to manipulate algebraically the properties of these metrics, for example, computing tetrads and null vectors for them - using the 13 commands of new Physics:-Tetrads package.

Examples

   

 

Commutators, AntiCommutators, and Dirac notation in quantum mechanics

 

When computing with products of noncommutative operators, the results depend on the algebra of commutators and anticommutators that you previously set. Besides that, in Physics, various mathematical objects themselves satisfy specific commutation rules. You can query about these rules using the Library  commands Commute  and AntiCommute . Previously existing functionality and enhancements in this area were refined. These include:

• 

Computing Commutators and Anticommutators between equations, or of an expression with an equation.

• 

Library:-Commute(A, F(A)) = true whenever A is a quantum operator and F is a commutative mapping (see Cohen-Tannoudji, Quantum Mechanics, page 171).

• 

Differentiating with respect to a noncommutative variable whenever all the variables present in the derivand commute with the differentiation variable.

• 

Automatic computation of F(X).Ket(X, x) = F(x)*Ket(X, x), that is the automatic computation of a function of an operator applied to its eigenkets (see Cohen-Tannoudji, Quantum Mechanics, page 171).

• 

Parameterized commutators; for example: when setting the rule Commutator(A, exp(lambda*B)) = lambda*C, take lambda as a parameter, so Commutator(A, exp(alpha*B)) now returns alpha*C, not "lambda C."

• 

Automatic derivation of a commutator rule: Commutator(A, F(B)) = F '(B) when Commutator(A, C) = Commutator(B, C) = 0 and C = Commutator(A, B), as shown in (see Cohen-Tannoudji, Quantum Mechanics, page 171).

• 

 "f(A) | A[a] >=f(a) | A[a] >", including cases like for instance "f(alpha A) | A[a] >=f(alpha a) | A[a] >", or "(e)^((&ImaginaryI; f(t) A)/`&hbar;`) | A[a] >=(e)^((&ImaginaryI; f(t) a)/`&hbar;`) | A[a] >".

• 

New mechanism to have more than one algebra rule related to the same function (for example, a function of two arguments that come in different order).

• 

The dot product of the inverse of an operator, Inverse(A) · Ket, now returns the same as 1/A · Ket.

• 

F(H) is Hermitian if H is Hermitian and F is assumed to be real, via Assume, assuming, or Setup(realobjects = F).

• 

Implement that F(H) is Hermitian if H is Hermitian and F is a mathematical real function, that is, one that maps real objects into real objects; in this change only exp, the trigonometric functions and their inert forms are included.

• 

Add a few previously missing Unitary and Hermitian operator cases:

  

a) if \035U and V are unitary, the U V is also unitary.

  

b) if A is Hermitian then exp(i*A) is unitary.

  

c) if U is unitary and A is Hermitian, then U*A*`#msup(mi("U"),mo("&dagger;"))` is also Hermitian.

• 

Make the type definition for ExtendedQuantumOperator more precise to include as such any arbitrary function of an ExtendedQuantumOperator.

Examples

   

 

New Assume command and new enhanced Mode: automaticsimplification

 

One new enhanced mode was added to the Physics setup, automaticsimplification, and a new Physics:-Assume  command make expressions be automatically expressed in simpler forms and allow for very flexible ways of implementing assumptions, making the Physics environment concretely more expressive.

Assume

 

In almost any mathematical formulation in Physics, there are objects that are real, positive, or just angles that have a restricted range; for example: Planck's constant, time, the mass and position of particles, and so on. When placing assumptions using the assume  command, however, expressions entered before placing the assumptions and those entered with the assumptions cannot be reused in case the the assumptions are removed. Also, when using assume variables get redefined so that geometrical coordinates (spacetime, Cartesian, cylindrical, and spherical) loss their identity. These issues got addressed with a new Assume  command, that does not redefine the variables, implementing the concept of an "extended  assuming ", allowing for reusing expressions entered before placing assumptions and also after removing them. Assume also includes the functionality of the additionally  command.

Examples

   

Automatic simplification

 

This new Physics mode of computation means that, after you enter Setup(automaticsimplification = true), the output corresponding to every single input (not just related to Physics) gets automatically simplified in size before being returned to the screen. This is fantastically convenient for interactive work in most situations.

Examples

   

 

Vectors Package

 

A number of changes were performed in the Vectors  subpackage to make the computations more natural and versatile:

• 

Enhancement in the algebraic manipulations of inert vectorial differential operators.

• 

Improvements in the manipulation of of scalar products of vector or scalar functions (to the left) with vectorial differential operators (to the right), that result in vectorial or scalar differential operators.

• 

Several improvements in the use of trigonometric simplifications when changing the basis or the coordinates in vectorial expressions.

• 

Add new functionality mapping Vectors:-Component over equations, automatically changing basis if the two sides are not projected over the same base.

• 

Implement the expansion of the square of a vectorial expression as the scalar (dot) product of the expression with itself, including the case of a vectorial quantum operator expression.

• 

Allow multiplying equations also when the product operator is in scalar and vector products (Vectors:-`.` and Vectors:-`&x`).

• 

ChangeBasis : allow changing coordinates between sets of orthogonal coordinates also when the expression is not vectorial.

• 

New command: ChangeCoordinates , to rewrite an algebraic expression, using Cartesian, cylindrical, and spherical coordinates, an expression that involves these coordinates, either a scalar expression, or vectorial one but then not changing the orthonormal basis.

Examples

   

 

The Physics Library

 

Twenty-six new commands, useful for programming and interactive computation, have been added to the Physics:-Library  package. These are:

• 

ClearCaches

• 

ExpandProductsInExpression

• 

FlipCharacterOfFreeIndices

• 

FromMinkowskiKindToSignature

• 

FromSignatureToMinkowskiKind

• 

FromTetradToTetradMetric

• 

GetByMatchingPattern

• 

GetTypeOfTensorIndices

• 

GetVectorRootName

• 

HasOriginalTypeOfIndices

• 

IsEuclideanSignature

• 

IsGalileanSignature

• 

IsMinkowskiSignature

• 

IsValidSignature

• 

IsEuclideanMetric

• 

IsGalileanMetric

• 

IsMinkowskiMetric

• 

IsOrthonormalTetradMetric

• 

IsNullTetradMetric 

• 

IsNullTetrad

• 

IsOrthonormalTetrad

• 

IsTensorFunctionalForm

• 

RepositionRepeatedIndicesAsIn

• 

RestoreRepeatedIndices

• 

RewriteTypeOfIndices

• 

SplitIndicesByType

 

Additionally, several improvements in the previously existing Physics:-Library  commands have been implemented:

• 

Add the types spacetimeindex, spaceindex, spinorindex, gaugeindex, and tetradindex to the exports of the Library:-PhysicsType  package.

• 

Library:-ToCovariant  and Library:-ToContravariant  when the spacetime is curved and some 'tensors' involved are not actually a tensor in a curved space.

• 

Add new options changefreeindices and flipcharacterofindices to the Library:-ToCovariant  and Library:-ToContravariant  commands, to actually lower and raise the free indices as necessary, instead of the default behavior of returning an expression that is mathematically equivalent to the given one.

• 

Extend the Library commands GetCommutativeSymbol , GetAntiCommutativeSymbol , and GetNonCommutativeSymbol  to return vectorial symbols when Vectors  is loaded and a vectorial symbol is requested.

• 

Add functionality to the Library command GetSymbolsWithSameType  so that when the input is a list of objects, it returns a list with new symbols of the corresponding types, automatically taking into account the vectorial (Y/N) kind of the symbols.

Examples

   

 

Miscellaneous

 
• 

Add several fields to the Physics:-Setup() applet in order to allow for manipulating all the Physics settings from within the applet.

• 

New Physics:-Setup  options: automaticsimplification and normusesconjugate.

• 

When any of Physics  or Physics:-Vectors  are loaded, dtheta, dphi, etc. are now displayed as `d&theta;`, `d&phi;`, etc. 

• 

Implement, within the `*` operator, both the global  and the Physics one , the product of equations as the product of left-hand sides equal the product of right-hand sides, eliminating the frequently tedious typing "lhs(eq[1])*lhs(eq[2]) = rhs(eq[1])*rhs(eq[2])". You can now just enter "eq[1]*eq[2]".

• 

Automatically distribute dot products over lists, as in A.[a, b, c] = [A.a, A.b, A.c].

• 

Allow (A = B) - C also when A, B, and C are Matrices.

• 

Add convert(`...`, setofequations) and convert(`...`, listofequations) to convert Physics:-Vectors, Matrices of equations, etc. into sets or lists of equations.

• 

Annihilation  and Creation  operators are now displayed as in textbooks using `#msup(mi("a"),mo("&uminus0;"))` and `#msup(mi("a"),mo("&plus;"))`.

• 

It is now possible to use equation labels to copy and paste expressions involving Annihilation and Creation operators.

• 

Implement the ability in Fundiff  to compute functional derivatives by passing only a function name as second argument. This works okay when the derivand contains this function with only one dependency (perhaps with many variables), say X, permitting varying a function quite like that done using paper and pencil.

• 

The determination of symmetries and antisymmetries of tensorial expressions got enhanced.

• 

The metric g[mu, nu] as well as the tetrad `&efr;`[a, mu] and tetrad metric eta[mu, nu] can now be (re)defined using the standard Physics:-Define  command for defining tensors. Also, the definition can now be given directly in terms of a tensorial expression.

• 

Add keyword option attemptzerorecognition in TensorArray , so that each component of the array is tested for 0.

• 

Allow to sum over a list of objects, or over `in` structures like '`in`(j, [a, b, c])' when redefining sum, and also in Physics:-Library:-Add .

• 

Harmonize the use of simplify/siderels  with Physics, so that anticommutative and noncommutative objects, whether they are vectorial or not, are respected as such and not transformed into commutative objects when the simplification is performed.

• 

Changes in design:

a. 

The output of KillingVectors  has now the format of a vector solution by default, that is, a 4-D vector on the left-hand side and a list with its components on the right-hand side and as such can be repassed to the Define  command for posterior use as a tensor. To recover the old format of a set of equation solutions for each vector component, a new optional argument, output = componentsolutions, got implemented.

b. 

Vectors:-Norm  now returns the Euclidean real norm by default, that is: Norm(`#mover(mi("v"),mo("&rarr;"))`) = `#mover(mi("v"),mo("&rarr;"))`.`#mover(mi("v"),mo("&rarr;"))`, and only return using conjugate, as in Norm(`#mover(mi("v"),mo("&rarr;"))`) = `#mover(mi("v"),mo("&rarr;"))`.conjugate(`#mover(mi("v"),mo("&rarr;"))`), when the option conjugate is passed, or the setting normusesconjugate is set using Physics:-Setup .

c. 

The output of FeynmanDiagrams  now discards, by default, all terms that include tadpoles. Also, an option, includetadpoles, to have these terms included as in previous releases, got implemented.

d. 

When Physics is loaded, 0^m does not return 0, in view that, in Maple, 0^0 returns 1.

e. 

The dot product A.B of quantum operators A and B now returns as a (noncommutative) product A B when neither A nor B involve Bras  or Kets .

f. 

If A is a quantum operator and Vectors  is loaded, then `#mover(mi("A",mathcolor = "olive"),mo("&rarr;"))` is also a quantum operator; likewise, if Z is a noncommutative prefix and Vectors is loaded then `#mover(mi("Z",mathcolor = "olive"),mo("&rarr;"))`is also a noncommutative object.

g. 

When Vectors  is loaded, the Hermitian and Unitary properties of operators set using the Setup  command are now propagated to "the name under the arrow" and vice versa, so that if A is a Hermitian Operator, or Unitary, then `#mover(mi("A",mathcolor = "olive"),mo("&rarr;"))` is too.

h. 

The SpaceTimeVector  can now have dependency other than a coordinate system.

i. 

It is now possible to enter `&PartialD;`[mu](A[mu]*B[mu])even when the index is repeated twice, considering that mu in A[mu]*B[mu] = A.B is actually a dummy, so that a collision with mu in `&PartialD;`[mu] can be programmatically avoided.

j. 

Diminish the use of KroneckerDelta  as a tensor, using the metric g_ instead in the output of Physics commands, reserving KroneckerDelta to be used as the standard corresponding symbol in quantum mechanics, so not as a tensor.

Examples

   

 

See Also

 

Physics , Computer Algebra for Theoretical Physics, The Physics project


OneYearOfPhysics.mw

OneYearOfPhysics.pdf

Edgardo S. Cheb-Terrab
Physics, Differential Equations and Mathematical Functions, Maplesoft

    Intersection of surfaces:

x3-.25*(sin(4*x1)+sin(3*x2+x3)+sin(2*x2))=0;  (1)

(x1-xx1)^4+(x2-xx2)^4+(x3-xx3)^4-1=0;          (2)   

   Surface (1) and a set of surfaces (2). Point (xx1, xx2, xx3) belongs to (1). Moving along the surface (1), we compute its intersection with the surface (2).
   The program is very simple and its algorithm can be used for many other combinations of equations.

intersection_of_surfaces.mw  

There seems to be a bug in the CodeGeneration package for Python which leads to a deletion of braces in some cases.

# E.g.

CodeGeneration[Python](Pi*(a+2));

# leads to

cg5 = math.pi * a + 2

which is obviously wrong.

Hey Everyone:

I was wondering what are your favorite and most useful code snippets that you often use. Maybe ones that are in your initialization code? Maybe ones that speed up something that you often do in maple? Maybe ones that you've seen on this and other websites and adopted for your own purposes?

For fun, I attach my init.mpl (.txt here, as .mpl attachments are not allowed by mapleprimes) here init.txt


Some of the snippets that I use the most are also listed below:

#rearrange curves inside an already created plot, so that certain curves are "on top" of the other ones.
#discussed here:
#http://www.mapleprimes.com/questions/201626-Order-Of-Curves-In-A-Plot
rearrangeCurves:= proc(
     v_items::specfunc(anything, PLOT),
     v_reorder::list([integer,integer]):= []
)
local p, curves, rest;
     (curves,rest):= selectremove(type, v_items, specfunc(anything, CURVES));
     curves:= < op(curves) >:         
     for p in v_reorder do
          curves[p]:= curves[p[[2,1]]]
     end do;
     PLOT(convert(curves,list)[], op(rest))
end proc:


#for numerical differentiation
#based on the idea from:
#http://www.mapleprimes.com/posts/119554-Data-Interpolation
#example use:
#alist:=[seq(i, i=0..10, 0.1)]:
#data:=map(x->evalf(sin(x)), alist):
#plot(alist, data);
#plot([cos(x), 'num_diff(x, LinearAlgebra:-Transpose(Matrix([alist,data])))'], x=1..10, thickness=5, linestyle=[solid, dot], color=[blue, red]);
num_diff:=proc(x, v_data, v_options:=[method=spline, degree=3])
 #v_data is a matrix
 #TODO: let the data be in a more arbitrary format that ArrayInterpolation understands, but keep x as first var
 evalf(D[1](x->CurveFitting:-ArrayInterpolation(v_data, [x],v_options[])[])(x));
end:

#extract nth columns/rows from a matrix
#these only work if have a 2d object... should be updated to also work
#with 1d row/column vectors
#Example use cases
#A := LinearAlgebra:-RandomMatrix(20, 20, outputoptions = [datatype = float[8]]);
#nthColumns(A, 2); #Every other column
#nthRows(A, 10)[.., 1..3]; #Every 10th row, but show only first 3 columns
nthColumns:=proc(v_m, v_n)
  v_m[..,[seq(i, i=1..rtable_size(v_m)[2], v_n)]]
end:
nthRows:=proc(v_m, v_n)
  v_m[[seq(i, i=1..rtable_size(v_m)[1], v_n)],..]
end:


#saves a png plot
savePlot:=proc(v_p, v_fileName, v_w:="800", v_h:="500")
    plotsetup("png", plotoutput=v_fileName, plotoptions=cat("quality=100,portrait,noborder,width=",v_w,",height=",v_h));
    print(plots[display](v_p));
    Threads[Sleep](2):
    fclose(v_fileName):
    plotsetup(default);
end:

 

The well-known  combinat[composition]  command computes and returns a list containing all distinct ordered  k-tuples of positive integers whose elements sum equals  . These are known as the compositions of  n .  For some applications, additional constraints are required for the elements of these k-tuples, for example, that they are within a certain range.

The  Composition  procedure solves this problem. Required parameters:  n - a nonnegative integer, - a positive integer. The parameter  res  is the optional parameter (by default  res is  ). If  res  is a number, all elements of  k-tuples must be greater than or equal  res .  If  res  is a range  a .. b ,   all elements of  k-tuples must be greater than or equal  a  and  less than or equal  b .  Composition(n,k,1)  is equivalent to  combinat[composition](n,k) .

 

The code of the procedure:

Composition := proc (n::nonnegint, k::posint, res::{range, nonnegint} := 0)

local a, b, It, L0; 

if res::nonnegint then a := res; b := n-(k-1)*a  else a := lhs(res); b := rhs(res) fi;

if b < a or b*k < n then return `No solutions` fi; 

It := proc (L)

local m, j, P, R, i, N;

m := nops(L[1]); j := k-m; N := 0;

for i to nops(L) do

R := n-`+`(op(L[i]));

if R <= b*j and a*j <= R then N := N+1;

P[N] := [seq([op(L[i]), s], s = max(a, R-b*(j-1)) .. min(R, b))] fi;

od;

[seq(op(P[s]), s = 1 .. N)];

end proc;

L0 := [[]];

(It@@k)(L0); 

end proc:

 

Three simple examples:

Composition(10,3); ``;   # All terms greater than or equal 0

Composition(10,3, 2);   # All terms greater than or equal 2

Composition(10,3, 2..4);   # All terms greater than or equal 2 and less than or equal to 4 

 

 

A more complex example. The problem - to find all the numbers in the range  1 .. 99999999  whose digits sum is equal to 21 .

Each number is represented by a list of digits from left to right, replacing missing digits at the left with zeros.

M:=Composition(21,8, 0..9):  

nops(M);  # The number of solutions

[seq(M[1+100000*i], i=0..9)]; # 10 solutions from the list M starting the first one

seq(add(%[i,k]*10^(8-k), k=1..8),i=1..nops(%));  # Conversion into numbers

 

Composition.mws

Greetings to all.

I am writing to alert MaplePrimes users to a Maple package that makes an remarkable contribution to combinatorics and really ought to be part of your discrete math / symbolic combinatorics class if you teach one. The combstruct package was developed at INRIA in Paris, France, by the algorithmics research team of P. Flajolet during the mid 1990s. This software package features a parser for grammars involving combinatorial operators such as sequence, set or multiset and it can derive functional equations from the grammar as well as exponential and ordinary generating functions for labeled and unlabeled enumeration. Coefficients of these generating functions can be computed. All of it easy to use and very powerful. If you are doing research on some type of combinatorial structure definitely check with combstruct first.

My purpose in this message is to advise you of the existence of this package and encourage you to use it in your teaching and research. With this in mind I present five applications of the combstruct package. These are very basic efforts that admit improvement that can perhaps serve as an incentive to deploy combstruct nonetheless. Here they are:

I hope you enjoy reading these and perhaps you might want to feature combstruct as well, which presented the first complete implementation in a computer algebra system of the symbolic method, sometimes called the folklore theorem of combinatorial enumeration, when it initially appeared.

Best regards,

Marko Riedel.

We are happy to announce the first results of a partnership between Maplesoft and the University of Waterloo to provide effective, engaging online education for technical courses.

Combining rich course materials developed by the University with Maple T.A. and Maplesoft technology for developing, managing, and displaying dynamic content, the Secondary School Courseware project supports high school students and teachers from around the world in their Precalculus and Calculus courses. The site includes interactive investigations, videos, and self-assessment questions that provide immediate feedback.

Feel free to take a look. The site is free, and no login is required.  

For more information about the project, see Online Mathematical Courseware.

eithne

D_Method.mw

The classical Draghilev’s method.  Example of solving the system of two transcendental equations. For a single the initial approximation are searched 9 approximate solutions of the system.
(4*(x1^2+x2-11))*x1+2*x1+2*x2^2-14+cos(x1)=0;
2*x1^2+2*x2-22+(4*(x1+x2^2-7))*x2-sin(x2)=0; 
x01 := -1.; x02 := 1.;


Equation: ((x1+.25)^2+(x2-.2)^2-1)^2+(x3-.1)^2-.999=0;



a_cam_3D.mw


Cam mechanism animation.   Equation:  (xx2-1.24)^10+5*(xx1-.66)^10-9.=0
a_cam.mw



Transformation and
rotation.

transformation.mw


First 40 41 42 43 44 45 46 Last Page 42 of 71