chiark / gitweb /
ff339eb772671f75a6212eaf540c9cb1eeeeddc1
[clg] / gffi / virtual-slots.lisp
1 ;; Common Lisp bindings for GTK+ v2.x
2 ;; Copyright 2000-2006 Espen S. Johnsen <espen@users.sf.net>
3 ;;
4 ;; Permission is hereby granted, free of charge, to any person obtaining
5 ;; a copy of this software and associated documentation files (the
6 ;; "Software"), to deal in the Software without restriction, including
7 ;; without limitation the rights to use, copy, modify, merge, publish,
8 ;; distribute, sublicense, and/or sell copies of the Software, and to
9 ;; permit persons to whom the Software is furnished to do so, subject to
10 ;; the following conditions:
11 ;;
12 ;; The above copyright notice and this permission notice shall be
13 ;; included in all copies or substantial portions of the Software.
14 ;;
15 ;; THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND,
16 ;; EXPRESS OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF
17 ;; MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT.
18 ;; IN NO EVENT SHALL THE AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY
19 ;; CLAIM, DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT,
20 ;; TORT OR OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE
21 ;; SOFTWARE OR THE USE OR OTHER DEALINGS IN THE SOFTWARE.
22
23 ;; $Id: virtual-slots.lisp,v 1.8 2007-06-01 06:46:06 espen Exp $
24
25 (in-package "GFFI")
26
27 ;;;; Superclass for all metaclasses implementing some sort of virtual slots
28
29 (defclass virtual-slots-class (standard-class) 
30   ())
31
32 (defclass direct-virtual-slot-definition (standard-direct-slot-definition)
33   ((setter :reader slot-definition-setter :initarg :setter)
34    (getter :reader slot-definition-getter :initarg :getter)
35    (unbound :reader slot-definition-unbound :initarg :unbound)
36    (boundp :reader slot-definition-boundp :initarg :boundp)
37    (makunbound :reader slot-definition-makunbound :initarg :makunbound)
38    #+clisp(type :initarg :type :reader slot-definition-type)))
39   
40 (defclass effective-virtual-slot-definition (standard-effective-slot-definition)
41   ((setter :reader slot-definition-setter :initarg :setter)
42    (getter :reader slot-definition-getter :initarg :getter)
43    (unbound :reader slot-definition-unbound :initarg :unbound)
44    (boundp :reader slot-definition-boundp :initarg :boundp)
45    (makunbound :reader slot-definition-makunbound :initarg :makunbound)
46    #+clisp(reader-function)
47    #+clisp(writer-function)
48    #+clisp(boundp-function)
49    makunbound-function
50    #+clisp(type :initarg :type :reader slot-definition-type)))
51
52 (defclass direct-special-slot-definition (standard-direct-slot-definition)
53   ((special :initarg :special :accessor slot-definition-special)))
54
55 (defclass effective-special-slot-definition (standard-effective-slot-definition)
56   ((special :initarg :special :accessor slot-definition-special)))
57
58 (defclass virtual-slots-object (standard-object)
59   ())
60
61 (defgeneric slot-readable-p (slotd))
62 (defgeneric slot-writable-p (slotd))
63 (defgeneric compute-slot-reader-function (slotd &optional signal-unbound-p))
64 (defgeneric compute-slot-boundp-function (slotd))
65 (defgeneric compute-slot-writer-function (slotd))
66 (defgeneric compute-slot-makunbound-function (slotd))
67
68 (defmethod slot-readable-p ((slotd standard-effective-slot-definition))
69   (declare (ignore slotd))
70   t)
71
72 (defmethod slot-writable-p ((slotd standard-effective-slot-definition))
73   (declare (ignore slotd))
74   t)
75
76
77 #+clisp
78 (defmethod slot-definition-type ((slotd t))
79   (clos:slot-definition-type slotd))
80
81
82 (defmethod direct-slot-definition-class ((class virtual-slots-class) &rest initargs)
83   (cond
84    ((eq (getf initargs :allocation) :virtual)
85     (find-class 'direct-virtual-slot-definition))
86    ((getf initargs :special)
87     (find-class 'direct-special-slot-definition))
88    (t (call-next-method))))
89
90 (defmethod effective-slot-definition-class ((class virtual-slots-class) &rest initargs)
91   (cond
92    ((eq (getf initargs :allocation) :virtual)
93     (find-class 'effective-virtual-slot-definition))
94    ((getf initargs :special)
95     (find-class 'effective-special-slot-definition))
96    (t (call-next-method))))
97
98
99 (defmethod slot-readable-p ((slotd effective-virtual-slot-definition))
100   (slot-boundp slotd 'getter))
101
102 (define-condition unreadable-slot (cell-error)
103   ((instance :reader unreadable-slot-instance :initarg :instance))
104   (:report (lambda (condition stream)
105              (format stream "~@<The slot ~S in the object ~S is not readable.~@:>"
106               (cell-error-name condition)
107               (unreadable-slot-instance condition)))))
108
109 (defmethod compute-slot-reader-function :around ((slotd effective-virtual-slot-definition) &optional (signal-unbound-p t))
110   (if (not (slot-readable-p slotd))
111       #'(lambda (object)
112           (error 'unreadable-slot :name (slot-definition-name slotd) :instance object))
113     (let ((reader-function (call-next-method)))
114       (cond
115        ;; Don't create wrapper to signal unbound value
116        ((not signal-unbound-p) reader-function)
117        
118        ;; An explicit boundp function has been supplied
119        ((slot-boundp slotd 'boundp) 
120         (let ((boundp (slot-value slotd 'boundp)))
121           #'(lambda (object)
122               (if (not (funcall boundp object))
123                   (slot-unbound (class-of object) object (slot-definition-name slotd))
124                 (funcall reader-function object)))))
125        
126        ;; A type unbound value exists
127        ((let ((unbound-method (find-applicable-type-method 'unbound-value 
128                                (slot-definition-type slotd) nil)))
129           (when unbound-method
130             (let ((unbound-value (funcall unbound-method (slot-definition-type slotd))))
131               #'(lambda (object)
132                   (let ((value (funcall reader-function object)))
133                     (if (eq value unbound-value)
134                         (slot-unbound (class-of object) object (slot-definition-name slotd))
135                       value)))))))
136        
137        ((let ((boundp-function (compute-slot-boundp-function slotd)))
138           #'(lambda (object)
139               (if (funcall boundp-function object)
140                   (funcall reader-function object)
141                 (slot-unbound (class-of object) object (slot-definition-name slotd))))))))))
142
143 (defmethod compute-slot-reader-function ((slotd effective-virtual-slot-definition) &optional signal-unbound-p)
144   (declare (ignore signal-unbound-p))
145   (let ((getter (slot-value slotd 'getter)))
146     #-sbcl getter
147     #+sbcl
148     (etypecase getter
149       (symbol #'(lambda (object) (funcall getter object)))
150       (function getter))))
151
152 (defmethod compute-slot-boundp-function ((slotd effective-virtual-slot-definition))
153   (cond
154    ;; Non readable slots are not bound per definition
155    ((not (slot-readable-p slotd))
156     #'(lambda (object) (declare (ignore object)) nil))
157
158    ;; An explicit boundp function has been supplied
159    ((slot-boundp slotd 'boundp)
160     (let ((boundp (slot-value slotd 'boundp)))
161       #-sbcl boundp
162       #+sbcl
163       (etypecase boundp
164         (symbol #'(lambda (object) (funcall boundp object)))
165         (function boundp))))
166
167    ;; An unbound value has been supplied
168    ((slot-boundp slotd 'unbound)
169     (let ((reader-function (compute-slot-reader-function slotd nil))
170           (unbound-value (slot-value slotd 'unbound)))
171       #'(lambda (object)
172           (not (eql (funcall reader-function object) unbound-value)))))
173    
174    ;; A type unbound value exists
175    ((let ((unbound-method (find-applicable-type-method 'unbound-value 
176                            (slot-definition-type slotd) nil)))
177       (when unbound-method
178         (let ((reader-function (compute-slot-reader-function slotd nil))
179               (unbound-value (funcall unbound-method (slot-definition-type slotd))))
180           #'(lambda (object)
181               (not (eql (funcall reader-function object) unbound-value)))))))
182    
183    ;; Slot has no unbound state
184    (#'(lambda (object) (declare (ignore object)) t))))
185
186 (defmethod slot-writable-p ((slotd effective-virtual-slot-definition))
187   (slot-boundp slotd 'setter))
188
189 (define-condition unwritable-slot (cell-error)
190   ((instance :reader unwritable-slot-instance :initarg :instance))
191   (:report (lambda (condition stream)
192              (format stream "~@<The slot ~S in the object ~S is not writable.~@:>"
193               (cell-error-name condition)
194               (unwritable-slot-instance condition)))))
195
196 (defmethod compute-slot-writer-function :around ((slotd effective-virtual-slot-definition))
197   (if (not (slot-writable-p slotd))
198       #'(lambda (value object)
199           (declare (ignore value))
200           (error 'unwritable-slot :name (slot-definition-name slotd) :instance object))
201     (call-next-method)))
202
203 (defmethod compute-slot-writer-function ((slotd effective-virtual-slot-definition))
204   (let ((setter (slot-value slotd 'setter)))
205     #-sbcl setter
206     #+sbcl
207     (etypecase setter
208       (symbol #'(lambda (object value) (funcall setter object value)))
209       (list #'(lambda (object value)
210                 (funcall setter value object)))
211       (function setter))))
212
213 (define-condition slot-can-not-be-unbound (cell-error)
214   ((instance :reader slot-can-not-be-unbound-instance :initarg :instance))
215   (:report (lambda (condition stream)
216              (format stream "~@<The slot ~S in the object ~S can not be made unbound.~@:>"
217               (cell-error-name condition)
218               (slot-can-not-be-unbound-instance condition)))))
219
220 (defmethod compute-slot-makunbound-function ((slotd effective-virtual-slot-definition))
221   (cond
222    ((not (slot-writable-p slotd))
223     #'(lambda (object)
224         (error 'unwritable-slot :name (slot-definition-name slotd) :instance object)))
225    ((slot-boundp slotd 'makunbound)
226     (let ((makunbound (slot-value slotd 'makunbound)))
227       #-sbcl makunbound
228       #+sbcl
229       (etypecase makunbound
230         (symbol #'(lambda (object) (funcall makunbound object)))
231         (function makunbound))))
232    ((slot-boundp slotd 'unbound)
233     #'(lambda (object)
234         (funcall (slot-value slotd 'writer-function) (slot-value slotd 'unbound) object)))
235    (t
236     #'(lambda (object)
237         (error 'slot-can-not-be-unbound :name (slot-definition-name slotd) :instance object)))))
238
239
240 #-clisp
241 (defmethod initialize-internal-slot-functions ((slotd effective-virtual-slot-definition))
242   #?-(sbcl>= 0 9 15) ; Delayed to avoid recursive call of finalize-inheritanze
243   (setf 
244    (slot-value slotd 'reader-function) (compute-slot-reader-function slotd)
245    (slot-value slotd 'boundp-function) (compute-slot-boundp-function slotd)
246    (slot-value slotd 'writer-function) (compute-slot-writer-function slotd)
247    (slot-value slotd 'makunbound-function) (compute-slot-makunbound-function slotd))
248
249   #?-(sbcl>= 0 9 8)(initialize-internal-slot-gfs (slot-definition-name slotd)))
250
251
252 #-clisp
253 (defmethod compute-slot-accessor-info ((slotd effective-virtual-slot-definition) type gf)
254   nil)
255
256
257 (defun slot-bound-in-some-p (instances slot)
258   (find-if
259    #'(lambda (ob)
260        (and (slot-exists-p ob slot) (slot-boundp ob slot)))
261    instances))
262
263 (defun most-specific-slot-value (instances slot &optional default)
264   (let ((object (slot-bound-in-some-p instances slot)))
265     (if object
266         (slot-value object slot)
267       default)))
268
269 (defun compute-most-specific-initargs (slotds slots)
270   (loop
271    for slot in slots
272    as (slot-name initarg) = (if (atom slot)
273                                 (list slot (intern (string slot) "KEYWORD"))
274                               slot)
275    when (slot-bound-in-some-p slotds slot-name)
276    nconc (list initarg (most-specific-slot-value slotds slot-name))))
277
278 (defmethod compute-effective-slot-definition-initargs ((class virtual-slots-class) direct-slotds)
279   (typecase (first direct-slotds)
280     (direct-virtual-slot-definition
281      (nconc
282       (compute-most-specific-initargs direct-slotds
283        '(getter setter unbound boundp makunbound
284          #?(or (sbcl>= 0 9 8) (featurep :clisp))
285          (#?-(sbcl>= 0 9 10)type #?(sbcl>= 0 9 10)sb-pcl::%type :type)))
286       (call-next-method)))
287     (direct-special-slot-definition
288      (append '(:special t) (call-next-method)))
289     (t (call-next-method))))
290
291 #?(or (not (sbcl>= 0 9 14)) (featurep :clisp))
292 (defmethod slot-value-using-class
293     ((class virtual-slots-class) (object virtual-slots-object)
294      (slotd effective-virtual-slot-definition))
295     (funcall (slot-value slotd 'reader-function) object))
296
297 #?(or (not (sbcl>= 0 9 14)) (featurep :clisp))
298 (defmethod slot-boundp-using-class
299     ((class virtual-slots-class) (object virtual-slots-object)
300      (slotd effective-virtual-slot-definition))
301     (funcall (slot-value slotd 'boundp-function) object))
302
303 #?(or (not (sbcl>= 0 9 14)) (featurep :clisp))
304 (defmethod (setf slot-value-using-class) 
305     (value (class virtual-slots-class) (object virtual-slots-object)
306      (slotd effective-virtual-slot-definition))
307   (funcall (slot-value slotd 'writer-function) value object))
308
309 (defmethod slot-makunbound-using-class
310     ((class virtual-slots-class) (object virtual-slots-object)
311      (slotd effective-virtual-slot-definition))
312   (funcall (slot-value slotd 'makunbound-function) object))
313
314
315 ;; In CLISP and SBCL (0.9.15 or newler) a class may not have been
316 ;; finalized when update-slots are called. So to avoid the possibility
317 ;; of finalize-instance being called recursivly we have to delay the
318 ;; initialization of slot functions until after an instance has been
319 ;; created.
320 #?(or (sbcl>= 0 9 15) (featurep :clisp))
321 (defmethod slot-unbound (class (slotd effective-virtual-slot-definition) (name (eql 'reader-function)))
322   (declare (ignore class))
323   (setf (slot-value slotd name) (compute-slot-reader-function slotd)))
324
325 #?(or (sbcl>= 0 9 15) (featurep :clisp))
326 (defmethod slot-unbound (class (slotd effective-virtual-slot-definition) (name (eql 'boundp-function)))
327   (declare (ignore class))
328   (setf (slot-value slotd name) (compute-slot-boundp-function slotd)))
329
330 #?(or (sbcl>= 0 9 15) (featurep :clisp))
331 (defmethod slot-unbound (class (slotd effective-virtual-slot-definition) (name (eql 'writer-function)))
332   (declare (ignore class))
333   (setf (slot-value slotd name) (compute-slot-writer-function slotd)))
334
335 #?(or (sbcl>= 0 9 15) (featurep :clisp))
336 (defmethod slot-unbound (class (slotd effective-virtual-slot-definition) (name (eql 'makunbound-function)))
337   (declare (ignore class))
338   (setf (slot-value slotd name) (compute-slot-makunbound-function slotd)))
339
340
341 (defmethod validate-superclass
342     ((class virtual-slots-class) (super standard-class))
343   t)
344
345 (defmethod slot-definition-special ((slotd standard-direct-slot-definition))
346   (declare (ignore slotd))
347   nil)
348
349 (defmethod slot-definition-special ((slotd standard-effective-slot-definition))
350   (declare (ignore slotd))
351   nil)
352
353
354 ;;; To determine if a slot should be initialized with the initform,
355 ;;; CLISP checks whether it is unbound or not. This doesn't work with
356 ;;; virtual slots that does not have an unbound state, so we have to
357 ;;; implement initform initialization in a way similar to how it is
358 ;;; done in PCL.
359 #+clisp
360 (defmethod shared-initialize ((object virtual-slots-object) names &rest initargs)
361   (let* ((class (class-of object))
362          (slotds (class-slots class))
363          (keywords (loop
364                     for args on initargs by #'cddr
365                     collect (first args)))
366          (names
367           (loop
368            for slotd in slotds
369            as name = (slot-definition-name slotd)
370            as initargs = (slot-definition-initargs slotd)
371            as init-p = (and
372                         (or (eq names t) (find name names))
373                         (slot-definition-initfunction slotd)
374                         (not (intersection initargs keywords)))
375            as virtual-p = (typep slotd 'effective-virtual-slot-definition)
376            when (and init-p virtual-p)
377            do (setf 
378                (slot-value-using-class class object slotd)
379                (funcall (slot-definition-initfunction slotd)))
380            when (and init-p (not virtual-p))
381            collect name)))
382
383       (apply #'call-next-method object names initargs)))