vim: update release.sh to vim 7.3
[msysgit/mtrensch.git] / share / vim / vim72 / syntax / maple.vim
blob37abf16fad62ae91bbdcba64ce0582a6c311bff4
1 " Vim syntax file
2 " Language:     Maple V (based on release 4)
3 " Maintainer:   Dr. Charles E. Campbell, Jr. <NdrOchipS@PcampbellAfamily.Mbiz>
4 " Last Change:  Sep 11, 2006
5 " Version:      9
6 " URL:  http://mysite.verizon.net/astronaut/vim/index.html#vimlinks_syntax
8 " Package Function Selection: {{{1
9 " Because there are a lot of packages, and because of the potential for namespace
10 " clashes, this version of <maple.vim> needs the user to select which, if any,
11 " package functions should be highlighted.  Select your packages and put into your
12 " <.vimrc> none or more of the lines following let ...=1 lines:
14 "   if exists("mvpkg_all")
15 "    ...
16 "   endif
18 " *OR* let mvpkg_all=1
20 " This syntax file contains all the keywords and top-level packages of Maple 9.5
21 " but only the contents of packages of Maple V Release 4, and the top-level
22 " routines of Release 4.  <Jacques Carette - carette@mcmaster.ca>
24 " For version 5.x: Clear all syntax items
25 " For version 6.x: Quit when a syntax file was already loaded
26 if version < 600
27   syntax clear
28 elseif exists("b:current_syntax")
29   finish
30 endif
32 " Iskeyword Effects: {{{1
33 if version < 600
34   set iskeyword=$,48-57,_,a-z,@-Z
35 else
36   setlocal iskeyword=$,48-57,_,a-z,@-Z
37 endif
39 " Package Selection: {{{1
40 " allow user to simply select all packages for highlighting
41 if exists("mvpkg_all")
42   let mv_DEtools    = 1
43   let mv_Galois     = 1
44   let mv_GaussInt   = 1
45   let mv_LREtools   = 1
46   let mv_combinat   = 1
47   let mv_combstruct = 1
48   let mv_difforms   = 1
49   let mv_finance    = 1
50   let mv_genfunc    = 1
51   let mv_geometry   = 1
52   let mv_grobner    = 1
53   let mv_group      = 1
54   let mv_inttrans   = 1
55   let mv_liesymm    = 1
56   let mv_linalg     = 1
57   let mv_logic      = 1
58   let mv_networks   = 1
59   let mv_numapprox  = 1
60   let mv_numtheory  = 1
61   let mv_orthopoly  = 1
62   let mv_padic      = 1
63   let mv_plots      = 1
64   let mv_plottools  = 1
65   let mv_powseries  = 1
66   let mv_process    = 1
67   let mv_simplex    = 1
68   let mv_stats      = 1
69   let mv_student    = 1
70   let mv_sumtools   = 1
71   let mv_tensor     = 1
72   let mv_totorder   = 1
73 endif
75 " Parenthesis/curly/brace sanity checker: {{{1
76 syn case match
78 " parenthesis/curly/brace sanity checker
79 syn region mvZone       matchgroup=Delimiter start="(" matchgroup=Delimiter end=")" transparent contains=ALLBUT,mvError,mvBraceError,mvCurlyError
80 syn region mvZone       matchgroup=Delimiter start="{" matchgroup=Delimiter end="}" transparent contains=ALLBUT,mvError,mvBraceError,mvParenError
81 syn region mvZone       matchgroup=Delimiter start="\[" matchgroup=Delimiter end="]" transparent contains=ALLBUT,mvError,mvCurlyError,mvParenError
82 syn match  mvError              "[)\]}]"
83 syn match  mvBraceError "[)}]"  contained
84 syn match  mvCurlyError "[)\]]" contained
85 syn match  mvParenError "[\]}]" contained
86 syn match  mvComma              "[,;:]"
87 syn match  mvSemiError  "[;:]"  contained
88 syn match  mvDcolon             "::"
90 " Maple Packages, updated for Maple 9.5
91 syn keyword mvPackage   algcurves       ArrayTools      Cache   codegen
92 syn keyword mvPackage   CodeGeneration  CodeTools       combinat        combstruct
93 syn keyword mvPackage   ContextMenu     CurveFitting    DEtools diffalg
94 syn keyword mvPackage   difforms        DiscreteTransforms      Domains ExternalCalling
95 syn keyword mvPackage   FileTools       finance GaussInt        genfunc
96 syn keyword mvPackage   geom3d  geometry        gfun    Groebner
97 syn keyword mvPackage   group   hashmset        IntegerRelations        inttrans
98 syn keyword mvPackage   LargeExpressions        LibraryTools    liesymm linalg
99 syn keyword mvPackage   LinearAlgebra   LinearFunctionalSystems LinearOperators
100 syn keyword mvPackage   ListTools       Logic   LREtools        Maplets
101 syn keyword mvPackage   MathematicalFunctions   MathML  Matlab
102 syn keyword mvPackage   MatrixPolynomialAlgebra MmaTranslator   networks
103 syn keyword mvPackage   numapprox       numtheory       Optimization    OreTools
104 syn keyword mvPackage   Ore_algebra     OrthogonalSeries        orthopoly       padic
105 syn keyword mvPackage   PDEtools        plots   plottools       PolynomialIdeals
106 syn keyword mvPackage   PolynomialTools powseries       process QDifferenceEquations
107 syn keyword mvPackage   RandomTools     RationalNormalForms     RealDomain      RootFinding
108 syn keyword mvPackage   ScientificConstants     ScientificErrorAnalysis simplex
109 syn keyword mvPackage   Slode   SNAP    Sockets SoftwareMetrics
110 syn keyword mvPackage   SolveTools      Spread  stats   StringTools
111 syn keyword mvPackage   Student student sumtools        SumTools
112 syn keyword mvPackage   tensor  TypeTools       Units   VariationalCalculus
113 syn keyword mvPackage   VectorCalculus  Worksheet       XMLTools
115 " Language Support: {{{1
116 syn keyword mvTodo      contained       COMBAK  FIXME   TODO    XXX
117 if exists("g:mapleversion") && g:mapleversion < 9
118  syn region  mvString   start=+`+ skip=+``+ end=+`+     keepend contains=mvTodo,@Spell
119  syn region  mvString   start=+"+ skip=+""+ end=+"+     keepend contains=@Spell
120  syn region  mvDelayEval        start=+'+ end=+'+       keepend contains=ALLBUT,mvError,mvBraceError,mvCurlyError,mvParenError,mvSemiError
121  syn match   mvVarAssign        "[a-zA-Z_][a-zA-Z_0-9]*[ \t]*:=" contains=mvAssign
122  syn match   mvAssign   ":="    contained
123 else
124  syn region  mvName             start=+`+ skip=+``+ end=+`+     keepend contains=mvTodo
125  syn region  mvString   start=+"+ skip=+""+ end=+"+     keepend contains=@Spell
126  syn region  mvDelayEval        start=+'+ end=+'+       keepend contains=ALLBUT,mvError,mvBraceError,mvCurlyError,mvParenError
127  syn match   mvDelim            "[;:]"  display
128  syn match   mvAssign   ":="
129 endif
131 " Lower-Priority Operators: {{{1
132 syn match mvOper        "\."
134 " Number handling: {{{1
135 syn match mvNumber      "\<\d\+"                " integer
136  syn match mvNumber     "[-+]\=\.\d\+"          " . integer
137 syn match mvNumber      "\<\d\+\.\d\+"          " integer . integer
138 syn match mvNumber      "\<\d\+\."              " integer .
139 syn match mvNumber      "\<\d\+\.\."    contains=mvRange        " integer ..
141 syn match mvNumber      "\<\d\+e[-+]\=\d\+"             " integer e [-+] integer
142 syn match mvNumber      "[-+]\=\.\d\+e[-+]\=\d\+"       " . integer e [-+] integer
143 syn match mvNumber      "\<\d\+\.\d*e[-+]\=\d\+"        " integer . [integer] e [-+] integer
145 syn match mvNumber      "[-+]\d\+"              " integer
146 syn match mvNumber      "[-+]\d\+\.\d\+"                " integer . integer
147 syn match mvNumber      "[-+]\d\+\."            " integer .
148 syn match mvNumber      "[-+]\d\+\.\."  contains=mvRange        " integer ..
150 syn match mvNumber      "[-+]\d\+e[-+]\=\d\+"   " integer e [-+] integer
151 syn match mvNumber      "[-+]\d\+\.\d*e[-+]\=\d\+"      " integer . [integer] e [-+] integer
153 syn match mvRange       "\.\."
155 " Operators: {{{1
156 syn keyword mvOper      and not or xor implies union intersect subset minus mod
157 syn match   mvOper      "<>\|[<>]=\|[<>]\|="
158 syn match   mvOper      "&+\|&-\|&\*\|&\/\|&"
159 syn match   mvError     "\.\.\."
161 " MapleV Statements: ? statement {{{1
163 " MapleV Statements: ? statement
164 " Split into booleans, conditionals, operators, repeat-logic, etc
165 syn keyword mvBool      true    false   FAIL
166 syn keyword mvCond      elif    else    fi      if      then
168 syn keyword mvRepeat    by      for     in      to
169 syn keyword mvRepeat    do      from    od      while
171 syn keyword mvSpecial   NULL
172 syn match   mvSpecial   "\[\]\|{}"
174 if exists("g:mapleversion") && g:mapleversion < 9
175  syn keyword mvStatement        Order   fail    options read    save
176  syn keyword mvStatement        break   local   point   remember        stop
177  syn keyword mvStatement        done    mod     proc    restart with
178  syn keyword mvStatement        end     mods    quit    return
179  syn keyword mvStatement        error   next
180 else
181  syn keyword mvStatement        option  options read    save
182  syn keyword mvStatement        break   local   remember        stop
183  syn keyword mvStatement        done    mod     proc    restart
184  syn keyword mvStatement        end     mods    quit    return
185  syn keyword mvStatement        error   next    try     catch
186  syn keyword mvStatement        finally assuming        global  export
187  syn keyword mvStatement        module  description     use
188 endif
190 " Builtin Constants: ? constants {{{1
191 syn keyword mvConstant  Catalan I       gamma   infinity
192 syn keyword mvConstant  Pi
194 " Comments:  DEBUG, if in a comment, is specially highlighted. {{{1
195 syn keyword mvDebug     contained       DEBUG
196 syn cluster mvCommentGroup      contains=mvTodo,mvDebug,@Spell
197 syn match mvComment "#.*$"      contains=@mvCommentGroup
199 " Basic Library Functions: ? index[function]
200 syn keyword mvLibrary $ @       @@      ERROR
201 syn keyword mvLibrary AFactor   KelvinHer       arctan  factor  log     rhs
202 syn keyword mvLibrary AFactors  KelvinKei       arctanh factors log10   root
203 syn keyword mvLibrary AiryAi    KelvinKer       argument        fclose  lprint  roots
204 syn keyword mvLibrary AiryBi    LambertW        array   feof    map     round
205 syn keyword mvLibrary AngerJ    Lcm     assign  fflush  map2    rsolve
206 syn keyword mvLibrary Berlekamp LegendreE       assigned        filepos match   savelib
207 syn keyword mvLibrary BesselI   LegendreEc      asspar  fixdiv  matrix  scanf
208 syn keyword mvLibrary BesselJ   LegendreEc1     assume  float   max     searchtext
209 syn keyword mvLibrary BesselK   LegendreF       asubs   floor   maximize        sec
210 syn keyword mvLibrary BesselY   LegendreKc      asympt  fnormal maxnorm sech
211 syn keyword mvLibrary Beta      LegendreKc1     attribute       fopen   maxorder        select
212 syn keyword mvLibrary C LegendrePi      bernstein       forget  member  seq
213 syn keyword mvLibrary Chi       LegendrePic     branches        fortran min     series
214 syn keyword mvLibrary Ci        LegendrePic1    bspline fprintf minimize        setattribute
215 syn keyword mvLibrary CompSeq   Li      cat     frac    minpoly shake
216 syn keyword mvLibrary Content   Linsolve        ceil    freeze  modp    showprofile
217 syn keyword mvLibrary D MOLS    chrem   fremove modp1   showtime
218 syn keyword mvLibrary DESol     Maple_floats    close   frontend        modp2   sign
219 syn keyword mvLibrary Det       MeijerG close   fscanf  modpol  signum
220 syn keyword mvLibrary Diff      Norm    coeff   fsolve  mods    simplify
221 syn keyword mvLibrary Dirac     Normal  coeffs  galois  msolve  sin
222 syn keyword mvLibrary DistDeg   Nullspace       coeftayl        gc      mtaylor singular
223 syn keyword mvLibrary Divide    Power   collect gcd     mul     sinh
224 syn keyword mvLibrary Ei        Powmod  combine gcdex   nextprime       sinterp
225 syn keyword mvLibrary Eigenvals Prem    commutat        genpoly nops    solve
226 syn keyword mvLibrary EllipticCE        Primfield       comparray       harmonic        norm    sort
227 syn keyword mvLibrary EllipticCK        Primitive       compoly has     normal  sparse
228 syn keyword mvLibrary EllipticCPi       Primpart        conjugate       hasfun  numboccur       spline
229 syn keyword mvLibrary EllipticE ProbSplit       content hasoption       numer   split
230 syn keyword mvLibrary EllipticF Product convergs        hastype op      splits
231 syn keyword mvLibrary EllipticK Psi     convert heap    open    sprem
232 syn keyword mvLibrary EllipticModulus   Quo     coords  history optimize        sprintf
233 syn keyword mvLibrary EllipticNome      RESol   copy    hypergeom       order   sqrfree
234 syn keyword mvLibrary EllipticPi        Randpoly        cos     iFFT    parse   sqrt
235 syn keyword mvLibrary Eval      Randprime       cosh    icontent        pclose  sscanf
236 syn keyword mvLibrary Expand    Ratrecon        cost    identity        pclose  ssystem
237 syn keyword mvLibrary FFT       Re      cot     igcd    pdesolve        stack
238 syn keyword mvLibrary Factor    Rem     coth    igcdex  piecewise       sturm
239 syn keyword mvLibrary Factors   Resultant       csc     ilcm    plot    sturmseq
240 syn keyword mvLibrary FresnelC  RootOf  csch    ilog    plot3d  subs
241 syn keyword mvLibrary FresnelS  Roots   csgn    ilog10  plotsetup       subsop
242 syn keyword mvLibrary Fresnelf  SPrem   dawson  implicitdiff    pochhammer      substring
243 syn keyword mvLibrary Fresnelg  Searchtext      define  indets  pointto sum
244 syn keyword mvLibrary Frobenius Shi     degree  index   poisson surd
245 syn keyword mvLibrary GAMMA     Si      denom   indexed polar   symmdiff
246 syn keyword mvLibrary GaussAGM  Smith   depends indices polylog symmetric
247 syn keyword mvLibrary Gaussejord        Sqrfree diagonal        inifcn  polynom system
248 syn keyword mvLibrary Gausselim Ssi     diff    ininame powmod  table
249 syn keyword mvLibrary Gcd       StruveH dilog   initialize      prem    tan
250 syn keyword mvLibrary Gcdex     StruveL dinterp insert  prevprime       tanh
251 syn keyword mvLibrary HankelH1  Sum     disassemble     int     primpart        testeq
252 syn keyword mvLibrary HankelH2  Svd     discont interface       print   testfloat
253 syn keyword mvLibrary Heaviside TEXT    discrim interp  printf  thaw
254 syn keyword mvLibrary Hermite   Trace   dismantle       invfunc procbody        thiele
255 syn keyword mvLibrary Im        WeberE  divide  invztrans       procmake        time
256 syn keyword mvLibrary Indep     WeierstrassP    dsolve  iostatus        product translate
257 syn keyword mvLibrary Interp    WeierstrassPPrime       eliminate       iperfpow        proot   traperror
258 syn keyword mvLibrary Inverse   WeierstrassSigma        ellipsoid       iquo    property        trigsubs
259 syn keyword mvLibrary Irreduc   WeierstrassZeta entries iratrecon       protect trunc
260 syn keyword mvLibrary Issimilar Zeta    eqn     irem    psqrt   type
261 syn keyword mvLibrary JacobiAM  abs     erf     iroot   quo     typematch
262 syn keyword mvLibrary JacobiCD  add     erfc    irreduc radnormal       unames
263 syn keyword mvLibrary JacobiCN  addcoords       eulermac        iscont  radsimp unapply
264 syn keyword mvLibrary JacobiCS  addressof       eval    isdifferentiable        rand    unassign
265 syn keyword mvLibrary JacobiDC  algebraic       evala   isolate randomize       unload
266 syn keyword mvLibrary JacobiDN  algsubs evalapply       ispoly  randpoly        unprotect
267 syn keyword mvLibrary JacobiDS  alias   evalb   isqrfree        range   updatesR4
268 syn keyword mvLibrary JacobiNC  allvalues       evalc   isqrt   rationalize     userinfo
269 syn keyword mvLibrary JacobiND  anames  evalf   issqr   ratrecon        value
270 syn keyword mvLibrary JacobiNS  antisymm        evalfint        latex   readbytes       vector
271 syn keyword mvLibrary JacobiSC  applyop evalgf  lattice readdata        verify
272 syn keyword mvLibrary JacobiSD  arccos  evalhf  lcm     readlib whattype
273 syn keyword mvLibrary JacobiSN  arccosh evalm   lcoeff  readline        with
274 syn keyword mvLibrary JacobiTheta1      arccot  evaln   leadterm        readstat        writebytes
275 syn keyword mvLibrary JacobiTheta2      arccoth evalr   length  realroot        writedata
276 syn keyword mvLibrary JacobiTheta3      arccsc  exp     lexorder        recipoly        writeline
277 syn keyword mvLibrary JacobiTheta4      arccsch expand  lhs     rem     writestat
278 syn keyword mvLibrary JacobiZeta        arcsec  expandoff       limit   remove  writeto
279 syn keyword mvLibrary KelvinBei arcsech expandon        ln      residue zip
280 syn keyword mvLibrary KelvinBer arcsin  extract lnGAMMA resultant       ztrans
281 syn keyword mvLibrary KelvinHei arcsinh
284 " ==  PACKAGES  ======================================================= {{{1
285 " Note: highlighting of package functions is now user-selectable by package.
287 " Package: DEtools     differential equations tools {{{2
288 if exists("mv_DEtools")
289   syn keyword mvPkg_DEtools     DEnormal        Dchangevar      autonomous      dfieldplot      reduceOrder     untranslate
290   syn keyword mvPkg_DEtools     DEplot  PDEchangecoords convertAlg      indicialeq      regularsp       varparam
291   syn keyword mvPkg_DEtools     DEplot3d        PDEplot convertsys      phaseportrait   translate
292 endif
294 " Package: Domains: create domains of computation {{{2
295 if exists("mv_Domains")
296 endif
298 " Package: GF: Galois Fields {{{2
299 if exists("mv_GF")
300   syn keyword mvPkg_Galois      galois
301 endif
303 " Package: GaussInt: Gaussian Integers {{{2
304 if exists("mv_GaussInt")
305   syn keyword mvPkg_GaussInt    GIbasis GIfactor        GIissqr GInorm  GIquadres       GIsmith
306   syn keyword mvPkg_GaussInt    GIchrem GIfactors       GIlcm   GInormal        GIquo   GIsqrfree
307   syn keyword mvPkg_GaussInt    GIdivisor       GIgcd   GImcmbine       GIorder GIrem   GIsqrt
308   syn keyword mvPkg_GaussInt    GIfacpoly       GIgcdex GInearest       GIphi   GIroots GIunitnormal
309   syn keyword mvPkg_GaussInt    GIfacset        GIhermite       GInodiv GIprime GIsieve
310 endif
312 " Package: LREtools: manipulate linear recurrence relations {{{2
313 if exists("mv_LREtools")
314   syn keyword mvPkg_LREtools    REcontent       REprimpart      REtodelta       delta   hypergeomsols   ratpolysols
315   syn keyword mvPkg_LREtools    REcreate        REreduceorder   REtoproc        dispersion      polysols        shift
316   syn keyword mvPkg_LREtools    REplot  REtoDE  constcoeffsol
317 endif
319 " Package: combinat: combinatorial functions {{{2
320 if exists("mv_combinat")
321   syn keyword mvPkg_combinat    Chi     composition     graycode        numbcomb        permute randperm
322   syn keyword mvPkg_combinat    bell    conjpart        inttovec        numbcomp        powerset        stirling1
323   syn keyword mvPkg_combinat    binomial        decodepart      lastpart        numbpart        prevpart        stirling2
324   syn keyword mvPkg_combinat    cartprod        encodepart      multinomial     numbperm        randcomb        subsets
325   syn keyword mvPkg_combinat    character       fibonacci       nextpart        partition       randpart        vectoint
326   syn keyword mvPkg_combinat    choose  firstpart
327 endif
329 " Package: combstruct: combinatorial structures {{{2
330 if exists("mv_combstruct")
331   syn keyword mvPkg_combstruct  allstructs      draw    iterstructs     options specification   structures
332   syn keyword mvPkg_combstruct  count   finished        nextstruct
333 endif
335 " Package: difforms: differential forms {{{2
336 if exists("mv_difforms")
337   syn keyword mvPkg_difforms    const   defform formpart        parity  scalarpart      wdegree
338   syn keyword mvPkg_difforms    d       form    mixpar  scalar  simpform        wedge
339 endif
341 " Package: finance: financial mathematics {{{2
342 if exists("mv_finance")
343   syn keyword mvPkg_finance     amortization    cashflows       futurevalue     growingperpetuity       mv_finance      presentvalue
344   syn keyword mvPkg_finance     annuity effectiverate   growingannuity  levelcoupon     perpetuity      yieldtomaturity
345   syn keyword mvPkg_finance     blackscholes
346 endif
348 " Package: genfunc: rational generating functions {{{2
349 if exists("mv_genfunc")
350   syn keyword mvPkg_genfunc     rgf_charseq     rgf_expand      rgf_hybrid      rgf_pfrac       rgf_sequence    rgf_term
351   syn keyword mvPkg_genfunc     rgf_encode      rgf_findrecur   rgf_norm        rgf_relate      rgf_simp        termscale
352 endif
354 " Package: geometry: Euclidean geometry {{{2
355 if exists("mv_geometry")
356   syn keyword mvPkg_geometry    circle  dsegment        hyperbola       parabola        segment triangle
357   syn keyword mvPkg_geometry    conic   ellipse line    point   square
358 endif
360 " Package: grobner: Grobner bases {{{2
361 if exists("mv_grobner")
362   syn keyword mvPkg_grobner     finduni gbasis  leadmon normalf solvable        spoly
363   syn keyword mvPkg_grobner     finite  gsolve
364 endif
366 " Package: group: permutation and finitely-presented groups {{{2
367 if exists("mv_group")
368   syn keyword mvPkg_group       DerivedS        areconjugate    cosets  grouporder      issubgroup      permrep
369   syn keyword mvPkg_group       LCS     center  cosrep  inter   mulperms        pres
370   syn keyword mvPkg_group       NormalClosure   centralizer     derived invperm normalizer      subgrel
371   syn keyword mvPkg_group       RandElement     convert grelgroup       isabelian       orbit   type
372   syn keyword mvPkg_group       Sylow   core    groupmember     isnormal        permgroup
373 endif
375 " Package: inttrans: integral transforms {{{2
376 if exists("mv_inttrans")
377   syn keyword mvPkg_inttrans    addtable        fouriercos      hankel  invfourier      invlaplace      mellin
378   syn keyword mvPkg_inttrans    fourier fouriersin      hilbert invhilbert      laplace
379 endif
381 " Package: liesymm: Lie symmetries {{{2
382 if exists("mv_liesymm")
383   syn keyword mvPkg_liesymm     &^      TD      depvars getform mixpar  vfix
384   syn keyword mvPkg_liesymm     &mod    annul   determine       hasclosure      prolong wcollect
385   syn keyword mvPkg_liesymm     Eta     autosimp        dvalue  hook    reduce  wdegree
386   syn keyword mvPkg_liesymm     Lie     close   extvars indepvars       setup   wedgeset
387   syn keyword mvPkg_liesymm     Lrank   d       getcoeff        makeforms       translate       wsubs
388 endif
390 " Package: linalg: Linear algebra {{{2
391 if exists("mv_linalg")
392   syn keyword mvPkg_linalg      GramSchmidt     coldim  equal   indexfunc       mulcol  singval
393   syn keyword mvPkg_linalg      JordanBlock     colspace        exponential     innerprod       multiply        smith
394   syn keyword mvPkg_linalg      LUdecomp        colspan extend  intbasis        norm    stack
395   syn keyword mvPkg_linalg      QRdecomp        companion       ffgausselim     inverse normalize       submatrix
396   syn keyword mvPkg_linalg      addcol  cond    fibonacci       ismith  orthog  subvector
397   syn keyword mvPkg_linalg      addrow  copyinto        forwardsub      issimilar       permanent       sumbasis
398   syn keyword mvPkg_linalg      adjoint crossprod       frobenius       iszero  pivot   swapcol
399   syn keyword mvPkg_linalg      angle   curl    gausselim       jacobian        potential       swaprow
400   syn keyword mvPkg_linalg      augment definite        gaussjord       jordan  randmatrix      sylvester
401   syn keyword mvPkg_linalg      backsub delcols geneqns kernel  randvector      toeplitz
402   syn keyword mvPkg_linalg      band    delrows genmatrix       laplacian       rank    trace
403   syn keyword mvPkg_linalg      basis   det     grad    leastsqrs       references      transpose
404   syn keyword mvPkg_linalg      bezout  diag    hadamard        linsolve        row     vandermonde
405   syn keyword mvPkg_linalg      blockmatrix     diverge hermite matadd  rowdim  vecpotent
406   syn keyword mvPkg_linalg      charmat dotprod hessian matrix  rowspace        vectdim
407   syn keyword mvPkg_linalg      charpoly        eigenval        hilbert minor   rowspan vector
408   syn keyword mvPkg_linalg      cholesky        eigenvect       htranspose      minpoly scalarmul       wronskian
409   syn keyword mvPkg_linalg      col     entermatrix     ihermite
410 endif
412 " Package: logic: Boolean logic {{{2
413 if exists("mv_logic")
414   syn keyword mvPkg_logic       MOD2    bsimp   distrib environ randbool        tautology
415   syn keyword mvPkg_logic       bequal  canon   dual    frominert       satisfy toinert
416 endif
418 " Package: networks: graph networks {{{2
419 if exists("mv_networks")
420   syn keyword mvPkg_networks    acycpoly        connect dinic   graph   mincut  show
421   syn keyword mvPkg_networks    addedge connectivity    djspantree      graphical       mindegree       shrink
422   syn keyword mvPkg_networks    addvertex       contract        dodecahedron    gsimp   neighbors       span
423   syn keyword mvPkg_networks    adjacency       countcuts       draw    gunion  new     spanpoly
424   syn keyword mvPkg_networks    allpairs        counttrees      duplicate       head    octahedron      spantree
425   syn keyword mvPkg_networks    ancestor        cube    edges   icosahedron     outdegree       tail
426   syn keyword mvPkg_networks    arrivals        cycle   ends    incidence       path    tetrahedron
427   syn keyword mvPkg_networks    bicomponents    cyclebase       eweight incident        petersen        tuttepoly
428   syn keyword mvPkg_networks    charpoly        daughter        flow    indegree        random  vdegree
429   syn keyword mvPkg_networks    chrompoly       degreeseq       flowpoly        induce  rank    vertices
430   syn keyword mvPkg_networks    complement      delete  fundcyc isplanar        rankpoly        void
431   syn keyword mvPkg_networks    complete        departures      getlabel        maxdegree       shortpathtree   vweight
432   syn keyword mvPkg_networks    components      diameter        girth
433 endif
435 " Package: numapprox: numerical approximation {{{2
436 if exists("mv_numapprox")
437   syn keyword mvPkg_numapprox   chebdeg chebsort        fnorm   laurent minimax remez
438   syn keyword mvPkg_numapprox   chebmult        chebyshev       hornerform      laurent pade    taylor
439   syn keyword mvPkg_numapprox   chebpade        confracform     infnorm minimax
440 endif
442 " Package: numtheory: number theory {{{2
443 if exists("mv_numtheory")
444   syn keyword mvPkg_numtheory   B       cyclotomic      invcfrac        mcombine        nthconver       primroot
445   syn keyword mvPkg_numtheory   F       divisors        invphi  mersenne        nthdenom        quadres
446   syn keyword mvPkg_numtheory   GIgcd   euler   isolve  minkowski       nthnumer        rootsunity
447   syn keyword mvPkg_numtheory   J       factorEQ        isprime mipolys nthpow  safeprime
448   syn keyword mvPkg_numtheory   L       factorset       issqrfree       mlog    order   sigma
449   syn keyword mvPkg_numtheory   M       fermat  ithprime        mobius  pdexpand        sq2factor
450   syn keyword mvPkg_numtheory   bernoulli       ifactor jacobi  mroot   phi     sum2sqr
451   syn keyword mvPkg_numtheory   bigomega        ifactors        kronecker       msqrt   pprimroot       tau
452   syn keyword mvPkg_numtheory   cfrac   imagunit        lambda  nearestp        prevprime       thue
453   syn keyword mvPkg_numtheory   cfracpol        index   legendre        nextprime
454 endif
456 " Package: orthopoly: orthogonal polynomials {{{2
457 if exists("mv_orthopoly")
458   syn keyword mvPkg_orthopoly   G       H       L       P       T       U
459 endif
461 " Package: padic: p-adic numbers {{{2
462 if exists("mv_padic")
463   syn keyword mvPkg_padic       evalp   function        orderp  ratvaluep       rootp   valuep
464   syn keyword mvPkg_padic       expansion       lcoeffp ordp
465 endif
467 " Package: plots: graphics package {{{2
468 if exists("mv_plots")
469   syn keyword mvPkg_plots       animate coordplot3d     gradplot3d      listplot3d      polarplot       setoptions3d
470   syn keyword mvPkg_plots       animate3d       cylinderplot    implicitplot    loglogplot      polygonplot     spacecurve
471   syn keyword mvPkg_plots       changecoords    densityplot     implicitplot3d  logplot polygonplot3d   sparsematrixplot
472   syn keyword mvPkg_plots       complexplot     display inequal matrixplot      polyhedraplot   sphereplot
473   syn keyword mvPkg_plots       complexplot3d   display3d       listcontplot    odeplot replot  surfdata
474   syn keyword mvPkg_plots       conformal       fieldplot       listcontplot3d  pareto  rootlocus       textplot
475   syn keyword mvPkg_plots       contourplot     fieldplot3d     listdensityplot pointplot       semilogplot     textplot3d
476   syn keyword mvPkg_plots       contourplot3d   gradplot        listplot        pointplot3d     setoptions      tubeplot
477   syn keyword mvPkg_plots       coordplot
478 endif
480 " Package: plottools: basic graphical objects {{{2
481 if exists("mv_plottools")
482   syn keyword mvPkg_plottools   arc     curve   dodecahedron    hyperbola       pieslice        semitorus
483   syn keyword mvPkg_plottools   arrow   cutin   ellipse icosahedron     point   sphere
484   syn keyword mvPkg_plottools   circle  cutout  ellipticArc     line    polygon tetrahedron
485   syn keyword mvPkg_plottools   cone    cylinder        hemisphere      octahedron      rectangle       torus
486   syn keyword mvPkg_plottools   cuboid  disk    hexahedron
487 endif
489 " Package: powseries: formal power series {{{2
490 if exists("mv_powseries")
491   syn keyword mvPkg_powseries   compose multiply        powcreate       powlog  powsolve        reversion
492   syn keyword mvPkg_powseries   evalpow negative        powdiff powpoly powsqrt subtract
493   syn keyword mvPkg_powseries   inverse powadd  powexp  powseries       quotient        tpsform
494   syn keyword mvPkg_powseries   multconst       powcos  powint  powsin
495 endif
497 " Package: process: (Unix)-multi-processing {{{2
498 if exists("mv_process")
499   syn keyword mvPkg_process     block   fork    pclose  pipe    popen   wait
500   syn keyword mvPkg_process     exec    kill
501 endif
503 " Package: simplex: linear optimization {{{2
504 if exists("mv_simplex")
505   syn keyword mvPkg_simplex     NONNEGATIVE     cterm   dual    maximize        pivoteqn        setup
506   syn keyword mvPkg_simplex     basis   define_zero     equality        minimize        pivotvar        standardize
507   syn keyword mvPkg_simplex     convexhull      display feasible        pivot   ratio
508 endif
510 " Package: stats: statistics {{{2
511 if exists("mv_stats")
512   syn keyword mvPkg_stats       anova   describe        fit     random  statevalf       statplots
513 endif
515 " Package: student: student calculus {{{2
516 if exists("mv_student")
517   syn keyword mvPkg_student     D       Product distance        isolate middlesum       rightsum
518   syn keyword mvPkg_student     Diff    Sum     equate  leftbox midpoint        showtangent
519   syn keyword mvPkg_student     Doubleint       Tripleint       extrema leftsum minimize        simpson
520   syn keyword mvPkg_student     Int     changevar       integrand       makeproc        minimize        slope
521   syn keyword mvPkg_student     Limit   combine intercept       maximize        powsubs trapezoid
522   syn keyword mvPkg_student     Lineint completesquare  intparts        middlebox       rightbox        value
523   syn keyword mvPkg_student     Point
524 endif
526 " Package: sumtools: indefinite and definite sums {{{2
527 if exists("mv_sumtools")
528   syn keyword mvPkg_sumtools    Hypersum        extended_gosper hyperrecursion  hyperterm       sumrecursion    sumtohyper
529   syn keyword mvPkg_sumtools    Sumtohyper      gosper  hypersum        simpcomb
530 endif
532 " Package: tensor: tensor computations and General Relativity {{{2
533 if exists("mv_tensor")
534   syn keyword mvPkg_tensor      Christoffel1    Riemann connexF display_allGR   get_compts      partial_diff
535   syn keyword mvPkg_tensor      Christoffel2    RiemannF        contract        dual    get_rank        permute_indices
536   syn keyword mvPkg_tensor      Einstein        Weyl    convertNP       entermetric     invars  petrov
537   syn keyword mvPkg_tensor      Jacobian        act     cov_diff        exterior_diff   invert  prod
538   syn keyword mvPkg_tensor      Killing_eqns    antisymmetrize  create  exterior_prod   lin_com raise
539   syn keyword mvPkg_tensor      Levi_Civita     change_basis    d1metric        frame   lower   symmetrize
540   syn keyword mvPkg_tensor      Lie_diff        commutator      d2metric        geodesic_eqns   npcurve tensorsGR
541   syn keyword mvPkg_tensor      Ricci   compare directional_diff        get_char        npspin  transform
542   syn keyword mvPkg_tensor      Ricciscalar     conj    displayGR
543 endif
545 " Package: totorder: total orders on names {{{2
546 if exists("mv_totorder")
547   syn keyword mvPkg_totorder    forget  init    ordering        tassume tis
548 endif
549 " =====================================================================
551 " Highlighting: Define the default highlighting. {{{1
552 " For version 5.7 and earlier: only when not done already
553 " For version 5.8 and later: only when an item doesn't have highlighting yet
554 if version >= 508 || !exists("did_maplev_syntax_inits")
555   if version < 508
556     let did_maplev_syntax_inits = 1
557     command -nargs=+ HiLink hi link <args>
558   else
559     command -nargs=+ HiLink hi def link <args>
560   endif
562   " Maple->Maple Links {{{2
563   HiLink mvBraceError   mvError
564   HiLink mvCurlyError   mvError
565   HiLink mvDebug                mvTodo
566   HiLink mvParenError   mvError
567   HiLink mvPkg_DEtools  mvPkgFunc
568   HiLink mvPkg_Galois   mvPkgFunc
569   HiLink mvPkg_GaussInt mvPkgFunc
570   HiLink mvPkg_LREtools mvPkgFunc
571   HiLink mvPkg_combinat mvPkgFunc
572   HiLink mvPkg_combstruct       mvPkgFunc
573   HiLink mvPkg_difforms mvPkgFunc
574   HiLink mvPkg_finance  mvPkgFunc
575   HiLink mvPkg_genfunc  mvPkgFunc
576   HiLink mvPkg_geometry mvPkgFunc
577   HiLink mvPkg_grobner  mvPkgFunc
578   HiLink mvPkg_group    mvPkgFunc
579   HiLink mvPkg_inttrans mvPkgFunc
580   HiLink mvPkg_liesymm  mvPkgFunc
581   HiLink mvPkg_linalg   mvPkgFunc
582   HiLink mvPkg_logic    mvPkgFunc
583   HiLink mvPkg_networks mvPkgFunc
584   HiLink mvPkg_numapprox        mvPkgFunc
585   HiLink mvPkg_numtheory        mvPkgFunc
586   HiLink mvPkg_orthopoly        mvPkgFunc
587   HiLink mvPkg_padic    mvPkgFunc
588   HiLink mvPkg_plots    mvPkgFunc
589   HiLink mvPkg_plottools        mvPkgFunc
590   HiLink mvPkg_powseries        mvPkgFunc
591   HiLink mvPkg_process  mvPkgFunc
592   HiLink mvPkg_simplex  mvPkgFunc
593   HiLink mvPkg_stats    mvPkgFunc
594   HiLink mvPkg_student  mvPkgFunc
595   HiLink mvPkg_sumtools mvPkgFunc
596   HiLink mvPkg_tensor   mvPkgFunc
597   HiLink mvPkg_totorder mvPkgFunc
598   HiLink mvRange                mvOper
599   HiLink mvSemiError    mvError
600   HiLink mvDelim                Delimiter
602   " Maple->Standard Links {{{2
603   HiLink mvAssign               Delimiter
604   HiLink mvBool         Boolean
605   HiLink mvComma                Delimiter
606   HiLink mvComment              Comment
607   HiLink mvCond         Conditional
608   HiLink mvConstant             Number
609   HiLink mvDelayEval    Label
610   HiLink mvDcolon               Delimiter
611   HiLink mvError                Error
612   HiLink mvLibrary              Statement
613   HiLink mvNumber               Number
614   HiLink mvOper         Operator
615   HiLink mvAssign               Delimiter
616   HiLink mvPackage              Type
617   HiLink mvPkgFunc              Function
618   HiLink mvPktOption    Special
619   HiLink mvRepeat               Repeat
620   HiLink mvSpecial              Special
621   HiLink mvStatement    Statement
622   HiLink mvName         String
623   HiLink mvString               String
624   HiLink mvTodo         Todo
626   delcommand HiLink
627 endif
629 " Current Syntax: {{{1
630 let b:current_syntax = "maple"
631 " vim: ts=20 fdm=marker