chiark / gitweb /
95604ae4dd388356feaa91d391d6ad778881a44c
[sod] / doc / SYMBOLS
1 -----------------------------------------------------------------------------
2 Package `sod'
3
4 builtin.lisp
5   *builtin-module*                              variable
6   make-builtin-module                           function
7
8 c-types-class-impl.lisp
9   c-class-type                                  class
10   c-type-class                                  generic setf
11   cl:class                                      class c-type
12   find-class-type                               function
13   find-sod-class                                function
14   make-class-type                               function
15   record-sod-class                              function
16
17 c-types-impl.lisp
18   cl:*                                          variable function c-type
19   alignas
20   alignas-storage-specifier                     class
21   cl:array                                      class c-type
22   atomic                                        c-type
23   bool                                          c-type
24   c-array-dimensions                            generic
25   c-array-type                                  class
26   c-atomic-type                                 class
27   c-enum-type                                   class
28   c-function-arguments                          generic
29   c-function-keywords                           generic
30   c-function-type                               class
31   c-keyword-function-type                       class
32   c-pointer-type                                class
33   c-struct-type                                 class
34   c-tagged-type-kind                            generic
35   c-type-bool                                   variable
36   c-type-char                                   variable
37   c-type-double                                 variable
38   c-type-double-complex                         variable
39   c-type-double-imaginary                       variable
40   c-type-float                                  variable
41   c-type-float-complex                          variable
42   c-type-float-imaginary                        variable
43   c-type-int                                    variable
44   c-type-long                                   variable
45   c-type-long-double                            variable
46   c-type-long-double-complex                    variable
47   c-type-long-double-imaginary                  variable
48   c-type-long-long                              variable
49   c-type-name                                   generic
50   c-type-ptrdiff-t                              variable
51   c-type-short                                  variable
52   c-type-signed-char                            variable
53   c-type-size-t                                 variable
54   c-type-tag                                    generic
55   c-type-unsigned                               variable
56   c-type-unsigned-char                          variable
57   c-type-unsigned-long                          variable
58   c-type-unsigned-long-long                     variable
59   c-type-unsigned-short                         variable
60   c-type-va-list                                variable
61   c-type-void                                   variable
62   c-type-wchar-t                                variable
63   c-union-type                                  class
64   cl:char                                       function setf c-type parser
65   commentify-argument-names                     function
66   commentify-function-type                      function
67   const-string                                  c-type
68   define-simple-c-type                          macro
69   double                                        c-type
70   double-complex                                c-type
71   double-imaginary                              c-type
72   enum                                          c-type
73   find-simple-c-type                            function
74   cl:float                                      function class c-type
75   float-complex                                 c-type
76   float-imaginary                               c-type
77   fn                                            c-type
78   fun                                           c-type
79   func                                          c-type
80   cl:function                                   function class c-type
81   int                                           c-type
82   kind-c-tagged-type                            generic
83   llong                                         c-type
84   long                                          c-type
85   long-double                                   c-type
86   long-double-complex                           c-type
87   long-double-imaginary                         c-type
88   long-int                                      c-type
89   long-long                                     c-type
90   long-long-int                                 c-type
91   make-array-type                               function
92   make-atomic-type                              function
93   make-c-tagged-type                            function
94   make-enum-type                                function
95   make-function-type                            function
96   make-keyword-function-type                    function
97   make-pointer-type                             function
98   make-simple-type                              function
99   make-struct-type                              function
100   make-union-type                               function
101   merge-keyword-lists                           function
102   cl:nil                                        constant c-type parser
103   pointer                                       c-type
104   pprint-argument-list                          function
105   pprint-c-function-type                        function
106   ptr                                           c-type
107   ptrdiff-t                                     c-type
108   reify-variable-argument-tail                  function
109   cl:schar                                      function setf c-type
110   short                                         c-type
111   short-int                                     c-type
112   signed                                        c-type
113   signed-char                                   c-type
114   signed-int                                    c-type
115   signed-long                                   c-type
116   signed-long-int                               c-type
117   signed-long-long                              c-type
118   signed-long-long-int                          c-type
119   signed-short                                  c-type
120   signed-short-int                              c-type
121   simple-c-type                                 class
122   sint                                          c-type
123   size-t                                        c-type
124   sllong                                        c-type
125   slong                                         c-type
126   specs                                         c-type
127   sshort                                        c-type
128   cl:string                                     function class c-type opthandler
129   struct                                        c-type
130   tagged-c-type                                 class
131   uchar                                         c-type
132   uint                                          c-type
133   ullong                                        c-type
134   ulong                                         c-type
135   cl:union                                      function c-type
136   unsigned                                      c-type
137   unsigned-char                                 c-type
138   unsigned-int                                  c-type
139   unsigned-long                                 c-type
140   unsigned-long-int                             c-type
141   unsigned-long-long                            c-type
142   unsigned-long-long-int                        c-type
143   unsigned-short                                c-type
144   unsigned-short-int                            c-type
145   ushort                                        c-type
146   va-list                                       c-type
147   vec                                           c-type
148   void                                          c-type
149   wchar-t                                       c-type
150   []                                            c-type
151
152 c-types-parse.lisp
153   parse-c-type                                  function
154   parse-declarator                              function
155
156 c-types-proto.lisp
157   argument                                      class
158   argument-default                              function
159   argument-name                                 function
160   argument-type                                 function
161   argumentp                                     function
162   c-name-case                                   function
163   c-qualifier-keyword                           generic
164   c-storage-specifiers-type                     class
165   c-type                                        macro class
166   c-type-alias                                  macro
167   c-type-equal-p                                generic
168   c-type-qualifier-keywords                     function
169   c-type-qualifiers                             generic
170   c-type-space                                  function
171   c-type-specifiers                             generic
172   c-type-subtype                                generic
173   canonify-qualifiers                           function
174   commentify-argument-name                      generic
175   defctype                                      macro
176   define-c-storage-specifier-syntax             macro
177   define-c-type-syntax                          macro
178   expand-c-storage-specifier                    generic
179   expand-c-storage-specifier-form               generic
180   expand-c-type-form                            generic
181   expand-c-type-spec                            generic
182   format-qualifiers                             function
183   make-argument                                 function
184   maybe-in-parens                               macro
185   pprint-c-storage-specifier                    generic
186   pprint-c-type                                 generic
187   print-c-storage-specifier                     generic
188   print-c-type                                  generic
189   qualifiable-c-type                            class
190   qualify-c-type                                generic
191   wrap-c-type                                   function
192
193 class-finalize-impl.lisp
194   c3-cpl                                        function
195   clos-cpl                                      function
196   dylan-cpl                                     function
197   flavors-cpl                                   function
198   l*loops-cpl                                   function
199   merge-class-lists                             function
200   python-cpl                                    function
201   report-class-list-merge-error                 function
202
203 class-finalize-proto.lisp
204   check-class-initializer                       generic
205   check-sod-class                               generic
206   compute-chains                                generic
207   compute-cpl                                   generic
208   finalization-error                            macro
209   finalization-failed                           function
210   finalize-sod-class                            generic
211
212 class-layout-impl.lisp
213   sod-class-effective-slot                      class
214   sod-class-slot                                class
215   sod-slot-initializer-function                 generic
216   sod-slot-prepare-function                     generic
217
218 class-layout-proto.lisp
219   base-offset                                   class
220   base-offset-chain-head                        generic
221   base-offset-class                             generic
222   chain-offset                                  class
223   chain-offset-chain-head                       generic
224   chain-offset-class                            generic
225   chain-offset-target-head                      generic
226   class-pointer                                 class
227   class-pointer-chain-head                      generic
228   class-pointer-class                           generic
229   class-pointer-meta-chain-head                 generic
230   class-pointer-metaclass                       generic
231   compute-effective-slot                        generic
232   compute-ichain                                generic
233   compute-ilayout                               generic
234   compute-islots                                generic
235   compute-vtable                                generic
236   compute-vtable-items                          generic
237   compute-vtables                               generic
238   compute-vtmsgs                                generic
239   effective-slot                                class
240   effective-slot-class                          generic
241   effective-slot-direct-slot                    generic
242   effective-slot-initializer                    generic
243   find-class-initializer                        generic
244   find-slot-initargs                            generic
245   find-slot-initializer                         generic
246   ichain                                        class
247   ichain-body                                   generic
248   ichain-class                                  generic
249   ichain-head                                   generic
250   ichain-tail                                   generic
251   ilayout                                       class
252   ilayout-class                                 generic
253   ilayout-ichains                               generic
254   islots                                        class
255   islots-class                                  generic
256   islots-slots                                  generic
257   islots-subclass                               generic
258   make-base-offset                              generic
259   make-class-pointer                            generic
260   vtable                                        class
261   vtable-body                                   generic
262   vtable-chain-head                             generic
263   vtable-chain-tail                             generic
264   vtable-class                                  generic
265   vtable-pointer                                class
266   vtable-pointer-chain-head                     generic
267   vtable-pointer-chain-tail                     generic
268   vtable-pointer-class                          generic
269   vtmsgs                                        class
270   vtmsgs-chain-head                             generic
271   vtmsgs-chain-tail                             generic
272   vtmsgs-class                                  generic
273   vtmsgs-entries                                generic
274   vtmsgs-subclass                               generic
275
276 class-make-impl.lisp
277   check-method-argument-lists                   function
278   check-method-return-type                      function
279   check-method-return-type-against-message      function
280
281 class-make-proto.lisp
282   check-message-type                            generic
283   check-method-type                             generic
284   guess-metaclass                               generic
285   make-sod-class                                function
286   make-sod-class-initfrag                       generic
287   make-sod-class-initializer                    generic
288   make-sod-class-tearfrag                       generic
289   make-sod-initializer-using-slot               generic
290   make-sod-instance-initializer                 generic
291   make-sod-message                              generic
292   make-sod-method                               generic
293   make-sod-method-using-message                 generic
294   make-sod-slot                                 generic
295   make-sod-slot-initarg                         generic
296   make-sod-slot-initarg-using-slot              generic
297   make-sod-user-initarg                         generic
298   sod-initarg-argument                          generic
299   sod-message-method-class                      generic
300
301 class-output.lisp
302   *instance-class*                              variable
303
304 class-utilities.lisp
305   argument-lists-compatible-p                   function
306   find-class-slot-by-name                       function
307   find-instance-slot-by-name                    function
308   find-message-by-name                          function
309   find-root-metaclass                           function
310   find-root-superclass                          function
311   find-superclass-by-nick                       function
312   ichain-struct-tag                             function
313   ichain-union-tag                              function
314   ilayout-struct-tag                            function
315   inheritance-path-reporter-state               class
316   islots-struct-tag                             function
317   make-inheritance-path-reporter-state          function
318   message-macro-name                            function
319   report-inheritance-path                       function
320   select-minimal-class-property                 function
321   sod-subclass-p                                function
322   valid-name-p                                  function
323   vtable-name                                   function
324   vtable-struct-tag                             function
325   vtable-union-tag                              function
326   vtmsgs-struct-tag                             function
327
328 classes.lisp
329   sod-class                                     class
330   sod-class-chain                               generic
331   sod-class-chain-head                          generic
332   sod-class-chain-link                          generic
333   sod-class-chains                              generic
334   sod-class-class-initializers                  generic setf
335   sod-class-direct-superclasses                 generic
336   sod-class-ilayout                             generic
337   sod-class-initfrags                           generic setf
338   sod-class-initializer                         class
339   sod-class-instance-initializers               generic setf
340   sod-class-messages                            generic setf
341   sod-class-metaclass                           generic
342   sod-class-methods                             generic setf
343   sod-class-name                                generic
344   sod-class-nickname                            generic
345   sod-class-precedence-list                     generic
346   sod-class-slots                               generic setf
347   sod-class-state                               generic
348   sod-class-tearfrags                           generic setf
349   sod-class-type                                generic
350   sod-class-vtables                             generic
351   sod-initarg                                   class
352   sod-initializer                               class
353   sod-initializer-class                         generic
354   sod-initializer-slot                          generic
355   sod-initializer-value                         generic
356   sod-instance-initializer                      class
357   sod-message                                   class
358   sod-message-class                             generic
359   sod-message-name                              generic
360   sod-message-type                              generic
361   sod-method                                    class
362   sod-method-body                               generic
363   sod-method-class                              generic
364   sod-method-message                            generic
365   sod-method-type                               generic
366   sod-slot                                      class
367   sod-slot-class                                generic
368   sod-slot-initarg                              class
369   sod-slot-name                                 generic
370   sod-slot-type                                 generic
371   sod-user-initarg                              class
372
373 codegen-impl.lisp
374   codegen                                       class
375   temporary-argument                            class
376   temporary-function                            function class
377   temporary-variable                            class
378
379 codegen-proto.lisp
380   *null-pointer*                                variable
381   *sod-ap*                                      variable
382   *sod-master-ap*                               variable
383   banner-inst                                   class
384   block-inst                                    class
385   break-inst                                    class
386   call-inst                                     class
387   codegen-add-function                          generic
388   codegen-build-function                        function
389   codegen-functions                             generic setf
390   codegen-pop                                   generic
391   codegen-pop-block                             generic
392   codegen-pop-function                          generic
393   codegen-push                                  generic
394   cond-inst                                     class
395   continue-inst                                 class
396   convert-stmts                                 function
397   definst                                       macro
398   deliver-call                                  function
399   deliver-expr                                  function
400   do-while-inst                                 class
401   emit-banner                                   function
402   emit-decl                                     generic
403   emit-decls                                    generic
404   emit-inst                                     generic
405   emit-insts                                    generic
406   ensure-var                                    generic
407   expr-inst                                     class
408   for-inst                                      class
409   format-banner-comment                         function
410   format-compound-statement                     macro
411   format-temporary-name                         generic
412   function-inst                                 class
413   if-inst                                       class
414   inst                                          class
415   inst-alt                                      generic
416   inst-args                                     generic
417   inst-banner                                   generic
418   inst-banner-args                              generic
419   inst-body                                     generic
420   inst-cond                                     generic
421   inst-conseq                                   generic
422   inst-control                                  generic
423   inst-decls                                    generic
424   inst-expr                                     generic
425   inst-func                                     generic
426   inst-init                                     generic
427   inst-metric                                   generic
428   inst-name                                     generic
429   inst-op                                       generic
430   inst-type                                     generic
431   inst-update                                   generic
432   inst-var                                      generic
433   make-banner-inst                              function
434   make-block-inst                               function
435   make-break-inst                               function
436   make-call-inst                                function
437   make-cond-inst                                function
438   make-continue-inst                            function
439   make-do-while-inst                            function
440   make-expr-inst                                function
441   make-for-inst                                 function
442   make-function-inst                            function
443   make-if-inst                                  function
444   make-return-inst                              function
445   make-set-inst                                 function
446   make-update-inst                              function
447   make-var-inst                                 function
448   make-while-inst                               function
449   return-inst                                   class
450   set-inst                                      class
451   temp-tag                                      generic
452   temporary-name                                class
453   temporary-var                                 generic
454   update-inst                                   class
455   var-in-use-p                                  generic setf
456   var-inst                                      class
457   while-inst                                    class
458   with-temporary-var                            macro
459
460 final.lisp
461   *debugout-pathname*                           variable
462   *sod-version*                                 variable
463   exercise                                      function
464   test-module                                   function
465   test-parse-c-type                             function
466   test-parse-pset                               function
467   test-parser                                   macro
468
469 fragment-parse.lisp
470   parse-delimited-fragment                      function
471   scan-c-fragment                               function
472
473 lexer-proto.lisp
474   define-indicator                              function
475   cl:error                                      function class parser
476   lexer-error                                   function class
477   must                                          parser
478   scan-comment                                  function
479   skip-until                                    parser
480   sod-token-scanner                             class
481   syntax-error                                  function class
482
483 method-aggregate.lisp
484   aggregating-effective-method                  class
485   aggregating-message                           class
486   aggregating-message-properties                generic
487   check-aggregating-message-type                generic
488   compute-aggregating-message-kernel            generic
489   define-aggregating-method-combination         macro
490   sod-message-combination                       generic
491   sod-message-kernel-function                   generic
492
493 method-impl.lisp
494   basic-direct-method                           class
495   basic-effective-method                        class
496   basic-effective-method-body                   function
497   basic-message                                 class
498   daemon-direct-method                          class
499   delegating-direct-method                      class
500   effective-method-after-methods                generic
501   effective-method-around-methods               generic
502   effective-method-before-methods               generic
503   simple-effective-method                       class
504   simple-message                                class
505   sod-method-role                               generic
506   standard-effective-method                     class
507   standard-message                              class
508
509 method-proto.lisp
510   codegen-class                                 generic
511   codegen-message                               generic
512   codegen-method                                generic
513   codegen-target                                generic
514   compute-effective-method-body                 generic
515   compute-effective-method-keyword-arguments    function
516   compute-effective-methods                     generic
517   compute-method-entry-functions                generic
518   compute-sod-effective-method                  generic
519   convert-to-ilayout-inst                       class
520   effective-method                              class
521   effective-method-basic-argument-names         generic
522   effective-method-class                        generic
523   effective-method-function-name                generic
524   effective-method-keywords                     generic
525   effective-method-live-p                       generic
526   effective-method-message                      generic
527   ensure-ilayout-var                            function
528   inst-chain-head                               generic
529   inst-class                                    generic
530   inst-expr                                     generic
531   invoke-delegation-chain                       function
532   invoke-method                                 function
533   keyword-message-p                             function
534   make-convert-to-ilayout-inst                  function
535   make-method-entries                           generic
536   make-trampoline                               function
537   method-codegen                                class
538   method-entry                                  class
539   method-entry-chain-head                       generic
540   method-entry-chain-tail                       generic
541   method-entry-effective-method                 generic
542   method-entry-function-name                    generic
543   method-entry-function-type                    generic
544   method-entry-slot-name                        generic
545   primary-method-class                          generic
546   simple-method-body                            generic
547   sod-message-applicable-methods                generic
548   sod-message-argument-tail                     generic
549   sod-message-effective-method-class            generic
550   sod-message-keyword-argument-lists            generic
551   sod-method-description                        generic
552   sod-method-function-name                      generic
553   sod-method-function-type                      generic
554   sod-method-next-method-type                   generic
555   varargs-message-p                             function
556
557 module-impl.lisp
558   *module-dirs*                                 variable
559   c-fragment                                    class
560   c-fragment-text                               generic
561   code-fragment                                 generic
562   code-fragment-constraints                     generic
563   code-fragment-item                            class
564   code-fragment-name                            generic
565   code-fragment-reason                          generic
566   find-file                                     function
567   type-item                                     class
568
569 module-output.lisp
570   banner                                        function
571   declare-output-type                           function
572   guard-name                                    function
573   one-off-output                                function
574   output-module                                 function
575   output-type-pathname                          function
576
577 module-parse.lisp
578   class-item
579   read-module                                   function
580
581 module-proto.lisp
582   *module*                                      variable
583   add-clear-the-decks-function                  function
584   add-module-binding                            function
585   add-to-module                                 generic
586   clear-the-decks                               function
587   define-clear-the-decks                        macro
588   define-module                                 macro
589   define-module-var                             macro
590   finalize-module                               generic
591   module                                        class
592   module-dependencies                           generic setf
593   module-errors                                 generic
594   module-import                                 generic
595   module-items                                  generic setf
596   module-name                                   generic
597   module-pset                                   generic
598   with-module-environment                       macro
599   with-temporary-module                         macro
600
601 output-proto.lisp
602   add-sequencer-constraint                      generic
603   add-sequencer-item-function                   generic
604   ensure-sequencer-item                         generic
605   hook-output                                   generic
606   invoke-sequencer-items                        generic
607   make-sequencer-item                           function
608   sequence-output                               macro
609   sequencer                                     class
610   sequencer-constraints                         generic setf
611   sequencer-item                                class
612   sequencer-item-functions                      function setf
613   sequencer-item-name                           function
614   sequencer-item-p                              function
615   sequencer-table                               generic
616
617 pset-parse.lisp
618   parse-property                                function
619   parse-property-set                            function
620
621 pset-proto.lisp
622   add-property                                  function
623   check-unused-properties                       function
624   coerce-property-value                         generic
625   decode-property                               generic
626   default-slot-from-property                    macro
627   get-property                                  function
628   make-property                                 function
629   make-property-set                             function
630   make-pset                                     function
631   p-key                                         function
632   p-name                                        function
633   p-seenp                                       function setf
634   p-type                                        function
635   p-value                                       function
636   property                                      class
637   property-key                                  function
638   property-set                                  generic
639   propertyp                                     function
640   pset                                          class
641   pset-get                                      function
642   pset-map                                      function
643   pset-store                                    function
644   psetp                                         function
645   store-property                                function
646   with-pset-iterator                            macro
647
648 Classes:
649 cl:t
650   sb-pcl::slot-object
651     cl:condition
652       sod-parser:condition-with-location
653         sod-parser:error-with-location [cl:error]
654           sod-parser:base-lexer-error
655             lexer-error [sod-parser:parser-error]
656           sod-parser:base-syntax-error
657             syntax-error [sod-parser:parser-error]
658       cl:serious-condition
659         cl:error
660           sod-parser:error-with-location [sod-parser:condition-with-location]
661             sod-parser:base-lexer-error
662               lexer-error [sod-parser:parser-error]
663             sod-parser:base-syntax-error
664               syntax-error [sod-parser:parser-error]
665           sod-parser:parser-error
666             lexer-error [sod-parser:base-lexer-error]
667             syntax-error [sod-parser:base-syntax-error]
668     cl:standard-object
669       alignas-storage-specifier
670       base-offset
671       sod::basic-codegen
672         codegen
673           method-codegen
674       c-fragment
675       c-type
676         c-array-type
677         c-function-type
678           c-keyword-function-type
679         c-storage-specifiers-type
680         qualifiable-c-type
681           c-atomic-type
682           c-pointer-type
683           simple-c-type
684             c-class-type
685           tagged-c-type
686             c-enum-type
687             c-struct-type
688             c-union-type
689       chain-offset
690       class-pointer
691       code-fragment-item
692       sb-pcl::definition-source-mixin
693         cl:class [sb-pcl::dependent-update-mixin sb-pcl::standard-specializer]
694       effective-method
695         basic-effective-method
696           simple-effective-method
697             aggregating-effective-method
698             standard-effective-method
699       effective-slot
700         sod-class-effective-slot
701       ichain
702       ilayout
703       inheritance-path-reporter-state
704       inst
705         banner-inst
706         block-inst
707         break-inst
708         call-inst
709         cond-inst
710         continue-inst
711         convert-to-ilayout-inst
712         do-while-inst
713         expr-inst
714         for-inst
715         function-inst
716         if-inst
717         return-inst
718         set-inst
719         update-inst
720         var-inst
721         while-inst
722       islots
723       sb-mop:metaobject
724         sb-mop:specializer
725           sb-pcl::standard-specializer
726             cl:class [sb-pcl::dependent-update-mixin sb-pcl::definition-source-mixin]
727       method-entry
728       module
729       sb-pcl::plist-mixin
730         sb-pcl::dependent-update-mixin
731           cl:class [sb-pcl::definition-source-mixin sb-pcl::standard-specializer]
732       sequencer
733       sod-class
734       sod-initarg
735         sod-slot-initarg
736         sod-user-initarg
737       sod-initializer
738         sod-class-initializer
739         sod-instance-initializer
740       sod-message
741         basic-message
742           simple-message
743             aggregating-message
744             standard-message
745       sod-method
746         basic-direct-method
747           daemon-direct-method
748           delegating-direct-method
749       sod-slot
750         sod-class-slot
751       temporary-name
752         temporary-argument
753         temporary-function
754         temporary-variable
755       sod-parser:token-scanner
756         sod-token-scanner
757       type-item
758       vtable
759       vtable-pointer
760       vtmsgs
761     cl:structure-object
762       argument
763       property
764       pset
765       sequencer-item
766
767 Methods:
768 add-sequencer-constraint
769   sequencer cl:list
770 add-sequencer-item-function
771   sequencer t t
772 add-to-module
773   module t
774 aggregating-message-properties
775   t t
776   aggregating-message (eql :custom)
777 base-offset-chain-head
778   base-offset
779 base-offset-class
780   base-offset
781 c-array-dimensions
782   c-array-type
783 c-fragment-text
784   c-fragment
785 c-function-arguments
786   c-function-type
787 c-function-keywords
788   c-keyword-function-type
789 c-qualifier-keyword
790   (eql :atomic)
791   cl:symbol
792 c-tagged-type-kind
793   c-enum-type
794   c-struct-type
795   c-union-type
796 c-type-class
797   c-class-type
798 (setf c-type-class)
799   t c-class-type
800 c-type-equal-p
801   t t [and]
802   c-array-type c-array-type [and]
803   c-atomic-type c-atomic-type [and]
804   c-class-type c-class-type [and]
805   c-function-type c-function-type [and]
806   c-keyword-function-type c-keyword-function-type [and]
807   c-pointer-type c-pointer-type [and]
808   c-storage-specifiers-type c-type [:around]
809   c-type c-storage-specifiers-type [:around]
810   qualifiable-c-type qualifiable-c-type [and]
811   simple-c-type simple-c-type [and]
812   tagged-c-type tagged-c-type [and]
813 c-type-name
814   simple-c-type
815 c-type-qualifiers
816   qualifiable-c-type
817 c-type-specifiers
818   c-storage-specifiers-type
819 c-type-subtype
820   c-array-type
821   c-atomic-type
822   c-function-type
823   c-pointer-type
824   c-storage-specifiers-type
825 c-type-tag
826   tagged-c-type
827 chain-offset-chain-head
828   chain-offset
829 chain-offset-class
830   chain-offset
831 chain-offset-target-head
832   chain-offset
833 check-aggregating-message-type
834   t t t
835   aggregating-message (eql :progn) c-function-type
836 check-class-initializer
837   effective-slot sod-class
838   sod-class-effective-slot sod-class
839 check-message-type
840   aggregating-message t
841   sod-message c-function-type
842   sod-message c-type
843 check-method-type
844   daemon-direct-method sod-message c-function-type
845   sod-method aggregating-message c-function-type
846   sod-method sod-message c-function-type
847   sod-method sod-message c-type
848 check-sod-class
849   sod-class
850 class-pointer-chain-head
851   class-pointer
852 class-pointer-class
853   class-pointer
854 class-pointer-meta-chain-head
855   class-pointer
856 class-pointer-metaclass
857   class-pointer
858 code-fragment
859   code-fragment-item
860 code-fragment-constraints
861   code-fragment-item
862 code-fragment-name
863   code-fragment-item
864 code-fragment-reason
865   code-fragment-item
866 codegen-add-function
867   codegen t
868 codegen-class
869   method-codegen
870 codegen-functions
871   codegen
872 (setf codegen-functions)
873   t codegen
874 codegen-message
875   method-codegen
876 codegen-method
877   method-codegen
878 codegen-pop
879   codegen
880 codegen-pop-block
881   t
882 codegen-pop-function
883   t t t
884 codegen-push
885   codegen
886 codegen-target
887   method-codegen
888 coerce-property-value
889   cl:integer (eql :int) (eql :boolean)
890   cl:string (eql :id) (eql :boolean)
891   cl:string (eql :id) (eql :keyword)
892   cl:string (eql :id) (eql :symbol)
893   cl:string (eql :id) (eql :type)
894   cl:string (eql :string) (eql :id)
895   cl:string (eql :string) (eql :keyword)
896   cl:string (eql :string) (eql :symbol)
897   cl:symbol (eql :symbol) (eql :boolean)
898   cl:symbol (eql :symbol) (eql :id)
899   cl:symbol (eql :symbol) (eql :keyword)
900   t t (eql cl:t)
901   t t t
902 commentify-argument-name
903   cl:null
904   t
905   temporary-name
906 compute-aggregating-message-kernel
907   aggregating-message (eql :and) t t t t
908   aggregating-message (eql :custom) t t t t
909   aggregating-message (eql :max) t t t t
910   aggregating-message (eql :min) t t t t
911   aggregating-message (eql :or) t t t t
912   aggregating-message (eql :product) t t t t
913   aggregating-message (eql :progn) t t t t
914   aggregating-message (eql :sum) t t t t
915 compute-chains
916   sod-class
917 compute-cpl
918   sod-class
919 compute-effective-method-body
920   basic-effective-method t t [:around]
921   simple-effective-method t t
922 compute-effective-methods
923   sod-class
924 compute-effective-slot
925   sod-class sod-class-slot
926   sod-class sod-slot
927 compute-ichain
928   sod-class t
929 compute-ilayout
930   sod-class
931 compute-islots
932   sod-class sod-class
933 compute-method-entry-functions
934   basic-effective-method
935   effective-method [:around]
936 compute-sod-effective-method
937   sod-message sod-class
938 compute-vtable
939   sod-class cl:list
940 compute-vtable-items
941   sod-class sod-class sod-class sod-class cl:function
942 compute-vtables
943   sod-class
944 compute-vtmsgs
945   sod-class sod-class sod-class sod-class
946 decode-property
947   cl:character
948   cl:cons
949   cl:function
950   cl:integer
951   cl:string
952   cl:symbol
953   c-type
954   property
955 effective-method-after-methods
956   basic-effective-method
957 effective-method-around-methods
958   basic-effective-method
959 effective-method-basic-argument-names
960   basic-effective-method
961 effective-method-before-methods
962   basic-effective-method
963 effective-method-class
964   effective-method
965 effective-method-function-name
966   effective-method
967 effective-method-keywords
968   effective-method
969 effective-method-live-p
970   aggregating-effective-method
971   sod::lifecycle-effective-method
972   simple-effective-method
973 effective-method-message
974   effective-method
975 effective-slot-class
976   effective-slot
977 effective-slot-direct-slot
978   effective-slot
979 effective-slot-initializer
980   effective-slot
981 emit-decl
982   sod::basic-codegen t
983 emit-decls
984   sod::basic-codegen t
985 emit-inst
986   sod::basic-codegen t
987 emit-insts
988   t t
989   sod::basic-codegen t
990 ensure-sequencer-item
991   sequencer t
992 ensure-var
993   sod::basic-codegen t t
994 expand-c-storage-specifier
995   cl:list
996   cl:symbol
997 expand-c-storage-specifier-form
998   (eql alignas) t
999   (eql sod-parser:lisp) t
1000 expand-c-type-form
1001   (eql cl:*) t
1002   (eql cl:array) t
1003   (eql cl:char) t
1004   (eql cl:class) t
1005   (eql cl:float) t
1006   (eql cl:function) t
1007   (eql cl:nil) t
1008   (eql cl:union) t
1009   (eql atomic) t
1010   (eql bool) t
1011   (eql double) t
1012   (eql double-complex) t
1013   (eql double-imaginary) t
1014   (eql enum) t
1015   (eql float-complex) t
1016   (eql float-imaginary) t
1017   (eql fn) t
1018   (eql fun) t
1019   (eql func) t
1020   (eql int) t
1021   (eql long) t
1022   (eql long-double) t
1023   (eql long-double-complex) t
1024   (eql long-double-imaginary) t
1025   (eql long-long) t
1026   (eql pointer) t
1027   (eql ptr) t
1028   (eql ptrdiff-t) t
1029   (eql short) t
1030   (eql signed-char) t
1031   (eql size-t) t
1032   (eql specs) t
1033   (eql struct) t
1034   (eql unsigned) t
1035   (eql unsigned-char) t
1036   (eql unsigned-long) t
1037   (eql unsigned-long-long) t
1038   (eql unsigned-short) t
1039   (eql va-list) t
1040   (eql vec) t
1041   (eql void) t
1042   (eql wchar-t) t
1043   (eql []) t
1044   (eql sod-parser:lisp) t
1045   cl:string t
1046 expand-c-type-spec
1047   (eql cl:char)
1048   (eql cl:float)
1049   (eql cl:schar)
1050   (eql cl:string)
1051   (eql bool)
1052   (eql const-string)
1053   (eql double)
1054   (eql double-complex)
1055   (eql double-imaginary)
1056   (eql float-complex)
1057   (eql float-imaginary)
1058   (eql int)
1059   (eql llong)
1060   (eql long)
1061   (eql long-double)
1062   (eql long-double-complex)
1063   (eql long-double-imaginary)
1064   (eql long-int)
1065   (eql long-long)
1066   (eql long-long-int)
1067   (eql ptrdiff-t)
1068   (eql short)
1069   (eql short-int)
1070   (eql signed)
1071   (eql signed-char)
1072   (eql signed-int)
1073   (eql signed-long)
1074   (eql signed-long-int)
1075   (eql signed-long-long)
1076   (eql signed-long-long-int)
1077   (eql signed-short)
1078   (eql signed-short-int)
1079   (eql sint)
1080   (eql size-t)
1081   (eql sllong)
1082   (eql slong)
1083   (eql sshort)
1084   (eql uchar)
1085   (eql uint)
1086   (eql ullong)
1087   (eql ulong)
1088   (eql unsigned)
1089   (eql unsigned-char)
1090   (eql unsigned-int)
1091   (eql unsigned-long)
1092   (eql unsigned-long-int)
1093   (eql unsigned-long-long)
1094   (eql unsigned-long-long-int)
1095   (eql unsigned-short)
1096   (eql unsigned-short-int)
1097   (eql ushort)
1098   (eql va-list)
1099   (eql void)
1100   (eql wchar-t)
1101   cl:list
1102   cl:string
1103 sod-parser:file-location
1104   c-fragment
1105   property
1106   sod-class
1107   sod-initarg
1108   sod-initializer
1109   sod-message
1110   sod-method
1111   sod-slot
1112 finalize-module
1113   module
1114 finalize-sod-class
1115   sod-class
1116   sod-class [:around]
1117 find-class-initializer
1118   effective-slot sod-class
1119 find-slot-initargs
1120   sod-class sod-slot
1121 find-slot-initializer
1122   sod-class sod-slot
1123 format-temporary-name
1124   temporary-argument t
1125   temporary-function t
1126   temporary-name t
1127   temporary-variable t
1128 guess-metaclass
1129   sod-class
1130 hook-output
1131   t t t [progn]
1132   base-offset (eql :c) t [progn]
1133   base-offset (eql :h) t [progn]
1134   basic-effective-method (eql :c) t [progn]
1135   chain-offset (eql :c) t [progn]
1136   chain-offset (eql :h) t [progn]
1137   class-pointer (eql :c) t [progn]
1138   class-pointer (eql :h) t [progn]
1139   code-fragment-item t t [progn]
1140   delegating-direct-method (eql :c) t [progn]
1141   effective-slot (eql cl:class) t [progn]
1142   ichain (eql :h) t [progn]
1143   ichain (eql cl:class) t [progn]
1144   ichain (eql ilayout) t [progn]
1145   ichain t t [progn]
1146   ilayout (eql :h) t [progn]
1147   ilayout t t [progn]
1148   islots (eql :h) t [progn]
1149   islots (eql cl:class) t [progn]
1150   islots t t [progn]
1151   method-entry (eql :c) t [progn]
1152   method-entry (eql vtmsgs) t [progn]
1153   module (eql :c) t [progn]
1154   module (eql :h) t [progn]
1155   module t t [progn]
1156   sod-class (eql :c) t [progn]
1157   sod-class (eql :h) t [progn]
1158   sod-class t t [progn]
1159   sod-class-effective-slot (eql cl:class) t [progn]
1160   sod-method (eql :c) t [progn]
1161   sod-method (eql :h) t [progn]
1162   sod-slot (eql islots) t [progn]
1163   vtable (eql :c) t [progn]
1164   vtable (eql :h) t [progn]
1165   vtable t t [progn]
1166   vtable-pointer (eql :h) t [progn]
1167   vtable-pointer (eql cl:class) t [progn]
1168   vtmsgs (eql :c) t [progn]
1169   vtmsgs (eql :h) t [progn]
1170   vtmsgs (eql vtmsgs) t [progn]
1171   vtmsgs t t [progn]
1172 ichain-body
1173   ichain
1174 ichain-class
1175   ichain
1176 ichain-head
1177   ichain
1178 ichain-tail
1179   ichain
1180 ilayout-class
1181   ilayout
1182 ilayout-ichains
1183   ilayout
1184 inst-alt
1185   cond-inst
1186   if-inst
1187 inst-args
1188   banner-inst
1189   call-inst
1190 inst-banner
1191   function-inst
1192 inst-banner-args
1193   function-inst
1194 inst-body
1195   block-inst
1196   do-while-inst
1197   for-inst
1198   function-inst
1199   while-inst
1200 inst-chain-head
1201   convert-to-ilayout-inst
1202 inst-class
1203   convert-to-ilayout-inst
1204 inst-cond
1205   cond-inst
1206   do-while-inst
1207   for-inst
1208   if-inst
1209   while-inst
1210 inst-conseq
1211   cond-inst
1212   if-inst
1213 inst-control
1214   banner-inst
1215 inst-decls
1216   block-inst
1217 inst-expr
1218   convert-to-ilayout-inst
1219   expr-inst
1220   return-inst
1221   set-inst
1222   update-inst
1223 inst-func
1224   call-inst
1225 inst-init
1226   for-inst
1227   var-inst
1228 inst-metric
1229   cl:list
1230   cl:null
1231   t
1232   banner-inst
1233   block-inst
1234   break-inst
1235   call-inst
1236   cond-inst
1237   continue-inst
1238   convert-to-ilayout-inst
1239   do-while-inst
1240   expr-inst
1241   for-inst
1242   function-inst
1243   if-inst
1244   return-inst
1245   set-inst
1246   sod::suppliedp-struct-inst
1247   update-inst
1248   var-inst
1249   while-inst
1250 inst-name
1251   function-inst
1252   var-inst
1253 inst-op
1254   update-inst
1255 inst-type
1256   function-inst
1257   var-inst
1258 inst-update
1259   for-inst
1260 inst-var
1261   set-inst
1262   sod::suppliedp-struct-inst
1263   update-inst
1264 invoke-sequencer-items
1265   sequencer
1266 islots-class
1267   islots
1268 islots-slots
1269   islots
1270 islots-subclass
1271   islots
1272 kind-c-tagged-type
1273   (eql :enum)
1274   (eql :struct)
1275   (eql :union)
1276 make-base-offset
1277   sod-class sod-class
1278 make-class-pointer
1279   sod-class sod-class sod-class sod-class
1280 cl:make-load-form
1281   c-fragment
1282 make-method-entries
1283   basic-effective-method sod-class sod-class
1284 sod-parser:make-scanner-stream
1285   sod-token-scanner
1286 make-sod-class-initfrag
1287   sod-class t t
1288 make-sod-class-initializer
1289   sod-class t t t t
1290 make-sod-class-tearfrag
1291   sod-class t t
1292 make-sod-initializer-using-slot
1293   sod-class sod-slot t t t t
1294 make-sod-instance-initializer
1295   sod-class t t t t
1296 make-sod-message
1297   sod-class t t t
1298 make-sod-method
1299   sod-class t t t t t
1300 make-sod-method-using-message
1301   sod-message sod-class t t t t
1302 make-sod-slot
1303   sod-class t t t
1304 make-sod-slot-initarg
1305   sod-class t t t t
1306 make-sod-slot-initarg-using-slot
1307   sod-class t sod-slot t
1308 make-sod-user-initarg
1309   sod-class t t t
1310 method-entry-chain-head
1311   method-entry
1312 method-entry-chain-tail
1313   method-entry
1314 method-entry-effective-method
1315   method-entry
1316 method-entry-function-name
1317   effective-method sod-class t
1318 method-entry-function-type
1319   method-entry
1320 method-entry-slot-name
1321   method-entry
1322 module-dependencies
1323   module
1324 (setf module-dependencies)
1325   t module
1326 module-errors
1327   module
1328 module-import
1329   t
1330   module
1331   sod-class
1332   type-item
1333 module-items
1334   module
1335 (setf module-items)
1336   t module
1337 module-name
1338   module
1339 module-pset
1340   module
1341 pprint-c-storage-specifier
1342   cl:symbol t
1343   alignas-storage-specifier t
1344 pprint-c-type
1345   t t t [:around]
1346   c-array-type t t
1347   c-atomic-type t t
1348   c-function-type t t
1349   c-keyword-function-type t t
1350   c-pointer-type t t
1351   c-storage-specifiers-type t t
1352   simple-c-type t t
1353   tagged-c-type t t
1354 primary-method-class
1355   simple-message
1356   standard-message
1357 print-c-storage-specifier
1358   t cl:symbol
1359   t t
1360   t alignas-storage-specifier
1361 print-c-type
1362   t c-array-type
1363   t c-atomic-type
1364   t c-class-type
1365   t c-function-type
1366   t c-pointer-type
1367   t c-storage-specifiers-type
1368   t simple-c-type
1369   t tagged-c-type
1370 cl:print-object
1371   banner-inst t
1372   base-offset t
1373   block-inst t
1374   break-inst t
1375   c-fragment t
1376   c-type t
1377   call-inst t
1378   chain-offset t
1379   class-pointer t
1380   cond-inst t
1381   continue-inst t
1382   convert-to-ilayout-inst t
1383   do-while-inst t
1384   effective-method t
1385   effective-slot t
1386   expr-inst t
1387   for-inst t
1388   function-inst t
1389   ichain t
1390   if-inst t
1391   ilayout t
1392   islots t
1393   method-entry t
1394   pset t
1395   return-inst t
1396   sequencer-item t
1397   set-inst t
1398   sod-class t
1399   sod-initializer t
1400   sod-message t
1401   sod-method t
1402   sod-slot t
1403   temporary-name t
1404   update-inst t
1405   var-inst t
1406   vtable t
1407   vtable-pointer t
1408   vtmsgs t
1409   while-inst t
1410 property-set
1411   cl:list
1412   pset
1413 qualify-c-type
1414   qualifiable-c-type t
1415 sod-parser:scanner-token
1416   sod-token-scanner
1417 sequencer-constraints
1418   sequencer
1419 (setf sequencer-constraints)
1420   t sequencer
1421 sequencer-table
1422   sequencer
1423 cl:shared-initialize
1424   aggregating-message t [:before]
1425   basic-direct-method t [:after]
1426   c-function-type t [:after]
1427   c-keyword-function-type t [:after]
1428   effective-method t [:after]
1429   method-codegen t [:after]
1430   module t [:after]
1431   sequencer t
1432   simple-effective-method t [:after]
1433   sod-class t [:after]
1434   sod-class-slot t [:after]
1435   sod-initializer t [:after]
1436   sod-message t [:after]
1437   sod-method t [:after]
1438   sod-slot t [:after]
1439   sod-token-scanner t [:after]
1440 simple-method-body
1441   aggregating-effective-method t t
1442   sod::lifecycle-effective-method t t
1443   standard-effective-method t t
1444 cl:slot-unbound
1445   t basic-direct-method (eql sod::function-type)
1446   t basic-effective-method (eql sod::basic-argument-names)
1447   t basic-effective-method (eql sod::functions)
1448   t basic-message (eql sod::argument-tail)
1449   t delegating-direct-method (eql sod::function-type)
1450   t delegating-direct-method (eql sod::next-method-type)
1451   t sod-class (eql sod::%ilayout)
1452   t sod-class (eql sod::effective-methods)
1453   t sod-class (eql sod::vtables)
1454 sod-class-chain
1455   sod-class
1456 sod-class-chain-head
1457   sod-class
1458 sod-class-chain-link
1459   sod-class
1460 sod-class-chains
1461   sod-class
1462 sod-class-class-initializers
1463   sod-class
1464 (setf sod-class-class-initializers)
1465   t sod-class
1466 sod-class-direct-superclasses
1467   sod-class
1468 sod-class-ilayout
1469   sod-class
1470 sod-class-initfrags
1471   sod-class
1472 (setf sod-class-initfrags)
1473   t sod-class
1474 sod-class-instance-initializers
1475   sod-class
1476 (setf sod-class-instance-initializers)
1477   t sod-class
1478 sod-class-messages
1479   sod-class
1480 (setf sod-class-messages)
1481   t sod-class
1482 sod-class-metaclass
1483   sod-class
1484 sod-class-methods
1485   sod-class
1486 (setf sod-class-methods)
1487   t sod-class
1488 sod-class-name
1489   sod-class
1490 sod-class-nickname
1491   sod-class
1492 sod-class-precedence-list
1493   sod-class
1494 sod-class-slots
1495   sod-class
1496 (setf sod-class-slots)
1497   t sod-class
1498 sod-class-state
1499   sod-class
1500 sod-class-tearfrags
1501   sod-class
1502 (setf sod-class-tearfrags)
1503   t sod-class
1504 sod-class-type
1505   sod-class
1506 sod-class-vtables
1507   sod-class
1508 sod-initarg-argument
1509   sod-initarg
1510 sod-initializer-class
1511   sod-initializer
1512 sod-initializer-slot
1513   sod-initializer
1514 sod-initializer-value
1515   sod-initializer
1516 sod-message-applicable-methods
1517   sod-message sod-class
1518 sod-message-argument-tail
1519   basic-message
1520 sod-message-class
1521   sod-message
1522 sod-message-combination
1523   aggregating-message
1524 sod-message-effective-method-class
1525   aggregating-message
1526   sod::initialization-message
1527   standard-message
1528   sod::teardown-message
1529 sod-message-kernel-function
1530   aggregating-message
1531 sod-message-keyword-argument-lists
1532   sod::initialization-message sod-class t t
1533   sod-message sod-class t t
1534 sod-message-method-class
1535   basic-message sod-class t
1536   simple-message sod-class t
1537   sod-message sod-class t
1538 sod-message-name
1539   sod-message
1540 sod-message-type
1541   sod-message
1542 sod-method-body
1543   sod-method
1544 sod-method-class
1545   sod-method
1546 sod-method-description
1547   basic-direct-method
1548 sod-method-function-name
1549   basic-direct-method
1550 sod-method-function-type
1551   basic-direct-method
1552 sod-method-message
1553   sod-method
1554 sod-method-next-method-type
1555   delegating-direct-method
1556 sod-method-role
1557   basic-direct-method
1558 sod-method-type
1559   sod-method
1560 sod-slot-class
1561   sod-slot
1562 sod-slot-initializer-function
1563   sod-class-slot
1564 sod-slot-name
1565   sod-slot
1566 sod-slot-prepare-function
1567   sod-class-slot
1568 sod-slot-type
1569   sod-slot
1570 temp-tag
1571   temporary-name
1572 temporary-var
1573   sod::basic-codegen t
1574 var-in-use-p
1575   t
1576   temporary-variable
1577 (setf var-in-use-p)
1578   t temporary-variable
1579 vtable-body
1580   vtable
1581 vtable-chain-head
1582   vtable
1583 vtable-chain-tail
1584   vtable
1585 vtable-class
1586   vtable
1587 vtable-pointer-chain-head
1588   vtable-pointer
1589 vtable-pointer-chain-tail
1590   vtable-pointer
1591 vtable-pointer-class
1592   vtable-pointer
1593 vtmsgs-chain-head
1594   vtmsgs
1595 vtmsgs-chain-tail
1596   vtmsgs
1597 vtmsgs-class
1598   vtmsgs
1599 vtmsgs-entries
1600   vtmsgs
1601 vtmsgs-subclass
1602   vtmsgs
1603
1604 -----------------------------------------------------------------------------
1605 Package `sod-frontend'
1606
1607 frontend.lisp
1608   main                                          function
1609
1610 Classes:
1611 cl:t
1612
1613 Methods:
1614
1615 -----------------------------------------------------------------------------
1616 Package `sod-parser'
1617
1618 floc-proto.lisp
1619   base-lexer-error                              class
1620   base-syntax-error                             class
1621   cerror*                                       function
1622   cerror*-with-location                         function
1623   cerror-with-location                          function
1624   classify-condition                            generic
1625   condition-with-location                       class
1626   count-and-report-errors                       macro
1627   enclosed-condition                            generic
1628   enclosing-condition                           class
1629   enclosing-condition-with-location             class
1630   enclosing-condition-with-location-type        generic
1631   enclosing-error-with-location                 class
1632   enclosing-information-with-location           class
1633   enclosing-warning-with-location               class
1634   error-with-location                           function class
1635   file-location                                 generic class
1636   file-location-column                          function
1637   file-location-filename                        function
1638   file-location-line                            function
1639   file-location-p                               function
1640   info                                          function
1641   info-with-location                            function
1642   information                                   class
1643   information-with-location                     class
1644   make-condition-with-location                  function
1645   make-file-location                            function
1646   noted                                         function
1647   parser-error                                  class
1648   parser-error-expected                         generic
1649   parser-error-found                            generic
1650   report-parser-error                           function
1651   simple-condition-with-location                class
1652   simple-error-with-location                    class
1653   simple-information                            class
1654   simple-information-with-location              class
1655   simple-lexer-error                            class
1656   simple-syntax-error                           class
1657   simple-warning-with-location                  class
1658   warn-with-location                            function
1659   warning-with-location                         class
1660   with-default-error-location                   macro
1661
1662 parser-expr-proto.lisp
1663   apply-operator                                generic
1664   binop                                         macro
1665   close-parenthesis                             class
1666   expr                                          parser
1667   lparen                                        function
1668   open-parenthesis                              class
1669   operator-left-precedence                      generic
1670   operator-push-action                          generic
1671   operator-right-precedence                     generic
1672   postop                                        macro
1673   prefix-operator                               class
1674   preop                                         macro
1675   push-operator                                 generic
1676   push-value                                    generic
1677   rparen                                        function
1678   simple-binary-operator                        class
1679   simple-operator                               class
1680   simple-postfix-operator                       class
1681   simple-prefix-operator                        class
1682   simple-unary-operator                         class
1683
1684 parser-impl.lisp
1685   list-parser                                   class
1686   string-parser                                 class
1687
1688 parser-proto.lisp
1689   ?                                             parser
1690   cl:and                                        macro parser
1691   call-pluggable-parser                         function
1692   cl:char                                       function setf c-type parser
1693   character-parser-context                      class
1694   combine-parser-failures                       function
1695   commit                                        parser
1696   cond-parse                                    macro
1697   define-pluggable-parser                       macro
1698   defparse                                      macro
1699   expand-parser-form                            generic
1700   expand-parser-spec                            generic
1701   filter                                        parser
1702   if-char                                       parser
1703   if-parse                                      macro
1704   sod-utilities:it
1705   label                                         parser
1706   lisp                                          c-type parser
1707   cl:list                                       function class parser opthandler
1708   many                                          parser
1709   cl:not                                        function parser
1710   cl:or                                         macro parser
1711   parse
1712   parse-empty                                   function
1713   parse-fail                                    function
1714   parser                                        macro
1715   parser-at-eof-p                               generic
1716   parser-capture-place                          generic
1717   parser-current-char                           generic
1718   parser-places-must-be-released-p              generic
1719   parser-release-place                          generic
1720   parser-restore-place                          generic
1721   parser-step                                   generic
1722   parser-token-type                             generic
1723   parser-token-value                            generic
1724   peek                                          parser
1725   plug                                          parser
1726   pluggable-parser-add                          function
1727   cl:satisfies                                  parser
1728   seq                                           parser
1729   skip-many                                     parser
1730   token                                         parser
1731   token-parser-context                          class
1732   when-parse                                    macro
1733   with-parser-context                           macro
1734   with-parser-place                             macro
1735   wrap-parser                                   generic
1736
1737 scanner-charbuf-impl.lisp
1738   charbuf-scanner                               class
1739   charbuf-scanner-map                           generic
1740   charbuf-scanner-place-p                       function
1741   charbuf-scanner-stream                        class
1742
1743 scanner-impl.lisp
1744   list-scanner                                  class
1745   list-scanner-p                                function
1746   make-list-scanner                             function
1747   make-string-scanner                           function
1748   string-scanner                                class
1749   string-scanner-p                              function
1750
1751 scanner-proto.lisp
1752   character-scanner                             class
1753   character-scanner-context                     class
1754   character-scanner-stream                      class
1755   make-scanner-stream                           generic
1756   parser-scanner                                generic
1757   scanner-at-eof-p                              generic
1758   scanner-capture-place                         generic
1759   scanner-column                                generic setf
1760   scanner-context                               class
1761   scanner-current-char                          generic
1762   scanner-filename                              generic
1763   scanner-interval                              generic
1764   scanner-line                                  generic setf
1765   scanner-release-place                         generic
1766   scanner-restore-place                         generic
1767   scanner-step                                  generic
1768   scanner-token                                 generic
1769   scanner-unread                                generic
1770   token-scanner                                 class
1771   token-scanner-context                         class
1772   token-scanner-place                           class
1773   token-scanner-place-p                         function
1774   token-type                                    generic
1775   token-value                                   generic
1776   with-scanner-place                            macro
1777
1778 streams-impl.lisp
1779   position-aware-input-stream                   class
1780   position-aware-output-stream                  class
1781   position-aware-stream                         class
1782   position-aware-stream-column                  generic setf
1783   position-aware-stream-line                    generic setf
1784
1785 streams-proto.lisp
1786   stream-pathname                               generic
1787
1788 Classes:
1789 cl:t
1790   sb-pcl::slot-object
1791     cl:condition
1792       condition-with-location
1793         enclosing-condition-with-location [enclosing-condition]
1794           enclosing-error-with-location [cl:error]
1795           enclosing-information-with-location [information]
1796           enclosing-warning-with-location [cl:warning]
1797         error-with-location [cl:error]
1798           base-lexer-error
1799             simple-lexer-error [simple-error-with-location]
1800           base-syntax-error
1801             simple-syntax-error [simple-error-with-location]
1802           simple-error-with-location [cl:simple-error]
1803             simple-lexer-error [base-lexer-error]
1804             simple-syntax-error [base-syntax-error]
1805         information-with-location [information]
1806           simple-information-with-location [simple-information]
1807         simple-condition-with-location [cl:simple-condition]
1808         warning-with-location [cl:warning]
1809           simple-warning-with-location [cl:simple-warning]
1810       enclosing-condition
1811         enclosing-condition-with-location [condition-with-location]
1812           enclosing-error-with-location [cl:error]
1813           enclosing-information-with-location [information]
1814           enclosing-warning-with-location [cl:warning]
1815       information
1816         enclosing-information-with-location [enclosing-condition-with-location]
1817         information-with-location [condition-with-location]
1818           simple-information-with-location [simple-information]
1819         simple-information [cl:simple-condition]
1820           simple-information-with-location [information-with-location]
1821       cl:serious-condition
1822         cl:error
1823           enclosing-error-with-location [enclosing-condition-with-location]
1824           error-with-location [condition-with-location]
1825             base-lexer-error
1826               simple-lexer-error [simple-error-with-location]
1827             base-syntax-error
1828               simple-syntax-error [simple-error-with-location]
1829             simple-error-with-location [cl:simple-error]
1830               simple-lexer-error [base-lexer-error]
1831               simple-syntax-error [base-syntax-error]
1832           parser-error
1833           cl:simple-error [cl:simple-condition]
1834             simple-error-with-location [error-with-location]
1835               simple-lexer-error [base-lexer-error]
1836               simple-syntax-error [base-syntax-error]
1837       cl:simple-condition
1838         simple-condition-with-location [condition-with-location]
1839         cl:simple-error [cl:error]
1840           simple-error-with-location [error-with-location]
1841             simple-lexer-error [base-lexer-error]
1842             simple-syntax-error [base-syntax-error]
1843         simple-information [information]
1844           simple-information-with-location [information-with-location]
1845         cl:simple-warning [cl:warning]
1846           simple-warning-with-location [warning-with-location]
1847       cl:warning
1848         enclosing-warning-with-location [enclosing-condition-with-location]
1849         cl:simple-warning [cl:simple-condition]
1850           simple-warning-with-location [warning-with-location]
1851         warning-with-location [condition-with-location]
1852           simple-warning-with-location [cl:simple-warning]
1853     cl:standard-object
1854       character-parser-context
1855         character-scanner-context [scanner-context]
1856         string-parser
1857       character-scanner
1858         charbuf-scanner
1859       sb-gray:fundamental-stream [cl:stream]
1860         sb-gray:fundamental-character-stream
1861           sb-gray:fundamental-character-input-stream [sb-gray:fundamental-input-stream]
1862             character-scanner-stream
1863               charbuf-scanner-stream
1864             sod-parser::proxy-character-input-stream [sod-parser::proxy-input-stream]
1865               position-aware-input-stream [position-aware-stream]
1866           sb-gray:fundamental-character-output-stream [sb-gray:fundamental-output-stream]
1867             sod-parser::proxy-character-output-stream [sod-parser::proxy-stream]
1868               position-aware-output-stream [position-aware-stream]
1869         sb-gray:fundamental-input-stream
1870           sb-gray:fundamental-character-input-stream [sb-gray:fundamental-character-stream]
1871             character-scanner-stream
1872               charbuf-scanner-stream
1873             sod-parser::proxy-character-input-stream [sod-parser::proxy-input-stream]
1874               position-aware-input-stream [position-aware-stream]
1875           sod-parser::proxy-input-stream [sod-parser::proxy-stream]
1876             sod-parser::proxy-character-input-stream [sb-gray:fundamental-character-input-stream]
1877               position-aware-input-stream [position-aware-stream]
1878         sb-gray:fundamental-output-stream
1879           sb-gray:fundamental-character-output-stream [sb-gray:fundamental-character-stream]
1880             sod-parser::proxy-character-output-stream [sod-parser::proxy-stream]
1881               position-aware-output-stream [position-aware-stream]
1882         sod-parser::proxy-stream
1883           position-aware-stream
1884             position-aware-input-stream [sod-parser::proxy-character-input-stream]
1885             position-aware-output-stream [sod-parser::proxy-character-output-stream]
1886           sod-parser::proxy-character-output-stream [sb-gray:fundamental-character-output-stream]
1887             position-aware-output-stream [position-aware-stream]
1888           sod-parser::proxy-input-stream [sb-gray:fundamental-input-stream]
1889             sod-parser::proxy-character-input-stream [sb-gray:fundamental-character-input-stream]
1890               position-aware-input-stream [position-aware-stream]
1891       list-parser
1892       sod-parser::parenthesis
1893         close-parenthesis
1894         open-parenthesis [prefix-operator]
1895       prefix-operator
1896         open-parenthesis [sod-parser::parenthesis]
1897         simple-prefix-operator [simple-unary-operator]
1898       scanner-context
1899         character-scanner-context [character-parser-context]
1900         token-scanner-context [token-parser-context]
1901       simple-operator
1902         simple-binary-operator
1903         simple-unary-operator
1904           simple-postfix-operator
1905           simple-prefix-operator [prefix-operator]
1906       token-parser-context
1907         token-scanner-context [scanner-context]
1908       token-scanner
1909     cl:structure-object
1910       file-location
1911       list-scanner
1912       string-scanner
1913       token-scanner-place
1914   cl:stream
1915     sb-gray:fundamental-stream [cl:standard-object]
1916       sb-gray:fundamental-character-stream
1917         sb-gray:fundamental-character-input-stream [sb-gray:fundamental-input-stream]
1918           character-scanner-stream
1919             charbuf-scanner-stream
1920           sod-parser::proxy-character-input-stream [sod-parser::proxy-input-stream]
1921             position-aware-input-stream [position-aware-stream]
1922         sb-gray:fundamental-character-output-stream [sb-gray:fundamental-output-stream]
1923           sod-parser::proxy-character-output-stream [sod-parser::proxy-stream]
1924             position-aware-output-stream [position-aware-stream]
1925       sb-gray:fundamental-input-stream
1926         sb-gray:fundamental-character-input-stream [sb-gray:fundamental-character-stream]
1927           character-scanner-stream
1928             charbuf-scanner-stream
1929           sod-parser::proxy-character-input-stream [sod-parser::proxy-input-stream]
1930             position-aware-input-stream [position-aware-stream]
1931         sod-parser::proxy-input-stream [sod-parser::proxy-stream]
1932           sod-parser::proxy-character-input-stream [sb-gray:fundamental-character-input-stream]
1933             position-aware-input-stream [position-aware-stream]
1934       sb-gray:fundamental-output-stream
1935         sb-gray:fundamental-character-output-stream [sb-gray:fundamental-character-stream]
1936           sod-parser::proxy-character-output-stream [sod-parser::proxy-stream]
1937             position-aware-output-stream [position-aware-stream]
1938       sod-parser::proxy-stream
1939         position-aware-stream
1940           position-aware-input-stream [sod-parser::proxy-character-input-stream]
1941           position-aware-output-stream [sod-parser::proxy-character-output-stream]
1942         sod-parser::proxy-character-output-stream [sb-gray:fundamental-character-output-stream]
1943           position-aware-output-stream [position-aware-stream]
1944         sod-parser::proxy-input-stream [sb-gray:fundamental-input-stream]
1945           sod-parser::proxy-character-input-stream [sb-gray:fundamental-character-input-stream]
1946             position-aware-input-stream [position-aware-stream]
1947
1948 Methods:
1949 apply-operator
1950   open-parenthesis sod-parser::expression-parse-state
1951   simple-binary-operator sod-parser::expression-parse-state
1952   simple-unary-operator sod-parser::expression-parse-state
1953 charbuf-scanner-map
1954   charbuf-scanner t
1955 classify-condition
1956   cl:error
1957   cl:warning
1958   base-lexer-error
1959   base-syntax-error
1960   information
1961 enclosed-condition
1962   enclosing-condition
1963 enclosing-condition-with-location-type
1964   cl:condition
1965   cl:error
1966   cl:warning
1967   information
1968 expand-parser-form
1969   t (eql cl:and) t
1970   t (eql cl:list) t
1971   t (eql cl:nil) t
1972   t (eql cl:or) t
1973   t (eql cl:t) t
1974   t (eql cl:when) t
1975   t (eql ?) t
1976   t (eql commit) t
1977   t (eql expr) t
1978   t (eql label) t
1979   t (eql lisp) t
1980   t (eql many) t
1981   t (eql peek) t
1982   t (eql plug) t
1983   t (eql seq) t
1984   t (eql skip-many) t
1985   t t t
1986   character-parser-context (eql cl:char) t
1987   character-parser-context (eql cl:not) t
1988   character-parser-context (eql cl:satisfies) t
1989   character-parser-context (eql filter) t
1990   character-parser-context (eql if-char) t
1991   list-parser (eql cl:quote) t
1992   list-parser (eql cl:type) t
1993   token-parser-context (eql token) t
1994   token-scanner-context (eql cl:error) t
1995   token-scanner-context (eql sod:must) t
1996   token-scanner-context (eql sod:skip-until) t
1997 expand-parser-spec
1998   t (eql :eof)
1999   t (eql cl:nil)
2000   t (eql cl:t)
2001   t cl:list
2002   character-parser-context (eql :any)
2003   character-parser-context (eql :whitespace)
2004   character-parser-context cl:character
2005   character-parser-context cl:string
2006   list-parser t
2007   token-parser-context cl:string
2008   token-parser-context t
2009 file-location
2010   cl:stream
2011   t
2012   sod:c-fragment
2013   sod:property
2014   sod:sod-class
2015   sod:sod-initarg
2016   sod:sod-initializer
2017   sod:sod-message
2018   sod:sod-method
2019   sod:sod-slot
2020   character-scanner
2021   sod-parser::charbuf-scanner-place
2022   condition-with-location
2023   file-location
2024   position-aware-stream
2025   string-scanner
2026   token-scanner
2027   token-scanner-place
2028 cl:make-load-form
2029   file-location
2030 make-scanner-stream
2031   sod:sod-token-scanner
2032   character-scanner
2033   charbuf-scanner
2034   string-scanner
2035 operator-left-precedence
2036   simple-binary-operator
2037   simple-postfix-operator
2038 operator-push-action
2039   t t
2040   t open-parenthesis
2041   open-parenthesis t
2042 operator-right-precedence
2043   simple-binary-operator
2044   simple-postfix-operator
2045   simple-prefix-operator
2046 parser-at-eof-p
2047   list-parser
2048   scanner-context
2049   string-parser
2050   token-parser-context
2051 parser-capture-place
2052   t
2053   list-parser
2054   scanner-context
2055   string-parser
2056 parser-current-char
2057   character-scanner-context
2058   string-parser
2059 parser-error-expected
2060   parser-error
2061 parser-error-found
2062   parser-error
2063 parser-places-must-be-released-p
2064   t
2065   list-parser
2066   sod-parser::list-scanner-context
2067   string-parser
2068   sod-parser::string-scanner-context
2069 parser-release-place
2070   t t
2071   scanner-context t
2072 parser-restore-place
2073   list-parser t
2074   scanner-context t
2075   string-parser t
2076 parser-scanner
2077   scanner-context
2078 parser-step
2079   scanner-context
2080   string-parser
2081 parser-token-type
2082   token-scanner-context
2083 parser-token-value
2084   token-scanner-context
2085 position-aware-stream-column
2086   position-aware-stream
2087 (setf position-aware-stream-column)
2088   t position-aware-stream
2089 position-aware-stream-line
2090   position-aware-stream
2091 (setf position-aware-stream-line)
2092   t position-aware-stream
2093 cl:print-object
2094   file-location t
2095   simple-operator t
2096 push-operator
2097   t sod-parser::expression-parse-state
2098   close-parenthesis sod-parser::expression-parse-state
2099   open-parenthesis sod-parser::expression-parse-state [:after]
2100   prefix-operator sod-parser::expression-parse-state
2101 push-value
2102   t sod-parser::expression-parse-state
2103 scanner-at-eof-p
2104   charbuf-scanner
2105   list-scanner
2106   string-scanner
2107   token-scanner
2108 scanner-capture-place
2109   t
2110   charbuf-scanner
2111   list-scanner
2112   string-scanner
2113   token-scanner
2114 scanner-column
2115   t
2116   charbuf-scanner
2117   string-scanner
2118   token-scanner
2119 (setf scanner-column)
2120   t token-scanner
2121 scanner-current-char
2122   charbuf-scanner
2123   string-scanner
2124 scanner-filename
2125   t
2126   charbuf-scanner
2127   string-scanner
2128   token-scanner
2129 scanner-interval
2130   charbuf-scanner t
2131   string-scanner t
2132 scanner-line
2133   t
2134   charbuf-scanner
2135   string-scanner
2136   token-scanner
2137 (setf scanner-line)
2138   t token-scanner
2139 scanner-release-place
2140   t t
2141   charbuf-scanner t
2142   token-scanner t
2143 scanner-restore-place
2144   charbuf-scanner t
2145   list-scanner t
2146   string-scanner t
2147   token-scanner t
2148 scanner-step
2149   charbuf-scanner
2150   list-scanner
2151   string-scanner
2152   token-scanner
2153 scanner-token
2154   sod:sod-token-scanner
2155 scanner-unread
2156   charbuf-scanner t
2157   string-scanner t
2158 cl:shared-initialize
2159   charbuf-scanner t [:after]
2160   simple-binary-operator t [:after]
2161   token-scanner t [:after]
2162 sb-gray:stream-line-column
2163   position-aware-output-stream
2164 stream-pathname
2165   cl:file-stream
2166   cl:stream
2167   position-aware-stream
2168   sod-parser::proxy-stream
2169 sb-gray:stream-peek-char
2170   character-scanner-stream
2171 sb-gray:stream-read-char
2172   character-scanner-stream
2173   position-aware-input-stream
2174 sb-gray:stream-read-line
2175   charbuf-scanner-stream
2176   position-aware-input-stream
2177 sb-gray:stream-read-sequence
2178   charbuf-scanner-stream cl:string
2179   position-aware-input-stream t
2180 sb-gray:stream-start-line-p
2181   position-aware-output-stream
2182 sb-gray:stream-terpri
2183   position-aware-output-stream
2184 sb-gray:stream-unread-char
2185   character-scanner-stream t
2186   position-aware-input-stream t
2187 sb-gray:stream-write-char
2188   position-aware-output-stream t
2189 sb-gray:stream-write-sequence
2190   position-aware-output-stream t
2191 sb-gray:stream-write-string
2192   position-aware-output-stream t
2193 token-type
2194   list-scanner
2195   token-scanner
2196 token-value
2197   list-scanner
2198   token-scanner
2199 wrap-parser
2200   t t
2201   string-parser t
2202
2203 -----------------------------------------------------------------------------
2204 Package `optparse'
2205
2206 optparse.lisp
2207   *command-line*                                variable
2208   *help*                                        variable
2209   *options*                                     variable
2210   *program-name*                                variable
2211   *usage*                                       variable
2212   *version*                                     variable
2213   clear                                         opthandler
2214   dec                                           opthandler
2215   define-program                                function
2216   defopthandler                                 macro
2217   defoptmacro                                   macro
2218   die                                           function
2219   die-usage                                     function
2220   do-options                                    macro
2221   do-usage                                      function
2222   exit                                          function
2223   help-options                                  optmacro
2224   inc                                           opthandler
2225   int                                           opthandler
2226   invoke-option-handler                         function
2227   cl:keyword                                    opthandler
2228   cl:list                                       function class parser opthandler
2229   make-option                                   function
2230   make-option-parser                            function
2231   moan                                          function
2232   op-long-only-p                                function setf
2233   op-negated-numeric-p                          function setf
2234   op-negated-p                                  function setf
2235   op-non-option                                 function setf
2236   op-numeric-p                                  function setf
2237   op-options                                    function setf
2238   opt-arg-name                                  function setf
2239   opt-arg-optional-p                            function setf
2240   opt-documentation                             function setf
2241   opt-long-name                                 function setf
2242   opt-negated-tag                               function setf
2243   opt-short-name                                function setf
2244   opt-tag                                       function setf
2245   option                                        class
2246   option-parse-error                            function class
2247   option-parse-next                             function
2248   option-parse-remainder                        function
2249   option-parse-return                           function
2250   option-parse-try                              macro
2251   option-parser                                 class
2252   option-parser-p                               function
2253   optionp                                       function
2254   options                                       macro
2255   parse-option-form                             function
2256   cl:read                                       function opthandler
2257   sanity-check-option-list                      function
2258   cl:set                                        function opthandler
2259   set-command-line-arguments                    function
2260   show-help                                     function
2261   show-usage                                    function
2262   simple-usage                                  function
2263   cl:string                                     function class c-type opthandler
2264   with-unix-error-reporting                     macro
2265
2266 Classes:
2267 cl:t
2268   sb-pcl::slot-object
2269     cl:condition
2270       cl:serious-condition
2271         cl:error
2272           option-parse-error [cl:simple-condition]
2273       cl:simple-condition
2274         option-parse-error [cl:error]
2275     cl:structure-object
2276       option
2277       option-parser
2278
2279 Methods:
2280 cl:print-object
2281   option t
2282
2283 -----------------------------------------------------------------------------
2284 Package `sod-utilities'
2285
2286 utilities.lisp
2287   aand                                          macro
2288   acase                                         macro
2289   acond                                         macro
2290   aecase                                        macro
2291   aetypecase                                    macro
2292   aif                                           macro
2293   asetf                                         macro
2294   atypecase                                     macro
2295   awhen                                         macro
2296   backtrack-position                            function
2297   categorize                                    macro
2298   compose                                       function
2299   copy-instance                                 function
2300   copy-instance-using-class                     generic
2301   default-slot                                  macro
2302   define-access-wrapper                         macro
2303   define-on-demand-slot                         macro
2304   defvar-unbound                                macro
2305   designated-condition                          function
2306   distinguished-point-shortest-paths            function
2307   dosequence                                    macro
2308   sb-mop:eql-specializer                        class
2309   sb-mop:eql-specializer-object                 generic
2310   frob-identifier                               function
2311   sb-mop:generic-function-methods               generic setf
2312   inconsistent-merge-error                      class
2313   instance-initargs                             generic
2314   invoke-associated-restart                     function
2315   it
2316   lbuild-add                                    function
2317   lbuild-add-list                               function
2318   lbuild-list                                   function
2319   loc                                           class
2320   locf                                          macro
2321   locp                                          function
2322   make-list-builder                             function
2323   mappend                                       function
2324   maybe-print-unreadable-object                 macro
2325   merge-error-candidates                        generic
2326   merge-lists                                   function
2327   sb-mop:method-specializers                    generic
2328   once-only                                     macro
2329   parse-body                                    function
2330   partial-order-minima                          function
2331   print-ugly-stuff                              function
2332   ref                                           function setf
2333   simple-control-error                          class
2334   symbolicate                                   function
2335   update-position                               function
2336   whitespace-char-p                             function
2337   with-gensyms                                  macro
2338   with-locatives                                macro
2339
2340 Classes:
2341 cl:t
2342   sb-pcl::slot-object
2343     cl:condition
2344       cl:serious-condition
2345         cl:error
2346           cl:control-error
2347             simple-control-error [cl:simple-error]
2348           inconsistent-merge-error
2349           cl:simple-error [cl:simple-condition]
2350             simple-control-error [cl:control-error]
2351       cl:simple-condition
2352         cl:simple-error [cl:error]
2353           simple-control-error [cl:control-error]
2354     cl:standard-object
2355       sb-mop:metaobject
2356         sb-mop:specializer
2357           sb-pcl::exact-class-specializer
2358             sb-mop:eql-specializer [sb-pcl::standard-specializer sb-pcl::specializer-with-object]
2359           sb-pcl::specializer-with-object
2360             sb-mop:eql-specializer [sb-pcl::standard-specializer sb-pcl::exact-class-specializer]
2361           sb-pcl::standard-specializer
2362             sb-mop:eql-specializer [sb-pcl::exact-class-specializer sb-pcl::specializer-with-object]
2363     cl:structure-object
2364       loc
2365
2366 Methods:
2367 copy-instance-using-class
2368   cl:standard-class t
2369 sb-mop:eql-specializer-object
2370   sb-mop:eql-specializer
2371 sb-mop:generic-function-methods
2372   cl:standard-generic-function
2373 (setf sb-mop:generic-function-methods)
2374   t cl:standard-generic-function
2375 instance-initargs
2376   cl:standard-object
2377 merge-error-candidates
2378   inconsistent-merge-error
2379 sb-mop:method-specializers
2380   cl:standard-method
2381