D DEC C Compiler Messages

This appendix lists the DEC C compiler diagnostic messages. For more information about the format of compiler diagnostic messages, see Chapter 1.

To display a particular compiler message online, enter the following command:

$ HELP CC/DECC MESSAGE mnemonic<Return>  (VAX only)
$ HELP CC MESSAGE mnemonic<Return>  (Alpha only)

To display a list of all compiler message mnemonics, enter the following command:

$ HELP CC/DECC MESSAGE<Return>  (VAX only)
$ HELP CC MESSAGE<Return>  (Alpha only)

Some messages substitute information from the program into the message text. In this appendix, the portion of the text to be substituted is shown in italics.

Often, the same message is issued in different contexts within a program. In this appendix, the message context is indicated by the italicized word context within the message. The actual message issued by the compiler will contain one of the following phrases substituted for context:

You can control the messages issued with the /[NO]WARNINGS command line qualifier (see Chapter 1), or suppress the generation of certain messages with the #pragma message preprocessor directive (see Section 5.4.10).

abstractdcl Invalid abstract declarator.

addrarray context& before array "expression" is ignored.

addrbyval Address of a pass-by-value parameter !AF was taken. (Alpha only)

addrconstext context"name" does not have a constant address, but occurs in a context that requires an address constant. This is an extension of the language.

alignconst Integer constant alignment number is not necessarily supported on all platforms.

alignext _align is a language extension.

alignpop This "restore" has underflowed the member alignment's stack. No corresponding "save" was found.

argaddr contexttaking the address of the constant expression "expression" in an argument list is a language extension.

arglisgtr255 Function call specifies an argument list whose length exceeds maximum specified by the calling standard. Any use of va_count by the called function will be wrong.

arglistoolong Function call specifies an argument list whose length exceeds the VAX architecture limit. This call allocates stack space which is never deallocated by the caller.

arraybrace context a required set of braces is missing.

asmcomexp Comma expected while processing !AD instruction (Alpha only)

asmendexp Semicolon or asm end expected while processing !AD instruction (Alpha only)

asmfimmdots Floating point load-immediate instructions require a .s file (Alpha only)

asmfregexp Float register expected while processing !AD instruction (Alpha only)

asmhintdots Hint on !AD instruction requires a .s file (Alpha only)

asmiconexp Integer constant expected while processing !AD instruction (Alpha only)

asmidexp Identifier expected while processing !AD instruction (Alpha only)

asminstexp Instruction mnemonic expected (found !AD) (Alpha only)

asmlabexp Label expected while processing !AD instruction (Alpha only)

asmlabmuldef Multiple definitions of label in asm (!AD) (Alpha only)

asmlabundef Reference to undefined label in asm (!AD) (Alpha only)

asmldgpdots Unusual ldgp requires a .s file (Alpha only)

asmlparexp Left paren expected while processing !AD instruction (Alpha only)

asmnotinst !AD instruction is not supported in asms on !AD (Alpha only)

asmnotreg !AD is not a register name on !AD (Alpha only)

asmnotsup Support for !AD (!AD) in asms is not implemented on !AD (Alpha only)

asmpaltrunc PALcode function has been truncated to !SL (Alpha only)

asmrawreg !AD uses !AD before it is defined (Alpha only)

asmrawretreg !AD will be loaded with current return address before use in !AD instruction (Alpha only)

asmregexp Float register expected while processing !AD instruction (Alpha only)

asmrparexp Right paren expected while processing !AD instruction (Alpha only)

asmsymdots Use of symbolic addresses with !AD instruction requires a .s file. (Alpha only)

assertion !AD (Alpha only)

assignext contextrelaxed struct or union type compatibility is a language extension.

autoalign The alignment boundary of an automatic cannot be greater than longword or octaword.

autoexternal contexta storage class of "auto" or "register" is illegal at file scope.

badalign Invalid alignment boundary.

badbounds contextthe array bounds are incorrectly specified.

badbreak This break statement is not within a for, while, do, or switch statement.

badcharsinhdr Illegal characters after header name.

badcmmntpstng Token concatenation with comments might not be portable - use ## operator.

badcondit context"true expression" and "false expression" cannot be combined in a conditional expression.

badconstexpr Syntax error in constant expression.

badcontinue This continue statement is not within a for, while, or do statement.

baddcl This name cannot be undefined.

baddeclspec Invalid argument to __declspec. Valid arguments are "thread" or "__thread".

baddefarg Bad argument for "defined" operator.

baddirective "Directive text" is an invalid preprocessor directive, and is being ignored.

badenum Invalid enumerator.

badexpr Invalid expression.

badfatcomment The compiler cannot recover.

badfbfile Invalid feedback file: !AD (Alpha only)

badflnameinln #line directive is missing file name.

badflnamestr Filename cannot be a wide string literal.

badfloattype contextthis floating point type "type" is not supported on this platform.

badformalparm Formal parameter is not an identifier.

badfuncpragma Unknown function specified in #pragma.

badfuncstocls The storage class of function name cannot be storage_class. This storage class has been changed to 'extern'.

badheadernm Invalid include file or header name specification.

badhexconst Hex constant value too large.

badid Ill-formed identifier.

badifdef An #ifdef or #ifndef is not followed by an identifier.

badifndefarg #ifndef argument is not an identifier.

badinclude An #include directive has illegal syntax.

badintrinsic context #pragma intrinsic is needed to enable the "name" builtin.

baditerate The first expression in the parallel processing pragma "iterate" must be an assignment to an index variable.

badlblb Illegal use of ## operator.

badline Illegal syntax for #line directive.

badlinedir Missing argument for #line directive.

badlinedirtv Illegal token in #line directive.

badlinkreg Invalid register "register" for linkage pragma. Pragma is ignored.

badlinnum Ignoring the line number for the #line directive-too small.

badlist An identifier list is not allowed. Specify only a single identifier.

badlocale The compiler could not set its locale to locale.

badmacrocall pp directives are not valid inside macro calls.

badmacroinln Illegal token from macro call in #line directive.

badmacroname "directive" directive is not followed by an identifier and is being ignored.

badmbcomment An invalid multibyte character was encountered in a comment.

badmcrorecurs Recursive expansion of macro "name" exceeded num levels and was terminated.

badmember Invalid member declaration.

badmemoff contextmultiple definitions of member "name" found with different offsets.

badmemtyp contextmultiple definitions of member "name" found with different types.

badmoduleid Invalid identifier found immediately following "#pragma module" or "#module" directive.

badmultibyte An invalid multibyte character was encountered in type of construction.

badoctconst Octal constant value too large.

badopccap !AD instruction used is not in the selected instruction set. (Alpha only)

badover context the "name" builtin cannot be overloaded.

badppdir File ends in an unfinished pp directive.

badpppragarg The modifier "modifier" cannot be used with the parallel processing pragma "pragma".

badpppragma Unexpected or Missing argument to the parallel processing pragma "pragma name". Pragma is ignored.

badpragmaform Unrecognized #pragma form.

badpragmalink A bad linkage pragma was specified. Pragma is ignored.

badprefix Argument to extern_prefix is not a recognized keyword or a quoted string. Pragma is ignored.

badregister context"name" has register storage class, but occurs in a context that precludes register storage. The storage class has been changed to auto.

badreturntype contexta function cannot return type type.

badrounding Invalid combination of rounding mode and non-IEEE floating point mode.

badstaticcvt In the static initialization, the address cannot be converted to the destination type.

badstmt Invalid statement.

badswitchprgm Unrecognized switch in #pragma directive.

badsymsize The size of the object exceeds max_size bytes. This is not yet supported.

badtken Lexically invalid token.

badtoken Ill-formed source element.

badtokeninfo Miscellaneous token is lexically invalid.

baduselink A bad use_linkage pragma was specified. Pragma is ignored.

badusermacro This name cannot be a user-defined macro.

badvastart contextold-style parameter "name", with type that requires default argument promotion, cannot be used with va_start.

bifproto contextthe built-in function, "name", requires a prototype declaration to be included from filename.

bitarray The CDD description for name specifies that it is an array of bitfields; It has been converted to a scalar bit- field.

bitbadrep contextthe bitfield type is not an integral type.

bitfieldsize The CDD description for bit-field name specifies a size greater than 32; The excess is declare separately.

bitinitaddr context.name, is a bitfield, and cannot be initialized with a relocatable address.

bitnotint contextthe bitfield type is not an int, signed int or unsigned int.

bitwidth contextthe bitfield width expression "expression" is outside the range lower to upper.

bitwidthtyp contextthe bitfield width expression "expression" does not have an integral type.

bltinargcnt contextan incorrect number of arguments were passed to the builtin function, "function expression".

boundadj The CDD description for name specifies non- zero-origin dimension bound(s); The bound(s) are adjusted to zero- origin.

boundnotint contextthe array bound "expression" does not have an integral type.

break Event break at !AD (Alpha only)

bugcheck Compiler bugcheck. Submit an SPR with a problem description.

cannotredef Cannot #define a macro that is currently expanding.

cannotundef Cannot #undef a macro that is currently expanding.

caserange contextthe case label "expression" is out of the range -32768 to 32767.

cddattr One or more field descriptions in this CDD record specify an attribute which is being ignored.

cddbadid An invalid identifier, name, is being ignored in the dictionary directive.

cddext #dictionary is a language extension.

cddhist A valid CDD remark string was not found.

cddpath A valid CDD pathname was not found. The CDD directive has been ignored.

cddtoodeep The attributes for the Common Data Dictionary record description name exceed the implementation's limit for record complexity.

cg_unwind Terminating code generation for current routine. (Alpha only)

charconst Ill-formed character constant.

charoverfl A character constant value requires more than sizeof(int) bytes of storage.

chkexpand !SL integrity check error!%S after IL expansion of routine !AF (Alpha only)

chkinit !SL integrity check error!%S in initial IL & ST for module !AF (Alpha only)

chkopt !SL integrity check error!%S after !2(+)!AF optimization phase for routine !4(-)!AF (Alpha only)

classnoinit contextthe struct or union object "name" is uninitialized and has a const member.

closbracket Missing "]".

closebrace Missing "}".

closeparen Missing ")".

colmajor The CDD description for name specifies that it is a column major array; It has been converted to a one-dimensional array.

compassign The meaning of an old form compound assignment operator has changed.

compilerbug Bug found in compiler: bug.

Description: This message indicates that the compiler detected a bug within itself.

User Action: Report the compiler bug to Digital. Please include an example program that reproduces the problem.

conlinkreg Conflicting register usage between "first set" and "second set". Pragma is ignored.

conpsectattr Conflicting psect attribute overrides previous attribute.

consolewrt An error occurred while attempting to write to the console output: problem.

constfunc Ignoring const type qualifier in declaration of name.

constinwrt Const variable resides in wrt extern model.

constnoinit contextthe const object "name" is uninitialized.

conststocls contextthe const object "name" has no explicit storage class. In C, its storage class defaults to "extern"; in C++, it defaults to "static". Add an explicit "ext ern" or "static" keyword.

contfile A file ends with a continuation character.

controlassign contextthe assignment expression "expression" is used as the controlling expression of an if, while, or for statement.

convaraslit context the use of the const variable "name" in place of a literal constant is a language extension.

crxcond Common Data Dictionary description extraction condition.

cvtdiftypes context"expression" of type "type", is being converted to "target type".

cxxcommbadmode Use of C++ style comment (//) is a syntax error in this standard mode.

cxxcomment C++ comments (//) are not yet part of standard C.

cxxcommnonport C++ comments (//) are not yet part of standard C.

cxxkeyword "C++ keyword" is a keyword in C++. Using it as an identifier in your C program will prevent porting your program to C++.

dclmismatlnk The declaration of "name" has number parameter(s) but its linkage "name" has numberbox. Function will have standard linkage.

dclmismatlnk0 The declaration of "name" has an unknown number of parameters and cannot be used with the linkage "name". Function will have standard linkage.

dclmismatlnk1 where "name" modifierhas a floating type but its linkage "name" specifies an integer register. Function will have standard linkage.

dclmismatlnk2 where "name" modifierrequires an integer register but its linkage "name" specifies a floating register. Function will have standard linkage.

dclmismatlnk3 where "name" has a size that is incompatible with the number of registers specified by its linkage "name". Function w ill have standard linkage.

dclmismatlnk4 where "name" modifierhas a type that is not allowed because the function has the linkage "name-leavevmode". Function will have standard linkage.

dclmismatlnk5 The function "name" has a void return type but its linkage "name" specifies a return location. Function will have standard linkage.

decconstlarge Decimal constant value too large.

declaration Invalid declaration.

declarator Invalid declarator.

declspecext __declspec is a language extension.

decnotimpl Not implemented: feature.

Description: This message indicates that you have used a feature that is not fully supported by the compiler.

User Action: Avoid using the indicated feature.

defdefined The identifier "defined" cannot be defined.

definedarg A "defined" operator does not have an identifier as an argument.

defineeof In the processing of "#define name", the end of the file was encountered.

defparmtype The type of the parameter name defaults to "int".

defreturntype The type of the function name defaults to "int".

directvnocpp "Directive text" is not recognized as a preprocessing directive in nopreprocessing mode, and is being ignored.

disredecl contextthe type of the external "name" is not compatible with the type of a declaration of "name" in another name scop e at location.

dollarid Extension: A '$' was encountered in an identifier.

dupcase The switch statement containing this case label already has a case label for "number".

dupdefault The switch statement containing this default label already has a default label.

dupenum contextthe enumerator "name" is not unique.

duplabel The label "name" is already defined in this procedure at location.

duplink Duplicate linkage pragmas for linkage name "linkage name".

dupmacroparm In the definition of the macro "macro name", the parameter "parameter name" appears more than once in the identifier list.

dupparm context"name" is a duplicate parameter name.

dupppragma The "modifier" modifier of the parallel processing pragma "pragma" has already been specified. The new modifier will replace the old.

dupstorcls contextthe same storage class modifier occurs more than once.

duptypedef context"name" has a duplicate typedef at where. This might not be portable.

duptypespec contextthe same type specifier occurs more than once.

duptypqual contextthere is a redundant use of type qualifier "const or volatile".

elifignored Out of place #elif directive ignored.

ellipsearg ANSI C does not permit the use of an ellipse as an only argument.

ellipseparm contexta parameter with type "type" matches an ellipse in previous declaration at location.

elseignored Out of place #else directive ignored.

embedcomment A comment is neither preceded nor followed by white space.

emptycharconst Empty character constant.

emptyfile Source file does not contain any declarations.

emptyobj Empty object file due to errors. (Alpha only)

enum16bit contextthe enumeration constant name is out of the range -32768 to 32767.

enumcalc contextthe enum variable "expression" is used in an arithmetic operation.

enuminit contextthe enumerator "name" is initialized to the nonintegral value "expression".

enumrange contextthe enumeration constant "name" is out of range INT_MIN to INT_MAX.

enumused contextthe enumerator name "name" has been used previously.

eofincomment End of file reached inside a comment.

errorlim Diagnostic message limit exceeded. (Alpha only)

escoverfl The value of an escape sequence is out of range.

excnestinc Exceeded the limit of nesting level for #include files.

expandeddefined Macro expansion includes the token "defined", which will be treated as an operator. This might not be portable.

expnotres Expression does not contribute to result. (Alpha only)

exprcvtint The expression "expression" has been converted to integer.

exprnotint The expression "expression" has type type, which is not integral.

extendtype this platform specific type is a language extension.

externinit DEC C allows the initialization of a variable with extern storage class. This differs from the VAX C behavior.

externpop This "restore" has underflowed the extern model's stack. No corresponding "save" was found.

extrabraces context is enclosed within too many pairs of braces.

extraelif Extraneous #elif in false #else block.

extraelse Extraneous #else in false #else block.

extramodule Redundant "#pragma module" or "#module" directive ignored.

extrapragargs Extra pragma arguments to #pragma pragma were found. Pragma is ignored.

extrasemi Extraneous semicolon.

falloffend The last statement in nonvoid function "name" is not a return statement.

fbfilenotfound Feedback file not found: !AD (Alpha only)

fbnomatches Could not find feedback information for most of this function: !AD (Alpha only)

fileclose An error occurred while attempting to close a source file: problem.

filenotfound File not found: !AD (Alpha only)

fileopen An error occurred while attempting to open the source file: problem.

fileread An error occurred while attempting to read a source file: problem.

filnamtoolon File name too long.

finbranch A goto to the label "label" branches into a finally handler.

floatconsqual The float_const_qual is not valid in strict ANSI mode and will be ignored.

floatconst Ill-formed floating constant.

floaterr contexta floating point error occurs in evaluating the expression "expression".

floatoverfl contextfloating point overflow occurs in evaluating the expression "expression".

foundcr A carriage-return character was encountered; it is being treated as white space.

funcelement contextthe element type of an array type is a function type.

funcidlis contexta function declarator has an identifier list but is not part of a function definition. Extraneous parameter names are ignored.

funcinit The declaration of the function "name" includes an initializer.

funcmem The member name has a function type.

funcmixptr contextfunction types differ because this declaration specifies "type1" and a previous declaration specifies "type2".

funcnotdef The function "name" has non-extern storage class, occurs in a context that requires its definition, and has no definition. The storage class has been changed to extern.

funcnotfunc In this function definition, "name" has type type instead of a function type.

funcredecl contextfunction types differ because one has no argument information and the other has ellipsis.

funcstorcls contexta function has an explicit storage class other than "static" or "extern".

funcstormod contexta function cannot have this storage class modifier. Modifier ignored.

funcstrcls The block-level declaration of the function "name" specifies an explicit storage class other than extern.

functypevoid In this function definition, a typedef void parameter is not strictly ANSI conformant and might not be portable.

gblrefinit The declaration of "name" specifies the globalref storage class and includes an initializer.

gemargsize contextthe size of "expression" exceeds the implementation's limit of 2147483647 bytes on the size of a function argument.

globalext A storage class of globaldef, globalref, or globalvalue is a language extension.

gotszovfl GOT table overflow for module !AF (Alpha only)

gprelexc GP-relative addressed data overflows limit of !UL; reduce -Gt value. (Alpha only)

gprelexc_osf GP-relative section overflows limit of !UL bytes (Alpha only)

hexdiff A hexadecimal escape sequence contains more than three hexadecimal digits.

idexpected Identifier expected but not found.

idlength An identifier name exceeds the maximum allowable length and is being truncated to number characters.

ignorecallval contextthe value returned from the function "expression" is not used; if this is intended, it should be cast to "void".

ignoredcdd The #dictionary directive has been ignored.

ignoreextra Spurious token(s) ignored on preprocessor directive line.

ignoretag contextthe tag "name" is redeclared, but will be ignored.

ignoretokens # not in column 1 is ignored, skipping to end of line.

ignorsysreg Ignoring system register specified in routine's linkage. (Alpha only)

impfncmssngret Nonvoid function "name" with implicit return type int does not contain a return statement.

Description: This message indicates that a function with an implicit return type of int does not contain a return statement. This message is not issued for functions with an explicit return type. See message missingreturn.

User Action: Consider declaring the function to be a void function. If it is supposed to return a value, add a return statement with the value the function is to return.

implicitfunc contextthe identifier "name" is implicitly declared as a function.

incargcnt Number of actual and formal parameters inconsistent in !AF (Alpha only)

incargtyp Type of actual argument inconsistent with formal parameter declaration in !AF (Alpha only)

incfilespec Invalid include file specification.

includeopen An error occurred while attempting to open the include file name: problem.

includeproepi Cannot include files in a prolog or epilog file, #include directive ignored.

incomparry Strict ANSI C extension: The member name has incomplete array type.

incompcall contextthe return type of "expression" is incomplete.

incompderef context"expression" is a pointer to an incomplete struct or union and should not be used as the left operand of a member dereference.

incompelinit context, an array's element type is incomplete, which precludes its initialization.

incompelmnt contextthe element type of an array type is incomplete.

incompmem The member "name" has an incomplete type.

incompnolink In this declaration, "name" has no linkage and is of an incomplete type.

incompparm In the definition of the function "function name", the parameter "parameter name" has an incomplete type.

incompreturn In the definition of the function "name", the return type is an incomplete type other than void.

incompstat The static declaration of "name" is a tentative definition and specifies an incomplete type.

incomptent The type of the tentatively-defined variable "name" is incomplete at the end of the compilation unit.

incompvalue context"expression" has incomplete type, and so cannot be used as an rvalue.

incompvoid contextthe element type of an array type is incomplete. The void type cannot be completed.

initconflict Overlapping static storage initializations detected at Psect !AF + !SL (Alpha only)

inline Inlining inlined function within calling function.

inlinefunc An inlining pragma contains an illegal function specification.

inlinestoclsmod The __inline storage class modifier is a language extension and might not be portable.

insufaln Alignment specified for extern model insufficient for variable. Extern model alignment updated.

intconst Ill-formed integer constant.

intimplied In this declaration, no type was specified. Type defaulted to int.

intoverfl contextinteger overflow occurs in evaluating the expression "expression".

intundfun The function "name" is not a known intrinsic function and cannot be used with #pragma pragma type.

invalidarg Invalid argument to pragma pragma. Pragma is ignored.

invalidstr The # operator produced an invalid string.

invaltoken Invalid token discarded.

invcppinargs Possible directive "#directive" within a macro argument list. Treated as part of the argument list, and not as a preprocessing directive.

invdupenum contextthe value of the enumerator "name" conflicts with a previous declaration.

invnomemprag Invalid argument to nomember_alignment pragma. Pragma is ignored.

invpackprag Invalid pack pragma. Pragma is ignored.

invpragident Invalid argument to pragma ident. Pragma is ignored.

invweakprag Invalid weak pragma. Pragma is ignored.

keycomb Illegal combination of keywords.

knrfunc The function "name" is defined using the old style K&R syntax. The ANSI C Standard has marked this syntax as obsolescent, and it is not supported in C++. Consider using the new ANSI C prototype syntax.

lblbbegin A "##" token was found at the beginning of the replacement list in the definition of the macro "name".

lblbend A "##" token was found at the end of the replacement list in the definition of the macro "name".

lblbnomacro ## is present in an illegal context; it is only legal in macro-defining preprocessing directives.

lblbresult The result of the ## operator is not a valid preprocessing token.

lbnoparm The # operator is not followed by a parameter.

lcrxcond Common Data Dictionary description extraction condition. msg.

lexerrors More than number lexical errors were encountered in the course of compilation.

linetoolong Input line too long.

listline At listing line number.

listopen An error occurred while attempting to open the listing file: reason.

localextini The block-level declaration of "name" includes an initializer and specifies storage class extern.

logicalline A logical source line longer than number characters was encountered.

longdoubleny1 Type long double has the same representation as type double on this platform and is treated as a synonym for type double in this compilation mode.

longdoublenyi Type long double has the same representation as type double on this platform.

longextern The external identifier name exceeds number characters; truncated to "truncated spelling".

longfloatext contextlong float as a synonym for double is a language extension.

longlongsufx The integer constant is of type "type" which is a language extension and might not be portable.

longlongtype contexttype "type" is a language extension.

longmoduleid Identifier name in "#pragma module" or "#module" directive exceeds 31 characters.

longmodulestr Character string constant in "#pragma module" or "#module" directive exceeds 31 characters.

longprefix Prefix string too long. Truncated to "newprefix".

longpsect Psect name is too long (maximum is 31 characters).

lvaluecast contextthe result of the cast "cast" is used as an lvalue.

macendarg In the processing of a macro-replacement of "name" within an argument to another macro, the end of that argument was encountered.

macroargcout In the argument list for the macro "name", the number of arguments supplied does not match the number of parameters in the definition.

macroeof In the processing of a macro-replacement of "name", the end of the file was encountered.

macroext A predefined macro was used that does not begin with an underscore.

macroidlist The identifier-list in the definition of the macro "name" is syntactically invalid.

macrorecurse Recursion has occurred in a macro invocation.

macroredef The redefinition of the macro "name" conflicts with a current definition because reason. The redefinition is now in effect.

macroredefin Macro redefined.

mainparm Strict ANSI C extension: The declaration of the "main" function has more than two parameters.

mainprogext MAIN_PROGRAM is a language extension.

mayhideloss context"expression" has a larger data size than "target type". The use of a cast operator might suppress the message that this assignment can result in data loss..

maylosedata context"expression" has a larger data size than "target type". Assignment might result in data loss.

mbtowc An error occurred in a call to the mbtowc function.

mechmismatch Argument passing mechanism does not match formal parameter mechanism for !AF (Alpha only)

misactarg <Missing actual argument for corresponding formal !AF (Alpha only)

misalgndmem This member is at offset offset, which is not a multiple of the member's alignment of align. Consider padding before this member, rearranging the order of member declarations, or using pragma member_alignment.

misalgndstrct This member requires align1 alignment for efficient access, but is contained in a struct containing align2 alignment. Consider using pragma nomember_alignment

misdefarg Missing argument for "defined" operator.

misdefpar Missing right parenthesis for "defined" operator.

mismatparam contextparameter number has a different type than specified in an earlier declaration of this function.

mismatthread contextthe __declspec(thread) storage class modifier of "name" is different from a previous declaration of "name" at leavevmodelocation.

misparamcount contextthe number of parameters differs from an earlier declaration of this function.

missingfunc The function "name" has internal linkage, occurs in a context that requires its definition, and has no definition.

missinglabel The label "label name" is the target of a goto statement within the function "function name", but has no definition within "function namevevmode".

missingmacro An identifier was not found immediately following "#define".

missingreturn Nonvoid function "name" does not contain a return statement.

Description: This message indicates that a function with an explicit return type does not contain a return statement. This message is not issued for functions with an implicit return type of int. See message impfncmssngret.

User Action: Consider declaring the function to be a void function. If it is supposed to return a value, add a return statement with the value the function is to return.

missingtype Missing type specifier or type qualifier.

mixfuncvoid contextcompatibility of a pointer to void and a pointer to a function might not be portable.

mixinline The function name is declared both inline and noinline.

mixlinkage context"name" is declared with both internal and external linkage.

mixoldnew The definition of the function name includes both a prototype and a declaration list.

mixstorcls contexta storage class has already been specified. This storage class is ignored.

modnoidstr Invalid identifier or character string constant specification.

modstorcls Storage class modifier noshare has no meaning with this storage class. Modifier is ignored.

moduleext "#module" preprocessing directive is a language extension.

modulefirst "#pragma module" or "#module" directive must precede any language text.

msgpop This "restore" has underflowed the message stack. No corresponding "save" was found.

multichar A character constant includes more than one character or wide character.

multilink Multiple linkage pragmas specified for "routine name".

multilinkreg The register "register" is specified more than once in the linkage pragma. Pragma is ignored.

multimain More than one main program has been defined.

multipsectname Multiple psect_type names specified. The name "new_name" supersedes "old_name".

needaddrcont context"name" does not have a constant address, but occurs in a context that requires an address constant.

needarith context"expression" has type type, which is not arithmetic.

needconstexpr context"name" is not constant, but occurs in a context that requires a constant expression.

needconstext context"name" is not constant, but occurs in a context that requires a constant expression. This is an extension of the language.

needdfloat The CDD description for name specifies the D_Floating data type; The data cannot be represented when compiling with /G_FLOAT.

needfuncptr context"expression" points to type type, but occurs in a context that requires a pointer to a function type.

needgfloat The CDD description for name specifies the G_Floating data type; The data cannot be represented when compiling with /NOG_FLOAT.

needieee The CDD description for name specifies a VAX floating data type; The data cannot be represented when compiling with /FLOAT=IEEE_FLOAT.

needintexpr context"expression" has type type, which is not integral.

needlvalue context"expression" is not an lvalue, but occurs in a context that requires one.

needmember context"name" is not a member of "struct or union expression".

neednonbltin context"name" is a builtin and cannot be used in this context.

neednonconst context"expression" has const- qualified type, but occurs in a context that requires a modifiable lvalue.

neednonconstv context"expression" has readonly- or const-qualified type, but occurs in a context that requires a modifiable lvalue.

neednonvoid context"expression" has void type, but occurs in a context that requires a nonvoid result.

needpointer context"expression" has type type, but occurs in a context that requires a pointer.

needptrobj context"expression" does not point to an object type.

needscalar context"expression" has type type, which is not scalar.

needscalartyp context"source type" is type type, which is not scalar.

needsimpleasm This asm is unsupported or illegal.

needstrconst context"name" is not a legal asm string, a string constant is required.

needstruct context"expression" has type type, but occurs in a context that requires a union or struct.

nestedenum The type "type" is declared nested within "enclosing type". In C, the nesting is ignored and type and its enumerator constants can be accessed as if they were not nested. However, the type and its enumerators are members in C++.

nestedtype The type "type" is declared nested within "enclosing type". In C, the nesting is ignored and type can be accessed as if it was not nested. However, the type is a member in C++.

newlocale The compiler is setting its locale to locale.

nlchar An unexpected newline character is present in a character constant.

nlheader A newline occurs inside of a header name.

nlstring An unexpected newline character is present in a string literal.

noadd context"expression1" and "expression2" cannot be added.

nobitfield context"expression" is a bitfield, but occurs in a context that precludes bitfields.

nocasehere This case label occurs outside of any switch statement.

nocddhere CDD is not available on this platform. The #dictionary directive has been ignored.

nocolon Missing ":".

nocoloninexpr Missing colon for conditional expression.

nocomma Missing ",".

nocondexpr Missing #if conditional expression.

noconvert context"expression" is of type "type", and cannot be converted to "target type".

noconvertcls context"expression" has type type and cannot be converted to target type type that is incompatible.

nodcl contextthere is no declarator.

nodefaulthere This default label occurs outside of any switch staement.

noendif Missing #endif directive.

noequal Missing "=".

noequality context"expression1" and "expression2" cannot be compared for equality or inequality.

nofunc There is no function named name defined in this compilation unit.

noidentstr Invalid character string constant specification.

noinclfile Cannot find file filename specified in #include directive.

noincludearg #include directive missing argument.

noinit The type of variable does not permit initialization.

noleavetarg This leave statement is not within a try statement.

noleftopernd Token pasting operator missing left operand.

nolinkage context"name" has no linkage and has a prior declaration in this scope at where.

nolonglong context64-bit integral types are not supported on this platform.

nolongvptr 64 bit virtual pointers are not supported on this platform. Pragma is ignored.

nomacroname #define directive is missing macro name identifier.

nomainuflo No main function encountered within module. /IEEE_ MODE=UNDERFLOW_TO_ZERO is ignored.

nomodule The module directive is not supported on this platform and will be ignored.

nonatomic Unable to generate code for atomic access (Alpha only)

nonewtype The type "type" is being declared as part of context. C++ does not permit a new type to be declared in this context.

nongrnacc Unable to generate code for requested granularity. (Alpha only)

nonlbeforeeof File does not end in unescaped newline.

nonmultalign The size of this structure is size bytes, which is not a multiple of its alignment of align. Respecify the alignment of the structure or add bytes bytes of additional padding.

nonoctal An octal constant contains nonoctal digits.

nonportdefined The #ifdef defined(...) directive might not be portable.

nonportlinedir Non-ANSI #line directive.

nontermif An #if, #ifdef or #ifndef is not terminated.

nonulinit context, there is no room for the terminating '\0'. ANSI C allows this, but C++ does not.

noobj Object file deleted.

nooperand Stringization operator missing operand.

nooperands Token pasting operator missing both operands.

noparenarglst Missing right parenthesis for macro argument list.

noparm This declaration does not declare a parameter.

noparmlist The declaration of function has an empty parameter list. If the function has parameters, they should be declared here; if it has no parameters, "void" should be specified in the parameter list.

noparmtyp Parameter has no type or storage class.

nopragarg No argument for #pragma pragma was found. Pragma is ignored.

nopsect Missing psect name.

noregavail Unable to satisfy program register allocation requirements. (Alpha only)

norelational context"expression1" and "expression2" cannot be compared with a relational operator.

noreturnval The function "name" returns a value, but no value is given in this return statement.

noretval Routine !AF does not return a value. (Alpha only)

norghtparen No right parenthesis for parameter list.

norightopernd Token pasting operator missing right operand.

norightparen Missing ")".

nosehhand Missing exception handler.

nosemi Missing ";".

nosfile Cannot create .s file: overlapping static storage initializations at Psect !AF + !SL (Alpha only)

noshareext noshare is a language extension.

noshrinshr Noshare variable resides in shr extern model - noshare ignored.

nostring Missing string literal.

nosubtract context"expression2" cannot be subtracted from "expression1".

notaddrcast contextthe address constant "expression" can be cast only to a pointer type, but "type" is type class type.

notcompat contextthe type of "name" is not compatible with the type of a previous declaration of "name" at location.

notconstqual contextthe referenced type of the pointer value "expression" is const, but the referenced type of the target of this assignment is not.

notinparallel The parallel processing pragma "pragma" must appear inside a parallel region.

notlocalparm context"identifier" is not a local parameter.

notoneorzero contextthe value of "expression" is neither 0 nor 1.

notparm contextname is not a parameter.

notposint contextthe array bound "expression" is not a positive integer.

notrightmost context"identifier" is not the rightmost parameter to "function".

notscalarctrl The controlling expression "expression" has type type, which is not scalar.

nottypedef context"name" does not name a type.

notunalqua contextthe referenced type of the pointer value "expression" is __unaligned, but the referenced type of the target of this assignment is not.

notvolqual contextthe referenced type of the pointer value "expression" is volatile, but the referenced type of the target of this assignment is not.

notypes Declaration has no type or storage class.

nouniqformals Nonunique formal parameter definition.

nowhile Missing "while".

numargs contexta function declarator has more parameters than the implementation's limit of 1024.

octal89 The use of octal 8 and 9 is a language extension.

okcppinargs "#directive" directive within a macro argument list is not portable.

openbrace Missing "{".

opencomment A comment is not terminated.

openparen Missing "(".

optlevel Invalid optimization level number, defaulted to number.

othermember context"name" is a member of another struct or union.

outopen An error occurred while attempting to open an output file: reason.

parmincomp contextthe parameter name has an incomplete type.

parminit contexta parameter declaration cannot include an initializer.

parmstorcls contexta parameter has an explicit storage class other than "register".

parmstormod contexta parameter cannot have a storage class modifier.

parmtyplist Ill-formed parameter type list.

parnocommavastart Missing one or two parameters to "va_ start".

parnoident Missing identifier.

parnotimp Not implemented in the parse: feature.

pasnotimp Not implemented: feature.

ppmisschunk This schedtype modifier to the parallel processing pragma pfor requires the pragma to have a chunksize modifier, and none was specified.

ppmissiterarg The parallel processing pragma "iterate" must be followed by three expressions.

ppnotavar The modifier "modifier" to the parallel processsing pragma "parallel" must be a list of simple variables.

pppragmamiss The parallel processing pragma "pragma" must be followed by "pragma".

ppunexptoken Error parsing parallel processing pragma. Found "found" when expecting "expecting".

ppuselessopt1 The chunksize modifier to the parallel processing pragma pfor requires a schedtype of dynamic or interleave. Chunksize is ignored.

ppuselessopt2 The [no]ifinline modifier to the parallel processing pragma parallel requires an if modifier. Modifier is ignored.

pragignore The name pragma is not active. Pragma is ignored.

pragma Strict ANSI C extension: A #pragma directive was encountered.

pragmaident Please use the preferred "#pragma ident" directive in place of the "#ident" directive.

pragmamod Please use the preferred "#pragma module" directive in place of the "#module" directive.

pragnocanalign The compiler on this platform cannot process octaword or page aligned data. The alignment used will be quadword.

predefined This predefined macro cannot be redefined.

prenotimpwar Not implemented yet: feature.

Description: This message indicates that you have used a feature not fully supported by the compiler.

User Action: Avoid using the indicated feature.

preopte An error was detected in the processing of a option spelling option: #define or #undefine problem

preoptw A problem was detected in the processing of a option spelling option: #define or #undefine problem

preprocout An error occurred while attempting to open the preprocessor output file: problem.

promotmatch contextthe promoted type of name is incompatible with the type of the corresponding parameter in a prior declaration.

promotmatchw contextthe promoted type of name is incompatible with the type of the corresponding parameter in a prior declaration.

protoscope The type "type" has been declared with prototype scope. This might not be what you intended.

protoscope2 In an earlier declaration of this function a struct type was declared with prototype scope. Now it is declared with a different prototype scope.

protoscope3 In an earlier declaration of this function a struct type was declared with prototype scope. Now it is declared with file scope.

protostatic The extracted header file contains prototypes for static functions, which should be removed before including the header in a source file other than the originator.

prototag The extracted header file contains prototypes with tag names, which should be moved to after the tag name declaration.

prototypedef The extracted header file contains prototypes with typedefs, which should be moved to after the typedef declaration.

psectfirst "#pragma psect_type" directive must precede any declarations.

psecttoolong Psect name is too long (maximum is 31 characters). Pragma is ignored.

ptrmismatch contextthe referenced type of the pointer value "expression" is "type", which is not compatible with "target type".

qualaftcomma Type qualifier(s) after a comma ignored.

qualisptr context"expression" has a pointer type, but occurs in a context that expects a struct or union.

qualnotus contextthe qualifier for "name" is not a struct or union.

readonlyext readonly is a language extension.

redef This declaration contains a redefinition of "name".

redefstruct contextthe struct "name" is redefined.

redeftag contextthe tag "name" is redeclared.

redefunion contextthe union "name" is redefined.

regconflict Conflicting required uses of register(s): !AD (Alpha only)

regnoshare contextnoshare cannot be used with the register storage class. Modifier noshare is ignored.

rejectstatic The support for building kernel objects has been disabled in this compiler. Please use the default cc compiler that shipped with the operating system.

relocalignment An initialization requiring relocation is not correctly aligned at Psect !AF + !@SI (Alpha only)

renamerr An error occurred while attempting to rename a file: problem.

resmismatch The pointer size restored with pragma pragma name was saved using pragma pragma name. The pointer size restored will take effect.

restrictext The __restrict type qualifier is a language extension.

restrictext1 Placement of the __restrict qualifier within the array bound specifier of a formal parameter declaration is a language extension.

restrictnop The restrict type qualifier can only be applied to a pointer type that points to an object or incomplete type. Qualifier is ignored.

rtlmapnotfound C RTL mapping information for RTL name not found. Could not access image_name.

rtlmismatch DEC C RTL prefix table version mismatch: RTL table is Vmajor.minor, compiler needs Vmajor.minor leavevmode.

sameastypedef Declaring an extern with the same name as a file scope typedef is a language extension.

scacall This function contains too many parameters for SCA to handle. Function parameter info will be truncated.

scacovflo Compiler Internal Error: SCA event buffer overflowed. Please submit an SPR.

scalefactor The CDD description for name specifies a scale factor of number. The scale factor is being ignored.

shareconst In this declaration, noshare has been ignored due to the presence of const or readonly.

shiftcount contextthe shift count "number" is negative or exceeds the size of the operand "expression"".

sizebit context"expression" is a bitfield, and so has no size.

sizefunc context"expression" is of a function type, and so has no size.

sizefunctyp context"type" is a function type, and so has no size.

sizeincomp context"expression" is of an incomplete type, and so has no size.

sizeincomptyp context"type" is an incomplete type, and so has no size.

srcline At source line number.

ssnotimp feature is not yet implemented.

stackpop This "restore" has underflowed the pragma stack name stack. No corresponding "save" was found.

statictrunc In the static initialization, the value of the address has been truncated.

statinitwarn The linker will be unable to perform this static initialization if the initializer is defined in a sharable image.

stdarg contextstdarg.h macros might be required if the address of the parameter name is used to index through a parameter list.

stkallexc Allocations to stack exceeded maximum stack size. (Alpha only)

stoalnerr Psect !AF alignment is insufficient for allocation of !AF (Alpha only)

storclsdcl contexta storage class without a declarator is meaningless.

storeqexc Allocations to !AF section exceeded growth bounds. (Alpha only)

storisstat This redeclaration of the static initialized variable "name" will have static storage class which differs from the VAX C behavior.

stormoddcl contexta storage class modifier without a declarator is meaningless.

strctpadding An additional number bytes of padding have been implicitly inserted prior to this member for proper alignment of this member. Consider explicitly padding or rearranging the order of member declarations.

stringconst Ill-formed string constant.

structbrace context a required set of braces is missing.

subinvalidchr Parameter substitution produced an invalid character constant.

subinvalidstr Parameter substitution produced an invalid string literal.

success Normal successful completion.

suppressoptlevel File not optimized; use -g3 if both optimization and debug wanted.

switchlong The signed or unsigned long expression "expression" is used in a switch statement.

sysregused System register specified as external register. (Alpha only)

system !AD (Alpha only)

tagdiffer contextthe tag "name" differs from the tag "name" used in an earlier declaration of this function.

tagorbrace Missing tag or "{".

tailrecursion Eliminating tail-recursive call within function "some function".

tentredef This definition or tentative definition of "name" is redefining the definition or tentative definition on hboxlocation. This is not allowed in C++. compiler__declare_tent_redef1.

tesmes this unknown is a unknown test.

text_ad !AD (Alpha only)

text_as !AS (Alpha only)

textarray The CDD description for name specifies that it is text 1; It has been translated into an array of char.

textarrayn The CDD description for name specified that it is text 1; It has been translated into an array of char because null_terminate was used.

textchar The CDD description for name specified that it is text 1; It has been translated into a type char.

textmodule The text library module form of #include is an extension.

threadfunc contextthe __declspec(thread) storage class modifier cannot be used with a function type. Modifier is ignored.

threadnyi contextthe __declspec(thread) storage class modifier is not implemented on this platform. It will be ignored except to verify correct compile-time usage.

threadsto1 contextthe __declspec(thread) storage class modifier requires a storage class of extern, static, or none. Modifier is ignored.

threadsto2 contextthe __declspec(thread) storage class modifier requires a storage class of extern, or static. Modifier is ignored.

toofewactuals Too few actual parameters in macro call.

toofewargs context"function expression" expects correct number arguments, but actual number are supplied.

toolong context, "expression" is too long by count character(s).

toomany context, there are actual number elements, which is extra number too many.

toomanyactls Too many actual parameters in macro call.

toomanyargs context"function expression" expects correct number arguments, but actual number are supplied.

toomanyerr More than number errors were encountered in the course of compilation.

toomanytokens Too many tokens in macro expansion.

toomanytxtlib Too many text libraries. Library library name and subsequent will not be searched.

toomnyrel Object file section !AD has !UL relocations; maximum allowed is !UL (Alpha only)

trailcomma Trailing comma found in enumerator list.

typealign context_align cannot be used with the typedef storage class. Modifier _align is ignored.

typeconflict context"typespec1" cannot be combined with "typespec2".

typedeffunc In this function definition, "name" acquires its type from a typedef.

typedefinit The declaration of the typedef "name" contains an initializer.

typedefna Accepting an old-style parameter name which matches a typedef is a language extension.

typeexpr context"name" is declared as a label, tag, or typedef, and so cannot occur as an expression.

typnotfound contextno typedef with the name "name" occurs in any accessible scope.

typqualnot A type qualifier is not allowed in this context.

uabort Compilation terminated by user.

ucode An error (problem) occurred in writing the ucode file.

ucodesyms An error (problem) occurred in writing the ucode symbol table file.

unalignedfunc Ignoring __unaligned type qualifier in declaration of name.

unalignext The __unaligned type qualifier is a language extension.

unavailpragma The pragma "pragma name" is not available on this platform.

unavolacc Volatile access appears unaligned, but must be aligned at run-time to ensure atomicity and byte granularity (Alpha only)

uncalled Routine !AF can never be called. (Alpha only)

undeclared context"name" is not declared.

undefbadid An identifier was not found immediately following "#undef".

undefdefined The identifier "defined" cannot be undefined.

undefenum contextthe enum "name" is not defined.

undefeof In the processing of "#undef name", the end of the file was encountered.

undefescap An undefined escape sequence was encountered; the backslash is being ignored.

undefextra Spurious tokens were found following "#undef macro name".

undefined contextname is not defined.

undefpred This predefined macro cannot be undefined.

underflow contextunderflow occurs in evaluating the expression "expression".

uninit Variable !AF is fetched, not initialized. (Alpha only)

unionbrace context a required set of braces is missing.

unkextmod Unknown extern model. Pragma is ignored.

unkintrin The function "routine name" is not a known intrinsic function and cannot be used with #pragma pragma name. Pragma is ignored.

unkmsgcmd Bad or missing command in pragma message. Pragma is ignored.

unkmsgid Unknown message id or group "id" is ignored.

unknownchar Spurious character: character.

unknownlink The specified linkage is undefined. Pragma is ignored.

unknownmacro "name" is not currently defined as a macro. It has been replaced by the constant zero.

unknownpragma The pragma "pragma text" is unrecognized.

unknownprgma Unrecognized #pragma directive.

unkpsectattr Unknown psect attribute for extern model. Pragma is ignored.

unmatchelif Unmatched #elif.

unmatchelse Unmatched #else.

unmatchendif Out of place #endif directive ignored.

unnamedmem An unnamed member does not have a bitfield, struct, or union type. Member is ignored.

unnameparm In the definition of the function name, a parameter has no name.

unreach Code can never be executed at label !AF (Alpha only)

unrlinkattr Unrecognized attribute for linkage pragma. Pragma is ignored.

unsfloatop Floating point code used with nofloat_ switch.

unstructmem The declaration of a member which is an unnamed struct or union type is an extension and might not be portable.

unsupptype The CDD description for name specifies a data type not supported in C.

uselessalign context_align cannot be used with the class storage class. Modifier _align is ignored.

uselessstomod contextnoshare or readonly cannot be used with the typedef storage class. Modifier is ignored.

uselesstyped This typedef declaration is useless because it does not declare a typedef name.

valuepres contextthe unsigned char or unsigned short value "expression" is being widened to int rather than unsigned int, which differs from unsigned preserving semantics.

variantdcl A declaration of a variant struct or variant union must have a single declarator which is an identifier.

variantdup The field "member name" of this variant struct or variant union duplicates the name of a field in the enclosing struct or union.

variantext variant struct or union is a language extension.

varianttag A variant struct or union cannot have a tag.

variantunion variant_union union is a language extension. Consider using an anonymous union (a union without a tag or declarator) instead: anonymous unions are supported by C++ and some other vendor's C compilers.

varnomem A variant struct or variant union can occur only as a member of a struct or union.

verticalspdir Vertical whitespace within pp directive.

vlistalign contextthe alignment of "expression" is insufficient.

vlistsize contextthe size of "expression" is less than the size of a va_list structure as defined in stdarg.h and varargs.h.

voidreturn The function "name" has return type void, and so cannot contain a return statement with an expression.

volatilefunc Ignoring volatile type qualifier in declaration of name.

warnimplfunc contextthere is no prototype for "name".

weakcomm The primary name "name" is declared as a common or external, and is not defined with an initial value in this compilation unit.

wrtinnowrt Writable variable resides in nowrt extern model.

xtralarge Line number is greater than the 32767 specified by ANSI and might not be portable.

zerodiv contextdivision by zero occurs in evaluating the expression "expression".

zerodivide Division by zero in expression.


Previous Page | Next Page | Table of Contents | Index