close Warning: Can't synchronize with repository "(default)" (The repository directory has changed, you should resynchronize the repository with: trac-admin $ENV repository resync '(default)'). Look in the Trac log for more information.

source: branches/f4grobner/grobner.lisp@ 42

Last change on this file since 42 was 42, checked in by Marek Rychlik, 9 years ago

* empty log message *

File size: 80.2 KB
Line 
1;;; -*- Mode: Lisp; Package: Maxima; Syntax: Common-Lisp; Base: 10 -*-
2;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
3;;;
4;;; Copyright (C) 1999, 2002, 2009 Marek Rychlik <rychlik@u.arizona.edu>
5;;;
6;;; This program is free software; you can redistribute it and/or modify
7;;; it under the terms of the GNU General Public License as published by
8;;; the Free Software Foundation; either version 2 of the License, or
9;;; (at your option) any later version.
10;;;
11;;; This program is distributed in the hope that it will be useful,
12;;; but WITHOUT ANY WARRANTY; without even the implied warranty of
13;;; MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
14;;; GNU General Public License for more details.
15;;;
16;;; You should have received a copy of the GNU General Public License
17;;; along with this program; if not, write to the Free Software
18;;; Foundation, Inc., 59 Temple Place - Suite 330, Boston, MA 02111-1307, USA.
19;;;
20;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
21
22(in-package :maxima)
23
24(macsyma-module cgb-maxima)
25
26(eval-when
27 #+gcl (load eval)
28 #-gcl (:load-toplevel :execute)
29 (format t "~&Loading maxima-grobner ~a ~a~%"
30 "$Revision: 1.1 $" "$Date: 2008/09/08 21:40:10 $"))
31
32;;FUNCTS is loaded because it contains the definition of LCM
33($load "functs")
34
35;; Macros for making lists with iterators - an exammple of GENSYM
36;; MAKELIST-1 makes a list with one iterator, while MAKELIST accepts an
37;; arbitrary number of iterators
38
39;; Sample usage:
40;; Without a step:
41;; >(makelist-1 (* 2 i) i 0 10)
42;; (0 2 4 6 8 10 12 14 16 18 20)
43;; With a step of 3:
44;; >(makelist-1 (* 2 i) i 0 10 3)
45;; (0 6 12 18)
46
47;; Generate sums of squares of numbers between 1 and 4:
48;; >(makelist (+ (* i i) (* j j)) (i 1 4) (j 1 i))
49;; (2 5 8 10 13 18 17 20 25 32)
50;; >(makelist (list i j '---> (+ (* i i) (* j j))) (i 1 4) (j 1 i))
51;; ((1 1 ---> 2) (2 1 ---> 5) (2 2 ---> 8) (3 1 ---> 10) (3 2 ---> 13)
52;; (3 3 ---> 18) (4 1 ---> 17) (4 2 ---> 20) (4 3 ---> 25) (4 4 ---> 32))
53
54;; Evaluate expression expr with variable set to lo, lo+1,... ,hi
55;; and put the results in a list.
56(defmacro makelist-1 (expr var lo hi &optional (step 1))
57 (let ((l (gensym)))
58 `(do ((,var ,lo (+ ,var ,step))
59 (,l nil (cons ,expr ,l)))
60 ((> ,var ,hi) (reverse ,l))
61 (declare (fixnum ,var)))))
62
63(defmacro makelist (expr (var lo hi &optional (step 1)) &rest more)
64 (if (endp more)
65 `(makelist-1 ,expr ,var ,lo ,hi ,step)
66 (let* ((l (gensym)))
67 `(do ((,var ,lo (+ ,var ,step))
68 (,l nil (nconc ,l `,(makelist ,expr ,@more))))
69 ((> ,var ,hi) ,l)
70 (declare (fixnum ,var))))))
71
72;;----------------------------------------------------------------
73;; This package implements BASIC OPERATIONS ON MONOMIALS
74;;----------------------------------------------------------------
75;; DATA STRUCTURES: Monomials are represented as lists:
76;;
77;; monom: (n1 n2 ... nk) where ni are non-negative integers
78;;
79;; However, lists may be implemented as other sequence types,
80;; so the flexibility to change the representation should be
81;; maintained in the code to use general operations on sequences
82;; whenever possible. The optimization for the actual representation
83;; should be left to declarations and the compiler.
84;;----------------------------------------------------------------
85;; EXAMPLES: Suppose that variables are x and y. Then
86;;
87;; Monom x*y^2 ---> (1 2)
88;;
89;;----------------------------------------------------------------
90
91(deftype exponent ()
92 "Type of exponent in a monomial."
93 'fixnum)
94
95(deftype monom (&optional dim)
96 "Type of monomial."
97 `(simple-array exponent (,dim)))
98
99;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
100;;
101;; Construction of monomials
102;;
103;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
104
105(defmacro make-monom (dim &key (initial-contents nil initial-contents-supplied-p)
106 (initial-element 0 initial-element-supplied-p))
107 "Make a monomial with DIM variables. Additional argument
108INITIAL-CONTENTS specifies the list of powers of the consecutive
109variables. The alternative additional argument INITIAL-ELEMENT
110specifies the common power for all variables."
111 ;;(declare (fixnum dim))
112 `(make-array ,dim
113 :element-type 'exponent
114 ,@(when initial-contents-supplied-p `(:initial-contents ,initial-contents))
115 ,@(when initial-element-supplied-p `(:initial-element ,initial-element))))
116
117
118
119;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
120;;
121;; Operations on monomials
122;;
123;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
124
125(defmacro monom-elt (m index)
126 "Return the power in the monomial M of variable number INDEX."
127 `(elt ,m ,index))
128
129(defun monom-dimension (m)
130 "Return the number of variables in the monomial M."
131 (length m))
132
133(defun monom-total-degree (m &optional (start 0) (end (length m)))
134 "Return the todal degree of a monomoal M. Optinally, a range
135of variables may be specified with arguments START and END."
136 (declare (type monom m) (fixnum start end))
137 (reduce #'+ m :start start :end end))
138
139(defun monom-sugar (m &aux (start 0) (end (length m)))
140 "Return the sugar of a monomial M. Optinally, a range
141of variables may be specified with arguments START and END."
142 (declare (type monom m) (fixnum start end))
143 (monom-total-degree m start end))
144
145(defun monom-div (m1 m2 &aux (result (copy-seq m1)))
146 "Divide monomial M1 by monomial M2."
147 (declare (type monom m1 m2 result))
148 (map-into result #'- m1 m2))
149
150(defun monom-mul (m1 m2 &aux (result (copy-seq m1)))
151 "Multiply monomial M1 by monomial M2."
152 (declare (type monom m1 m2 result))
153 (map-into result #'+ m1 m2))
154
155(defun monom-divides-p (m1 m2)
156 "Returns T if monomial M1 divides monomial M2, NIL otherwise."
157 (declare (type monom m1 m2))
158 (every #'<= m1 m2))
159
160(defun monom-divides-monom-lcm-p (m1 m2 m3)
161 "Returns T if monomial M1 divides MONOM-LCM(M2,M3), NIL otherwise."
162 (declare (type monom m1 m2 m3))
163 (every #'(lambda (x y z) (declare (type exponent x y z)) (<= x (max y z))) m1 m2 m3))
164
165(defun monom-lcm-divides-monom-lcm-p (m1 m2 m3 m4)
166 "Returns T if monomial MONOM-LCM(M1,M2) divides MONOM-LCM(M3,M4), NIL otherwise."
167 (declare (type monom m1 m2 m3 m4))
168 (every #'(lambda (x y z w) (declare (type exponent x y z w)) (<= (max x y) (max z w))) m1 m2 m3 m4))
169
170(defun monom-lcm-equal-monom-lcm-p (m1 m2 m3 m4)
171 "Returns T if monomial MONOM-LCM(M1,M2) equals MONOM-LCM(M3,M4), NIL otherwise."
172 (declare (type monom m1 m2 m3 m4))
173 (every #'(lambda (x y z w) (declare (type exponent x y z w)) (= (max x y) (max z w))) m1 m2 m3 m4))
174
175(defun monom-divisible-by-p (m1 m2)
176 "Returns T if monomial M1 is divisible by monomial M2, NIL otherwise."
177 (declare (type monom m1 m2))
178 (every #'>= m1 m2))
179
180(defun monom-rel-prime-p (m1 m2)
181 "Returns T if two monomials M1 and M2 are relatively prime (disjoint)."
182 (declare (type monom m1 m2))
183 (every #'(lambda (x y) (declare (type exponent x y)) (zerop (min x y))) m1 m2))
184
185(defun monom-equal-p (m1 m2)
186 "Returns T if two monomials M1 and M2 are equal."
187 (declare (type monom m1 m2))
188 (every #'= m1 m2))
189
190(defun monom-lcm (m1 m2 &aux (result (copy-seq m1)))
191 "Returns least common multiple of monomials M1 and M2."
192 (declare (type monom m1 m2))
193 (map-into result #'max m1 m2))
194
195(defun monom-gcd (m1 m2 &aux (result (copy-seq m1)))
196 "Returns greatest common divisor of monomials M1 and M2."
197 (declare (type monom m1 m2))
198 (map-into result #'min m1 m2))
199
200(defun monom-depends-p (m k)
201 "Return T if the monomial M depends on variable number K."
202 (declare (type monom m) (fixnum k))
203 (plusp (elt m k)))
204
205(defmacro monom-map (fun m &rest ml &aux (result `(copy-seq ,m)))
206 `(map-into ,result ,fun ,m ,@ml))
207
208(defmacro monom-append (m1 m2)
209 `(concatenate 'monom ,m1 ,m2))
210
211(defmacro monom-contract (k m)
212 `(subseq ,m ,k))
213
214(defun monom-exponents (m)
215 (declare (type monom m))
216 (coerce m 'list))
217
218
219
220;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
221;;
222;; Implementations of various admissible monomial orders
223;;
224;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
225
226;; pure lexicographic
227(defun lex> (p q &optional (start 0) (end (monom-dimension p)))
228 "Return T if P>Q with respect to lexicographic order, otherwise NIL.
229The second returned value is T if P=Q, otherwise it is NIL."
230 (declare (type monom p q) (type fixnum start end))
231 (do ((i start (1+ i)))
232 ((>= i end) (values nil t))
233 (declare (type fixnum i))
234 (cond
235 ((> (monom-elt p i) (monom-elt q i))
236 (return-from lex> (values t nil)))
237 ((< (monom-elt p i) (monom-elt q i))
238 (return-from lex> (values nil nil))))))
239
240;; total degree order , ties broken by lexicographic
241(defun grlex> (p q &optional (start 0) (end (monom-dimension p)))
242 "Return T if P>Q with respect to graded lexicographic order, otherwise NIL.
243The second returned value is T if P=Q, otherwise it is NIL."
244 (declare (type monom p q) (type fixnum start end))
245 (let ((d1 (monom-total-degree p start end))
246 (d2 (monom-total-degree q start end)))
247 (cond
248 ((> d1 d2) (values t nil))
249 ((< d1 d2) (values nil nil))
250 (t
251 (lex> p q start end)))))
252
253
254;; total degree, ties broken by reverse lexicographic
255(defun grevlex> (p q &optional (start 0) (end (monom-dimension p)))
256 "Return T if P>Q with respect to graded reverse lexicographic order,
257NIL otherwise. The second returned value is T if P=Q, otherwise it is NIL."
258 (declare (type monom p q) (type fixnum start end))
259 (let ((d1 (monom-total-degree p start end))
260 (d2 (monom-total-degree q start end)))
261 (cond
262 ((> d1 d2) (values t nil))
263 ((< d1 d2) (values nil nil))
264 (t
265 (revlex> p q start end)))))
266
267
268;; reverse lexicographic
269(defun revlex> (p q &optional (start 0) (end (monom-dimension p)))
270 "Return T if P>Q with respect to reverse lexicographic order, NIL
271otherwise. The second returned value is T if P=Q, otherwise it is
272NIL. This is not and admissible monomial order because some sets do
273not have a minimal element. This order is useful in constructing other
274orders."
275 (declare (type monom p q) (type fixnum start end))
276 (do ((i (1- end) (1- i)))
277 ((< i start) (values nil t))
278 (declare (type fixnum i))
279 (cond
280 ((< (monom-elt p i) (monom-elt q i))
281 (return-from revlex> (values t nil)))
282 ((> (monom-elt p i) (monom-elt q i))
283 (return-from revlex> (values nil nil))))))
284
285
286(defun invlex> (p q &optional (start 0) (end (monom-dimension p)))
287 "Return T if P>Q with respect to inverse lexicographic order, NIL otherwise
288The second returned value is T if P=Q, otherwise it is NIL."
289 (declare (type monom p q) (type fixnum start end))
290 (do ((i (1- end) (1- i)))
291 ((< i start) (values nil t))
292 (declare (type fixnum i))
293 (cond
294 ((> (monom-elt p i) (monom-elt q i))
295 (return-from invlex> (values t nil)))
296 ((< (monom-elt p i) (monom-elt q i))
297 (return-from invlex> (values nil nil))))))
298
299
300
301;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
302;;
303;; Order making functions
304;;
305;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
306
307(defvar *monomial-order* #'lex>
308 "Default order for monomial comparisons")
309
310(defmacro monomial-order (x y)
311 `(funcall *monomial-order* ,x ,y))
312
313(defun reverse-monomial-order (x y)
314 (monomial-order y x))
315
316(defvar *primary-elimination-order* #'lex>)
317
318(defvar *secondary-elimination-order* #'lex>)
319
320(defvar *elimination-order* nil
321 "Default elimination order used in elimination-based functions.
322If not NIL, it is assumed to be a proper elimination order. If NIL,
323we will construct an elimination order using the values of
324*PRIMARY-ELIMINATION-ORDER* and *SECONDARY-ELIMINATION-ORDER*.")
325
326(defun elimination-order (k)
327 "Return a predicate which compares monomials according to the
328K-th elimination order. Two variables *PRIMARY-ELIMINATION-ORDER*
329and *SECONDARY-ELIMINATION-ORDER* control the behavior on the first K
330and the remaining variables, respectively."
331 (declare (type fixnum k))
332 #'(lambda (p q &optional (start 0) (end (monom-dimension p)))
333 (declare (type monom p q) (type fixnum start end))
334 (multiple-value-bind (primary equal)
335 (funcall *primary-elimination-order* p q start k)
336 (if equal
337 (funcall *secondary-elimination-order* p q k end)
338 (values primary nil)))))
339
340(defun elimination-order-1 (p q &optional (start 0) (end (monom-dimension p)))
341 "Equivalent to the function returned by the call to (ELIMINATION-ORDER 1)."
342 (declare (type monom p q) (type fixnum start end))
343 (cond
344 ((> (monom-elt p start) (monom-elt q start)) (values t nil))
345 ((< (monom-elt p start) (monom-elt q start)) (values nil nil))
346 (t (funcall *secondary-elimination-order* p q (1+ start) end))))
347
348
349
350;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
351;;
352;; Priority queue stuff
353;;
354;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
355
356(defparameter *priority-queue-allocation-size* 16)
357
358(defun priority-queue-make-heap (&key (element-type 'fixnum))
359 (make-array *priority-queue-allocation-size* :element-type element-type :fill-pointer 1
360 :adjustable t))
361
362(defstruct (priority-queue (:constructor priority-queue-construct))
363 (heap (priority-queue-make-heap))
364 test)
365
366(defun make-priority-queue (&key (element-type 'fixnum)
367 (test #'<=)
368 (element-key #'identity))
369 (priority-queue-construct
370 :heap (priority-queue-make-heap :element-type element-type)
371 :test #'(lambda (x y) (funcall test (funcall element-key y) (funcall element-key x)))))
372
373(defun priority-queue-insert (pq item)
374 (priority-queue-heap-insert (priority-queue-heap pq) item (priority-queue-test pq)))
375
376(defun priority-queue-remove (pq)
377 (priority-queue-heap-remove (priority-queue-heap pq) (priority-queue-test pq)))
378
379(defun priority-queue-empty-p (pq)
380 (priority-queue-heap-empty-p (priority-queue-heap pq)))
381
382(defun priority-queue-size (pq)
383 (fill-pointer (priority-queue-heap pq)))
384
385(defun priority-queue-upheap (a k
386 &optional
387 (test #'<=)
388 &aux (v (aref a k)))
389 (declare (fixnum k))
390 (assert (< 0 k (fill-pointer a)))
391 (loop
392 (let ((parent (ash k -1)))
393 (when (zerop parent) (return))
394 (unless (funcall test (aref a parent) v)
395 (return))
396 (setf (aref a k) (aref a parent)
397 k parent)))
398 (setf (aref a k) v)
399 a)
400
401
402(defun priority-queue-heap-insert (a item &optional (test #'<=))
403 (vector-push-extend item a)
404 (priority-queue-upheap a (1- (fill-pointer a)) test))
405
406(defun priority-queue-downheap (a k
407 &optional
408 (test #'<=)
409 &aux (v (aref a k)) (j 0) (n (fill-pointer a)))
410 (declare (fixnum k n j))
411 (loop
412 (unless (<= k (ash n -1))
413 (return))
414 (setf j (ash k 1))
415 (if (and (< j n) (not (funcall test (aref a (1+ j)) (aref a j))))
416 (incf j))
417 (when (funcall test (aref a j) v)
418 (return))
419 (setf (aref a k) (aref a j)
420 k j))
421 (setf (aref a k) v)
422 a)
423
424(defun priority-queue-heap-remove (a &optional (test #'<=) &aux (v (aref a 1)))
425 (when (<= (fill-pointer a) 1) (error "Empty queue."))
426 (setf (aref a 1) (vector-pop a))
427 (priority-queue-downheap a 1 test)
428 (values v a))
429
430(defun priority-queue-heap-empty-p (a)
431 (<= (fill-pointer a) 1))
432
433
434
435;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
436;;
437;; Global switches
438;; (Can be used in Maxima just fine)
439;;
440;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
441
442(defmvar $poly_monomial_order '$lex
443 "This switch controls which monomial order is used in polynomial
444and Grobner basis calculations. If not set, LEX will be used")
445
446(defmvar $poly_coefficient_ring '$expression_ring
447 "This switch indicates the coefficient ring of the polynomials
448that will be used in grobner calculations. If not set, Maxima's
449general expression ring will be used. This variable may be set
450to RING_OF_INTEGERS if desired.")
451
452(defmvar $poly_primary_elimination_order nil
453 "Name of the default order for eliminated variables in elimination-based functions.
454If not set, LEX will be used.")
455
456(defmvar $poly_secondary_elimination_order nil
457 "Name of the default order for kept variables in elimination-based functions.
458If not set, LEX will be used.")
459
460(defmvar $poly_elimination_order nil
461 "Name of the default elimination order used in elimination calculations.
462If set, it overrides the settings in variables POLY_PRIMARY_ELIMINATION_ORDER
463and SECONDARY_ELIMINATION_ORDER. The user must ensure that this is a true
464elimination order valid for the number of eliminated variables.")
465
466(defmvar $poly_return_term_list nil
467 "If set to T, all functions in this package will return each polynomial as a
468list of terms in the current monomial order rather than a Maxima general expression.")
469
470(defmvar $poly_grobner_debug nil
471 "If set to TRUE, produce debugging and tracing output.")
472
473(defmvar $poly_grobner_algorithm '$buchberger
474 "The name of the algorithm used to find grobner bases.")
475
476(defmvar $poly_top_reduction_only nil
477 "If not FALSE, use top reduction only whenever possible.
478Top reduction means that division algorithm stops after the first reduction.")
479
480
481
482;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
483;;
484;; Coefficient ring operations
485;;
486;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
487;;
488;; These are ALL operations that are performed on the coefficients by
489;; the package, and thus the coefficient ring can be changed by merely
490;; redefining these operations.
491;;
492;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
493
494(defstruct (ring)
495 (parse #'identity :type function)
496 (unit #'identity :type function)
497 (zerop #'identity :type function)
498 (add #'identity :type function)
499 (sub #'identity :type function)
500 (uminus #'identity :type function)
501 (mul #'identity :type function)
502 (div #'identity :type function)
503 (lcm #'identity :type function)
504 (ezgcd #'identity :type function)
505 (gcd #'identity :type function))
506
507(defparameter *ring-of-integers*
508 (make-ring
509 :parse #'identity
510 :unit #'(lambda () 1)
511 :zerop #'zerop
512 :add #'+
513 :sub #'-
514 :uminus #'-
515 :mul #'*
516 :div #'/
517 :lcm #'lcm
518 :ezgcd #'(lambda (x y &aux (c (gcd x y))) (values c (/ x c) (/ y c)))
519 :gcd #'gcd)
520 "The ring of integers.")
521
522
523
524;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
525;;
526;; This is how we perform operations on coefficients
527;; using Maxima functions.
528;;
529;; Functions and macros dealing with internal representation structure
530;;
531;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
532
533(defun make-term-variable (ring nvars pos
534 &optional
535 (power 1)
536 (coeff (funcall (ring-unit ring)))
537 &aux
538 (monom (make-monom nvars :initial-element 0)))
539 (declare (fixnum nvars pos power))
540 (incf (monom-elt monom pos) power)
541 (make-term monom coeff))
542
543(defstruct (term
544 (:constructor make-term (monom coeff))
545 ;;(:constructor make-term-variable)
546 ;;(:type list)
547 )
548 (monom (make-monom 0) :type monom)
549 (coeff nil))
550
551(defun term-sugar (term)
552 (monom-sugar (term-monom term)))
553
554(defun termlist-sugar (p &aux (sugar -1))
555 (declare (fixnum sugar))
556 (dolist (term p sugar)
557 (setf sugar (max sugar (term-sugar term)))))
558
559
560
561
562;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
563;;
564;; Low-level polynomial arithmetic done on
565;; lists of terms
566;;
567;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
568
569(defmacro termlist-lt (p) `(car ,p))
570(defun termlist-lm (p) (term-monom (termlist-lt p)))
571(defun termlist-lc (p) (term-coeff (termlist-lt p)))
572
573(define-modify-macro scalar-mul (c) coeff-mul)
574
575(defun scalar-times-termlist (ring c p)
576 "Multiply scalar C by a polynomial P. This function works
577even if there are divisors of 0."
578 (mapcan
579 #'(lambda (term)
580 (let ((c1 (funcall (ring-mul ring) c (term-coeff term))))
581 (unless (funcall (ring-zerop ring) c1)
582 (list (make-term (term-monom term) c1)))))
583 p))
584
585
586(defun term-mul (ring term1 term2)
587 "Returns (LIST TERM) wheter TERM is the product of the terms TERM1 TERM2,
588or NIL when the product is 0. This definition takes care of divisors of 0
589in the coefficient ring."
590 (let ((c (funcall (ring-mul ring) (term-coeff term1) (term-coeff term2))))
591 (unless (funcall (ring-zerop ring) c)
592 (list (make-term (monom-mul (term-monom term1) (term-monom term2)) c)))))
593
594(defun term-times-termlist (ring term f)
595 (declare (type ring ring))
596 (mapcan #'(lambda (term-f) (term-mul ring term term-f)) f))
597
598(defun termlist-times-term (ring f term)
599 (mapcan #'(lambda (term-f) (term-mul ring term-f term)) f))
600
601(defun monom-times-term (m term)
602 (make-term (monom-mul m (term-monom term)) (term-coeff term)))
603
604(defun monom-times-termlist (m f)
605 (cond
606 ((null f) nil)
607 (t
608 (mapcar #'(lambda (x) (monom-times-term m x)) f))))
609
610(defun termlist-uminus (ring f)
611 (mapcar #'(lambda (x)
612 (make-term (term-monom x) (funcall (ring-uminus ring) (term-coeff x))))
613 f))
614
615(defun termlist-add (ring p q)
616 (declare (type list p q))
617 (do (r)
618 ((cond
619 ((endp p)
620 (setf r (revappend r q)) t)
621 ((endp q)
622 (setf r (revappend r p)) t)
623 (t
624 (multiple-value-bind
625 (lm-greater lm-equal)
626 (monomial-order (termlist-lm p) (termlist-lm q))
627 (cond
628 (lm-equal
629 (let ((s (funcall (ring-add ring) (termlist-lc p) (termlist-lc q))))
630 (unless (funcall (ring-zerop ring) s) ;check for cancellation
631 (setf r (cons (make-term (termlist-lm p) s) r)))
632 (setf p (cdr p) q (cdr q))))
633 (lm-greater
634 (setf r (cons (car p) r)
635 p (cdr p)))
636 (t (setf r (cons (car q) r)
637 q (cdr q)))))
638 nil))
639 r)))
640
641(defun termlist-sub (ring p q)
642 (declare (type list p q))
643 (do (r)
644 ((cond
645 ((endp p)
646 (setf r (revappend r (termlist-uminus ring q)))
647 t)
648 ((endp q)
649 (setf r (revappend r p))
650 t)
651 (t
652 (multiple-value-bind
653 (mgreater mequal)
654 (monomial-order (termlist-lm p) (termlist-lm q))
655 (cond
656 (mequal
657 (let ((s (funcall (ring-sub ring) (termlist-lc p) (termlist-lc q))))
658 (unless (funcall (ring-zerop ring) s) ;check for cancellation
659 (setf r (cons (make-term (termlist-lm p) s) r)))
660 (setf p (cdr p) q (cdr q))))
661 (mgreater
662 (setf r (cons (car p) r)
663 p (cdr p)))
664 (t (setf r (cons (make-term (termlist-lm q) (funcall (ring-uminus ring) (termlist-lc q))) r)
665 q (cdr q)))))
666 nil))
667 r)))
668
669;; Multiplication of polynomials
670;; Non-destructive version
671(defun termlist-mul (ring p q)
672 (cond ((or (endp p) (endp q)) nil) ;p or q is 0 (represented by NIL)
673 ;; If p=p0+p1 and q=q0+q1 then pq=p0q0+p0q1+p1q
674 ((endp (cdr p))
675 (term-times-termlist ring (car p) q))
676 ((endp (cdr q))
677 (termlist-times-term ring p (car q)))
678 (t
679 (let ((head (term-mul ring (termlist-lt p) (termlist-lt q)))
680 (tail (termlist-add ring (term-times-termlist ring (car p) (cdr q))
681 (termlist-mul ring (cdr p) q))))
682 (cond ((null head) tail)
683 ((null tail) head)
684 (t (nconc head tail)))))))
685
686(defun termlist-unit (ring dimension)
687 (declare (fixnum dimension))
688 (list (make-term (make-monom dimension :initial-element 0)
689 (funcall (ring-unit ring)))))
690
691(defun termlist-expt (ring poly n &aux (dim (monom-dimension (termlist-lm poly))))
692 (declare (type fixnum n dim))
693 (cond
694 ((minusp n) (error "termlist-expt: Negative exponent."))
695 ((endp poly) (if (zerop n) (termlist-unit ring dim) nil))
696 (t
697 (do ((k 1 (ash k 1))
698 (q poly (termlist-mul ring q q)) ;keep squaring
699 (p (termlist-unit ring dim) (if (not (zerop (logand k n))) (termlist-mul ring p q) p)))
700 ((> k n) p)
701 (declare (fixnum k))))))
702
703
704
705;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
706;;
707;; Additional structure operations on a list of terms
708;;
709;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
710
711(defun termlist-contract (p &optional (k 1))
712 "Eliminate first K variables from a polynomial P."
713 (mapcar #'(lambda (term) (make-term (monom-contract k (term-monom term))
714 (term-coeff term)))
715 p))
716
717(defun termlist-extend (p &optional (m (make-monom 1 :initial-element 0)))
718 "Extend every monomial in a polynomial P by inserting at the
719beginning of every monomial the list of powers M."
720 (mapcar #'(lambda (term) (make-term (monom-append m (term-monom term))
721 (term-coeff term)))
722 p))
723
724(defun termlist-add-variables (p n)
725 "Add N variables to a polynomial P by inserting zero powers
726at the beginning of each monomial."
727 (declare (fixnum n))
728 (mapcar #'(lambda (term)
729 (make-term (monom-append (make-monom n :initial-element 0)
730 (term-monom term))
731 (term-coeff term)))
732 p))
733
734
735
736;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
737;;
738;; Arithmetic on polynomials
739;;
740;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
741
742(defstruct (poly
743 ;;BOA constructor, by default constructs zero polynomial
744 (:constructor make-poly-from-termlist (termlist &optional (sugar (termlist-sugar termlist))))
745 (:constructor make-poly-zero (&aux (termlist nil) (sugar -1)))
746 ;;Constructor of polynomials representing a variable
747 (:constructor make-variable (ring nvars pos &optional (power 1)
748 &aux
749 (termlist (list
750 (make-term-variable ring nvars pos power)))
751 (sugar power)))
752 (:constructor poly-unit (ring dimension
753 &aux
754 (termlist (termlist-unit ring dimension))
755 (sugar 0))))
756 (termlist nil :type list)
757 (sugar -1 :type fixnum))
758
759;; Leading term
760(defmacro poly-lt (p) `(car (poly-termlist ,p)))
761
762;; Second term
763(defmacro poly-second-lt (p) `(cadar (poly-termlist ,p)))
764
765;; Leading monomial
766(defun poly-lm (p) (term-monom (poly-lt p)))
767
768;; Second monomial
769(defun poly-second-lm (p) (term-monom (poly-second-lt p)))
770
771;; Leading coefficient
772(defun poly-lc (p) (term-coeff (poly-lt p)))
773
774;; Second coefficient
775(defun poly-second-lc (p) (term-coeff (poly-second-lt p)))
776
777;; Testing for a zero polynomial
778(defun poly-zerop (p) (null (poly-termlist p)))
779
780;; The number of terms
781(defun poly-length (p) (length (poly-termlist p)))
782
783(defun scalar-times-poly (ring c p)
784 (make-poly-from-termlist (scalar-times-termlist ring c (poly-termlist p)) (poly-sugar p)))
785
786(defun monom-times-poly (m p)
787 (make-poly-from-termlist (monom-times-termlist m (poly-termlist p)) (+ (poly-sugar p) (monom-sugar m))))
788
789(defun term-times-poly (ring term p)
790 (make-poly-from-termlist (term-times-termlist ring term (poly-termlist p)) (+ (poly-sugar p) (term-sugar term))))
791
792(defun poly-add (ring p q)
793 (make-poly-from-termlist (termlist-add ring (poly-termlist p) (poly-termlist q)) (max (poly-sugar p) (poly-sugar q))))
794
795(defun poly-sub (ring p q)
796 (make-poly-from-termlist (termlist-sub ring (poly-termlist p) (poly-termlist q)) (max (poly-sugar p) (poly-sugar q))))
797
798(defun poly-uminus (ring p)
799 (make-poly-from-termlist (termlist-uminus ring (poly-termlist p)) (poly-sugar p)))
800
801(defun poly-mul (ring p q)
802 (make-poly-from-termlist (termlist-mul ring (poly-termlist p) (poly-termlist q)) (+ (poly-sugar p) (poly-sugar q))))
803
804(defun poly-expt (ring p n)
805 (make-poly-from-termlist (termlist-expt ring (poly-termlist p) n) (* n (poly-sugar p))))
806
807(defun poly-append (&rest plist)
808 (make-poly-from-termlist (apply #'append (mapcar #'poly-termlist plist))
809 (apply #'max (mapcar #'poly-sugar plist))))
810
811(defun poly-nreverse (p)
812 (setf (poly-termlist p) (nreverse (poly-termlist p)))
813 p)
814
815(defun poly-contract (p &optional (k 1))
816 (make-poly-from-termlist (termlist-contract (poly-termlist p) k)
817 (poly-sugar p)))
818
819(defun poly-extend (p &optional (m (make-monom 1 :initial-element 0)))
820 (make-poly-from-termlist
821 (termlist-extend (poly-termlist p) m)
822 (+ (poly-sugar p) (monom-sugar m))))
823
824(defun poly-add-variables (p k)
825 (setf (poly-termlist p) (termlist-add-variables (poly-termlist p) k))
826 p)
827
828(defun poly-list-add-variables (plist k)
829 (mapcar #'(lambda (p) (poly-add-variables p k)) plist))
830
831(defun poly-standard-extension (plist &aux (k (length plist)))
832 "Calculate [U1*P1,U2*P2,...,UK*PK], where PLIST=[P1,P2,...,PK]."
833 (declare (list plist) (fixnum k))
834 (labels ((incf-power (g i)
835 (dolist (x (poly-termlist g))
836 (incf (monom-elt (term-monom x) i)))
837 (incf (poly-sugar g))))
838 (setf plist (poly-list-add-variables plist k))
839 (dotimes (i k plist)
840 (incf-power (nth i plist) i))))
841
842(defun saturation-extension (ring f plist &aux (k (length plist)) (d (monom-dimension (poly-lm (car plist)))))
843 "Calculate [F, U1*P1-1,U2*P2-1,...,UK*PK-1], where PLIST=[P1,P2,...,PK]."
844 (setf f (poly-list-add-variables f k)
845 plist (mapcar #'(lambda (x)
846 (setf (poly-termlist x) (nconc (poly-termlist x)
847 (list (make-term (make-monom d :initial-element 0)
848 (funcall (ring-uminus ring) (funcall (ring-unit ring)))))))
849 x)
850 (poly-standard-extension plist)))
851 (append f plist))
852
853
854(defun polysaturation-extension (ring f plist &aux (k (length plist))
855 (d (+ k (length (poly-lm (car plist))))))
856 "Calculate [F, U1*P1+U2*P2+...+UK*PK-1], where PLIST=[P1,P2,...,PK]."
857 (setf f (poly-list-add-variables f k)
858 plist (apply #'poly-append (poly-standard-extension plist))
859 (cdr (last (poly-termlist plist))) (list (make-term (make-monom d :initial-element 0)
860 (funcall (ring-uminus ring) (funcall (ring-unit ring))))))
861 (append f (list plist)))
862
863(defun saturation-extension-1 (ring f p) (polysaturation-extension ring f (list p)))
864
865
866
867
868;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
869;;
870;; Evaluation of polynomial (prefix) expressions
871;;
872;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
873
874(defun coerce-coeff (ring expr vars)
875 "Coerce an element of the coefficient ring to a constant polynomial."
876 ;; Modular arithmetic handler by rat
877 (make-poly-from-termlist (list (make-term (make-monom (length vars) :initial-element 0)
878 (funcall (ring-parse ring) expr)))
879 0))
880
881(defun poly-eval (ring expr vars &optional (list-marker '[))
882 (labels ((p-eval (arg) (poly-eval ring arg vars))
883 (p-eval-list (args) (mapcar #'p-eval args))
884 (p-add (x y) (poly-add ring x y)))
885 (cond
886 ((eql expr 0) (make-poly-zero))
887 ((member expr vars :test #'equalp)
888 (let ((pos (position expr vars :test #'equalp)))
889 (make-variable ring (length vars) pos)))
890 ((atom expr)
891 (coerce-coeff ring expr vars))
892 ((eq (car expr) list-marker)
893 (cons list-marker (p-eval-list (cdr expr))))
894 (t
895 (case (car expr)
896 (+ (reduce #'p-add (p-eval-list (cdr expr))))
897 (- (case (length expr)
898 (1 (make-poly-zero))
899 (2 (poly-uminus ring (p-eval (cadr expr))))
900 (3 (poly-sub ring (p-eval (cadr expr)) (p-eval (caddr expr))))
901 (otherwise (poly-sub ring (p-eval (cadr expr))
902 (reduce #'p-add (p-eval-list (cddr expr)))))))
903 (*
904 (if (endp (cddr expr)) ;unary
905 (p-eval (cdr expr))
906 (reduce #'(lambda (p q) (poly-mul ring p q)) (p-eval-list (cdr expr)))))
907 (expt
908 (cond
909 ((member (cadr expr) vars :test #'equalp)
910 ;;Special handling of (expt var pow)
911 (let ((pos (position (cadr expr) vars :test #'equalp)))
912 (make-variable ring (length vars) pos (caddr expr))))
913 ((not (and (integerp (caddr expr)) (plusp (caddr expr))))
914 ;; Negative power means division in coefficient ring
915 ;; Non-integer power means non-polynomial coefficient
916 (coerce-coeff ring expr vars))
917 (t (poly-expt ring (p-eval (cadr expr)) (caddr expr)))))
918 (otherwise
919 (coerce-coeff ring expr vars)))))))
920
921
922
923
924;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
925;;
926;; Debugging/tracing
927;;
928;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
929
930
931
932(defmacro debug-cgb (&rest args)
933 `(when $poly_grobner_debug (format *terminal-io* ,@args)))
934
935;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
936;;
937;; An implementation of Grobner basis
938;;
939;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
940
941(defun spoly (ring f g)
942 "It yields the S-polynomial of polynomials F and G."
943 (declare (type poly f g))
944 (let* ((lcm (monom-lcm (poly-lm f) (poly-lm g)))
945 (mf (monom-div lcm (poly-lm f)))
946 (mg (monom-div lcm (poly-lm g))))
947 (declare (type monom mf mg))
948 (multiple-value-bind (c cf cg)
949 (funcall (ring-ezgcd ring) (poly-lc f) (poly-lc g))
950 (declare (ignore c))
951 (poly-sub
952 ring
953 (scalar-times-poly ring cg (monom-times-poly mf f))
954 (scalar-times-poly ring cf (monom-times-poly mg g))))))
955
956
957(defun poly-primitive-part (ring p)
958 "Divide polynomial P with integer coefficients by gcd of its
959coefficients and return the result."
960 (declare (type poly p))
961 (if (poly-zerop p)
962 (values p 1)
963 (let ((c (poly-content ring p)))
964 (values (make-poly-from-termlist (mapcar
965 #'(lambda (x)
966 (make-term (term-monom x)
967 (funcall (ring-div ring) (term-coeff x) c)))
968 (poly-termlist p))
969 (poly-sugar p))
970 c))))
971
972(defun poly-content (ring p)
973 "Greatest common divisor of the coefficients of the polynomial P. Use the RING structure
974to compute the greatest common divisor."
975 (declare (type poly p))
976 (reduce (ring-gcd ring) (mapcar #'term-coeff (rest (poly-termlist p))) :initial-value (poly-lc p)))
977
978
979
980;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
981;;
982;; An implementation of the division algorithm
983;;
984;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
985
986(defun grobner-op (ring c1 c2 m f g)
987 "Returns C2*F-C1*M*G, where F and G are polynomials M is a monomial.
988Assume that the leading terms will cancel."
989 #+grobner-check(funcall (ring-zerop ring)
990 (funcall (ring-sub ring)
991 (funcall (ring-mul ring) c2 (poly-lc f))
992 (funcall (ring-mul ring) c1 (poly-lc g))))
993 #+grobner-check(monom-equal-p (poly-lm f) (monom-mul m (poly-lm g)))
994 ;; Note that we can drop the leading terms of f ang g
995 (poly-sub ring
996 (scalar-times-poly ring c2 (cdr f))
997 (scalar-times-poly ring c1 (monom-times-poly m (cdr g)))))
998
999(defun poly-pseudo-divide (ring f fl)
1000 "Pseudo-divide a polynomial F by the list of polynomials FL. Return
1001multiple values. The first value is a list of quotients A. The second
1002value is the remainder R. The third argument is a scalar coefficient
1003C, such that C*F can be divided by FL within the ring of coefficients,
1004which is not necessarily a field. Finally, the fourth value is an
1005integer count of the number of reductions performed. The resulting
1006objects satisfy the equation: C*F= sum A[i]*FL[i] + R."
1007 (declare (type poly f) (list fl))
1008 (do ((r (make-poly-zero))
1009 (c (funcall (ring-unit ring)))
1010 (a (make-list (length fl) :initial-element (make-poly-zero)))
1011 (division-count 0)
1012 (p f))
1013 ((poly-zerop p)
1014 (debug-cgb "~&~3T~d reduction~:p" division-count)
1015 (when (poly-zerop r) (debug-cgb " ---> 0"))
1016 (values (mapcar #'poly-nreverse a) (poly-nreverse r) c division-count))
1017 (declare (fixnum division-count))
1018 (do ((fl fl (rest fl)) ;scan list of divisors
1019 (b a (rest b)))
1020 ((cond
1021 ((endp fl) ;no division occurred
1022 (push (poly-lt p) (poly-termlist r)) ;move lt(p) to remainder
1023 (setf (poly-sugar r) (max (poly-sugar r) (term-sugar (poly-lt p))))
1024 (pop (poly-termlist p)) ;remove lt(p) from p
1025 t)
1026 ((monom-divides-p (poly-lm (car fl)) (poly-lm p)) ;division occurred
1027 (incf division-count)
1028 (multiple-value-bind (gcd c1 c2)
1029 (funcall (ring-ezgcd ring) (poly-lc (car fl)) (poly-lc p))
1030 (declare (ignore gcd))
1031 (let ((m (monom-div (poly-lm p) (poly-lm (car fl)))))
1032 ;; Multiply the equation c*f=sum ai*fi+r+p by c1.
1033 (mapl #'(lambda (x)
1034 (setf (car x) (scalar-times-poly ring c1 (car x))))
1035 a)
1036 (setf r (scalar-times-poly ring c1 r)
1037 c (funcall (ring-mul ring) c c1)
1038 p (grobner-op ring c2 c1 m p (car fl)))
1039 (push (make-term m c2) (poly-termlist (car b))))
1040 t)))))))
1041
1042(defun poly-exact-divide (ring f g)
1043 "Divide a polynomial F by another polynomial G. Assume that exact division
1044with no remainder is possible. Returns the quotient."
1045 (declare (type poly f g))
1046 (multiple-value-bind (quot rem coeff division-count)
1047 (poly-pseudo-divide ring f (list g))
1048 (declare (ignore division-count coeff)
1049 (list quot)
1050 (type poly rem)
1051 (type fixnum division-count))
1052 (unless (poly-zerop rem) (error "Exact division failed."))
1053 (car quot)))
1054
1055
1056
1057;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1058;;
1059;; An implementation of the normal form
1060;;
1061;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1062
1063(defun normal-form-step (ring fl p r c division-count
1064 &aux (g (find (poly-lm p) fl
1065 :test #'monom-divisible-by-p
1066 :key #'poly-lm)))
1067 (cond
1068 (g ;division possible
1069 (incf division-count)
1070 (multiple-value-bind (gcd cg cp)
1071 (funcall (ring-ezgcd ring) (poly-lc g) (poly-lc p))
1072 (declare (ignore gcd))
1073 (let ((m (monom-div (poly-lm p) (poly-lm g))))
1074 ;; Multiply the equation c*f=sum ai*fi+r+p by cg.
1075 (setf r (scalar-times-poly ring cg r)
1076 c (funcall (ring-mul ring) c cg)
1077 ;; p := cg*p-cp*m*g
1078 p (grobner-op ring cp cg m p g))))
1079 (debug-cgb "/"))
1080 (t ;no division possible
1081 (push (poly-lt p) (poly-termlist r)) ;move lt(p) to remainder
1082 (setf (poly-sugar r) (max (poly-sugar r) (term-sugar (poly-lt p))))
1083 (pop (poly-termlist p)) ;remove lt(p) from p
1084 (debug-cgb "+")))
1085 (values p r c division-count))
1086
1087;; Merge it sometime with poly-pseudo-divide
1088(defun normal-form (ring f fl &optional (top-reduction-only $poly_top_reduction_only))
1089 ;; Loop invariant: c*f0=sum ai*fi+r+f, where f0 is the initial value of f
1090 #+grobner-check(when (null fl) (warn "normal-form: empty divisor list."))
1091 (do ((r (make-poly-zero))
1092 (c (funcall (ring-unit ring)))
1093 (division-count 0))
1094 ((or (poly-zerop f)
1095 ;;(endp fl)
1096 (and top-reduction-only (not (poly-zerop r))))
1097 (progn
1098 (debug-cgb "~&~3T~d reduction~:p" division-count)
1099 (when (poly-zerop r)
1100 (debug-cgb " ---> 0")))
1101 (setf (poly-termlist f) (nreconc (poly-termlist r) (poly-termlist f)))
1102 (values f c division-count))
1103 (declare (fixnum division-count)
1104 (type poly r))
1105 (multiple-value-setq (f r c division-count)
1106 (normal-form-step ring fl f r c division-count))))
1107
1108
1109
1110;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1111;;
1112;; These are provided mostly for debugging purposes To enable
1113;; verification of grobner bases with BUCHBERGER-CRITERION, do
1114;; (pushnew :grobner-check *features*) and compile/load this file.
1115;; With this feature, the calculations will slow down CONSIDERABLY.
1116;;
1117;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1118
1119(defun buchberger-criterion (ring g)
1120 "Returns T if G is a Grobner basis, by using the Buchberger
1121criterion: for every two polynomials h1 and h2 in G the S-polynomial
1122S(h1,h2) reduces to 0 modulo G."
1123 (every
1124 #'poly-zerop
1125 (makelist (normal-form ring (spoly ring (elt g i) (elt g j)) g nil)
1126 (i 0 (- (length g) 2))
1127 (j (1+ i) (1- (length g))))))
1128
1129(defun grobner-test (ring g f)
1130 "Test whether G is a Grobner basis and F is contained in G. Return T
1131upon success and NIL otherwise."
1132 (debug-cgb "~&GROBNER CHECK: ")
1133 (let (($poly_grobner_debug nil)
1134 (stat1 (buchberger-criterion ring g))
1135 (stat2
1136 (every #'poly-zerop
1137 (makelist (normal-form ring (copy-tree (elt f i)) g nil)
1138 (i 0 (1- (length f)))))))
1139 (unless stat1 (error "~&Buchberger criterion failed."))
1140 (unless stat2
1141 (error "~&Original polys not in ideal spanned by Grobner.")))
1142 (debug-cgb "~&GROBNER CHECK END")
1143 t)
1144
1145
1146
1147;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1148;;
1149;; Pair queue implementation
1150;;
1151;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1152
1153(defun sugar-pair-key (p q &aux (lcm (monom-lcm (poly-lm p) (poly-lm q)))
1154 (d (monom-sugar lcm)))
1155 "Returns list (S LCM-TOTAL-DEGREE) where S is the sugar of the S-polynomial of
1156polynomials P and Q, and LCM-TOTAL-DEGREE is the degree of is LCM(LM(P),LM(Q))."
1157 (declare (type poly p q) (type monom lcm) (type fixnum d))
1158 (cons (max
1159 (+ (- d (monom-sugar (poly-lm p))) (poly-sugar p))
1160 (+ (- d (monom-sugar (poly-lm q))) (poly-sugar q)))
1161 lcm))
1162
1163(defstruct (pair
1164 (:constructor make-pair (first second
1165 &aux
1166 (sugar (car (sugar-pair-key first second)))
1167 (division-data nil))))
1168 (first nil :type poly)
1169 (second nil :type poly)
1170 (sugar 0 :type fixnum)
1171 (division-data nil :type list))
1172
1173;;(defun pair-sugar (pair &aux (p (pair-first pair)) (q (pair-second pair)))
1174;; (car (sugar-pair-key p q)))
1175
1176(defun sugar-order (x y)
1177 "Pair order based on sugar, ties broken by normal strategy."
1178 (declare (type cons x y))
1179 (or (< (car x) (car y))
1180 (and (= (car x) (car y))
1181 (< (monom-total-degree (cdr x))
1182 (monom-total-degree (cdr y))))))
1183
1184(defvar *pair-key-function* #'sugar-pair-key
1185 "Function that, given two polynomials as argument, computed the key
1186in the pair queue.")
1187
1188(defvar *pair-order* #'sugar-order
1189 "Function that orders the keys of pairs.")
1190
1191(defun make-pair-queue ()
1192 "Constructs a priority queue for critical pairs."
1193 (make-priority-queue
1194 :element-type 'pair
1195 :element-key #'(lambda (pair) (funcall *pair-key-function* (pair-first pair) (pair-second pair)))
1196 :test *pair-order*))
1197
1198(defun pair-queue-initialize (pq f start
1199 &aux
1200 (s (1- (length f)))
1201 (b (nconc (makelist (make-pair (elt f i) (elt f j))
1202 (i 0 (1- start)) (j start s))
1203 (makelist (make-pair (elt f i) (elt f j))
1204 (i start (1- s)) (j (1+ i) s)))))
1205 "Initializes the priority for critical pairs. F is the initial list of polynomials.
1206START is the first position beyond the elements which form a partial
1207grobner basis, i.e. satisfy the Buchberger criterion."
1208 (declare (type priority-queue pq) (type fixnum start))
1209 (dolist (pair b pq)
1210 (priority-queue-insert pq pair)))
1211
1212(defun pair-queue-insert (b pair)
1213 (priority-queue-insert b pair))
1214
1215(defun pair-queue-remove (b)
1216 (priority-queue-remove b))
1217
1218(defun pair-queue-size (b)
1219 (priority-queue-size b))
1220
1221(defun pair-queue-empty-p (b)
1222 (priority-queue-empty-p b))
1223
1224;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1225;;
1226;; Buchberger Algorithm Implementation
1227;;
1228;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1229
1230(defun buchberger (ring f start &optional (top-reduction-only $poly_top_reduction_only))
1231 "An implementation of the Buchberger algorithm. Return Grobner basis
1232of the ideal generated by the polynomial list F. Polynomials 0 to
1233START-1 are assumed to be a Grobner basis already, so that certain
1234critical pairs will not be examined. If TOP-REDUCTION-ONLY set, top
1235reduction will be preformed. This function assumes that all polynomials
1236in F are non-zero."
1237 (declare (type fixnum start))
1238 (when (endp f) (return-from buchberger f)) ;cut startup costs
1239 (debug-cgb "~&GROBNER BASIS - BUCHBERGER ALGORITHM")
1240 (when (plusp start) (debug-cgb "~&INCREMENTAL:~d done" start))
1241 #+grobner-check (when (plusp start)
1242 (grobner-test ring (subseq f 0 start) (subseq f 0 start)))
1243 ;;Initialize critical pairs
1244 (let ((b (pair-queue-initialize (make-pair-queue)
1245 f start))
1246 (b-done (make-hash-table :test #'equal)))
1247 (declare (type priority-queue b) (type hash-table b-done))
1248 (dotimes (i (1- start))
1249 (do ((j (1+ i) (1+ j))) ((>= j start))
1250 (setf (gethash (list (elt f i) (elt f j)) b-done) t)))
1251 (do ()
1252 ((pair-queue-empty-p b)
1253 #+grobner-check(grobner-test ring f f)
1254 (debug-cgb "~&GROBNER END")
1255 f)
1256 (let ((pair (pair-queue-remove b)))
1257 (declare (type pair pair))
1258 (cond
1259 ((criterion-1 pair) nil)
1260 ((criterion-2 pair b-done f) nil)
1261 (t
1262 (let ((sp (normal-form ring (spoly ring (pair-first pair)
1263 (pair-second pair))
1264 f top-reduction-only)))
1265 (declare (type poly sp))
1266 (cond
1267 ((poly-zerop sp)
1268 nil)
1269 (t
1270 (setf sp (poly-primitive-part ring sp)
1271 f (nconc f (list sp)))
1272 ;; Add new critical pairs
1273 (dolist (h f)
1274 (pair-queue-insert b (make-pair h sp)))
1275 (debug-cgb "~&Sugar: ~d Polynomials: ~d; Pairs left: ~d; Pairs done: ~d;"
1276 (pair-sugar pair) (length f) (pair-queue-size b)
1277 (hash-table-count b-done)))))))
1278 (setf (gethash (list (pair-first pair) (pair-second pair)) b-done)
1279 t)))))
1280
1281(defun parallel-buchberger (ring f start &optional (top-reduction-only $poly_top_reduction_only))
1282 "An implementation of the Buchberger algorithm. Return Grobner basis
1283of the ideal generated by the polynomial list F. Polynomials 0 to
1284START-1 are assumed to be a Grobner basis already, so that certain
1285critical pairs will not be examined. If TOP-REDUCTION-ONLY set, top
1286reduction will be preformed."
1287 (declare (ignore top-reduction-only)
1288 (type fixnum start))
1289 (when (endp f) (return-from parallel-buchberger f)) ;cut startup costs
1290 (debug-cgb "~&GROBNER BASIS - PARALLEL-BUCHBERGER ALGORITHM")
1291 (when (plusp start) (debug-cgb "~&INCREMENTAL:~d done" start))
1292 #+grobner-check (when (plusp start)
1293 (grobner-test ring (subseq f 0 start) (subseq f 0 start)))
1294 ;;Initialize critical pairs
1295 (let ((b (pair-queue-initialize (make-pair-queue) f start))
1296 (b-done (make-hash-table :test #'equal)))
1297 (declare (type priority-queue b)
1298 (type hash-table b-done))
1299 (dotimes (i (1- start))
1300 (do ((j (1+ i) (1+ j))) ((>= j start))
1301 (declare (type fixnum j))
1302 (setf (gethash (list (elt f i) (elt f j)) b-done) t)))
1303 (do ()
1304 ((pair-queue-empty-p b)
1305 #+grobner-check(grobner-test ring f f)
1306 (debug-cgb "~&GROBNER END")
1307 f)
1308 (let ((pair (pair-queue-remove b)))
1309 (when (null (pair-division-data pair))
1310 (setf (pair-division-data pair) (list (spoly ring
1311 (pair-first pair)
1312 (pair-second pair))
1313 (make-poly-zero)
1314 (funcall (ring-unit ring))
1315 0)))
1316 (cond
1317 ((criterion-1 pair) nil)
1318 ((criterion-2 pair b-done f) nil)
1319 (t
1320 (let* ((dd (pair-division-data pair))
1321 (p (first dd))
1322 (sp (second dd))
1323 (c (third dd))
1324 (division-count (fourth dd)))
1325 (cond
1326 ((poly-zerop p) ;normal form completed
1327 (debug-cgb "~&~3T~d reduction~:p" division-count)
1328 (cond
1329 ((poly-zerop sp)
1330 (debug-cgb " ---> 0")
1331 nil)
1332 (t
1333 (setf sp (poly-nreverse sp)
1334 sp (poly-primitive-part ring sp)
1335 f (nconc f (list sp)))
1336 ;; Add new critical pairs
1337 (dolist (h f)
1338 (pair-queue-insert b (make-pair h sp)))
1339 (debug-cgb "~&Sugar: ~d Polynomials: ~d; Pairs left: ~d; Pairs done: ~d;"
1340 (pair-sugar pair) (length f) (pair-queue-size b)
1341 (hash-table-count b-done))))
1342 (setf (gethash (list (pair-first pair) (pair-second pair))
1343 b-done) t))
1344 (t ;normal form not complete
1345 (do ()
1346 ((cond
1347 ((> (poly-sugar sp) (pair-sugar pair))
1348 (debug-cgb "(~a)?" (poly-sugar sp))
1349 t)
1350 ((poly-zerop p)
1351 (debug-cgb ".")
1352 t)
1353 (t nil))
1354 (setf (first dd) p
1355 (second dd) sp
1356 (third dd) c
1357 (fourth dd) division-count
1358 (pair-sugar pair) (poly-sugar sp))
1359 (pair-queue-insert b pair))
1360 (multiple-value-setq (p sp c division-count)
1361 (normal-form-step ring f p sp c division-count))))))))))))
1362
1363;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1364;;
1365;; Grobner Criteria
1366;;
1367;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1368
1369(defun criterion-1 (pair)
1370 "Returns T if the leading monomials of the two polynomials
1371in G pointed to by the integers in PAIR have disjoint (relatively prime)
1372monomials. This test is known as the first Buchberger criterion."
1373 (declare (type pair pair))
1374 (let ((f (pair-first pair))
1375 (g (pair-second pair)))
1376 (when (monom-rel-prime-p (poly-lm f) (poly-lm g))
1377 (debug-cgb ":1")
1378 (return-from criterion-1 t))))
1379
1380(defun criterion-2 (pair b-done partial-basis
1381 &aux (f (pair-first pair)) (g (pair-second pair))
1382 (place :before))
1383 "Returns T if the leading monomial of some element P of
1384PARTIAL-BASIS divides the LCM of the leading monomials of the two
1385polynomials in the polynomial list PARTIAL-BASIS, and P paired with
1386each of the polynomials pointed to by the the PAIR has already been
1387treated, as indicated by the absence in the hash table B-done."
1388 (declare (type pair pair) (type hash-table b-done)
1389 (type poly f g))
1390 ;; In the code below we assume that pairs are ordered as follows:
1391 ;; if PAIR is (I J) then I appears before J in the PARTIAL-BASIS.
1392 ;; We traverse the list PARTIAL-BASIS and keep track of where we
1393 ;; are, so that we can produce the pairs in the correct order
1394 ;; when we check whether they have been processed, i.e they
1395 ;; appear in the hash table B-done
1396 (dolist (h partial-basis nil)
1397 (cond
1398 ((eq h f)
1399 #+grobner-check(assert (eq place :before))
1400 (setf place :in-the-middle))
1401 ((eq h g)
1402 #+grobner-check(assert (eq place :in-the-middle))
1403 (setf place :after))
1404 ((and (monom-divides-monom-lcm-p (poly-lm h) (poly-lm f) (poly-lm g))
1405 (gethash (case place
1406 (:before (list h f))
1407 ((:in-the-middle :after) (list f h)))
1408 b-done)
1409 (gethash (case place
1410 ((:before :in-the-middle) (list h g))
1411 (:after (list g h)))
1412 b-done))
1413 (debug-cgb ":2")
1414 (return-from criterion-2 t)))))
1415
1416
1417
1418;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1419;;
1420;; An implementation of the algorithm of Gebauer and Moeller, as
1421;; described in the book of Becker-Weispfenning, p. 232
1422;;
1423;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1424
1425(defun gebauer-moeller (ring f start &optional (top-reduction-only $poly_top_reduction_only))
1426 "Compute Grobner basis by using the algorithm of Gebauer and
1427Moeller. This algorithm is described as BUCHBERGERNEW2 in the book by
1428Becker-Weispfenning entitled ``Grobner Bases''. This function assumes
1429that all polynomials in F are non-zero."
1430 (declare (ignore top-reduction-only)
1431 (type fixnum start))
1432 (cond
1433 ((endp f) (return-from gebauer-moeller nil))
1434 ((endp (cdr f))
1435 (return-from gebauer-moeller (list (poly-primitive-part ring (car f))))))
1436 (debug-cgb "~&GROBNER BASIS - GEBAUER MOELLER ALGORITHM")
1437 (when (plusp start) (debug-cgb "~&INCREMENTAL:~d done" start))
1438 #+grobner-check (when (plusp start)
1439 (grobner-test ring (subseq f 0 start) (subseq f 0 start)))
1440 (let ((b (make-pair-queue))
1441 (g (subseq f 0 start))
1442 (f1 (subseq f start)))
1443 (do () ((endp f1))
1444 (multiple-value-setq (g b)
1445 (gebauer-moeller-update g b (poly-primitive-part ring (pop f1)))))
1446 (do () ((pair-queue-empty-p b))
1447 (let* ((pair (pair-queue-remove b))
1448 (g1 (pair-first pair))
1449 (g2 (pair-second pair))
1450 (h (normal-form ring (spoly ring g1 g2)
1451 g
1452 nil #| Always fully reduce! |#
1453 )))
1454 (unless (poly-zerop h)
1455 (setf h (poly-primitive-part ring h))
1456 (multiple-value-setq (g b)
1457 (gebauer-moeller-update g b h))
1458 (debug-cgb "~&Sugar: ~d Polynomials: ~d; Pairs left: ~d~%"
1459 (pair-sugar pair) (length g) (pair-queue-size b))
1460 )))
1461 #+grobner-check(grobner-test ring g f)
1462 (debug-cgb "~&GROBNER END")
1463 g))
1464
1465(defun gebauer-moeller-update (g b h
1466 &aux
1467 c d e
1468 (b-new (make-pair-queue))
1469 g-new)
1470 "An implementation of the auxillary UPDATE algorithm used by the
1471Gebauer-Moeller algorithm. G is a list of polynomials, B is a list of
1472critical pairs and H is a new polynomial which possibly will be added
1473to G. The naming conventions used are very close to the one used in
1474the book of Becker-Weispfenning."
1475 (declare
1476 #+allegro (dynamic-extent b)
1477 (type poly h)
1478 (type priority-queue b))
1479 (setf c g d nil)
1480 (do () ((endp c))
1481 (let ((g1 (pop c)))
1482 (declare (type poly g1))
1483 (when (or (monom-rel-prime-p (poly-lm h) (poly-lm g1))
1484 (and
1485 (notany #'(lambda (g2) (monom-lcm-divides-monom-lcm-p
1486 (poly-lm h) (poly-lm g2)
1487 (poly-lm h) (poly-lm g1)))
1488 c)
1489 (notany #'(lambda (g2) (monom-lcm-divides-monom-lcm-p
1490 (poly-lm h) (poly-lm g2)
1491 (poly-lm h) (poly-lm g1)))
1492 d)))
1493 (push g1 d))))
1494 (setf e nil)
1495 (do () ((endp d))
1496 (let ((g1 (pop d)))
1497 (declare (type poly g1))
1498 (unless (monom-rel-prime-p (poly-lm h) (poly-lm g1))
1499 (push g1 e))))
1500 (do () ((pair-queue-empty-p b))
1501 (let* ((pair (pair-queue-remove b))
1502 (g1 (pair-first pair))
1503 (g2 (pair-second pair)))
1504 (declare (type pair pair)
1505 (type poly g1 g2))
1506 (when (or (not (monom-divides-monom-lcm-p
1507 (poly-lm h)
1508 (poly-lm g1) (poly-lm g2)))
1509 (monom-lcm-equal-monom-lcm-p
1510 (poly-lm g1) (poly-lm h)
1511 (poly-lm g1) (poly-lm g2))
1512 (monom-lcm-equal-monom-lcm-p
1513 (poly-lm h) (poly-lm g2)
1514 (poly-lm g1) (poly-lm g2)))
1515 (pair-queue-insert b-new (make-pair g1 g2)))))
1516 (dolist (g3 e)
1517 (pair-queue-insert b-new (make-pair h g3)))
1518 (setf g-new nil)
1519 (do () ((endp g))
1520 (let ((g1 (pop g)))
1521 (declare (type poly g1))
1522 (unless (monom-divides-p (poly-lm h) (poly-lm g1))
1523 (push g1 g-new))))
1524 (push h g-new)
1525 (values g-new b-new))
1526
1527
1528
1529;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1530;;
1531;; Standard postprocessing of Grobner bases
1532;;
1533;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1534
1535(defun reduction (ring plist)
1536 "Reduce a list of polynomials PLIST, so that non of the terms in any of
1537the polynomials is divisible by a leading monomial of another
1538polynomial. Return the reduced list."
1539 (do ((q plist)
1540 (found t))
1541 ((not found)
1542 (mapcar #'(lambda (x) (poly-primitive-part ring x)) q))
1543 ;;Find p in Q such that p is reducible mod Q\{p}
1544 (setf found nil)
1545 (dolist (x q)
1546 (let ((q1 (remove x q)))
1547 (multiple-value-bind (h c div-count)
1548 (normal-form ring x q1 nil #| not a top reduction! |# )
1549 (declare (ignore c))
1550 (unless (zerop div-count)
1551 (setf found t q q1)
1552 (unless (poly-zerop h)
1553 (setf q (nconc q1 (list h))))
1554 (return)))))))
1555
1556(defun minimization (p)
1557 "Returns a sublist of the polynomial list P spanning the same
1558monomial ideal as P but minimal, i.e. no leading monomial
1559of a polynomial in the sublist divides the leading monomial
1560of another polynomial."
1561 (do ((q p)
1562 (found t))
1563 ((not found) q)
1564 ;;Find p in Q such that lm(p) is in LM(Q\{p})
1565 (setf found nil
1566 q (dolist (x q q)
1567 (let ((q1 (remove x q)))
1568 (when (member-if #'(lambda (p) (monom-divides-p (poly-lm x) (poly-lm p))) q1)
1569 (setf found t)
1570 (return q1)))))))
1571
1572(defun poly-normalize (ring p &aux (c (poly-lc p)))
1573 "Divide a polynomial by its leading coefficient. It assumes
1574that the division is possible, which may not always be the
1575case in rings which are not fields. The exact division operator
1576is assumed to be provided by the RING structure of the
1577COEFFICIENT-RING package."
1578 (mapc #'(lambda (term)
1579 (setf (term-coeff term) (funcall (ring-div ring) (term-coeff term) c)))
1580 (poly-termlist p))
1581 p)
1582
1583(defun poly-normalize-list (ring plist)
1584 "Divide every polynomial in a list PLIST by its leading coefficient. "
1585 (mapcar #'(lambda (x) (poly-normalize ring x)) plist))
1586
1587
1588
1589;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1590;;
1591;; Algorithm and Pair heuristic selection
1592;;
1593;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1594
1595(defun find-grobner-function (algorithm)
1596 "Return a function which calculates Grobner basis, based on its
1597names. Names currently used are either Lisp symbols, Maxima symbols or
1598keywords."
1599 (ecase algorithm
1600 ((buchberger :buchberger $buchberger) #'buchberger)
1601 ((parallel-buchberger :parallel-buchberger $parallel_buchberger) #'parallel-buchberger)
1602 ((gebauer-moeller :gebauer_moeller $gebauer_moeller) #'gebauer-moeller)))
1603
1604(defun grobner (ring f &optional (start 0) (top-reduction-only nil))
1605 ;;(setf F (sort F #'< :key #'sugar))
1606 (funcall
1607 (find-grobner-function $poly_grobner_algorithm)
1608 ring f start top-reduction-only))
1609
1610(defun reduced-grobner (ring f &optional (start 0) (top-reduction-only $poly_top_reduction_only))
1611 (reduction ring (grobner ring f start top-reduction-only)))
1612
1613(defun set-pair-heuristic (method)
1614 "Sets up variables *PAIR-KEY-FUNCTION* and *PAIR-ORDER* used
1615to determine the priority of critical pairs in the priority queue."
1616 (ecase method
1617 ((sugar :sugar $sugar)
1618 (setf *pair-key-function* #'sugar-pair-key
1619 *pair-order* #'sugar-order))
1620; ((minimal-mock-spoly :minimal-mock-spoly $minimal_mock_spoly)
1621; (setf *pair-key-function* #'mock-spoly
1622; *pair-order* #'mock-spoly-order))
1623 ((minimal-lcm :minimal-lcm $minimal_lcm)
1624 (setf *pair-key-function* #'(lambda (p q)
1625 (monom-lcm (poly-lm p) (poly-lm q)))
1626 *pair-order* #'reverse-monomial-order))
1627 ((minimal-total-degree :minimal-total-degree $minimal_total_degree)
1628 (setf *pair-key-function* #'(lambda (p q)
1629 (monom-total-degree
1630 (monom-lcm (poly-lm p) (poly-lm q))))
1631 *pair-order* #'<))
1632 ((minimal-length :minimal-length $minimal_length)
1633 (setf *pair-key-function* #'(lambda (p q)
1634 (+ (poly-length p) (poly-length q)))
1635 *pair-order* #'<))))
1636
1637
1638
1639;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1640;;
1641;; Operations in ideal theory
1642;;
1643;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1644
1645;; Does the term depend on variable K?
1646(defun term-depends-p (term k)
1647 "Return T if the term TERM depends on variable number K."
1648 (monom-depends-p (term-monom term) k))
1649
1650;; Does the polynomial P depend on variable K?
1651(defun poly-depends-p (p k)
1652 "Return T if the term polynomial P depends on variable number K."
1653 (some #'(lambda (term) (term-depends-p term k)) (poly-termlist p)))
1654
1655(defun ring-intersection (plist k)
1656 "This function assumes that polynomial list PLIST is a Grobner basis
1657and it calculates the intersection with the ring R[x[k+1],...,x[n]], i.e.
1658it discards polynomials which depend on variables x[0], x[1], ..., x[k]."
1659 (dotimes (i k plist)
1660 (setf plist
1661 (remove-if #'(lambda (p)
1662 (poly-depends-p p i))
1663 plist))))
1664
1665(defun elimination-ideal (ring flist k
1666 &optional (top-reduction-only $poly_top_reduction_only) (start 0)
1667 &aux (*monomial-order*
1668 (or *elimination-order*
1669 (elimination-order k))))
1670 (ring-intersection (reduced-grobner ring flist start top-reduction-only) k))
1671
1672(defun colon-ideal (ring f g &optional (top-reduction-only $poly_top_reduction_only))
1673 "Returns the reduced Grobner basis of the colon ideal Id(F):Id(G),
1674where F and G are two lists of polynomials. The colon ideal I:J is
1675defined as the set of polynomials H such that for all polynomials W in
1676J the polynomial W*H belongs to I."
1677 (cond
1678 ((endp g)
1679 ;;Id(G) consists of 0 only so W*0=0 belongs to Id(F)
1680 (if (every #'poly-zerop f)
1681 (error "First ideal must be non-zero.")
1682 (list (make-poly
1683 (list (make-term
1684 (make-monom (monom-dimension (poly-lm (find-if-not #'poly-zerop f)))
1685 :initial-element 0)
1686 (funcall (ring-unit ring))))))))
1687 ((endp (cdr g))
1688 (colon-ideal-1 ring f (car g) top-reduction-only))
1689 (t
1690 (ideal-intersection ring
1691 (colon-ideal-1 ring f (car g) top-reduction-only)
1692 (colon-ideal ring f (rest g) top-reduction-only)
1693 top-reduction-only))))
1694
1695(defun colon-ideal-1 (ring f g &optional (top-reduction-only $poly_top_reduction_only))
1696 "Returns the reduced Grobner basis of the colon ideal Id(F):Id({G}), where
1697F is a list of polynomials and G is a polynomial."
1698 (mapcar #'(lambda (x) (poly-exact-divide ring x g)) (ideal-intersection ring f (list g) top-reduction-only)))
1699
1700
1701(defun ideal-intersection (ring f g &optional (top-reduction-only $poly_top_reduction_only)
1702 &aux (*monomial-order* (or *elimination-order*
1703 #'elimination-order-1)))
1704 (mapcar #'poly-contract
1705 (ring-intersection
1706 (reduced-grobner
1707 ring
1708 (append (mapcar #'(lambda (p) (poly-extend p (make-monom 1 :initial-element 1))) f)
1709 (mapcar #'(lambda (p)
1710 (poly-append (poly-extend (poly-uminus ring p)
1711 (make-monom 1 :initial-element 1))
1712 (poly-extend p)))
1713 g))
1714 0
1715 top-reduction-only)
1716 1)))
1717
1718(defun poly-lcm (ring f g)
1719 "Return LCM (least common multiple) of two polynomials F and G.
1720The polynomials must be ordered according to monomial order PRED
1721and their coefficients must be compatible with the RING structure
1722defined in the COEFFICIENT-RING package."
1723 (cond
1724 ((poly-zerop f) f)
1725 ((poly-zerop g) g)
1726 ((and (endp (cdr (poly-termlist f))) (endp (cdr (poly-termlist g))))
1727 (let ((m (monom-lcm (poly-lm f) (poly-lm g))))
1728 (make-poly-from-termlist (list (make-term m (funcall (ring-lcm ring) (poly-lc f) (poly-lc g)))))))
1729 (t
1730 (multiple-value-bind (f f-cont)
1731 (poly-primitive-part ring f)
1732 (multiple-value-bind (g g-cont)
1733 (poly-primitive-part ring g)
1734 (scalar-times-poly
1735 ring
1736 (funcall (ring-lcm ring) f-cont g-cont)
1737 (poly-primitive-part ring (car (ideal-intersection ring (list f) (list g) nil)))))))))
1738
1739;; Do two Grobner bases yield the same ideal?
1740(defun grobner-equal (ring g1 g2)
1741 "Returns T if two lists of polynomials G1 and G2, assumed to be Grobner bases,
1742generate the same ideal, and NIL otherwise."
1743 (and (grobner-subsetp ring g1 g2) (grobner-subsetp ring g2 g1)))
1744
1745(defun grobner-subsetp (ring g1 g2)
1746 "Returns T if a list of polynomials G1 generates
1747an ideal contained in the ideal generated by a polynomial list G2,
1748both G1 and G2 assumed to be Grobner bases. Returns NIL otherwise."
1749 (every #'(lambda (p) (grobner-member ring p g2)) g1))
1750
1751(defun grobner-member (ring p g)
1752 "Returns T if a polynomial P belongs to the ideal generated by the
1753polynomial list G, which is assumed to be a Grobner basis. Returns NIL otherwise."
1754 (poly-zerop (normal-form ring p g nil)))
1755
1756;; Calculate F : p^inf
1757(defun ideal-saturation-1 (ring f p start &optional (top-reduction-only $poly_top_reduction_only)
1758 &aux (*monomial-order* (or *elimination-order*
1759 #'elimination-order-1)))
1760 "Returns the reduced Grobner basis of the saturation of the ideal
1761generated by a polynomial list F in the ideal generated by a single
1762polynomial P. The saturation ideal is defined as the set of
1763polynomials H such for some natural number n (* (EXPT P N) H) is in the ideal
1764F. Geometrically, over an algebraically closed field, this is the set
1765of polynomials in the ideal generated by F which do not identically
1766vanish on the variety of P."
1767 (mapcar
1768 #'poly-contract
1769 (ring-intersection
1770 (reduced-grobner
1771 ring
1772 (saturation-extension-1 ring f p)
1773 start top-reduction-only)
1774 1)))
1775
1776
1777
1778;; Calculate F : p1^inf : p2^inf : ... : ps^inf
1779(defun ideal-polysaturation-1 (ring f plist start &optional (top-reduction-only $poly_top_reduction_only))
1780 "Returns the reduced Grobner basis of the ideal obtained by a
1781sequence of successive saturations in the polynomials
1782of the polynomial list PLIST of the ideal generated by the
1783polynomial list F."
1784 (cond
1785 ((endp plist) (reduced-grobner ring f start top-reduction-only))
1786 (t (let ((g (ideal-saturation-1 ring f (car plist) start top-reduction-only)))
1787 (ideal-polysaturation-1 ring g (rest plist) (length g) top-reduction-only)))))
1788
1789(defun ideal-saturation (ring f g start &optional (top-reduction-only $poly_top_reduction_only)
1790 &aux
1791 (k (length g))
1792 (*monomial-order* (or *elimination-order*
1793 (elimination-order k))))
1794 "Returns the reduced Grobner basis of the saturation of the ideal
1795generated by a polynomial list F in the ideal generated a polynomial
1796list G. The saturation ideal is defined as the set of polynomials H
1797such for some natural number n and some P in the ideal generated by G
1798the polynomial P**N * H is in the ideal spanned by F. Geometrically,
1799over an algebraically closed field, this is the set of polynomials in
1800the ideal generated by F which do not identically vanish on the
1801variety of G."
1802 (mapcar
1803 #'(lambda (q) (poly-contract q k))
1804 (ring-intersection
1805 (reduced-grobner ring
1806 (polysaturation-extension ring f g)
1807 start
1808 top-reduction-only)
1809 k)))
1810
1811(defun ideal-polysaturation (ring f ideal-list start &optional (top-reduction-only $poly_top_reduction_only))
1812 "Returns the reduced Grobner basis of the ideal obtained by a
1813successive applications of IDEAL-SATURATION to F and lists of
1814polynomials in the list IDEAL-LIST."
1815 (cond
1816 ((endp ideal-list) f)
1817 (t (let ((h (ideal-saturation ring f (car ideal-list) start top-reduction-only)))
1818 (ideal-polysaturation ring h (rest ideal-list) (length h) top-reduction-only)))))
1819
1820
1821
1822;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1823;;
1824;; Set up the coefficients to be polynomials
1825;;
1826;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1827
1828;; (defun poly-ring (ring vars)
1829;; (make-ring
1830;; :parse #'(lambda (expr) (poly-eval ring expr vars))
1831;; :unit #'(lambda () (poly-unit ring (length vars)))
1832;; :zerop #'poly-zerop
1833;; :add #'(lambda (x y) (poly-add ring x y))
1834;; :sub #'(lambda (x y) (poly-sub ring x y))
1835;; :uminus #'(lambda (x) (poly-uminus ring x))
1836;; :mul #'(lambda (x y) (poly-mul ring x y))
1837;; :div #'(lambda (x y) (poly-exact-divide ring x y))
1838;; :lcm #'(lambda (x y) (poly-lcm ring x y))
1839;; :ezgcd #'(lambda (x y &aux (gcd (poly-gcd ring x y)))
1840;; (values gcd
1841;; (poly-exact-divide ring x gcd)
1842;; (poly-exact-divide ring y gcd)))
1843;; :gcd #'(lambda (x y) (poly-gcd x y))))
1844
1845
1846
1847;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1848;;
1849;; Conversion from internal to infix form
1850;;
1851;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1852
1853(defun coerce-to-infix (poly-type object vars)
1854 (case poly-type
1855 (:termlist
1856 `(+ ,@(mapcar #'(lambda (term) (coerce-to-infix :term term vars)) object)))
1857 (:polynomial
1858 (coerce-to-infix :termlist (poly-termlist object) vars))
1859 (:poly-list
1860 `([ ,@(mapcar #'(lambda (p) (coerce-to-infix :polynomial p vars)) object)))
1861 (:term
1862 `(* ,(term-coeff object)
1863 ,@(mapcar #'(lambda (var power) `(expt ,var ,power))
1864 vars (monom-exponents (term-monom object)))))
1865 (otherwise
1866 object)))
1867
1868
1869
1870;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1871;;
1872;; Maxima expression ring
1873;;
1874;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1875
1876(defparameter *expression-ring*
1877 (make-ring
1878 ;;(defun coeff-zerop (expr) (meval1 `(($is) (($equal) ,expr 0))))
1879 :parse #'(lambda (expr)
1880 (when modulus (setf expr ($rat expr)))
1881 expr)
1882 :unit #'(lambda () (if modulus ($rat 1) 1))
1883 :zerop #'(lambda (expr)
1884 ;;When is exactly a maxima expression equal to 0?
1885 (cond ((numberp expr)
1886 (= expr 0))
1887 ((atom expr) nil)
1888 (t
1889 (case (caar expr)
1890 (mrat (eql ($ratdisrep expr) 0))
1891 (otherwise (eql ($totaldisrep expr) 0))))))
1892 :add #'(lambda (x y) (m+ x y))
1893 :sub #'(lambda (x y) (m- x y))
1894 :uminus #'(lambda (x) (m- x))
1895 :mul #'(lambda (x y) (m* x y))
1896 ;;(defun coeff-div (x y) (cadr ($divide x y)))
1897 :div #'(lambda (x y) (m// x y))
1898 :lcm #'(lambda (x y) (meval1 `((|$LCM|) ,x ,y)))
1899 :ezgcd #'(lambda (x y) (apply #'values (cdr ($ezgcd ($totaldisrep x) ($totaldisrep y)))))
1900 ;; :gcd #'(lambda (x y) (second ($ezgcd x y)))))
1901 :gcd #'(lambda (x y) ($gcd x y))))
1902
1903(defvar *maxima-ring* *expression-ring*
1904 "The ring of coefficients, over which all polynomials
1905are assumed to be defined.")
1906
1907
1908
1909;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1910;;
1911;; Maxima expression parsing
1912;;
1913;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1914
1915(defun equal-test-p (expr1 expr2)
1916 (alike1 expr1 expr2))
1917
1918(defun coerce-maxima-list (expr)
1919 "convert a maxima list to lisp list."
1920 (cond
1921 ((and (consp (car expr)) (eql (caar expr) 'mlist)) (cdr expr))
1922 (t expr)))
1923
1924(defun free-of-vars (expr vars) (apply #'$freeof `(,@vars ,expr)))
1925
1926(defun parse-poly (expr vars &aux (vars (coerce-maxima-list vars)))
1927 "Convert a maxima polynomial expression EXPR in variables VARS to internal form."
1928 (labels ((parse (arg) (parse-poly arg vars))
1929 (parse-list (args) (mapcar #'parse args)))
1930 (cond
1931 ((eql expr 0) (make-poly-zero))
1932 ((member expr vars :test #'equal-test-p)
1933 (let ((pos (position expr vars :test #'equal-test-p)))
1934 (make-variable *maxima-ring* (length vars) pos)))
1935 ((free-of-vars expr vars)
1936 ;;This means that variable-free CRE and Poisson forms will be converted
1937 ;;to coefficients intact
1938 (coerce-coeff *maxima-ring* expr vars))
1939 (t
1940 (case (caar expr)
1941 (mplus (reduce #'(lambda (x y) (poly-add *maxima-ring* x y)) (parse-list (cdr expr))))
1942 (mminus (poly-uminus *maxima-ring* (parse (cadr expr))))
1943 (mtimes
1944 (if (endp (cddr expr)) ;unary
1945 (parse (cdr expr))
1946 (reduce #'(lambda (p q) (poly-mul *maxima-ring* p q)) (parse-list (cdr expr)))))
1947 (mexpt
1948 (cond
1949 ((member (cadr expr) vars :test #'equal-test-p)
1950 ;;Special handling of (expt var pow)
1951 (let ((pos (position (cadr expr) vars :test #'equal-test-p)))
1952 (make-variable *maxima-ring* (length vars) pos (caddr expr))))
1953 ((not (and (integerp (caddr expr)) (plusp (caddr expr))))
1954 ;; Negative power means division in coefficient ring
1955 ;; Non-integer power means non-polynomial coefficient
1956 (mtell "~%Warning: Expression ~%~M~%contains power which is not a positive integer. Parsing as coefficient.~%"
1957 expr)
1958 (coerce-coeff *maxima-ring* expr vars))
1959 (t (poly-expt *maxima-ring* (parse (cadr expr)) (caddr expr)))))
1960 (mrat (parse ($ratdisrep expr)))
1961 (mpois (parse ($outofpois expr)))
1962 (otherwise
1963 (coerce-coeff *maxima-ring* expr vars)))))))
1964
1965(defun parse-poly-list (expr vars)
1966 (case (caar expr)
1967 (mlist (mapcar #'(lambda (p) (parse-poly p vars)) (cdr expr)))
1968 (t (merror "Expression ~M is not a list of polynomials in variables ~M."
1969 expr vars))))
1970(defun parse-poly-list-list (poly-list-list vars)
1971 (mapcar #'(lambda (g) (parse-poly-list g vars)) (coerce-maxima-list poly-list-list)))
1972
1973
1974
1975;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1976;;
1977;; Order utilities
1978;;
1979;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
1980(defun find-order (order)
1981 "This function returns the order function bases on its name."
1982 (cond
1983 ((null order) nil)
1984 ((symbolp order)
1985 (case order
1986 ((lex :lex $lex) #'lex>)
1987 ((grlex :grlex $grlex) #'grlex>)
1988 ((grevlex :grevlex $grevlex) #'grevlex>)
1989 ((invlex :invlex $invlex) #'invlex>)
1990 ((elimination-order-1 :elimination-order-1 elimination_order_1) #'elimination-order-1)
1991 (otherwise
1992 (mtell "~%Warning: Order ~M not found. Using default.~%" order))))
1993 (t
1994 (mtell "~%Order specification ~M is not recognized. Using default.~%" order)
1995 nil)))
1996
1997(defun find-ring (ring)
1998 "This function returns the ring structure bases on input symbol."
1999 (cond
2000 ((null ring) nil)
2001 ((symbolp ring)
2002 (case ring
2003 ((expression-ring :expression-ring $expression_ring) *expression-ring*)
2004 ((ring-of-integers :ring-of-integers $ring_of_integers) *ring-of-integers*)
2005 (otherwise
2006 (mtell "~%Warning: Ring ~M not found. Using default.~%" ring))))
2007 (t
2008 (mtell "~%Ring specification ~M is not recognized. Using default.~%" ring)
2009 nil)))
2010
2011(defmacro with-monomial-order ((order) &body body)
2012 "Evaluate BODY with monomial order set to ORDER."
2013 `(let ((*monomial-order* (or (find-order ,order) *monomial-order*)))
2014 . ,body))
2015
2016(defmacro with-coefficient-ring ((ring) &body body)
2017 "Evaluate BODY with coefficient ring set to RING."
2018 `(let ((*maxima-ring* (or (find-ring ,ring) *maxima-ring*)))
2019 . ,body))
2020
2021(defmacro with-elimination-orders ((primary secondary elimination-order)
2022 &body body)
2023 "Evaluate BODY with primary and secondary elimination orders set to PRIMARY and SECONDARY."
2024 `(let ((*primary-elimination-order* (or (find-order ,primary) *primary-elimination-order*))
2025 (*secondary-elimination-order* (or (find-order ,secondary) *secondary-elimination-order*))
2026 (*elimination-order* (or (find-order ,elimination-order) *elimination-order*)))
2027 . ,body))
2028
2029
2030
2031;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
2032;;
2033;; Conversion from internal form to Maxima general form
2034;;
2035;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
2036
2037(defun maxima-head ()
2038 (if $poly_return_term_list
2039 '(mlist)
2040 '(mplus)))
2041
2042(defun coerce-to-maxima (poly-type object vars)
2043 (case poly-type
2044 (:polynomial
2045 `(,(maxima-head) ,@(mapcar #'(lambda (term) (coerce-to-maxima :term term vars)) (poly-termlist object))))
2046 (:poly-list
2047 `((mlist) ,@(mapcar #'(lambda (p) ($ratdisrep (coerce-to-maxima :polynomial p vars))) object)))
2048 (:term
2049 `((mtimes) ,($ratdisrep (term-coeff object))
2050 ,@(mapcar #'(lambda (var power) `((mexpt) ,var ,power))
2051 vars (monom-exponents (term-monom object)))))
2052 ;; Assumes that Lisp and Maxima logicals coincide
2053 (:logical object)
2054 (otherwise
2055 object)))
2056
2057
2058
2059;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
2060;;
2061;; Macro facility for writing Maxima-level wrappers for
2062;; functions operating on internal representation
2063;;
2064;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
2065
2066(defmacro with-parsed-polynomials (((maxima-vars &optional (maxima-new-vars nil new-vars-supplied-p))
2067 &key (polynomials nil)
2068 (poly-lists nil)
2069 (poly-list-lists nil)
2070 (value-type nil))
2071 &body body
2072 &aux (vars (gensym))
2073 (new-vars (gensym)))
2074 `(let ((,vars (coerce-maxima-list ,maxima-vars))
2075 ,@(when new-vars-supplied-p
2076 (list `(,new-vars (coerce-maxima-list ,maxima-new-vars)))))
2077 (coerce-to-maxima
2078 ,value-type
2079 (with-coefficient-ring ($poly_coefficient_ring)
2080 (with-monomial-order ($poly_monomial_order)
2081 (with-elimination-orders ($poly_primary_elimination_order
2082 $poly_secondary_elimination_order
2083 $poly_elimination_order)
2084 (let ,(let ((args nil))
2085 (dolist (p polynomials args)
2086 (setf args (cons `(,p (parse-poly ,p ,vars)) args)))
2087 (dolist (p poly-lists args)
2088 (setf args (cons `(,p (parse-poly-list ,p ,vars)) args)))
2089 (dolist (p poly-list-lists args)
2090 (setf args (cons `(,p (parse-poly-list-list ,p ,vars)) args))))
2091 . ,body))))
2092 ,(if new-vars-supplied-p
2093 `(append ,vars ,new-vars)
2094 vars))))
2095
2096(defmacro define-unop (maxima-name fun-name
2097 &optional (documentation nil documentation-supplied-p))
2098 "Define a MAXIMA-level unary operator MAXIMA-NAME corresponding to unary function FUN-NAME."
2099 `(defun ,maxima-name (p vars
2100 &aux
2101 (vars (coerce-maxima-list vars))
2102 (p (parse-poly p vars)))
2103 ,@(when documentation-supplied-p (list documentation))
2104 (coerce-to-maxima :polynomial (,fun-name *maxima-ring* p) vars)))
2105
2106(defmacro define-binop (maxima-name fun-name
2107 &optional (documentation nil documentation-supplied-p))
2108 "Define a MAXIMA-level binary operator MAXIMA-NAME corresponding to binary function FUN-NAME."
2109 `(defmfun ,maxima-name (p q vars
2110 &aux
2111 (vars (coerce-maxima-list vars))
2112 (p (parse-poly p vars))
2113 (q (parse-poly q vars)))
2114 ,@(when documentation-supplied-p (list documentation))
2115 (coerce-to-maxima :polynomial (,fun-name *maxima-ring* p q) vars)))
2116
2117
2118
2119;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
2120;;
2121;; Maxima-level interface functions
2122;;
2123;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;
2124
2125;; Auxillary function for removing zero polynomial
2126(defun remzero (plist) (remove #'poly-zerop plist))
2127
2128;;Simple operators
2129
2130(define-binop $poly_add poly-add
2131 "Adds two polynomials P and Q")
2132
2133(define-binop $poly_subtract poly-sub
2134 "Subtracts a polynomial Q from P.")
2135
2136(define-binop $poly_multiply poly-mul
2137 "Returns the product of polynomials P and Q.")
2138
2139(define-binop $poly_s_polynomial spoly
2140 "Returns the syzygy polynomial (S-polynomial) of two polynomials P and Q.")
2141
2142(define-unop $poly_primitive_part poly-primitive-part
2143 "Returns the polynomial P divided by GCD of its coefficients.")
2144
2145(define-unop $poly_normalize poly-normalize
2146 "Returns the polynomial P divided by the leading coefficient.")
2147
2148;;Functions
2149
2150(defmfun $poly_expand (p vars)
2151 "This function is equivalent to EXPAND(P) if P parses correctly to a polynomial.
2152If the representation is not compatible with a polynomial in variables VARS,
2153the result is an error."
2154 (with-parsed-polynomials ((vars) :polynomials (p)
2155 :value-type :polynomial)
2156 p))
2157
2158(defmfun $poly_expt (p n vars)
2159 (with-parsed-polynomials ((vars) :polynomials (p) :value-type :polynomial)
2160 (poly-expt *maxima-ring* p n)))
2161
2162(defmfun $poly_content (p vars)
2163 (with-parsed-polynomials ((vars) :polynomials (p))
2164 (poly-content *maxima-ring* p)))
2165
2166(defmfun $poly_pseudo_divide (f fl vars
2167 &aux (vars (coerce-maxima-list vars))
2168 (f (parse-poly f vars))
2169 (fl (parse-poly-list fl vars)))
2170 (multiple-value-bind (quot rem c division-count)
2171 (poly-pseudo-divide *maxima-ring* f fl)
2172 `((mlist)
2173 ,(coerce-to-maxima :poly-list quot vars)
2174 ,(coerce-to-maxima :polynomial rem vars)
2175 ,c
2176 ,division-count)))
2177
2178(defmfun $poly_exact_divide (f g vars)
2179 (with-parsed-polynomials ((vars) :polynomials (f g) :value-type :polynomial)
2180 (poly-exact-divide *maxima-ring* f g)))
2181
2182(defmfun $poly_normal_form (f fl vars)
2183 (with-parsed-polynomials ((vars) :polynomials (f)
2184 :poly-lists (fl)
2185 :value-type :polynomial)
2186 (normal-form *maxima-ring* f (remzero fl) nil)))
2187
2188(defmfun $poly_buchberger_criterion (g vars)
2189 (with-parsed-polynomials ((vars) :poly-lists (g) :value-type :logical)
2190 (buchberger-criterion *maxima-ring* g)))
2191
2192(defmfun $poly_buchberger (fl vars)
2193 (with-parsed-polynomials ((vars) :poly-lists (fl) :value-type :poly-list)
2194 (buchberger *maxima-ring* (remzero fl) 0 nil)))
2195
2196(defmfun $poly_reduction (plist vars)
2197 (with-parsed-polynomials ((vars) :poly-lists (plist)
2198 :value-type :poly-list)
2199 (reduction *maxima-ring* plist)))
2200
2201(defmfun $poly_minimization (plist vars)
2202 (with-parsed-polynomials ((vars) :poly-lists (plist)
2203 :value-type :poly-list)
2204 (minimization plist)))
2205
2206(defmfun $poly_normalize_list (plist vars)
2207 (with-parsed-polynomials ((vars) :poly-lists (plist)
2208 :value-type :poly-list)
2209 (poly-normalize-list *maxima-ring* plist)))
2210
2211(defmfun $poly_grobner (f vars)
2212 (with-parsed-polynomials ((vars) :poly-lists (f)
2213 :value-type :poly-list)
2214 (grobner *maxima-ring* (remzero f))))
2215
2216(defmfun $poly_reduced_grobner (f vars)
2217 (with-parsed-polynomials ((vars) :poly-lists (f)
2218 :value-type :poly-list)
2219 (reduced-grobner *maxima-ring* (remzero f))))
2220
2221(defmfun $poly_depends_p (p var mvars
2222 &aux (vars (coerce-maxima-list mvars))
2223 (pos (position var vars)))
2224 (if (null pos)
2225 (merror "~%Variable ~M not in the list of variables ~M." var mvars)
2226 (poly-depends-p (parse-poly p vars) pos)))
2227
2228(defmfun $poly_elimination_ideal (flist k vars)
2229 (with-parsed-polynomials ((vars) :poly-lists (flist)
2230 :value-type :poly-list)
2231 (elimination-ideal *maxima-ring* flist k nil 0)))
2232
2233(defmfun $poly_colon_ideal (f g vars)
2234 (with-parsed-polynomials ((vars) :poly-lists (f g) :value-type :poly-list)
2235 (colon-ideal *maxima-ring* f g nil)))
2236
2237(defmfun $poly_ideal_intersection (f g vars)
2238 (with-parsed-polynomials ((vars) :poly-lists (f g) :value-type :poly-list)
2239 (ideal-intersection *maxima-ring* f g nil)))
2240
2241(defmfun $poly_lcm (f g vars)
2242 (with-parsed-polynomials ((vars) :polynomials (f g) :value-type :polynomial)
2243 (poly-lcm *maxima-ring* f g)))
2244
2245(defmfun $poly_gcd (f g vars)
2246 ($first ($divide (m* f g) ($poly_lcm f g vars))))
2247
2248(defmfun $poly_grobner_equal (g1 g2 vars)
2249 (with-parsed-polynomials ((vars) :poly-lists (g1 g2))
2250 (grobner-equal *maxima-ring* g1 g2)))
2251
2252(defmfun $poly_grobner_subsetp (g1 g2 vars)
2253 (with-parsed-polynomials ((vars) :poly-lists (g1 g2))
2254 (grobner-subsetp *maxima-ring* g1 g2)))
2255
2256(defmfun $poly_grobner_member (p g vars)
2257 (with-parsed-polynomials ((vars) :polynomials (p) :poly-lists (g))
2258 (grobner-member *maxima-ring* p g)))
2259
2260(defmfun $poly_ideal_saturation1 (f p vars)
2261 (with-parsed-polynomials ((vars) :poly-lists (f) :polynomials (p)
2262 :value-type :poly-list)
2263 (ideal-saturation-1 *maxima-ring* f p 0)))
2264
2265(defmfun $poly_saturation_extension (f plist vars new-vars)
2266 (with-parsed-polynomials ((vars new-vars)
2267 :poly-lists (f plist)
2268 :value-type :poly-list)
2269 (saturation-extension *maxima-ring* f plist)))
2270
2271(defmfun $poly_polysaturation_extension (f plist vars new-vars)
2272 (with-parsed-polynomials ((vars new-vars)
2273 :poly-lists (f plist)
2274 :value-type :poly-list)
2275 (polysaturation-extension *maxima-ring* f plist)))
2276
2277(defmfun $poly_ideal_polysaturation1 (f plist vars)
2278 (with-parsed-polynomials ((vars) :poly-lists (f plist)
2279 :value-type :poly-list)
2280 (ideal-polysaturation-1 *maxima-ring* f plist 0 nil)))
2281
2282(defmfun $poly_ideal_saturation (f g vars)
2283 (with-parsed-polynomials ((vars) :poly-lists (f g)
2284 :value-type :poly-list)
2285 (ideal-saturation *maxima-ring* f g 0 nil)))
2286
2287(defmfun $poly_ideal_polysaturation (f ideal-list vars)
2288 (with-parsed-polynomials ((vars) :poly-lists (f)
2289 :poly-list-lists (ideal-list)
2290 :value-type :poly-list)
2291 (ideal-polysaturation *maxima-ring* f ideal-list 0 nil)))
2292
2293(defmfun $poly_lt (f vars)
2294 (with-parsed-polynomials ((vars) :polynomials (f) :value-type :polynomial)
2295 (make-poly-from-termlist (list (poly-lt f)))))
2296
2297(defmfun $poly_lm (f vars)
2298 (with-parsed-polynomials ((vars) :polynomials (f) :value-type :polynomial)
2299 (make-poly-from-termlist (list (make-term (poly-lm f) (funcall (ring-unit *maxima-ring*)))))))
2300
Note: See TracBrowser for help on using the repository browser.