* as/mcs51/lkarea.c (lnkarea, lnkarea2): improved BSEG size calculation,
[fw/sdcc] / src / SDCCsymt.h
1 /*-------------------------------------------------------------------------
2   SDCCsymt.h - Header file for Symbols table related structures and MACRO's.              
3               Written By -  Sandeep Dutta . sandeep.dutta@usa.net (1998)
4
5    This program is free software; you can redistribute it and/or modify it
6    under the terms of the GNU General Public License as published by the
7    Free Software Foundation; either version 2, or (at your option) any
8    later version.
9    
10    This program is distributed in the hope that it will be useful,
11    but WITHOUT ANY WARRANTY; without even the implied warranty of
12    MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the
13    GNU General Public License for more details.
14    
15    You should have received a copy of the GNU General Public License
16    along with this program; if not, write to the Free Software
17    Foundation, 59 Temple Place - Suite 330, Boston, MA 02111-1307, USA.
18    
19    In other words, you are welcome to use, share and improve this program.
20    You are forbidden to forbid anyone else to use, share and improve
21    what you give them.   Help stamp out software-hoarding!  
22 -------------------------------------------------------------------------*/
23
24 #ifndef  SDCCSYMT_H
25 #define  SDCCSYMT_H
26
27 #define MAX_NEST_LEVEL  256
28 #define SDCC_SYMNAME_MAX 64
29 #define SDCC_NAME_MAX  3*SDCC_SYMNAME_MAX // big enough for _<func>_<var>_etc
30 #include "SDCChasht.h"
31 #include "SDCCglobl.h"
32
33 #define INTNO_MAX 255                   /* maximum allowed interrupt number */
34 #define INTNO_UNSPEC (INTNO_MAX+1)      /* interrupt number unspecified */
35
36 #define BITVAR_PAD -1
37
38 enum {
39     TYPEOF_INT=1,
40     TYPEOF_SHORT,
41     TYPEOF_CHAR,
42     TYPEOF_LONG,
43     TYPEOF_FLOAT,
44     TYPEOF_BIT,
45     TYPEOF_BITFIELD,
46     TYPEOF_SBIT,
47     TYPEOF_SFR,
48     TYPEOF_VOID,
49     TYPEOF_STRUCT,
50     TYPEOF_ARRAY,
51     TYPEOF_FUNCTION,
52     TYPEOF_POINTER,
53     TYPEOF_FPOINTER,
54     TYPEOF_CPOINTER,
55     TYPEOF_GPOINTER,
56     TYPEOF_PPOINTER,
57     TYPEOF_IPOINTER,
58     TYPEOF_EEPPOINTER
59 };
60
61 // values for first byte (or 3 most significant bits) of generic pointer.
62 #define GPTYPE_FAR       0x00
63 #define GPTYPE_NEAR      0x40
64 #define GPTYPE_XSTACK    0x60
65 #define GPTYPE_CODE      0x80
66
67 #define HASHTAB_SIZE 256
68
69 /* hash table bucket */
70 typedef struct bucket
71   {
72     void *sym;                  /* pointer to the object   */
73     char name[SDCC_NAME_MAX + 1];       /* name of this symbol          */
74     int level;                  /* nest level for this symbol   */
75     int block;                  /* belongs to which block */
76     struct bucket *prev;        /* ptr 2 previous bucket   */
77     struct bucket *next;        /* ptr 2 next bucket       */
78   }
79 bucket;
80
81 typedef struct structdef
82   {
83     char tag[SDCC_NAME_MAX + 1];        /* tag part of structure      */
84     unsigned char level;        /* Nesting level         */
85     struct symbol *fields;      /* pointer to fields     */
86     unsigned size;              /* sizeof the table in bytes  */
87     int type;                   /* STRUCT or UNION */
88   }
89 structdef;
90
91 /* noun definitions */
92 typedef enum
93   {
94     V_INT = 1,
95     V_FLOAT,
96     V_CHAR,
97     V_VOID,
98     V_STRUCT,
99     V_LABEL,
100     V_BIT,
101     V_BITFIELD,
102     V_SBIT,
103     V_DOUBLE
104   }
105 NOUN;
106
107 /* storage class    */
108 typedef enum
109   {
110     S_FIXED = 0,
111     S_AUTO,
112     S_REGISTER,
113     S_SFR,
114     S_SBIT,
115     S_CODE,
116     S_XDATA,
117     S_DATA,
118     S_IDATA,
119     S_PDATA,
120     S_LITERAL,
121     S_STACK,
122     S_XSTACK,
123     S_BIT,
124     S_EEPROM
125   }
126 STORAGE_CLASS;
127
128 /* specifier is the last in the type-chain */
129 typedef struct specifier
130   {
131     NOUN noun;                  /* CHAR INT STRUCTURE LABEL   */
132     STORAGE_CLASS sclass;       /* REGISTER,AUTO,FIX,CONSTANT */
133     struct memmap *oclass;      /* output storage class       */
134     unsigned _long:1;           /* 1=long            */
135     unsigned _short:1;          /* 1=short int    */
136     unsigned _unsigned:1;       /* 1=unsigned, 0=signed       */
137     unsigned _signed:1;         /* just for sanity checks only*/
138     unsigned _static:1;         /* 1=static keyword found     */
139     unsigned _extern:1;         /* 1=extern found             */
140     unsigned _absadr:1;         /* absolute address specfied  */
141     unsigned _volatile:1;       /* is marked as volatile      */
142     unsigned _const:1;          /* is a constant              */
143     unsigned _typedef:1;        /* is typedefed               */
144     unsigned _isregparm:1;      /* is the first parameter     */
145     unsigned _isenum:1;         /* is an enumerated type      */
146     unsigned _addr;             /* address of symbol          */
147     unsigned _stack;            /* stack offset for stacked v */
148     unsigned _bitStart;         /* bit start position         */
149     int _bitLength;             /* bit length                 */
150     int argreg;                 /* reg no for regparm         */
151     union
152       {                         /* Values if constant or enum */
153         TYPE_WORD   v_int;      /* 2 bytes: int and char values           */
154         char       *v_char;     /*          character string              */
155         TYPE_UWORD  v_uint;     /* 2 bytes: unsigned int const value      */
156         TYPE_DWORD  v_long;     /* 4 bytes: long constant value           */
157         TYPE_UDWORD v_ulong;    /* 4 bytes: unsigned long constant value  */
158         double      v_float;    /*          floating point constant value */
159         struct symbol *v_enum;  /* ptr to enum_list if enum==1            */
160       }
161     const_val;
162     struct structdef *v_struct; /* structure pointer      */
163   }
164 specifier;
165
166 /* types of declarators */
167 typedef enum
168   {
169     POINTER = 0,                /* pointer to near data */
170     FPOINTER,                   /* pointer to far data  */
171     CPOINTER,                   /* pointer to code space */
172     GPOINTER,                   /* _generic pointer     */
173     PPOINTER,                   /* paged area pointer   */
174     IPOINTER,                   /* pointer to upper 128 bytes */
175     UPOINTER,                   /* unknown pointer used only when parsing */
176     EEPPOINTER,                 /* pointer to eeprom     */
177     ARRAY,
178     FUNCTION
179   }
180 DECLARATOR_TYPE;
181
182 typedef struct declarator
183   {
184     DECLARATOR_TYPE dcl_type;   /* POINTER,ARRAY or FUNCTION  */
185     unsigned int num_elem;      /* # of elems if type==array  */
186     unsigned ptr_const:1;       /* pointer is constant        */
187     unsigned ptr_volatile:1;    /* pointer is volatile        */
188     struct sym_link *tspec;     /* pointer type specifier     */
189   }
190 declarator;
191
192 typedef enum {
193   DECLARATOR=1,
194   SPECIFIER
195 } SYM_LINK_CLASS;
196 #define DECLSPEC2TXT(select) (select==DECLARATOR?"DECLARATOR":select==SPECIFIER?"SPECIFIER":"UNKNOW")
197
198 typedef struct sym_link
199   {
200     SYM_LINK_CLASS class;       /* DECLARATOR or SPECIFIER    */
201     unsigned tdef:1;            /* current link created by    */
202     /* typedef if this flag is set */
203     union
204       {
205         specifier s;            /* if CLASS == SPECIFIER      */
206         declarator d;           /* if CLASS == DECLARATOR     */
207       } select;
208
209     /* function attributes */
210     struct {
211       struct value *args;       /* the defined arguments      */
212       unsigned hasVargs:1;      /* functions has varargs      */
213       unsigned calleeSaves:1;   /* functions uses callee save */
214       unsigned hasbody:1;       /* function body defined      */
215       unsigned hasFcall:1;      /* does it call other functions */
216       unsigned reent:1;         /* function is reentrant      */
217       unsigned naked:1;         /* naked function             */
218
219       unsigned shadowregs:1;    /* function uses shadow registers (pic16 port) */
220       unsigned wparam:1;        /* first byte of arguments is passed via WREG (pic16 port) */
221       unsigned nonbanked:1;     /* function has the nonbanked attribute */
222       unsigned banked:1;        /* function has the banked attribute */
223       unsigned critical:1;      /* critical function          */
224       unsigned intrtn:1;        /* this is an interrupt routine */
225       unsigned rbank:1;         /* seperate register bank     */
226       unsigned intno;           /* 1=Interrupt svc routine    */
227       short    regbank;         /* register bank 2b used      */
228       unsigned builtin;         /* is a builtin function      */
229       unsigned javaNative;      /* is a JavaNative Function (TININative ONLY) */
230       unsigned overlay;         /* force parameters & locals into overlay segment */
231       unsigned hasStackParms;   /* function has parameters on stack */
232     } funcAttrs;
233
234     struct sym_link *next;      /* next element on the chain  */
235   }
236 sym_link;
237
238 typedef struct symbol
239   {
240     char name[SDCC_SYMNAME_MAX + 1];    /* Input Variable Name     */
241     char rname[SDCC_NAME_MAX + 1];      /* internal name           */
242
243     short level;                /* declration lev,fld offset */
244     short block;                /* sequential block # of defintion */
245     int key;
246     unsigned implicit:1;        /* implicit flag                     */
247     unsigned undefined:1;       /* undefined variable                */
248     unsigned _isparm:1;         /* is a parameter          */
249     unsigned ismyparm:1;        /* is parameter of the function being generated */
250     unsigned isitmp:1;          /* is an intermediate temp */
251     unsigned islbl:1;           /* is a temporary label */
252     unsigned isref:1;           /* has been referenced  */
253     unsigned isind:1;           /* is a induction variable */
254     unsigned isinvariant:1;     /* is a loop invariant  */
255     unsigned cdef:1;            /* compiler defined symbol */
256     unsigned addrtaken:1;       /* address of the symbol was taken */
257     unsigned isreqv:1;          /* is the register quivalent of a symbol */
258     unsigned udChked:1;         /* use def checking has been already done */
259
260     /* following flags are used by the backend
261        for code generation and can be changed
262        if a better scheme for backend is thought of */
263     unsigned isLiveFcall:1;     /* is live at or across a function call */
264     unsigned isspilt:1;         /* has to be spilt */
265     unsigned spillA:1;          /* spilt be register allocator */
266     unsigned remat:1;           /* can be remateriazed */
267     unsigned isptr:1;           /* is a pointer */
268     unsigned uptr:1;            /* used as a pointer */
269     unsigned isFree:1;          /* used by register allocator */
270     unsigned islocal:1;         /* is a local variable        */
271     unsigned blockSpil:1;       /* spilt at block level       */
272     unsigned remainSpil:1;      /* spilt because not used in remainder */
273     unsigned stackSpil:1;       /* has been spilt on temp stack location */
274     unsigned onStack:1;         /* this symbol allocated on the stack */
275     unsigned iaccess:1;         /* indirect access      */
276     unsigned ruonly:1;          /* used in return statement only */
277     unsigned spildir:1;         /* spilt in direct space */
278     unsigned ptrreg:1;          /* this symbol assigned to a ptr reg */
279     unsigned noSpilLoc:1;       /* cannot be assigned a spil location */
280     unsigned isstrlit;          /* is a string literal and it's usage count  */
281     unsigned accuse;            /* can be left in the accumulator
282                                    On the Z80 accuse is divided into
283                                    ACCUSE_A and ACCUSE_HL as the idea
284                                    is quite similar.
285                                  */
286     unsigned dptr;              /* 8051 variants with multiple DPTRS
287                                    currently implemented in DS390 only
288                                 */
289     int allocreq ;              /* allocation is required for this variable */
290     int stack;                  /* offset on stack      */
291     int xstack;                 /* offset on xternal stack */
292     short nRegs;                /* number of registers required */
293     short regType;              /* type of register required    */
294
295     struct regs *regs[4];       /* can have at the most 4 registers */
296     struct asmop *aop;          /* asmoperand for this symbol */
297     struct iCode *fuse;         /* furthest use */
298     struct iCode *rematiCode;   /* rematerialise with which instruction */
299     struct operand *reqv;       /* register equivalent of a local variable */
300     struct symbol *prereqv;     /* symbol before register equiv. substituion */
301     struct symbol *psbase;      /* if pseudo symbol, the symbol it is based on */
302     union
303       {
304         struct symbol *spillLoc;        /* register spil location */
305         struct set *itmpStack;  /* symbols spilt @ this stack location */
306       }
307     usl;
308     short bitVar;               /* this is a bit variable    */
309     unsigned offset;            /* offset from top if struct */
310
311     int lineDef;                /* defined line number        */
312     char *fileDef;              /* defined filename           */
313     int lastLine;               /* for functions the last line */
314     struct sym_link *type;      /* 1st link to declarator chain */
315     struct sym_link *etype;     /* last link to declarator chain */
316     struct symbol *next;        /* crosslink to next symbol   */
317     struct symbol *localof;     /* local variable of which function */
318     struct initList *ival;      /* ptr to initializer if any  */
319     struct bitVect *defs;       /* bit vector for definitions */
320     struct bitVect *uses;       /* bit vector for uses        */
321     struct bitVect *regsUsed;   /* for functions registers used */
322     int liveFrom;               /* live from iCode sequence number */
323     int liveTo;                 /* live to sequence number */
324     int used;                   /* no. of times this was used */
325     int recvSize;               /* size of first argument  */
326     struct bitVect *clashes;    /* overlaps with what other symbols */
327   }
328 symbol;
329
330 extern sym_link *validateLink(sym_link  *l, 
331                                const char       *macro,
332                                const char       *args,
333                                const char       select,
334                                const char       *file, 
335                                unsigned         line);
336 /* Easy Access Macros */
337 #define DCL_TYPE(l)  validateLink(l, "DCL_TYPE", #l, DECLARATOR, __FILE__, __LINE__)->select.d.dcl_type
338 #define DCL_ELEM(l)  validateLink(l, "DCL_ELEM", #l, DECLARATOR, __FILE__, __LINE__)->select.d.num_elem
339 #define DCL_PTR_CONST(l) validateLink(l, "DCL_PTR_CONST", #l, DECLARATOR, __FILE__, __LINE__)->select.d.ptr_const
340 #define DCL_PTR_VOLATILE(l) validateLink(l, "DCL_PTR_VOLATILE", #l, DECLARATOR, __FILE__, __LINE__)->select.d.ptr_volatile
341 #define DCL_TSPEC(l) validateLink(l, "DCL_TSPEC", #l, DECLARATOR, __FILE__, __LINE__)->select.d.tspec
342
343 #define FUNC_DEBUG //assert(IS_FUNC(x));
344 #define FUNC_HASVARARGS(x) (x->funcAttrs.hasVargs)
345 #define IFFUNC_HASVARARGS(x) (IS_FUNC(x) && FUNC_HASVARARGS(x))
346 #define FUNC_ARGS(x) (x->funcAttrs.args)
347 #define IFFUNC_ARGS(x) (IS_FUNC(x) && FUNC_ARGS(x))
348 #define FUNC_HASFCALL(x) (x->funcAttrs.hasFcall)
349 #define IFFUNC_HASFCALL(x) (IS_FUNC(x) && FUNC_HASFCALL(x))
350 #define FUNC_HASBODY(x) (x->funcAttrs.hasbody)
351 #define IFFUNC_HASBODY(x) (IS_FUNC(x) && FUNC_HASBODY(x))
352 #define FUNC_CALLEESAVES(x) (x->funcAttrs.calleeSaves)
353 #define IFFUNC_CALLEESAVES(x) (IS_FUNC(x) && FUNC_CALLEESAVES(x))
354 #define FUNC_ISISR(x) (x->funcAttrs.intrtn)
355 #define IFFUNC_ISISR(x) (IS_FUNC(x) && FUNC_ISISR(x))
356 #define IFFUNC_RBANK(x) (IS_FUNC(x) && FUNC_RBANK(x))
357 #define FUNC_INTNO(x) (x->funcAttrs.intno)
358 #define FUNC_REGBANK(x) (x->funcAttrs.regbank)
359 #define FUNC_HASSTACKPARM(x) (x->funcAttrs.hasStackParms)
360
361 #define FUNC_ISREENT(x) (x->funcAttrs.reent)
362 #define IFFUNC_ISREENT(x) (IS_FUNC(x) && FUNC_ISREENT(x))
363 #define FUNC_ISSHADOWREGS(x) (x->funcAttrs.shadowregs)
364 #define IFFUNC_ISSHADOWREGS(x) (IS_FUNC(x) && FUNC_ISSHADOWREGS(x))
365 #define FUNC_ISWPARAM(x) (x->funcAttrs.wparam)
366 #define IFFUNC_ISWPARAM(x) (IS_FUNC(x) && FUNC_ISWPARAM(x))
367 #define FUNC_ISNAKED(x) (x->funcAttrs.naked)
368 #define IFFUNC_ISNAKED(x) (IS_FUNC(x) && FUNC_ISNAKED(x))
369 #define FUNC_NONBANKED(x) (x->funcAttrs.nonbanked)
370 #define IFFUNC_NONBANKED(x) (IS_FUNC(x) && FUNC_NONBANKED(x))
371 #define FUNC_BANKED(x) (x->funcAttrs.banked)
372 #define IFFUNC_BANKED(x) (IS_FUNC(x) && FUNC_BANKED(x))
373 #define FUNC_ISCRITICAL(x) (x->funcAttrs.critical)
374 #define IFFUNC_ISCRITICAL(x) (IS_FUNC(x) && FUNC_ISCRITICAL(x))
375 #define FUNC_ISBUILTIN(x) (x->funcAttrs.builtin)
376 #define IFFUNC_ISBUILTIN(x) (IS_FUNC(x) && FUNC_ISBUILTIN(x))
377 #define FUNC_ISJAVANATIVE(x) (x->funcAttrs.javaNative)
378 #define IFFUNC_ISJAVANATIVE(x) (IS_FUNC(x) && FUNC_ISJAVANATIVE(x))
379 #define FUNC_ISOVERLAY(x) (x->funcAttrs.overlay)
380 #define IFFUNC_ISOVERLAY(x) (IS_FUNC(x) && FUNC_ISOVERLAY(x))
381
382 #define IFFUNC_ISBANKEDCALL(x) (!IFFUNC_NONBANKED(x) && \
383   (options.model == MODEL_HUGE || \
384    ((options.model == MODEL_LARGE || options.model == MODEL_MEDIUM) && \
385    (TARGET_IS_Z80 || TARGET_IS_GBZ80)) || \
386   IFFUNC_BANKED(x)))
387
388 #define SPEC_NOUN(x) validateLink(x, "SPEC_NOUN", #x, SPECIFIER, __FILE__, __LINE__)->select.s.noun
389 #define SPEC_LONG(x) validateLink(x, "SPEC_LONG", #x, SPECIFIER, __FILE__, __LINE__)->select.s._long
390 #define SPEC_SHORT(x) validateLink(x, "SPEC_LONG", #x, SPECIFIER, __FILE__, __LINE__)->select.s._short
391 #define SPEC_USIGN(x) validateLink(x, "SPEC_USIGN", #x, SPECIFIER, __FILE__, __LINE__)->select.s._unsigned
392 #define SPEC_SCLS(x) validateLink(x, "SPEC_SCLS", #x, SPECIFIER, __FILE__, __LINE__)->select.s.sclass
393 #define SPEC_ENUM(x) validateLink(x, "SPEC_ENUM", #x, SPECIFIER, __FILE__, __LINE__)->select.s._isenum
394 #define SPEC_OCLS(x) validateLink(x, "SPEC_OCLS", #x, SPECIFIER, __FILE__, __LINE__)->select.s.oclass
395 #define SPEC_STAT(x) validateLink(x, "SPEC_STAT", #x, SPECIFIER, __FILE__, __LINE__)->select.s._static
396 #define SPEC_EXTR(x) validateLink(x, "SPEC_EXTR", #x, SPECIFIER, __FILE__, __LINE__)->select.s._extern
397 #define SPEC_CODE(x) validateLink(x, "SPEC_CODE", #x, SPECIFIER, __FILE__, __LINE__)->select.s._codesg
398 #define SPEC_ABSA(x) validateLink(x, "SPEC_ABSA", #x, SPECIFIER, __FILE__, __LINE__)->select.s._absadr
399 #define SPEC_BANK(x) validateLink(x, "SPEC_BANK", #x, SPECIFIER, __FILE__, __LINE__)->select.s._regbank
400 #define SPEC_ADDR(x) validateLink(x, "SPEC_ADDR", #x, SPECIFIER, __FILE__, __LINE__)->select.s._addr
401 #define SPEC_STAK(x) validateLink(x, "SPEC_STAK", #x, SPECIFIER, __FILE__, __LINE__)->select.s._stack
402 #define SPEC_CVAL(x) validateLink(x, "SPEC_CVAL", #x, SPECIFIER, __FILE__, __LINE__)->select.s.const_val
403 #define SPEC_BSTR(x) validateLink(x, "SPEC_BSTR", #x, SPECIFIER, __FILE__, __LINE__)->select.s._bitStart
404 #define SPEC_BLEN(x) validateLink(x, "SPEC_BLEN", #x, SPECIFIER, __FILE__, __LINE__)->select.s._bitLength
405
406 /* Sleaze: SPEC_ISR_SAVED_BANKS is only used on 
407  * function type symbols, which obviously cannot
408  * be of BIT type. Therefore, we recycle the 
409  * _bitStart field instead of defining a new field.
410  */
411 #define SPEC_ISR_SAVED_BANKS(x) validateLink(x, "SPEC_NOUN", #x, SPECIFIER, __FILE__, __LINE__)->select.s._bitStart
412 #define SPEC_VOLATILE(x) validateLink(x, "SPEC_NOUN", #x, SPECIFIER, __FILE__, __LINE__)->select.s._volatile
413 #define SPEC_CONST(x) validateLink(x, "SPEC_NOUN", #x, SPECIFIER, __FILE__, __LINE__)->select.s._const
414 #define SPEC_STRUCT(x) validateLink(x, "SPEC_NOUN", #x, SPECIFIER, __FILE__, __LINE__)->select.s.v_struct
415 #define SPEC_TYPEDEF(x) validateLink(x, "SPEC_NOUN", #x, SPECIFIER, __FILE__, __LINE__)->select.s._typedef
416 #define SPEC_REGPARM(x) validateLink(x, "SPEC_NOUN", #x, SPECIFIER, __FILE__, __LINE__)->select.s._isregparm
417 #define SPEC_ARGREG(x) validateLink(x, "SPEC_NOUN", #x, SPECIFIER, __FILE__, __LINE__)->select.s.argreg
418
419 /* type check macros */
420 #define IS_DECL(x)   ( x && x->class == DECLARATOR      )
421 #define IS_SPEC(x)   ( x && x->class == SPECIFIER  )
422 #define IS_ARRAY(x)  (IS_DECL(x) && DCL_TYPE(x) == ARRAY)
423 #define IS_DATA_PTR(x) (IS_DECL(x) && DCL_TYPE(x) == POINTER)
424 #define IS_PTR(x)    (IS_DECL(x) && (DCL_TYPE(x) == POINTER    ||    \
425                                      DCL_TYPE(x) == FPOINTER   ||    \
426                                      DCL_TYPE(x) == GPOINTER   ||    \
427                                      DCL_TYPE(x) == IPOINTER   ||    \
428                                      DCL_TYPE(x) == PPOINTER   ||    \
429                                      DCL_TYPE(x) == EEPPOINTER ||    \
430                                      DCL_TYPE(x) == CPOINTER   ||    \
431                                      DCL_TYPE(x) == UPOINTER  ))
432 #define IS_PTR_CONST(x) (IS_PTR(x) && DCL_PTR_CONST(x))
433 #define IS_FARPTR(x) (IS_DECL(x) && DCL_TYPE(x) == FPOINTER)
434 #define IS_CODEPTR(x) (IS_DECL(x) && DCL_TYPE(x) == CPOINTER)
435 #define IS_GENPTR(x) (IS_DECL(x) && DCL_TYPE(x) == GPOINTER)
436 #define IS_FUNCPTR(x) (IS_DECL(x) && (DCL_TYPE(x) == CPOINTER || DCL_TYPE(x) == GPOINTER) && IS_FUNC(x->next))
437 #define IS_FUNC(x)   (IS_DECL(x) && DCL_TYPE(x) == FUNCTION)
438 #define IS_LONG(x)   (IS_SPEC(x) && x->select.s._long)
439 #define IS_UNSIGNED(x) (IS_SPEC(x) && x->select.s._unsigned)
440 #define IS_TYPEDEF(x)(IS_SPEC(x) && x->select.s._typedef)
441 #define IS_CONSTANT(x)  (!x ? 0 : \
442                            IS_SPEC(x) ? \
443                            x->select.s._const : \
444                            x->select.d.ptr_const)
445 #define IS_STRUCT(x) (IS_SPEC(x) && x->select.s.noun == V_STRUCT)
446 #define IS_ABSOLUTE(x)  (IS_SPEC(x) && x->select.s._absadr )
447 #define IS_REGISTER(x)  (IS_SPEC(x) && SPEC_SCLS(x) == S_REGISTER)
448 #define IS_RENT(x)   (IS_SPEC(x) && x->select.s._reent )
449 #define IS_STATIC(x) (IS_SPEC(x) && SPEC_STAT(x))
450 #define IS_INT(x)    (IS_SPEC(x) && x->select.s.noun == V_INT)
451 #define IS_VOID(x)   (IS_SPEC(x) && x->select.s.noun == V_VOID)
452 #define IS_CHAR(x)   (IS_SPEC(x) && x->select.s.noun == V_CHAR)
453 #define IS_EXTERN(x)    (IS_SPEC(x) && x->select.s._extern)
454 #define IS_VOLATILE(x)  (!x ? 0 : \
455                            IS_SPEC(x) ? \
456                            x->select.s._volatile : \
457                            x->select.d.ptr_volatile)
458 #define IS_INTEGRAL(x) (IS_SPEC(x) && (x->select.s.noun == V_INT ||  \
459                                        x->select.s.noun == V_CHAR || \
460                                        x->select.s.noun == V_BITFIELD || \
461                                        x->select.s.noun == V_BIT ||  \
462                                        x->select.s.noun == V_SBIT ))
463 #define IS_BITFIELD(x) (IS_SPEC(x) && (x->select.s.noun == V_BITFIELD))
464 #define IS_BITVAR(x) (IS_SPEC(x) && (x->select.s.noun == V_BITFIELD || \
465                                      x->select.s.noun  == V_BIT ||   \
466                                      x->select.s.noun == V_SBIT ))
467 #define IS_BIT(x) (IS_SPEC(x) && (x->select.s.noun  == V_BIT ||   \
468                                   x->select.s.noun == V_SBIT ))
469 #define IS_FLOAT(x)  (IS_SPEC(x) && x->select.s.noun == V_FLOAT)
470 #define IS_ARITHMETIC(x) (IS_INTEGRAL(x) || IS_FLOAT(x))
471 #define IS_AGGREGATE(x) (IS_ARRAY(x) || IS_STRUCT(x))
472 #define IS_LITERAL(x)   (IS_SPEC(x)  && x->select.s.sclass == S_LITERAL)
473 #define IS_CODE(x)      (IS_SPEC(x)  && SPEC_SCLS(x) == S_CODE)
474 #define IS_REGPARM(x)   (IS_SPEC(x) && SPEC_REGPARM(x))
475
476 /* symbol check macros */
477 #define IS_AUTO(x) (x->level && !IS_STATIC(x->etype) && !IS_EXTERN(x->etype))
478
479 /* forward declaration for the global vars */
480 extern bucket *SymbolTab[];
481 extern bucket *StructTab[];
482 extern bucket *TypedefTab[];
483 extern bucket *LabelTab[];
484 extern bucket *enumTab[];
485 extern symbol *__fsadd;
486 extern symbol *__fssub;
487 extern symbol *__fsmul;
488 extern symbol *__fsdiv;
489 extern symbol *__fseq;
490 extern symbol *__fsneq;
491 extern symbol *__fslt;
492 extern symbol *__fslteq;
493 extern symbol *__fsgt;
494 extern symbol *__fsgteq;
495
496 /* Dims: mul/div/mod, BYTE/WORD/DWORD, SIGNED/UNSIGNED */
497 extern symbol *__muldiv[3][3][2];
498 /* Dims: BYTE/WORD/DWORD SIGNED/UNSIGNED */
499 extern sym_link *__multypes[3][2];
500 /* Dims: to/from float, BYTE/WORD/DWORD, SIGNED/USIGNED */
501 extern symbol *__conv[2][3][2];
502 /* Dims: shift left/shift right, BYTE/WORD/DWORD, SIGNED/UNSIGNED */
503 extern symbol *__rlrr[2][3][2];
504
505 #define CHARTYPE        __multypes[0][0]
506 #define UCHARTYPE       __multypes[0][1]
507 #define INTTYPE         __multypes[1][0]
508 #define UINTTYPE        __multypes[1][1]
509 #define LONGTYPE        __multypes[2][0]
510 #define ULONGTYPE       __multypes[2][1]
511
512
513 extern sym_link *floatType;
514
515 #include "SDCCval.h"
516
517 typedef enum
518 {
519   RESULT_TYPE_NONE = 0, /* operands will be promoted to int */
520   RESULT_TYPE_BIT,
521   RESULT_TYPE_CHAR,
522   RESULT_TYPE_INT,
523   RESULT_TYPE_OTHER,    /* operands will be promoted to int */
524   RESULT_TYPE_IFX,
525 } RESULT_TYPE;
526
527 /* forward definitions for the symbol table related functions */
528 void initSymt ();
529 symbol *newSymbol (char *, int);
530 sym_link *newLink (SYM_LINK_CLASS);
531 sym_link *newFloatLink ();
532 structdef *newStruct (char *);
533 void addDecl (symbol *, int, sym_link *);
534 sym_link *mergeSpec (sym_link *, sym_link *, char *name);
535 symbol *reverseSyms (symbol *);
536 sym_link *reverseLink (sym_link *);
537 symbol *copySymbol (symbol *);
538 symbol *copySymbolChain (symbol *);
539 void printSymChain (symbol *, int);
540 void printStruct (structdef *, int);
541 char *genSymName (int);
542 sym_link *getSpec (sym_link *);
543 char *genSymName (int);
544 int compStructSize (int, structdef *);
545 sym_link *copyLinkChain (sym_link *);
546 int checkDecl (symbol *, int);
547 void checkBasic (sym_link *, sym_link *);
548 value *checkPointerIval (sym_link *, value *);
549 value *checkStructIval (symbol *, value *);
550 value *checkArrayIval (sym_link *, value *);
551 value *checkIval (sym_link *, value *);
552 unsigned int getSize (sym_link *);
553 unsigned int getAllocSize (sym_link *);
554 unsigned int bitsForType (sym_link *);
555 sym_link *newIntLink ();
556 sym_link *newCharLink ();
557 sym_link *newLongLink ();
558 int compareType (sym_link *, sym_link *);
559 int compareTypeExact (sym_link *, sym_link *, int);
560 int checkFunction (symbol *, symbol *);
561 void cleanUpLevel (bucket **, int);
562 void cleanUpBlock (bucket **, int);
563 int funcInChain (sym_link *);
564 void addSymChain (symbol **);
565 sym_link *structElemType (sym_link *, value *);
566 symbol *getStructElement (structdef *, symbol *);
567 sym_link *computeType (sym_link *, sym_link *, RESULT_TYPE, int);
568 void processFuncArgs (symbol *);
569 int isSymbolEqual (symbol *, symbol *);
570 int powof2 (TYPE_UDWORD);
571 void printTypeChain (sym_link *, FILE *);
572 void printTypeChainRaw (sym_link *, FILE *);
573 void initCSupport ();
574 void initBuiltIns ();
575 void pointerTypes (sym_link *, sym_link *);
576 void cdbStructBlock (int);
577 void initHashT ();
578 bucket *newBucket ();
579 void addSym (bucket **, void *, char *, int, int, int checkType);
580 void deleteSym (bucket **, void *, char *);
581 void *findSym (bucket **, void *, const char *);
582 void *findSymWithLevel (bucket **, struct symbol *);
583 void *findSymWithBlock (bucket **, struct symbol *, int);
584 void changePointer (sym_link * p);
585 void checkTypeSanity(sym_link *etype, char *name);
586 sym_link *typeFromStr (char *) ;
587 STORAGE_CLASS sclsFromPtr(sym_link *ptr);
588 sym_link *newEnumType (symbol *);
589 void  promoteAnonStructs (int, structdef *);
590
591
592 extern char *nounName(sym_link *); /* noun strings */
593 extern void printFromToType (sym_link *, sym_link *);
594
595 #endif