Internal : Message number %d, exceeds allowed range.

The message number exceeds the allowed maximum size. It is either larger than the maximum allowed message number for the front end or is less than 1.

This message should never be generated. There is something wrong with the message catalog or installation of the compiler. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code. You may be able to change your code, so that the compiler does not try to issue this message.

Message ID: INTERNAL_0001


Internal : Message level %d, is out of range.

The message level exceeds the allowed range. It is not in the valid range of message levels for the message system.

This message should never be generated. There is something wrong with the message catalog or installation of the compiler. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code. You may be able to change your code, so that the compiler does not try to issue this message.

Message ID: INTERNAL_0002


Internal : Message system failed trying to issue message.

The message system was unable to issue the message indicated by the message number included in this message. This internal error can arise for a number of possible reasons, including:

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that the compiler does not try to issue this message.

Message ID: INTERNAL_0003


Error : The MODULE PROCEDURE statement is only allowed in a generic interface block.

A MODULE PROCEDURE statement can only be specified in an interface block that has a generic_spec. The compiler found a MODULE PROCEDURE statement in an interface block that does not have a generic specification.

Message ID: ERROR_0004


Error : This statement is out of order.

The current statement violates the Fortran standard statement ordering rules.

Message ID: ERROR_0005


Error : A keyword or identifier must follow the label or construct name.

The compiler has found a label or construct name. A keyword or identifier must follow the label or construct name. The following examples may clarify this.

   10          ! This is an illegal statement
   10 CONTINUE ! This is legal; a keyword follows 10
   

Message ID: ERROR_0006


Error : A construct name is not allowed on this kind of statement.

A construct name can only appear on an IF-THEN statement, a DO statement, or a SELECT CASE statement. This error is generated when a construct name is found on a statement other than those listed above.

Message ID: ERROR_0007


Error : This statement must precede all component definitions in the derived type definition.

This PRIVATE or SEQUENCE statement follows one or more component definitions in the derived type definition. The PRIVATE and SEQUENCE statements must precede any component definitions.

Message ID: ERROR_0008


Internal : No forward reference entries exist for label %s even though it is undefined.

If an attribute entry exists for the label then it must be referenced in the scoping unit. If it was referenced but was never defined, there must be at least one forward reference entry to represent the unresolved forward reference. However, the forward reference chain for the label is empty.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0009


Error : Dummy argument "%s" is already defined in this argument list.

The name of a dummy argument appears more than once in the argument list on a FUNCTION, SUBROUTINE, ENTRY or statement function definition statement.

Message ID: ERROR_0010


Log_Warning : The line size option is ignored because free source form is in effect.

The line size option is ignored when the source form is set to free, because the line may contain up to 132 characters. With fixed source form the line size option is valid, because the Fortran standard limits the line to 72 characters. The option allows the line length to be extended to 80 characters.

Message ID: LOG_WARNING_0011


Internal : %s underflow.

This message is generated from POP_SRC macro in src_input.m. The source stack has underflowed.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0012


Ansi : Fortran requires multiple entry point function results to both be default intrinsic types.

A multiple entry point function (a function with one or more ENTRY statements) can have entry points which return results of differing declared types only if all entry points return results which are scalar and of type default real, default logical, double precision real, default complex, or default integer. If the entry point has the POINTER attribute, all entry points must be the same type and be pointers. The compiler allows the entry points with the same declared types to have different kind parameters.

Message ID: ANSI_0013


Limit : Insufficient memory is available for compilation to continue.

The compiler ran out of memory during compilation of the program. Check with your product support organization and request more memory for the job. Remember that program compilation may be only one of several processes executing in the job space.

Message ID: LIMIT_0014


Error : This statement is not allowed in a block data program unit.

Derived type definitions, type declaration statement and the following statements are allowed in a block data program unit:

   	COMMON
   	DATA
   	DIMENSION
   	END BLOCK DATA
   	EQUIVALENCE
   	IMPLICIT
   	IMPLICIT NONE
   	INTRINSIC
   	PARAMETER
   	POINTER
   	SAVE
   	TARGET
   	TASK COMMON
   	USE
   

The SEQUENCE statement must be specified in a derived type definition to be in a block data program unit.

Message ID: ERROR_0015


Error : The %s statement is not allowed in a main program unit.

The following statements are not allowed in a main program unit:

   	ENTRY
   	INTENT
   	OPTIONAL
   	PRIVATE
   	PUBLIC
   	RETURN
   

These statements must be inside a construct or contained scoping unit to be in a main program unit:
-- SEQUENCE, END TYPE in a derived type definition
-- MODULE PROCEDURE in a generic interface block
-- ELSE, ELSE IF, END IF in an IF construct
-- CASE, END SELECT in a CASE construct
-- ELSEWHERE, END WHERE in a WHERE construct
-- CYCLE, EXIT, END DO in a DO construct
-- FUNCTION, SUBROUTINE in an interface block
-- END FUNCTION in an interface body
-- END SUBROUTINE in an interface body
-- END INTERFACE in an interface block

Message ID: ERROR_0016


Error : Cannot open file. It is needed for debugging or tracing.

The compiler cannot open the debug file or the trace file.

Message ID: ERROR_0017


Error : This statement must not follow a MODULE PROCEDURE statement in a generic interface block.

The syntax for an interface block is:

           interface_stmt
             [interface_body]...
             [module_procedure_stmt]...
           end_interface_stmt
   

Message ID: ERROR_0018


Error : The %s statement is not allowed in a module.

Derived-type definitions, type declaration statements and the following statements are allowed in a module (before the END MODULE or the CONTAINS statement):

   	ALLOCATABLE
   	COMMON
   	DATA
   	DIMENSION
   	EQUIVALENCE
   	EXTERNAL
   	IMPLICIT
   	IMPLICIT NONE
   	INTERFACE
   	INTRINSIC
   	NAMELIST
   	PARAMETER
   	POINTER
   	PUBLIC
   	PRIVATE
   	SAVE
   	TARGET
   	USE
   

These statements must be in an interface block or contained scoping unit to be in a module program unit.
-- MODULE PROCEDURE in a generic interface block
-- SEQUENCE, END TYPE in a derived-type definition
-- FUNCTION, SUBROUTINE, END FUNCTION, END SUBROUTINE, END INTERFACE in an interface block

Message ID: ERROR_0019


Ansi : The use of DOUBLE COMPLEX is an extension to the Fortran standard.

The DOUBLE COMPLEX statement is not part of the Fortran standard.

Message ID: ANSI_0020


Error : The type attributes for two entry points conflict.

If the result of any entry point of a multiple entry function (a function with one or more ENTRY statements) is of type character, or a derived type then all entry points in that function must return a result that is of the same type. If the function result is of type character, all entry points must return a result with the same declared character length. If the result is of a derived type, then all entries must be the same derived type.

Message ID: ERROR_0021


Ansi : The type of function result "%s" must be a default intrinsic type if it does not match the type of other entry points.

A multiple entry point function (a function with one or more ENTRY statements) may have entry points which return results of differing declared types only if all entry points return results which are scalar and of type default real, default logical, double precision real, default complex, or default integer. If the entry point has the POINTER attribute, all entry points must be of the same type and have the POINTER attribute.

The compiler allows the mix of default and non-default real, logical, double precision, complex and integer.

Message ID: ANSI_0022


Error : Label is not defined in this scoping unit.

When a statement label is referenced, the label must be the statement label of a branch target statement that appears in the same scoping unit as the label reference. For example, if the following GO TO statement appears in a subprogram, label 10 must be defined in the same subprogram.

        GO TO 10
   

Message ID: ERROR_0023


Error : This character constant, for this I/O control information list item, is not allowed.

Many I/O control information list items allow only a limited set of valid character constants. A character constant was encountered that is not valid for this control list item. Following are the I/O control items and their valid character constants:

   OPEN I/O control
    list item                   Character constants
    STATUS    OLD, NEW, SCRATCH, REPLACE, UNKNOWN
    ACCESS    SEQUENCTIAL, DIRECT
    FORM      FORMATTED, UNFORMATTED
    BLANK     NULL, ZERO
    POSITION  ASIS, REWIND, APPEND
    ACTION    READ, WRITE, READWRITE
    DELIM     APOSTROPHE, QUOTE, NONE
    PAD       YES, NO
   

For the CLOSE I/O control list item STATUS, the allowed character constants are KEEP and DELETE.

For the READ/WRITE I/O control list item ADVANCE, the allowed character constants are YES and NO.

Message ID: ERROR_0024


Error : This statement is not allowed in a derived type definition.

The only statements allowed in a derived type definition are PRIVATE, SEQUENCE and the component definition statement. PRIVATE is only allowed if the derived type definition is in a module program unit.

Message ID: ERROR_0025


Error : This statement is not allowed in an interface block; expected SUBROUTINE, FUNCTION, MODULE PROCEDURE or END statement.

The only statements allowed in an interface block are FUNCTION, SUBROUTINE, MODULE PROCEDURE, and END INTERFACE. FUNCTION and SUBROUTINE start an interface body. END INTERFACE ends the interface block. MODULE PROCEDURE can be specified if the interface block is a generic interface. A generic interface contains a list of module procedures that can be referenced with the generic name.

Message ID: ERROR_0026


Error : Function entry has result name. It must be used when declaring the result to be an array.

If a function has a result name, the result name must be used when declaring the result to be an array.

Message ID: ERROR_0027


Error : A trailing ")" is missing in the program string.

The parentheses groups do not match in the optional parenthesized list that can appear on the PROGRAM statement.

Message ID: ERROR_0028


Error : The maximum number of unnamed block data program units is 26 and has been exceeded.

The Fortran standard limits unnamed block data program units to 1 in an executable program. However, the compiler extends this limit to 26. The compiler detected more than 26 unnamed block data program units.

Message ID: ERROR_0029


Ansi : The Fortran standard does not allow more than one unnamed BLOCK DATA program unit.

The Fortran standard does not allow more than one unnamed block data program unit.

Message ID: ANSI_0030


Ansi : Arguments to a PROGRAM statement are an extension to the Fortran standard.

A PROGRAM statement contains an argument list enclosed in parentheses. The Fortran standard does not provide for actual arguments to a main program.

Message ID: ANSI_0031


Error : The type specification "CHARACTER*(*)" is not allowed in an IMPLICIT statement.

Assumed-length character type declarations are not allowed in IMPLICIT statements.

Message ID: ERROR_0032


Error : If the component is being typed as the derived type being defined, it must have the POINTER attribute.

The Fortran standard requires that a component of a derived type may not be declared to be of the derived type, unless it is a pointer. For example:

         TYPE BB
           TYPE(BB) :: A
         END TYPE
   

Component A is illegal, because it is defined as the type being declared (BB).

         TYPE ZZ
           TYPE(ZZ), POINTER :: A
         END TYPE
   

Component A is legal here, because it is a pointer to a structure of the type being declared (ZZ).

Message ID: ERROR_0033


Internal : The name or attribute index is not valid. It is less than 0 or greater than the table index.

The local name table index or attribute table index is not valid. It is either less than zero or greater than the last table index entered.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0034


Error : The character length has exceeded the maximum length.

The maximum character length was exceeded.

Message ID: ERROR_0035


Error : Function entry has result name, which must be used when declaring the result to be a pointer.

If a function has a result name, the result name must be used when declaring the result to be a pointer.

Message ID: ERROR_0036


Ansi : Input lines greater than 72 characters long are an extension to the Fortran standard.

The compiler detected an input line greater than 72 characters. The Fortran standard does not provide for input lines greater than 72 characters long in fixed source form.

Message ID: ANSI_0037


Internal : This character is not valid. Expected keyword DO following failed parse of type spec DOUBLE.

This error is generated when DO is not encountered as expected.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0038


Error : This namelist group name was referenced in an I/O statement. It must not be specified in this NAMELIST statement.

Namelist statements may be mixed in with executable statements. However, all definitions of a specific namelist group must occur before the first reference to the namelist group by an I/O statement.

Message ID: ERROR_0039


Error : If this main program has no PROGRAM statement specified, then no name can be specified on the END PROGRAM statement.

The compiler detected an END PROGRAM statement followed by a name for a program unit. This program unit has no PROGRAM statement and therefore no name.

Message ID: ERROR_0040


Error : The %s statement must only be specified once for derived type definition "%s".

The PRIVATE and SEQUENCE statements must only be specified once in a derived type definition.

Message ID: ERROR_0041


Internal : Attribute entry %d has a variant problem with field %s.

The compiler detected a variant problem. A field is being accessed in the attribute table, but the wrong variant is active. The field may actually be in the attribute auxiliary table, but it is checking the attribute table variant. In general whether the field actually resides in the attribute table or the attribute auxiliary table should make no difference in resolving the problem.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0042


Error : Only one such statement is allowed in each such construct.

Each IF construct must only have one ELSE block. Each WHERE construct must only have one ELSEWHERE block. The compiler detected more than one ELSE or ELSE WHERE statement in the IF or WHERE construct.

Message ID: ERROR_0043


Error : The entry point name of the host must not be redefined in an interface body.

Within an external subprogram one of the entry point names was specified in an explicit interface in a contained subprogram. Entry point names already have explicit interfaces in the host, so they may not have another interface specified in a contained procedure. The following example illustrates an illegal redefinition.

      FUNCTION ABC()
        CONTAINS
          SUBROUTINE SAM()
            INTERFACE
               FUNCTION ABC() !  Illegal re-definition
               END FUNCTION   !  of ABC's interface
            END INTERFACE
          END SUBROUTINE
      END FUNCTION
   

Message ID: ERROR_0044


Error : Component is private type, therefore derived type must also be private or have private components.

If a component of a derived type is declared to be a private type, either the derived type definition must contain the PRIVATE statement or the derived type must be private.

Message ID: ERROR_0045


Ansi : The TASK COMMON statement is an extension to the Fortran standard.

The TASK COMMON statement is an extension to the Fortran standard.

Message ID: ANSI_0046


Error : A '*' must only be used with the UNIT or FMT I/O control information list items.

An asterisk (*) was encountered in an I/O control information list in a position or with a keyword other than UNIT or FMT.

Message ID: ERROR_0047


Error : The DO variable must not be defined while it is active.

The name of an active DO variable appeared in a statement that would change the DO variable's value. The DO variable can be used but not redefined within the range of its loop.

Message ID: ERROR_0048


Log_Error : Cannot open source file.

The compiler cannot open the source file.

Message ID: LOG_ERROR_0049


Internal : Attempt to read past end of file.

This is generated from fixed_get_line in src_input.c. The compiler has attempted to read past EOF. The source input file may be corrupted.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0050


Error : A compiler directive must not be continued.

A compiler directive must not be continued.

Message ID: ERROR_0051


Ansi : More than this many continuation lines is an extension to the Fortran standard in this source form.

The Fortran standard only allows for 19 continuation lines in fixed source form and 39 continuation lines in free form.

Message ID: ANSI_0052


Error : The first line of an include file must not be a continuation line.

The first line of an include file must not be a continuation line.

Message ID: ERROR_0053


Error : The source line following an INCLUDE line must not be a continuation line.

The line following an INCLUDE line must not be a continuation line.

Message ID: ERROR_0054


Warning : The file line does not end with a newline.

The compiler expects all lines in the source file to end with a newline character. This line does not end with a newline character.

Message ID: WARNING_0055


Error : A continuation line must not contain a label.

It is illegal to define a label on a continuation line.

Message ID: ERROR_0056


Error : The INCLUDE file name length exceeds the maximum number of characters.

The length of the name of the INCLUDE file exceeds the maximum length. Shorten the name of the INCLUDE file.

Message ID: ERROR_0057


Error : The INCLUDE file name is missing.

An INCLUDE line does not follow the expected form. In the following syntax, file is the name of the file to be included:

         INCLUDE 'file'
   

The file name must be enclosed in apostrophes or quotation marks. Only an embedded comment can follow the closing delimiter.

Message ID: ERROR_0058


Error : There is a missing delimiter on an INCLUDE file name.

An INCLUDE line does not follow the expected form. In the following syntax, file is the name of the file to be included:

         INCLUDE 'file'
   

The file name must be enclosed in apostrophes or quotation marks. Only embedded comments can follow the closing delimiter.

Message ID: ERROR_0059


Error : The source following the INCLUDE file name is not a comment.

An INCLUDE line does not follow the expected form. In the following syntax, file is the name of the file to be included:

         INCLUDE 'file'
   

The file name must be enclosed in apostrophes or quotation marks. Only an embedded comment can follow the closing delimiter.

Message ID: ERROR_0060


Error : The INCLUDE line must not contain a statement label.

An INCLUDE line does not follow the expected form. In the following syntax, file is the name of the file to be included:

         INCLUDE 'file'
   

The file name must be enclosed in apostrophes or quotation marks. Only an embedded comment can follow the closing delimiter.

Message ID: ERROR_0061


Error : Operator is not intrinsic. All operations in a DATA statement expression must be intrinsic.

The DATA statement has the general form:

     data_stmt_object_list /data_stmt_value_list/
   

where a data_stmt_object can be a variable or an implied-DO. In a data_stmt_object that is a variable; each subscript, section subscript, substring starting point, and substring ending point must be an expression where each operation is intrinsic.

The DATA statement implied-DO has the form:

     (data_i_do_object_list, data_i_do_variable =
   	scalar_int_expr, scalar_int_expr
   	[, scalar_int_expr])
   

All operations in each subscript of a data_i_do_object subscript list must be intrinsic. Likewise, all operations in each loop control scalar_int_expr must be intrinsic.

Message ID: ERROR_0062


Error : Cannot open INCLUDE file.

The compiler cannot open the specified INCLUDE file.

Message ID: ERROR_0063


Error : Recursive use of INCLUDE file.

An INCLUDE file must not include itself.

Message ID: ERROR_0064


Error : A defined operator exceeds the maximum length of 127 characters.

A defined operator must not exceed 127 characters.

Message ID: ERROR_0065


Error : A defined operator is missing the "." delimiter.

A defined operator must start and end with a period delimiter. This defined operator is missing its end delimiter.

Message ID: ERROR_0066


Error : Identifier length exceeds the maximum of 127 characters.

The compiler detected an identifier whose length exceeds 127 characters. The Fortran standard limits identifer length to 127 characters.

Message ID: ERROR_0067


Error : The label length exceeds the maximum of 5 digits.

Fortran requires labels to be 5 or less digits. The compiler has detected a label with more than 5 digits.

Message ID: ERROR_0068


Error : A label must have at least one nonzero digit.

The compiler detected a label consisting of all zeros. A label must have at least one nonzero digit.

Message ID: ERROR_0069


Error : Each control item specifier must be specified only once.

An I/O statement contains the same specifier more than once. For example, the following would cause this message to be issued, because UNIT= is specified twice.

         WRITE (UNIT=101,FMT=10,UNIT=101)
   

Message ID: ERROR_0070


Ansi : Fortran requires continuation lines to contain text following the & symbol in free source form.

The Fortran standard requires continuation lines to contain characters other than the continuation character.

Message ID: ANSI_0071


Internal : Object "%s" is host associated to itself. Attr index is %d.

AT_ATTR_LINK(attr_idx) = attr_idx. This causes all kinds of internal loops during compilation. An attribute should never link to itself.

Message ID: INTERNAL_0072


Error : This control item specifier is not allowed for this I/O statement.

An I/O statement contains an inappropriate or unrecognized specifier. The specifiers allowed on a READ or WRITE statement are:

   UNIT    FMT         END         REC
   ERR     IOSTAT      NML         ADVANCE
   SIZE    EOR
   
The specifiers allowed on an OPEN statement are:
   UNIT     FILE       STATUS      IOSTAT
   ERR      FORM       ACCESS      RECL
   BLANK    POSITION   ACTION      DELIM
   PAD
   
The specifiers allowed on a CLOSE statement are:
   UNIT     IOSTAT     STATUS      ERR
   
The specifiers allowed on an INQUIRE statement are:
   FILE     IOSTAT     ERR         EXIST
   OPENED   NUMBER     NAMED       RECL
   NEXTREC  NAME       ACCESS      SEQUENTIAL
   FORM     DIRECT     FORMATTED   UNFORMATTED
   BLANK    UNIT       POSITION    ACTION
   READ     WRITE      READWRITE   DELIM
   PAD
   

Message ID: ERROR_0073


Log_Warning : Assembly language output (-eS or -S filename) disables binary output. Assembly language output selected.

The compiler cannot have an assembly language file and a binary file open at the same time. The binary output file is disabled, because assembly language output is requested on the command line (-eS or -S filename). The binary output file is on by default; therefore, specifying an assembly language file on the command line (without turning off the binary file) results in this warning message.

   -eS file.f     Warning message issued
   -dB -eS file.f No warning, because -dB
                           turns off binary output
   -eS -dS file.f Warning message for -eS.
                           Both assembly and binary output are disabled.
   

Message ID: LOG_WARNING_0074


Log_Warning : Rounding/truncation conflict detected. Single option selected.

The compiler detected a rounding/truncation conflict on the command line. The last option specified is used.

Message ID: LOG_WARNING_0075


Log_Warning : Inline option conflict detected. Automatic mode selected.

This message is issued when both -O inline[0-3] and -I filename are specified on the command line. Automatic inlining is selected.

Message ID: LOG_WARNING_0076


Log_Error : Command line has an unknown option.

The compiler detected an unknown option on the command line.

Message ID: LOG_ERROR_0077


Log_Error : This option has an illegal argument.

The argument for the specified option is illegal.

Message ID: LOG_ERROR_0078


Log_Error : Options are not allowed after the input file name.

Nothing must follow the source input file name on the command line.

Message ID: LOG_ERROR_0079


Log_Error : Name must be specified for file when input is from stdin.

If the source is input from stdin, a name must be specified for the binary or the assembly language file (depending on which one is requested).

Message ID: LOG_ERROR_0080


Internal : Unexpected attribute entry has been found in the local scope during use processing.

Routine not_visible_semantics has found an attribute in the symbol table The only things allowed to be in the local scope during use processing are the procedure name, function result name, dummy argument names, use associated objects and objects used in declaration bounds expressions. Other items that may be present, must have a declaration error.

Message ID: INTERNAL_0081


Log_Warning : Debugging (-G) requires binary output (-eB). Binary output is enabled.

If binary output is disabled (using the -dB option), the compiler can only provide semantic and syntactic error checking. Debugging requires binary output to be generated. Although binary output is on by default, it can be turned off by specifying -dB or requesting an assembly language file (-eS or -S filename). Following are examples to clarify this:

    -dB -G0   illegal - binary output is off, debug is on
    -eS -G0   illegal - assembly language file is on, debug is on
   

Message ID: LOG_WARNING_0082


Error : This token is missing the expected delimiter.

The compiler detected the start of a token delimited by an apostrophe or a quotation mark. The matching end delimiter is missing.

Message ID: ERROR_0083


Error : This Hollerith constant has the wrong number of characters.

The compiler detected an inconsistency between the count and the number of characters actually specified in a Hollerith constant. An example of this would be:

    4H123   The constant contains only 3 characters,
            but the 4H indicates there should be 4.
   

Message ID: ERROR_0084


Error : The number of characters in the Hollerith specifier must be greater than zero.

Specifying 0H is not valid. The Hollerith constant must have a length greater than 0.

Message ID: ERROR_0085


Error : The END statement of this statement must be followed by the proper keyword.

Fortran requires that the END statement for a module procedure or internal procedure be END FUNCTION if it is a function, and END SUBROUTINE if it is a subroutine. The compiler detected only an END statement.

Message ID: ERROR_0086


Error : In a real constant with a D or E following the decimal field, the D or E must be followed by an exponent.

The compiler detected a missing exponent field in a real constant. The syntax for a real constant is

      [sign] real_literal_constant
   

real_literal_constant is significand [exponent_letter exponent] [_kind_param]

or

digit_string exponent_letter exponent [_kind_param]

significand is digit_string.[digit_string]

or

digit_string

exponent_letter is E or exponent is signed_digit_string

Message ID: ERROR_0087


Error : The kind parameter suffix is not valid on a double precision real constant form.

The compiler detected a kind parameter following a D exponent.

The syntax for a real constant is

   [digit_str].digit_str[exponent_letter exponent]
   [_kind_param]
   

exponent_letter is D or E; exponent is signed_digit_string with the following constraint: if both kind_param and exponent_letter are present, exponent_letter must be E.

Message ID: ERROR_0088


Error : The kind parameter on a literal constant must be an integer number or named constant.

If a kind parameter is specified on a literal constant, it must be an integer number or named constant of type integer. For example:

     r = 10.0_8    ! is a valid kind parameter
     END

     PARAMETER (KIND=4)
     j = 10_KIND   ! is a valid kind parameter
     END

     r = 10.0_IT   ! is not valid, because IT
                   ! is not an integer constant value.
   

Message ID: ERROR_0089


Ansi : Boolean constants are an extension to the Fortran standard.

Octal and hexadecimal values may be specified as Boolean constants in the following ways:

   
1000B --> octal
'1a3'X --> hexadecimal

The Fortran standard does not support Boolean constants.

Message ID: ANSI_0090


Error : This constant contains %d characters. The number of allowed characters must be > 0 and <= %d.

Both nonstandard Boolean constants and Fortran BOZ constants have limits to their size. These limits are determined by machine type. If the machine type has 64-bit words, the maximum lengths are as follows: For octal constants: 22 For hexadecimal constants: 16 For binary constants: 64 If the octal constant contains 22 characters, the high order (leftmost) digit must only be a 0 or a 1. If the machine type has 32-bit words, the maximum lengths are as follows: For octal constants: 11 For hexadecimal constants: 8 For binary constants: 32 If the octal constant contains 11 characters, the high order (leftmost) digit must only be 0-3.

Message ID: ERROR_0091


Error : The value of this constant exceeds the range allowed on this machine type.

Nonstandard Boolean constants and Fortran BOZ constants have limits to their size. These limits are determined by machine type. If the machine type has 64-bit words, the maximum lengths are as follows: For octal constants: 22 For hexadecimal constants: 16 For binary constants: 64 If the octal constant contains 22 characters, the high order (leftmost) digit must only be a 0 or a 1. If the machine type has 32-bit words, the maximum lengths are as follows: For octal constants: 11 For hexadecimal constants: 8 For binary constants: 32 If the octal constant contains 11 characters, the high order (leftmost) digit must only be 0-3.

Message ID: ERROR_0092


Error : Character is not valid in an octal constant.

In octal constants (either BOZ or Boolean constants), the only allowed digits are 0-7. The compiler detected a character outside of this range.

Message ID: ERROR_0093


Error : A Hollerith constant must be so many characters or less when the "R" form is specified.

The "R" Hollerith form is specified as follows: '123456789'R 9R123456789

Both of these cases are in error, because there are more than the maximum number of characters that fit in a word specified in the Hollerith constant. On 64 bit machines, a maximum of 8 characters is allowed. On 32 bit machines, a maximum of 4 characters is allowed.

Message ID: ERROR_0094


Error : The real constant must contain digits in the whole and/or the fractional part of the constant.

The compiler is looking for a real constant but can only find a period.

For example:

     1.2       Legal
      .2       Legal
     1.        Legal
      .        Illegal
   

Message ID: ERROR_0095


Ansi : Hollerith constants are an extension to the Fortran standard.

The following specifications for a Hollerith constant are nonstandard. 2Hab 2Lab 2Rab 'ab'h 'ab'l 'ab'r "ab"H "ab"L "ab"R

Message ID: ANSI_0096


Error : The constant is not assignment compatible with "%s".

A variable is being initialized in either a type declaration statement or a DATA statement. In either case, the value of the constant or structure constructor must be compatible with its corresponding variable according to the rules of intrinsic assignment.

Message ID: ERROR_0097


Error : A dot operator consisting of only letters is expected.

A dot operator is expected but not found. A dot operator must consist of only letters.

Message ID: ERROR_0098


Log_Error : One "-O" is specified, therefore the conflicting "-O" must not be specified.

Two optimization options appearing on the command line request conflicting optimizations.

Message ID: LOG_ERROR_0099


Error : This statement must begin with a label, a keyword, or an identifier.

The token that begins the statement is not valid. The token must be either a label or an identifier. An identifier can be a language keyword, a construct name, an identifier that is the target variable in an assignment statement, or the name of a statement function in a statement function definition statement.

Message ID: ERROR_0100


Error : The length of the kind parameter exceeds the maximum length of 127.

The length of the kind parameter exceeds 127 characters. Shorten the length of the kind parameter.

Message ID: ERROR_0101


Error : Only an assignment statement can be used in a WHERE statement.

In a WHERE statement, the statement following the mask expression is not an assignment statement.

Message ID: ERROR_0102


Log_Summary : f90: Cray CF90 Version

This identifies which version and release of the compiler is being used.

Message ID: LOG_SUMMARY_0103


Log_Summary : f90: COMPILE TIME %f SECONDS

This message reports the time, in seconds, that elapsed during the compilation of the program.

Message ID: LOG_SUMMARY_0104


Log_Summary : f90: MAXIMUM FIELD LENGTH %d DECIMAL WORDS

This message reports the maximum amount of memory used by the compiler during compilation.

Message ID: LOG_SUMMARY_0105


Log_Summary : f90: %d SOURCE LINES

This message is no longer used. Use LOG_SUMMARY_1925.

Message ID: LOG_SUMMARY_0106


Log_Summary : f90: %d ERRORS, %d WARNINGS, %d OTHER MESSAGES, %d ANSI

This message is no longer used. Use LOG_SUMMARY_1926.

Message ID: LOG_SUMMARY_0107


Log_Summary : f90: CODE: %d WORDS, DATA: %d WORDS

This message reports the number of words of instructions and the number of words of data generated by the compiler.

Message ID: LOG_SUMMARY_0108


Error : Blank common must not be declared in a TASK COMMON statement or directive.

A TASK COMMON statement specifies the blank (unnamed) common block. A TASK COMMON block must be named. For example:

   TASK COMMON /cbname/ n, ...        ! Legal
   TASK COMMON // n, ...              ! Illegal
   

Message ID: ERROR_0109


Error : The SAVE attribute is specified more than once for this common block.

The SAVE attribute must only be specified once for a common block name. For example:

    PROGRAM MAIN
    COMMON /BLK/A
    SAVE /BLK/
    SAVE /BLK/ ! Illegal
   

This is illegal because SAVE is specified twice for BLK.

Message ID: ERROR_0110


Error : The PARAMETER attribute is specified, therefore an initialization expression must be specified.

The = initialization_expr must appear for the data object name if the statement contains a PARAMETER attribute.

Message ID: ERROR_0111


Comment : The arithmetic IF statement is an obsolescent feature.

This is an outdated FORTRAN 77 feature. Use the logical IF statement or the IF construct in place of the arithmetic IF.

Message ID: COMMENT_0112


Error : IMPLICIT NONE is specified in the local scope, therefore an explicit type must be specified for this data object.

When IMPLICIT NONE is specified, all data objects must have an explicit type.

Message ID: ERROR_0113


Error : A deferred-shape or assumed-shape array must not have an assumed-size specifier or an upper bound specified.

The compiler found array(:10) or array(:*) or a variation of this. A deferred-shape specifier and an assumed-shape specifier must not have an upper bound specified. The following bound forms are permissible:

   explicit-shape array	[lower-bound:] upper-bound
   
assumed-shape array [lower-bound]:
deferred-shape array :
assumed-size array [lower-bound:]*

The following example declares a 2-dimensional assumed-shape array of type integer.

       INTEGER, DIMENSION(1:,:) :: ARRAY
   

Message ID: ERROR_0114


Error : An explicit-shape array must have an upper bound specified.

The type of an array is determined by the first dimension. If the dimension is 1:2 (where 1 and 2 are integers and 1 is optional), this is an explicit-shape array declaration and the rest of the dimensions must have an upper bound specified.

Message ID: ERROR_0115


Error : The assumed-size specifier (*) must be the upper bound for the last dimension of an explicit-shape array declaration.

The assumed-size specifier (*) can only be declared for the last dimension of an explicit-shape array. It must be the upper bound and be followed by a right parenthesis. The following bound forms are permissible:

   explicit-shape array	[lower-bound:] upper-bound
   
assumed-shape array [lower-bound]:
deferred-shape array :
assumed-size array [lower-bound:]*

Message ID: ERROR_0116


Error : The maximum rank for an array declaration is 7.

An array can have no more than 7 dimensions.

Message ID: ERROR_0117


Error : Function "%s" was used in an expression. The type is assumed to be %s.

The compiler detected an attempt to retype a function that was previously implicitly typed and used in an expression. The following is an example of this error:

        DIMENSION ARRAY(KFUNC())
        REAL KFUNC
   
In this example, KFUNC can only be typed integer, because that is how it is implicitly typed in the DIMENSION statement.

Message ID: ERROR_0118


Error : This is a deferred-shape dimension specifier. Therefore a comma or right parenthesis is expected, but something else was found.

While parsing a deferred-shape array specification, the compiler expected a comma or right parenthesis, but found something else. A deferred-shape dimension specifier is simply a colon (:). Other types of permissible bound forms are:

     explicit-shape array	[lower-bound:] upper-bound
   
assumed-shape array [lower-bound]:
assumed-size array [lower-bound:]*

If an array has the ALLOCATABLE or POINTER attribute, it must be specified as a deferred-shape array. The following example declares a 3-dimensional pointer array called JOE of type integer:

   INTEGER, POINTER, DIMENSION(:,:,:) :: JOE
   

Message ID: ERROR_0119


Error : The mask expression of a WHERE statement or WHERE construct must be type logical.

The expression used as the mask expression in a WHERE statement or WHERE construct is not the correct type. It must be a logical expression.

Message ID: ERROR_0120


Error : If the "= initialization" expression is specified, "::" must separate the type and attributes from the identifier list.

The :: separator is required if = initialization_expr is specified on the type declaration statement.

Message ID: ERROR_0121


Error : The RESULT keyword is only permitted on ENTRY statements in function subprograms.

The RESULT keyword is used on an ENTRY statement that is not in a function subprogram. A RESULT keyword can only be specified on the FUNCTION and ENTRY statements in a function subprogram.

Message ID: ERROR_0122


Error : This is a derived type type-name. It cannot be defined as a type-name more than once.

A derived type type-name must only be defined once. The compiler found a type-name being used a subsequent time to define another derived type.

Message ID: ERROR_0123


Ansi : Use of %s*%d is an extension to the Fortran standard.

Use of data_type*length is an extension to the Fortran standard for noncharacter data types.

Message ID: ANSI_0124


Error : This is not an allowed length for the type.

The length specified after the asterisk is an illegal length for the type. For example: DOUBLE PRECISION*8 is illegal because 16 is the only valid star type for DOUBLE PRECISION.

Following are types and their legal star types:

    Integer: 1, 2, 4, 6, 8
    Real: 4, 8, 16
    Complex: 8, 16, 32
    Logical: 1, 2, 4, 8
    Double precision: 16
   

Message ID: ERROR_0125


Error : Derived type is used, but it does not have any components defined for it.

The components of a derived type must be defined before they are accessed, unless the type is specified on a FUNCTION statement or an IMPLICIT statement. In these cases, the derived type must be defined after the reference. In all cases, the derived type must be defined. A derived type is defined by specifying the component definitions.

Message ID: ERROR_0126


Error : More than one part reference of this data reference has a rank greater than zero.

This data reference has more than one part that is array-valued. In an array-valued data reference, there must be only one array-valued part. In the following example, both A and B are arrays:

   	A(1:4)%B(3:4)  ! Illegal reference
   

Message ID: ERROR_0127


Error : Positional actual arguments in an actual argument list must precede any keywords.

A positional argument follows an argument keyword in this actual argument list.

Message ID: ERROR_0128


Error : The kind type parameter must be a scalar integer constant.

A kind type parameter may be a digit_string or the name of a scalar integer constant. For example:

   INTEGER, PARAMETER :: large = 8
   REAL, PARAMETER    :: rkind = 8.0
   INTEGER            :: ikind = 8

   i = 123_8      ! Legal
   i = 123_large  ! Legal

   i = 123_rkind  ! Illegal rkind not type integer.
   i = 123_ikind  ! Illegal ikind not named constant.
   

Message ID: ERROR_0129


Warning : The kind type parameter value is not valid for this type.

Following are valid kind types for each type:

     Character: 1
     Integer: 1, 2, 4, 6, 8
     Real: 4, 8, 16
     Complex: 4, 8, 16
     Logical: 1, 2, 4, 8
   

Message ID: WARNING_0130


Error : Explicit-shape array "%s" has nonconstant bounds so it can only be declared in a function or subroutine program unit.

Explicit-shape arrays with nonconstant bounds can only be declared in subroutines, functions, or interface bodies which describe subroutines and functions. The compiler detected an array with nonconstant bounds, but the program unit is not a subroutine or function.

Message ID: ERROR_0131


Error : Function entry "%s" has result name "%s", which must be used when declaring the result to be a target.

If a function has a result name, the result name must be used when declaring the result to be a target.

Message ID: ERROR_0132


Ansi : The Fortran standard requires a SAVE statement with no saved-entity-list to be the only SAVE in the scoping unit.

If a SAVE statement with an omitted saved_entity_list occurs in a scoping unit, no other explicit occurrences of the SAVE attribute or SAVE statement are permitted in the same scoping unit.

Message ID: ANSI_0133


Ansi : Cray pointers are an extension to the Fortran standard.

Cray pointers are nonstandard and are declared as follows: POINTER(pointer,pointee) Fortran pointers are declared as follows: POINTER [::] object-name The two kinds of pointers must not be mixed.

Message ID: ANSI_0134


Error : A FORMAT statement is required to have a statement label.

The syntax of a FORMAT statement is:

format_stmt is FORMAT format_specification

format_specification is ([format_item_list])

The FORMAT statement must have a statement label.

Message ID: ERROR_0135


Internal : The variant active in the attribute entry passed is not valid.

The attribute table index passed to the named routine is not valid. It has the wrong active variant.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0136


Error : An EQUIVALENCE list needs at least two items in the list.

There are less than two items in an EQUIVALENCE list. An EQUIVALENCE list needs at least two items.

Message ID: ERROR_0137


Internal : Table does not line up correctly on a word boundary for this machine.

The listed table does not line up on a word boundary for this machine. Check to make sure that the table is divided up into 32 bit chunks and that the NUM_...._WDS macro for the table is set to the correct number of words.

This message should never be generated. This is a bad compiler or a bad installation. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code.

Message ID: INTERNAL_0138


Error : This I/O control list specifier requires a keyword.

All arguments used in the I/O statements OPEN, CLOSE, BACKSPACE, ENDFILE, REWIND, and INQUIRE must be identified with a keyword= preceding the argument, except for the UNIT, FMT and NML specifiers. If UNIT is specified without a keyword, it must be the first item in the control list. If the FMT or NML specifier is specified without a keyword, it must be the second item in the list; the first item must be the UNIT specified without its keyword.

Message ID: ERROR_0139


Error : The derived type being defined is a sequence type so any components which are derived types must also be sequence types.

If a SEQUENCE statement is present in the derived type being defined, all derived types specified in component definitions must be sequence types. The compiler detected a component which is a derived type but is not a sequence type.

Message ID: ERROR_0140


Internal : The beginning token of this statement has led to a bad choice of statement type.

The statement parse driver has called the parse_bad_stmt routine. Check the beginning token and the token to parse routines table.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0141


Error : Label variable must be scalar and of type default integer.

An ASSIGN statement or an assigned GO TO statement has a label variable (scalar_int_variable) that is not scalar and/or is not of type default integer. The syntax of the ASSIGN statement is:

     ASSIGN label TO scalar_int_variable
   
The syntax of the assigned GO TO statement is:
     GO TO scalar_int_variable [ [,] (label_list) ]
   
The scalar_int_variable must be an unqualified name; it cannot be a structure component, array element, or substring designator. The variable must be of type default integer, and it must be scalar.

Message ID: ERROR_0142


Error : Character object has nonconstant bounds. It can only be declared in a function or subroutine program unit.

Objects that are typed as character with nonconstant lengths can only be declared in subroutines, functions, and interface bodies (which describe subroutines and functions). The compiler detected a character object with a nonconstant length, but the declaration is not contained in a subroutine, interface body, or function.

Message ID: ERROR_0143


Error : Transfer of control to the nonexecutable statement at this line is not allowed.

The statement is attempting to transfer control to a nonexecutable statement. Control can only be transferred to an executable branch target statement.

Message ID: ERROR_0144


Error : Transfer of control to this statement at this line is not allowed.

The statement is attempting to transfer control to an executable statement that must not be used as a branch target. All executable statements are branch targets except for: CASE, ELSE, ELSE IF, ELSE WHERE, END WHERE and IF-THEN. Transfer of control to some executable statements is allowed only in limited contexts:
-- It is permissible to branch to an END SELECT statement only from within its CASE construct.
-- Control should only be transferred to an END IF statement from within its IF construct. Transfer of control to an END IF statement from outside its IF construct is obsolescent.
-- Control should only be transferred to a DO loop termination statement from within its DO construct. For nested DO loops that share a common loop termination statement, control should only be transferred to the loop termination statement from within the innermost DO construct.

Violations of these specific cases are diagnosed by other messages.

Message ID: ERROR_0145


Error : Statement label was previously defined at another line.

A statement label must only be defined once within a scoping unit. The compiler found another definition for the statement label at the specified line.

Message ID: ERROR_0146


Error : Transfer of control into the WHERE construct starting at that line is not allowed.

The statement is attempting to transfer control to a statement in the WHERE block or ELSEWHERE block of a WHERE construct. In a WHERE construct, only the WHERE construct statement itself can be a branch target.

Message ID: ERROR_0147


Error : Transfer of control into the CASE block starting at that line is not allowed.

The statement in error is attempting to transfer control to a CASE block from outside the CASE construct or from another CASE block within the same CASE construct. Transfer of control to the interior of a CASE block from outside the block is not permissible.

Message ID: ERROR_0148


Comment : Transfer of control to an END IF statement from outside the IF construct is obsolescent.

Instead of branching to the END IF statement from outside its IF construct, branch to the statement following the END IF. This may require program logic changes if the statement following the END IF is not a valid branch target statement.

An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which a better method is available. The ANSI Fortran committee recommends that programmers use the preferred method in new programs and convert existing code to the preferred method. If the use of an obsolescent feature becomes insignificant in Fortran programs, a future Fortran standards committee may consider deleting it from the standard.

Message ID: COMMENT_0149


Error : Transfer of control to an END DO statement from outside its block DO construct is not allowed.

The statement in error is attempting to transfer control to an END DO statement but the branching statement is not contained in the block DO construct terminated by the labeled END DO. It is permissible to branch to an END DO statement only from within its DO construct.

Message ID: ERROR_0150


Error : This use of derived type "%s" is not valid.

A derived type name is in an executable statement, but is not being used as a derived type constructor.

Message ID: ERROR_0151


Error : The assignment statement of a WHERE statement or in a WHERE construct must not be a defined assignment.

This masked array assignment resolves to a defined assignment.

Message ID: ERROR_0152


Error : Transfer of control to an END SELECT statement from outside its CASE construct is not allowed.

The statement in error is attempting to transfer control to an END SELECT statement but the branching statement is not contained in a CASE block of the CASE construct terminated by the labeled END SELECT. It is permissible to branch to an END SELECT statement only from within its CASE construct.

Message ID: ERROR_0153


Warning : Transfer of control into the DO loop starting at that line is not safe.

The statement is transferring control into the body of a DO loop or to the termination statement of a DO loop but the branching statement is not contained in the loop. In nested loops with a common termination statement, control can only be transferred to the common termination statement from the innermost loop.

Message ID: WARNING_0154


Ansi : Transfer of control into the DO loop starting at that line is nonstandard.

The Fortran standard does not allow transfer of control into the body of a DO loop or to the termination statement of a DO loop from outside the loop.

Message ID: ANSI_0155


Warning : Transfer of control into this block starting at that line is not safe.

The statement is transferring control into a THEN block, ELSE block, or ELSE IF block from outside the IF construct or from another block within the IF construct. Transfer of control to the interior of a block from outside the block is not allowed.

Message ID: WARNING_0156


Ansi : Transfer of control into this block starting at that line is nonstandard.

The Fortran standard does not allow transfer of control into a THEN block, ELSE IF block, or ELSE block from outside the IF construct or from another block within the IF construct.

Message ID: ANSI_0157


Error : No name can be specified on the END BLOCK DATA statement for an unnamed block data program unit.

An unamed block data program unit must not have a name specified on its END statement. The compiler detected a name on the END BLOCK DATA statement for a block data program unit that is unnamed.

Message ID: ERROR_0158


Error : More than one CASE DEFAULT statement was found for this CASE construct.

The compiler detected more than one CASE DEFAULT statement for this CASE construct. Only one CASE DEFAULT statement is allowed per CASE construct.

Message ID: ERROR_0159


Internal : There is a problem with the block stack at block stack index %d.

One of the following errors has occurred:
-- The compiler has found an unknown block on the block stack at the given block index. The block stack should never have an unknown block on it.
-- The block stack has an If_Blk without a IF_THEN_BLK, IF_ELSE_IF_BLK, or IF_ELSE_BLK immediately following it.
-- The blk_stk_idx = NULL_IDX. The block stack should always have the program unit block as the first entry.
-- The current block is an If_Then_Blk, If_Else_If_Blk, or If_Else_Blk but the preceding block entry is not an If_Blk.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0160


Ansi : A character literal used as a Hollerith constant is an extension to the Fortran standard.

A character constant is being used in a context in which a character constant is not allowed, but a Hollerith constant is allowed. This is an extension to the Fortran standard. Hollerith constants are allowed in arithmetic and logical expressions and in assignment statements where the left side of the equal sign is an entity of type integer or real. This message can also occur with the use of a literal string as a file identifier in a control information list on an I/O statement.

Message ID: ANSI_0161


Error : This statement is not allowed in an ELSE IF block of an IF construct.

The following statements are allowed following the ELSEIF of an IF construct:

   ALLOCATE               ASSIGN
   BACKSPACE              BUFFER
   CALL                   CLOSE
   CONTINUE               DATA
   DEALLOCATE             DECODE
   DO                     ENCODE
   ENDFILE                ENDIF
   ELSE                   ELSEIF
   FORMAT                 GOTO
   IF                     INQUIRE
   NAMELIST               NULLIFY
   OPEN                   PAUSE
   PRINT                  READ
   RETURN                 REWIND
   SELECT                 STOP
   WHERE                  WRITE
   assignment
   

The following statements are allowed if the listed condition is met.
-- CASE, END SELECT in a CASE construct
-- ELSEWHERE, END WHERE in a WHERE construct
-- CYCLE, EXIT, END DO in a DO construct

Message ID: ERROR_0162


Error : This statement is not allowed in an ELSE block of an IF construct.

The following statements are allowed in the ELSE block of an IF construct:

   ALLOCATE               ASSIGN
   BACKSPACE              BUFFER
   CALL                   CLOSE
   CONTINUE               DATA
   DEALLOCATE             DECODE
   DO                     ENCODE
   ENDFILE                ENDIF
   ELSE                   ELSEIF
   FORMAT                 GOTO
   IF                     INQUIRE
   NAMELIST               NULLIFY
   OPEN                   PAUSE
   PRINT                  READ
   RETURN                 REWIND
   SELECT                 STOP
   WHERE                  WRITE
   assignment
   

The following statements are allowed if the listed condition is met.
-- CASE, END SELECT in a CASE construct
-- ELSEWHERE, END WHERE in a WHERE construct
-- CYCLE, EXIT, END DO in a DO construct

Message ID: ERROR_0163


Error : This statement is not allowed in an internal procedure.

The following statements are not allowed in an internal procedure:

       CONTAINS
       TASK COMMON
       PUBLIC
       PRIVATE
   

The following statements must be inside an interface block, scoping unit, or construct to be in an internal subprogram.
-- SEQUENCE, END TYPE in a derived type definition
-- MODULE PROCEDURE in a generic interface block
-- ELSE, ELSEIF, END IF in an IF construct
-- CASE, END SELECT in a CASE construct
-- ELSEWHERE, END WHERE in a WHERE construct
-- CYCLE, EXIT, END DO in a DO construct
-- FUNCTION, SUBROUTINE, END INTERFACE in an interface block

Message ID: ERROR_0164


Error : This statement is not allowed in a module procedure.

The following statements are not allowed in a module procedure:

       PUBLIC
       PRIVATE
       TASK COMMON
   

The following statements must be inside an interface block, scoping unit, or construct to be in a module procedure:
-- SEQUENCE, END TYPE in a derived type definition
-- MODULE PROCEDURE in a generic interface block
-- ELSE, ELSEIF, END IF in an IF construct
-- CASE, END SELECT in a CASE construct
-- ELSEWHERE, END WHERE in a WHERE construct
-- CYCLE, EXIT, END DO in a DO construct
-- FUNCTION, SUBROUTINE, END INTERFACE in an interface block

Message ID: ERROR_0165


Error : Extraneous data follows a format specification.

This format specification has unrecognizable characters beyond the end of the format specification. The following statement would cause this message to be issued:

     10 FORMAT(1X,A8) X6		! Illegal
   

Message ID: ERROR_0166


Warning : Field width is too small in this usage.

An improper field width is used with an E, F, D, G, I, Z, or O edit descriptor. In the following edit descriptors, w must be greater than or equal to d:

     Ew.d  Ew.dEe
     Fw.d
     Gw.d  Gw.dEe
     Dw.d
   
For the following edit descriptors, w must be greater than or equal to m.
     Iw.m
     Bw.m
     Ow.m
     Zw.m
   

Message ID: WARNING_0167


Ansi : Empty parentheses in a FORMAT are an extension to the Fortran standard and are ignored.

An empty format specification appears in another format specification. The Fortran standard requires format specifications to be in the following format:

     ([format_item_list])
   

format_item_list is a list of items of the following form:

     [r] data_edit_desc
     control_edit_desc
     [r] char_string_edit_desc
               (format_item_list)
   

r is a nonzero, unsigned integer constant.

Message ID: ANSI_0168


Ansi : A comma between these format fields is required by the Fortran standard.

This format specification has two consecutive format descriptors with no comma separating them. The Fortran standard requires commas between items in a format specification. The Fortran standard allows the comma to be omitted in the following places:
-- Between a P descriptor and an immediately following F, E, D, or G descriptor
-- Before or after a slash
-- Before or after a colon

Message ID: ANSI_0169


Ansi : A comma preceding a right parenthesis is an extension to the Fortran standard.

This format specification has a comma followed by another comma, or a comma followed by a right parenthesis. The Fortran standard does not allow a comma to precede the right parenthesis.

Message ID: ANSI_0170


Error : Construct name was previously declared at that line.

A construct name must only be defined once in a scoping unit. The compiler found a definition for this construct name at the specified line.

Message ID: ERROR_0171


Error : The assign variable name must be an unqualified name.

The assign variable name in an ASSIGN statement must be a simple variable name. The name must not contain structure component qualifications nor can it be qualified by a subscript list or a substring range.

Message ID: ERROR_0172


Error : The compiler expected a NAMELIST group name following the NML specifier.

The compiler expected a namelist group name to follow the NML specifier.

Message ID: ERROR_0173


Ansi : A WRITE statement with no unit I/O specifier is an extension to the Fortran standard.

A WRITE statement of the following form was encountered:

     WRITE f [,iolist]
   

This form of the WRITE statement, with no control information list, is an extension to the Fortran standard.

Message ID: ANSI_0174


Error : The IMPLICIT range is not in alphabetical order.

In an IMPLICIT statement, if the implicit specification list is: letter1 - letter2, letter2 must follow letter1 alphabetically.

Message ID: ERROR_0175


Error : IMPLICIT NONE is specified in this scope, therefore no other IMPLICIT statements are allowed.

If IMPLICT NONE is specified within the scope of a procedure, no other IMPLICIT statements are allowed.

Message ID: ERROR_0176


Error : The specified letter(s) were specified in a previous IMPLICIT statement. They must not be specified again.

A letter must only be specified once in an IMPLICIT statement in a scoping unit. For example:

      IMPLICIT INTEGER (A)
      IMPLICIT REAL (A,B)          ! Illegal
   
This is illegal, because A was specified in the previous IMPLICIT statement.

Message ID: ERROR_0177


Internal : Array class is Unknown_Array, but there is no declaration error for the dimension spec.

The array class should only be Unknown_Array if there is a declaration error for the dimension spec. The problem is detected at the end of parse_array_spec.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0178


Internal : Chose DEFAULT case on case statement in this routine. Should never get here.

While processing a switch statement, a case was entered that should not be entered.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0179


Internal : Identifier was found in table, but should not have been found.

The name being searched for in the table should not be found in the current scope (examples are program unit name and dummy argument identifiers).

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0180


Error : The mask expression in a WHERE statement or WHERE construct must be an array-valued expression.

The compiler detected a masking expression in a WHERE statement that is a scalar expression. It must be an array-valued expression.

Message ID: ERROR_0181


Ansi : The use of a repetition count with the slash edit descriptor is an extension to the Fortran standard.

A repetition count was found before the slash edit descriptor. This use of the repetition count is an extension to the Fortran standard.

Message ID: ANSI_0182


Error : The %s statement is not allowed in a CASE block of a CASE construct.

The following statements are allowed in a CASE construct, following a CASE statement:

   ALLOCATE               ASSIGN
   BACKSPACE              BUFFER
   CALL                   CLOSE
   CONTINUE               DATA
   DEALLOCATE             DECODE
   DO                     ENCODE
   ENDFILE                ENDIF
   ELSE                   ELSEIF
   FORMAT                 GOTO
   IF                     INQUIRE
   NAMELIST               NULLIFY
   OPEN                   PAUSE
   PRINT                  READ
   RETURN                 REWIND
   SELECT                 STOP
   WHERE                  WRITE
   assignment
   

The following statements are allowed if the listed condition is met.
-- CASE, END SELECT in a CASE construct
-- ELSEWHERE, END WHERE in a WHERE construct
-- CYCLE, EXIT, END DO in a DO construct

Message ID: ERROR_0183


Caution : Recursive function entry name must have a result name to be called recursively when declared an array.

If the result of a recursive function is an array, it must have a declared result name in order to be called recursively. If no result name is specified, a reference to the function name is a reference to the result variable. This makes it impossible to call this function recursively from within its scope. For example:

   RECURSIVE FUNCTION IARRAY(I) RESULT(I_RESULT)
   REAL, DIMENSION :: I_RESULT(100)
   ...
   ! The following reference to I_RESULT
   ! is a reference to the 10th element of
   ! the result variable.

   X = I_RESULT(10)

   ! The following reference to IARRAY
   ! is a recursive reference to the function

   Y = IARRAY(10)
   END FUNCTION
   

Message ID: CAUTION_0184


Error : Function entry has a result name. Use result name when typing the function result.

If a function entry has a result name, the result name must be used when typing or specifying attributes of the function result.

Message ID: ERROR_0185


Error : Unexpected syntax: Expecting one thing to follow the END keyword, but found another.

The compiler is looking for one of the following strings after the END keyword: BLOCK DATA, MODULE, PROGRAM, SUBROUTINE, FUNCTION, INTERFACE, TYPE, IF, DO, SELECT, WHERE or "EOS". The compiler did not find the appropriate string.

Message ID: ERROR_0186


Error : The "::" separator is required on a component definition statement, if the POINTER or DIMENSION attribute is specified.

The Fortran standard requires a :: separator to follow the specification of the POINTER and/or DIMENSION attributes on a component declaration statement. For example:

       TYPE :: NEW_TYPE
         INTEGER, POINTER :: A     ! Legal
         REAL, DIMENSION(100)  B   ! Illegal
       END TYPE
   

Message ID: ERROR_0187


Error : This name is already used as a component name for this derived type.

Each component of a derived type must have a unique name. This name is already a component name in this derived type.

Message ID: ERROR_0188


Error : Component has the POINTER attribute, therefore the DIMENSION attribute must be a deferred-shape dimension.

If a component has the POINTER attribute and the DIMENSION attribute, the dimension must be a deferred-shape dimension.

Message ID: ERROR_0189


Error : Component "%s" does not have a POINTER attribute so its dimension must be an explicit-shape array with constant bounds.

If a component has the DIMENSION attribute, but does not have the POINTER attribute, the DIMENSION must be an explicit-shape definition with constant bounds.

Message ID: ERROR_0190


Error : A character length for a component declaration must be a constant expression.

The character length for a component definition must be a constant expression.

Message ID: ERROR_0191


Error : The "* char-length" must only be specified for an object of type character.

A "*char_length" is specified for a component or data object whose type is not character.

Message ID: ERROR_0192


Internal : Unexpected value found in field for entry.

The value found in the symbol table field is not valid. It is issued for:
-- Finding something beyond Structure in AT_TYPE.
-- Finding a function, with a NULL_IDX in ATP_RSLT_IDX.
-- If the count is nonzero for a derived type, ATO_CHAR_CPNT, ATO_POINTER_CPNT or ATO_NUMERIC_CPNT must be set.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0193


Error : The DO variable must be the name of a variable.

An iterative DO statement has the form:

   DO [label] [,] do_variable = scalar_numeric_expr,
     scalar_numeric_expr [, scalar_numeric_expr]
   
The DO variable must be a named scalar variable; for example, it must not be a function name nor a named constant name.

Message ID: ERROR_0194


Error : In a masked array assignment, the mask expression and the variable being defined must be arrays of the same shape.

All masked assignment statements must match the shape of the mask expression.

Message ID: ERROR_0195


Internal : Function was called with a token whose length exceeds the maximum number of characters.

The symbol table search routines are optimized and have a limit on the size of the item being searched. This routine was called to search for an item which exceeded the limit of the routine.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0196


Error : Unexpected syntax: one thing was expected but found another.

The syntax of this statement is incorrect. During parsing, the compiler was looking for one thing, but found another. This is a general message used throughout the parser.

Message ID: ERROR_0197


Error : The "::" separator is illegal on the EXTERNAL and the INTRINSIC statements.

The syntax for the INTRINSIC statement is:

     INTRINSIC intrinsic_procedure-name_list
   

The syntax for the EXTERNAL statement is:

     EXTERNAL external_name_list
   

Message ID: ERROR_0198


Error : The DO variable must be an unqualified name.

The iterative DO statement has the form:

     DO [label] [,] do_variable = scalar_numeric_expr,
         scalar_numeric_expr [, scalar_numeric_expr]
   

The DATA statement, some I/O statements, and an array constructor must contain implied-DOs. The forms of the implied-DOs are:

    (data_i_do_object_list, data_i_do_variable =
      scalar_int_expr, scalar_int_expr [, scalar_int_expr])

    (io_implied_do_object_list, do_variable =
      scalar_numeric_expr, scalar_numeric_expr
        [, scalar_numeric_expr])

    (ac_value_list, ac_do_variable =
      scalar_int_expr, scalar_int_expr
        [, scalar_int_expr])
   
The DO variable of the DO and I/O statements, the data_i_do_variable of the DATA statement, and the ac_do_variable of the array constructor are all called "DO variables". In each case, the DO variable must be a named variable; that is, it must be a simple, unqualified name. For example, it must not contain either a subscript list or the structure component separator "%".

Message ID: ERROR_0199


Ansi : The use of this edit descriptor is an extension to the Fortran standard.

A format specification contains an edit descriptor that is an extension to the Fortran standard. The following nonstandard edit descriptors are accepted by the compiler:

Zw
Hexadecimal integer
Rw
right-justified character
$
suppress carriage control
[n]X
spacing, omitting n is nonstandard
n/
carriage control, n is nonstandard

Message ID: ANSI_0200


Error : An allocate object in an ALLOCATE statement must be either a pointer or an allocatable array.

All arguments in an ALLOCATE statement must be previously declared to be either pointer or allocatable arrays.

Message ID: ERROR_0201


Error : The status variable for this ALLOCATE/DEALLOCATE statement must be a scalar integer variable.

The variable used as the status variable, STAT = stat_variable, in an ALLOCATE or DEALLOCATE statement cannot be an array and must be of integer type.

Message ID: ERROR_0202


Error : The STAT= must follow all allocation items in an ALLOCATE statement.

No allocation items in an ALLOCATE statement must follow a status variable. STAT = stat_variable must be the last item in the list.

Message ID: ERROR_0203


Error : The number of subscripts is greater than the number of declared dimensions.

An array reference of the form a(s[,s]...) is being used. The number of subscripts in the reference should equal the number of dimensions declared for the array in a DIMENSION, COMMON, POINTER or type statement. As an extension to the Fortran standard, the compiler allows array references to specify fewer subscripts than the declared number. In this case, the lower bounds of the remaining unspecified dimensions are used.

Message ID: ERROR_0204


Error : If an array is specified in an ALLOCATE statement, it must have an allocate shape specification list.

An attempt was made to allocate an array in an ALLOCATE statement without supplying an allocate shape specification list. The syntax of an allocate shape specification list is

         [lower_bound :] upper_bound
   

Message ID: ERROR_0205


Error : The exponent in a constant initialization expression must be type integer.

The Fortran standard requires that if exponentiation is used in a constant initialization expression, it must have an integer exponent.

Message ID: ERROR_0206


Internal : Reset lex has attempted to reset source input to a line not in the source buffer.

The routine reset_src_input attempted to reset the source input index to a line number that is no longer available in the source input buffer. Source input should only be reset on the current line.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0207


Ansi : Using a Cray pointer as a DO variable is an extension to the Fortran standard.

A Cray pointer is being used as a DO variable. Support of Cray pointers is an extension to the Fortran standard.

Message ID: ANSI_0208


Error : There is no actual argument to correspond to this dummy argument number.

An alternate return dummy argument (*) does not have a matching label actual argument.

Message ID: ERROR_0209


Error : This has the wrong attribute. It must not be used in an initialization expression because it is not a constant.

The compiler detected an illegal use of this object. To be used in an initialization expression, the object must be a constant. The only attributes that a constant may have are PARAMETER, PRIVATE or PUBLIC. A constant may be given an explicit type and it may be declared to be an explicit-shape array.

Message ID: ERROR_0210


Error : Continuation is not allowed for this statement.

This continuation line in fixed source form does not follow a regular source line. This error is issued when the first line of a program is a continuation line.

Message ID: ERROR_0211


Error : This is typed, therefore it must not have component references specified for it.

The object in question is followed by a structure component name separator (%), but the object has not been declared as a derived type.

Message ID: ERROR_0212


Error : This is not a component of that derived type.

While parsing a component reference, the compiler detected a name that is not declared to be a component of the derived type.

Message ID: ERROR_0213


Limit : The maximum number of fatal errors has been exceeded.

The compiler aborts when the maximum number of allowed fatal errors is detected. The maximum number is set to 100. This can be overridden with the -dq command-line option. The -dq option allows for an unlimited number of fatal errors.

Message ID: LIMIT_0214


Error : Dummy argument of statement function must have a character length that is an integer constant expression.

If a dummy argument of a statement function is type character, its length must be an integer constant expression. The compiler detected a statement function dummy argument whose type is character, but whose length is either assumed-length or variable length.

Message ID: ERROR_0215


Error : A character string must be less than the maximum number of characters when used as a dataset name or Boolean constant.

The compiler detected a character string that will not fit in a machine word. A dataset name or integer expression was expected. A dataset name is an external file identifier in a control information list in an I/O statement.

Message ID: ERROR_0216


Error : The DO loop expression must be type integer, default real, or double precision real.

Each expression in the loop_control portion of the DO statement must be numeric and of type integer, default real, or double precision real. A DO loop expression of type default real or double precision real is an obsolescent feature. Type integer is the preferred choice.

Message ID: ERROR_0217


Comment : A DO loop expression of type default real or double precision real is an obsolescent feature.

A real or double precision real DO loop expression is an obsolescent feature. (An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which a better method is available.) An expression of type integer should be used in place of the DO loop expression that is of type default real or double precision real.

Message ID: COMMENT_0218


Error : The DO variable must be type integer, default real, or double precision real.

The DO variable of the DO statement must be numeric and of type integer, default real, or double precision real. The use of a DO variable of type default real or double precision real is an obsolescent feature. Type integer is the preferred choice.

Message ID: ERROR_0219


Comment : A DO variable of type default real or double precision real is an obsolescent feature.

An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which a better method is available. A DO variable of type integer should be used in place of a DO variable of type default real or double precision real.

Message ID: COMMENT_0220


Ansi : Non-integer bound expressions are an extension to the Fortran standard.

The Fortran standard requires all bound expressions to be type integer.

Message ID: ANSI_0221


Error : This DO statement expression must be scalar.

In a DO statement of the form

      DO [label] [,] do_variable = scalar_numeric_expr,
           scalar_numeric_expr [, scalar_numeric_expr]
   

each scalar_numeric_expr must be scalar.

In a DO statement of the form

      DO [label] [,] WHILE(scalar_logical_expr)
   
the scalar_logical_expr must be scalar.

Message ID: ERROR_0222


Error : The DO variable must be scalar.

In a DO statement of the form

      DO [label] [,] do_variable = scalar_numeric_expr,
           scalar_numeric_expr [, scalar_numeric_expr]
   

the do_variable must be scalar.

Message ID: ERROR_0223


Internal : Semantic analysis of compiler generated DO loop expression failed.

There are two expression trees that are generated by the compiler as part of the representation of a DO statement: the iteration count calculation and the calculation of the value of the DO variable. Both involve only already-established compiler temps. Semantic analysis is only used to propagate data types, and so on, up the expression tree therefore semantic analysis should not fail.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0224


Error : For [%s][%s], the error flag in table %s is TRUE (1), but the message number is 0.

This message is always followed by an internal message and compiler abort.

This message is issued by a debug routine that is called at main initialization for debug compilations. The routine goes through the semantic tables and confirms that the flags and messages agree. The tables involved are:

flag table
message table
obj_to_attr
attr_msg_num
obj_to_name
name_msg_num
obj_to_other
other_msg_num

Verify the entry in both tables and change one or the other so both agree. If this message is issued, the combination is marked in error in the table, but no error message is specified for the combination in the table.

Message ID: ERROR_0225


Internal : There are problems with the semantic tables. See previous error messages.

This internal error is issued if verify_semantic_tbls has found any problems in the semantic tables. Fatal errors are issued for each problem. This final internal error is issued at the end to halt compilation.

This message should never be generated. This is a bad compiler or a bad installation. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code.

Message ID: INTERNAL_0226


Error : For this, the error flag in the table is FALSE (0), but the message number is unexpected.

This message is always followed by an internal message and compiler abort.

This message is issued by a debug routine that is called at main initialization for debug compilations. It goes through the semantic tables and makes sure that the flags and messages agree. The tables involved are:

flag table
message table
obj_to_attr
attr_msg_num
obj_to_name
name_msg_num
obj_to_other
other_msg_num

Verify the entry in both tables and change one or the other so both agree. If this message is issued, the combination is legal, but the table has an error message for this combination.

Message ID: ERROR_0227


Error : The mode specifier for a BUFFER IN or BUFFER OUT statement must be type integer.

A BUFFER IN or BUFFER OUT statement contains an improper mode specifier. In the following statements, m, the mode specifier, must be an integer expression:

         BUFFERIN (id,m) (bloc,eloc)
         BUFFEROUT (id,m) (bloc,eloc)
   
The mode specifier must not be an array expression.

Message ID: ERROR_0228


Error : The unit specifier or file identifier is not a valid data type or form.

An I/O statement contains an improper unit or file identifier.

A unit identifier may be one of the following:
-- An integer expression with a value in the range 0 to 101.
-- An asterisk denoting the default unit.

A file identifier may be one of the following:
-- A character variable, array element, array, or substring specifying an internal file.
-- A string of up to 7 alphanumeric characters enclosed in apostrophes, specifying an external file name.

Message ID: ERROR_0229


Error : The mode specifier for the BUFFER IN or BUFFER OUT statement must be scalar.

The BUFFER IN or BUFFER OUT statement contains an improper mode specifier . In the following statements, m, the mode specifier, must be an integer expression:

         BUFFERIN (id,m) (bloc,eloc)
         BUFFEROUT (id,m) (bloc,eloc)
   

The mode specifier must not be an array expression.

Message ID: ERROR_0230


Error : The character string exceeds the maximum dataset name size.

The external file identifier in a control information list on an I/O statement exceeds 7 characters. File identifiers must consist of 1 to 7 alphanumeric characters on Cray Research general-purpose (64-bit) architectures. The limit is 4 characters on 32-bit architectures.

Message ID: ERROR_0231


Error : IMPLICIT NONE is specified in the local scope, therefore an explicit type must be specified for this function.

When IMPLICIT NONE is set, all functions must have explicit types.

Message ID: ERROR_0232


Error : IMPLICIT NONE is specified in the host scope, therefore an explicit type must be specified for this function.

When IMPLICIT NONE is set in a host scope, all functions must have explicit types, including those in any contained scopes.

Message ID: ERROR_0233


Error : The DO WHILE expression must be type logical.

In a DO statement of the form:

    DO [label] [,] WHILE (scalar_logical_expr)
   

the scalar_logical_expr must be type logical.

Message ID: ERROR_0234


Error : I/O list items of a derived type which have a pointer component are not allowed.

If a derived type ultimately contains a pointer component, an object of this type must not appear as an I/O input item nor as the result of the evaluation of an I/O output list item.

Message ID: ERROR_0235


Internal : NULL_IDX encountered when completing a compiler generated CONTINUE statement.

To complete a compiler generated CONTINUE statement, continue_stmt_semantics searches for a statement header (SH) following the current SH that is not compiler generated and that has a nonzero line number. This internal error message is issued when the end of the chain of statement headers was encountered without finding a statement header that satisfies the above criteria.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0236


Limit : Maximum table size has been exceeded for this table.

An internal error condition has occured because an internal table has grown too large for its index field size. Generally this is caused because the program is too large for the compiler to handle. Splitting your code into multiple compilation units may allow compilation to successfully complete.

Please notify your product support organization, so that we may verify that a compiler limit has been reached.

Message ID: LIMIT_0237


Error : This is declared as a named constant. The type is assumed to be different.

The compiler detected an attempt to retype a named constant via a type declaration statement or an IMPLICIT statement. This is only legal if the type confirms the implicit type of the object.

        PARAMETER (A = 3.0)
        INTEGER A               ! Illegal

        PARAMETER (I = 4)
        INTEGER I               ! Legal

        PARAMETER (I = 4)
        IMPLICIT INTEGER (I)    ! Legal

        PARAMETER (I = 4)
        IMPLICIT CHARACTER (I)  ! Illegal
   

Message ID: ERROR_0238


Error : This is initialized in a DATA statement. The type is assumed to be different.

The compiler detected an attempt to retype an object that is already initialized. This is only legal if the type confirms the implicit type of the object.

        DATA A /3/
        INTEGER A	! This is illegal

        DATA I /3/
        INTEGER I	! Legal
   

Message ID: ERROR_0239


Error : External function is referenced in a bounds specification expression. It must have a nonpointer scalar result.

It is an extension to the Fortran standard to allow external function calls in array dimension bound declarators or character length declarators. These functions must not have array-valued or pointer-valued results.

Message ID: ERROR_0240


Comment : The nonblock DO construct is an obsolescent feature.

An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which a better method is available. The nonblock DO construct is an obsolescent feature. If a DO statement contains a label and the loop termination statement is a statement other than END DO or CONTINUE, the loop is defined to be a nonblock DO construct. The CONTINUE or END DO statement should be used to terminate a DO loop. If multiple DO loops terminate with the same statement, a separate CONTINUE or END DO statement should be used to terminate each nested DO loop.

Message ID: COMMENT_0241


Error : The termination statement of a nonblock DO construct must not be an unconditional GO TO statement.

If a DO statement contains a label and the loop termination statement is a statement other than END DO or CONTINUE, the loop is defined to be a nonblock DO construct. An unconditional GO TO statement must not be used as the termination statement of a nonblock DO construct.

Message ID: ERROR_0242


Error : The termination statement of a nonblock DO construct must not be an assigned GO TO statement.

If a DO statement contains a label and the loop termination statement is a statement other than END DO or CONTINUE, the loop is defined to be a nonblock DO construct. An assigned GO TO statement must not be used as the termination statement of a nonblock DO construct.

Message ID: ERROR_0243


Error : The termination statement of a nonblock DO construct must not be this statement.

If a DO statement contains a label and the loop termination statement is an action_stmt other than END DO or CONTINUE, the loop is defined to be a nonblock DO construct. The following action_stmts must not be used as the termination statement of a nonblock DO construct: RETURN, STOP, EXIT, CYCLE, END FUNCTION, END SUBROUTINE, END PROGRAM, or arithmetic IF.

Message ID: ERROR_0244


Internal : The number of arguments in the call list is greater than the largest list expected.

The number of actual arguments is greater than the allocated internal table size.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0245


Error : The termination statement of a nonblock DO construct must not be an outmoded IF statement.

If a DO statement contains a label and the loop termination statement is a statement other than END DO or CONTINUE, the loop is defined to be a nonblock DO construct. An outmoded IF statement is an indirect logical IF statement or a two-branch arithmetic IF statement. These statements have been replaced by alternatives that enhance the portability of Fortran programs. The IF construct or logical IF should be used in place of both of these outmoded forms.

Message ID: ERROR_0246


Error : A subscript or substring expression in an EQUIVALENCE statement must be an integer constant expression.

Each subscript or substring expression in an equivalence item must be a scalar integer constant expression.

Message ID: ERROR_0247


Error : The DO statement label is already defined.

The termination statement label specified by the DO statement was defined earlier in the scoping unit. By definition, the loop termination statement must follow the DO statement. Therefore, the label must be on a statement following the DO statement.

Message ID: ERROR_0248


Internal : Compiler internal error in fold_relationals. Unexpected types of operands.

The routine fold_relationals has found operand types that are not valid.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0249


Error : Array syntax is not allowed in an EQUIVALENCE statement.

Sectioned array references are not allowed in an EQUIVALENCE statement.

Message ID: ERROR_0250


Internal : Compiler internal error in fold_relationals. Unexpected operator.

The routine fold_relationals was called to fold an operator that it was not intended to see.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0251


Error : The operands in this array syntax operation are not conformable.

Both operands of an array syntax operation must be shape conformant. The two arrays that have constant subscripts are not shape conformant.

Message ID: ERROR_0252


Error : The left and right hand sides of this array syntax assignment must be conformable arrays.

When an assignment statement is array syntax, the left side and the right side must be shape conformant.

Message ID: ERROR_0253


Caution : The values of the DO statement expressions prevent the loop from executing.

The iterative DO statement has the form:

       DO [label] [,] do_variable =
   	start_expr, end_expr [, inc_expr]
   

The iteration count for the DO loop is calculated from:

       MAX( INT( (end_expr - start_expr + inc_expr) /
   	inc_expr), 0)
   

The iteration count is zero for both of the following cases:

       start_expr > end_expr  and  inc_expr > 0,
                or
       start_expr < end_expr  and  inc_expr < 0
   

If the iteration count is zero, the loop will not be executed.

Message ID: CAUTION_0254


Error : The value of the increment expression must not be zero.

The DO statement contains an increment expression that has a zero value. It must be greater than zero or less than zero.

Message ID: ERROR_0255


Error : Dummy argument has the POINTER attribute. It requires an actual argument with the POINTER attribute.

A dummy argument that has the POINTER attribute must be matched with an actual argument that has the POINTER attribute.

Message ID: ERROR_0256


Internal : An illegal item is detected in this field of the attribute table.

An unexpected value has been found in the symbol tables.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0257


Error : This actual argument is an assumed-size array, therefore it must not be associated with an assumed-shape dummy argument.

An assumed-shape dummy argument cannot be associated with an assumed-size actual argument.

Message ID: ERROR_0258


Error : Recursive reference to this is illegal in a bounds specification expression.

Function references are allowed in bounds specification expressions as an extension to the Fortran standard. Recursive function references are not allowed in bounds specification expressions. The compiler detected something similar to the following example:

         FUNCTION IFUNC()
         RECURSIVE IFUNC
         DIMENSION A(IFUNC())
   

The reference to IFUNC is illegal because a bounds expression must be computed at the entry point.

Message ID: ERROR_0259


Internal : Unexpected block stack order.

If the current block type is greater than Interface_Body_Blk, procedure cif_begin_scope_rec expects it to be because one of these block types was the first statement in the main program. Either the Block Stack has been corrupted or cif_begin_scope_rec needs to be corrected because it is making an incorrect assumption.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0260


Error : This statement is not allowed in a function subprogram.

The PRIVATE and PUBLIC statements are not allowed in a function subprogram.

The following statements must be inside an interface block, scoping unit, or construct to be in a function subprogram.
-- SEQUENCE, END TYPE in a derived type definition
-- MODULE PROCEDURE in a generic interface block
-- ELSE, ELSEIF, END IF in an IF construct
-- CASE, END SELECT in a CASE construct
-- ELSEWHERE, END WHERE in a WHERE construct
-- CYCLE, EXIT, END DO in a DO construct
-- FUNCTION, SUBROUTINE, END SUBROUTINE, END INTERFACE in an interface block

Message ID: ERROR_0261


Error : This statement is not in the range of a matching DO construct.

The CYCLE and EXIT statements must be specified in the range of a DO construct. If the CYCLE or EXIT statement refers to a DO construct name, it must be within the range of the DO construct with the same DO construct name.

Message ID: ERROR_0262


Internal : The semantics pass statement driver encountered an illegal or unknown statement type.

The driver that applies semantic processing to each statement in the semantics pass selects the appropriate semantics routine from an array of function pointers. The index into the array is not valid. It must be a positive value, but is probably zero or a negative value.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0263


Error : This statement is not allowed following a CONTAINS statement. Expecting FUNCTION, SUBROUTINE or END statement.

The only statements allowed following a CONTAINS statement are SUBROUTINE, FUNCTION, and END. SUBROUTINE and FUNCTION start a new internal or module subprogram.

Message ID: ERROR_0264


Ansi : Specifying the NAMELIST statement after the first executable statement is an extension to the Fortran standard.

The Fortran standard requires all NAMELIST statements to be in the specification part of a program unit. It is an extension to the Fortran standard to allow the NAMELIST statement to be interspersed with executable statements. However, all definitions of a namelist group must occur before any reference to the namelist group.

Message ID: ANSI_0265


Ansi : The use of edit descriptor -nX is an extension to the Fortran standard.

The use of a negative value with the X edit descriptor is an extension to the Fortran standard.

Message ID: ANSI_0266


Error : This statement is not allowed in the THEN block of an IF construct.

The following statements are allowed in an IF construct:

   ALLOCATE               ASSIGN
   BACKSPACE              BUFFER
   CALL                   CLOSE
   CONTINUE               DATA
   DEALLOCATE             DECODE
   DO                     ENCODE
   ENDFILE                ENDIF
   ELSE                   ELSEIF
   FORMAT                 GOTO
   IF                     INQUIRE
   NAMELIST               NULLIFY
   OPEN                   PAUSE
   PRINT                  READ
   RETURN                 REWIND
   SELECT                 STOP
   WHERE                  WRITE
   assignment
   

The following statements are allowed if the listed condition is met.
-- CASE, END SELECT in a CASE construct
-- ELSEWHERE, END WHERE in a WHERE construct
-- CYCLE, EXIT, END DO in a DO construct

Message ID: ERROR_0267


Error : This statement is not allowed in a DO construct.

The following statements are allowed in a DO construct:

   ALLOCATE               ASSIGN
   BACKSPACE              BUFFER
   CALL                   CLOSE
   CONTINUE               DATA
   DEALLOCATE             DECODE
   DO                     ENCODE
   ENDFILE                ENDIF
   ELSE                   ELSEIF
   FORMAT                 GOTO
   IF                     INQUIRE
   NAMELIST               NULLIFY
   OPEN                   PAUSE
   PRINT                  READ
   RETURN                 REWIND
   SELECT                 STOP
   WHERE                  WRITE
   assignment
   

The following statements are allowed in the listed constructs.
-- CASE, END SELECT in a CASE construct
-- ELSE, ELSEIF, END IF in an IF construct
-- ELSEWHERE, END WHERE in a WHERE construct

Message ID: ERROR_0268


Error : This statement is not allowed following a SELECT CASE statement.

The CASE statement is the only statement that can follow a SELECT CASE statement. The compiler found another statement (not a CASE statement) following the SELECT CASE statement.

Message ID: ERROR_0269


Error : This statement is not allowed in a WHERE construct.

Only array assignment statements are allowed in the WHERE block or ELSEWHERE block of a WHERE construct. The compiler found another statement (not an array assignment statement) in a WHERE or ELSEWHERE block.

Message ID: ERROR_0270


Error : The %s statement is not allowed in an interface body.

The following statements are allowed in an interface body.

ALLOCATABLE
COMMON
derived type definitions
DIMENSION statement
END FUNCTION
END SUBROUTINE
EQUIVALENCE
EXTERNAL
IMPLICIT
IMPLICIT NONE
INTENT
INTRINSIC
NAMELIST
OPTIONAL
PARAMETER
POINTER
SAVE
TARGET
type declaration
USE

The following statements are allowed if the listed condition is met:
-- SEQUENCE, END TYPE in a derived type definition
-- PUBLIC, PRIVATE in a module program unit

Message ID: ERROR_0271


Error : This statement is not allowed in a subroutine subprogram.

The PRIVATE and PUBLIC statements are not allowed in a subroutine subprogram.

These statements must be inside an interface block, scoping unit, or a construct to be in a subroutine subprogram.
-- SEQUENCE, END TYPE in a derived type definition
-- MODULE PROCEDURE in a generic interface block
-- ELSE, ELSEIF, END IF in an IF construct
-- CASE, END SELECT in a CASE construct
-- ELSEWHERE, END WHERE in a WHERE construct
-- CYCLE, EXIT, END DO in a DO construct
-- FUNCTION, END FUNCTION, SUBROUTINE, END SUBROUTINE, END INTERFACE in an interface block

Message ID: ERROR_0272


Error : This attribute is specified more than once for the component declaration.

An attribute must only be specified once for a component. The DIMENSION or the POINTER attribute has been specified more than once for the component, as in the following example:

     TYPE :: ABC
       REAL, POINTER, POINTER :: IJK ! illegal
     END TYPE ABC
   

Message ID: ERROR_0273


Ansi : Fortran requires all intrinsic procedure actual arguments to be type integer or character for restricted expressions.

In Fortran, restricted expressions allow elemental function references. Each argument to the intrinsic must be type integer or character. The compiler allows arguments to be typed other than integer or character, if the result of the expression is type integer or character.

Message ID: ANSI_0274


Error : The PUBLIC and/or PRIVATE attribute is specified more than once for this derived type.

The PUBLIC or PRIVATE attribute can only be declared once for the derived type.

Message ID: ERROR_0275


Error : This must be a constant to be used in an initialization expression.

The compiler detected an illegal use of the object. It must be a constant to be in an initialization expression.

Message ID: ERROR_0276


Error : This is not valid as a keyword for this call.

The compiler detected an actual argument keyword that does not match a dummy argument name in the explicit interface for the called routine.

Message ID: ERROR_0277


Internal : No semantics routine exists for this statement type.

The statement level semantics processing driver encountered a statement header that contains a statement type value for a statement for which there is no semantic routine.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0278


Ansi : The EXTERNAL attribute has been specified for the program unit being compiled. This is nonstandard.

The compiler detected the following:

       SUBROUTINE JOE()
       EXTERNAL JOE  ! This is nonstandard
       RETURN
       END
   

Message ID: ANSI_0279


Ansi : Fortran requires all intrinsic procedure actual arguments to be type integer for specification expressions.

In Fortran, specification expressions allow elemental function references. Each argument to the intrinsic must be type integer. The compiler allows arguments to be typed other than integer, as long as the result of the expression is type integer.

Message ID: ANSI_0280


Error : The left hand side of an assignment statement must be a variable or a function result.

The left side of this assignment statement is not valid. This could be caused by assigning a value to a constant, external subprogram name, namelist group name, or some other entity other than a variable or the function result name of the current function.

Message ID: ERROR_0281


Error : Function is declared in an interface block, therefore it must not be typed assumed-length character.

The only functions that can be typed as assumed-length character are external functions. If a function is declared inside an interface block, it must not be typed as assumed-length character. Interface blocks are only used for explicitly declared external subprograms.

Message ID: ERROR_0282


Error : The name specified on this statement must match.

The compiler detected that the name specified on the END statement does not match the name of the program unit or derived type.

The names must match for the following statements:

   PROGRAM/END PROGRAM program_name
   MODULE/END MODULE  module_name
   BLOCKDATA/END BLOCK DATA block_data_name
   SUBROUTINE/END SUBROUTINE subroutine_name
   FUNCTION/END FUNCTION function_name
   TYPE/END TYPE type_name
   

Message ID: ERROR_0283


Error : This construct has construct name, therefore that statement must specify the same construct name.

If the IF, DO, or CASE construct has a construct name, the END IF, END DO, or END SELECT statement must specify the same construct name. The compiler detected a difference between the construct names or a construct name is missing on the END statement.

Message ID: ERROR_0284


Error : If this construct does not have a construct name, that statement must not have a construct name specified.

If the DO, IF, or CASE construct does not have a construct name specified, the corresponding END DO, END IF, or END SELECT statement must not have a construct name specified.

Message ID: ERROR_0285


Error : A derived type type-name must not be the same as the name of the intrinsic type %s.

The compiler detected one of the following:

        TYPE :: INTEGER
        TYPE :: REAL
        TYPE :: DOUBLE PRECISION
        TYPE :: COMPLEX
        TYPE :: CHARACTER
        TYPE :: LOGICAL
   

All of the above are illegal, because a derived type type-name must not be the same as the name of any intrinsic type.

Message ID: ERROR_0286


Warning : The result of function name in the function subprogram is not defined.

The end of a function was reached, and nowhere in the function was the function return value defined or assigned. The function return value must be defined during execution of the function.

Message ID: WARNING_0287


Error : A termination statement is missing for this DO statement.

The compiler detected that the DO statement has no corresponding termination statement. If the DO statement does not specify a label, the DO loop must be terminated with an END DO statement. If the DO statement specifies a label, the DO loop must be terminated with an END DO statement or any action statement other than the following statements:

       unconditional GO TO
       assigned GO TO
       RETURN
       STOP
       EXIT
       CYCLE
       END FUNCTION
       END SUBROUTINE
       END PROGRAM
       arithmetic IF
   

Message ID: ERROR_0288


Error : This statement has no matching statement.

The compiler cannot find the beginning statement for the block that this END statement is closing. The following END statements close the corresponding blocks:

    END              PROGRAM, MODULE, BLOCK DATA,
                        FUNCTION, SUBROUTINE
    END PROGRAM      PROGRAM
    END FUNCTION     FUNCTION
    END SUBROUTINE   SUBROUTINE
    END BLOCK DATA   BLOCK DATA
    END MODULE       MODULE
    END IF           IF
    END DO           DO
    END SELECT       SELECT CASE
    END WHERE        WHERE
    END INTERFACE    INTERFACE
    END TYPE         TYPE
   

Message ID: ERROR_0289


Error : Derived type must have at least one component declared for it.

The compiler detected no components declared for the derived type ending at this statement. The syntax for a derived type definition requires at least one component declaration and is as follows:

       derived_type_stmt
         [private_sequence_stmt]...
         component_def_stmt
         [component_def_stmt]...
       end_type_stmt
   

Message ID: ERROR_0290


Error : An END statement is missing for this statement.

The compiler detected that one of the following syntactic constructs is missing its END statement: a module, a block data subprogram, a subroutine subprogram, a function subprogram, an IF construct, a DO construct, a CASE construct, a WHERE construct, an interface block, an interface body, or a derived type definition. These are all required to have an END statement.

Message ID: ERROR_0291


Error : This is specified as the module name on a USE statement, but the compiler cannot find it.

The compiler cannot locate the module name specified on the USE statement. The compiler searches through all modules specified before the current program unit. If it cannot find the module there, it then searchs all files specified on the -p command-line option.

Message ID: ERROR_0292


Error : This unnamed main program unit is missing an END statement.

The compiler detected a premature end of file. A main program unit must be terminated by an END statement. An unnamed main program unit is a program unit that has no PROGRAM, SUBROUTINE, FUNCTION, MODULE or BLOCKDATA statement as its first statement.

Message ID: ERROR_0293


Error : Equivalence-object must be a sequence derived type.

If an object appears in an EQUIVALENCE statement and is derived type, it must be a sequence derived type.

Message ID: ERROR_0294


Internal : Routine expected LA_CH input to be different.

A routine has the built-in assumption that the lookahead character be the specified character.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0295


Internal : PRINTMSG received a zero line number.

All messages (except Log messages which are output to standard error) must have a nonzero line number.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0296


Error : IMPLICIT NONE is specified in the host scope, therefore an explicit type must be specified for this data object.

When IMPLICIT NONE is specified in a host scope, all data objects must have explicit types, including those in any contained scopes.

Message ID: ERROR_0297


Error : Only one IMPLICIT NONE statement is allowed in a scope.

When an IMPLICIT NONE statement is specified in a scoping unit, there must be no other IMPLICIT statements in the scoping unit.

Message ID: ERROR_0298


Error : An assignment can not be made to a function name when a separate function result variable has been declared.

An attempt was made to assign a value to the name of the function (function result variable) when the function declaration specifies a separate function result variable. This result variable must be used instead.

Message ID: ERROR_0299


Error : Operators "=, =>, and %%" must not be used as defined operators.

The compiler detected the operator =, =>, or % being used as a defined_operator in OPERATOR(defined_operator). Valid defined_operators are:

   **	*	/	+
   -	//	.EQ.	.NE.
   .LT.	.LE.	.GT.	.GE.
   ==	/=	<	<=
   >	>=	.NOT.	.AND.
   .OR.	.EQV.	.NEQV.	
   defined-unary-op
   defined-binary-op
   

NOTE: defined-unary-op and defined-binary-op are .letter[letter]... .

Message ID: ERROR_0300


Warning : Binary output must be requested for a module information file for module to be created.

A module information file will not be created because a binary output file is not being created. The module information file resides in the binary file, therefore it cannot be written. Specifying -dB on the command line or generating an assembly language file disables generation of the binary file.

Message ID: WARNING_0301


Error : The operands are not rank-conformant.

A binary operator in an array syntax expression must have rank conformance. This means that the ranks must be equal or one or both of the operands must be scalar.

Message ID: ERROR_0302


Error : Data type is not allowed with this data type for this operation.

An expression contains two operands of data types that are illegal for the operator being used.

Message ID: ERROR_0303


Error : Missing left parenthesis in FORMAT specifier.

This format specification has unbalanced parentheses.

Message ID: ERROR_0304


Error : Missing right parenthesis or unexpected end of FORMAT specifier.

A format specification contains unbalanced parentheses. There are more left parentheses than there are right parentheses.

Message ID: ERROR_0305


Error : Integer constant expected.

An incomplete edit descriptor is used in a format specification. The exact form must be followed when specifying the following edit descriptors:

     Ew.d	Ew.dEe
     Fw.d
     Gw.d	Gw.dEe
     Dw.d	Dw.dEe
     Iw	Iw.m
     Bw	Bw.m
     Ow	Ow.m
     Zw	Zw.m
     Rw
     Lw
     kP    -kP   +kP
     Tc
     TLc
     TRc
     -nX
   
The values w, d, m, k, n, and c must not be omitted.

Message ID: ERROR_0306


Error : A period is expected.

The compiler expects a period here. These edit descriptors must adhere to the following forms:

     Ew.d	Ew.dEe
     Fw.d
     Gw.d	Gw.dEe
     Dw.d
   

Message ID: ERROR_0307


Error : Expecting -nP, -nX, or +nP, but found something else.

The compiler found -n (where n is an integer) and expected it to be followed by P or X; or the compiler found +n and expected it to be followed by P.

Message ID: ERROR_0308


Error : No repeat count is allowed for this edit descriptor.

A nonrepeatable edit descriptor is used with a repeat count. The following edit descriptors must not be repeated:

         kP    scale factor
         "     literal string
         '     literal string
         BN    blanks ignored
         BZ    blanks treated as zeros
         :     terminate format control
         Tn    Positioning
         TLn
         TRn
         nX    spacing
         $     carriage control
         SP    plus signs
         S     plus signs
         SS    plus signs
   

Message ID: ERROR_0309


Error : The repeat count value must be greater than 0.

The repeat count is not valid for this format specification. Format specifications must be in the following format:

     ([format_item_list])
   

format_item_list is a list of items of the following form:

   [r] data_edit_desc
             control_edit_desc
             char_string_edit_desc
   [r] (format_item_list)
   

r is a nonzero, unsigned integer constant.

Message ID: ERROR_0310


Error : Field width must not be zero.

The compiler has found a zero field width or exponent width on an edit descriptor. In the following edit descriptors, the values w and e cannot be zero:

     Ew.d  Ew.dEe
     Fw.d
     Gw.d  Gw.dEe
     Dw.d  Dw.dEe
     Iw    Iw.m
     Aw
     Ow    Ow.m
     Zw    Zw.m
     Rw
     Lw
   

Message ID: ERROR_0311


Error : Maximum size for field width, decimal field width, exponent field width, or repetition count exceeded.

For repeatable edit descriptors, a maximum field size of 16,777,215 is allowed for total field width and decimal digit field width. A maximum field size of 63 is allowed for the exponent field width. A maximum of 2,147,483,647 is allowed for the repetition count.

Message ID: ERROR_0312


Error : Missing or zero length for the H edit descriptor.

An H edit descriptor is being used with an improper value for the number of characters. The H edit descriptor, used to output Hollerith strings, must adhere to the following form:

        nH
   

n must be a nonzero, positive integer.

Message ID: ERROR_0313


Error : Unknown edit descriptor has been detected.

This format specification has an unknown edit descriptor.

Message ID: ERROR_0314


Error : Encountered end of data before completion of last edit descriptor processing.

An H edit descriptor specifies a number of characters greater than the length of the statement. For example, the following statement would cause this message to be issued:

     10    FORMAT(100HABCDEFGHIJ)
   

Message ID: ERROR_0315


Error : Hollerith, octal, hexadecimal and binary constants are not allowed as I/O list items.

Constants that are of type Boolean are not allowed as input or output list items on I/O statements. Boolean constants are either Hollerith constants or hexadecimal, octal, or binary constants. Some examples include

   	4habcd
   	"abcd"R
   	77b
   	x"a77"
   

Message ID: ERROR_0316


Ansi : The use of this as a dot operator is an extension to the Fortran standard.

The following dot operators are extensions to the Fortran standard.

     .A.    (a synonym for .AND.)
     .N.    (a synonym for .NOT.)
     .O.    (a synonym for .OR.)
     .X.    (a synonym for .NEQV.)
     .XOR.		
   

The extension dot operator is not allowed if it is being used as a defined operator.

Message ID: ANSI_0317


Error : This operator has not been declared as a user defined operator.

The compiler detected a dot operator that is not declared as a defined operator and is not an intrinsic dot operator.

Message ID: ERROR_0318


Error : A subscript must be a scalar integer expression.

The compiler detected a subscript in an array reference or in a subscript triplet array reference that is not a scalar integer expression.

Message ID: ERROR_0319


Error : A vector subscript must be a rank 1 integer expression.

The compiler detected a vector subscript for an array reference that has a rank greater than 1.

Message ID: ERROR_0320


Error : The second subscript must not be omitted from a subscript triplet in the last dimension of an assumed-size array.

The second subscript must not be omitted from a subscript triplet in the last dimension of an assumed-size array.

Message ID: ERROR_0321


Error : This use of a function or derived type is not valid.

A parenthesized list was expected but was not found. The object in question is either a derived type name or a forward reference to an internal function.

Message ID: ERROR_0322


Error : The expressions in a substring range must be scalar integer expressions.

The compiler detected a substring range that is not a scalar integer expression.

Message ID: ERROR_0323


Error : Assignment of an expression of this rank to a variable of another rank is not allowed.

Unless there is an extended assignment to allow it, the ranks of both sides of an assignment statement must agree or the right side must be a rank zero expression.

Message ID: ERROR_0324


Internal : The routine get_dummy_arg_type is called with a dummy argument that is not a data object.

The routine get_dummy_arg_type is called with an argument that is not valid.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0325


Error : The left hand side of this assignment statement is a constant.

The left side of an assignment statement is either a named constant or a subobject of a named constant.

Message ID: ERROR_0326


Ansi : The actual argument to IACHAR and ICHAR must have length equal to one character.

The actual argument to IACHAR and ICHAR must have length = 1.

Message ID: ANSI_0327


Error : Statement label is not a FORMAT statement label.

A statement label that is not defined on a FORMAT statement is being referenced in a context where a FORMAT statement label is required.

Message ID: ERROR_0328


Error : Intrinsic function is not allowed in an initialization expression.

This intrinsic function is not allowed in an initialization expression. It must be an elemental intrinsic function or one of the following transformational intrinsic functions:

      REPEAT
      RESHAPE
      SELECTED_INT_KIND
      SELECTED_REAL_KIND
      TRANSFER
      TRIM
   

Message ID: ERROR_0329


Error : More than one actual argument has been specified for a dummy argument.

The compiler recognized that more than one actual argument was specified for a particular dummy argument. This can result from two identical argument keywords or an argument keyword and a positional argument for the same dummy argument.

Message ID: ERROR_0330


Error : There is no corresponding dummy argument for this actual argument number.

The actual argument does not have a corresponding dummy argument. This is caused by specifying more actual arguments than the number of dummy arguments.

Message ID: ERROR_0331


Error : There is no actual argument to correspond to this dummy argument.

An explicit interface for the called routine was declared. The compiler found that a nonoptional dummy argument (does not have the OPTIONAL attribute) does not have a corresponding actual argument.

Message ID: ERROR_0332


Error : An actual argument keyword is being used when an explicit interface is not known.

An argument keyword can only be used if the interface to the called routine is known at compile time. This information can be supplied for external subprograms by an interface block. Internal and module subprograms always have keyword information specified by definition.

Message ID: ERROR_0333


Error : The type of this actual argument does not match that of the dummy argument.

A difference was detected between the type of the actual argument and the type of the dummy argument supplied in an explicit interface for the called routine.

Message ID: ERROR_0334


Error : Function is an illegal reference in a CALL statement.

This CALL statement is attempting to call a function. Only subroutines can be specified on CALL statements.

Message ID: ERROR_0335


Error : The kind of this actual argument does not match that of its associated dummy argument.

A difference was detected between the kind type parameter of the actual argument and the kind type parameter of the dummy argument supplied in an explicit interface for the called routine.

Message ID: ERROR_0336


Error : The rank of this actual argument does not match that of its corresponding dummy argument.

A difference was detected between the rank of the actual argument and the rank of the dummy argument supplied in an explicit interface for the called routine.

Message ID: ERROR_0337


Error : An alternate return dummy argument (*) requires a user label as its actual argument.

An explicit interface defines this dummy argument as an alternate return argument (*), but the call site does not supply a user label as the corresponding actual argument.

Message ID: ERROR_0338


Error : Unexpected syntax: A label, a left parenthesis, or a variable name is expected but found something else.

There are three forms of the GO TO statement:
-- Unconditional: GO TO label
-- Computed: GO TO (label_list) [,] scalar_int_expr
-- Assigned: GO TO scalar_int_variable [ [,] (label_list) ]

The token following the keyword TO is expected to be a statement label, a left parenthesis, or a variable name.

Message ID: ERROR_0339


Error : Variable does not appear in an ASSIGN statement in this scoping unit.

The diagnosed variable was not assigned a statement label value by an ASSIGN statement in the current scoping unit. When executing an assigned GO TO statement, the integer variable must be defined with the value of a statement label of a branch target statement that appears in the same scoping unit. The variable can be defined with a statement label value only by an ASSIGN statement in the same scoping unit as the assigned GO TO statement.

Message ID: ERROR_0340


Comment : The ASSIGN statement is an obsolescent feature.

An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which a better method is available. The ASSIGN statement allows a label to be dynamically assigned to an integer variable, and the assigned GO TO statement allows "indirect branching" through this variable. This hinders the readability of the program flow, especially if the integer variable also is used in arithmetic operations. The two totally different usages of the integer variable can be an obscure source of error.

These statements have commonly been used to simulate internal procedures that can now be coded directly.

Message ID: COMMENT_0341


Comment : The assigned GO TO statement is an obsolescent feature.

An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which a better method is available. The ASSIGN statement allows a label to be dynamically assigned to an integer variable, and the assigned GO TO statement allows "indirect branching" through this variable. This hinders the readability of the program flow, especially if the integer variable also is used in arithmetic operations. The two totally different usages of the integer variable can be an obscure source of error.

These statements have commonly been used to simulate internal procedures that can now be coded directly.

Message ID: COMMENT_0342


Error : A RECURSIVE keyword must be declared for a subprogram so that the subprogram can be called recursively.

A function or subroutine is being called recursively, but the program unit does not have the RECURSIVE keyword on its FUNCTION or SUBROUTINE statement.

Message ID: ERROR_0343


Ansi : This subprogram has no result name, but is being called recursively. This is an extension to the Fortran standard.

If the function declaration does not contain a RESULT clause, the Fortran standard states that any reference to the function name is a reference to the result variable of the function, not a recursive call. An extension has been made to allow a reference to the function name to be a recursive reference, provided the function result is not array-valued or a derived type. It is more explicit and safer to use a RESULT clause when a function is to be called recursively.

Message ID: ANSI_0344


Error : Label is not defined on either an executable statement or a FORMAT statement.

In an ASSIGN statement, label must be the statement label of an executable statement (and it must be a valid branch target statement) or it must be the statement label of a FORMAT statement. The executable or format statement must also be defined in the same scoping unit as the ASSIGN statement.

Message ID: ERROR_0345


Error : The statement at this line is not a valid branch target statement.

In an ASSIGN statement, if label is the statement label of an executable statement, the executable statement must be a valid branch target statement. Examples of executable statements that are not valid branch target statements are: ELSE IF, ELSE, CASE, ELSEWHERE, and END WHERE.

Message ID: ERROR_0346


Warning : Label is defined in the WHERE construct starting at that line.

The label in the ASSIGN statement is defined on a statement contained in a WHERE construct. Transfer of control to the interior of a WHERE construct is prohibited.

Message ID: WARNING_0347


Warning : Label is defined in the CASE block starting at that line.

The label in the ASSIGN statement is defined on a statement contained in a CASE block. Transfer of control into a CASE block from outside of the block (even from another CASE block of the same CASE construct) is prohibited.

Message ID: WARNING_0348


Warning : Label does not appear in an ASSIGN statement in this scoping unit.

The label cited in the message is used in the assigned GO TO statement being diagnosed but the label did not appear in any ASSIGN statement in the current scoping unit. When executing an assigned GO TO statement, the integer variable must be defined with the value of a statement label of a branch target statement that appears in the same scoping unit. The variable can be defined with a statement label value only by an ASSIGN statement in the same scoping unit as the assigned GO TO statement.

Message ID: WARNING_0349


Error : This is typed CHARACTER*(*), therefore it must be a dummy argument, a constant or a Cray pointee.

A data object that is declared to be assumed-length character (CHARACTER*(*)), must be a constant, dummy argument, or a Cray pointee. A Cray pointee is nonstandard.

Message ID: ERROR_0350


Error : This is an assumed-shape array, therefore it must be a nonpointer dummy argument.

By definition an assumed-shape array must be a nonpointer dummy argument. An assumed-shape array is declared by specifying

      DIMENSION NEW_ARRAY(10:)
   
This declares a rank one array called NEW_ARRAY with a lower bound of 10. NEW_ARRAY must not be declared with the POINTER attribute.

Message ID: ERROR_0351


Error : This has the OPTIONAL and/or INTENT attribute, therefore it must be a dummy argument.

If an object is given the OPTIONAL and/or INTENT attributes it must be declared as a dummy argument.

Message ID: ERROR_0352


Error : This must have the POINTER or ALLOCATABLE attributes or be a dummy argument, because it is a deferred-shape array.

A deferred-shape array must be a dummy argument, a pointer, or have the ALLOCATABLE attribute. This item has none of these characteristics.

Message ID: ERROR_0353


Error : Equivalence-object is of a derived type that has an ultimate component that has the POINTER attribute.

An equivalence-object of a derived type has a component that is a pointer. Derived types with pointer components cannot be equivalenced.

Message ID: ERROR_0354


Error : This is used in an expression or specified in a namelist group, and the type is already assumed to be different.

When an object is used in an expression or specified in a namelist group, it is implicitly typed if it is the first reference to this object. The object can subsequently be typed in a type declaration statement only if it confirms the type.

Example:

        DIMENSION ARRAY(K)
        REAL K          ! Illegal
   

K can only be typed integer, because that is what it is implicitly typed as in the DIMENSION statement.

        IMPLICIT INTEGER(A-Z)
        NAMELIST /GROUP/ R
        REAL R           ! Illegal
   

R can only be typed integer, because that is what it is implicitly typed as in the NAMELIST statement

Message ID: ERROR_0355


Error : Assignment of an expression of this type to a variable of that type is not allowed.

The combination of types in this assignment statement is not valid. The assignment of derived types is only allowed when the types are defined by the same declaration or their declarations both contain SEQUENCE statements and are identical in every respect. "Identical" means that the type name, number of components, component order, component names, and component type and attributes agree.

Message ID: ERROR_0356


Error : The number of components in this derived type constructor does not match the declared number.

This derived type constructor has an incorrect number of components.

Message ID: ERROR_0357


Error : This derived type constructor has a type mismatch error.

Each component of a derived type constructor must be the same type as the corresponding component of the derived type definition. The types of this constructor component and the corresponding component of the derived type do not match.

Message ID: ERROR_0358


Error : This structure constructor item which corresponds to a pointer component is not an allowable target.

When a component in a derived type is a pointer, the corresponding structure constructor expression must evaluate to an object that would be an allowable target for such a pointer in a pointer assignment statement. In the following example, both of the structure constructors are allowed.

      TYPE X
         INTEGER, POINTER :: IPTR
      END TYPE

      TYPE(X)          :: LEFT
      INTEGER, POINTER :: INT_PTR
      INTEGER, TARGET  :: INT_TARGET

      LEFT = X(INT_PTR)

      LEFT = X(INT_TARGET)
   

Message ID: ERROR_0359


Error : The rank of derived type constructor component does not match the declared rank.

All components of a derived type constructor must match the corresponding declared component in type and shape.

Message ID: ERROR_0360


Error : Both actual arguments to DPROD must be of type default real.

Both actual arguments to DPROD must be of type default real.

Message ID: ERROR_0361


Warning : This statement can not be reached.

The statement preceding the diagnosed statement is a GO TO statement. The current statement has no label; therefore, control cannot reach the current statement. For example:

      GO TO 20
      I = J ! There is no way to get to this statement.
   

Message ID: WARNING_0362


Error : All of the actual arguments to this intrinsic call are not conformable to each other.

All of the actual arguments to an elemental intrinsic must be conformable.

Message ID: ERROR_0363


Limit : The number of compiler generated labels exceeds the compiler limit.

During the compilation process, the compiler must generate internal labels. The number of labels used by the compiler exceeds the indicated limit. The source file must be divided into smaller, separate files.

Message ID: LIMIT_0364


Error : This statement must not be the action-stmt of a logical IF statement.

The logical IF statement contains a statement that is not permitted as the action_stmt portion of the logical IF statement.

The syntax of a logical IF statement is:

      IF (scalar_logical_expr) action_stmt
   

The action_stmt must be an executable statement that is not:
-- Another logical IF statement
-- Any form of an END statement
-- Any statement that is part of a construct (such as the IF, ELSE IF, or ELSE statement of an IF construct)

Message ID: ERROR_0365


Internal : Unexpected statement type when parsing the target statement of a logical IF.

The logical IF statement handler encountered a stmt_type value that it did not expect.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0366


Error : Object is a module procedure or an internal function so it must not be typed as an assumed-length character.

Internal and module procedures must not be typed as assumed-length character.

Message ID: ERROR_0367


Error : Module procedure must be defined in this scoping unit or associated from another scoping unit.

All names listed on a MODULE PROCEDURE statement must be defined in that scoping unit, or be accessible from another scoping unit. The following example shows a module procedure that has not been defined.

        MODULE Error

          INTERFACE Undefined
            MODULE PROCEDURE Not_Here
          END INTERFACE

        END MODULE Error
   

Not_Here is in error. It does not exist in module ERROR and has not been made available by use association.

Message ID: ERROR_0368


Error : This expression must be an integer scalar expression.

The expression encountered in this context must be an integer scalar expression (for example, the expression which follows a RETURN statement must be an integer scalar expression).

Message ID: ERROR_0369


Error : Alternate return specifiers are not allowed in function subprograms.

If the user codes a RETURN statement in a function subprogram, the keyword RETURN must stand alone. Alternate return specifiers are not allowed in function subprograms.

Message ID: ERROR_0370


Comment : Alternate return specifiers are obsolescent.

An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which a better method is available.

An alternate return allows a called procedure to direct the execution of the calling procedure upon return. The same effect can be achieved by returning an integer value where this integer value is used to control a CASE construct or computed GO TO statement upon return to the calling procedure.

Message ID: COMMENT_0371


Error : All dimension specifiers on a COMMON statement must be declared with constant bounds.

The syntax for an object in a common_block_object_list is

      variable_name [(explicit_shape_spec_list)]
   

Each bound in an explicit_shape_spec must be a constant specification expression. To declare a pointer in a common_block_object_list, use the DIMENSION statement to declare the array as a deferred-shape array; then specify it in a COMMON statement.

Message ID: ERROR_0372


Error : Object is in a common block and is derived-type. This derived-type must be a sequence type.

If a common_block_object is of a derived type, it must be a sequence type.

Message ID: ERROR_0373


Error : This numeric constant is out of range.

A numeric constant was found to be out of range. Either an integer constant is too large or a real constant has an exponent which is too large.

Message ID: ERROR_0374


Warning : The number of subscripts is smaller than the number of declared dimensions.

An array reference of the form a(s[,s]...) is used. The number of subscripts in the reference should equal the number of dimensions declared for the array. An extension to the Fortran standard allows fewer subscripts than the declared number of dimensions. The subscripts specified in the array reference are used for the leftmost dimensions, and the lower bounds are used for the rightmost subscripts that were omitted.

Message ID: WARNING_0375


Ansi : An array reference with fewer than the declared number of dimensions is an extension to the Fortran standard.

The compiler allows arrays to be referenced with fewer than the declared number of dimensions. The unspecified dimensions are implied to be the lower bound of that dimension. This is an extension to the Fortran standard.

Message ID: ANSI_0376


Error : Unexpected syntax: expected the keyword THEN, the beginning of an action-stmt, or a label.

If the statement is intended to be the IF-THEN statement of an IF construct, the keyword THEN must follow the closing parenthesis of the IF condition. If the statement is intended to be an IF statement, the beginning of an action_stmt must follow the closing parenthesis of the IF condition. If the statement is intended to be an arithmetic IF, an indirect logical IF, or a two-branch arithmetic IF, a label must follow the closing parenthesis of the IF condition.

The arithmetic IF is an obsolescent feature and the indirect logical IF and two-branch arithmetic IF are outmoded extensions.

Message ID: ERROR_0377


Error : This subprogram reference is illegal.

The compiler detected a subprogram reference where a data object or function call was expected. This may be the result of a function name without an actual argument list or a subroutine name not in a CALL statement.

Message ID: ERROR_0378


Error : Procedure must be EXTERNAL, a module procedure or declared in an interface block to be an actual argument.

A procedure name is used as an actual argument to a function or subroutine call, but the procedure name has not been given the EXTERNAL attribute, is not a module procedure, or is not specified in an interface block. NOTE: Giving the EXTERNAL attribute to the name of the SUBROUTINE being compiled is an extension to the standard.

Message ID: ERROR_0379


Error : No specific match to the defined generic operation can be found.

The type(s) of operand(s) to a defined operator or generic call cannot be matched with any of the specific subprogram interfaces contained in the interface block. All actual arguments must match exactly by type, kind type, and rank with the corresponding dummy argument in order for a match to occur. Any dummy arguments that have no corresponding actual arguments must be declared OPTIONAL.

Message ID: ERROR_0380


Comment : The PAUSE statement is obsolescent.

The PAUSE statement is obsolescent. An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which a better method is available. In most cases, the functionality of a PAUSE statement can be achieved in a portable manner with the use of a READ statement that awaits some input data.

Message ID: COMMENT_0381


Log_Error : Cannot open Compiler Information File .

The compiler cannot open the Compiler Information File (CIF) named input_name.T or a temporary CIF for writing. Check the file permissions for the working directory.

Message ID: LOG_ERROR_0382


Error : Cannot write to the Compiler Information File.

The compiler cannot write a record to the Compiler Information File (CIF). Compilation will continue but CIF processing is turned off. No object file will be created.

Message ID: ERROR_0383


Internal : The length of the keyword in a keyword table is greater than the maximum of 127.

All the items in the keyword table must be less than 127 characters, because of token size limits. Check the table in use at the time the message was issued.

This message should never be generated and signifies a bad compiler or a bad installation. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code.

Message ID: INTERNAL_0384


Ansi : The character variable/expression or the integer constant following the STOP/PAUSE statement is nonstandard.

The Fortran standard allows for a scalar character literal constant or a 5 digit integer literal constant (leading zeros do not count) following a STOP or PAUSE. Using a character variable, a character expression, or an integer constant longer than 5 digits is an extension to the Fortran standard.

Message ID: ANSI_0385


Error : The expression following a STOP/PAUSE must be a scalar character expression or an unsigned integer constant.

The Fortran standard allows for a 5-digit unsigned scalar integer constant (leading zeros do not count) or a scalar character constant following a STOP or PAUSE keyword. The compiler allows an arbitrary length unsigned scalar integer constant or a scalar character expression following the STOP or PAUSE keyword.

Message ID: ERROR_0386


Error : The CONTAINS statement must be followed by a FUNCTION or SUBROUTINE statement.

The compiler detected a CONTAINS statement that is not followed by a SUBROUTINE or FUNCTION statement. The syntax for the CONTAINS statement is as follows:

In a module:

     contains_stmt
            module_subprogram
           [module_subprogram]...
   

In an external procdure

     contains_stmt
           internal_subprogram
          [internal_subprogram]...
   

Message ID: ERROR_0387


Log_Warning : Assembly language listing (-rg) disables assembly language output (-eS or -S filename). The listing is selected.

The compiler cannot have an assembly language listing and an assembly language output file at the same time. The assembly language output file is disabled.

Example:

   -eS -rg file.f (Warning message will be issued)
   

Message ID: LOG_WARNING_0388


Error : No specific match can be found for the generic subprogram call.

A function or subroutine call which invokes the name of a generic interface does not match any specific subprogram interfaces in the generic interface block. All dummy arguments that do not have the OPTIONAL attribute must match exactly all corresponding actual arguments in type, kind type, and rank.

Message ID: ERROR_0389


Error : Derived type is defined in the host scope and used in the local scope, therefore it must not be redefined.

The compiler detected the following:

     TYPE :: NEW_TYPE
       INTEGER :: A
     END TYPE NEW_TYPE
     ...

     CONTAINS
       SUBROUTINE EXAMPLE
       TYPE(NEW_TYPE) :: VAR

       TYPE :: NEW_TYPE  ! This redefinition is illegal.
         INTEGER :: B
       END TYPE NEW_TYPE
       ...
       END SUBROUTINE
     END
   

Message ID: ERROR_0390


Warning : Type will be re-mapped.

The specified data type has been mapped to the new data type, because the compiler does not currently support the specified data type.

Message ID: WARNING_0391


Error : Data type is not allowed for this operator.

The data type of an operand of a unary operator is not valid.

Message ID: ERROR_0392


Error : An array reference with parentheses must have at least one subscript.

The compiler found an array reference with no subscripts, but it is not a whole array reference. The following example demonstrates the problem:

      DIMENSION I(10)
      J = I()
   

If J is a scalar reference, then to be correct a subscript must be specified in the reference to I, such as I(3).

Message ID: ERROR_0393


Error : This Hollerith constant is longer than one word.

A Hollerith constant used as a numeric constant cannot be longer than one word.

Message ID: ERROR_0394


Ansi : Masking expressions are an extension to the Fortran standard.

A logical operator is used with operands that are of types integer, real, Boolean and/or Cray pointer. This is called a masking expression and is an extension to the Fortran standard.

Message ID: ANSI_0395


Error : This generic interface has both subroutine and function specific interfaces.

A generic interface must have only all function specific interfaces or all subroutine specific interfaces. This generic interface has both subroutine and function specific interfaces.

Message ID: ERROR_0396


Error : The generic interface cannot be called as a subroutine.

A generic interface name is used in a CALL statement but the interface contains only function specific interfaces.

Message ID: ERROR_0397


Error : The generic interface cannot be used as a function.

A generic interface name is used as a function name but the interface contains only subroutine specific interfaces.

Message ID: ERROR_0398


Comment : Generic interface call was resolved.

This comment tells what resolution occurred for a generic interface reference or overloaded operator.

Message ID: COMMENT_0399


Error : The characters found in the label field are not valid.

In fixed source form, the label field of a line (columns 1 to 5) must only have spaces or digits. An illegal character has been found in the label field on this line.

Message ID: ERROR_0400


Error : A stride specification in the array shape specification on the ALLOCATE statement is illegal.

An array shape specification has a stride specified. Only the lower bound (which is optional) and upper bound can be specified. The syntax for a allocate_shape_spec is [lower_bound:] upper_bound.

Message ID: ERROR_0401


Error : The number of extents specified for this allocate object does not match the declared rank.

When an allocate_object is an allocatable array or pointer array, the shape specified in an ALLOCATE statement must have the extent of every dimension specified.

Message ID: ERROR_0402


Error : The upper or lower bound of a dimension in an allocate object must be a scalar integer expression.

In an ALLOCATE statement, an allocate_object has its shape specified with bounds that are not scalar integer expressions.

Message ID: ERROR_0403


Error : Only scalar objects can be allocated in an ALLOCATE statement.

A nonscalar object was encountered in an allocation_list of an ALLOCATE statement. This is because a part_ref in a derived type reference is a whole array reference or an array section.

Message ID: ERROR_0404


Error : An allocate/deallocate object cannot be a substring reference.

An allocate_object in an ALLOCATE or DEALLOCATE statement was referenced with a substring qualifier.

Message ID: ERROR_0405


Ansi : The indirect logical IF and the two-branch arithmetic IF statements are both nonstandard and outmoded.

The indirect logical IF statement and the two-branch arithmetic IF statement are obsolete features. These outmoded features have been replaced by alternatives that enhance the portability of Fortran programs. The IF construct or logical IF should be used in place of both of these outmoded forms. Do not use these outmoded forms, especially in new code.

Message ID: ANSI_0406


Error : Labels must be in columns 1 through 5 in fixed source form.

This is fixed source form, so the label must be in columns 1-5. An example of this error follows:

         i = 1; 100 read *,i
   

100 is in error. It should be specified as follows:

         i=1
   100   read *, i
   

Message ID: ERROR_0407


Error : This pointer is to the right of a part-ref with nonzero rank.

A part_ref with a nonzero rank cannot have another part_ref to the right with the POINTER attribute.

Message ID: ERROR_0408


Error : The conditional expression must be type integer, real, or double precision.

The conditional expression of an arithmetic IF must be type integer, real, or double precision.

Message ID: ERROR_0409


Error : The conditional expression must be scalar.

The conditional expression of an arithmetic IF must have a scalar result and must be type integer, real, or double precision.

Message ID: ERROR_0410


Error : A variable in an assignment statement must not be an assumed-size array.

The left side of an assignment statement cannot be a whole array reference of an assumed-size array.

Message ID: ERROR_0411


Error : This whole array reference of an assumed-size array is not allowed.

An assumed-size array cannot appear as a whole array reference except when it is an actual argument.

Message ID: ERROR_0412


Error : The STAT variable must not be allocated within the ALLOCATE statement in which it appears.

The STAT= variable for this ALLOCATE statement is also an allocate_object in the same ALLOCATE statement.

Message ID: ERROR_0413


Error : The conditional expression must be type logical, integer, real, or double precision.

If the two-branch IF is intended to be the indirect logical IF, the conditional expression must be type logical. If the two-branch IF is intended to be the two-branch arithmetic IF, the conditional expression must be type integer, real, or double precision.

Both forms of two-branch IF statements are outmoded features. They should no longer be used.

Message ID: ERROR_0414


Error : A blank is required before this lexical token in free source form.

The Fortran standard requires a blank to separate names, constants, or labels from adjacent keywords, names, constants or labels.

Message ID: ERROR_0415


The conditional expression must be type logical.

The syntax of an IF-THEN statement is:

    [if_construct_name:] IF (scalar_logical_expr) THEN
   

The syntax of an ELSE IF statement is:

    ELSE IF (scalar_logical_expr) THEN [if_construct_name]
   

The syntax of an IF statement is:

     IF (scalar_logical_expr) action_stmt
   

In all three cases, the conditional expression must be type logical and must be scalar.

Message ID: ERROR_0416


Error : The pointer-object in a pointer assignment statement must have the POINTER attribute.

The left side of a pointer assignment statement must have the POINTER attribute.

Message ID: ERROR_0417


Error : The variable in a pointer assignment statement must have the TARGET attribute or the POINTER attribute.

The variable that is the right side of a pointer assignment statement, must be a target, the subobject of a target, or a pointer.

Message ID: ERROR_0418


Error : The target in a pointer assignment statement must have the same type parameters as the pointer.

To be valid, both sides of a pointer assignment statement must agree in type, kind type, and rank. This also applies to a structure constructor expression that corresponds to a pointer component.

Message ID: ERROR_0419


Error : The target in a pointer assignment statement must not be an array section with a vector subscript.

The right side of a pointer assignment statement must not be an array section with a vector valued subscript. This also applies to an expression within a structure constructor whose corresponding component is a pointer.

Message ID: ERROR_0420


Error : An expression used in a pointer assignment statement must deliver a pointer result.

Only pointer valued functions can be on the right side of a pointer assignment statement.

Message ID: ERROR_0421


Error : Character is not valid in a binary constant.

In a binary constant (boz_literal_constant), the only allowed digits are 0 and 1. The compiler detected a character outside this range.

Message ID: ERROR_0422


Error : Character is not valid in a hexadecimal constant.

In a hexadecimal constant (either a BOZ or Boolean constant), the only allowed digits are 0-9, and A-F (a-f is also legal). The compiler detected a character other than 0-9 or A-F.

Message ID: ERROR_0423


Error : Attribute appears more than once in this attribute list.

On a type declaration statement, it is illegal to specify the same attribute more than once. The compiler detected something like this example:

    REAL, ALLOCATABLE, DIMENSION(::), &
          ALLOCATABLE :: A
   

ALLOCATABLE is in error. It is specified twice.

Message ID: ERROR_0424


Error : Attributes must not appear in the same attribute list.

The specified attributes are mutually exclusive. An object must not have both attributes. Following is a list of attributes, followed by conflicting attributes.

ALLOCATABLE
EXTERNAL,
INTENT,
INTRINSIC,
OPTIONAL,
PARAMETER,
POINTER
DIMENSION
EXTERNAL
ALLOCATABLE,
INTENT,
INTRINSIC,
PARAMETER,
POINTER,
SAVE,
TARGET
INTENT
ALLOCATABLE,
EXTERNAL,
INTRINSIC,
PARAMETER,
POINTER,
SAVE
INTRINSIC
ALLOCATABLE,
EXTERNAL,
INTENT,
PARAMETER,
POINTER,
PRIVATE,
PUBLIC,
SAVE,
TARGET
OPTIONAL
ALLOCATABLE,
PARAMETER,
SAVE
PARAMETER
ALLOCATABLE,
EXTERNAL,
INTENT,
INTRINSIC,
OPTIONAL,
POINTER,
TARGET
POINTER
ALLOCATABLE,
EXTERNAL,
INTENT,
INTRINSIC,
PARAMETER,
TARGET
PRIVATE
INTRINSIC,
PUBLIC
PUBLIC
INTRINSIC,
PRIVATE
SAVE
EXTERNAL,
INTENT,
INTRINSIC,
OPTIONAL
TARGET
EXTERNAL,
INTRINSIC,
PARAMETER,
POINTER

Message ID: ERROR_0425


Error : Each pointer-object in a NULLIFY statement must have the POINTER attribute.

Each object in a NULLIFY statement must be a variable name or structure component that has the POINTER attribute.

Message ID: ERROR_0426


Error : The STAT= variable must not be deallocated within the same DEALLOCATE statement.

The STAT= variable in this DEALLOCATE statement is being deallocated in the same statement.

Message ID: ERROR_0427


Error : An allocate object must be either a pointer or an allocatable array in a DEALLOCATE statement.

All arguments in an ALLOCATE statement must be previously declared to be either a pointer or an allocatable array.

Message ID: ERROR_0428


Error : Only scalar objects can be deallocated in a DEALLOCATE statement.

The deallocate_object_list of a DEALLOCATE statement contains a nonscalar object. This is because a part_ref in a derived type reference is a whole array reference or an array section.

Message ID: ERROR_0429


Error : A deallocate object in a DEALLOCATE statement cannot be an array element or section.

An object in a deallocate_object_list must be the name of a pointer or allocatable array. It can be a structure component but it cannot be an array element reference or an array section.

Message ID: ERROR_0430


Error : The target in a pointer assignment statement must have the same rank as the pointer.

To be valid, both sides of a pointer assignment statement must agree in type, kind type, and rank in order to be valid. This also applies to a structure constructor expression that corresponds to a pointer component.

Message ID: ERROR_0431


Error : Pointer assignment of a %s target or pointer to a %s pointer is not allowed.

Both sides of a pointer assignment statement must agree in type, kind type, and rank in order to be valid. This also applies to a structure constructor expression that corresponds to a pointer component.

Message ID: ERROR_0432


Internal : Attempting to split an I/O statement without creating a begin and end I/O statement.

The compiler detected that the flag io_stmt_must_be_split was false when it was inside routines that split I/O statements into multiple statements. This implies an internal error condition.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0433


Error : Illegal association of a scalar actual argument to an assumed-shape dummy argument "%s".

An assumed-shape array dummy argument cannot have a scalar actual argument associated with it.

Message ID: ERROR_0434


Error : Illegal association of a scalar actual argument with array dummy argument.

Unless a scalar actual argument is an array element reference, it cannot be passed to an array dummy argument.

Message ID: ERROR_0435


Error : Illegal association of an array-valued actual argument with a scalar dummy argument.

A scalar dummy argument requires a scalar actual argument.

Message ID: ERROR_0436


Error : This has the OPTIONAL attribute, therefore it must not be used in a bounds specification expression.

This object must not be used in a bounds specification expression because it has the OPTIONAL attribute.

Message ID: ERROR_0437


Error : Namelist group has the PUBLIC attribute so namelist group object cannot have the PRIVATE attribute.

If a namelist group name has the PUBLIC attribute, no item in the namelist group object list can have the PRIVATE attribute. Also, no group object list item of derived type can have a component with the PRIVATE attribute.

Message ID: ERROR_0438


Error : The I/O control list for this statement must have a UNIT specifier.

A UNIT specifier, for either an external or internal file, must be present for this I/O statement.

Message ID: ERROR_0439


Error : The I/O control list for an INQUIRE statement must have either a UNIT or FILE specifier.

The INQUIRE statement must have either a UNIT or FILE specifier. It cannot have both.

Message ID: ERROR_0440


Error : An expression of this type is not valid as an argument for this specifier.

The I/O control list specifier is not valid.

Message ID: ERROR_0441


Error : The INQUIRE statement must not have both the UNIT and FILE specifiers.

The INQUIRE statement must have either a UNIT or FILE specifier. It cannot have both.

Message ID: ERROR_0442


Error : The FMT and NML specifiers must not be specified in the same I/O control list.

An I/O control list was encountered for a WRITE or a READ statement that had both the FMT and the NML specifiers. The statement can either be a formatted or a namelist I/O statement; it cannot be both.

Message ID: ERROR_0443


Error : A namelist group name must not be present if an I/O list is present.

Namelist I/O cannot have an input or output list.

Message ID: ERROR_0444


Error : This specifier cannot be used in a WRITE statement control list.

The END=, EOR=, and SIZE= specifiers cannot be used with a WRITE statement.

Message ID: ERROR_0445


Error : The NML= control list specifier requires a namelist group name as an argument.

The NML= specifier is in a READ, WRITE or PRINT statement that has an argument that is not a namelist group name.

Message ID: ERROR_0446


Error : The FMT= control list item must be a label, a character expression or an ASSIGN integer variable.

A format I/O control list specifier must either be a label or an integer variable. The I/O control list specifier must have previously been defined in an ASSIGN statement, or it must be a character variable or a character expression.

Message ID: ERROR_0447


Error : This I/O control list item must be a label or an ASSIGN variable.

I/O specifiers that specify branch targets, such as EOR=, ERR= or END=, must have either a label as an argument or an integer variable that was defined in an ASSIGN statement.

Message ID: ERROR_0448


Error : An expression of this rank is not valid for this control list specifier.

An item in the I/O control list has a rank greater than zero.

Message ID: ERROR_0449


Internal : Procedure get_type_desc has been called with something that does not need a type descriptor.

During the PDGCS interface, get_type_desc was called to find a type descriptor for something that does not need a type.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0450


Error : This reference to function without an actual argument list is illegal.

This call to a function has no parentheses following it. If the actual argument list is empty, the function name must be followed by parentheses when it is being called.

Message ID: ERROR_0451


Error : This reference to the subroutine is not in a CALL statement.

A reference to a subroutine is in an expression. A subroutine subprogram must only be called with a CALL statement.

Message ID: ERROR_0452


Error : This reference to the main program is illegal.

A reference to a main program name is in an expression. A main program name must not be referenced.

Message ID: ERROR_0453


Error : This reference to the block data is illegal.

A reference to a block data name is in an expression. A block data subprogram name must not be referenced.

Message ID: ERROR_0454


Error : This reference to the module is illegal.

A reference to a module name is in an expression. A module name must not be specified in an expression.

Message ID: ERROR_0455


Error : The main program is an illegal reference in a CALL statement.

A main program name must not be specified in a CALL statement.

Message ID: ERROR_0456


Error : Blockdata is an illegal reference in a CALL statement.

A block data subprogram name must not be specified in a CALL statement.

Message ID: ERROR_0457


Error : Module is an illegal reference in a CALL statement.

A module name must not be specified in a CALL statement.

Message ID: ERROR_0458


Error : A variable of this type is not valid as an argument for this specifier.

The type of the variable used as an I/O control list specifier is not valid.

Message ID: ERROR_0459


Error : This control list specifier must have a scalar variable of the required type as an argument for this statement.

Some I/O control list specifiers require a variable name as an argument. It must be of the required type and must have default kind type.

Message ID: ERROR_0460


Error : This I/O control list specifier requires an argument with default kind parameter.

The control list item does not have a default kind type.

Message ID: ERROR_0461


Error : If the FMT= specifier is an integer variable, it must be of default kind type.

An integer variable used as a format specifier in a READ, WRITE, or PRINT statement must be of default integer type.

Message ID: ERROR_0462


Error : If REC= is present, an END= specifier must not appear in this statement.

An END= specifier in a READ or WRITE statement also has a REC= specifier.

Message ID: ERROR_0463


Error : If REC= is present, the format must not be list-directed in this statement.

An asterisk (*) is the format specifier in a READ or WRITE statement that also has a REC= specifier.

Message ID: ERROR_0464


If an EOR= specifier is present, an ADVANCE= specifier must also appear in a %s statement.

An EOR= specifier is in a READ or WRITE statement that does not have an ADVANCE= specifier.

Message ID: ERROR_0465


Error : If REC= is present, a namelist group name must not appear in this statement.

A namelist group name is in a READ or WRITE statement that has a REC= specifier.

Message ID: ERROR_0466


Error : A variable used as an internal file must not be an array section with a vector subscript.

A character variable used as the UNIT specifier in a READ or WRITE statement has a vector subscript.

Message ID: ERROR_0467


Error : If an ADVANCE= specifier is present, the FMT= specifier must be present.

An ADVANCE= specifier can be present only in a formatted sequential I/O statement with explicit format specification and no internal file unit specifier.

Message ID: ERROR_0468


Error : If an ADVANCE= specifier is present, the FMT= specifier must not be list-directed.

An ADVANCE= specifier can be present only in a formatted sequential I/O statement with explicit format specification and no internal file unit specifier.

Message ID: ERROR_0469


Error : If the ADVANCE= specifier is present, the UNIT= specifier must not specify an internal file.

An ADVANCE= specifier can be present only in a formatted sequential I/O statement with explicit format specification and no internal file unit specifier.

Message ID: ERROR_0470


Error : If the UNIT= specifier refers to an internal file, the REC= specifier must not be present.

If the unit specifier specifies an internal file, the io_control_spec_list must not contain a REC= specifier or a namelist group name.

Message ID: ERROR_0471


Error : If the UNIT= specifier refers to an internal file, a namelist group name must not be present.

If the unit specifier specifies an internal file, the io_control_spec_list must not contain a REC= specifier or a namelist group name.

Message ID: ERROR_0472


Error : If the ADVANCE= specifier is present, the statement must be a sequential access I/O statement.

An ADVANCE= specifier can be present only in a formatted sequential I/O statement with explicit format specification and no internal file unit specifier. The REC= specifier makes this a direct access I/O statement.

Message ID: ERROR_0473


Error : The DO variable of an implied-DO loop must be integer, default real, or double precision real.

The DO variable must be integer, real, or double precision real.

Message ID: ERROR_0474


Error : Specific interface must be a subroutine, if it is inside a defined assignment interface block.

A specific interface is within a defined assignment interface block, but is not a subroutine. All specific interfaces in a defined assignment interface block must be subroutines.

Message ID: ERROR_0475


Error : This implied-DO control expression must be scalar.

The numeric expressions controlling an implied-DO loop in an I/O statement I/O list must be scalar. These expressions are the start value of the implied-DO variable, the finish value, and the optional increment value.

Message ID: ERROR_0476


Error : This implied-DO control expression must be an integer, default real, or double precision real expression.

Each implied-DO control expression must be a scalar numeric expression of integer, default real, or double precision real type.

Message ID: ERROR_0477


Error : An expression cannot be used as an input item in this statement.

An I/O input item is an expression. Input items must be variables.

Message ID: ERROR_0478


Error : A constant cannot be used as an input item in this statement.

An I/O input item is a constant. Input items must be variables.

Message ID: ERROR_0479


Warning : This type will be mapped to DOUBLE PRECISION.

Type DOUBLE PRECISION*16 has been mapped to DOUBLE PRECISION, because the compiler does not currently support DOUBLE PRECISION*16. The compiler will fully support DOUBLE PRECISION*16 in subsequent releases.

Message ID: WARNING_0480


Error : This implied-DO control variable is not valid.

An expression or constant appears where an implied-DO variable is expected.

Message ID: ERROR_0481


Error : This implied-DO variable is not scalar.

An implied-DO variable has a rank greater than zero.

Message ID: ERROR_0482


Error : The IOLENGTH= specifier in an INQUIRE statement must be a scalar default integer variable.

In an INQUIRE statement, the IOLENGTH= specifier requires that a scalar integer variable of default kind type be specified.

Message ID: ERROR_0483


Error : This has an ultimate component that has the POINTER attribute, therefore it must not be in a namelist group.

A namelist group object cannot have a derived type with a pointer component or an ultimate pointer component. Items of derived type that have pointer components are not allowed in namelist groups.

Message ID: ERROR_0484


Ansi : A character constant file name used as a UNIT= specifier is an extension of the Fortran standard.

A character constant is specified where a unit number is expected. The constant is interpreted as the name of a file and is an extension to the Fortran standard.

Message ID: ANSI_0485


Error : This has been use associated from this module and at least one more module. It must not be referenced.

If an entity is use associated from more than one module, it cannot be referenced. For example:

     MODULE one
       INTEGER two_uses
     END MODULE

     MODULE two
       INTEGER two_uses
     END MODULE

     PROGRAM show
       USE one
       USE two       ! It is legal to use
                     ! associate TWO_USES twice.

       J = two_uses  ! This is illegal, because
                     ! the compiler cannot determine
                     ! which TWO_USES is correct.
   

Message ID: ERROR_0486


Error : The specific interfaces make the generic or defined interface ambiguous.

Two specific interfaces in a generic or defined interface are ambiguous. Within a scoping unit, two procedures in the same generic or defined interface are differentiated by their nonoptional dummy arguments. One way to differentiate the specific interfaces is by the number of dummy arguments. If the specific interfaces have the same number of dummy arguments, the dummy arguments must differ in type, kind type or rank.

Message ID: ERROR_0487


Error : All bounds and kind selector expressions must be type integer, but this one is not.

The compiler detected a noninteger expression in a bounds expression or in a kind selector expression. Bounds expressions are used to declare array dimension size and character length and must always be type integer. Kind selector expressions must always be integer constants and are used to declare the kind of a type.

Message ID: ERROR_0488


Error : The specific interface must have exactly two dummy arguments when inside a defined assignment interface block.

A defined assignment interface block must have only specific interfaces within it that are subroutines with exactly two required dummy arguments.

Message ID: ERROR_0489


Dummy argument \"%s\" must not have the OPTIONAL attribute within a defined operator or assignment interface block.

A dummy argument has the OPTIONAL attribute, but the specific interface it is declared in is a defined operator or defined assignment interface block.

Message ID: ERROR_0490


Error : Dummy argument must be properly specified as to INTENT within a defined operator or defined assignment interface block.

Within a defined operator or defined assignment interface block the intents of dummy arguments must be specified with certain values. For defined assignment, the first dummy argument must have INTENT(OUT) or INTENT(INOUT). The second dummy argument must have INTENT(IN). For defined operators, the dummy arguments must have INTENT(IN).

Message ID: ERROR_0491


Error : Specific interface must be a function within a defined operator interface block.

All specific interfaces within a defined operator interface block must be functions with one or two dummy arguments.

Message ID: ERROR_0492


Error : The function result cannot be assumed-length character because it is in a defined operator interface block.

A function specific interface within a defined operator interface block cannot have an assumed-length character result.

Message ID: ERROR_0493


Error : The specific interface must have exactly one dummy argument when inside a defined unary operator interface block.

All specific interfaces within this defined operator interface block are interpreted as unary operations and therefore must have only one argument.

Message ID: ERROR_0494


Error : This specific interface conflicts with the intrinsic use of the operator.

A specific interface in a defined operator or assignment interface block has dummy arguments with types, kind types, and rank that are valid as an intrinsic use of the operator. This conflict creates an ambiguity and is not allowed.

Message ID: ERROR_0495


Error : The specific interface must have exactly two dummy arguments when inside a defined binary operator interface block.

In a defined operator interface block, the number of dummy arguments to a specific interface must match the intrinsic use of the operator. A strictly binary operator, such as the asterisk, requires two dummy arguments.

Message ID: ERROR_0496


Error : The specific interface must have one or two dummy arguments when inside a defined operator interface block.

In a defined operator interface block, the number of dummy arguments to a specific interface must match the intrinsic use of the operator. Operators like + or - can be used as both unary or binary operators and therefore the specific interfaces may have either one or two dummy arguments.

Message ID: ERROR_0497


Error : Dummy argument is a dummy procedure. This is not allowed within a defined assignment or defined operator interface.

Specific interfaces within a defined assignment or defined operator interface block must have dummy arguments that are data objects. Dummy procedures are not allowed.

Message ID: ERROR_0498


Error : A defined operator must not be the same as a logical literal constant.

A logical literal constant, .TRUE. or .FALSE., is specified where an operator is expected.

Message ID: ERROR_0499


Error : Array is assumed-size, therefore it must be a dummy argument.

An array that is declared with the assumed-size specifier, must be a dummy argument. If it is type character it can also be a Cray character pointee. Cray pointers are an extension to the Fortran standard.

Message ID: ERROR_0500


Error : This is an assumed-size array of type character. It must be a dummy argument or a pointee of a Cray character pointer.

A character array that is declared with the assumed-length specifier must be a dummy argument or the pointee of a Cray character pointer. Cray pointers are an extension to the Fortran standard.

Message ID: ERROR_0501


Error : This actual argument is not a program unit. Dummy argument is a dummy procedure.

The subprogram being called has an explicit interface. This explicit interface allows the actual argument to be compared with the dummy argument. This check has revealed a mismatch between the actual argument and the dummy argument. The dummy argument is a dummy procedure and the actual argument is not a program unit.

Message ID: ERROR_0502


Error : Argument mismatch: Actual argument does not match dummy argument.

The subprogram being called has an explicit interface. This explicit interface allows the actual argument to be compared with the dummy argument. This check has revealed a mismatch between the actual argument and the dummy argument.

Message ID: ERROR_0503


Error : Actual argument is a label but dummy argument is not an alternate return specifier.

Labels must only be passed to dummy arguments that are "*" alternate return specifiers.

Message ID: ERROR_0504


Error : Continuation of character context in free source form requires an "&" as the first nonblank character of the next line.

A character context continuation in free source form must have an & as the first nonblank character in the next line.

Message ID: ERROR_0505


Error : Function is recursive, therefore it must not be typed as assumed-length character.

The Fortran standard prohibits the typing of a recursive function as assumed-length character.

A function name must not be declared with an asterisk character length if the function is an internal or module function, array-valued, pointer-valued, or is recursive.

Message ID: ERROR_0506


Error : Function is array-valued and/or pointer-valued, therefore it must not be typed as assumed-length character.

The Fortran standard prohibits typing a function whose result is an array or a pointer as assumed-length character.

A function name must not be declared with an asterisk character length if the function is an internal or module function, array-valued, pointer-valued, or is recursive.

Message ID: ERROR_0507


Error : The parent-string of a substring reference must be of type character.

A substring can only be formed from a character variable or a character constant.

Message ID: ERROR_0508


Error : This must not be used in a bounds specification expression.

The compiler has detected a conflict between a declaration and a use of this object. The object must not be used in a bounds specification expression because it has been declared to be one of the following:

           Cray pointer
           Cray pointee
           function result
           module procedure
           internal procedure
           derived-type
           generic interface
           namelist group
           statement function
           construct
           module
           block data
           program
           subroutine
   

Message ID: ERROR_0509


Ansi : The use of this as a logical literal constant is an extension to the Fortran standard.

These are extensions to the Fortran standard.

     .F.    (for .FALSE.)
     .T.    (for .TRUE.)
   

If either of these extension forms are declared as defined operators, then the extension is not allowed.

Message ID: ANSI_0510


Error : This is scalar, but it is being used as an array or function reference.

A name is followed by a parenthesized list, but it is not an array or a function name.

Message ID: ERROR_0511


Error : This is the name of a namelist group. This is an illegal usage.

A namelist group name must only be used as a control list item for a READ, WRITE, or PRINT statement to designate namelist I/O.

Message ID: ERROR_0512


Error : Unexpected syntax: A comma, identifier, WHILE, or EOS was expected but found something else.

The format of a DO statement is:

      [do_construct_name:] DO [label] [loop_control]
   

The format of loop_control is:

        [,] do_variable = scalar_numeric_expr,
   	scalar_numeric_expr [, scalar_numeric_expr]

                        or

        [,] WHILE (scalar_logical_expr)
   

The compiler found the keyword DO followed by a label. It was expecting the label to be followed by a comma, an identifier, the keyword WHILE, or the end of the statement but it found something else.

Message ID: ERROR_0513


Internal : malloc_check has found a problem with the malloc'd tables. See previous message.

In debug mode, malloc_check is called before every malloc, realloc and free. This time malloc_check found a problem. malloc_check will print a message, describing the problem. The message will be output before this internal message.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0514


Error : Unexpected syntax: A label, comma, identifier, WHILE, or EOS was expected but found something else.

The format of a DO statement is:

      [do_construct_name:] DO [label] [loop_control]
   

The format of loop_control is:

        [,] do_variable = scalar_numeric_expr,
           scalar_numeric_expr [, scalar_numeric_expr]

                        or

        [,] WHILE (scalar_logical_expr)
   

The compiler found the keyword DO and was expecting it to be followed by a statement label, a comma, an identifier, the keyword WHILE, or the end of the statement.

Message ID: ERROR_0515


Internal : For "%s", LN_NAME_IDX (%d) does not match AT_NAME_IDX(%d).

A symbol table entry needs to share the same name pool entry for the same name. The local name table does not use the same name pool entry as the attribute table. This can cause bad index problems in module and interface compression.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0516


Error : This DO variable is already being used as the DO variable of an outer loop.

An active DO variable can only have its value altered by its DO statement. Its value cannot be altered by any statement contained in the loop. This means that if a variable is being used as a DO variable, it cannot be used as the DO variable of an inner loop.

Message ID: ERROR_0517


Error : This is used as a subroutine, therefore it must not be used in a bounds specification expression.

The compiler detected a conflict between uses of this object. The object is used as a subroutine, which prohibits it from being used in an expression.

Message ID: ERROR_0518


Error : Dummy argument has the INTENT(OUT) attribute, therefore it must not be used in a bounds specification expression.

A dummy argument with INTENT(OUT) cannot be used in a bounds specification expression.

Message ID: ERROR_0519


Error : Using external function "%s" in a bounds specification expression is nonstandard.

It is an extension to the Fortran standard to reference an external function in an array dimension bound declarator or a character length declarator.

Message ID: ERROR_0520


Error : Local variable must be a dummy argument or in common to be used in a bounds specification expression.

Each primary of a specification expression must be a constant, a dummy argument, a common block member, use associated or host associated. The compiler detected a variable that is not one of these things.

Message ID: ERROR_0521


Ansi : It is an extension to the Fortran standard to allow character and noncharacter to be equivalenced to each other.

If one object in an equivalence list is character or character sequence type, then all of the objects in the list must be of character or character sequence type. The compiler has relaxed this restriction. Character and noncharacter can be equivalenced to each other. However, if a noncharacter item does not align on a word boundary because of such an equivalence, a fatal error is issued.

Message ID: ANSI_0522


Error : The type of equivalence object "%s" is not identical to the type of the other equivalence objects.

If an equivalence_object is of a derived type that is not a numeric sequence or character sequence type, all objects in the equivalence group must be of these types. Or, if an equivalence_object is of an intrinsic type other than default integer, default real, double precision real, default complex, default logical, or character, all objects in the equivalence set must be of the same type with the same kind type parameter value.

Message ID: ERROR_0523


Error : More than 99 continuation lines in fixed source form is not allowed.

The continuation line limits for the compiler are 99 for both fixed source form and free source form.

Message ID: ERROR_0524


Error : More than 99 continuation lines in free source form is not allowed.

The continuation line limits for the compiler are 99 for both fixed source form and free source form.

Message ID: ERROR_0525


Error : Common block has been extended past its start by equivalencing.

A common block was extended past its starting address by equivalencing a noncommon block variable to this common block. Extending a common block in this direction is not allowed.

Message ID: ERROR_0526


Error : Object does not start on a word boundary due to the alignment of a character item.

A noncharacter object was equivalenced to a character object which caused the noncharacter object to not align on a word boundary.

Message ID: ERROR_0527


Error : Object is equivalenced in two different places.

A variable was equivalenced so two different locations within the same variable are overlayed. For example:

     EQUIVALENCE (A(1), A(3))  ! This is illegal
   

Message ID: ERROR_0528


Error : Object has been previously used in an executable statement, therefore it must not be a dummy argument.

Dummy arguments in an ENTRY statement must not be referenced in an executable statement before they are declared. They can be used in bounds specification expressions.

Message ID: ERROR_0529


Error : An implied-DO variable must not be a variable subobject.

An implied-DO variable must be a named scalar variable of type integer, default real or double precision real. The name cannot be qualified by either component references or subscript lists.

Message ID: ERROR_0530


Error : Compiler directive must appear before the first executable statement.

The following compiler directives must be specified in the declaration part of the program unit.

      AUXILIARY
      NAME
      NOSIDE EFFECTS
      SYMMETRIC
      TASK COMMON
      VFUNCTION
   

Message ID: ERROR_0531


Error : An input item must not be the implied-DO variable of any implied-DO loop that contains the input item.

An I/O input item was encountered within an implied-DO loop that was the DO variable for that loop.

Message ID: ERROR_0532


Error : Reuse of this as an implied-DO variable in a nested implied-DO is not allowed.

The name of an implied-DO variable in a DATA statement appears more than once in the implied-DO list or in an array constructor. Examples of statements that cause this message to be issued:

       DATA ((A(I,J), I = 1,5), I = 1,5)

       IARRY = (/ ((I + I, I = 1, 3), I = 1, 3) /)
   

Message ID: ERROR_0533


Error : This is in blank common, therefore it must not be given the AUXILIARY attribute via a compiler directive statement.

Arrays or variables that are in blank common are not allowed to be in auxiliary storage.

Message ID: ERROR_0534


Error : This is typed as character, therefore it must not be given the AUXILIARY attribute via a compiler directive statement.

Variables and arrays that are in auxiliary storage must not be typed as character.

Message ID: ERROR_0535


Error : This is of a type which has a character or pointer component, therefore it must not be in auxiliary storage.

If an item is in auxiliary storage and is typed as a derived type, no components of that derived type can be character or pointers.

Message ID: ERROR_0536


Error : This is in a TASK COMMON block. It must not be given the AUXILIARY attribute via a compiler directive statement.

A variable or an array in a TASK COMMON block must not be given the AUXILIARY attribute.

Message ID: ERROR_0537


Error : A negative base of type real cannot be raised to a real power.

The following is an example of an exponentiation operation that is mathematically undefined.

     (-1.0)**3.5
   

Such undefined expressions are not allowed.

Message ID: ERROR_0538


Error : A continuation line is expected but this is not a continuation line.

In free source form, if an & is encountered at the end of a line, it signals that the line will continue onto the next noncomment line. There is no noncomment line following this line.

Message ID: ERROR_0539


Error : The value specified for DIM is invalid.

The value specified for DIM is larger than the rank of ARRAY or less than 1.

Message ID: ERROR_0540


Error : Implementation is deferred for this Fortran statement, type, expression or constructor.

Implementation for the following items is deferred: MODULES USE statement CONTAINS statement internal procedures module procedures constructors bounds declarations that use intrinsics array parameters REAL*16 REAL (KIND=16) COMPLEX*32 (KIND=16)

Message ID: ERROR_0541


Error : The repeat factor must not be signed.

The DATA statement repeat factor (data_stmt_repeat) must be an unsigned scalar integer constant (scalar-int-constant). The integer constant can be a literal constant or a named constant; it cannot be signed.

Message ID: ERROR_0542


Warning : Kind type parameter value will be mapped to another kind.

The specified kind type has been mapped to the new kind type, because the compiler does not currently support the specified kind type.

Message ID: WARNING_0543


Error : The termination statement of a nonblock DO construct must be an executable statement.

The termination statement of a nonblock DO construct must be an executable statement such as a CONTINUE or an assignment statement. It must not be a nonexecutable statement such as a DATA or a FORMAT statement.

Message ID: ERROR_0544


Internal : Two operator nodes were marked IR_ARRAY_NODE in a reference tree.

Internal compiler error from make_base_subtree.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0545


Internal : Nonarray used with subscript_opr in expr_semantics.

Internal compiler error from expr_semantics.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0546


Ansi : This is a named constant and is also a common block name. This is an extension to the Fortran standard.

The Fortran standard prohibits using the same name for a named constant and a common block name.

Message ID: ANSI_0547


Error : This has been used as a variable, therefore it must not be used as a derived-type name.

The compiler detected a conflict in uses of this object. The object is used as a variable, which prohibits it from being used as a derived-type name.

Message ID: ERROR_0548


Error : This statement is not allowed within a parallel region.

The f90 tasking implementation does not allow branches in or out of a parallel region. A parallel region is either a DOALL loop or a region of code delimited by a PARALLEL/ENDPARALLEL pair. A return statement is not allowed within this kind of region as it is an improper exit out of the region. Also, an ENTRY statement is not allowed since it is an improper entry into the region.

Message ID: ERROR_0549


Error : This has an attribute which means it must not be declared with a conflicting attribute.

The compiler detected a conflict in declarations for this object. This object must not have both of these attributes.

Message ID: ERROR_0550


Error : This must not be declared with that attribute.

The compiler detected a conflict in declarations for this object. This object must not be given the specified attribute.

Message ID: ERROR_0551


Error : This has an attribute which means it must not be declared in that way.

The compiler detected a conflict in declarations for this object. Because the object has the given attribute, it must not be declared to be the new item.

Message ID: ERROR_0552


Error : This must not be declared in that way.

The compiler detected a conflict in declarations for this object. This object is already declared as the given item, therefore it must not be declared to be the new item.

Message ID: ERROR_0553


Error : This must not be given that attribute again.

An entity must not be explicitly given any attribute more than once in a scoping unit.

Message ID: ERROR_0554


Internal : Cannot write to the temporary message file.

The compiler can not write any (more) records to the temporary message file.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0555


Log_Error : Cannot open the temporary message file.

The compiler cannot open the temporary message file. This file is required to buffer messages until the end of the compilation, at which time they are output in source line order. Check the file permissions for the working directory.

Message ID: LOG_ERROR_0556


Error : This has been used as a variable, therefore it must not be declared or used as a procedure.

Once an object is referenced or defined as a variable, it must not be redeclared as a procedure or referenced as a procedure.

Message ID: ERROR_0557


Error : This has been used as a variable, therefore it must not be declared in that way.

The object being declared is used as a variable, which prohibits it from being declared as any of the following items:

   	Cray pointer
   	Cray pointee
   	function result
   	derived type
   	generic interface
   	namelist group
   	statement function
   	construct name
   	function
   	subroutine
   

Message ID: ERROR_0558


Error : This has been used as a variable, therefore it must not be declared with that attribute.

The object being declared is used as a variable, which prohibits it from being given any of the following attributes:

   	DIMENSION
   	ALLOCATABLE
   	PARAMETER
   	INTRINSIC
   	VFUNCTION
   	NOSIDE EFFECTS
   

Message ID: ERROR_0559


Error : This is typed as variable length character, therefore it must not be declared with that attribute.

The compiler detected a conflict in declarations for this object. The object being declared is typed as a variable length character entity, which prohibits it from being given any of the following attributes:

   	AUXILIARY
   	PARAMETER
   	SAVE
   	EXTERNAL
   	INTRINSIC
   	VFUNCTION
   	NOSIDE EFFECTS
   

An object typed as variable length character must not be given an explicit type more than once. It must not be equivalenced or data initialized.

Message ID: ERROR_0560


Error : This is typed as variable length character, therefore it must not be declared in that way.

The compiler detected a conflict in declarations for this object. The object being declared is typed as a variable length character entity, which prohibits it from being declared as any of the following items:

   	Cray pointee
   	dummy argument
   	derived type
   	generic interface
   	namelist group
   	statement function
   	construct name
   	function
   	subroutine
   

Message ID: ERROR_0561


Error : This is an explicit-shape array with nonconstant bounds, therefore it must not be declared with that attribute.

The compiler detected a conflict in declarations for this object. The object being declared is an explicit-shape array with nonconstant bounds, which prohibits it from being given any of the following attributes:

   	ALLOCATABLE
   	DIMENSION
   	PARAMETER
   	SAVE
   	POINTER
   	EXTERNAL
   	INTRINSIC
   	VFUNCTION
   	NOSIDE EFFECTS
   

It must not be equivalenced or data initialized.

Message ID: ERROR_0562


Error : This is an explicit-shape array with nonconstant bounds, therefore it must not be declared in that way.

The compiler detected a conflict in declarations for this object. The object being declared is an explicit-shape array with nonconstant bounds, which prohibits it from being declared as any of the following items:

   	Cray pointer
   	Cray pointee
   	derived type
   	generic interface
   	namelist group
   	statement function
   	construct name
   	subroutine
   	internal procedure
   	module procedure
   

Message ID: ERROR_0563


Error : This is in a common block, therefore it must not be declared with that attribute.

The compiler detected a conflict in declarations for this object. The object being declared is in a common block, which prohibits it from being given any of the following attributes:

   	ALLOCATABLE
   	PARAMETER
   	INTENT
   	OPTIONAL
   	SAVE
   	EXTERNAL
   	INTRINSIC
   	VFUNCTION
   	NOSIDE EFFECTS
   

It must not be typed as an assumed-length character or declared as an assumed-size or assumed-shape array.

Message ID: ERROR_0564


Error : This is in a common block, therefore it must not be declared in that way.

The compiler detected a conflict in declarations for this object. The object being declared is in a common block, which prohibits it from being declared as any of the following items:

   	Cray pointee
   	function result
   	dummy argument
   	derived type
   	generic interface
   	namelist group
   	statement function
   	construct name
   	function
   	subroutine
   

Message ID: ERROR_0565


Error : This is defined in an explicit interface, therefore it must not be declared with that attribute.

If an explicit interface is declared for a procedure, all information describing the procedure must be specified inside the explicit interface, with the exception of the OPTIONAL, PRIVATE and PUBLIC attributes. The procedure may be specified as a dummy argument.

Message ID: ERROR_0566


Error : This is defined in an explicit interface, therefore it must not be declared in that way.

If an explicit interface is declared for a procedure, all information describing the procedure must be specified inside the explicit interface, with the exception of the OPTIONAL, PRIVATE and PUBLIC attributes. The procedure may be specified as a dummy argument.

Message ID: ERROR_0567


Error : This is not a valid reference in a subroutine call.

Only a subroutine can be referenced in a CALL statement.

Message ID: ERROR_0568


Error : Label variable must be a variable, not a named constant.

An ASSIGN statement or an assigned GO TO statement has a named constant where the label variable (scalar_int_variable) should appear.

The syntax of the ASSIGN statement is:

     ASSIGN label TO scalar_int_variable
   

The syntax of the assigned GO TO statement is:

     GO TO scalar_int_variable [ [,] (label_list) ]
   

The scalar_int_variable must be an unqualified name of a variable; that is, it cannot be a structure component, array element, or substring designator. The label must be of type default integer, and it must be scalar.

Message ID: ERROR_0569


Error : This has the ALLOCATABLE attribute, therefore it must be declared to be a deferred-shape array.

If an object is declared to be an allocatable object, it must also be declared to be a deferred-shape array. The following are two correct ways of declaring A to be allocatable.

       ALLOCATABLE :: A(:)

       REAL, ALLOCATABLE :: A
       DIMENSION A(:)
   

Message ID: ERROR_0570


Error : Function result is a deferred-shape array, therefore it must have the POINTER attribute.

A function result that is a deferred-shape array must have the POINTER attribute. Likewise, a function name that has the POINTER attribute and is an array must be declared with a deferred_shape_spec_list.

Example:

       FUNCTION FCN()
       REAL, DIMENSION(:) :: FCN
       POINTER :: FCN
   

Message ID: ERROR_0571


Error : This has been used as a function, therefore it must not be declared with that attribute.

The object being declared has already been used as a function, so no further declarations may be made for this object.

Message ID: ERROR_0572


Error : THis has been used as a function, therefore it must not be declared in that way.

The object being declared has already been used as a function, so no further declarations may be made for this object.

Message ID: ERROR_0573


Error : This has been used as a subroutine, therefore it must not be declared with that attribute.

The object being declared has already been used as a subroutine, so no further declarations may be made for this object.

Message ID: ERROR_0574


Error : This has been used as a subroutine, therefore it must not be declared in that way.

The object being declared has already been used as a subroutine, so no further declarations may be made for this object.

Message ID: ERROR_0575


Error : This has that attribute, therefore it must not be typed as variable length character.

The object must not be typed as variable length character if the object has been typed in a previous type statement, initialized in a DATA statement or has the following attributes: PARAMETER, SAVE, POINTER, VFUNCTION, AUXILIARY, NOSIDE EFFECTS, EXTERNAL or INTRINSIC.

Message ID: ERROR_0576


Error : This has already been declared, herefore it must not now be typed as variable length character.

The compiler detected a conflict in declarations for this object. The object must not be typed as variable length character because it has been declared to be one of the following:

           Cray pointer
           Cray pointee
           module procedure
           derived type
           generic interface
           namelist group
           statement function
           construct
           module
           block data
           program
           subroutine
   

Message ID: ERROR_0577


Error : This is in a common block, therefore it must not be typed as variable length character.

The character length of an object in a common block must be known at compile time.

Message ID: ERROR_0578


Error : This is defined in an explicit interface. All information about this procedure must be specified in the interface.

If an explicit interface is declared for a procedure, all information describing the procedure must be specified inside the explicit interface, with the exception of the OPTIONAL, PRIVATE and PUBLIC attributes. The procedure may be specified as a dummy argument.

Message ID: ERROR_0579


Error : The data type of this object is incompatible with the data type in this PARAMETER assignment.

The named constant becomes defined with the value determined from the initialization expression. This must meet the rules of intrinsic assignment as defined in the Fortran standard. The type of the specified named constant and the type of the value do not meet the rules of intrinsic assignment.

Message ID: ERROR_0580


Error : This is a subroutine, therefore it must not be given an explicit type.

This object is a subroutine, so it may not be given an explicit type.

Message ID: ERROR_0581


Error : This has that attribute, therefore it must not be declared as an explicit-shape array with nonconstant bounds.

The compiler detected a conflict in declarations for this object. The object must not be declared as an explicit-shape array with nonconstant bounds because it is equivalenced, data initialized, typed as an assumed-length character and/or has one or more of the following attributes:

           ALLOCATABLE
           DIMENSION
           PARAMETER
           SAVE
           PRIVATE
           PUBLIC
           POINTER
           EXTERNAL
           INTRINSIC
           VFUNCTION
           NOSIDE EFFECTS
   

Message ID: ERROR_0582


Error : This has already been declared, therefore it must not now be declared as an explicit-shape array with nonconstant bounds.

The compiler detected a conflict in declarations for this object. The object must not be declared as an explicit-shape array with nonconstant bounds because it has been declared to be one of the following:

           Cray pointer
           module procedure
           derived type
           generic interface
           namelist group
           statement function
           construct
           module
           block data
           program
   

Message ID: ERROR_0583


Log_Error : Machine characteristics system call failed.

The call to the machine characteristics system call failed, because it was given an invalid machine name.

Message ID: LOG_ERROR_0584


Error : This is in a common block, therefore it must not be declared as an explicit-shape array with nonconstant bounds.

The length of an array in a common block must be known at compile time.

Message ID: ERROR_0585


Warning : The -dp option does not affect REAL(KIND=16) or COMPLEX(KIND=16). These will remain double precision.

REAL(KIND=16) and COMPLEX(KIND=16) are not affected by the -dp command-line option.

Message ID: WARNING_0586


Error : The initialization expression must be a constant to be used with PARAMETER assignment for this object.

The Fortran standard requires the initialization expression to be a constant, if the type declaration statement has the PARAMETER attribute, or if the initialization expression is specified in a PARAMETER statement.

Message ID: ERROR_0587


Error : This is a subroutine, therefore it must not be declared with the DIMENSION attribute.

A subroutine may not have the DIMENSION attribute.

Message ID: ERROR_0588


Error : This has an attribute which means it must not now be in a common block.

The compiler detected a conflict in declarations for this object. The object must not be in a common block because:


-- It is typed as CHARACTER*(*),
-- It is an assumed-size or assumed-shape array, or
-- It has one or more of the following attributes:

           ALLOCATABLE
           PARAMETER
           INTENT
           OPTIONAL
           SAVE
           EXTERNAL
           INTRINSIC
           VFUNCTION
           NOSIDE EFFECTS
   

Message ID: ERROR_0589


Error : This has already been declared, therefore it must not now be in a common block.

The compiler detected a conflict in declarations for this object. The object must not be in a common block because it has been declared to be one of the following:

           Cray pointee
           function result
           dummy argument
           derived type
           generic interface
           namelist group
           statement function
           construct name
           procedure
           module
           block data
           program
   

Message ID: ERROR_0590


Error : This is typed as variable length character, therefore it must not be in a common block.

The length of a character variable in a common block must be known at compile time.

Message ID: ERROR_0591


Error : This is an explicit-shape array with nonconstant bounds, therefore it must not be in a common block.

The length of an array in a common block must be known at compile time.

Message ID: ERROR_0592


Error : This already appears in a common block. It must only be specified once in a common block.

A variable is only allowed to appear once in a common block and a variable must only appear in one common block. The compiler detected the same variable specified more than once in a common block or the compiler detected the same variable in two different common blocks.

Message ID: ERROR_0593


Error : This is a procedure name, therefore it must not be in a common block.

Only variables are allowed in common blocks.

Message ID: ERROR_0594


Error : The attribute on the type declaration statement is not allowed in this program unit.

Although the type declaration statement must be allowed in this program unit, the specific attribute is not allowed in this program unit. Following are context restrictions for the different attributes:
-- ALLOCATABLE: Not allowed in a block data program unit.
-- DIMENSION: Allowed where a type declaration statement is allowed.
-- EXTERNAL: Not allowed in a block data program unit.
-- INTENT: Allowed only in subroutines, functions, and interface bodies.
-- INTRINSIC: Allowed where a type declaration statement is allowed.
-- OPTIONAL: Allowed only in subroutines, functions, and interface bodies.
-- PARAMETER: Allowed where a type declaration statement is allowed.
-- POINTER: Allowed where a type declaration statement is allowed.
-- PRIVATE: Allowed only in modules.
-- PUBLIC: Allowed only in modules.
-- SAVE: Allowed where a type declaration statement is allowed.
-- TARGET: Allowed where a type declaration statement is allowed.

Message ID: ERROR_0595


Error : This attribute must only be specified if the derived type statement is in the specification part of a module.

Although the derived type declaration statement can be allowed in this context, the PUBLIC and PRIVATE attributes are only allowed if this derived type declaration statement is in a module program unit.

Message ID: ERROR_0596


Limit : Compiler internal development commandline option caused the compiler to abort on the first ANSI message.

There is a development command-line option that causes the compiler to abort after the first ANSI message.

Message ID: LIMIT_0597


Error : This must not have the PUBLIC attribute, because it is typed as a private type.

If an object is typed as a private type, it must not be given the PUBLIC attribute, either by default or actual declaration.

Message ID: ERROR_0598


Error : This has the %s attribute, therefore it must not be in a namelist group.

The object must not be in a namelist group because it is typed CHARACTER*(*), it is an assumed-size, assumed-shape or deferred-shape array or it has one or more of the following attributes:

           ALLOCATABLE
           AUXILIARY
           PARAMETER
           POINTER
           EXTERNAL
           INTRINSIC
           VFUNCTION
           NOSIDE EFFECTS
   

Message ID: ERROR_0599


Error : This has already been declared in a way which means it must not be in a namelist group.

The object must not be in a namelist group because it is one of the following:

           Cray pointee
           derived type
           generic interface
           namelist group
           statement function
           construct
           module
           block data
           program
           function
           subroutine
   

An object in a namelist group must be a variable.

Message ID: ERROR_0600


Error : This is typed as variable length character, therefore it must not be in a namelist group.

The length of namelist group objects must be known at compile time.

Message ID: ERROR_0601


Error : This is an explicit-shape array with nonconstant bounds, therefore it must not be in a namelist group.

The length of namelist group objects must be known at compile time.

Message ID: ERROR_0602


Error : This is a procedure name, therefore it must not be in a namelist group.

All objects in a namelist group must be variables.

Message ID: ERROR_0603


Log_Warning : This is an unsupported compiler directive.

The specified compiler directive is unsupported on this hardware or it is deferred until a future release.

Message ID: LOG_WARNING_0604


Error : This must be a constant to be used in an initialization expression.

To be used in an initialization expression, the object must be a constant. The compiler detected one of the following:
-- The object is type character or an array with nonconstant bounds.
-- The object is in common, therefore it is a variable.
-- The object is a procedure. It has an explicit interface and/or it is used as a function or a subroutine.
-- The object has been used as a variable.

Message ID: ERROR_0605


Internal : Internal Error with I/O control list table.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0606


Error : Object is in auxiliary storage. It must not be host associated.

Objects in auxiliary storage must not be host associated. Auxiliary storage is an extension to the Fortran standard.

Message ID: ERROR_0607


Error : This has an attribute which means it must not be a procedure in an interface block.

If an explicit interface is declared for a procedure, all information describing the procedure must be specified inside the explicit interface, with the exception of the OPTIONAL, PRIVATE and PUBLIC attributes. The procedure may be specified as a dummy argument.

Message ID: ERROR_0608


Error : This has already been declared in a way which means it must not be a function in an interface block.

If an explicit interface is declared for a procedure, all information describing the procedure must be specified inside the explicit interface, with the exception of the OPTIONAL, PRIVATE and PUBLIC attributes. The procedure may be specified as a dummy argument.

Message ID: ERROR_0609


Error : This is typed as variable length character, therefore it must not be a procedure in an interface block.

If an explicit interface is declared for a procedure, all information describing the procedure must be specified inside the explicit interface, with the exception of the OPTIONAL, PRIVATE and PUBLIC attributes. The procedure may be specified as a dummy argument.

Message ID: ERROR_0610


Error : This is an explicit-shape array with nonconstant bounds, therefore it must not be a procedure in an interface block.

If an explicit interface is declared for a procedure, all information describing the procedure must be specified inside the explicit interface, with the exception of the OPTIONAL, PRIVATE and PUBLIC attributes. The procedure may be specified as a dummy argument.

Message ID: ERROR_0611


Error : This is in a common block, therefore it must not be a procedure or be used as a procedure.

All objects in a common block are variables. The compiler has detected an attempt to use a variable as a procedure or to declare a variable as a procedure.

Message ID: ERROR_0612


Error : This is defined in an explicit interface. It must not be defined with more than one explicit interface.

A procedure must only be defined in one explicit interface. An explicit interface is defined for an external procedure in an interface block. An explicit interface is defined for a module or internal procedure when the procedure is defined.

Message ID: ERROR_0613


Error : The storage size needed for this exceeds the maximum storage size available.

The storage needed for this item exceeds the memory size (in words) of this machine.

Message ID: ERROR_0614


Error : The storage size needed for this expression exceeds the maximum storage size available.

The storage needed for this expression exceeds the memory size (in words) of this machine. The expression could contain array constructors or be the result of a function call.

Message ID: ERROR_0615


Error : This has been used as a function, therefore it cannot be declared in an explicit interface block.

All definitions of a function must be before any uses of that function, with the exception of internal functions. They may be used before they are defined.

Message ID: ERROR_0616


Error : This has been used as a subroutine, therefore it cannot be declared in an explicit interface block.

All definitions of a subroutine must be before any uses of that subroutine, with the exception of internal subroutines. They may be used before they are defined.

Message ID: ERROR_0617


Error : Precompiled procedure must have the same double precision (-ep/-dp) option specified as this compilation.

If the current compilation unit is being compiled with the -dp option, each module it uses or precompiled procedure it attempts to inline must be compiled with the -dp option. If the current compilation unit is being compiled with the -ep option, each module it uses or precompiled procedure it inlines must be compiled with the -ep option.

Message ID: ERROR_0618


Error : This has already been declared in a way which means it must not be a subroutine in an interface block.

If an explicit interface is declared for a procedure, all information describing the procedure must be specified inside the explicit interface, with the exception of the OPTIONAL, PRIVATE and PUBLIC attributes. The procedure may be specified as a dummy argument.

Message ID: ERROR_0619


Warning : Dummy argument is not an auxiliary array but this actual argument is.

When an actual argument is an auxiliary array, the address passed to the subprogram will be an auxiliary storage address. If the associated dummy argument is not an auxilary array, the address will be interpreted incorrectly. Auxiliary arrays are an extension to the Fortran standard.

Message ID: WARNING_0620


Error : The kind parameter is not valid. It must be a scalar integer constant.

The syntax for a kind parameter is _kind-param

kind_param is digit_string or scalar_int_constant_name

Examples of valid kind parameters are:

    4
    8
    INTEGER, PARAMETER :: KIND_PARM=4
   

Message ID: ERROR_0621


Error : Dummy argument has the TARGET attribute. It requires an actual argument with the TARGET or POINTER attribute.

A dummy argument that has the TARGET attribute can only be associated with an actual argument that has either the TARGET attribute or the POINTER attribute.

Message ID: ERROR_0622


Error : Default integer kind size for precompiled procedure must match the default integer kind size for this compilation.

For modules, both the module and the using compilation unit must be compiled with the same default integer kind type. They both must be compiled with the same -i command-line option or the same CDIR$ INTEGER= option. Following are some examples.

    module          compilation unit
    default         using the module
    -i64             -i64            ! Legal
    -i32             -i64            ! Illegal
    !DIR INTEGER=64  -i32            ! Illegal
    !DIR INTEGER=64  !DIR INTEGER=64 ! Legal
   
The same goes for precompiled inlinable procedures. Both the caller and callee must be compiled the same.

Message ID: CAUTION_0623


Internal : Bad left operand to ptr_assign_from_target.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0624


Error : To be a Cray character pointee, this must be properly declared prior to the POINTER statement.

When declaring a Cray character pointer, the type of the pointee must be declared CHARACTER*(*) before the POINTER statement, as in the following examples.

     CHARACTER*(*)  EE
     POINTER(PTR, EE)   ! legal

     POINTER(PTR, EE)
     CHARACTER*(*)  EE  ! illegal

   

Message ID: ERROR_0625


Internal : Expected one thing, got something else..

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0626


Warning : Dummy argument is an auxiliary array and the actual argument is not.

When an interface to a subprogram is known and a dummy argument is an auxiliary array, the subprogram expects that the address it receives will be an auxiliary storage address. This will not be the case when the actual argument associated with the auxiliary array dummy argument is an expression, an array that is not auxiliary, or an array section. An array section of an auxiliary array is still invalid because the section is copied into a temporary array that will not be in auxiliary storage. Auxiliary storage is an extension to the Fortran standard.

Message ID: WARNING_0627


Error : This has an attribute which means it must not be used as an external function name.

The compiler detected a conflict between a declaration and a use of this object. The object must not be used as an external function name because it is typed as assumed-length character, it is an assumed-size or assumed-shape array, it is equivalenced or data initialialized or it has one or more of the following attributes:

           ALLOCATABLE
           AUXILIARY
           PARAMETER
           INTENT
           TARGET
           SAVE
           POINTER
           INTRINSIC
   

Message ID: ERROR_0628


Error : This has already been declared in a way which means it must not be used as an external function name.

The compiler detected a conflict in a declaration and a use of this object. The object must not be used as an external function name because it has been declared to be one of the following:

           Cray pointer
           Cray pointee
           function result
           derived type
           namelist group
           statement function
           construct
           variable
           module
           block data
           program
           subroutine
           internal procedure
   

Message ID: ERROR_0629


Internal : Non constant character in namelist_static_dv_whole_def.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0630


Log_Error : This compiler is not licensed on this hardware. Please contact Sun.

A license is needed to run this compiler on this hardware.

Message ID: LOG_ERROR_0631


Error : This has been used as a subroutine, therefore it must not be used as a function.

The object is a subroutine, so it must not be used as a function.

Message ID: ERROR_0632


Error : This has an attribute which meeans it must not be used as a subroutine name in a CALL statement.

The only attributes that a subroutine can have are:

           OPTIONAL
           PUBLIC
           PRIVATE
           EXTERNAL
           INTRINSIC
           NOSIDE EFFECTS
   

Message ID: ERROR_0633


Error : This has already been declared in a way which means it must not be used as an external subroutine name in a CALL statement.

The compiler detected a conflict between a declaration and a use of this object. The object must not be used as an external subroutine name in a CALL statement because it has been declared to be one of the following:

           Cray pointer
           Cray pointee
           function result
           derived type
           namelist group
           statement function
           construct
           variable
           module
           block data
           program
           function
   

Message ID: ERROR_0634


Error : This is typed as character, therefore it must not be used as a subroutine.

A subroutine may not have an explicit type.

Message ID: ERROR_0635


Error : This has the DIMENSION attribute, therefore it must not be used as a subroutine.

A subroutine cannot have the DIMENSION attribute.

Message ID: ERROR_0636


Internal : Something other than list opnd in io_list_semantics.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0637


Error : Cray character pointee must be an assumed-length character variable.

To be a Cray character pointee, the pointee must be declared CHARACTER*(*), as in the following examples:

        CHARACTER*(*)  EE
        POINTER(PT, EE)    ! legal

        CHARACTER*(I)  EE
        POINTER(PT,EE)     ! illegal

        CHARACTER*(6)  EE
        POINTER(PT,EE)     ! illegal
   

The Cray pointer data type is an extension to the Fortran standard.

Message ID: ERROR_0638


Error : This is used as a function, therefore it must not be used as a subroutine.

A function must not be referenced as if it is a subroutine.

Message ID: ERROR_0639


Error : This actual argument must not be scalar.

This particular argument must not be a scalar entity.

Message ID: ERROR_0640


Error : This has already been declared in a way which means it must not be used in an expression.

The compiler detected a conflict between a declaration and a use of this name. The name must not be used in an expression because it is a derived-type name, a namelist group name, a construct name, a module name, a block data program unit name or a main program name.

Message ID: ERROR_0641


Error : This has already been declared in a way which means it must not be re-declared in that way.

A Cray pointer cannot also be a Cray character pointer. A Cray character pointer cannot also be a Cray pointer. The Cray pointer and character pointer data types are extensions to the Fortran standard.

Message ID: ERROR_0642


Error : This has been used as a subroutine, therefore it must not be referenced in an expression.

A subroutine can only be used in a CALL statement.

Message ID: ERROR_0643


Error : This has an attribute which means it must not be used as a derived-type name.

This object must be a derived-type to be used as a derived-type. The only attributes that a derived-type name can have are PUBLIC or PRIVATE.

Message ID: ERROR_0644


Error : This has already been declared in a way which means it must not be used as a derived-type name.

The compiler detected a conflict between a declaration and a use of this object. The object must not be used as a derived-type name it is not a derived-type name.

Message ID: ERROR_0645


Error : This is typed as character, therefore it must not be used as a derived-type name.

The compiler detected a conflict between a declaration for this object and a use of the object. The object used is typed as character, which prohibits it from being used as a derived-type name.

Message ID: ERROR_0646


Error : This has the DIMENSION attribute, therefore it must not be used as a derived-type name.

The compiler detected a conflict in declarations for this object. The only attributes that a derived-type name can have are PUBLIC or PRIVATE.

Message ID: ERROR_0647


Error : This is in a common block which makes it a variable, therefore it must not be used as a derived-type name.

The compiler detected a conflict between a declaration and a use of this object. The object is a variable, because it is in a common block. A variable cannot be used as a derived-type name.

Message ID: ERROR_0648


Error : This is a procedure, therefore it must not be used as a derived-type name.

The compiler detected a conflict between a declaration and a use of this object. The object is a procedure, so it must not be used as a derived-type name.

Message ID: ERROR_0649


Error : This is a Cray pointee. It must not be typed as a derived type.

A Cray pointee must not be a derived type. The Cray pointer data type (and its associated pointee) is an extension to the Fortran standard.

Message ID: ERROR_0650


Error : This is typed as a derived type, therefore it must not be declared as a Cray pointee.

A Cray pointee must not be a derived type. The Cray pointer data type (and its associated pointee) is an extension to the Fortran standard.

Message ID: ERROR_0651


Error : This has been used as a function, therefore it must not be used as a derived-type name.

The compiler detected a conflict between uses of this object. The object being declared is used as a function, which prohibits it from being used as a derived-type name.

Message ID: ERROR_0652


Error : This has been used as a subroutine, therefore it must not be used as a derived-type name.

The compiler detected a conflict in uses of this object. The object being declared is used as a subroutine, which prohibits it from being used as a derived-type name.

Message ID: ERROR_0653


Error : This actual argument does not have a legal rank for this intrinsic procedure.

This actual argument does not have a legal rank for the intrinsic procedure in question.

Message ID: ERROR_0654


Internal : fnd_semantic_err is detecting error(s) that the calling routine is not.

Many routines do their own error checking and only call fnd_semantic_err when they have a problem. If something gets changed in the semantic tables, the calling routines need to be changed as well. The problem can be found by checking the error previous to this internal error. That is the error that the calling routine needs to detect.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0655


Error : A PUBLIC/PRIVATE statement with no access list must only be specified once in the scoping unit of the module.

Multiple PRIVATE and PUBLIC statements without an access_id_list are illegal. The compiler detected something like the following example:

      MODULE A
      PUBLIC
      PRIVATE  !  Illegal - PUBLIC is already specified
   

Message ID: ERROR_0656


Error : Function result cannot be in a namelist group, because it is not the result of an active function.

A function result is allowed in a namelist group if it is in the containing scope of the namelist statement, as in this example:

    MODULE ABC
    CONTAINS
      FUNCTION XYZ()
        NAMELIST /GRP/ XYZ, RST  ! RST is illegal
      END FUNCTION

      FUNCTION RST()
      END FUNCTION
    END MODULE
   

RST is illegal in the NAMELIST statement, because the NAMELIST statement is not in the scope of RST. XYZ is a legal namelist group member.

Message ID: ERROR_0657


Error : This must be an integer constant or the DO variable of a containing implied-DO.

Each operand of the start, end, or increment expression of a DATA implied-DO must be an integer constant (literal or named), or it must be a DO variable of a containing implied-DO.

Message ID: ERROR_0658


Error : All dummy arguments used in the length expression for this object must be specified at the same entry point.

If a variable length character declaration uses dummy arguments to determine the length expression, all the dummy arguments must be specified at the same entry point. The compiler detected a length expression, where one dummy argument is at one entry point and another dummy argument used in the same length expression is not at the same entry point. The following example demonstrates this:

      SUBROUTINE SUBCHAR(IDX1)
      CHARACTER*(IDX1 + IDX2)  SUN_CHAR
      ...
      ENTRY SUBLATER(IDX2)
      ...
      END SUBROUTINE
   

This program would receive an error for the length expression for SUN_CHAR. IDX1 and IDX2 have to be specified together in at least one entry point to make this program legal.

Message ID: ERROR_0659


Error : All dummy arguments used in the bounds expressions for this array must be specified at the same entry point.

If a variable length array declaration uses dummy arguments to determine any of its bounds, all the dummy arguments must be specified at the same entry point. The compiler detected an array declaration where one dummy argument is at one entry point and another dummy argument used in a bound expression for the same array declaration is not at the same entry point. The following example demonstrates this:

      SUBROUTINE SUBDIM(IDX1)
      REAL, DIMENSION (IDX1,IDX2) ::  AN_ARRAY
      ...
      ENTRY SUBLATER(IDX2)
      ...
      END SUBROUTINE
   

This program would get an error for the declaration of AN_ARRAY. IDX1 and IDX2 have to be specified together in at least one entry point to make this program legal.

Message ID: ERROR_0660


Error : All dummy arguments used in specification expressions to declare this must be specified at the same entry point.

The compiler detected a character array declaration, with dummy arguments used in specification expressions to declare character length and array bounds. All dummy arguments used in specification expressions for the declaration of this object must be specified in at least one common entry point. The following example demonstrates this:

      SUBROUTINE SUBCHAR(IDX1)
      CHARACTER*(IDX1)  CHAR_ARRAY(IDX2)
      ...
      ENTRY SUBLATER(IDX2)
      ...
      END SUBROUTINE
   

This program would get an error for the CHAR_ARRAY declaration. IDX1 and IDX2 have to be specified together in at least one entry point to make this program legal.

Message ID: ERROR_0661


Error : All dummy arguments used in expressions to declare this must be specified at the same entry point as the object.

The compiler detected a dummy argument declaration, with dummy arguments used in specification expressions to declare character length and/or array bounds. All dummy arguments used in specification expressions for the declaration of this object must be specified in the same entry point as the dummy argument. The following example demonstrates this:

      SUBROUTINE SUBCHAR(IDX1, CHAR_ARRAY)
      CHARACTER*(IDX1)  CHAR_ARRAY(IDX2)
      ...
      ENTRY SUBLATER(IDX2)
      ...
      END SUBROUTINE
   

This program would get an error for CHAR_ARRAY declaration. IDX1, IDX2, and CHAR_ARRAY must be specified together in at least one entry point to make this program legal.

Message ID: ERROR_0662


Error : This belongs to a common block that is in auxiliary storage so it must not be a namelist group object.

Namelist group objects must not be in auxiliary storage. Auxiliary storage is an extension to the Fortran standard.

Message ID: ERROR_0663


Internal : Expression semantics missed detection of an error for a constant specification expression.

If the statement type is component declaration statement, the expression parser should catch all objects in the expression that are not constant expressions.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0664


Internal : Unexpected basic type from create_dv_type_code.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0665


Error : This has been used as a variable or a function in the character length, therefore it must not be the function name.

PP The compiler detected the following:

       CHARACTER*(IFUN)  FUNCTION IFUN()
   
PP or
       CHARACTER*(IFUN(1))  FUNCTION IFUN(I)
   
PP These are both illegal.

Message ID: ERROR_0666


Error : The number of entities to be initialized exceeds the number of values.

PP The DATA statement is specifying more entities to be initialized than there are values available in the value list. The DATA statement has the following form:

     DATA data_stmt_set [ [,] data_stmt_set ]
   
PP where each data_stmt_set consists of
     data_stmt_object_list /data_stmt_value_list/
   
PP The data_stmt_object_list is expanded to form a sequence of scalar variables and the data_stmt_value_list is expanded to form a sequence of scalar constant values. The number of entities in the expanded data_stmt_object_list must be the same as the number of constant values in the expanded data_stmt_value_list.

Message ID: ERROR_0667


Error : The number of values exceeds the number of entities to be initialized.

PP The DATA statement is specifying more values in the value list than there are entities to be initialized. The DATA statement has the following form:

     DATA data_stmt_set [ [,] data_stmt_set ]
   
PP where each data_stmt_set consists of
     data_stmt_object_list /data_stmt_value_list/
   
PP The data_stmt_object_list is expanded to form a sequence of scalar variables and the data_stmt_value_list is expanded to form a sequence of scalar constant values. The number of entities in the expanded data_stmt_object_list must be the same as the number of constant values in the expanded data_stmt_value_list.

Message ID: ERROR_0668


Error : The matching DO statement has a construct name, therefore this statement must be an END DO with the same construct name.

PP If the DO statement of a block DO construct is identified by a construct name, the DO construct's termination statement must be an END DO statement and the END DO must specify the same construct name.

Message ID: ERROR_0669


Internal : Number of list items is greater than list count value.

PP This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0670


Error : Procedure is already in the interface block. It must not be specified multiple times.

PP A procedure must not be specified in the same interface block multiple times. Following are examples using module procedures:

      PROGRAM TEST1
       USE FOOS
       INTERFACE INT_1
         MODULE PROCEDURE FOO,FOO ! FOO is illegal
         MODULE PROCEDURE FOO1
         MODULE PROCEDURE FOO1    ! FOO1 is illegal
       END INTERFACE

       INTERFACE INT_2
         MODULE PROCEDURE FOO2B
       END INTERFACE

       INTERFACE INT_2
         MODULE PROCEDURE FOO2b   ! FOO2B is illegal
       END INTERFACE
       END
   
PP However, the following is legal for module procedures:
       MODULE TEST2
       USE FOOS
       INTERFACE INT_2
         MODULE PROCEDURE FOO2B
       END INTERFACE
       END MODULE

       MODULE TEST3
       USE FOOS
       INTERFACE INT_2
         MODULE PROCEDURE FOO2B
       END INTERFACE
       END MODULE

       PROGRAM TEST4
       USE TEST2
       USE TEST3   ! This is legal, because
                   ! FOO2B is coming in from
                   ! two separate modules
       END
   

Message ID: ERROR_0671


Error : This has been used as a function, therefore it must not be declared an explicit-shape array with nonconstant bounds.

PP The object being declared is used as a function, which prohibits it from being declared as an explicit-shape array with nonconstant bounds. All declarations must precede all uses of an entity.

Message ID: ERROR_0672


Error : The dimension attributes for these entry points conflict.

PP If the result of any entry point of a function with one or more ENTRY statements has the DIMENSION attribute, then all entry points in that function must return a result with the same DIMENSION attribute. If the function is array-valued, all entry points must return results of the same rank, and if the function is not assumed-shape, the shape of all entry point results must agree.

Message ID: ERROR_0673


Error : Entry points must both have the POINTER attribute.

PP If the result of any entry point of a function with one or more ENTRY statements has the POINTER attribute, then all entry points in that function must return a result with the POINTER attribute.

Message ID: ERROR_0674


Error : An implied-DO variable must be the name of a variable of type integer.

PP An implied-DO list in a DATA statement or in an array constructor contains an implied-DO loop control variable that is not a variable of type integer. PP The DATA statement implied DO has the form:

      (data_i_do_object_list, data_i_do_variable =
           scalar_int_expr, scalar_int_expr
   	[, scalar_int_expr])
   
PP The data_i_do_variable must be the name of an integer variable. PP The array constructor implied-DO has the form:
      (ac_value_list, ac_do_variable =
            scalar_int_expr, scalar_int_expr
   	[, scalar_int_expr])
   
PP The ac_do_variable must be the name of an integer variable. PP A correction to the Fortran standard as a response to an interpretation request expands on the rules for implied-DO loop control variables that are statement entities (the I/O implied-DO variable is not a statement entity). Essentially, it states that a statement entity can have the same name as a common block name or an integer scalar variable in the scoping unit containing the DATA statement or array constructor. Therefore, a statement entity cannot have the same name as an external procedure, an internal procedure, a module procedure, a named constant, a construct name, a generic name, a derived type name, and so on. Also, because it must be type integer, it cannot have the same name as an entity declared to be of a type other than integer. PP The interpretation response also states that the implied-DO variable must be the name of a scalar variable, but Sun f90 extends the standard by allowing the data_i_do_variable or ac_do_variable to have the same name as an integer array.

Message ID: ERROR_0675


Error : An identifier in a DATA value list must be the name of a previously declared named constant.

PP A value in the value list of a data statement has the form:

     [data_stmt_repeat *] data_stmt_constant
   
PP If the repeat factor or constant is an identifier, it must be the name of a named constant and the named constant must have been declared previously in the scoping unit or made accessible by use or by host association.

Message ID: ERROR_0676


Error : If the repeat factor is an identifier, it must be the name of a scalar named constant.

PP A value in the value list of a DATA statement may be preceded by a repeat factor as in:

      [data_stmt_repeat *] data_stmt_constant
   
PP If the DATA statement repeat factor is an identifier, it must be the name of a named constant and the named constant must represent a scalar value.

Message ID: ERROR_0677


Error : A DATA statement repeat factor must be type integer.

PP A value in the value list of a DATA statement may be preceded by a repeat factor as in:

     [data_stmt_repeat *] data_stmt_constant
   
PP The DATA statement repeat factor must be type integer.

Message ID: ERROR_0678


Error : The value of a DATA statement repeat factor must be equal to or greater than zero.

PP A value in the value list of a DATA statement may be preceded by a repeat factor as in:

        [data_stmt_repeat *] data_stmt_constant
   
PP If the DATA statement repeat factor is an identifier, it must be the name of a named constant and the named constant must represent a value that is equal to or greater than zero.

Message ID: ERROR_0679


Error : More than one IF condition is specified for the tasking directive.

PP The IF condition parameter for DOALL and PARALLEL compiler tasking directives can only be specified once.

Message ID: ERROR_0680


Error : The specifier for number of characters in this statement must be of type integer.

PP An ENCODE or DECODE statement is specifying a noninteger value for number of characters. In the following statements, n, the number of characters, must be a nonzero integer expression less than or equal to 152:

      ENCODE (n,f,dent) [elist]
      DECODE (n,f,sent) [dlist]
   

Message ID: ERROR_0681


Error : The specifier for number of characters in this statement must be in the range 1 to 152.

PP An ENCODE or DECODE statement is specifying a value for number of characters that is not in the range 1 to 152. In the following statements, n, the number of characters, must be a nonzero integer expression less than or equal to 152:

      ENCODE (n,f,dent) [elist]
      DECODE (n,f,sent) [dlist]
   

Message ID: ERROR_0682


Error : The specifier for number of characters in this statement must be a scalar integer expression.

PP An ENCODE or DECODE statement is specifying a value for number of characters that is not a valid expression. In the following statements, n, the number of characters, must be a nonzero integer expression less than or equal to 152:

      ENCODE (n,f,dent) [elist]
      DECODE (n,f,sent) [dlist]
   

Message ID: ERROR_0683


Error : Module procedure must have the PRIVATE attribute, because its function result is a private type.

PP A module procedure that has a dummy argument or function result of a type that has private accessibility must have private accessibility. PP If a module procedure is public, then if any of its dummy arguments or its function result is a derived type, the type must be a public type.

Message ID: ERROR_0684


Error : Module procedure must have the PRIVATE attribute, because dummy argument is a private type.

PP A module procedure that has a dummy argument or function result of a type that has private accessibility must have private accessibility. PP If a module procedure is public, then if any of its dummy arguments or its function result is a derived type, the type must be a public type.

Message ID: ERROR_0685


Error : Generic interface must be private, because specific interface is a function with a private type.

PP A module procedure that has a dummy argument or function result of a type that has private accessibility must have private accessibility and must not have a generic identifier that has public accessibility. PP If a generic identifier has public accessibility, then all of its specific procedures must have function results and dummy arguments that are declared to be public types.

Message ID: ERROR_0686


Error : Generic interface must be private, because dummy argument for specific interface is a private type.

PP A module procedure that has a dummy argument or function result of a type that has private accessibility must have private accessibility. PP If a module procedure is public, then if any of its dummy arguments or its function result is a derived type, the type must be a public type.

Message ID: ERROR_0687


Error : Common block was specified in a SAVE statement, but has not been specified in a COMMON statement.

PP If a common block is specified in a SAVE statement, the common block must also be declared in a COMMON statement.

Message ID: ERROR_0688


Internal : The operator enum in globals.h does not match the operator_str array in debug.h.

PP When you add an operator to globals.h you must also add the corresponding string to debug.h. PP This message should never be generated and signifies a bad compiler or a bad installation. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code.

Message ID: INTERNAL_0689


Error : Common block is specified in a TASK COMMON directive, therefore it must be specified in a COMMON statement.

PP If a common block is specified in a CDIR$ (!DIR$) TASK COMMON statement, the common block must also be declared in a COMMON or a TASK COMMON statement.

Message ID: ERROR_0690


Error : This is of a derived type that has an ultimate component that is a pointer, therefore it must not be a named constant.

PP A named constant must not be given the POINTER attribute and must not be of a derived type that has a pointer as one of its components.

Message ID: ERROR_0691


Ansi : Initializing a named common block member in a program unit other than a block data program unit is nonstandard.

PP An object is being initialized either by a DATA statement or by initialization on a type declaration statement. The object is a member of a named common block. If an object is a member of a named common block it should only be initialized in a block data program unit.

Message ID: ANSI_0692


Error : A blank common block member must not be initialized.

PP An object is being initialized either by a DATA statement or by initialization on a type declaration statement. The object is a member of blank common. An object that is a member of blank common must not be initialized.

Message ID: ERROR_0693


Error : This Hollerith constant is longer than one word.

PP A Hollerith constant containing more characters than fit in a machine word is being used in an expression. In this context, a Hollerith constant is limited to the number of characters that will fit in a machine word. Hollerith constants are an extension to the Fortran standard.

Message ID: ERROR_0694


Error : A Cray character pointer must not be initialized.

PP A DATA statement or a type declaration statement is attempting to initialize a Cray character pointer. Noncharacter Cray pointers can be initialized but Cray character pointers cannot be initialized. Cray pointers are an extension to the Fortran standard.

Message ID: ERROR_0695


Error : The implied-DO variable has already been used as an implied-DO variable in an inner loop.

PP A DATA statement may contain an implied-DO of the form:

      (data_i_do_object_list, data_i_do_variable =
           scalar_int_expr, scalar_int_expr
   	[, scalar_int_expr])
   
PP The data_i_do_variable of each implied-DO in the nest of implied-DOs must be a unique name. For example, the following nested set of implied-DOs does not conform to the Fortran standard because variable K is used in multiple loops:
   DATA ((ARRAY(K,K), K = 1, 3), K = 1, 3)  /9*-1/
   

Message ID: ERROR_0696


Error : Cray pointer and Cray pointee both must be public or they both must be private.

PP The compiler detected one of the following:

   	Cray Pointer	Cray Pointee
   	PRIVATE      PUBLIC
   	PUBLIC       PRIVATE
   
PP They both must have either the PUBLIC or PRIVATE attribute. Cray pointers are an extension to the Fortran standard.

Message ID: ERROR_0697


Ansi : Partial initialization of a whole array is an extension to the Fortran standard.

PP A constant must exist for each element of a whole array named in a data_stmt_object_list, but Sun f90 allows the number of values in the constant list to be fewer than the number of targets if the last item in the target list is a whole array reference. PP This is an outmoded extension that was carried forward into Sun f90. We recommend that you remove it where possible in existing code and avoid using it in any new code.

Message ID: ANSI_0698


Error : DATA target is a function reference or an array element reference to an undeclared array.

PP The DATA target (data_stmt_object or data_i_do_object) has the form:

      name(list)
   
PP At the time the reference was encountered, there was no additional information available for the name; therefore it is ambiguous. It appears to be either a function reference or an array element reference (where the array was not declared in the current scoping unit prior to the DATA statement). PP A DATA target cannot be a function reference because it must be a variable. PP If an array element reference appears in a DATA statement, the array must have had its array properties established by a previous specification statement in the current scoping unit. PP Example 1: The following program does not conform to standard because the implied-DO target array is declared to be an array by the specification statement that follows the DATA statement.
    DATA (array(i), i = 1, 5) /5 * 1.0/
    DIMENSION array(5)
   
PP Example 2: The following program does not conform to standard because the implied-DO target array is not declared in the internal subprogram. The presence of a DATA statement in a scoping unit causes the target variable to be implicitly declared to be a variable local to that scoping unit. Therefore, a contained scoping unit cannot initialize a variable declared in a host scoping unit.
    PROGRAM main
    REAL array(5)
    ...
    CONTAINS
      SUBROUTINE sub
      DATA (array(i), i = 1, 5) /5 * 1.0/
      ...
      END SUBROUTINE
    END PROGRAM
   

Message ID: ERROR_0699


Error : No specific intrinsic exists for the intrinsic call.

PP A function or subroutine call which invokes the name of an intrinsic procedure does not match any specific intrinsic. All dummy arguments without the OPTIONAL attribute must match in type and rank exactly.

Message ID: ERROR_0700


Error : "%s" is not an intrinsic routine.

PP A name declared with the INTRINSIC attribute is not a name of an intrinsic procedure.

Message ID: ERROR_0701


Type double complex is not supported with -ep.

PP Type double complex is supported as an extension to the Fortran standard, only if -dp is used on the command line (-dp means "disable double precision"). If -ep is on (enable double precision), then double complex is not supported. A double complex type which is unaffected by the -dp/-ep command-line options can be specified by using COMPLEX(KIND=16).

Message ID: ERROR_0702


Error : A continuation line can only follow a line continued with the "&" symbol.

PP In free source form, a continuation line that starts with the & symbol must follow a line that ends with the & symbol.

Message ID: ERROR_0703


Internal : Unexpected FLD value.

PP The code was expecting a specific FLD value (such as AT_Tbl_Idx) but encountered a FLD value it could not handle. PP This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0704


Error : "%s" is not a constant therefore it must not appear in an initialization expression.

PP The DATA statement has the general form:

      data_stmt_object_list /data_stmt_value_list/
   
PP where a data_stmt_object can be a variable or an implied-DO. In a data_stmt_object that is a variable, each subscript, section subscript, substring starting point, and substring ending point must be an initialization expression. An initialization is a constant expression with the addition that exponentiation is allowed if the power is of type integer. A constant expression is essentially an expression in which all primaries must be constants, or resolve to constants, and each operation must be intrinsic.

Message ID: ERROR_0705


Error : This function name must not appear in a DATA statement expression.

PP The DATA statement has the general form:

      data_stmt_object_list /data_stmt_value_list/
   
PP where a data_stmt_object can be a variable or an implied-DO. In a data_stmt_object that is a variable, each subscript, section subscript, substring starting point, and substring ending point must be an initialization expression. If a function reference appears in an initialization expression, it must be a reference to one of a restricted set of intrinsic functions allowed in an initialization expression. It must not be a reference to a user-defined function. PP The DATA statement implied-DO has the form:
   (data_i_do_object_list, data_i_do_variable =
     scalar_int_expr, scalar_int_expr [, scalar_int_expr])
   
PP A primary in a subscript of a data_i_do_object subscript list must be a constant or a DO variable of a containing implied-DO. A primary in such a subscript list cannot be a reference to either an intrinsic or a user-defined function. Also, each primary in each loop control scalar_int_expr must be a constant or a DO variable of a containing implied-DO.

Message ID: ERROR_0706


Error : Module procedure is not a module procedure in a parent of this scoping unit.

PP Each module_procedure_name in a MODULE PROCEDURE statement must be the name of a module procedure that is accessible via host or use association. PP The compiler found the module procedure name in the host, but it is not a module procedure. It is a variable, a derived type, or a namelist group name. Following is an example of what the compiler found:

    MODULE MOD
    DIMENSION MM(100)

    CONTAINS
      SUBROUTINE JOE()
        INTERFACE BAD
          MODULE PROCEDURE MM ! MM is not a module
                              ! procedure.  It is
                              ! an array.
        END INTERFACE
      END SUBROUTINE JOE
    END MODULE
   

Message ID: ERROR_0707


Warning : Possible recursive reference to module procedure. RECURSIVE must be specified for a recursive reference.

PP The compiler detected a declaration for a module procedure inside an interface block that is in the scope of the module procedure itself. The following example may clarify this:

   MODULE MM
   CONTAINS
     SUBROUTINE JOE
       INTERFACE GENERIC
         MODULE PROCEDURE JOE ! This is a reference
                              ! to the containing procedure
       END INTERFACE

       CALL GENERIC()   ! This is a recursive reference,
                        ! therefore JOE
                        ! must be declared
                        ! RECURSIVE SUBROUTINE JOE

      END SUBROUTINE JOE
   END MODULE
   

Message ID: WARNING_0708


Error : A DATA implied-DO target must be an array element or scalar structure component reference.

PP A DATA statement implied-DO has the form:

    (data_i_do_object_list, data_i_do_variable =
        scalar_int_expr, scalar_int_expr
           [, scalar_int_expr])
   
PP A data_i_do_object can be an array element reference, a scalar structure component reference, or another implied-DO. If the data_i_do object is a structure component reference, at least one of the structure or component names should have a subscript list associated with it.

Message ID: ERROR_0709


Warning : The -dp option does not change this type. It will remain double precision.

PP REAL*16, DOUBLE PRECISION*16 and COMPLEX*32 are not affected by the -dp command-line option. They will remain as double precision type.

Message ID: WARNING_0710


Caution : The type statement for the generic intrinsic function is ignored.

PP The name of a generic intrinsic function appeared in a type declaration statement. Generic intrinsic functions perform various operations, depending on the data types of their arguments. A specific data type cannot be assigned to a generic intrinsic function. The type declaration statement is ignored.

Message ID: CAUTION_0711


Error : Generic interface must not also be the name of a module, unless it is a specific name in the generic interface.

PP If a module procedure and a generic interface name are the same, the module procedure must be specified as a specific name in the generic interface. The following is a legal example:

       MODULE XYZ
         INTERFACE IN
           MODULE PROCEDURE IN
         END INTERFACE
         CONTAINS
           SUBROUTINE  IN()
           END SUBROUTINE IN
      END MODULE XYZ
   
PP The following is an illegal example:
       MODULE XYZ
         INTERFACE IN
           MODULE PROCEDURE NOT_IN
         END INTERFACE
         CONTAINS
           SUBROUTINE  IN()
           END SUBROUTINE IN

           SUBROUTINE DOIT()
           CALL IN()  ! Illegal; the compiler cannot
                      ! determine which IN to call.
           END SUBROUTINE DOIT

           SUBROUTINE  NOT_IN()
           END SUBROUTINE NOT_IN
      END MODULE XYZ
   

Message ID: ERROR_0712


Error : Generic interface is also an external or module procedure. It must be a specific name in the generic interface.

PP If a generic interface and an external or module procedure share the same name, the procedure must be a specific name in the generic interface. If a module procedure and a generic interface name are the same, the module procedure must be specified as a specific name in the generic interface. PP The following is a legal example:

    MODULE XYZ
      CONTAINS
        SUBROUTINE  IN()
        END SUBROUTINE IN

        SUBROUTINE DOIT()
        INTERFACE IN
          MODULE PROCEDURE IN
        END INTERFACE
        CALL IN()
        END SUBROUTINE DOIT
    END MODULE XYZ
   
PP The following is an illegal example:
   MODULE XYZ
     CONTAINS
       SUBROUTINE  IN()
       END SUBROUTINE IN

       SUBROUTINE DOIT()
       INTERFACE IN
         MODULE PROCEDURE NOT_IN
       END INTERFACE     ! Illegal; IN not in interface
       CONTAINS
         SUBROUTINE B
         CALL IN()       ! Illegal; compiler cannot
         END SUBROUTINE B! determine which IN to call
       END SUBROUTINE DOIT

       SUBROUTINE NOT_IN
       END SUBROUTINE NOT_IN
   END MODULE XYZ
   

Message ID: ERROR_0713


Ansi : This is a common block name and is declared as an intrinsic procedure. This is nonstandard.

PP A common block name is being used as the name of an intrinsic procedure. This is an extension to the Fortran standard.

Message ID: ANSI_0714


Log_Warning : Binary output (-eB or -b filename) disables assembly language output (-eS or -S filename). Binary file selected.

PP The compiler cannot have an assembly language file and a binary file open at the same time. Assembly language output is disabled, because binary output has been requested on the command line (-eB or -b filename). The compiler has processed a command line similar to this one:

           -eS -eB  file.f
   
PP This warning indicates that the -eB option overrides the -eS option.

Message ID: LOG_WARNING_0715


Ansi : This is an external procedure or a program unit and is also a common block name. This is nonstandard.

PP The Fortran standard prohibits a common block name from being the name of an external subprogram or a program unit. A program unit is a block data subprogram, a module subprogram, or a main program. An external subprogram is an external function or subroutine.

Message ID: ANSI_0716


Log_Warning : The -Ta option implies -Ca.

PP If the MPP apprentice option is specified, all CIF records are generated, even if the user only requests specific CIF records.

Message ID: LOG_WARNING_0717


Internal : The line number passed to the routine set_format_start_idx is not a valid line number.

PP The routine set_format_start_idx was trying to match an input line number with a line number currently in the statement buffer. It could not find a match. PP This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0718


Warning : Integer overflow resulted from an integer conversion or arithmetic operation.

PP When trying to compute the value of a constant expression, the compiler encountered an integer value that is too large to be represented. A constant expression is an expression involving only constants, and the value of the expression is determined at compile time rather than at execution time. This error may occur during an intermediate computation (for example, add, subtract, multiply, or divide, or exponentiation) or may occur when data conversion is required during the computation (for example, converting from real to integer).

Message ID: WARNING_0719


Error : A constant expression exceeds the valid range.

PP When trying to compute the value of a constant expression, the compiler encountered an integer or real value that was too large to be represented. A constant expression is an expression involving only constants, and the value of the expression is determined at compile time rather than at execution time. This error may occur during an intermediate computation (for example, add, subtract, multiply, divide, or exponentiation) or may occur when data conversion is required during the computation (for example, converting from double precision to real).

Message ID: ERROR_0720


Error : A divisor of zero was detected in an expression.

PP When trying to compute the value of a constant expression, the compiler encountered a divide operation with a divisor of zero. A constant expression is an expression involving only constants, and the value of the expression is determined at compile time rather than at execution time.

Message ID: ERROR_0721


Error : This use of the function is not valid.

PP A function name was encountered without a parentheses group.

Message ID: ERROR_0722


Error : This use of a generic interface or internal function is not valid.

PP A name that could either be a generic interface or an internal function is specified without a parentheses group.

Message ID: ERROR_0723


Error : Unknown statement. Expected assignment statement but found something else instead of "=" or "=>".

PP The compiler expected an assignment statement but could not find an assignment or pointer assignment operator at the correct point.

Message ID: ERROR_0724


Error : Module must be targeted for the same operating system as this compilation.

PP The module being specified in the USE statement must be targetted for the same operating system as this compilation. Target operating systems may not be mixed.

Message ID: ERROR_0725


Error : There is a problem with the module information file for this module.

PP The compiler received a read or write error while attempting to read or write the module information file.

Message ID: ERROR_0726


Error : The BOUNDARY argument must have the same type and type parameters as ARRAY.

PP The BOUNDARY argument must have the same type and type parameters as ARRAY.

Message ID: ERROR_0727


Error : At least one actual argument to this intrinsic must be present.

PP At least one actual argument must be passed to this intrinsic procedure.

Message ID: ERROR_0728


Ansi : This is not type integer, therefore initializing it with a BOZ literal constant is nonstandard.

PP The Fortran standard states that a BOZ literal constant can only appear in a DATA statement and it can only be used to initialize a variable of type integer.

Message ID: ANSI_0729


Warning : A dummy argument with INTENT(OUT) or INTENT(INOUT) is associated with an actual argument that cannot be defined.

PP An actual argument that is an expression, constant, or vector valued subscript array reference has been associated with a dummy argument that has the INTENT(OUT) or INTENT(INOUT) attribute. A warning is issued because the actual argument cannot be defined.

Message ID: WARNING_0730


Error : This is the name of a dummy argument to the program unit, therefore it must not be use associated from that module.

PP The name of a dummy argument to the program unit has been found in a module brought in by a USE statement. This creates a name conflict, therefore it is not allowed. PP Example:

       MODULE NEW
         INTEGER ABC
       END MODULE

       SUBROUTINE XYZ(ABC)
        USE NEW     ! ABC is illegal here
       END SUBROUTINE
   

Message ID: ERROR_0731


Error : This name is not in the module.

PP The compiler cannot find the specified name in the module. If a name is specified on a USE statement, it must be in that module.

Message ID: ERROR_0732


Ansi : Initializing multiple array elements with a single Hollerith or character constant is nonstandard.

A Hollerith constant (including the character literal form, '...') can initialize more than one element of an integer or real array when the array is specified without a subscript list. For example, given the array declared

   INTEGER a(2)
   

on a 64-bit machine, the following DATA statements have the same effect:

     DATA a /'1234567890123456'/

     DATA a /8H12345678, 8H90123456'/
   

Initializing array elements in this manner is an extension to the Fortran standard. It is an outmoded feature. We recommend that you remove it where possible from existing code and avoid using it in any new code.

Message ID: ANSI_0733


Internal : Internal error in create_loop_stmts.

Unexpected intermediate text found in create_loop_stmts.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0734


Ansi : Using a single END DO as a termination statement for multiple DO loops is an extension to the Fortran standard.

The Fortran standard defines a block DO construct to be a DO loop that terminates with an END DO or CONTINUE statement where each DO loop in a nest of DO loops must have its own terminating END DO or CONTINUE statement. The compiler extends the standard by allowing more than one DO loop to share a single labeled END DO as the common termination statement.

This is an outmoded feature. We recommend that you remove it where possible from existing code and avoid using it in any new code.

Message ID: ANSI_0735


Error : This is the name of this program unit, therefore it must not be use associated from the module.

The name of the program unit has been found in a module brought in by a USE statement. This creates a name conflict.

Example:

      MODULE NEW
       INTEGER ABC
      END MODULE

      PROGRAM ABC
        USE NEW   ! ABC is illegal here
      END PROGRAM
   

Message ID: ERROR_0736


Internal : Internal compiler error encountered in process_deferred_io_list.

In the routine process_deferred_io_list, an Alt_Return_Opr was found without a Br_Index_Opr on the next stmt. This indicates an internal compiler error condition.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0737


Error : Dummy argument X is type complex, thus dummy argument Y must not be present.

If the dummy argument X to the CMPLX intrinsic is type complex, then the dummy argument Y must not be present.

Message ID: ERROR_0738


Warning : No arguments are allowed to the intrinsic function - arguments ignored.

No actual arguments are allowed to be passed to this intrinsic function. The arguments are ignored.

Message ID: WARNING_0739


Error : IMPLICIT NONE is specified in the local scope, therefore an explicit type must be specified for the statement function.

When IMPLICIT NONE is specified, all statement functions must be explicitly typed.

Message ID: ERROR_0740


Error : IMPLICIT NONE is specified in the local scope. Statement function dummy argument must have an explicit type.

When IMPLICIT NONE is specified, all dummy arguments to statement functions must be explicitly typed.

Message ID: ERROR_0741


Error : IMPLICIT NONE is specified in the host scope, therefore an explicit type must be specified for statement function.

When IMPLICIT NONE is specified in a host scope, all statement functions must be explicitly typed, including those in any contained scopes.

Message ID: ERROR_0742


Error : IMPLICIT NONE is specified in the host scope. Statement function dummy argument must have an explicit type.

When IMPLICIT NONE is specified in a host scope, all statement function dummy arguments must be explicitly typed, including those in any contained scopes.

Message ID: ERROR_0743


Log_Warning : This commandline option has an unsupported option.

This command-line option is not supported on this hardware. The option is ignored.

Message ID: LOG_WARNING_0744


Error : The case value is not the same type as the case expression in the SELECT CASE statement.

For a given CASE construct, each case_value must be of the same type as the case_expr specified in the SELECT CASE statement. For type character, the case_values need not have the same length as each other nor do they have to be the same length as the case_expr in the SELECT CASE statement.

Message ID: ERROR_0745


Error : The case value has the same value as a case value on line %d.

For a given CASE construct, the case_value_ranges must not overlap; there must be no possible value of the case_expr of the SELECT CASE statement that matches more than one case_value_range.

The compiler encountered a case_value that has already been specified in a previous CASE statement of the same CASE construct. Example:

      SELECT CASE (k)

         CASE (1)
           ...

         CASE (1) ! Error; case_value 1 has
           ...    ! already been specified

       END SELECT
   

Message ID: ERROR_0746


Error : The case-value is already contained in a case-value range on line %d.

For a given CASE construct, the case_value_ranges must not overlap; there must be no possible value of the case_expr of the SELECT CASE statement that matches more than one case_value_range.

The compiler encountered a case_value whose value is contained in a case_value_range that was specified in a previous CASE statement of the same CASE construct. Example:

       SELECT CASE (k)

         CASE (1:10)
           ...

         CASE (3) ! Error; case_value 3
                  ! is contained in
           ...    ! range (1:10) in a
                  ! previous CASE statement.

       END SELECT
   

Message ID: ERROR_0747


Error : The case-value range contains a value that was already specified by a case-value.

For a given CASE construct, the case_value_ranges must not overlap; there must be no possible value of the case_expr of the SELECT CASE statement that matches more than one case_value_range.

The compiler encountered a case_value_range that specifies a range that contains a value that has already been specified by a case_value in a previous CASE statement of the same CASE construct. Example:

      SELECT CASE (k)

       CASE (5)
          ...

       CASE (1:)  ! Error; case_value 5
          ...     ! has already been specified

       END SELECT
   

Message ID: ERROR_0748


Error : The case-value range overlaps a case-value range.

For a given CASE construct, the case_value_ranges must not overlap; there must be no possible value of the case_expr of the SELECT CASE statement that matches more than one case_value_range.

The compiler encountered a case_value_range that overlaps a case_value_range specified in a previous CASE statement of the same CASE construct. Example:

      SELECT CASE (k)

       CASE (1:10)
         ...

       CASE (5:) ! Error; the range 5:10
         ...     ! has already been specified

       END SELECT
   

Message ID: ERROR_0749


Error : Actual argument number to statement function is not scalar.

Only scalar dummy and actual arguments can be used in statement functions.

Message ID: ERROR_0750


Error : Type of actual argument does not agree with type of associated dummy argument.

The type of the actual argument to a statement function must agree with the type of the dummy argument it is associated with.

Message ID: ERROR_0751


Error : Actual argument to statement function has a different kind type than the dummy argument.

The kind type of an actual argument to a statement function must agree with the kind type of the dummy argument it is associated with.

Message ID: ERROR_0752


Error : Statement function "%s" must not call itself recursively.

A statement function must not call itself.

Message ID: ERROR_0753


Error : Statement function is called with an incorrect number of arguments.

The number of actual arguments to a statement function call must be the same as the number of its dummy arguments.

Message ID: ERROR_0754


Error : The expression of the statement function must be a scalar expression.

Only scalar statement functions are allowed.

Message ID: ERROR_0755


Error : The type of the expression is not assignment compatible with the result of the statement function.

The statement function expression must be compatible with the statement function result according to the rules of assignment type conformance.

Message ID: ERROR_0756


Error : Operator is not intrinsic. All operations in a statement function expression must be intrinsic.

An overloaded or defined operator is specified in a statement function expression. Only intrinsic operations are allowed.

Message ID: ERROR_0757


Warning : The value to the left of the colon is greater than the value to the right of the colon.

If the case_expr of the SELECT CASE statement has the value c and a CASE selector has the form low:high, the case is selected if the expression low .LE. c .AND. c .LE. high is true. The expression being diagnosed will never have the value true, because the value to the left of the colon, low, is greater than the value to the right of the colon, high. This is, therefore, an "empty" CASE and the code in the CASE will never be executed.

Message ID: WARNING_0758


Error : This is a procedure. Statement function actual arguments must be scalar data objects.

All actual arguments to a statement function must be scalar data objects. The following attributes declare an object to be a procedure, which is not a data object.

        EXTERNAL
        INTRINSIC
        VFUNCTION
        NOSIDE EFFECTS
   

Message ID: ERROR_0759


Error : This is not a scalar data object. Statement function actual arguments must be scalar data objects.

The object must not be used as a statement function actual argument because it is not a scalar data object.

Message ID: ERROR_0760


Error : This is a procedure name, therefore it must not be used as an actual argument to a statement function.

All actual arguments to a statement function must be scalar data objects.

Message ID: ERROR_0761


Internal : Internal error in io_ctl_list_semantics.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0762


Internal : Namelist descriptor was not created.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0763


Error : The SELECT CASE case-expr is type logical therefore a colon must not appear.

A CASE selector has the following basic forms:

     CASE (case_value)
     CASE (case_value:)
     CASE (:case_value)
     CASE (case_value:case_value)
   

If the case_expr of the SELECT CASE statement is type logical, only the first form is allowed; that is, the CASE selector must not contain any ranges.

Message ID: ERROR_0764


Error : The SELECT CASE case-expr must be scalar.

The SELECT CASE statement has the form:

     [case_construct_name:] SELECT CASE (case_expr)
   

The case_expr must be scalar and of type integer, character or logical.

Message ID: ERROR_0765


Error : The case-value must be a scalar expression.

The CASE statement has the following forms:

       CASE (case_value)
       CASE (case_value:)
       CASE (:case_value)
       CASE (case_value:case_value)
   

The case_value must be scalar.

Message ID: ERROR_0766


Error : The SELECT CASE case-expr must be type integer, character, or logical.

The SELECT CASE statement has the form:

      [case_construct_name:] SELECT CASE (case_expr)
   

The case_expr must be type integer, character, or logical.

Message ID: ERROR_0767


Error : The case-value must be type integer, character, or logical.

The CASE statement has the following forms:

       CASE (case_value)
       CASE (case_value:)
       CASE (:case_value)
       CASE (case_value:case_value)
   

The case_value in the first form must be type integer, character, or logical. Each case_value in the last three forms must be type integer or character.

Message ID: ERROR_0768


Error : Unexpected syntax: Expecting certain keywords or EOS to follow the END keyword, but found something else.

The compiler is looking for an EOS or the following after the END keyword: BLOCK DATA, MODULE, PROGRAM, SUBROUTINE, FUNCTION, INTERFACE, TYPE, IF, DO, SELECT, or WHERE. The compiler did not find either the EOS or any of the keywords in the list.

Message ID: ERROR_0769


Error : The kind-selector expression must be a scalar integer initialization expression.

A kind_selector can appear with a data type attribute, such as:

     INTEGER kind_selector
   

The kind_selector has the form:

     ( [KIND=] expr)
   

where expr must be a scalar integer initialization expression. An initialization expression is essentially an expression composed of intrinsic operators, and primaries that are constants and/or references to selected intrinsic functions. The expression must be such that a resultant value can be computed at compile time. See the manual for a complete description of all the characteristics that must be satisfied for an expression to be classed as an initialization expression.

Message ID: ERROR_0770


Ansi : Use of a BOZ literal constant outside of a DATA statement is an extension to the Fortran standard.

The Fortran standard only allows BOZ literal constants in a DATA statement value list. The compiler treats them as type Boolean and allows them wherever type Boolean is allowed.

Message ID: ANSI_0771


Error : The rank of this actual argument must match that of the assumed-shape dummy argument.

When a dummy argument is declared to be an assumed-shape array, the actual argument that is associated with it must conform in type, kind type, and shape. Shape conformance means having the same rank and the same extents in each rank.

Message ID: ERROR_0772


Error : The rank of this actual argument does not match that of the dummy argument.

When the actual argument is an array expression or pointer it can only be associated with an array dummy argument of the same rank.

Message ID: ERROR_0773


Error : Improper intrinsic argument type or inconsistent types.

The type and/or the kind type of an actual argument is not valid.

Message ID: ERROR_0774


Internal : An extent tmp has unexpected IR, during bound expansion at a call site.

During bound expansion, if the extent is a tmp, the IR is assumed to be tmp = max(tmp,0). The compiler has detected something other than this.

Message ID: INTERNAL_0775


Internal : "cif_stmt_type_rec" was passed a statement type it did not expect.

cif_stmt_type_rec is probably trying to process a statement that maps to the enum value CIF_Stmt_Type_Error. The array of CIF exact statement types might have gotten out of step with the normal statement type array.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0776


Error : The actual argument to the PRESENT intrinsic must be an optional dummy argument.

The argument passed to the PRESENT intrinsic function must be a dummy argument that has the OPTIONAL attribute.

Message ID: ERROR_0777


Ansi : This format specifier is an extension to the Fortran standard.

The Fortran standard allows format specifiers to be a default character expression, a FORMAT statement label, an asterisk (*), or a scalar default integer variable. The compiler allows other forms as an extension. These include integer and real whole arrays and Hollerith or Boolean constants. These extensions are interpreted as if they contain Hollerith data.

Message ID: ANSI_0778


Error : LOC function argument must be a variable, array, or array element.

The LOC intrinsic function argument must be a variable, array, or array element. The LOC intrinsic function is an extension to the Fortran standard.

Message ID: ERROR_0779


Error : Statement label was previously defined in this derived type definition.

A derived type definition is a Fortran scoping unit. A given statement label must be defined only once in a scoping unit. A previous definition of the statement label was found within the current derived type definition.

Message ID: ERROR_0780


Error : The substring start or end value exceeds the defined range.

A character substring reference has an improper substring designator. In the following character substring reference, the substring designators, begin and end, designate the beginning and ending character positions of the substring:

    CHAR ([begin]:[end])
   

If the substring has length greater than 0 then begin and end must be greater than 0 and less than or equal to the number of characters in the entity, CHAR. If end is less than begin the substring has length 0.

Message ID: ERROR_0781


Internal : List entry has a variant problem with field.

A list table entry has been used incorrectly. This is probably the result of using the field IL_PREV_LIST_IDX when IL_ARG_DESC_VARIANT is true or using IL_ARG_DESC_IDX when IL_ARG_DESC_VARIANT is false.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0782


Error : The TARGET argument must have the TARGET attribute or the POINTER attribute.

The second argument to the ASSOCIATED intrinsic function must be a pointer or a target.

Message ID: ERROR_0783


Error : The first argument to this intrinsic must have the POINTER attribute.

This argument must be a pointer.

Message ID: ERROR_0784


Error : The autotasking directive must only be used within a parallel region bounded by PARALLEL/ENDPARALLEL directives.

One of the following autotasking directives is not within a parallel region or is inside a guarded region. The following directives must only be used within a parallel region bounded by the PARALLEL/ENDPARALLEL directives.

     CASE
     ENDCASE
     DO PARALLEL
     END DO
   

Message ID: ERROR_0785


Error : An actual argument must be definable when associated with a dummy argument that has INTENT(OUT) or INTENT(INOUT).

A dummy argument that has either the INTENT(OUT) or INTENT(INOUT) attribute can only be associated with an actual argument that can be defined. It is an error to associate an expression, a constant, or a vector subscript array section with such a dummy argument. It is also an error to use an INTENT(IN) dummy argument as an actual argument that is associated with such a dummy argument.

Message ID: ERROR_0786


Ansi : Intrinsic "%s" is an extension to the Fortran standard.

This intrinsic procedure is an extension to the Fortran standard.

Message ID: ANSI_0787


Log_Warning : If -G0 (full debug) is specified, all optimizations are turned off.

Use of the -G0 debug option requires all optimization to be turned off. This compilation will be handled as if -O0 was specified on the command line. Optimized debugging is turned on with different levels of the -G option.

Message ID: LOG_WARNING_0788


Error : The case-value-range is missing both its case-values.

When a case_value range of a CASE statement case_selector contains a colon, the case_value_range must have one of the forms

        case_value:
   or   :case_value
   or   case_value:case_value
   

A case_value_range has been encountered that is missing both its left and right case_values.

Message ID: ERROR_0789


Warning : Unknown compiler directive or syntax error.

A misspelled or unrecognized compiler directive was encountered.

Message ID: WARNING_0790


Error : This is not a module, therefore it must not be specified on the USE statement as the module-name.

The name specified on the USE statement as the module name is already known to this scope as something other than a module name. The module_name can only be a module name. Following is an example of the error.

    PROGRAM ABC
    USE MOD_M :: BAD => R ! New local variable, BAD
    USE BAD               ! Illegal - BAD is a local
                          !    variable in this scope.
    END PROGRAM
   

Message ID: ERROR_0791


Error : This is the name of the module being compiled. It must not be specified on a USE statement.

A module must not use itself, as in this example:

    MODULE MODULE_M
    USE MODULE_M   ! This is illegal
     ...
    END MODULE
   

Message ID: ERROR_0792


Error : Module has no public entities declared in the module, therefore names specified in the only-list cannot be found.

The module specified on the USE statement is empty, which means that none of the names specified on the only_list will be found. The module could appear to be empty because all the module entities are private, the module has compilation errors, or the file containing the module information is corrupted.

Message ID: ERROR_0793


Error : CDIR$ INTEGER= must either precede a program unit or must precede any statements within the program unit.

The INTEGER= compiler directive must be seen by the compiler before any declarative or executable statements are encountered. This means that it can precede the program unit or it must immediately follow the program unit header statement. The following examples show the two contexts that are allowed. The INTEGER= compiler directive is not allowed in interface bodies, internal procedures or module procedures.

   CDIR$ INTEGER = 64
         integer i
         i = 10
         end

         subroutine sub
   CDIR$ INTEGER = 46
         i = 10
         end
   

Message ID: ERROR_0794


Warning : CDIR$ is only allowed within a program unit.

A compiler directive is outside a program unit. It must be specified in the program unit.

Message ID: WARNING_0795


Error : The value specified for the SAFEVL= value on the IVDEP directive must be a scalar integer constant.

A safe vector length for the IVDEP compiler directive must be a scalar integer constant expression so that the compiler can evaluate it at compile time.

Message ID: ERROR_0796


Log_Warning : The command line has an unsupported option.

This command-line option is not supported on this hardware. The option is ignored.

Message ID: LOG_WARNING_0797


Error : Unexpected parameter or work distribution for DO ALL directive.

The DO ALL directive allows the following parameters and work distributions:

     IF(expr)
     SHARED(variable_list)
     PRIVATE(variable_list)
     AUTOSCOPE
     CONTROL(variable_list)
     SAVELAST
     MAXCPUS(n)

     SINGLE
     CHUNKSIZE(n)
     NUMCHUNKS(m)
     GUIDED [vl]
     VECTOR
   

Message ID: ERROR_0798


Ansi : The use of this character as a continuation character is an extension to the Fortran standard.

The use of a character that is not in the Fortran character set is allowed as a continuation line indicator in fixed source form. This is an extension to the Fortran standard.

Message ID: ANSI_0799


Error : Only one work distribution must be specified on a DO ALL directive.

More than one work distribution is illegal on a DO ALL directive.

Message ID: ERROR_0800


Warning : Unsupported compiler directive.

The compiler encountered a compiler directive that is recognized but not supported. This occurs because the compiler directive is not relevant to supported hardware or because support for the compiler directive is deferred until a future release.

Message ID: WARNING_0801


Error : Variable subobjects are not allowed as arguments for this parameter of a tasking compiler directive.

When a tasking compiler directive defines scope or context for a parallel region, it must be for whole variables, not variable subobjects. The following code fragment is not allowed.

         TYPE X
            INTEGER I
         ENDTYPE

         TYPE(X) :: K

   CMIC$ DO ALL SHARED(K%I)
   

Message ID: ERROR_0802


Error : The expression for the tasking directive parameter IF must be a scalar logical expression.

The IF parameter for the tasking compiler directives DO ALL and PARALLEL requires a scalar logical expression.

Message ID: ERROR_0803


Caution : This is not a variable and will be ignored in the list of this directive.

An object other than a variable is in a SHARED, PRIVATE, or CONTROL list on a tasking compiler directive statement. It is ignored.

Message ID: CAUTION_0804


Error : Object is declared both SHARED and PRIVATE.

On a tasking directive statement, a variable is listed in both the PRIVATE and SHARED variable lists.

Message ID: ERROR_0805


Error : This argument on a tasking directive must be a scalar integer expression.

The arguments to the MAXCPUS, CHUNKSIZE, NUMCHUNKS, or GUIDED parameters or work distributions on a tasking directive must be scalar integer expressions.

Message ID: ERROR_0806


Error : The SHAPE argument must be a constant size rank one array with 7 or less elements.

The SHAPE argument to the RESHAPE intrinsic function must be an array of rank one and must not have more than 7 elements.

Message ID: ERROR_0807


Error : Unexpected work distribution for DO PARALLEL directive.

The following are the allowed work distributions for the DO PARALLEL compiler directive:

     SINGLE
     CHUNKSIZE(n)
     NUMCHUNKS(m)
     GUIDED [vl]
     VECTOR
   

Message ID: ERROR_0808


Error : Unexpected parameter for the PARALLEL compiler directive.

The following are the allowed parameters for the PARALLEL directive.

     IF(expr)
     SHARED(variable_list)
     PRIVATE(variable_list)
     AUTOSCOPE
     CONTROL(variable_list)
     SAVELAST
     MAXCPUS(n)
   

Message ID: ERROR_0809


Internal : This has a bad linear type.

The linear type for the given object is Err_Res. This needs to be set to the correct linear type so that storage can be assigned.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0810


Error : The case-value expression must be an initialization expression.

In a CASE statement of the form:

        CASE (case_value_range_list)
   
case_value_range must have one of the following forms:
       case_value
       case_value:
       :case_value
       case_value:case_value
   

Each case_value must be a scalar integer, character, or logical initialization expression. The case_value must also be of the same type as the expression in the corresponding SELECT CASE statement. A character or logical initialization expression is the same as a character or logical constant expression. An integer initialization expression is an integer constant expression in which the exponentiation operation is permitted only with an integer power.

Message ID: ERROR_0811


Error : This ENDCASE autotasking directive has no matching CASE directive.

An ENDCASE directive can only be used to close a set of concurrent regions delimited by CASE directives.

Message ID: ERROR_0812


Error : This END DO directive has no matching DO PARALLEL directive.

An END DO autotasking directive can only be used after a DO PARALLEL directive. The error could be caused by the two directives being placed in separate parallel regions.

Message ID: ERROR_0813


Error : This DO ALL autotasking directive is already within a parallel region.

The DO ALL directive creates a parallel region that is the body of the next DO loop. It cannot be used within another parallel region.

Message ID: ERROR_0814


Error : Unexpected nesting or overlap of GUARD regions.

Regions protected by a GUARD/ENDGUARD directive pair must not overlap or be nested. This message will be issued if two or more GUARD directives are encountered before an ENDGUARD.

Message ID: ERROR_0815


Error : Matching GUARD/ENDGUARD directives must both have the same flag argument or have no argument.

If a mutual exclusion flag is supplied on a GUARD or ENDGUARD autotasking directive, the same value must be specified for the matching directive.

Message ID: ERROR_0816


Error : This ENDGUARD directive has no matching GUARD directive.

An ENDGUARD autotasking directive was encountered without a matching GUARD directive.

Message ID: ERROR_0817


Error : The PARALLEL directive must not be used within another parallel region.

The PARALLEL autotasking directive, which marks the entry of a parallel region, must not be used within another parallel region.

Message ID: ERROR_0818


Error : This END PARALLEL directive has no matching PARALLEL directive.

The END PARALLEL autotasking directive must only be used after a PARALLEL directive within the same scoping unit.

Message ID: ERROR_0819


Error : An END CASE directive was expected before the end of the previous parallel region.

An END PARALLEL autotasking directive was encountered which ended a parallel region. There were CASE directives within this region but no closing END CASE directive.

Message ID: ERROR_0820


Error : A call to an internal procedure is illegal within a parallel region.

A call to an internal function or subroutine cannot be made from within a parallel region. This includes regions bounded by PARALLEL/ENDPARALLEL directives or from within the body of a DO ALL loop.

Message ID: ERROR_0821


Error : An autotasking directive was expected.

All parallel and guarded regions must be terminated before entering or terminating a scope. If a CONTAINS statement or END, END FUNCTION, or END SUBROUTINE statement is encountered while in a parallel region or guarded region, an error is issued.

Message ID: ERROR_0822


Error : Two different common blocks are equivalenced together.

Through an EQUIVALENCE statement the user has tried to overlay two different common blocks. This is illegal. For example:

          PROGRAM BAD
          COMMON /ONE/ A,B,C
          COMMON /TWO/ D,E,F

          EQUIVALENCE(A,D) ! Illegal
          END
   

Message ID: ERROR_0823


Internal : The pdgcs symbol table index for an attribute index is 0. This must be a valid index.

A call is being made to the PDGCS interface, which requires a valid PDGCS symbol table index as one of its arguments. This must be a valid index, but the compiler detected a NULL index.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0824


Warning : The object being initialized is not a member of any common block declared in this block data program unit.

A block data program unit is used to provide initial values for data objects in named common blocks. By extension, objects in blank common may also be initialized in a block data program unit.

The object being initialized is not a member of any common block (named or blank) declared in the block data program unit being compiled. The object's initialization will have no effect outside of the block data subprogram, because the object is not a member of a common block. The initialization should be removed or the item should be made a member of a (preferably named) common block.

Message ID: WARNING_0825


Error : Two different objects in the same common block are equivalenced together.

Two different objects within the same common block must not be overlayed such that it would change the storage sequence of the common block. Example:

        PROGRAM BAD
        COMMON // A,B,C
        EQUIVALENCE (A,C)  ! This is illegal
        END
   

Message ID: ERROR_0826


Error : This is used in an expression, before it is typed via an implicit or type statement, so the type is assumed.

When an object is used in an expression, it is implicitly typed if it is the first reference to this object. The object can subsequently be typed in a type declaration statement only if it confirms the type.

Example:

        DIMENSION ARRAY(K)
        REAL K          ! Illegal
   

K can only be typed integer, because that is what it is implicitly typed as in the DIMENSION statement. Also, if an object is referenced before an implicit statement that would reset its type, its original implicit type remains.

Message ID: ERROR_0827


Internal : Unsupported operator in folder_driver.

Internal compiler error. The driver for the expression folder was called with an invalid operator.

Message ID: INTERNAL_0828


Error : All ac-value expressions in an array constructor must have the same type and type parameters.

An element of an array constructor was encountered that had a different type or kind type than the rest of the elements.

Message ID: ERROR_0829


Error : There must be only one or zero arguments present when calling this intrinsic.

There must be only one or zero arguments present when calling this particular intrinsic procedure.

Message ID: ERROR_0830


Error : The value of this subscript is less than the declared lower bound.

A subscript value must be greater than or equal to the declared lower bound of the corresponding dimension.

Message ID: ERROR_0831


Internal : The compiler has detected a local name table following the scope.

When use_stmt_semantics is being executed, it assumes that it is the current scope being worked on and that the local name table is being created at the end of the local name table. The compiler detected another scope's local name table entries following this scopes local name table entries.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0832


Error : The argument to this intrinsic must be an allocatable array.

The actual argument to this intrinsic procedure must be an allocatable array.

Message ID: ERROR_0833


Error : The shape of the initialization expression value does not match that of named constant.

The shape of the initialization expression result value must match the shape of the corresponding named constant.

Message ID: ERROR_0834


Error : The initialization of scalar named constant with an array-valued expression is not valid.

A scalar named constant must only be given a scalar value.

Message ID: ERROR_0835


Internal : Compiler tmp does not have a storage block assigned to it.

All compiler tmps must have a storage block assigned to them when they are created. The compiler detected a compiler tmp without a storage block at the end of pass2 semantics during storage offset assignment.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0836


Ansi : An implied-DO variable that is not scalar is an extension to the Fortran standard.

An implied-DO list in a DATA statement or in an array constructor contains an implied-DO loop control variable that is not scalar.

The DATA statement implied-DO has the form:

      (data_i_do_object_list, data_i_do_variable =
           scalar_int_expr, scalar_int_expr
   	[, scalar_int_expr])
   

The array constructor implied-DO has the form:

      (ac_value_list, ac_do_variable =
            scalar_int_expr, scalar_int_expr
           [, scalar_int_expr])
   

A correction to the Fortran standard as a response to an interpretation request expands on the rules for implied-DO loop control variables that are statement entities (the I/O implied-DO variable is not a statement entity). Essentially, it states that a statement entity can have the same name as a common block name or an integer scalar variable in the scoping unit containing the DATA statement or array constructor. Therefore, a statement entity cannot have the same name as an external procedure, an internal procedure, a module procedure, a named constant, a construct name, a generic name, a derived type name, an array, and so on. Also, because it must be type integer, it cannot have the same name as an entity declared to be of a type other than integer.

Sun f90 extends the standard by allowing a data_i_do_variable or ac_do_variable to have the same name as an integer array.

Message ID: ANSI_0837


Error : Array constructor values of type character must all have the same length.

Array constructor values must all possess the same type and type parameters. This includes the character length.

Message ID: ERROR_0838


Internal : The assumed-length character bounds entry from decl_semantics is not valid.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0839


Error : This is substringed but not declared type character, or the object is subscripted but not dimensioned.

The user tried to equivalence an incorrectly declared variable. A substringed object must be type character and a subscripted object must be an array.

Message ID: ERROR_0840


Error : The start value of the section subscript triplet is less than the declared lower bound.

In a section subscript that is a triplet subscript, the start value must be greater than or equal to the declared lower bound of the array. For example, if an array is declared as follows:

         INTEGER  array(10)
   
the start value of a section subscript triplet referencing ARRAY must be equal to or greater than 1.

Message ID: ERROR_0841


Error : The initialization expression used on a type declaration statement must be a constant expression.

The expression used to initialize a data object on a type declaration statement must evaluate to a constant value.

Message ID: ERROR_0842


Error : The data type of this object is incompatable with the data type in this initialization assignment.

The variable becomes defined with the value determined from the initialization expression. This must meet the rules of intrinsic assignment as defined in the Fortran standard. The type of the specified variable and the type of the value do not meet the rules of intrinsic assignment.

Message ID: ERROR_0843


Error : The initialization of scalar variable "%s" with an array-valued expression is not valid.

A scalar variable must only be given a scalar value.

Message ID: ERROR_0844


Error : The shape of the initialization expression does not match that of the variable.

The shape of the initialization expression must match the shape of the corresponding variable.

Message ID: ERROR_0845


Internal : Storage block should be in the storage block table for the local scope, but is not.

During conversion to PDGCS, send_stor_blk found a host associated static storage block, that does not have a storage block in the local scope. All of these host associated storage blocks should have been entered into the local storage block during attr_link_resolution.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0846


Internal : "%s" does not have a storage block.

Every non-constant data object should have a storage block assigned to it. If this is an interface block, the storage block must be assigned by the end of decl_semantics. If this is not an interface block, a storage block must be assigned by the time the object is sent thru the interface to PDG.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0847


Error : Dummy argument is longer than the actual argument.

A statement function is being referenced with an actual argument of type character whose length is shorter than that of its associated dummy argument in the statement function definition. Actual arguments of type character must have a length that is greater than or equal to that of the associated dummy argument.

Message ID: ERROR_0848


Error : The start value of the section subscript triplet is greater than the declared upper bound.

In a section subscript that is a triplet subscript, the start value must be less than or equal to the declared upper bound of the array. For example, if an array is declared as follows:

         INTEGER  array(10)
   
the start value of a section subscript triplet referencing ARRAY must be equal to or less than 10.

Message ID: ERROR_0849


Internal : This is host associated and on the stack, but it is not in a host associated stack storage block.

During final_decl_semantics, the compiler found an object that is host associated, but is not in a host associated storage block. All host associated stack variables, must be in a host associated stack storage block.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0850


Error : A task common block member must not be data initialized.

The indicated object is declared to be a member of a TASK COMMON block; therefore it must not be initialized.

Message ID: ERROR_0851


Internal : Host associated object must be referenced or defined by a contained procedure.

During conversion to PDGCS, a host associated dummy argument or variable has been found that does not have the AT_REF_IN_CHILD or AT_DEF_IN_CHILD flag set. To be host associated, an object must be referenced or defined by a contained procedure.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0852


Error : The target must have the same character length as the pointer in a pointer assignment statement.

The type parameters of the target and the pointer used in a pointer assignment statement must agree. That includes the character length if the types of the target and pointer are character. This also applies to a structure constructor expression that corresponds to a pointer component.

Message ID: ERROR_0853


Error : The compiler cannot open the file, which may contain information about the used module.

The compiler cannot open the specified module file for USE statement processing. Check permissions for the file and for the directory. If this is a non-Cray Research system, the compiler may be attempting to open a .M file. This file was specified on the command line as -p x.o.

Message ID: ERROR_0854


Error : The compiler has detected errors in the module. No module information file will be created for this module.

The compiler detected errors in the module; therefore, no module information file will be created for this module. Errors can cause the information in the module information file to be unreliable.

Message ID: ERROR_0855


Error : DO loop iteration count exceeds the compiler limit of iterations.

A DO statement specifies an iteration count (number of times through the loop) that exceeds the maximum allowed for the target machine.

For the following statement, the iteration is calculated to be (end - start + inc) / inc

     DO [label] [,] do_variable = start, end [, inc]
   

Message ID: ERROR_0856


Internal : DO loop iteration count calculation failed.

The compiler is trying to calculate the iteration count for a DO loop or implied-DO at compile time (when the start, end, and increment values are all constants or all constant expressions).

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0857


Error : An object with the SAVE attribute must not be equivalenced to an object in a common block.

The user tried to equivalence a saved object to a common block.

Message ID: ERROR_0858


Error : A variable subobject is not valid on a SUPPRESS directive.

Only variable names are allowed on SUPPRESS directives. Structure components, array elements or sections and character substrings are not allowed.

Message ID: ERROR_0859


Error : The intrinsic cannot be passed as an actual argument.

This intrinsic procedure name cannot be in an actual argument list.

Message ID: ERROR_0860


Internal : Bad IR.

Improperly formed internal text.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0861


Error : The storage order of this object has been altered through equivalencing.

By equivalencing an object in a certain way the user changed the storage order of the object. For example:

    DIMENSION IA(10)
    COMMON /AA/ A,B,C,D,E,F,G,H,I,J,K
    EQUIVALENCE (IA(1), A)
    EQUIVALENCE (IA(2), C) ! Illegal; changes order of IA
    END
   

Message ID: ERROR_0862


Error : This has been referenced in the function character length expression, therefore it must not be declared in this way.

The compiler detected a conflict between a use and a declaration for an object. The object being declared was referenced in the function character length expression, which prohibits it from being declared as any of the following items:

           Cray pointer
           Cray pointee
           Cray character pointee
           function result
           derived type
           namelist group
           construct name
           alternate function entry
           subroutine
   

Message ID: ERROR_0863


Error : This has been referenced in the function character length expression, so it must not be a subroutine.

The object is referenced in the function character length expression, which prohibits it from being a subroutine in an interface block or from being used as a subroutine.

Message ID: ERROR_0864


Log_Warning : Inline option conflict detected. Non-automatic mode selected.

This message is issued when both -O inline[0-3] and -I filename are specified on the command line. Nonautomatic inlining is selected.

Message ID: LOG_WARNING_0865


Error : The function character length expression references "%s", therefore it must not be used as a derived-type name.

The compiler detected a conflict between uses of this object. The object being declared is referenced in the function character length expression, which prohibits it from being used as a derived-type name.

Message ID: ERROR_0866


Warning : Module has no public objects declared in the module, therefore nothing can be use associated from the module.

The module specified on the USE statement is apparently empty. This can be caused by one of several reasons:
-- The module contains no declarations in its specification part.
-- Everything in the module is declared private.
-- The module has compilation errors.

Message ID: WARNING_0867


Error : This is used in a constant expression, therefore it must be a constant.

This expression must be a constant initialization expression. Every identifier referenced in this expression must be declared to be a constant before this expression.

Message ID: ERROR_0868


Error : This has been typed, but the intrinsic procedure with the same name is a subroutine and subroutines cannot be typed.

The name specified with the INTRINSIC attribute is an intrinsic subroutine. A subroutine must not be typed. Example:

     REAL, INTRINSIC :: DATE_AND_TIME
   
DATE_AND_TIME is an intrinsic subroutine. A subroutine must not be typed, so this is not a valid statement.

Message ID: ERROR_0869


Error : The intrinsic call is not valid in a specification expression.

The specification expression contains a reference to an intrinsic function that is not allowed in a specification expression. The intrinsic function must have a scalar integer result.

Message ID: ERROR_0870


Internal : Field for statement header indexes to itself.

Something is wrong with the statement header linkage. The specified statement header indexes to itself via the SH_NEXT_IDX field or the SH_PREV_IDX field.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0871


Error : The implied-do-object-list is missing for this implied-DO.

An implied-DO was encountered within an array constructor or in an I/O list and it did not have an object list. The following is an example of an implied-DO that is not allowed.

      PRINT *, (I=1,10)
   

Message ID: ERROR_0872


Internal : The length tmp can only have one statement associated with it. This one has multiple statement headers.

This message is issued from insert_sh_after_entries. The compiler is attempting to change a length bound to length = 0, but the length bound has multiple statement headers. This should not happen. Only the actual bound entries can have multiple statement headers. Lengths and extents should only be one statement in length.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0873


Error : The argument to the compiler directive ID must be a character literal.

Something other than a character literal constant was encountered on a CDIR$ ID line.

Message ID: ERROR_0874


Error : This actual argument must not be an optional dummy argument.

The particular actual argument must not be an optional dummy argument in this context.

Message ID: ERROR_0875


Error : This has the AUXILIARY attribute and is in the specification part of a module, therefore it must be in a common block.

The AUXILIARY attribute is an extension to the Fortran standard. Auxiliary storage blocks can be specified in the specification part of a module only if these storage blocks are common blocks.

Message ID: ERROR_0876


Log_Warning : The -u options are ignored because this not a DEBUG version of the compiler.

The -u options are used to debug the compiler and are only available with a DEBUG compiler.

Message ID: LOG_WARNING_0877


Caution : A module of this name has already been directly or indirectly use associated into this scope.

A module name is a global name and by definition, all global names must be unique. The compiler detected more than one module with the same name in this scope and assumes that they are the same module. This can happen because a module can be directly or indirectly use associated into a scoping unit. An example would be:

      MODULE ABC
      INTEGER I
      END MODULE

      MODULE CDE
      USE ABC
      END MODULE

      PROGRAM BBB
      USE CDE
      USE ABC  ! ABC is already in this scope via CDE
      END MODULE
   

Message ID: CAUTION_0878


Error : The bloc or eloc variables must not be of derived type in a BUFFER I/O statement.

Because the I/O libraries must do implicit type conversion in BUFFER IN and BUFFER OUT operations, begin (bloc) and end (eloc) variables of derived type are not supported.

         BUFFERIN (id,m) (bloc,eloc)
         BUFFEROUT (id,m) (bloc,eloc)
   

Message ID: ERROR_0879


Error : Operator is not intrinsic. All operations in a specification expression must be intrinsic.

All operations in a specification expression must be intrinsic operations. The specification expression must not contain defined operators or overloaded operators.

Message ID: ERROR_0880


Error : The value of DIM must be: 1 <= DIM <= (rank of MASK).

The value of the DIM argument must be >= 1 or <= the rank of MASK.

Message ID: ERROR_0881


Error : Derived type has private components, which means component name must not be referenced.

When a derived type is declared in a module, the components must be declared to be private. This means that any procedure use associating this derived type does not have access to the component names or the internal structure of the derived type.

Message ID: ERROR_0882


Error : Derived type has private components, therefore a structure constructor must not be defined for this type.

When a derived type is declared in a module, the components must be declared to be private. This means that any procedure use associating this derived type does not have access to the component names or the internal structure of the derived type. Structure constructors of the derived type must not be used, because the internal structure of the derived type is unknown.

Message ID: ERROR_0883


Internal : Verify_interface has found a bad dummy argument in the dummy argument list for procedure.

Verify_interface expects all dummy arguments to be Data_Objs or Pgm_Units. It found something else in the list. This replaces the printf that said "dummy not data or pgm in verify_interface."

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0884


Log_Warning : Inlining is a deferred implementation.

Inlining will be implemented in a future release.

Message ID: LOG_WARNING_0885


Log_Warning : Implementation of this debugging level is deferred.

The -G 2 and -G 3 debugging level options will be implememented in a future release.

Message ID: LOG_WARNING_0886


Log_Warning : The optimization level should be different based on the debugging level.

The optimization level is set too high for the debug level. Lower the optimization level using the -O command-line option.

Message ID: LOG_WARNING_0887


Error : The BOUNDARY argument must be present if the ARRAY argument is of derived type.

The BOUNDARY argument must be present if ARRAY is of derived type.

Message ID: ERROR_0888


Error : The upper bound or extent of an assumed-size array must not be requested.

Requesting the upper bound or extent of the last dimension of an assumed-size array is not allowed.

Message ID: ERROR_0889


Error : This is a dummy argument with INTENT(IN), therefore it must not be defined.

When a dummy argument is specified with INTENT(IN), neither it nor any of its subobjects can be defined.

Message ID: ERROR_0890


Internal : Attribute has no TYPE. It should because it is a Data_Obj.

Every Data_Obj should have a type.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0891


Comment : The H edit descriptor is an obsolescent feature.

Instead of using the H edit descriptor, the Fortran standard recommends using the character constant edit descriptor.

An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which a better method is available in Fortran. The ANSI Fortran committee recommends that programmers use the preferred method in new programs and convert existing code to the preferred method. If the use of an obsolescent feature becomes insignificant in Fortran programs, a future Fortran standards committee may consider deleting it from the standard.

Message ID: COMMENT_0892


Internal : Fields for entry must both be set to a legal value. One field is set and the other is clear.

There are table index fields in the symbol tables that are dependent on field descriptors, so that we know which table the index is for. The detected an index with a Null_Idx field descriptor. Related fields are

     ATD_FLD	ATD_CONST_IDX
     ATD_FLD	ATD_TMP_IDX
     BD_LEN_FLD	BD_LEN_IDX
     BD_LB_FLD	BD_LB_IDX
     BD_UB_FLD	BD_UB_IDX
     BD_XT_FLD	BD_XT_IDX
     BD_SM_FLD	BD_SM_IDX
   

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0893


Error : Module has compile errors, therefore declarations obtained from the module via the USE statement may be incomplete.

The specified module is in this compilation unit, but it has compile time errors. Declarations obtained from this module may not be valid. Recompile the module and the procedure that references the module.

Message ID: ERROR_0894


Internal : Intrinsic operator encountered in constant constructor that has no folder.

No folder exists for this intrinsic but it is in a constant constructor.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0895


Error : The data item length must be equal for bloc and eloc in a BUFFER I/O statement.

Only certain combinations of data types are allowed for the bloc and eloc parameters to BUFFER IN and BUFFER OUT. The allowed combinations are as follows:

      real - real
      integer - integer
      logical - logical
      integer - real
      logical - integer
      logical - real
      double precision - double precision
      double precision - complex
      complex - complex
      character - character
   
      BUFFERIN (id,m) (bloc,eloc)
      BUFFEROUT (id,m) (bloc,eloc)
   

Message ID: ERROR_0896


Error : This call to VFUNCTION is not allowed inside a WHERE block or on a WHERE statement.

The compiler extension VFUNCTION is not supported for calls under a WHERE mask.

Message ID: ERROR_0897


Error : This is declared as a scalar variable in a module, therefore it must not be used as an external function name.

When an object is declared in a module, its attributes are complete. Its attributes must not be respecified by another declaration statement or by its use as an external function call. The following example illustrates the problem.

    MODULE M
    INTEGER I        ! I is a scalar variable
    END MODULE

    SUBROUTINE P2()
    USE M
    II = I(6)        ! Illegal reference of I
    END SUBROUTINE
   

Message ID: ERROR_0898


Ansi : Use of the tab character is an extension of the Fortran standard.

The use of the tab character is allowed as an extension to the Fortran standard.

Message ID: ANSI_0899


Ansi : Use of the "@" character in identifiers is an extension to the Fortran standard.

The use of the @ character is allowed as an extension to the Fortran standard.

Message ID: ANSI_0900


Ansi : Use of the "$" character in identifiers is an extension to the Fortran standard.

Use of the $ character in identifiers is allowed as an extension to the Fortran standard.

Message ID: ANSI_0901


Internal : The char_len.fld is Null_Idx in create_runtime_array_constructor.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0902


Ansi : Constant length character array constructor values with unequal lengths are nonstandard.

As an extension to the Fortran standard, type character array constructors are allowed to have character values with unequal lengths. This is allowed only if the lengths are constant. The longest constant length is chosen as the element length for the array constructor. All shorter ac_values are padded to this length.

Message ID: ANSI_0903


Internal : Call_Opr in constant constructor that was not an intrinsic.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0904


Error : The section subscript triplet produces a subscript value greater than the declared upper bound.

In a section subscript that is a triplet subscript, each subscript value must be greater than or equal to the declared lower bound of the array and must be less than or equal to the declared upper bound of the array. For example, if an array is declared as follows:

   INTEGER  array(10)
   
each subscript value of a section subscript triplet referencing ARRAY must be equal to or greater than 1 and must be equal to or less than 10.

Message ID: ERROR_0905


Error : A structure constructor in a DATA statement value list must represent a constant value.

Each component of a structure constructor in a DATA statement value list must be an initialization expression.

Usually each primary of an initialization expression must be a constant (either a named constant or a literal constant), or a subobject of a constant. There are also limited cases where the primaries must be certain intrinsic functions, or array constructors that are constant expressions.

Because the DATA statement value is a structure constructor, each of its components must obey the rules for an initialization expression. Thus, for example, in a DATA statement value list, a structure constructor containing a variable would not be a constant value and therefore would not be an initialization expression.

Message ID: ERROR_0906


Error : All bounds and kind selector specification expressions must be scalar.

The compiler detected a nonscalar expression in a bounds expression or in a kind selector expression. Bounds expressions are used to declare array dimension size and character length and must always be scalar and type integer. Kind selector expressions must always be scalar integer constants and are used to declare the kind of a type.

Message ID: ERROR_0907


Caution : This integer constant is too large to be used in a 46-bit multiply or divide.

The use of this value in a 46-bit multiply or divide may produce a floating point exception if its value is hidden from the compiler. This may occur when a constant or variable with a value exceeding the 46-bit maximum is passed as an actual argument to a subroutine or function which tries to perform the multiply or divide. To prevent this, compile with -i64 option. The -i46 option is the default.

Message ID: CAUTION_0908


Error : There are not enough registers available to make this vfunction call.

A call to a VFUNCTION can pass a maximum of seven single-word items or three double-word items. These can be mixed in any order, with a maximum of seven words. This call to a VFUNCTION passes more than seven words of arguments. Functions classed as VFUNCTIONs are an extension to the Fortran standard.

Message ID: ERROR_0909


Error : Arguments of derived type or type character are not allowed for vfunction calls.

All the arguments to a VFUNCTION must fit in seven registers. Only expressions of type integer, real, complex, or logical are allowed and the total number of words must not be greater than seven. Functions classed as VFUNCTIONs are an extension to the Fortran standard.

Message ID: ERROR_0910


Log_Warning : An assembly language file (-eS or -S filename) disables an assembly language listing (-rg). Output file selected.

The compiler cannot create an assembly language listing and an assembly language output file at the same time. The last option specified is the option selected.

Message ID: LOG_WARNING_0911


Log_Summary : f90-912: %d ERRORS found in command line. Compilation aborted.

This message gives a summary of error messages issued during command-line processing. If any errors are found during command-line processing, compilation is aborted.

Message ID: LOG_SUMMARY_0912


Log_Warning : A binary output file must be enabled to get an assembly language listing. (-rg)

A binary (-eB or -b filename or default) output file must be enabled to get an assembly language listing. For example:

     -dB -er  file.f
   

This will receive the warning message.

Message ID: LOG_WARNING_0913


Error : This has the DIMENSION attribute, therefore it must have an explicit interface to be used as a function.

If a function has an array-valued result, it must have an explicit interface. An explicit interface can be supplied by an interface block or by specifying the function as an internal or module subprogram.

Message ID: ERROR_0914


Error : This has the POINTER attribute, therefore it must have an explicit interface to be used as a function.

If a function has a pointer-valued result, it must have an explicit interface. An explicit interface can be supplied by an interface block or by specifying the function as an internal or module subprogram.

Message ID: ERROR_0915


Error : This has a variable length character result, therefore it must have an explicit interface.

If a function has a variable length character result, it must have an explicit interface. An explicit interface can be supplied by an interface block or by specifying the function as an internal or module subprogram. Specifying the EXTERNAL attribute does not give an explicit interface.

Message ID: ERROR_0916


Log_Error : The CIF option has an illegal argument.

The -C command-line option is being passed an invalid argument.

Message ID: LOG_ERROR_0917


Warning : Function "%s" has a pointer result, but the result has not been pointer assigned or allocated.

A pointer must be associated before it is referenced. This function has a result that is a pointer, but the result has not been specified in a pointer assignment statement or an ALLOCATE statement.

Message ID: WARNING_0918


Error : This has been host associated and used as a named constant, therefore it must not be redeclared as an internal procedure.

This object was declared to be a named constant in a host scope. The object must not be declared as an internal procedure, because it is host associated from the host scope and used as a named constant in an initialization expression in the local scope.

Message ID: ERROR_0919


Error : This is host associated, therefore it must not be redeclared with that attribute.

An object is host associated if it is declared in the host scope and used in the local scope. After an object is host associated in a scope, it must not be redeclared. The compiler detected something similar to this:

   PROGRAM ABC
   INTEGER I
   ...
   CONTAINS
     SUBROUTINE SUBR(A)
     DIMENSION A(I)

     SAVE I  ! Illegal; I used in DIMENSION statement
     END SUBROUTINE
   END PROGRAM
   

Message ID: ERROR_0920


Error : This is host associated, therefore it must not be redeclared in this way.

An object is host associated if it is declared in the host scope and used in the local scope. After an object is host associated into a scope, it must not be redeclared.

Message ID: ERROR_0921


Error : This has been use associated, therefore it must not be redeclared with that attribute.

After an object has been use associated, it cannot be specified in any specification statements.

Message ID: ERROR_0922


Error : This has been use associated, therefore it must not be redeclared in that way.

After an item has been use associated, it must not be specified in any specification statements, other than being given the PUBLIC or PRIVATE attribute.

Message ID: ERROR_0923


Error : This is host associated into this scope, so it cannot be redeclared as variable length character.

An object is host associated if it is declared in the host scope and used in the local scope. After an object is host associated in a scope, it must not be redeclared.

Message ID: ERROR_0924


Error : This has been use associated, therefore it must not be redeclared as variable length character.

After an item has been use associated, it must not be specified in any specification statements, other than being given the PUBLIC or PRIVATE attribute.

Message ID: ERROR_0925


Error : This is host associated, therefore it must not be redeclared with the DIMENSION attribute.

An object is host associated if it is declared in the host scope and used in the local scope. After an object is host associated in a scope, it must not be given the DIMENSION attribute.

Message ID: ERROR_0926


Error : This has been use associated, therefore it must not be redeclared with the DIMENSION attribute.

After an item has been use associated, it must not be specified in any specification statements, other than being given the PUBLIC or PRIVATE attribute.

Message ID: ERROR_0927


Error : This is host associated, therefore it must not be redeclared in a common block.

An object is host associated if it is declared in the host scope and used in the local scope. After an object is host associated in a scope, it must not be redeclared.

Message ID: ERROR_0928


Error : This has been use associated, therefore it must not be redeclared in a common block.

After an item has been use associated, it must not be specified in any specification statements, other than being given the PUBLIC or PRIVATE attribute.

Message ID: ERROR_0929


Error : This is host associated, therefore it must not be redeclared as a function.

An object is host associated if it is declared in the host scope and used in the local scope. After an object is host associated in a scope, it must not be redeclared.

Message ID: ERROR_0930


Error : This has been use associated, therefore it must not be redeclared as a function.

After an item has been use associated, it must not be redeclared.

Message ID: ERROR_0931


Error : This is host associated, therefore it cannot be redeclared as a subroutine.

An object is host associated if it is declared in the host scope and used in the local scope. After an object is host associated in a scope, it must not be redeclared.

Message ID: ERROR_0932


Error : This has been use associated, therefore it must not be redeclared as a subroutine.

After an item has been use associated, it must not be redeclared.

Message ID: ERROR_0933


Error : Module has no public entities declared in the module, therefore names specified in the rename-list cannot be found.

The module specified on the USE statement is apparently empty, therefore, none of the names specified on the rename_list will be found. The module could be empty for one of several reasons:
-- The module contains no declarations in its specification part.
-- Everything in the module is declared private.
-- The module has compilation errors.

Message ID: ERROR_0934


Warning : The integer arithmetic expression exceeds 46-bit maximum. 64-bit integer arithmetic will be tried.

When trying to compute the value of a constant expression, the compiler encountered an integer value that was too large to be represented in 46-bit integer format. The value was treated as a 64-bit value, and 64-bit integer arithmetic was performed. A constant expression involves only constants, and the value of the expression is determined at compile time, not at execution time. This error occurs when data type conversion is required during the computation (for example, converting from real to integer).

Message ID: WARNING_0935


Error : A DATA implied-DO loop control expression must be a scalar integer expression.

An implied-DO in a DATA statement has the form:

      (data_i_do_object_list, data_i_do_variable =
           scalar_int_expr, scalar_int_expr
   	[, scalar_int_expr])
   

The three scalar_int_exprs represent the start, end and increment values for the implied-DO. Each of these expressions must be scalar and each must be of type integer.

Message ID: ERROR_0936


Internal : The compiler is trying to use the intrinsic enum to call an intrinsic processor, but the enum is Unknown_Intrinsic.

There are a list of intrinsic enums, which are used to call the semantic routines for intrinsic processing. A enum is set to Uknown_Intrinsic and the unkown_intrinsic routine is being called.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0937


Caution : A real division was encountered in an expression being converted to integer.

An assignment statement is being used in which the operand on the left side of the equal sign is type integer and the operand on the right side of the equal sign is an expression of type real or double precision, containing a division operation. This message is a warning that division on this machine is achieved through reciprocal approximation, which may yield unexpected answers in these situations. For example, in the following statement, where X is 27.0 and Y = 9.0, X/Y will yield 2.9999...:

     I = X/Y
   

When 2.9999... is assigned to I (converted to integer) the result will be 2, not 3.

Message ID: CAUTION_0938


Error : Function is typed as assumed-length character. It must have a known character length to be called.

If a character function is called, the character function length must be known.

Message ID: ERROR_0939


Ansi : This is a statement function dummy argument and a variable. The types must agree.

If a statement function dummy argument has the same name as a variable, the variable may be typed after the statement function definition, but the type can only be confirmed.

Message ID: ANSI_0940


Error : Common block is defined and/or associated as a standard and a task common block in the same scope.

Common blocks can be defined in a scope by being declared, use associated or host associated. The common block in error is defined multiple times in this scope, but in some places it is a standard common block and in other places it is a task common block. Following are examples of how a common block gets defined in a scope:

     MODULE CC
     COMMON /BB/ M,N  ! Common block BB is declared
     END MODULE       ! in CC's scope

     PROGRAM ZZ
     USE CC           !  Common block BB is use
     CONTAINS         !  associated into ZZ's scope
       SUBROUTINE YY()
       N = M          ! Common block BB is host
       END SUBROUTINE ! associated into YY's scope
     END PROGRAM
   

Following is an example of the problem:

     MODULE CC
     COMMON /BB/ M,N      ! Common block BB declared
     END MODULE           ! in CC's scope

     MODULE DD
     TASK COMMON /BB/ M,N ! Common block BB declared
     END MODULE           ! in DD's scope

     PROGRAM QQ
     USE CC               ! Common block BB comes in
     USE DD               ! Common block BB comes in
                                   ! but it is TASK COMMON
     END PROGRAM
   

Task common blocks are an extension to the Fortran standard.

Message ID: ERROR_0941


Error : Common block is defined and/or associated in this scope as a standard and an auxiliary storage block.

Common blocks can be defined in a scope by being declared, use associated or host associated. The common block in error is defined multiple times in this scope, but in some places it is a standard common block and in other places it is a common block in auxiliary storage. Following are examples of how a common block gets defined in a scope:

      MODULE CC
      COMMON /BB/ M,N   ! Common block BB is declared
      END MODULE        ! in CC's scope

      PROGRAM ZZ
      USE CC            !  Common block BB is use
      CONTAINS          !  associated into ZZ's scope
        SUBROUTINE YY()
        N = M           ! Common block BB is host
        END SUBROUTINE  ! associated into YY's scope
      END PROGRAM
   

Auxiliary storage is an extension to the Fortran standard.

Message ID: ERROR_0942


Comment : The use of type default real or double precision real expressions for io-implied-do-control is an obsolescent feature.

Each scalar_numeric_expr in an io_implied_do_control must be of type integer, default real, or double precision real. Expressions of type default real and double precision real are considered obsolescent by the Fortran standard. An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which better methods are available in Fortran. Use type integer expressions as implied-DO expressions rather than default real or double precision.

Message ID: COMMENT_0943


Comment : The use of a type default real or double precision real DO variable is an obsolescent feature.

The DO variable in an io_implied_do must be a scalar of type integer, default real or double precision real. Variables of type default real and double precision real are considered obsolescent by the Fortran standard. An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which better methods are available in Fortran. Use a DO variable of type integer rather than default real or double precision.

Message ID: COMMENT_0944


Error : An auxiliary variable must not be used in an I/O statement.

The name of an entity allocated to the SSD by using an AUXILIARY compiler directive appears in an I/O statement. I/O transfers are not allowed into or out of auxiliary variables.

Auxiliary storage is an extension to the Fortran standard.

Message ID: ERROR_0945


Error : If a SIZE= specifier is present in an I/O control list, an ADVANCE= specifier also must appear.

A SIZE= specifier is in a READ or WRITE statement that does not have an ADVANCE= specifier.

Message ID: ERROR_0946


Error : The array actual argument cannot be optional in this context.

When calling an elemental intrinsic function, if there is an optional array actual argument being passed, then there must be a conformant nonoptional actual argument also being passed. Two objects are conformant if they have the same rank and extent for each dimension.

        DIMENSION A(10), B(10)
        MAX (A3=A, A1=B, A2=4)        ! Legal
        MAX (A3=A, A1=5, A2=4)        ! Illegal
   
In the call to MAX, A3 is an optional argument. Because A3 is specified, at least one of the nonoptional arguments A1 or A2 must be specified and at least one of the nonoptional arguments must be conformant to A3.

Message ID: ERROR_0947


Limit : This option was specified so the compilation is aborting on the first error.

If the -ea option is enabled, the compilation aborts after encountering the first error.

Message ID: LIMIT_0948


Error : Generic interface must not have an explicit type.

A generic interface must not be typed.

Message ID: ERROR_0949


Error : This is a generic interface or an intrinsic. It must not be typed, because it has already been referenced.

A generic interface name that is not an intrinsic name must not be given a type attribute. A generic interface that is an intrinsic may be given a type attribute, provided the generic interface was not previously referenced.

Message ID: ERROR_0950


Error : The extent for this dimension is too large for this array.

The extent calculation is too large for this machine. The array must be made smaller.

Message ID: ERROR_0951


Ansi : This is the name of a local variable in a host scope so it must not be the name of an external procedure.

The Fortran standard defines an external procedure as a global entity. Global entities are not allowed to have the same name as a local entity in any scope.

Message ID: ANSI_0952


Ansi : This is the name of a local entity in a host scope so it must not be the name of the module in a USE statement.

The Fortran standard defines a module as a global entity. Global entities are not allowed to have the same name as a local entity in any scope.

Message ID: ANSI_0953


Log_Summary : Cray CF90 Version %s (%s) %s

This identifies which version and release of the compiler is being used. This is used when -V is specified.

Message ID: LOG_SUMMARY_0954


Error : Program is missing an END statement.

The compiler detected a premature end of file. The main program unit must be terminated by an END [PROGRAM] statement.

Message ID: ERROR_0955


Error : This is host associated into this scope, but is not a derived type so it must not be used as a derived type.

If an entity is host associated into a scope as a variable, constant, or procedure, it must not be used as a derived type.

Message ID: ERROR_0956


Ansi : Permitting a BOZ constant to be signed is an extension to the Fortran standard.

The permissible forms for values in a DATA statement's data_stmt_value_list are:

       scalar_constant
       signed_int_literal_constant
       signed_real_literal_constant
       structure_constructor
       boz_literal_constant
   

Only an integer literal constant or a real literal constant can be signed. Allowing a BOZ literal constant to be signed is an extension to the Fortran standard.

Message ID: ANSI_0957


Error : A sign is permitted only for an integer literal constant or a real literal constant.

The permissible forms for values in a DATA statement's data_stmt_value_list are:

      scalar_constant
      signed_int_literal_constant
      signed_real-literal-constant
      structure_constructor
      boz_literal_constant
   

Only an integer literal constant or a real literal constant can be signed (and by extension, a BOZ literal constant can be signed).

Message ID: ERROR_0958


Warning : The AUTOSCOPE parameter on a PARALLEL or DOALL compiler directive is not yet supported.

This release of f90 does not support the AUTOSCOPE parameter to the DOALL or PARALLEL tasking directives. Therefore, all variables that are used inside a parallel region must have been specified with either the private or shared attribute on the PARALLEL or DOALL directive line.

Message ID: WARNING_0959


Error : Variable is in a parallel region and must be in the shared or private list if autoscope is not specified.

All user variables used in a parallel region or DOALL loop must be in either the shared or private list if autoscope is not specified. Autoscope is not supported in this release of f90; therefore, all scopes must be specified explicitly.

Message ID: ERROR_0960


Error : The DO control variable must not be SHARED in a DOALL loop.

The DO variable of a DOALL loop must not be specified with the SHARED attribute.

Message ID: ERROR_0961


Error : An array constructor implied-DO control expression must be a scalar integer expression.

An implied-DO in an array constructor has the form:

      (ac_value_list, ac_do_variable =
            scalar_int_expr, scalar_int_expr
   	[, scalar_int_expr])
   

The three scalar_int_exprs represent the start, end and increment values for the implied-DO. Each of these expressions must be scalar and each must be of type integer.

Message ID: ERROR_0962


Internal : Encountered SH_Tbl_Idx in cmp_ref_trees.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0963


Internal : Non constant character in gen_static_dv_whole_def.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0964


Internal : Problem in process_deferred_functions.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0965


Internal : Nonconstant shape for create_bd_ntry_for_const.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0966


Internal : Nonconstant character len in create_bd_ntry_for_const.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0967


Internal : Assumed_Size func result in set_shape_for_deferred_funcs.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0968


Internal : Non constant character in gen_internal_dope_vector.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0969


Internal : No function type information in call_list_semantics.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0970


Internal : Trying to change data obj in call_list_semantics.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0971


Internal : Bad dummy argument in call_list_semantics.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0972


Internal : Improper ir for left side of ptr assignment.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0973


Internal : Wrong statement header in assignment_stmt_semantics.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0974


Internal : Improper ir tree in expr_semantics.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0975


Internal : Expected Dv_Deref_Opr from ptr_assign_from_pointer.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0976


Internal : Expected ir from ptr_assign_from_pointer.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0977


Internal : Something other than list opnd in array_construct_semantics.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0978


Internal : Bad assumption in fold_aggragate_expression.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0979


Internal : Unexpected type for lcv constant in interpret_constructor.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0980


Internal : Not constant IN interpret_constructor.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0981


Internal : Not an lcv constant in interpret_constructor.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0982


Internal : Invalid position idx in interpret_constructor.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0983


Internal : Structure in array syntax portion of interpret ref.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0984


Internal : Error in create_array_constructor_asg, not ir idx.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0985


Internal : Error in create_array_constructor_asg, unexpected opr.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0986


Internal : Problem in create_struct_constructor_asg.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0987


Error : This is the result name of a function, therefore it must not be use associated from a module.

The result name of this function was found in a module brought in by a USE statement. This creates a name conflict, as in the following example:

      MODULE NEW
       INTEGER ABC
      END MODULE

      FUNCTION X RESULT(ABC)
       USE NEW          ! ABC is illegal here
      END FUNCTION
   

Message ID: ERROR_0988


Internal : The compiler has found an unexpected entity in the attr table when checking for not visible during use processing.

In routine attr_is_visible, the compiler found an attribute in the attr table that was unexpected.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0989


Error : It is illegal to take the LOC of an auxiliary array.

An auxiliary array must not be an actual argument in the LOC intrinsic function. Both auxiliary storage and the LOC intrinsic function are extensions to the Fortran standard.

Message ID: ERROR_0990


Error : Multiple specific interfaces exist and are ambiguous. This makes this interface ambiguous.

Multiple specific interfaces exist that are ambiguous. These are all specified in the same generic or defined interface. If a reference is made to this generic interface, the compiler will not be able to resolve to a specific interface, because it will not know which one to resolve to. Within a scoping unit, two procedures in the same generic or defined interface are differentiated by their nonoptional dummy arguments. One way to differentiate specific interfaces is by the number of dummy arguments. If the specific interfaces have the same number of dummy arguments, the dummy arguments must differ in type, kind type or rank. Specific interfaces in a defined interface must have dummy arguments that differ in type, kind type or rank.

Message ID: ERROR_0991


Log_Error : "-O" is specified, therefore a conflicting "-O" must not be specified.

If an optimization level is specified on the command line using -O num, none of the following options may be specified on the command line:

    -O scalar0  -O vector0  -O task0
    -O scalar1  -O vector1  -O task1
    -O scalar2  -O vector2  -O task2
    -O scalar3  -O vector3  -O task3
   

Message ID: LOG_ERROR_0992


Internal : An operator internal text does not have a valid type table index.

An operator ir node has a zero type table index. The routine that is issuing this error expects the operator to have a valid type index.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_0993


Error : The actual arguments to the ASSOCIATED intrinsic may both be dummy arguments only if they are both pointers.

The actual arguments to the associated intrinsic may both be dummy arguments only if they are both pointers.

Message ID: ERROR_0994


Internal : Unrecoverable error encountered while attempting to print buffered messages - %s

This message should never be generated. The compiler could not output the messages it has generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code.

Message ID: INTERNAL_0995


Error : The value of this subscript is greater than the declared upper bound.

A subscript value must be less than or equal to the declared upper bound of the corresponding dimension.

Message ID: ERROR_0996


Error : The section subscript triplet produces a subscript value less than the declared lower bound.

In a section subscript that is a triplet subscript, each subscript value must be greater than or equal to the declared lower bound of the array and must be less than or equal to the declared upper bound of the array. For example, if an array is declared as follows: INTEGER array(10) each subscript value of a section subscript triplet referencing ARRAY must be equal to or greater than 1 and must be equal to or less than 10.

Message ID: ERROR_0997


Error : The stride value of a section subscript triplet must not be zero.

A section subscript triplet consists of a start value, an end value, and a stride value separated by colons as follows: [start-value] : [end-value] [ : stride] The stride value must not be zero.

Message ID: ERROR_0998


Error : The argument to the CHAR intrinsic is outside the valid collating sequence.

The argument to the CHAR intrinsic is outside the valid collating sequence.

Message ID: ERROR_0999


Comment : Reserved


-- Explanation 1000 is used by the f90 installation process.
-- Explanation 1000 must be unformatted, hence the use of $EXP instead of $NEXP.
-- Explanation 1000 must be the USM VID string and nothing else. 1000 90.43\n

Message ID: COMMENT_1000


Error : The stride of an array subscript triplet must not be zero.

An array section was encountered that had a stride value of zero in it's subscript triplet.

Message ID: ERROR_1001


Error : This is specified in a namelist group, therefore the type is assumed.

When an object is specified in a namelist group, it is implicitly typed if it is the first reference to this object. The object can subsequently be typed in a type declaration statement only if it confirms the type.

Example:

        IMPLICIT INTEGER(A-Z)
        NAMELIST /GROUP/ R
        REAL R           ! Illegal
   

R can only be typed integer, because that is what it is implicitly typed as in the NAMELIST statement

Message ID: ERROR_1002


Warning : This compilation unit contains more than one unnamed program unit.

A compilation unit can only have one unnamed program unit.

Message ID: WARNING_1003


Internal : This has a negative offset.

When the frontend is finished with a data object its offset must be zero or positive.

Message ID: INTERNAL_1004


Error : This is a common block name and is also declared as an intrinsic procedure.

The Fortran standard prohibits a common block name from being used as the name of an intrinsic procedure.

Message ID: ERROR_1005


Ansi : Global name is in use as a common block name and an external subprogram or program unit name.

The Fortran standard prohibits a common block name from being the name of an external subprogram or a program unit. A program unit is a block data subprogram, a module subprogram, or a main program. An external subprogram is an external function or subroutine. An external subprogram name can also be defined on an ENTRY statement, a CALL statement, an EXTERNAL statement, an interface body or called as a function in an expression.

Message ID: ANSI_1006


Error : Global name is in use twice.

The scope of a global name is an entire compilation unit, so a global (or external) name must only be declared once.

Message ID: ERROR_1007


Caution : This cannot be double aligned because of equivalence alignment.

The -a dalign option is specified on the command line, so the compiler tries to double align everything. This variable cannot be double aligned, because it is equivalenced to another variable that is not on aligned on a double word.

Following is an example:

          DOUBLE PRECISION :: B, C
          REAL, DIMENSION(10) :: A
          EQUIVALENCE(A(1), B)
          EQUIVALENCE(A(2), C)
   
If B is aligned on a double word, then C cannot be and vice versa.

Message ID: CAUTION_1008


Warning : This compilation unit contains multiple main program units.

A compilation unit can only have one program unit.

Message ID: WARNING_1009


Warning : Global name is in use already.

The scope of a global name is an entire compilation unit, so a global (or external) name must only be declared once.

Message ID: WARNING_1010


Error : Procedure and this compilation must both be compiled with -a dalign, or without -a dalign.

If the current compilation unit is being compiled with the -a dalign option, each module it uses or each precompiled procedure it inlines must be compiled with the -a dalign option. If the current compilation unit is being compiled without the -a dalign option, each module it uses or each precompiled procedure it inlines must be compiled without the -a dalign option.

Message ID: ERROR_1011


Error : The DIM argument to the LBOUND, UBOUND, or SIZE intrinsic must be a value between 1 and the rank of the ARRAY argument.

When the dim argument is specified for the LBOUND, UBOUND, or SIZE intrinsic,\ its value must fall within the range of dimensions for the array argument. That range is 1 <= dim <= rank of array.

Message ID: ERROR_1012


Warning : The -a dalign commandline option has forced padding to be inserted in this common block.

The -a dalign option forces double word items to be on a double word boundary. An object in a common block is a double word object. To get this object on a double word boundary, a pad amount is inserted before the object in the common block.

Message ID: WARNING_1013


Error : Character object has nonconstant bounds. It can only be declared in a function, subroutine or interface body.

Objects that are typed as character with nonconstant lengths can only be declared in subroutines, functions, and interface bodies (which describe subroutines and functions). The compiler detected a character object with a nonconstant length, but the declaration is not contained in a subroutine, interface body, or function.

Message ID: ERROR_1014


Error : Local-name must only be referenced once in a rename-list in this scope.

The BNF for a rename-list is: local-name => use-name

The compiler has detected the same local-name in more than one rename. Each local-name must be unique in a scope.

Message ID: ERROR_1015


Internal : An invalid type was sent to arith input conversion.

Internal compiler error. A type that is not supported by the arith.a input conversion routines was encountered.

Message ID: INTERNAL_1016


Error : The DIM argument is not in a valid range.

The user is trying to pass an illegal value for dim.

Message ID: ERROR_1017


Internal : The char_len field is not set for a character expression in create_tmp_asg.

Internal compiler error. Character length information was not valid for an internal data structure.

Message ID: INTERNAL_1018


Internal : This is in an equivalence group, but does not have ATD_EQUIV set TRUE.

Everything in an equivalence group must have ATD_EQUIV set TRUE.

Message ID: INTERNAL_1019


Internal : Internal compiler error in process_variable_size_func.

Internal compiler error.

Message ID: INTERNAL_1020


Note : The implied-DO was transformed into a whole array or array section initialization.

An implied-DO is an inefficient way to initialize a whole array or an array section. Initialization of a large array via an implied-DO can utilize significant compile-time resources. Wherever possible, such an implied-DO should be replaced by initialization in a type declaration statement (for whole array initialization) or in a whole array or array section initialization in a DATA statement. For example, INTEGER array(100,100) DATA ((array(i,j), i = 1, 100), j = 1, 100) /10000 * -1/ should be replaced with INTEGER :: array(100,100) = -1 or INTEGER array(100,100) DATA array /10000 * -1/ An initialization of a portion of an array should be replaced by an array section initialization where possible (not all such initializations can be rewritten in array section notation). For example, INTEGER array(100,100) DATA ((array(i,j), i = 1, 100), j = 1, 50) /4999 * -1, 0/ should be replaced with INTEGER array(100,100) DATA array(:, 1:50) /4999 * -1, 0/

Message ID: NOTE_1021


Internal : Expected character substring in create_io_call_descriptor.

Internal compiler error.

Message ID: INTERNAL_1022


Internal : The line number passed on the fei_new_stmt must be nonzero.

fei_new_stmt requires a nonzero line number.

Message ID: INTERNAL_1023


Internal : Expression evaluation failed.

The compiler was trying to evaluate an expression at compile time and encountered an unexpected result or condition. This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code. You may be able to change your code so that the compiler does not try to issue this message.

Message ID: INTERNAL_1024


Internal : Nonconstant character length in create_scalar_type_tbl.

Internal compiler error.

Message ID: INTERNAL_1025


Error : Cannot open output file for module information table for module "%s". Check directory permissions.

The compiler cannot open up a file to write out the module information tables. Check write permission on the current directory.

Message ID: ERROR_1026


Error : Module , specified on the USE statement, is the module currently being compiled. A module cannot use itself.

A module cannot use itself, nor can any contained procedures of a module use the module. The compiler has detected something similar to this:

         MODULE M
           ...
         CONTAINS
           SUBROUTINE S()
           USE M	    ! Illegal
           END SUBROUTINE
         END MODULE
   

Message ID: ERROR_1027


Ansi : This is a host associated common block name and is an intrinsic procedure. This is nonstandard.

A host associated common block name is being used as the name of an intrinsic procedure. This is an extension to the Fortran standard. A common block name is host associated into a scope, if any member of the common block is host associated into the scope.

Message ID: ANSI_1028


Ansi : This is a use associated common block name and is an intrinsic procedure. This is nonstandard.

A use associated common block name is being used as the name of an intrinsic procedure. This is an extension to the Fortran standard. A common block name is use associated into a scope, if any member of the common block is use associated into the scope.

Message ID: ANSI_1029


Error : This is a host associated common block name and is also declared as an intrinsic procedure.

The Fortran standard prohibits a host associated common block name from being used as the name of an intrinsic procedure. A common block name is host associated into a scope, if any member of the common block is host associated into the scope.

Message ID: ERROR_1030


Error : This is a use associated common block name and is also declared as an intrinsic procedure.

The Fortran standard prohibits a use associated common block name from being used as the name of an intrinsic procedure. A common block name is use associated into a scope if any member of the common block is use associated into the scope.

Message ID: ERROR_1031


Ansi : This is a named constant and is also a host associated common block name. This is nonstandard.

The Fortran standard prohibits using the same name for a named constant and a host associated common block name. A common block name is host associated into a scope, if any member of the common block is host associated into the scope.

Message ID: ANSI_1032


Ansi : This is a named constant and is also a use associated common block name. This is nonstandard.

The Fortran standard prohibits using the same name for a named constant and a use associated common block name. A common block name is use associated into a scope, if any member of the common block is use associated into the scope.

Message ID: ANSI_1033


Error : The compiler cannot open file which may contain information about used module.

The compiler cannot open the specified module file for USE statement processing. Check permissions for the file and for the directory. If this is a non-CRAY system, the compiler may be attempting to open a .M file. This file was specified on the commandline as -p x.o.

Message ID: ERROR_1034


Error : Character object is used recursively to declare its own length.

An object typed as character must not be specified as part of the expression declaring its own length. The following is an example of an invalid declaration: CHARACTER*(CH) :: CH

Message ID: ERROR_1035


Error : Array is used recursively to declare its own bounds.

An array must not be specified as part of the expression declaring its own bounds. The following is an example of an invalid declaration: DIMENSION :: IARR(IARR)

Message ID: ERROR_1036


Error : This has been declared and used as a dummy argument, therefore it must not be declared or used as a procedure.

Once an object is declared as a dummy argument and then referenced or defined, it must not be redeclared as a procedure or referenced as a procedure.

Message ID: ERROR_1037


Error : This has been declared and used as a dummy argument, therefore it must not be declared in this way.

The object being declared is a referenced or defined dummy argument, which prohibits it from being declared as any of the following items:

   	Cray pointer
   	Cray pointee
   	function result
   	derived type
   	generic interface
   	namelist group
   	statement function
   	construct name
   	function
   	subroutine
   

Message ID: ERROR_1038


Error : This has been declared and used as a dummy argument, therefore it must not be declared with that attribute.

The object being declared is a referenced or defined dummy argument, which prohibits it from being given any of the following attributes:

   	DIMENSION
   	ALLOCATABLE
   	PARAMETER
   	INTRINSIC
   	VFUNCTION
   	NOSIDE EFFECTS
   

Message ID: ERROR_1039


Error : This has been declared and used as a dummy argument, therefore it must not be used as a derived-type name.

The compiler detected a conflict in uses of this object. The object is a dummy argument, which prohibits it from being used as a derived-type name.

Message ID: ERROR_1040


Error : Dummy procedure is called within a parallel region and must be in the shared list if autoscope is not specified.

All dummy procedures called in a parallel region or DOALL loop must be in the shared list if autoscope is not specified. Autoscope is not supported in this release of f90; therefore, all scopes must be specified explicitly.

Message ID: ERROR_1041


Error : The compiler could not successfully write intermediate file.

The compiler could not complete writing the intermediate file, most likely due to insufficient free disk space.

Message ID: ERROR_1042


Error : The compiler cannot open intermediate file.

The compiler cannot open the specified intermediate file for output.

Message ID: ERROR_1043


Internal : Internal : %s

The intermediate file generator detected an internal error condition.

Message ID: INTERNAL_1044


Log_Summary : f90: Cray CF90 Version %s (cft90:%s mif:%03d) %s

This identifies which version and release of the compiler is being used.

Message ID: LOG_SUMMARY_1045


Caution : The bounds needed for automatic variable are not available at all entry points.

A bound for an automatic variable can contain dummy arguments. The compiler has found one or more entry points where the dummy argument is not specified, so that the length of the automatic variable cannot be determined at all entry points. At entry points where the length cannot be determined, a zero length variable will be allocated.

Message ID: CAUTION_1046


Error : Typeless or BOZ constant is not allowed because the DO-variable is type DOUBLE PRECISION.

A typeless or BOZ constant is limited to one word when used in an arithmetic context. Assignment of such a typeless or BOZ constant to a variable of type DOUBLE PRECISION is not allowed. Similarly, such a constant must not be a DO loop expression when the DO-variable is of type DOUBLE PRECISION.

Message ID: ERROR_1047


Internal : Invalid operator encountered in change_to_base_and_offset.

Internal compiler error.

Message ID: INTERNAL_1048


Internal : Invalid form to operator Init_Reloc_Opr found in cvrt_exp_to_pdg.

Internal compiler error.

Message ID: INTERNAL_1049


Internal : Invalid form of Implied_Do_Opr in expand_io_list.

Internal compiler error.

Message ID: INTERNAL_1050


Internal : Object is data initialized, but does not have a storage type of static or common.

A compilation assumption is that data initialized objects must be in static or common storage. This object is not in static or common storage.

Message ID: INTERNAL_1051


Log_Error : The TARGET environment variable has not been set.

When compiling in the Distributed Programming Environment, the TARGET environment variable must be set to the name of the target machine. For example: % setenv TARGET cray-ymp

Message ID: LOG_ERROR_1052


Error : This is both a MODULE name specified on a USE statement and an object use associated from a MODULE.

The object specified is use associated into this scope from a module. It is also the name of a module specified on a USE statement. Each module name specified on a USE statement must be unique.

Message ID: ERROR_1053


Error : A 32 bit integer is not a valid argument to this intrinsic.

The information returned from this intrinsic will not fit in a 32 bit word. The argument must be a 64 bit word.

Message ID: ERROR_1054


Error : Module file is incompatible with this compiling system. Recompile the module with this compiling system.

The compiler is attempting to read a module file created with an incompatible compiler. Recompile the module file with the current compiler and command line options to ensure compatibility.

Message ID: ERROR_1055


Error : This is an invalid value for the NCOPIES argument.

This argument is a negative value and that is invalid.

Message ID: ERROR_1056


Error : Object has been USE associated twice from the same module but is not the sma object.

Later.

Message ID: ERROR_1057


Internal : Unexpected input to set_merge_link routine during use statement semantics.

An assumption is made in the set_mod_link routines that all duplicate attrs from the same original module will merge into one attribute. The compiler has found a case were there are 3 different attribute indexes, rather than just 2.

Message ID: INTERNAL_1058


Error : Generic interface has both subroutine and function specific interfaces.

All the specific procedures in a generic interface must be functions or subroutines. Functions and subroutines cannot be mixed in a generic interface. This generic interface has both subroutine and function specific procedures.

Message ID: ERROR_1059


Internal : Converting message file; libcif returned error status: %s

This message should never be generated. The compiler could not output the messages it has generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code.

Message ID: INTERNAL_1060


Warning : This integer length is not supported on this hardware. This directive is ignored.

Integer length 46 and 64 are not supported on a 32 bit hardware.

Message ID: WARNING_1061


Error : The argument is not in the valid range for this intrinsic.

The user has chosen an invalid numeric value as input to this intrinsic.

Message ID: ERROR_1062


Internal : Index is not a valid index for the table.

This is an internal error that will only be issued in specially built debug bounds checking compilers. There is an out of bounds table reference to a symbol table or IR table.

Message ID: INTERNAL_1063


Log_Warning : Two optimization levels are specified on the commandline. These cause the default to be reset.

The user has specified some optimization levels that require the compiler to change the default optimization level to be compatible.

Message ID: LOG_WARNING_1064


Error : Object has already been specified in a CACHE_ALIGN directive.

A variable or common block may not be specified in more than one CACHE_ALIGN compiler directive.

Message ID: ERROR_1065


Error : Variable subobjects are not allowed in a CACHE_ALIGN compiler directive.

Only variable names and common blocks are allowed in CACHE_ALIGN compiler directive lists. Variable subobjects are not allowed.

Message ID: ERROR_1066


Error : This object is not allowed in a CACHE_ALIGN compiler directive.

Only variables and common blocks are allowed in a CACHE_ALIGN compiler directive. Also, variables in common blocks are not allowed in a CACHE_ALIGN directive.

Message ID: ERROR_1067


Log_Warning : Optimization level is specified on the commandline. This causes the default to be reset.

The user has specified an optimization level that requires the compiler to change a default optimization level to be compatible.

Message ID: LOG_WARNING_1068


Warning : The optimization option is ignored, at this debugging level.

This optimization is ignored when this level of debugging is specified. To enable the optimization, a more optimized debugging level is needed.

Message ID: WARNING_1069


Error : This reference to this intrinsic must have an integer scalar result to be specified in a specification expression.

Intrinsics are allowed in specification expressions only if they have integer scalar results.

Message ID: ERROR_1070


Error : Interface contains procedure which has dummy argument. This dummy argument must not be OPTIONAL.

A dummy argument has the OPTIONAL attribute, but the specific interface it is declared in is a defined operator or defined assignment interface block.

Message ID: ERROR_1071


Error : Interface OPERATOR() contains procedure which has dummy argument. This dummy argument must have INTENT(IN).

Within a defined operator interface block the intents of dummy arguments must be specified with certain values. The dummy arguments must have INTENT(IN).

Message ID: ERROR_1072


Error : Interface contains procedure which has dummy procedure. A dummy procedure is not allowed.

Specific interfaces within a defined assignment or defined operator interface block must have dummy arguments that are data objects. Dummy procedures are not allowed.

Message ID: ERROR_1073


Error : Interface ASSIGNMENT(=) contains procedure which has dummy argument. The dummy argument must have the correct INTENT.

Within a defined assignment interface block the intents of dummy arguments must be specified with certain values. The first dummy argument must have INTENT(OUT) or INTENT(INOUT). The second dummy argument must have INTENT(IN).

Message ID: ERROR_1074


Error : This argument may not be ALLOCATABLE or POINTER.

This argument may not have the POINTER, or ALLOCATABLE attribute.

Message ID: ERROR_1075


Ansi : Arguments which have TYPELESS type are not standard.

TYPELESS is not allowed in this context.

Message ID: ANSI_1076


Ansi : Unused

Message ID: ANSI_1077


Error : This use of generic interface is not valid.

The compiler detected a generic interface reference where a data object or function call was expected. This is probably the result of a generic interface name without an actual argument list.

Message ID: ERROR_1078


Internal : Invalid type sent to arith.a folding routine.

Internal compiler error.

Message ID: INTERNAL_1079


Error : The argument to the PRESENT intrinsic must be an unqualified name.

An interpretation of the Fortran standard has changed the wording of the description of the argument to the PRESENT intrinsic function to read as follows: A must be the name of an optional dummy argument that is accessible in the procedure in which the PRESENT function reference appears. The word "name" in the Fortran standard is a technical term, defined to be a letter followed by up to 30 alphanumeric characters. A "name" therefore can not include a subscript list, substring expressions, the structure component separator (%), etc. and thus the argument to the PRESENT intrinsic function can not include any qualification.

Message ID: ERROR_1080


Error : Name qualification is not allowed in this context.

In this context (such as a value in a DATA statement value list), a named constant may appear, but not a subobject of a named constant. For example: DATA (a(i), i = 1, t%i) / p(i) * t%i / In the above DATA statement, assume that T is a named constant structure and P is a named constant array. All of the references to subobjects of T and P in the above DATA statement example are prohibited because an identifier in each of these contexts must be the name of a named constant. The name must not be qualified by a subscript list or structure component name.

Message ID: ERROR_1081


Error : The iteration count is too large.

The iteration count is calculated as follows: MAX( INT( (end-value - start-value + inc-value) / inc-value), 0) The loop control expression values are such that the value that would represent the iteration count is larger than the largest integer that can be represented.

Message ID: ERROR_1082


Warning : The magnitude of the final value of the DO variable is too large.

If the loop executes to completion, the magnitude of the final value of the DO variable will be larger than the largest integer that can be represented (if the increment value is positive), or smaller than the smallest negative integer that can be represented (if the increment value is negative) in an integer DO variable of the declared kind type value. The final value of the DO variable is calculated from: start-value + iteration-count * increment-value This message is issued for a DO statement of the following form on a machine whose word size is 32 bits because the final value of the DO variable would be 2147483648 (assume the DO variable is type default integer). This value is larger than the largest integer that can be represented. DO i = 1, 2147483647 This message is also issued if the DO variable is of type nondefault integer and the final value is out of range for the bit size of the kind type parameter of the DO variable. For example: INTEGER(KIND=1) i DO i = 1, 1000 A kind type parameter value of 1 implies that variable I can only contain integer values in the range -127 to +127. The final value of the DO variable is 1001 which is outside this range.

Message ID: WARNING_1083


Error : An implied-DO increment value of zero is not allowed.

The increment value for an implied-DO must not be zero. This error is issued if an increment value of zero is detected in an I/O implied-DO, array constructor implied-DO, or DATA implied-DO. Also, an increment value that is dependent on the value of an outer implied-DO variable must not evaluate to zero when the outer loop is iterated.

Message ID: ERROR_1084


Error : Namelist group has the PUBLIC attribute so namelist group object cannot have PRIVATE components.

If a namelist group name has the PUBLIC attribute, no item in the namelist group object list can have the PRIVATE attribute. Also, a namelist group list item of derived type may not have a component with the PRIVATE attribute.

Message ID: ERROR_1085


Warning : More than one actual argument has been specified for argument of this intrinsic.

The compiler recognized that more than one actual argument was specified for a particular dummy argument. This can result from two identical argument keywords or an argument keyword and a positional argument for the same dummy argument.

Message ID: WARNING_1086


Error : Argument to this intrinsic has the wrong rank.

A difference was detected between the rank of the actual argument and the rank of the dummy argument for this intrinsic function.

Message ID: ERROR_1087


Error : Argument to this intrinsic has the wrong type.

A difference was detected between the type of the actual argument and the type of the dummy argument for this intrinsic function.

Message ID: ERROR_1088


Error : Argument to this intrinsic has the wrong kind type.

A difference was detected between the kind type parameter of the actual argument and the kind type parameter of the dummy argument for this intrinsic function.

Message ID: ERROR_1089


Error : This intrinsic requires an argument which was not specified.

A required argument to an intrinsic function was not specified.

Message ID: ERROR_1090


Error : The rank of this POINTER actual argument does not match the rank of POINTER dummy argument.

If the dummy argument is a POINTER, the actual argument must be a POINTER and the types, type parameters, and ranks must agree.

Message ID: ERROR_1091


Error : CRI pointer has multiple pointees which are typed with differing numeric lengths.

A CRI pointer may have multiple pointees, but if the pointer does, all the pointees must be typed with types that have the same numeric length. For example: real(kind=4) :: A real(kind=8) :: B pointer(PA,A) pointer(PA,B) This is illegal, because the length of a real(kind=4) type is shorter than the length of a real(kind=8) type. NOTE: CRI character pointers are allowed to have multiple pointees with different character lengths.

Message ID: ERROR_1092


Error : The output argument of this intrinsic does not conform to the other actual arguments.

The output argument(s) of intrinsic subroutines must be conformable with the other arguments to the intrinsic.

Message ID: ERROR_1093


Error : This is declared as the statement function dummy argument, therefore it must not be used as an external function name.

A statement function dummy argument must be a scalar data object and must be used as a scalar data object. The following example illustrates the problem. In the example, X is the statement function dummy argument, but the reference to X in the statement function expression is to a function. PROGRAM P G(X) = X(3) END SUBROUTINE

Message ID: ERROR_1094


Internal : Invalid form of preparsed format constant.

This is an internal compiler error. The preparser used for FORMAT statements returned an invalid result.

Message ID: INTERNAL_1095


Error : An assumed-size array is illegal in this context.

The array arguments to the transformational intrinsic may not be assumed- size arrays.

Message ID: ERROR_1096


Ansi : It is nonstandard to mix kind types in an equivalence group, if any object in the group is a non default numeric type.

If an equivalence_object is of an intrinsic type other than default integer, default real, double precision real, default complex, or default logical all objects in the equivalence set must be of the same type with the same kind type parameter value.

Message ID: ANSI_1097


Error : This is a MODULE name specified on a USE statement, so it must not be specified as a rename or only name.

The compiler has found the name of the module specified in the rename or only list. The module name must not be renamed. The following example shows the problem: MODULE ABC integer one END MODULE PROGRAM P USE ABC, NEW_ABC => ABC ! Illegal to rename module name END PROGRAM

Message ID: ERROR_1098


Error : An INTEGER variable has been used as a FORMAT specifier but was not specified in an ASSIGN statement.

The use of an INTEGER variable as a FORMAT specifier is only allowed if the variable has be used in an ASSIGN statement with a valid FORMAT statement label. The compiler has detected that no ASSIGN statement with this variable was encountered.

Message ID: ERROR_1099


Error : I/O list items of a derived type which have a PRIVATE component are not allowed.

A derived-type object must not appear as an input/output list item if any component ultimately contained within the object is not accessible within the scoping unit containing the intput/output statement. This will happen when a derived-type object is use associated from a module where the derived-type definition contains private components.

Message ID: ERROR_1100


Error : An identifier in a DATA value list must be the name of a scalar named constant.

The values in the value list of a DATA statement may be literal constants or named constants. If a named constant appears, it must be the name of a scalar named constant (not an array constant that is an array). For example, the following program is in error: INTEGER, PARAMETER :: f(2) = (/ 1, 2 /) INTEGER :: array(2) DATA array /f/ F is the name of a named constant that is an array and thus must not appear in a DATA statement value list.

Message ID: ERROR_1101


Caution : CRI pointer has multiple pointees with differing types. This may be non portable.

A CRI pointer may have multiple pointees, but to be portable, they all should be typed with types that have the same numeric length. For example: real(kind=4) :: A real(kind=8) :: B pointer(PA,A) pointer(PA,B) This is legal on a PVP, but if you port this code to a 32 bit system, A is stored in 32 bits and B is stored in 64 bits. This means pointer PA is pointing to 2 items that have different storage sizes. This will be flagged as illegal on 32 bit systems. NOTE: CRI character pointers are allowed to have multiple pointees with different character lengths.

Message ID: CAUTION_1102


Caution : Procedure has the RECURSIVE attribute, so -ev (saveall option) will be ignored for this procedure.

The -ev option tells the compiler to statically allocate all local variables in the compilation unit. If a procedure is recursive, statically allocating the local variables has the potential to cause unwanted behavior from the compiler. Therefore, the compiler ignores the -ev option for all recursive procedures and any procedures contained in the recursive procedures. If the saveall option is needed for a recursive procedure, specify the SAVE statement in the procedure and in any contained procedures.

Message ID: CAUTION_1103


Log_Warning : The -eR option overrides the -ev option.

The -eR option implies implicit recursion in all procedures in the compilation unit. The -ev option implies saveall for all procedures in the compilation unit. Specifying saveall for a recursive procedure may cause indeterminate or unwanted results at execution time. Therefore, the compiler does not allow the -ev and -eR options to be specified on the commandling. If the saveall option is desired, specify the SAVE statement in each procedure in the compilation unit.

Message ID: LOG_WARNING_1104


Error : The unroll directive must be followed by EOS or a positive integer value to be used for the unroll count.

The syntax for the UNROLL directive is: UNROLL[n] where n is an optional positive integer initialization expression used as the unroll count.

Message ID: ERROR_1105


Error : The SHAPE argument must have a constant size and must be less than 8.

The SHAPE argument to the RESHAPE intrinsic must be a one dimensional array with a constant size.

Message ID: ERROR_1106


Error : Function must be the current function being compiled or a dummy procedure to be typed as assumed size character.

If a function is assumed-size character, it must be the current function being compiled or be a dummy procedure. The caller determines the character length of the function.

Message ID: ERROR_1107


Error : The type of the actual argument does not match the type of the dummy argument.

A difference was detected between the type of the actual argument and the type of the dummy argument supplied in an explicit interface for the called routine.

Message ID: ERROR_1108


Ansi : Initializing a member of blank common is nonstandard.

An object is being initialized either by a DATA statement or by initialization on a type declaration statement. The object is a member of blank common. It is nonstandard to initialize a member of blank common. If you wish to initialize a member of a common block, use a named common block.

Message ID: ANSI_1109


Warning : DOUBLE PRECISION is not supported on this platform. REAL will be used.

DOUBLE PRECISION is not supported on this platform. The compiler will use a REAL precision.

Message ID: WARNING_1110


Error : The external name following the equal on the compiler directive NAME must be a character literal.

Something other than a character literal constant was encountered following the equal sign on a CDIR$ NAME line.

Message ID: ERROR_1111


Error : Invalid destination or source for ENCODE or DECODE. It must be a variable, array element or whole array reference.

The ENCODE and DECODE statements have not been extended to include Fortran 90/95 specific features. This means that only variables, array elements or whole arrays can be used as the destination or source. Character substrings, array sections, derived type components, Fortran pointers, and allocatable arrays are not allowed. The use of internal file IO is recommended for these objects when they are type CHARACTER.

Message ID: ERROR_1112


Error : The specifier must be scalar.

This IO control item specifier must be a scalar expression, variable or array element.

Message ID: ERROR_1113


Internal : Defines are incompatible. This compiler has not been built correctly.

This is an internal message that only comes out in debug mode. # defines set in defines.h have been set in an incorrect combination. Check defines.h for the problem.

Message ID: INTERNAL_1114


Limit : The maximum number of alternate entries in one scope has been exceeded.

An internal error condition has occured because an internal number has grown too large for its field size.

Please notify your product support organization. You may be able to split your code into multiple program units so that compilation can successfully complete.

Message ID: LIMIT_1115


Internal : Defines must be specified in defines.h under the appropriate build section.

The compiler is built incorrectly. One or the other of the listed defines must be set under the section describing the compiler being built in defines.h. This is an internal error and will only be seen when an internal compiler is built.

Message ID: INTERNAL_1116


Internal : Internal error in create_struct_argchck_tbl.

Internal compiler error.

Message ID: INTERNAL_1117


Error : The TASK COMMON statement is not supported on this platform.

The task common block is not supported on this platform.

Message ID: ERROR_1118


Internal : Internal compiler error. The number of actual arguments does not match the number of dummy arguments.

This internal compiler error indicates that the call site processing of user or intrinsic calls encountered incorrect internal information concerning the interface of the program unit being called.

Message ID: INTERNAL_1119


Error : This is not a legal value for the DIM argument.

The user has chosen a value that the compiler has determined to be invalid for the DIM argument to this intrinsic. Please check the standard for the correct range of values for the DIM argument.

Message ID: ERROR_1120


Error : The NUMCPUS tasking directive is not allowed within a parallel region.

The f90 tasking implementation does not allow the \*NUMCPUS tasking directive to be specified within a parallel region. A parallel region is either a DOALL loop or a region of code delimited by a PARALLEL/ENDPARALLEL pair.

Message ID: ERROR_1121


Warning : The value specified on the NUMCPUS tasking directive is bad. Its range must be 1 to 64 so it has been reset.

The value specified on the NUMCPUS tasking directive must be greater than zero and less than or equal to 64.

Message ID: WARNING_1122


Caution : Arguments to the CNCALL tasking directive are ignored.

The compiler ignores arguments specified on the CNCALL tasking directive line.

Message ID: CAUTION_1123


Error : The NUMCPUS tasking directive must have a value specified in the range of 1 to 64.

The NUMCPUS tasking directive must have a value specified in the range 1 to 64. Syntax for the NUMCPUS directive is: NUMCPUS(value) where value is 1 to 64 inclusive.

Message ID: ERROR_1124


Error : Invalid type of argument for VAL intrinsic.

Only scalar INTEGER, LOGICAL, and REAL variables and expressions are supported with the %VAL intrinsic function. If a program unit is the argument, the %val intrinsic has no affect. The address of the program unit is passed as if the %val intrinsic had not been used.

Message ID: ERROR_1125


Error : Object specified on the PERMUTATION tasking directive must be an integer array.

The PERMUTATION tasking directive requires all objects specified on the directive to be integer arrays.

Message ID: ERROR_1126


Caution : Bit value truncated in conversion.

A typeless constant was used in an expression or assignment and the converion caused bits to be truncated. The following rules apply. If it is a numeric typeless constant, (BOZ or boolean) and is larger than the result type of the operation, bits are truncated on the left side. If it is a hollerith constant, "H" hollerith constants are truncated on the right side, "L" constants are truncated on the right side, and "R" constants are truncated on the left side. Character literal constants used as typeless (a CRI extension) are truncated on the right side.

Message ID: CAUTION_1127


Error : Common block is specified in a COMMON directive, therefore it must be specified in a COMMON statement.

If a common block is specified in a CDIR$ (!DIR$) COMMON statement, the common block must also be declared in a COMMON statement.

Message ID: ERROR_1128


Error : Common block may be specified in a COMMON directive or as TASK COMMON, but it must not be specified as both.

A common block must not be specified on both a TASK COMMON directive and a COMMON directive. A common block must not be specified on both a TASK COMMON statement and a COMMON directive.

Message ID: ERROR_1129


Warning : The INTEGER(KIND=6) and INTEGER*6 declarations will be removed in the next release.

Starting with the next release of the compiler, INTEGER(KIND=6) and INTEGER*6 declaration forms will no longer be accepted. On 64-bit platforms which had a default of INTEGER(KIND=6), the new default will be INTEGER(KIND=8). Beginning with the next release on these platforms, the commandline option "-O fastint" combined with the default integer will provide equivalent behavior to the current behavior for default integer. On 32-bit platforms, INTEGER(KIND=6) and INTEGER*6 are currently mapped to INTEGER(KIND=4) and INTEGER*4. For larger integer types, use INTEGER(KIND=8) which will provide a 64-bit integer type.

Message ID: WARNING_1130


Log_Warning : The "-i 46" option will be removed in the next release of f90. Use "-O fastint" instead.

The "-i 46" option is no longer relevant because different bit lengths are used for fast integer operations on different architectures. Therefore, the more general "-O fastint" option has been introduced. The "-i 46" option will be removed in the next release of f90. Use the "-O fastint" option instead.

Message ID: LOG_WARNING_1131


Log_Warning : The compiler is attempting to open this file to search for module.

The compiler is attempting to open a file that was specified on the -p commandline. The open routine has returned the specified error. The compiler may also be attempting to open a temporary file that it previously created during this compilation that contains information about a module compiled during this compilation.

Message ID: LOG_WARNING_1132


Error : This Hollerith constant is longer than 256 bits.

A Hollerith constant used as a numeric constant cannot be longer than 256 bits.

Message ID: ERROR_1133


Error : This is already a symbolic constant, therefore it must not be given that attribute.

N$PES is a special symbolic constant. It is compiler defined as type INTEGER and the type may not be changed. No attributes may be given to N$PES. It may be used as a symbolic constant in places where a symbolic constant is legal. The value of N$PES is set by a compiler commandline option, a load time option or a runtime option.

Message ID: ERROR_1134


Error : This is already a symbolic constant, therefore it must not be declared in that way.

N$PES is a special symbolic constant. It is compiler defined as type INTEGER and the type may not be changed. No attributes may be given to N$PES. It may be used as a symbolic constant in places where a symbolic constant is legal. The value of N$PES is set by a compiler commandline option, a load time option or a runtime option.

Message ID: ERROR_1135


Error : This is a symbolic constant, therefore it must not be declared as a procedure or used as a derived type.

N$PES is a special symbolic constant. It is compiler defined as type INTEGER and the type may not be changed. No attributes may be given to N$PES. It may be used as a symbolic constant in places where a symbolic constant is legal. The value of N$PES is set by a compiler commandline option, a load time option or a runtime option.

Message ID: ERROR_1136


Error : This is a scalar integer symbolic constant, therefore it must not be an array, typed as character, or be in common.

N$PES is a special symbolic constant. It is compiler defined as type INTEGER and the type may not be changed. No attributes may be given to N$PES. It may be used as a symbolic constant in places where a symbolic constant is legal. The value of N$PES is set by a compiler commandline option, a load time option or a runtime option.

Message ID: ERROR_1137


Error : This is a symbolic constant, therefore it must not be an object in a namelist group.

N$PES is a special symbolic constant. It is compiler defined as type INTEGER and the type may not be changed. No attributes may be given to N$PES. It may be used as a symbolic constant in places where a symbolic constant is legal. The value of N$PES is set by a compiler commandline option, a load time option or a runtime option.

Message ID: ERROR_1138


Error : Only one work distribution must be specified on a DO PARALLEL directive.

More than one work distribution is illegal on a DO PARALLEL directive.

Message ID: ERROR_1139


Warning : Work distribution parameter NCPUS_CHUNKS is not supported on this platform.

Work distribution parameter NCPUS_CHUNKS is not supported on this platform. The default is SINGLE and if no other work distribution is specified, the default will be used.

Message ID: WARNING_1140


Error : Only variable names are allowed in this compiler directive.

A name was encountered in a BOUNDS or NOBOUNDS compiler directive that was not a variable or dummy argument.

Message ID: ERROR_1141


Error : The STACK directive must not be specified in the specification part of a MODULE.

The STACK directive must not be specified in the specification part of a MODULE. Default storage in the specification part of a MODULE is always static storage and must not be changed with the STACK directive.

Message ID: ERROR_1142


Error : The STACK directive must not be specified inside an interface body or an interface block.

The STACK directive must not be specified inside an interface body or an interface block. The directive would have no meaning in this location.

Message ID: ERROR_1143


Warning : A SAVE statement with no save entity list and a %s directive are specified in the same scope. SAVE takes precedence.

The compiler has detected a SAVE statement with no saved entity list and a STACK or SYMMETRIC directive in the same scope. The SAVE statement takes precedence over the directive. The STACK directive tells the compiler to put all local variables on the stack, but the SAVE statement tells the compiler to put all local variable in static storage. SAVE overrides because it is a standard part of the Fortran language. The SYMMETRIC directive, available on MPP platforms also infers stack storage for local variables. The same reasoning applies, make SAVE override SYMMETRIC.

Message ID: WARNING_1144


Warning : The result of 128 bit floating point operations currently may be of a lesser precision.

The result of 128 bit floating point operations currently may be of a lesser precision. This includes anything typed as DOUBLE PRECISION, DOUBLE PRECISION*16, REAL (kind=16), REAL*16 and DOUBLE COMPLEX.

Message ID: WARNING_1145


Warning : The !DIR$ INTEGER=46 directive will be removed in the next release; "-O fastint" will provide equivalent behavior.

f90 will no longer support the !DIR$ INTEGER=46 directive in the next release. The f90 command line option "-O fastint" will provide equivalent behavior. NOTE: !DIR$ INTEGER=32 and !DIR$ INTEGER=64 will still be accepted.

Message ID: WARNING_1146


Error : The INLINE ALWAYS and the INLINE NEVER directives have both been specified for this object. Only one may be specified.

The compiler has found an INLINE ALWAYS and a INLINE NEVER directive specified for the same object. Only one of these directives may be specified for an object.

Message ID: ERROR_1147


Internal : Can not build the message file.

This message should never be generated. The compiler encountered an error or an unexpected occurrence when building the message file. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code.

Message ID: INTERNAL_1148


Warning : N$PES has been referenced, but was not given a value with the -X option. A value of 0 (zero) is being used for N$PES.

Currently, F90_M only supports compile-time N$PES. Any program that references N$PES must supply a compile-time value for N$PES with the -X command line option. The compiler will use a value of 0 for N$PES if a value is not supplied on the command line.

Message ID: WARNING_1149


Internal : Line number is invalid.

Internal compiler error. Line number information on an operator is not a valid number. This means it was not set correctly.

Message ID: INTERNAL_1150


Error : Module has been referenced in a USE statement. It may not be redefined with a MODULE statement.

The Fortran standard states that it is illegal to have two global names that are the same. This makes the following case illegal: m.f: module m integer :: i=2 end module m1.f: program p use m ... end program module m ! This is illegal because a module m has been ! previously referenced. integer :: i=4 end module subroutine s() use m ... end subroutine

Message ID: ERROR_1151


Error : The size of the first (or only) dimension of MATRIX_B must equal the size of the last (or only) dimension of MATRIX_A.

The size of the first (or only) dimension of MATRIX_B must equal the size of the last (or only) dimension of MATRIX_A.

Message ID: ERROR_1152


Error : Invalid argument to the PACK intrinsic.

The VECTOR argument to the PACK intrinsic must have the same type and kind type parameters as the ARRAY argument. Also, the VECTOR argument must have rank one.

Message ID: ERROR_1153


Error : Invalid FIELD argument to the UNPACK intrinsic.

The FIELD argument must have the same type and kind type parameters as the VECTOR argument.

Message ID: ERROR_1154


Error : The MASK argument must be conformable with ARRAY.

The MASK argument to the PACK intrinsic must be conformable with the ARRAY argument.

Message ID: ERROR_1155


Error : Illegal value for the POS argument.

The POS argument must be nonnegative and less than BIT_SIZE(I).

Message ID: ERROR_1156


Warning : Module file was created with a previous compiler release. It will not be supported by the next major release.

The module file was created with a previous major release of this compiler. We guarantee upwards compatibility for one major release, so by the next major release, this module file needs to be recreated.

Message ID: WARNING_1157


Error : An ELSE IF block must not follow an ELSE block.

If an IF construct contains an ELSE block, the ELSE must be the last block in the construct. Thus, an ELSE IF block can not follow an ELSE block.

Message ID: ERROR_1158


Internal : The library format parser is issuing a message number that is unknown to the compiler.

The library format parser and the compiler are out of sync.

Message ID: INTERNAL_1159


Ansi : The NULL edit descriptor is an extension to the Fortran standard.

The compiler has detected ,, in a format specification. The Fortran standard does not allow a comma to follow a comma in a format specification.

Message ID: ANSI_1160


Caution : Alignment of variable in common may cause performance degradation.

On 32-bit architectures, a performance advantage is gained if multi-word items are aligned on a 64 bit boundary, rather than a 32 bit boundary. The object in question, is not aligned on a double word boundary because of its position in the common block. A 32-bit (default integer) size object may be inserted before this object in the common block declaration. This will cause the object to be aligned on a 64-bit boundary. A second option is to specify -a dalign on the commandline. This will cause the compiler to insert a 32-bit pad before the object. A warning will be issued whenever this pad is inserted.

Message ID: CAUTION_1161


Log_Warning : -i 46 means -i 32 or -i64 on this platform. -i 46 will be removed in the next release of this compiler.

The -i 46 commandline option will be treated as if -i 32 or -i64 (platform dependent) was specified on the commandline. In the next release of this compiler, the -i 46 commandline option will be removed.

Message ID: LOG_WARNING_1162


Warning : !DIR$ INTEGER=46 means INTEGER=32 or INTEGER=64 on this platform. The !DIR INTEGER=46 directive will be removed in the next release.

!DIR$ INTEGER=46 means !DIR$ INTEGER=32 or !DIR$ INTEGER=64, depending on the platform. After this release !DIR$ INTEGER=46 will no longer be supported.

Message ID: WARNING_1163


Internal : Internal compiler error in conditional compilation routine.

An internal compiler error occured within the routines that support conditional compilation.

Message ID: INTERNAL_1164


Error : Conditional compilation has unexpected syntax.

While parsing a conditional compilation directive, a syntax error was encountered.

Message ID: ERROR_1165


Error : Conditional compilation blocking error.

A conditional compilation directive was encountered that was not expected. This is a blocking error where conditional compilation directives like ENDIF, ELSE, or ELIF, do not have corresponding IF, IFDEF, or IFNDEF directives.

Message ID: ERROR_1166


Error : Conditional compilation error. Identifier is referenced but not defined.

An identifier was encounted in the expresion within a conditional compilation directive that was not previously defined in a # define statement.

Message ID: ERROR_1167


Error : Common block is specified in a CACHE ALIGN directive, therefore it must be specified in a COMMON statement.

If a common block is specified in a CDIR$ (!DIR$) CACHE ALIGN statement, the common block must also be declared in a COMMON or a TASK COMMON statement.

Message ID: ERROR_1168


Warning : The !DIR$ [NO]MODINLINE must be specified within the scope of a module.

The compiler has detected a MODINLINE or NOMODINLINE directive within the scope of a PROGRAM, BLOCKDATA, external SUBROUTINE or external FUNCTION. This directive must only be specified in a module or inside of any contained procedures within the module.

Message ID: WARNING_1169


Warning : The -eS (save all) commandline option has been specified. The !DIR$ SYMMETRIC directive is ignored.

The -eS commandline option causes all local variables to go to static storage. The !DIR$ SYMMETRIC directive only affects local stack variables. No variables are put on the stack because of -eS, so the !DIR$ SYMMETRIC directive does nothing.

Message ID: WARNING_1170


Error : An explicit type must be specified for this object, because -eI, the IMPLICIT NONE commandline option is specified.

The -eI commandline option causes an IMPLICIT NONE to be specified in each procedure in the compilation. This commandline option is in effect for this compilation. The listed object needs to have an explicit type specified.

Message ID: ERROR_1171


Log_Warning : -s cf77types is for FORTRAN 77 programs only. If used with Fortran 90 programs, unexpected behavior may result.

The -s cf77types option is designed to make FORTRAN 77 programs that use an asterisk in a noncharacter type declaration (such as INTEGER*8) continue to work in the manner in which they worked with the CF77 compiler. The f90 compiler treats declarations using an asterisk the same as declarations using kind type parameter values; for example, INTEGER*8 has the same meaning as INTEGER(KIND=8). All new Fortran programs should be written with this in mind. Note: -s cf77types is replacing the -si option because it is a more descriptive name.

Message ID: LOG_WARNING_1172


Internal : A bad value has been used as a target word bit size. Only 32 and 64 are valid bit sizes.

Several utility routines take as input a word bit size. This compiler currently only targets 32 and 64 bit words. Either 32 or 64 must be passed to the utility routine.

Message ID: INTERNAL_1173


Error : The dope vector element length has exceeded the maximum length.

The dope vector element length was exceeded.

Message ID: ERROR_1174


Error : Integer overflow has occurred while calculating array bounds, character length or offset.

The compiler does internal folding to calculate such things as array length, stride between elements of an array, structure size, component size, size of an object, offsets for storage assignment ect.. During one of tests calculations an integer overflow occurred.

Message ID: ERROR_1175


Error : The SHAPE array for the RESHAPE intrinsic function contains a negative value.

The SHAPE array for a RESHAPE intrinsic function call must not contain any element that is negative.

Message ID: ERROR_1176


Error : Conditional compilation #error.

An #error conditional compilation directive was encountered. The text of the directive is included with this error message.

Message ID: ERROR_1177


Error : The conditional compilation ERROR directive must not be continued.

The message text used on a conditional compilation ERROR directive must fit on one line. The length of the line is the length of the Fortran source line which is dependent on source form and the -N command line option.

Message ID: ERROR_1178


Internal : Internal compiler error. Invalid type in folder_driver call.

The routine folder_driver was called with an improper type for the operator result, or improper types for its arguments.

Message ID: INTERNAL_1179


Error : This has already been named as a pointee in a POINTER statement. It cannot be given character type now.

A character pointee must be declared as an assumed-size character variable. Character pointee arrays are not valid.

Message ID: ERROR_1180


Error : Module file must be recompiled. Its format is unsupported.

The module file specified was compiled with a prerelease compiler or with an old no longer supported compiler. (We commit to supporting one major release previous to the current release.) The current version of the compiler has changed its module format and the module file has a format that is not supported.

Message ID: ERROR_1181


Log_Error : "-O taskinner" is specified, therefore "-O task2" or "-O task3" must be specified.

The optimization option "taskinner" was specified. Therefore, either the optimization option "task2" or "task3" must also be specified.

Message ID: LOG_ERROR_1182


Error : Module file must be recompiled. It was created by a later release of f90.

The module file specified was compiled with a compiler that was a later release than this compiler. Its has a format that is not supported by this compiler and must be recompiled.

Message ID: ERROR_1183


Warning : Evaluation of this constant expression produced a NaN or other abnormal value.

When computing the value of a constant expression, the compiler encountered an abnormal value such as a NaN. A constant expression is an expression involving only constants. The value of the expression is determined at compile time rather than at execution time. This warning may occur during an intermediate computation (for example, addition, subtraction, multiplication, division, or exponentiation) or may occur when data conversion is required during the computation (for example, converting from double precision to real).

Message ID: WARNING_1184


Log_Warning : The "-O pattern" option is temporarily disabled.

libsci is not yet available so the "-O pattern" option is temporarily disabled. When specified, it is ignored.

Message ID: LOG_WARNING_1185


Error : The actual argument to IACHAR and ICHAR must have length equal to one character.

The actual argument to IACHAR and ICHAR must have length = 1.

Message ID: ERROR_1186


Error : The SHAPE argument specified is not valid for the SOURCE argument provided.

The number of elements in the array constructor provided for the SOURCE argument is not equal to the product of the extents specified by the SHAPE argument.

Message ID: ERROR_1187


Error : The arguments to this bitwise intrinsic or operator must be the same size.

Arguments to bitwise intrinsics, such as AND and OR, must be the same number of words long. On solaris, this is not allowed integer * 8 i real * 4 x print *, or(i,x) Also, on solaris, this is not allowed. print *, i.or.x

Message ID: ERROR_1188


Warning : This numeric constant is out of range.

A numeric real constant was found to be out of range for the data type specified. This warning is issued to point out that the overflow/underflow occured and the proper IEEE value (Inf, -Inf) has been stored for the constant.

Message ID: WARNING_1189


Internal : Internal compiler error. Invalid type or constant sent to cvrt_str_to_cn.

This is an internal compiler error.

Message ID: INTERNAL_1190


Internal : Unsupported operator in expr_sem.

Internal compiler error.

Message ID: INTERNAL_1191


Log_Warning : Two options conflict, so the first option is ignored.

Two options conflict. The first option named in the message was specified on the f90 command line before the second option named in the message. The first option is ignored (the second option overrides it). For example, if "-O fastint" is specified on the f90 command line and then "-i 64" is specified, the "-O fastint" option is ignored ("-i 64" overrides it).

Message ID: LOG_WARNING_1192


Caution : Module is indirectly used in another module from a file that no longer exists.

When a module is used, the path and filename where the compiled module is found are stored with the module information. The loader uses this stored information to find the compiled module for loading purposes. (The module may contain module procedures and/or initialized data that is needed in the load step.) An indirectly used module is when module B uses module A and then module C uses module B. Module A is then indirectly referenced in module C. When a module is indirectly used, the compiler checks to see if the compiled module file is still available. If the compiler can no longer detect the compiled module file, this Caution message is issued. Compilation will successfully complete and does not depend on this compiled module file. The load step does need the compiled module file, so its current location must be specified on the load line.

Message ID: CAUTION_1193


Ansi : The use of the Dw.dEe edit descriptor is an extension to the Fortran standard.

The Dw.dEe edit descriptor is non-standard. Dw.d is a valid Fortran edit descriptor. It is the addition of the Ee that makes it non-standard.

Message ID: ANSI_1194


Warning : Possible function result type conflict. -i32 changes the type to a half word integer.

Commandline option -i32 has been used with this compilation. On an MPP, this option only assigns a half word of storage to an item declared to be type default integer. In this function, one or more results is of type default integer and one or more results is of a type other than default integer. With -i32, the default integer result(s) is now only a half word, rather than a full word of storage. The type of the other result(s) has not changed. Using -s default32 will change all default types to half word.

Message ID: WARNING_1195


Log_Warning : One commandline option is being replaced by another. The former will no longer be available in the next release.

In release 2 to be removed in release 3: Commandline option -O unroll is the same as -O unroll2. Option -O nounroll is the same as -O unroll0. We are removing -O unroll and -O nounroll to avoid duplication. In release 3 to be removed in release 4: Commandline option -si is the same as -scf77types. We are renaming -si to -s cf77types so that we have a more descriptive name.

Message ID: LOG_WARNING_1196


Error : Subscript out of range.

An array reference was encountered where a subscript was out of bounds for the array. The compiler will check array bounds at compile time if -RM is specified and the subscript and bounds values are constant.

Message ID: ERROR_1197


Caution : Alignment of component in numeric sequence structure may cause performance degradation.

On 32-bit architectures, a performance advantage is gained if multi-word items are aligned on a 64 bit boundary, rather than a 32 bit boundary. The component in question, is not aligned on a double word boundary because of its position in the derived type. A 32-bit (default integer) size component may be inserted before this component in the derived type declaration. This will cause the component to be aligned on a 64-bit boundary. A second option is to specify -a dalign on the commandline. This will cause the compiler to insert a 32-bit pad before the component. A warning will be issued whenever this pad is inserted. Following are two examples of this situation: .... TYPE X SEQUENCE INTEGER :: A COMPLEX :: B END TYPE TYPE(X) :: Q TYPE(X) :: R SAVE Q,R In the above example, we will assume that Q is at offset 0 in the local static storage block and R is at offset 96. This means Q%B is not aligned on a double word boundary, but R%B is aligned on a double word boundary. .... TYPE A SEQUENCE COMPLEX :: X INTEGER :: Y COMPLEX :: Z END TYPE In this example, there is no way that the X component and the Z component can both be double aligned without a 32 bit pad being inserted before component Z.

Message ID: CAUTION_1198


Log_Warning : Inlining may not be combined with debugging. Inlining has been turned off.

Inlining does not work with debugging.

Message ID: LOG_WARNING_1199


Internal : An invalid name is being entered into a name table. The name must not be NULL and must be greater than one in length.

The name being entered into a name table must be a valid name. It must be non-NULL and have a length greater than 0.

Message ID: INTERNAL_1200


Internal : The offset or length for block or object must be constant. It is not.

Offsets and block lengths may be based on N$PEs for common blocks, static blocks and other user declared areas. The compiler has detected the use of a N$PE constant being used where a true constant is required.

Message ID: INTERNAL_1201


Inline : Routine was not inlined.

There are conditions which inhibit a routine from being inlined. For example: routines containing ASSIGN statments cannot be inlined.

Message ID: INLINE_1202


Internal : Bad assumption in create_constructor_constant.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_1203


Inline : The call was inlined.

This routine was expanded in place. The overhead of the call no longer exists.

Message ID: INLINE_1204


Error : Dummy argument is longer than the actual argument.

An actual argument of type character is associated with a dummy argument whose length is longer than that of the actual argument. Actual arguments of type character must have a length that is greater than or equal to that of the associated dummy argument.

Message ID: ERROR_1205


Error : Asterisk is not allowed as UNIT control item specifier for this statement.

The UNIT= specifier can only be an asterisk when used in a WRITE, PRINT, or READ statement.

Message ID: ERROR_1206


Error : An asterisk can not be used as the UNIT control item specifier for unformatted I/O.

In a READ, WRITE, or PRINT I/O statement, the UNIT specifier can not be an asterisk if the I/O is unformatted.

Message ID: ERROR_1207


Ansi : A FMT or NML specifier without a keyword following a keyworded UNIT specifier is an extension to the Fortran standard.

F90 allows IO control lists that break the rules of keyworded arguments when the first specifier is the UNIT specifier with a UNIT= keyword and the second argument does not have a keyword. Ordinarily, this would be an error in that the compiler would not know what the specifier without the keyword is. In this case, and this case only, the compiler assumes that the second specifier is the FORMAT or NAMELIST specifier. WRITE ( UNIT = 10, *) I

Message ID: ANSI_1208


Inline : Routine was conditionally expanded inline.

Non-constant stride multipliers were detected in an array mapping. A conditional test was generated to determine if the call should be executed or the inlined routine.

Message ID: INLINE_1209


Error : Subprograms that contain assigned GOTO statements cannot contain Autotasking directives.

An assigned GOTO statement was encountered within a subprogram that contains Autotasking directives. Branches in or out of a parallel region are not allowed and the assigned GOTO has this potential.

Message ID: ERROR_1210


Error : The character length is dependent upon the runtime N$PES symbolic constant. This is not allowed.

Runtime N$PES must only be used for array bounds. It must not be used to declare character length.

Message ID: ERROR_1211


Error : An initialization expression must not contain symbolic constant.

Symbolic constants are not allowed in initialization expressions. These must be true constants. Examples where this is not allowed include component bounds and kind types.

Message ID: ERROR_1212


Internal : This must be a constant or a symbolic constant tmp.

ATD_OFFSET_IDX and SB_LEN_IDX must be constant values or symbolic constants represented by compiler temps.

Message ID: INTERNAL_1213


Error : INTENT OUT dummy arguments may not have a constant passed as an actual argument.

The user has tried to map a constant actual argument onto an INTENT OUT dummy argument.

Message ID: ERROR_1214


Log_Warning : Commandline option "-du" must not be specified with "-O ieeeconform". "-eu" is in effect.

The -O ieeeconform option, available on IEEE platforms causes the resulting executable code to conform more closely to the IEEE floating-point standard. The -du option on IEEE platforms, causes a faster divide sequence to be used, which may affect the results when converting to an integer value or when comparing results with those obtained from another system that supports IEEE floating-point arithmetic. The -eu option on IEEE platforms causes a true IEEE divide sequence to be generated. Thus, since -O ieeeconform is requesting executable code to conform more closely to the IEEE floating-point standard, -eu is in affect causing a true IEEE divide sequence to be geneated.

Message ID: LOG_WARNING_1215


Log_Warning : Commandline option "-O ieeeconform" causes default option "-du" to be switched to "-eu".

The -O ieeeconform option, available on IEEE platforms causes the resulting executable code to conform more closely to the IEEE floating-point standard. The -du option on IEEE platforms, causes a faster divide sequence to be used, which may affect the results when converting to an integer value or when comparing results with those obtained from another system that supports IEEE floating-point arithmetic. The -eu option on IEEE platforms causes a true IEEE divide sequence to be generated. Thus, since -O ieeeconform is requesting executable code to conform more closely to the IEEE floating-point standard, -eu is in affect causing a true IEEE divide sequence to be generated.

Message ID: LOG_WARNING_1216


Error : An autotasking directive is missing for this directive.

All parallel and guarded regions must be terminated before entering or terminating a scope or block. If a CONTAINS statement or END, END FUNCTION, or END SUBROUTINE statement is encountered while in a parallel region or guarded region, an error is issued. Also the parallel or guarded region must be properly nested within or fully contain code blocks like IF, DO, CASE, or WHERE constructs.

Message ID: ERROR_1217


Log_Warning : Implementation of commandline option is deferred.

Implementation of the specified commandline is deferred until a future revision or release.

Message ID: LOG_WARNING_1218


Error : This directive does not precede a DO loop construct.

A DO PARALLEL or DO ALL autotasking directive was encountered where no DO loop construct was found. The DO PARALLEL directive can only be specified within a parallel region and must precede a DO loop. The DO ALL must not be specified within a parallel region and must precede a DO loop.

Message ID: ERROR_1219


Error : Illegal branch into or out of an autotasking region.

It is illegal to branch into or out of a PARALLEL, DOALL, CASE, or GUARD autotasking region. This includes GOTO statements as well as ERR=, EOF= or EOR= branches from IO statements and alternate return branches from subroutine calls.

Message ID: ERROR_1220


Log_Warning : The -O commandline option has been specified with no arguments. It will be ignored.

The -O commandline option specifies optimization options for compilation. If it is specified with no arguments it is ignored and does not change any optimization levels.

Message ID: LOG_WARNING_1221


Error : The FIELD argument to the UNPACK intrinsic does not conform to MASK.

The MASK and FIELD arguments must be conformable with the UNPACK intrinsic.

Message ID: ERROR_1222


Error : This has an attribute which means it must not be an array whose bounds are determined by a symbolic constant expression.

The compiler detected a conflict in declarations for this object. The object must not be declared as an array whose bounds are determined by a symbolic constant expression, because it is equivalenced, data initialized, typed as an assumed-length character and/or has one or more of the following attributes: ALLOCATABLE DIMENSION PARAMETER SAVE PRIVATE PUBLIC POINTER EXTERNAL INTRINSIC VFUNCTION NOSIDE EFFECTS

Message ID: ERROR_1223


Error : This has already been declared in a way which means it must not be an array whose bounds are determined by a symbolic constant expression.

The compiler detected a conflict in declarations for this object. The object must not be an array whose bounds are determined by a symbolic constant expression. because it has been declared to be one of the following: Cray pointer module procedure derived type generic interface namelist group statement function construct module block data program

Message ID: ERROR_1224


Warning : Character constant intrinsic argument has been converted to Hollerith.

A character constant is used as an actual argument to an intrinsic function that does not accept character arguments, but it does accept Boolean (or Hollerith) arguments. F90 treats a character constant as Hollerith in contexts in which a character constant is invalid and a Hollerith constant is legal.

Message ID: WARNING_1225


Limit : The "-ea" option was specified so the compilation is aborting on the first error.

If the -ea option is enabled, the compilation aborts after encountering the first error.

Message ID: LIMIT_1226


Error : This common block member must not be initialized, because the block length is dependent on a symbolic constant.

If a common block has an array whose length is based on a symbolic constant, no members of the common block may be data initialized, because the offsets and length of the block are based on symbolic constants.

Message ID: ERROR_1227


Error : This common block member must not be equivalenced, because the block length is dependent on a symbolic constant.

If a common block contains an array whose length is dependent on a symbolic constant, no items in the common block may be equivalenced. The offsets of objects in the common block and the block length are based on symbolic constants.

Message ID: ERROR_1228


Ansi : The use of symbolic constant is non standard.

The use of symbolic constants, (constants whose values are not known until load or runtime) is not part of the Fortran standard.

Message ID: ANSI_1229


Error : Entry point is an array based on symbolic constants. There are multiple entry points, so this is not allowed.

If a function has alternate entry points, the function and its entry points are equivalenced together. Equivalencing is not allowed for arrays whose length is determined by a symbolic constant expression, thus if a function has multiple entry points, none of the entry points can have an array length based on a symbolic constant expression. An array-valued function with no alternate entry points, may have an array length based on a symbolic constant expression.

Message ID: ERROR_1230


Log_Warning : Commandline options -Xm and -X # (where # is number of N$PES) are mutually exclusive. The last -X takes precedence.

Commandline options -Xm and -X# are mutually exclusive. -Xm means malleable. N$PES should not be specified in the program. -X #, says use # number of pes to compile this program with. The compiler uses the last specified -X option on the commandline.

Message ID: LOG_WARNING_1231


Error : Commandline option -Xm has been specified, so N$PES must not be used in a declaration statement.

-Xm means the program being compiled is malleable, therefore N$PES should not be specified in the program unit declaration section. N$PES must lnly be used in executable code. It must not be used to declare array bounds when -Xm is specified. The compiler is issuing an error because it has found a reference to N$PES in an array bounds declaration.

Message ID: ERROR_1232


Error : This directive must not be specified in the specification part of a MODULE.

The following directives are not allowed within the specification part of a MODULE. SYMMETRIC: This directive causes stack based variables to be put on the shared stack. The specification part of a MODULE has no stack based variables, so the SYMMETRIC directive has no meaning in a MODULE.

Message ID: ERROR_1233


Caution : The SYMMETRIC directive does not apply to variable because the variable has a conflicting attribute.

Specifying !DIR$ SYMMETRIC with no variable names, causes all variable stored on the stack, to be stored on the shared stack. The following attributes prevent the variable from being stored on the shared stack: TARGET AUXILIARY The variable will be stored on the non-shared stack.

Message ID: CAUTION_1234


Error : Variable must not be specified with the !DIR$ SYMMETRIC directive because it is host associated.

Host associated variables must not be specified with the SYMMETRIC directive.

Message ID: ERROR_1235


Caution : SYMMETRIC does not apply to variable "%s" because it is host associated.

At this time host associated stack variables may not be stored on the shared stack.

Message ID: CAUTION_1236


Internal : I/O problem in module processing.

Module processing found an unexpected I/O problem. strerror is used to give more clues as to what went wrong.

Message ID: INTERNAL_1237


Log_Error : This is an invalid argument to the -X commandline option. The argument to -X must be m or in the range 1 thru 2048.

-X npes specifies the number of npes to use during execution. npes must be m (for malleable) or an integer in the range 1 thru 2048.

Message ID: LOG_ERROR_1238


Error : All objects in this equivalence set must be default numeric or numeric sequence derived type. This is not.

From the Fortran standard: "If an equivalence-object is of type default integer, default real, double precision real, default complex, default logical, or numeric sequence type, all of the objects in the equivalence set must be of these types." This compiler allows as an extension, the mixing of default numeric types with default character type in an equivalence set. Numeric sequence derived types are not allowed to be mixed with default character or character sequence derived types.

Message ID: ERROR_1239


Error : All objects in this equivalence set must be default character or character sequence derived type. This is not.

From the Fortran standard: "If an equivalence-object is of type default character or character sequence type, all of the objects in the equivalence set must be of these types." This compiler also allows as an extension, the mixing of default numeric types with default character types. Character sequence types are not allowed to be mixed with default numeric types.

Message ID: ERROR_1240


Error : Object is a non-default intrinsic type. All objects in this equivalence set must be the same type and kind type.

From the Fortran standard: "If an equivalence-object is of an intrinsic type other than default integer, default real, double precision real, default complex, default logical or default character, all of the objects in the equivalence set must be of the same type with the same kind type parameter value."

Message ID: ERROR_1241


Error : This is a not a character or numeric sequence derived type, so all objects in the equivalence set must be the same type.

From the Fortran standard: "If an equivalence-object is of a derived type that is not a numeric sequence or character sequence type, all of the objects in the equivalence set must be of the same type."

Message ID: ERROR_1242


Ansi : The .LG. operator is an extension to the Fortran standard.

The .LG. or <> operator is defined by the IEEE Floating Point standard but is not defined in the Fortran standard. Support for this operator is an extension to the Fortran standard.

Message ID: ANSI_1243


Warning : This is a derived type whose components are typed using -s default32. Equivalence storage association may not be as expected.

-s default32 causes all default types to be 32 bit based types rather than 64 bit based types. In derived types, all components must be on a full word boundary, so two components declared to be of 32 bit types are separated with a 64 bit pad.

Message ID: WARNING_1244


Error : Object was not declared with processor dimensions.

A reference was encountered with the [..] processor dimension syntax but the object was not declared with processor dimensions. The following example will produce this error. integer i(10) i(1)[3,4] = 1 end

Message ID: ERROR_1245


Error : Precompiled procedure is incompatible with this compiling system. Recompile with this compiling system.

The compiler is attempting to read a precompiled procedure for inlining. The precompiled procedure was created with an incompatible compiler. Recompile the procedure with the current compiler and command line options to ensure compatibility.

Message ID: ERROR_1246


Error : Precompiled procedure must be targeted for the same operating system as this compilation.

The precompiled procedure being inlined must be targetted for the same operating system as this compilation. Target operating systems may not be mixed.

Message ID: ERROR_1247


Error : Procedure and this compilation must both be compiled with this option, or both must be compiled without the option.

If the current compilation unit is being compiled with the listed option , each module it uses or each precompiled procedure it inlines must be compiled with the same options. If the current compilation unit is being compiled without the listed option, each module it uses or each precompiled procedure it inlines must be compiled without the option.

Message ID: ERROR_1248


Limit : Module was compiled in this compilation, but the compiler can no longer find the module.

When a module is compiled, the compiler keeps the module information table in a temporary file during compilation. When the module is specified in a USE statement the compiler attempts to read the module information table from the temporary file. Something has happened to the temporary file and the compiler cannot read up the module.

Message ID: LIMIT_1249


Internal : Expected to find this in the global name table, but srch_global_name_tbl returned not found.

At certain points in compilation the global name table is searched for names that were put in earlier during compilation. This error is issued when the expected name is not found. This error should never happen.

Message ID: INTERNAL_1250


Log_Error : The optional pad amount specified on the -apad[n] commandline option must be between 0 and 4096.

An optional pad amount may be specified on the -apad[n] commandline option. This number must be a integer literal constant greater than zero and less than 4096. The number specified is not within this range.

Message ID: LOG_ERROR_1251


Log_Error : The binary output file is the same as the binary output file created for inlinefrom file "%s".

The inlining information is stored in the binary output file. When x.f is specified with -Oinlinefrom=x.f, the compiler creates a file called x.o which holds the inlining information. If the following commandline is specified -Oinlinefrom=x.f x.f, then x.o, created during the inlinefrom call to the compiler is overwritten by the actual call to compile x.f. A method around this would be to specify an alternate binary file using -b file.o. For example: -Oinlinefrom=x.f -b out.o x.f

Message ID: LOG_ERROR_1252


Ansi : This statement is an extension to the Fortran standard.

The AUTOMATIC statement is an extension to the Fortran standard.

Message ID: ANSI_1253


Ansi : This attribute is an extension to the Fortran standard.

The AUTOMATIC attribute is an extension the Fortran standard.

Message ID: ANSI_1254


Error : This must not have the AUTOMATIC attribute as it is an array, pointer, character or a derived type function result.

The AUTOMATIC attribute must not be given to a function result that is array valued or pointer valued, or that is of type character or derived type.

Message ID: ERROR_1255


Error : Object has an attribute which means it must not be equivalenced to an object in a common block.

The user tried to equivalence a saved object to a common block or an object with the AUTOMATIC attribute to a common block.

Message ID: ERROR_1256


Error : Object has an attribute which means all objects in this equivalence group must have the %s attribute.

If one object in an equivalence group has the AUTOMATIC attribute, all objects in the equivalence group must have the AUTOMATIC object.

Message ID: ERROR_1257


Error : Module contains objects whose type is integer(kind=6) or integer*6. This is no longer supported.

A warning was issued in the previous release alerting users that the compiler will no longer support the integer*6 and integer(kind=6) types. Objects have been found of this type in the module being used. The integer*6 and/or integer(kind=6) declarations must be changed and the module recompiled.

Message ID: ERROR_1258


Ansi : This has been given an attribute more than once. This is nonstandard.

It is nonstandard to declare an object as having the same attribute mutiple times.

Message ID: ANSI_1259


Error : Prefix-spec is specified twice for this subprogram.

The same prefix-spec may not be specified more than once for a subprogram. A prefix-spec may be RECURSIVE, PURE, ELEMENTAL and/or type-spec. type-spec is a valid type specification such as INTEGER, CHARACTER*(10) or TYPE (derived_type_name).

Message ID: ERROR_1260


Error : RECURSIVE and ELEMENTAL must not be specified for the same subprogram.

A constraint to R1219 in the Fortran 95 standard prohibits prefix-specs RECURSIVE and ELEMENTAL from being specified for the same program unit.

Message ID: ERROR_1261


Error : This statement is not allowed within a PURE subprogram.

The following statements are not allowed within PURE subprograms. print statement open statement close statement backspace statement endfile statement rewind statement inquire statement stop statement pause statement This is a constraint to pure procedures (12.6). By definition an elemental procedure is a pure procedure, so these constraints apply to an elemental procedure as well.

Message ID: ERROR_1262


Error : A statement whose io-unit is an external-file-unit or *, is not allowed in a pure subprogram.

A constraint to pure procedures (12.6) prohibits read and write statements whose io-unit is an external-file-name or * to be specified in a pure subprogram. By definition an elemental procedure is a pure procedure, so this constraint applies to elemental procedures as well.

Message ID: ERROR_1263


Error : Variable in subprogram must not be given this attribute.

Variables in a pure subprogram must not be given the SAVE or data-initialization attributes. By definition an elemental procedure is a pure procedure, so this constraint applies to elemental procedures as well.

Message ID: ERROR_1264


Error : Non-pointer dummy argument to pure FUNCTION must have INTENT(IN) specified for it.

The specification part of a pure FUNCTION shall specify that all dummy arguments have INTENT(IN) except procedure arguments (dummy procedures) and arguments with the POINTER attribute. By definition all elemental FUNCTIONS are pure, so this applies to elemental FUNCTIONS as well.

Message ID: ERROR_1265


Error : Non-pointer dummy argument to pure SUBROUTINE must have an intent specified for it.

The specification part of a pure subroutine shall specify the intents of all dummy arguments except procedure arguments (dummy procedures), alternate return indicators and arguments with the POINTER attribute. By definition, elemental procedures are pure procedures, so this applies to elemental subroutines also.

Message ID: ERROR_1266


Error : This is a dummy argument to an elemental subprogram, so it must be a non-pointer scalar dummy argument.

A constraint to 12.7.1 in the Fortran standard requires all dummy arguments to elemental subprograms to be non-pointer and scalar. The dummy arguments must not be dummy procedures either.

Message ID: ERROR_1267


Error : This is an elemental function, so its function result must be scalar and cannot be a pointer.

A constraint to 12.7.1 requires function results for an elemental function to be scalar. They cannot be pointers.

Message ID: ERROR_1268


Error : An alternate return specifier is not allowed as a dummy argument to elemental SUBROUTINE.

A constraint to 12.7.1 in the Fortran standard says that a dummy argument to an elemental subroutine must not be *. * is an alternate return specifier.

Message ID: ERROR_1269


Error : This must not be defined inside of a pure subprogram. It is in common, a dummy argument or host or use associated.

A constraint to 12.6 pure procedures, prohibits the following dummy arguments from being defined within a pure subprogram: all dummy arguments to a function subprogram and all dummy arguments with the INTENT(IN) attribute with a subroutine subprogram. A constraint to 12.6 also prohibits the name of a common, host associated or use associated variable from appearing in a statement that would change the variable's value. The variable can be used but not redefined inside a pure subprogram. By definition, an elemental subprogram is pure, so the above constraints also apply to dummy arguments and variables within elemental subprograms.

Message ID: ERROR_1270


Error : This is a dummy procedure to pure subprogram. It must be specified with the PURE prefix-spec.

A constraint to 12.6 pure procedures, states that the specification-part of a pure subprogram shall specify that all dummy arguments that are procedure arguments are pure. In other words if there is a dummy procedure specified for a pure subprogram, that dummy procedure must have an explicit interface and that interface must specify it as pure. Dummy procedures must not be specified in elemental subprograms.

Message ID: ERROR_1271


Error : This is an internal subprogram to a pure subprogram. It must be given the pure prefix-spec.

A constraint to 12.6 Pure procedures in the Fortran standard states that all internal subprograms in a pure subprogram shall be pure. In other words, if an external subprogram is a pure subprogram, all its internal subprograms must also be declared as pure subprograms. By definition an elemental subprogram is pure, so the above constraint also applies to elemental subprograms.

Message ID: ERROR_1272


Error : This must not be argument associated in this way in a pure subprogram.

A constraint to 12.6 pure procedures, prohibits all dummy arguments to a function subprogram and all dummy arguments with the INTENT(IN) attribute with a subroutine subprogram, as weel as a common, host associated or use associated variable from being used as an actual argument associated with a dummy argument with INTENT(out) or INTENT(inout) or with the POINTER attribute. By definition, an elemental subprogram is pure, so the above constraint also applies to all dummy arguments within elemental subprograms.

Message ID: ERROR_1273


Error : Procedure must be pure, because it is referenced in a pure subprogram.

A constraint to 12.6, PURE procedures states that any procedure referenced in a pure subprogram, including one referenced via a defined operation or assignment shall be pure. A related constraint states that any procedure that is neither an intrinsic procedure nor a statement function and is referenced in a context requiring it to be pure, must have an explicit interface in the same scope as the reference. By definition an elemental procedure is also a pure procedure, so all constraints that apply to pure procedures, also apply to elemental procedures.

Message ID: ERROR_1274


Warning : Common block is used in multiple program units and has different lengths in the different program units.

During cross compilation semantics, the compiler has detected the same common block being used in multiple program units. The length of the common block varies in the program units.

Message ID: WARNING_1275


Warning : Common block is used in multiple program units. It must be in the same storage in all uses.

During cross compilation semantics, a common block was used in multiple program units. If the common block is in AUXILIARY storage in one program unit, it must be in AUXILIARY storage in all program units. If the common block is in TASK COMMON storage in one program unit, it must be in TASK COMMON storage in all program units.

Message ID: WARNING_1276


Error : Procedure is defined but it must have an explicit interface specified.

12.3.1.1 Explicit interfaces in the Fortran standard specifies that: A procedure other than a statement function shall have an explicit interface if the procedure is elemental or the procedure has (a) An optional dummy argument (b) A dummy argument that is an assumed-shape array, a pointer or a target (c) An array-valued result (functions only.) (d) A result that is a pointer (functions only) (e) A result whose character length parameter value is not assumed and not constant During global semantics the compiler has detected a call to an external procedure and has found an explicit interface for that procedure in another program unit during compilation. The explicit interface for that procedure describes the procedure as having one or more of the above characteristics. These characteristics require that an explicit interface be specified for this program unit in all program units that reference this procedure.

Message ID: ERROR_1277


Warning : Procedure is defined but has illegal association of array actual argument with scalar dummy argument.

Global semantics detected a difference between a definition and a reference in another program unit. A scalar dummy argument cannot have an array-valued actual argument associated with it.

Message ID: WARNING_1278


Warning : Procedure is defined but the actual argument type does not agree with the type of dummy argument.

Global semantics detected a difference between a definition and a reference in another program unit. The type of actual arguments associated with dummy arguments must agree.

Message ID: WARNING_1279


Warning : Directive is being replaced. It will no longer be available in the next release.

Directive MODINLINE is the same as directive INLINABLE. Directive NOMODINLINE is the same as directive NOININABLE. We are removing !DIR$ MODINLINE and !DIR$ NOMODINLINE because !DIR$ INLINABLE/NOINLINABLE is less specific. MODINLINE/NOMODINLINE applies only to module procedures. INLINABLE/NOINLINABLE can apply to all external procedures.

Message ID: WARNING_1280


Error : This use of the COPY_ASSUMED_SHAPE directive is not allowed.

The COPY_ASSUMED_SHAPE directive can be used in two ways. With an argument list, it specifies a group of conformant assumed shape dummy arguments that are to be copied to contiguous arrays. Without a list, all assumed shape dummy arguments are assumed to be conformant. It is not allowed to use both the directive with a list and one without a list.

Message ID: ERROR_1281


Error : Global name is defined one way at a previous line and another way in this program unit.

The scope of a global name is an entire compilation unit, so a global (or external) name must only be declared once. The compiler has found 2 separate program unit definitions for this object during this compilation. Something similar to the following has been found: function f() f = 2.0 end function ... subroutine f() ! A message is issued because f is both a function and ! a subroutine. end subroutine

Message ID: ERROR_1282


Error : Global name is declared in an interface block, but is defined differently in this program unit.

During global semantics for this compilation, the compiler found that the actual program unit definition disagrees with an interface block for this program unit. These should be the same.

Message ID: ERROR_1283


Warning : Procedure is defined and has a certain number of dummy argument(s). This interface has a different number of dummy argument(s) specified.

During global semantics for this compilation, the compiler found that the actual program unit definition disagrees with an interface block for this program unit. These should be the same. The number of dummy arguments differs between the actual program unit definition and an interface block for this program unit.

Message ID: WARNING_1284


Error : The attribute is specified in either the program unit or interface block definition, but not in both.

During global semantics for this compilation, the compiler found that the actual program unit definition disagrees with an interface block for this program unit. These should be the same. Attributes checked include vfunction, nosideeffects, pure, elemental and recursive.

Message ID: ERROR_1285


Warning : Type and/or rank for dummy argument defined at a previous line does not agree with this interface block.

During global semantics for this compilation, the compiler found that the actual program unit definition disagrees with an interface block for this program unit. These should be the same. The type and rank of all dummy arguments must agree.

Message ID: WARNING_1286


Warning : Type and/or rank for result to function defined at a previous line does not agree with this interface block.

During global semantics for this compilation, the compiler found that the actual program unit definition disagrees with an interface block for this program unit. These should be the same. The type and rank for the function result should be the same.

Message ID: WARNING_1287


Warning : Global name is defined one way at a previous line, but declared in this interface block in a different way.

During global semantics for this compilation, the compiler found that the actual program unit definition disagrees with an interface block for this program unit. These should be the same.

Message ID: WARNING_1288


Error : This directive cannot be specified within a DO PARALLEL loop.

Nesting of another DO PARALLEL directive within a DO loop that was specified as a DO PARALLEL loop is not allowed. The CASE directive is also not allowed in this context.

Message ID: ERROR_1289


Warning : Type and/or rank for result to function in the interface block at a previous line differs with this definition.

During global semantics for this compilation, the compiler found that the actual program unit definition disagrees with an interface block for this program unit. These should be the same. The type and rank for the function result should be the same.

Message ID: WARNING_1290


Warning : Type and/or rank for dummy argument in the interface block at a previous line differs with this definition.

During global semantics for this compilation, the compiler found that the actual program unit definition disagrees with an interface block for this program unit. These should be the same. The type and rank of all dummy arguments must agree.

Message ID: WARNING_1291


Warning : The interface block for this procedure at a previous line has a certain number of dummy argument(s). The definition has a different number of dummy argument(s).

During global semantics for this compilation, the compiler found that the actual program unit definition disagrees with an interface block for this program unit. These should be the same. The number of dummy arguments differs between the actual program unit definition and an interface block for this program unit.

Message ID: WARNING_1292


Warning : Global name is defined one way at a previous line, but is referenced in a different way in this program unit.

The scope of a global name is an entire compilation unit. Any references to this global name, must be correct and match the definition of this name. The compiler has found a program unit definition that does not match its reference. Something similar to the following has been found: program f ... end program ... subroutine f() call p() ! A message will be issued because p is a program in ! this compilation. end subroutine

Message ID: WARNING_1293


Warning : Type and/or rank for result to function defined at a previous line does not agree with this function reference.

During global semantics for this compilation, the compiler found that the actual program unit definition disagrees with a reference to the function. The type and rank for the function result should be the same.

Message ID: WARNING_1294


Warning : Procedure is defined at a previous line and has a certain number of dummy argument(s). This reference has a different number of actual argument(s) specified.

During global semantics for this compilation, the compiler found that the actual program unit definition disagrees with a reference to the procedure. The number of dummy arguments differs between the actual program unit definition and the number of actual arguments specified on this reference. If the definition has optional arguments, an explicit interface should be specified for this reference in this program unit.

Message ID: WARNING_1295


Warning : Subroutine defined at a previous line has an alternate return dummy argument, so this actual argument must be a user label.

Global semantics detected a difference between a definition and a reference in another program unit. An explicit interface defines this dummy argument as an alternate return argument (*), but the call site does not supply a user label as the corresponding actual argument.

Message ID: WARNING_1296


Warning : Procedure is defined at a previous line with a dummy argument as a data object. The actual argument is a procedure.

During global semantics the compiler found a mismatch between a dummy argument and an actual argument. If the dummy argument is a data object, the actual argument must be a data object. If the dummy argument is a dummy procudure, the actual argument must be a procedure.

Message ID: WARNING_1297


Warning : Procedure is defined at a previous line. The type of dummy function does not agree with the actual argument type.

Global semantics detected a difference between a definition and a reference in another program unit. The type of actual arguments associated with dummy arguments must agree. In this case both the dummy and actual are function. The types and kind types of the functions must agree.

Message ID: WARNING_1298


Warning : Procedure is defined at a previous line. The actual argument must be the same type of procedure as the dummy argument.

During global semantics the compiler found a mismatch between a dummy argument and an actual argument. If the dummy argument is a data object, the actual argument must be a data object. If the dummy procedure is a dummy function, the actual argument must be a function. If the dummy procedure is a subroutine, the actual argument must be a subroutine.

Message ID: WARNING_1299


Warning : Procedure is defined at a previous line with a dummy argument as a procedure. The actual argument is a data object.

During global semantics the compiler found a mismatch between a dummy argument and a actual argument. If the dummy argument is a data object, the actual argument must be a data object. If the dummy argument is a dummy procudure, the actual argument must be a procedure.

Message ID: WARNING_1300


Warning : Procedure is defined at a previous line. Illegal association of scalar actual argument with array dummy argument.

Global semantics detected a difference between a definition and a reference in another program unit. An array dummy argument cannot have a scalar actual argument associated with it. An array element is okay here.

Message ID: WARNING_1301


Ansi : An assumed size character array used as an internal file is an extension to the Fortran standard.

The Fortran standard only allows whole array references of assumed size arrays as arguments to procedures where the upper bound is not needed, or as an argument to LBOUND. F90 allows an internal file in a WRITE or READ statement to be an assumed size character array as an extension to the standard.

Message ID: ANSI_1302


Error : Only assumed shape dummy arguments are allowed on the COPY_ASSUMED_SHAPE directive.

An object that was not an assumed shape dummy argument was specified on the COPY_ASSUMED_SHAPE directive. Generally, this message results from the compiler encountering a scalar variable on the directive.

Message ID: ERROR_1303


Caution : The COPY_ASSUMED_SHAPE directive was encountered but there are no assumed shape dummy arguments.

The COPY_ASSUMED_SHAPE directive without an argument list, requests that all assumed shape dummy arguments get copied to temporary arrays to aid in loop optimization. This message was issued because there weren't any assumed shape dummy arguments.

Message ID: CAUTION_1304


Caution : This character literal has been blank padded to the length of the dummy argument.

The compiler determined that a character literal actual argument was shorter than the associated dummy argument. The literal was blank padded to the necessary length.

Message ID: CAUTION_1305


Ansi : Blank padding of a character literal actual argument is an extension to the Fortran standard.

The compiler determined that a character literal actual argument was shorter than the associated dummy argument. The literal was blank padded to the necessary length. This is an extension to the Fortran standard.

Message ID: ANSI_1306


Error : The kind of this actual argument does not match that of its associated dummy argument.

A difference was detected between the kind type parameter of the actual argument and the kind type parameter of the dummy argument supplied in an explicit interface for the called routine.

Message ID: ERROR_1307


Error : In a real constant with a D, E or Q following the decimal field, the D, E or Q must be followed by an exponent.

The compiler detected a missing exponent field in a real constant. The syntax for a real constant is [sign] real_literal_constant real_literal_constant is significand [exponent_letter exponent] [_kind_param] or digit_string exponent_letter exponent [_kind_param] significand is digit_string.[digit_string] or digit_string exponent_letter is E or exponent is signed_digit_string

Message ID: ERROR_1308


Error : The kind parameter suffix is not valid on a double or quad precision real constant form.

The compiler detected a kind parameter following a D or Q exponent. The syntax for a real constant is [digit_str].digit_str[exponent_letter exponent] [_kind_param] exponent_letter is D, E or Q; exponent is signed_digit_string with the following constraint: if both kind_param and exponent_letter are present, exponent_letter must be E.

Message ID: ERROR_1309


Log_Summary : f90: COMPILE TIME %s SECONDS

This message reports the time, in seconds, that elapsed during the compilation of the program.

Message ID: LOG_SUMMARY_1310


Error : This array argument to an ELEMENTAL call is not conformant to the other arguments.

By definition of ELEMENTAL from 12.7.2 of the standard, "For those elemental functions that have more than one argument, all actual arguments shall be conformable." The same statement is made for subroutines.

Message ID: ERROR_1311


Error : This DO PARALLEL directive is not allowed within a parallel CASE region.

A DO PARALLEL directive can only be used within a parallel region bounded by the PARALLEL/ENDPARALLEL directives. They cannot be specified within a CASE parallel region.

Message ID: ERROR_1312


Log_Warning : One commandline option overrides another.

The two specified commandline options conflict with each other and should not be specified on the same commandline. -ei and -e0 conflict. The compiler chooses the last option that is specified. (The rightmost wins rule.)

Message ID: LOG_WARNING_1313


Error : Object is declared in more than one scoping list.

On a tasking directive statement, a variable is listed in more than one scoping list. The scoping list are PRIVATE, GETFIRST, and SHARED.

Message ID: ERROR_1314


Internal : An internal inlining data structure has overflowed. The compilation cannot continue.

An internal data structure has overflowed. Report this to a site analyst. The data structure may be able to be increased in size.

Message ID: INTERNAL_1315


Internal : Symbol table field is NULL and should not be at this location.

There is a problem with the internal symbol tables. Please notify your system support person.

Message ID: INTERNAL_1316


Warning : SAFEVL is not allowed on the IVDEP directive on this platform. This IVDEP directive will be ignored.

The SAFEVL clause is not allowed on the IVDEP directive on this platform. This IVDEP directive will be ignored. Ie: Treated as a comment.

Message ID: WARNING_1317


Error : This is specified on the CACHE_BYPASS directive. It must have the dimension attribute.

All objects specified on the CACHE_BYPASS directive must be declared as arrays in the same scoping unit or be arrays that are host or use associated into the scope.

Message ID: ERROR_1318


Error : An array name must be specified on the CACHE_BYPASS directive. A subobject or an expression is not allowed.

The CACHE_BYPASS directive requires the name of an array. The compiler has detected an expression or a an array name followed by a subscript or substring reference. This is not allowed.

Message ID: ERROR_1319


Error : This is specified on the CACHE_BYPASS directive. Its type must be integer, logical or real with a kind type of 8.

Currently, the only supported array types for the CACHE_BYPASS directive are 64 bit integer, real and logical.

Message ID: ERROR_1320


Internal : Attr list table entry %d holds attr entry %d, which is being compressed out.

This should never happen. Please report this to your system support person.

Message ID: INTERNAL_1321


Error : The compiler has detected errors in this procedure. No inline information file will be created for this procedure.

The compiler detected errors in the procedure; therefore, no inline information file will be created for this procedure. Errors can cause the information in the inline information file to be unreliable.

Message ID: ERROR_1322


Ansi : All the arguments to this intrinsic must have the same type and kind type parameter

The standard requires that all the arguments to MIN/MAX must have identical type and kind type. The compiler will allow differing kind types and promote the smaller kind type arguments to the largest kind type argument.

Message ID: ANSI_1323


Internal : Maximum number of loops specified for a given line has been exceeded.

BLK_LOOP_NUM for the current DO loop is already at its maximum size. A larger value would overflow that space alloted for BLK_LOOP_NUM in the Block Stack. This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code. You may be able to change your code, so that the compiler does not try to issue this message.

Message ID: INTERNAL_1324


Inline : Routine was not inlined because a store into a constant will occur.

The user is attempting to inline a call site that has an invalid argument mapping. The actual argument is a constant and the callee does a store into the dummy argument associated with the constant. eg. subroutine sam(i) j = 4 i = j !this will create a store into a constant when inlined end program nono call sam(3) end

Message ID: INLINE_1325


Inline : Routine was not inlined because the routine contains an alternate RETURN.

The routine being inlined contains an alternate RETURN. Therefore, this routine cannot be expanded inline. eg. subroutine boo(*) print *, 'in boo' return 1 end program b call boo(*3) !this call will not get inlined print *, 'should never print this' 3 continue end

Message ID: INLINE_1326


Inline : Routine was not inlined because the routine calls the PRESENT intrinsic.

Routines containing a call to the PRESENT intrinsic cannot be inlined. eg. program tt call sam(i) !This call will not be inlined. end subroutine sam(j) print *, present(j) end

Message ID: INLINE_1327


Inline : Routine was not inlined because a corresponding actual and dummy argument do not have identical type and kind-type.

Each corresponding actual and dummy argument must have identical type and kind-type. If not, the call site will not be expanded inline. eg. subroutine sam(i) integer (8) i print *, i end program nono integer (4) j call sam(j) !will not get expanded inlined end

Message ID: INLINE_1328


Inline : Routine was not inlined because the routine calls the NUMARG intrinsic.

A routine containing a call to the NUMARG intrinsic cannot be expanded inline. eg. program boo call sam(3,i) !this call site will not be expanded inline end subroutine sam(j,k) print *, NUMARG() end

Message ID: INLINE_1329


Inline : Routine was not inlined because a scalar actual argument is being mapped to an array dummy argument.

If the inliner encounters a scalar actual argument being passed to an array dummy argument, the call site will not be inlined. eg. program boo call sam(a) !this call site will not be expanded inline end subroutine sam(b) dimension b(10) print *, b(1) end

Message ID: INLINE_1330


Inline : Routine was not inlined because the routine contains ASSIGN statements.

If a routine contains an ASSIGN statement, it will not be expanded inline. eg. program boo call sam() !this call site will not be inlined end subroutine sam() assign 10 to L j = k if (j .eq. 1) goto L r = q 10 continue r = s end

Message ID: INLINE_1331


Inline : Routine was not inlined because the routine is RECURSIVE.

If a routine is declared RECURSIVE, the inliner will not attempt to inline it. eg. subroutine sam() call joe() !this call site will not be inlined end RECURSIVE subroutine joe() if call joe() end

Message ID: INLINE_1332


Inline : Routine was not inlined because the routine being called is a dummy procedure.

If the inliner encouters a call to a dummy procedure, there will no attempt to inline that dummy procedure call. eg. subroutine boo(bubble) external bubble call bubble() !this call site will not be inlined end subroutine bil() external tank call boo(tank) end

Message ID: INLINE_1333


Inline : Routine was not inlined because it has OPTIONAL dummy arguments.

If a routine contains OPTIONAL dummy arguments, the inliner will never expand that routine inline. eg. subroutine slug(a,b) OPTIONAL :: b print *, b end program boo call slug(x,y) !slug can never be expanded inline end

Message ID: INLINE_1334


Inline : Routine was not inlined because an INLINE directive is not in effect.

This message is issued only when -Oinline1 is on the command line. At level one of inlining, the only way to get inlining to occur is with directives. The two directives that will cause inlining at this level are: !dir$ INLINE and !dir$ INLINEALWAYS

Message ID: INLINE_1335


Note : Routine was not inlined because the call was not within a loop.

This message is only issued with -Oinline2 on the command line. A call site will only be inlined if it exists within a DO loop.

Message ID: NOTE_1336


Inline : Routine was not inlined because it contains an Fortran pointer in static storage.

If a routine contains an Fortran pointer anywhere in static storage, the inliner will not inline the routine. eg. subroutine boo() common // a pointer a print *, 'in boo' end subroutine bo() save a pointer a print *, 'in bo' end program nono call boo() !this call site will not be inlined call bo() !this call site will not be inlined end

Message ID: INLINE_1337


Inline : Routine was not inlined because a NOINLINE directive is in effect.

The user has placed a !dir$ NOINLINE directive in their source which is preventing this call site from being inlined. eg. program this dimension a(10) !dir$ NOINLINE call sam() !this call site will not be inlined end subroutine sam() print *, 'in sam' end

Message ID: INLINE_1338


Inline : Routine is not inlined because an INLINENEVER directive has been specified.

This routine will not be expanded inline because the name appears in an INLINENEVER directive. If the INLINENEVER directive apprears in the definition of the routine with the "name" of that routine specified on the directive, no call to that routine will ever get expanded inline. If the INLINENEVER directive does not appear in the definition of a routine, then calls to the "names" specified on the INLINENEVER directive will not be inlined. eg. subroutine this() !dir$ INLINENEVER this print *, 'in this' end subroutine that() print *, 'in that' call this() ! call site will not be inlined end program boo !dir$ INLINENEVER that call this() ! call site will not be inlined call that() ! call site will not be inlined end

Message ID: INLINE_1339


Inline : Routine was not inlined because a dummy argument of the routine being inlined is a dummy procedure.

A dummy argument of the routine being inlined is a dummy procedure. The inliner will not inline this routine. eg. subroutine boo(b) external b print *, b(3.0) end program big intrinsic tan call boo(tan) !this call site will not be inlined end

Message ID: INLINE_1340


Inline : Routine was not inlined because the routine has a dummy argument that is referenced in a child routine.

A routine which has a dummy argument that is referenced in a child routine cannot be inlined. eg. subroutine boo(i) call sam() !this call site will not be expanded inline contains subroutine sam() print *, i end subroutine end subroutine

Message ID: INLINE_1341


Inline : Routine was not inlined because there are an unequal number of actual and dummy arguments.

The number of actual and dummy arguments must be identical to inline a call site. eg. subroutine boo(a) print *, a end program this call boo(x,y) !this call site will not be inlined end

Message ID: INLINE_1342


Inline : Routine was not inlined because a maximum of 64 actual arguments can be in the call list.

The user has coded more than 64 actual arguments at this call site. The call site cannot be inlined.

Message ID: INLINE_1343


Inline : Routine was not inlined because the compiler was unable to locate the routine to expand it inline.

The compiler was unable to locate a template for the routine being called in order to expand it inline. The reasons this may have occured: 1) The routine had compilation errors in it when the template was being created. 2) The user did not direct the compile as to where to find this routine for inlining. 3) The user never actually created a template for the routine.

Message ID: INLINE_1344


Inline : Routine was not inlined because the routine references a dummy argument not from the ENTRY taken.

The user has taken and entry point into a routine and somewhere in that routine referenced a dummy argument from some other entry point. This is not legal and the compiler will not inline such a call. eg. subroutine boo() common // a print *, a if (a .gt. 0.0) goto 10 entry alt(b) 10 continue print *, b end program nono common // a call boo() ! this call site will not be inlined end

Message ID: INLINE_1345


Inline : Routine was not inlined because there is a USE of a module that has not been defined yet.

If a routine is inlined which contains a USE statement. The module that is being USEd must have already been compiled and available. eg. program boo call s() ! this call site will not get inlined end subroutine s() use z print *, i end module z integer i end

Message ID: INLINE_1346


Inline : Routine was not inlined because it is too large to expand inline.

This particular routine contains too much text to be expanded inline.

Message ID: INLINE_1347


Caution : QUAD PRECISION is not supported on this platform. DOUBLE PRECISION will be used.

This machine does not have support for a REAL precision that is greater than DOUBLE PRECISION.

Message ID: CAUTION_1348


Internal : Constant table entry had a CN_POOL_IDX of zero.

This should never happen. It means there is an invalid entry in the constant table.

Message ID: INTERNAL_1349


Warning : This directive is obsolete. Support will be removed in the next major release.

Support for the listed directive will be removed in the following release. Please remove references to this directive from your code.

Message ID: WARNING_1350


Warning : Storage block will not be padded (-a pad), because one or more objects in the storage block are equivalenced.

The -a pad feature causes padding between objects of common and static storage blocks. If any objects are equivalenced, padding will not happen, as it may break the equivalency.

Message ID: WARNING_1351


Warning : The static storage block will not be padded (-a pad), because one or more objects in the storage block are equivalenced.

The -a pad feature causes padding between objects of common and static storage blocks. If any objects are equivalenced, padding will not happen, as it may break the equivalency.

Message ID: WARNING_1352


Log_Warning : Commandline option conflict detected. Compiler has chosen one of the options.

There is a conflict between the two options specified on the commandline, so the compiler has chosen one of the options. The message details which option is chosen.

Message ID: LOG_WARNING_1353


Warning : Unimplemented compiler directive.

Temporary message. This should never be received.

Message ID: WARNING_1354


Inline : Routine was not inlined because it has dummy argument(s) which are CRI pointers.

This routine was not inlined because a dummy argument is a CRI pointer.

Message ID: INLINE_1355


Warning : Expected a valid compiler directive.

During parsing of a compiler directive line, the compiler found an unknown character. The line was flushed.

Message ID: WARNING_1356


Inline : Routine was not inlined because this function's result is referenced in a child routine.

If function "FUNC" result is referenced in a child routine, "FUNC" can never be inlined. eg. program start j = if(10) ! this call will not get inlined print *, "j should be 10 ", j end program function if(i) integer if if = i call z() contains subroutine z() print *, "if should be 10 ", if ! hosted function result end subroutine end function

Message ID: INLINE_1357


Inline : Routine was not inlined because the routine contains a LOC of a variable in COMMON.

This routine cannot be expanded inline because it contains a LOC intrinsic which has a COMMON block variable as its argument. LANL requires that all CRI pointers be forced to memory at each and every call site regardless of whether the CRI pointer is in the call list or not. This makes inlining of routines containing CRI pointers dangerous in some cases.

Message ID: INLINE_1358


Inline : Routine was not inlined because it contains CRI pointers which are in COMMON.

Routines containing CRI pointers which exist in a COMMON block will not be inlined.

Message ID: INLINE_1359


Error : More than one clause has been specified for this directive.

Many clauses to C$ and C$PAR compiler directives may only be specified once. C$DOACROSS IF, CHUNK (or BLOCKED), MP_SCHEDTYPE, AFFINITY, NEST, and ONTO may only be specified once.

Message ID: ERROR_1360


Error : The ONTO clause is not allowed with this directive unless a NEST clause is seen first.

For the DOACROSS, PDO, and PARALLEL DO directives, the NEST clause must be specified before the ONTO clause.

Message ID: ERROR_1361


Error : Object is specified in more than one scoping list.

An object in a parallel region must not be scoped in more than one way. Below, object 'A' is in both the SHARE list and the LASTLOCAL list. This is not allowed. C$DOACROSS SHARE(A,B), LASTLOCAL(A) do 100 B = 1,10 A = B 100 continue

Message ID: ERROR_1362


Error : Objects in the REDUCTION clause must be scalar references.

Only scalar variables or array elements are allowed in the REDUCTION list of the DOACROSS directive.

Message ID: ERROR_1363


Error : The argument to the CHUNK clause must be a scalar INTEGER expression.

The CHUNK (or BLOCKED) expression to the DOACROSS directive must be a scalar INTEGER expression.

Message ID: ERROR_1364


Error : Variable must be declared in a COMMON block in order to use PE dimensions.

The F-- prototype only supports pe dimension syntax on COMMON block objects.

Message ID: ERROR_1365


Error : References with PE dimensions are not allowed as actual arguments.

The F-- prototype does not support PE dimension references as arguments to user or intrinsic calls.

Message ID: ERROR_1366


Internal : Bounds entry has a variant problem with field.

The compiler detected a variant problem. A field is being accessed in the bounds table, but the wrong variant is active. The bounds table variants are regular array entries and distribution entries. This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_1367


Error : Arguments to the ONTO clause must be INTEGER constants greater than zero.

The ONTO clause of the DOACROSS, PDO, PARALLEL DO directives, must contain only integer constants or the character '*'. The integer constants must be greater than zero.

Message ID: ERROR_1368


Error : The number of ONTO constants must equal the number of NEST variables.

For the DOACROSS, PDO, and PARALLEL DO directives, the number of integer constants, or '*' specifiers must be equal to the number of loop control variable specified in the associated NEST clause.

Message ID: ERROR_1369


Error : This clause is not allowed with the mp directive.

A clause was encountered that was not supported on the mp directive specified.

Message ID: ERROR_1370


Error : The argument to the THREAD clause must be a scalar INTEGER expression.

The THREAD clause, used with the DOACROSS, PDO, and PARALLEL DO directives, can have only one scalar INTEGER expression argument.

Message ID: ERROR_1371


Error : Arguments to the DATA clause must be array elements.

To be supplied.

Message ID: ERROR_1372


Error : Arguments to the THREAD clause must be constants.

to be supplied.

Message ID: ERROR_1373


Error : A subobject reference is not allowed in this context.

There are a number of contexts where a subobject reference is not allowed. That is, the variable being referenced must be referenced as an unqualified name, such as X or ARRAY. In particular, the name must not have any attached subscript list nor may it contain structure component (%) symbols. Some examples of such contexts are DO variables and in compiler directives. For example, when a tasking compiler directive defines scope or context for a parallel region, it must be for whole variables, not variable subobjects. The following code fragment is not allowed. TYPE X INTEGER I END TYPE TYPE(X) :: K CMIC$ DO ALL SHARED(K%I)

Message ID: ERROR_1374


Warning : The variable name list must contain at least two names.

The indicated list of names must contain at least two names.

Message ID: WARNING_1375


Error : Objects in the LASTTHREAD clause must be simple scalar variables.

Only scalar variable names can be used in the LASTTHREAD clause of the DOACROSS, PARALLEL DO, and PDO directives.

Message ID: ERROR_1376


Error : The ONTO clause can only be specified when the count of objects in the NEST clause is greater than 1.

The ONTO clause is intended for use with nested loops. If the NEST clause has only one object, an ONTO clause is not allowed.

Message ID: ERROR_1377


Error : Invalid argument to this directive.

Only certain integer values are allowed for the PREFETCH and PREFETCH_MANUAL directives. C*$* PREFETCH (n1, [, n2] ) n1 and n2 must be 0 - prefetching off 1 - conservative prefetching 2 - aggresive prefetching C*$* PREFETCH_MANUAL (n) n must be 0 - ignore manual directives 1 - respect manual directives

Message ID: ERROR_1378


Error : The DO-variable was not specified in the %s list preceding this loop nest.

The INTERCHANGE directive has the form: C*$* INTERCHANGE( DO-variable-list ) and the BLOCKABLE directive has the form: C*$* BLOCKABLE( DO-variable-list ) where each name in the DO-variable-list must be the name of a DO-variable in the loop nest following the directive. The DO-variable-list must contain at least 2 DO-variable names. The loop nest following a directive INTERCHANGE directive must be perfectly nested. This message is issued when the indicated DO-variable name is not contained in the DO-variable-list of the INTERCHANGE or BLOCKABLE directive that precedes the loop nest containing the current iterative DO loop.

Message ID: ERROR_1379


Error : These loops are not perfectly nested.

The current nest of iterative DO loops is expected to be perfectly nested because the nest is the subject of an INTERCHANGE directive. To be perfectly nested, a set of DO loops must have sequential DO statements at the head of the loop nest (that is, no other statements may appear between any of the DO statements) and the loop ending statements must also be sequential. Multiple loops that end on a single statement are still considered to be perfectly nested so long as the DO statements are sequential. This message is issued either when a statement appears between two of the DO statements at the head of the loop nest or between two of the loop ending statements at the bottom of the loop nest.

Message ID: ERROR_1380


Error : A statement must not appear between this directive and the DO loop that follows it.

The named directive must be immediately followed by a DO loop. No statement can come between the directive and the DO loop that follows it. This message is issued because a statement other than a DO statement followed the named directive.

Message ID: ERROR_1381


Error : The argument to the PREFETCH_REF_DISABLE directive must be an array name.

The PREFETCH_REF_DISABLE directive is used to disable prefetching of all references to the array specified on the directive. An name was encountered that was not a valid array name.

Message ID: ERROR_1382


Error : The SIZE argument to this directive must be a constant.

The SIZE argument to the PREFETCH_REF_DISABLE and PREFETCH_REF directives is used for volume analysis by the compiler. It must be a constant.

Message ID: ERROR_1383


Error : Invalid LEVEL value for this PREFETCH_REF directive.

For the PREFETCH_REF directive, the LEVEL clause tells the compiler the level in memory hierarchy to prefetch. level = 1 prefetch from L2 to L1 cache level = 2 prefetch from memory to L1 cache No other values are allowed.

Message ID: ERROR_1384


Error : This directive requires a variable name argument.

The first argument to the FILL_SYMBOL and ALIGN_SYMBOL directives must be a variable name.

Message ID: ERROR_1385


Error : The second argument to this directive must be L1cacheline, L2cacheline, page, or a power of 2 constant.

The second argument to the FILL_SYMBOL or ALIGN_SYMBOL directive must be a constant with a power of 2 value (1, 2, 4, 8, etc. ...) or one of the keywords, L1cacheline, L2cacheline, or page.

Message ID: ERROR_1386


Error : A directive has already been specified for the current loop nest.

This message is issued when more than one INTERCHANGE directives or BLOCKABLE directives apply to a single loop nest. This message is typically issued when more than one such directive precedes a loop, such as: C*$* INTERCHANGE(i, j, k) C*$* INTERCHANGE(j, k, m) DO j = 1, 5 ... or when one of these directives precedes a loop nest and another of directive of the same kind appears between two DO statements that are within range of the first directive, such as: C*$* INTERCHANGE(i, j, k) DO j = 1, 5 DO i = 1, 5 C*$* INTERCHANGE(m, k) DO k = 1, 5 DO m = 1, 5 ... END DO END DO END DO END DO

Message ID: ERROR_1387


Inline : Routine was not inlined because it is a function with alternate entries.

The user is attempting to inline a function with alternate entries. The inliner cannot determine if the code has actually only defined the result name of the entry point taken. eg. FUNCTION IBA() 10 CONTINUE IBA = 3 RETURN ENTRY IDA() ! This call will not inline. IDA = 1 GOTO 10 END

Message ID: INLINE_1388


Error : The DO loop nesting depth does not match the number of DO-variables in the BLOCKABLE directive DO-variable list.

This message is issued when the number of DO-variables specified in the DO-variable list of the BLOCKABLE directive is greater than the nesting depth of the nest of DO loops that follows the BLOCKABLE directive. For example, this message is issued for the first END DO of the following program fragment: C*$* BLOCKABLE(i, j, k) DO j = 1, 3 DO i = 1, 3 ... END DO END DO

Message ID: ERROR_1389


Warning : Cray character pointee will be treated as an assumed-length character variable.

A Cray character pointee was encountered that was declared with explicit character length. The character length of a pointee is only determined by the assignment to the associated Cray character pointer. The pointee will be treated as an assumed-length character variable. The explicit length specification will be ignored. The Cray pointer data type is an extension to the Fortran standard.

Message ID: WARNING_1390


Log_Warning : Source file contains no Fortran statements.

To be a valid Fortran program, the source file must contain at least an END statement. The source file is either zero-sized (completely empty) or contains only comments and/or blank lines. Such an actually or effectively empty source does not constitute a Fortran program.

Message ID: LOG_WARNING_1391


Ansi : Intrinsics which return a data type other than integer are not allowed in specification expressions.

The standard does not allow intrinsics which return a data type other than integer in specification expressions.

Message ID: ANSI_1392


Warning : Initializing multiple array elements with a single Hollerith or character constant will be removed in the next release.

The extension that allows multiple word-length array elements to be initialized in a DATA statement by breaking up a single Hollerith or character constant is an outmoded, obscure, and error prone extension. Consequently, starting with the next release of the compiler, this extension will no longer be provided. A Hollerith or character constant will correspond to a single array element in the target list of the DATA statement.

Message ID: WARNING_1393


Error : Only COMMON block names and COMMON block variables are allowed as arguments to the COPYIN directive.

This message is no longer used. Each item in a C$COPYIN directive must be a member of a local COMMON block. It can be a variable, an array, an individual element of an array, or the entire COMMON block. Note: The C$COPYIN directive cannot be executed from inside a parallel region. For example, C$COPYIN x,y, /foo/, a(i) propagates the values for x and y, all the values in the COMMON block foo, and the ith element of array a. All these items must be members of local COMMON blocks. Note that this directive is translated into executable code, so in this example i is evaluated at the time this statement is executed.

Message ID: ERROR_1394


Error : The C$COPYIN directive cannot be used within a parallel region.

Each item in a C$COPYIN directive must be a member of a local COMMON block. It can be a variable, an array, an individual element of an array, or the entire COMMON block. The C$COPYIN directive cannot be executed from inside a parallel region. For example, C$COPYIN x,y, /foo/, a(i) propagates the values for x and y, all the values in the COMMON block foo, and the ith element of array a. All these items must be members of local COMMON blocks. Note that this directive is translated into executable code, so in this example i is evaluated at the time this statement is executed.

Message ID: ERROR_1395


Error : Only array variable names can be specified on the %s directive.

The C$DYNAMIC, or C$REDISTRIBUTE directive must have one or more array names as arguments.

Message ID: ERROR_1396


Error : This must be a scalar INTEGER expression.

This argument to a directive must be a scalar integer expression.

Message ID: ERROR_1397


Error : Too few or too many ONTO values.

The ONTO clause of the DISTRIBUTE, DISTRIBUTE_RESHAPE, and REDISTRIBUTE directives, if it is specified, must have exactly the same number of values as there are BLOCK or CYCLIC distribution specifications. You do not specify an ONTO value for the '*' distribution specification.

Message ID: ERROR_1398


Warning : This intrinsic will not be supported in the 4.0 release and beyond.

This intrinsic is not part of the standard and is being phased out. Please change your code.

Message ID: WARNING_1399


Error : An allocatable array is not allowed in this context.

An allocatable array has been specified to an inquiry intrinsic within a specification expression. This is not allowed.

Message ID: ERROR_1400


Warning : Intrinsic subroutine EXIT is called without argument, zero is provided.

When call exit without an argument a zero is automatically provided as an argument EXIT(3F).

Message ID: WARNING_1401


Log_Summary : f90: MIPSpro Fortran 90 Version %s (%s) %s

This identifies which version and release of the compiler is being used.

Message ID: LOG_SUMMARY_1402


Log_Summary : f90: %d Error(s), %d Warning(s), %d Other message(s), %d ANSI(s)

This message gives a summary of messages issued during compilation.

Message ID: LOG_SUMMARY_1403


Warning : The STACK directive must not be specified inside an interface body or an interface block.

The STACK directive must not be specified inside an interface body or an interface block. The directive would have no meaning in this location.

Message ID: WARNING_1404


Warning : The STACK directive must not be specified in the specification part of a MODULE.

The STACK directive must not be specified in the specification part of a MODULE. Default storage in the specification part of a MODULE is always static storage and must not be changed with the STACK directive.

Message ID: WARNING_1405


Internal : Overflow of file_id_list in cif_flush_include_recs.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that the compiler does not try to issue this message.

Message ID: INTERNAL_1406


Warning : This has an attribute which means that support for declaration in this way is deferred.

The compiler detected a conflict in declarations for this object. Because the object has the given attribute, it must not be declared to be the new item. Although not allowed at this time, this will be allowed in a future release.

Message ID: WARNING_1407


Error : This is already declared in a way that means that support for a declaration with this attribute is deferred.

The compiler detected a conflict in declarations for this object. This object must not be given the specified attribute. Although not allowed at this time, it will be allowed in a future release.

Message ID: ERROR_1408


Inline : Routine was not inlined because the routine contains a !DIR$ INTEGER= directive.

This directive could potentially change the types of dummy arguments which could produce incorrect results when the routine is inlined.

Message ID: INLINE_1409


Internal : The length of the keyword is greater than the maximum of 127.

All the items in the keyword table must be less than 127 characters, because of token size limits. Check the table in use at the time the message was issued. This message should never be generated and signifies a bad compiler or a bad installation. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code.

Message ID: INTERNAL_1410


Error : This directive cannot be specified within this region.

An improper use of a compiler directive was detected. Many directives have regions of code that they cannot be specified in. An example would be the use of a C$PAR PDO directive specified within a critical section bounded by C$PAR CRITICAL SECTION / C$PAR END CRITICAL SECTION.

Message ID: ERROR_1411


Error : This directive must be specified within this region.

An improper use of a compiler directive was detected. Many directives can only be specified within certain regions of code. An example would be that a C$PAR PDO directive can only be specified within a parallel region bounded by C$PAR PARALLEL / C$PAR END PARALLEL.

Message ID: ERROR_1412


Warning : This numeric constant is out of range.

A numeric constant was found to be out of range. Either an integer constant is too large or a real constant has an exponent which is too large.

Message ID: WARNING_1413


Ansi : The symbolic constant "N$PES" is an extension to the Fortran standard.

N$PES is an extension to the Fortran standard. It is a special symbolic constant that is predefined by the compiler to be of type INTEGER; no attributes may be given to N$PES. It may be used as a symbolic constant in places where a symbolic constant is legal. The value of N$PES is set by a compiler command line option, a load time option, or a runtime option.

Message ID: ANSI_1414


Error : The AUTOSCOPE clause is not supported on this platform.

The AUTOSCOPE clause is not supported on this platform. Any unscoped variables will be assumed to be SHARED.

Message ID: ERROR_1415


Error : The order of the loop indices must correspond to the order in this NEST clause.

The NEST clause of the PDO, PARALLEL DO, and DOACROSS directives must use the same order for it's arguments as the order of the loop control variables of the nested loops. C$DOACROSS ... NEST(i,j,k) ... do i = 1,10 do k = 1,10 do j = 1,10 enddo enddo enddo The sample above would cause this message to be issued.

Message ID: ERROR_1416


Error : This AFFINITY list item does not match the NEST list.

The DO loop control variables specified in the AFFINITY clause of a DOACROSS, PDO, or PARALLEL DO directive must match the order of the list in the NEST clause.

Message ID: ERROR_1417


Error : ONTO is not allowed for DATA affinity.

The ONTO clause cannot be used when a DATA affinity is specified on DOACROSS, PDO, or PARALLEL DO directives.

Message ID: ERROR_1418


Error : Array is an assumed-size pointee. It must not be declared in a module.

An array that is declared with the assumed-size specifier must not be specified in a module program unit.

Message ID: ERROR_1419


Error : An interface body cannot access named entities from the host, thus this derived type is undefined.

A NOTE from the Fortran standard states that "An interface body does not access the named entities by host association, but it may access entities by USE association." The compiler has encountered an object used as a derived type, but there is no definition for the derived type within the definition for the interface body. Because the compiler found the derived type in the interface bodies host, the compiler (correctly or incorrectly) assumes that the user is attempting to host associate the derived type into the interface body. This is not allowed. The best way to do this would be to move the type definition to a module and use the module in both places. An alternative method would be to declare the derived type in both places, taking care that the derived type declarations meet the requirements for matching derived type declarations. (Two different type declarations are considered the same if they have the same name, both have the SEQUENCE attribute, and have components that do not have PRIVATE accessibility and agree in order, name, and attributes.)

Message ID: ERROR_1420


Internal : Local name entry has been compressed out during interface compression. It should not be.

An entry in the local name table was compressed out during interface block compression. This entry should not be compressed out.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that the compiler does not try to issue this message.

Message ID: INTERNAL_1421


Error : The SAFE_DISTANCE= value on the CONCURRENT directive must be a scalar integer constant greater than or equal to one.

A safe distance value for the CONCURRENT compiler directive must be a scalar integer constant expression so that the compiler can evaluate it at compile time. The expression must evaluate to an integer value of greater than or equal to one.

Message ID: ERROR_1422


Ansi : Implicit typing is confirmed for this object. The Fortran standard requires typing before reference with IMPLICIT NONE.

The Fortran standard requires that the type of an object be declared before that object is referenced when IMPLICIT NONE is specified in the scoping unit. In this test, there is a reference to the object before it is typed.

Message ID: ANSI_1423


Error : A type must be declared for this before it is referenced, initialized or declared a constant because of IMPLICIT NONE.

If IMPLICIT NONE is specified in a scope, the Fortran standard requires that a type be declared for an object before the object is referenced, initialized, specified as an object in a namelist group or declared as a constant.

Message ID: ERROR_1424


Inline : Routine was not inlined because the function result types do not match.

The function result type of the caller and callee do not match. Thus, the compiler cannot expand this function inline.

Message ID: INLINE_1425


Error : This has been referenced or defined in a prior statement in this scope. It may not be given the PARAMETER attribute.

The object being declared has been referenced or defined. A object must be given the PARAMETER attribute before being referenced or defined.

Message ID: ERROR_1426


Error : This is a Cray character pointer. All its pointees must be character, but that is not character.

A Cray pointer may have more than one pointee, but all pointees must be either character or non-character. A mix is not allowed.

Message ID: ERROR_1427


Error : This is a Cray pointer. All its pointees must be non-character, but that is typed as character.

A Cray pointer may have multiple pointees. However, all the pointees must either be character or non-character. They must not be mixed.

Message ID: ERROR_1428


Warning : This command line option overrides the specified directive, so the directive is ignored.

The specified command line option is incompatible with the specified directive. The directive is ignored and treated as if it is a comment line.

Message ID: WARNING_1429


Error : This array cannot be declared in the LOCAL clause of this directive.

Localized ALLOCATABLE or POINTER arrays are not supported on mp directives such as DOACROSS, PDO, PARALLEL DO. They can not be specified in a LOCAL clause. Also, Cray Pointees are not supported in a LOCAL clause.

Message ID: ERROR_1430


Error : The argument to this clause of this directive must be an integer constant or variable.

The argument to this clause on the directive must be an integer constant or an integer variable. POINT clause on the SEND directive POINT clause on the WAIT directive

Message ID: ERROR_1431


Error : The argument to this clause of this directive must be an integer constant.

The argument to this clause on the directive must be an integer constant. SPAN clause on the WAIT directive

Message ID: ERROR_1432


Error : The argument to this clause of this directive must be a logical expression.

The argument to this clause on the directive must be a logical expression. IF clause on the SEND directive

Message ID: ERROR_1433


Error : The storage size needed for this expression exceeds the maximum storage size available.

The storage needed for this expression exceeds the memory size (in bytes) of this machine. The expression could contain array constructors or be the result of a function call.

Message ID: ERROR_1434


Error : The storage size needed for this exceeds the maximum storage size available.

The storage needed for this item exceeds the memory size (in bytes) of this machine.

Message ID: ERROR_1435


Warning : This clause is not supported and will be ignored.

The compiler encountered a clause on a tasking directive that is recognized but not supported. This occurs because the clause is not relevant to the supported hardware or because support for the clause is deferred until a future release.

Message ID: WARNING_1436


Inline : Routine was not inlined because a LOC() of a constant will be generated.

A situation has been encountered where substituting a constant actual argument in the place of a dummy argument will cause a LOC() of a constant. The optimizer cannot handle such a construct.

Message ID: INLINE_1437


Caution : This argument produces a copy to a temporary variable.

A function or subroutine call has an argument that must be copied in or in/out to a temporary variable. If the message mentions a 'possible' copy in or out, then a runtime check is performed to see if a copy is necessary for a POINTER or ALLOCATABLE argument.

Message ID: CAUTION_1438


Error : Dummy argument must not appear in a specification expression.

Dummy arguments of elemental procedures must not appear in a specification expression, except as the argument to BIT_SIZE, KIND, LEN or a numeric inquiry intrinsic.

Message ID: ERROR_1439


Error : Common block name ", not the object name, must be specified on this directive.

Arguments to directives SECTION_GP and SECTION_NON_GP must be common block names or variables in static storage. A name of an object in a common block must not be specified. Rather, use the common block name. For example: COMMON /BLK/ A,B !*$*SECTION_GP /BLK/ ! correct !*$*SECTION_GP (A) ! illegal

Message ID: ERROR_1440


Error : This has an attribute which means that it must not be specified with that compiler directive.

The compiler detected a conflict in declarations for this object. The specified attribute and directive are incompatible, therefore the object cannot be declared to be both.

Message ID: ERROR_1441


Error : This has already been declared in a way which means it must not be declared again with this compiler directive.

The compiler detected a conflict in declarations for this object. The object must not be declared with the specified compiler directive.

Message ID: ERROR_1442


Error : This has been declared and used as a dummy argument. It must not be declared again with this compiler directive.

The object being declared is a referenced or defined dummy argument, which prohibits it from being declared with the specified compiler directive.

Message ID: ERROR_1443


Error : This has been used as a variable, therefore it must not be declared again with this compiler directive.

The object being declared is used as a variable, which prohibits it from being declared with the specified compiler directive.

Message ID: ERROR_1444


Warning : This directive does not affect autotasking under the -pfa command line option.

The TASK and NOTASK compiler directives are not fully implemented on this platform. They control the recognition of other tasking CMIC$ directives, but do not have an affect on autotasking under the -pfa command line option.

Message ID: WARNING_1445


Error : This variable cannot be declared in the PRIVATE clause of this directive.

Privatized ALLOCATABLE or POINTER variables are not supported on mp directives DOALL, and PARALLEL. They can not be specified in a PRIVATE clause. Also, Cray pointees cannot be specified with the PRIVATE clause.

Message ID: ERROR_1446


Error : This is already a symbolic constant, therefore it must not be specified with this compiler directive.

N$PES is a special symbolic constant. It is compiler defined as type INTEGER and the type must not be changed. No attributes can be given to N$PES, nor can N$PES be specified on any compiler directive. It may be used as a symbolic constant in places where a symbolic constant is legal. The value of N$PES is set by a compiler command line option, a load time option or a runtime option.

Message ID: ERROR_1447


Error : This has been use associated, therefore it must not be declared again with this compiler directive.

After an object has been use associated, it cannot be specified in any specification statements or in any declarative compiler directives such as ALIGN_SYMBOL, FILL_SYMBOL, NAME, SECTION_GP, SECTION_NON_GP, VFUNCTION or SYMMETRIC.

Message ID: ERROR_1448


Error : This is host associated, therefore it must not be specified with this compiler directive.

An object is host associated if it is declared in the host scope and used in the local scope. After an object is host associated into a scope, it must not be redeclared. It also must not be specified on a declarative directive.

Message ID: ERROR_1449


Error : This is typed as variable length character, therefore it must not be declared again with this compiler directive.

The compiler detected a conflict in declarations for this object. The object being declared is typed as a variable length character entity, which prohibits it from being declared one a declarative compiler directive.

Message ID: ERROR_1450


Error : This is an explicit-shape array with nonconstant bounds, therefore it must not be specified with this compiler directive.

The compiler detected a conflict in declarations for this object. The object being declared is an explicit-shape array with nonconstant bounds, which prohibits it from being specified on a declarative compiler directive.

Message ID: ERROR_1451


Error : This is specified with the directive, therefore it must not be typed as variable length character.

The compiler detected a conflict in declarations for this object. The object being declared is specified with a directive which prohibits it from being typed as a variable length character.

Message ID: ERROR_1452


Error : This is defined in an explicit interface, therefore it must not be declared again with this compiler directive.

If an explicit interface is declared for a procedure, all information describing the procedure must be specified inside the explicit interface, with the exception of the OPTIONAL, PRIVATE and PUBLIC attributes. The procedure may be specified as a dummy argument. This procedure may also be specified on the INLINE directive.

Message ID: ERROR_1453


Error : This has been used as a function, therefore it must not be declared again with this compiler directive.

The object being declared has already been used as a function, so no further declarations may be made for this object.

Message ID: ERROR_1454


Error : This has been used as a subroutine, therefore it must not be declared again with this compiler directive.

The object being declared has already been used as a subroutine, so no further declarations may be made for this object.

Message ID: ERROR_1455


Error : Only elemental intrinsics of type integer or character are allowed in an initialization expression.

The standard says that a primary of an initialization expression may be an elemental intrinsic function reference of type integer or character where each argument is an initialization expression of type integer or character.

Message ID: ERROR_1456


Error : This is specified with that directive, so it must not be declared again with the other directive.

The compiler detected a conflict in declarations for this object. This object must not be specified on both directives.

Message ID: ERROR_1457


Error : This is specified with that directive, so it must not be declared in this way.

The compiler detected a conflict in declarations for this object. The specified directive stops this object from being declared with the attribute.

Message ID: ERROR_1458


Error : This is specified with that directive, therefore it must not be specified with that attribute.

The compiler detected a conflict in declarations for this object. The specified directive stops this object from being specified with that attribute.

Message ID: ERROR_1459


Warning : A call to start_pes_() has been generated by the compiler.

When using the -ufmm option, the compiler now generates a call to start_pes_(0). Please remove any user calls to START_PES() in your code.

Message ID: WARNING_1460


Error : This use of construct name is not allowed.

To be supplied.

Message ID: ERROR_1461


Error : This use of label is not allowed.

To be supplied.

Message ID: ERROR_1462


Error : This, specified with that directive, is a procedure. Statement function actual arguments must be scalar data objects.

All actual arguments to a statement function must be scalar data objects. The following attributes declare an object to be a procedure, which is not a data object.

Message ID: ERROR_1463


Error : This is specified with that directive. It must not be declared as an explicit-shape array with nonconstant bounds.

The compiler has detected a conflict in declarations. The object has been declared with the specified directive, so it must not be declared as an explicit-shape array with nonconstant bounds.

Message ID: ERROR_1464


Error : This is specified with that directive. It must not be an array whose bounds are dependent on a symbolic constant.

The compiler has detected a conflict in declarations. The object has been declared with the specified directive, so it must not be an array whose bounds are declared with a symbolic constant expression.

Message ID: ERROR_1465


Error : This is specified with that directive, therefore it must not be a procedure in an interface block.

The compiler has detected a conflict in declarations. The object has been declared with the specified directive, so it must not be declared as a procedure in an interface block.

Message ID: ERROR_1466


Error : This is specified with that directive, therefore it must not be used as an external function name.

The compiler has detected a conflict in declarations. The object has been declared with the specified directive, so it must not be used as an external function name.

Message ID: ERROR_1467


Error : This is specified with that directive, therefore it must not be used as a subroutine name in a CALL statement.

The compiler has detected a conflict in declarations. The object has been declared with the specified directive, so it must not be used as a subroutine name in a CALL statement.

Message ID: ERROR_1468


Error : This is specified with the %s directive, therefore it must not be used as a derived-type name.

The compiler has detected a conflict in declarations. The object has been declared with the specified directive, so it must not be used as a derived-type name.

Message ID: ERROR_1469


Error : This is specified with that directive, so it is not a constant. It must not be used in an initialization expression.

The compiler has detected a conflict in declarations. The object has been declared with the specified directive. It must not be used in an initialization expression because it is not a constant.

Message ID: ERROR_1470


Error : This has been referenced or declared in this scope already. It must not be declared as the function result.

If a result name is specified on the FUNCTION statement, the name must not have previously been referenced or declared. A previous reference is possible in the following example: CHARACTER*(RSLT()) FUNCTION FUN() RESULT(RSLT) A previous declaration would be if the result name was the same as a dummy argument name.

Message ID: ERROR_1471


Error : This END CRITICAL directive must have the same name as the matching CRITICAL directive.

If the CRITICAL section is named, the paired END CRITICAL must also be named.

Message ID: ERROR_1472


Error : Object must be a variable to be in this clause of the directive.

Only data objects are allowed in following clauses to OpenMP directives. PRIVATE SHARED FIRSTPRIVATE COPYIN REDUCTION LASTPRIVATE

Message ID: ERROR_1473


Error : DO, SECTIONS, and SINGLE directives are not allowed to be nested.

DO, SECTIONS, and SINGLE directives that bind to the same PARALLEL directive are not allowed to be nested one inside the other. The PARALLEL DO and PARALLEL SECTIONS directives can be viewed as a PARALLEL directive followed by the appropriate work sharing directive. Therefore DO, SECTIONS, and SINGLE directives cannot be nested directly within a PARALLEL DO or PARALLEL SECTIONS region.

Message ID: ERROR_1474


Error : It is illegal to specify a CHUNK in the SCHEDULE clause when RUNTIME schedule type is specified.

In the SCHEDULE clause of OpenMP tasking directives, a CHUNK can only be specified when the TYPE is STATIC, DYNAMIC, or GUIDED. It can not be specified with RUNTIME.

Message ID: ERROR_1475


Error : Variable is specified in more than one !$OMP directive clause.

Each variable specified in clauses to !$OMP directives may appear explicitly in only one clause, except that a variable may be specified as both FIRSTPRIVATE and LASTPRIVATE.

Message ID: ERROR_1476


Error : It is illegal to declare a scope attribute for this pointee.

Cray pointees cannot have scope declared for them in OpenMP tasking directives.

Message ID: ERROR_1477


Error : This may not be specified in FIRSTPRIVATE or LASTPRIVATE clauses.

Fortran pointers, allocatable arrays and Cray pointers may be specified in only the PRIVATE and SHARED clauses of OpenMP tasking directives. They may not be specified in either the FIRSTPRIVATE or LASTPRIVATE clause.

Message ID: ERROR_1478


Error : Common block must be declared before being specified with the THREADPRIVATE directive.

The !$OMP THREADPRIVATE directive must appear in the declaration section of the routine after the COMMON block has been declared.

Message ID: ERROR_1479


Error : Only named variables are allowed in the list of a FLUSH directive.

The !$OMP FLUSH directive has an optional list. This list should contain only named variables.

Message ID: ERROR_1480


Blank common, \"//\", must not be declared in a %s directive.

Blank common, specified as //, is not allowed in the COMMON, TASK COMMON or THREADPRIVATE directives. These directives must specify named common blocks.

Message ID: ERROR_1481


Error : This array cannot be specified as PRIVATE, FIRSTPRIVATE, or LASTPRIVATE.

Assumed size and assumed shape arrays cannot be specified in the PRIVATE, FIRSTPRIVATE, or LASTPRIVATE clauses of OpenMP directives.

Message ID: ERROR_1482


Error : Object must be a scalar variable to be in the REDUCTION clause of this directive.

Only named scalar, intrinsic typed variables may appear in the list of variables for the REDUCTION clause. Subobjects, array elements, pointers, and common blocks are not allowed to be reduction variables.

Message ID: ERROR_1483


Error : This is not allowed in the %s clause.

Fortran pointers, allocatable arrays, and Cray pointers are only allowed in the SHARED and PRIVATE clauses. They are disallowed in REDUCTION lists, FIRSTPRIVATE, LASTPRIVATE, and COPYIN clauses.

Message ID: ERROR_1484


Error : Common block is host or use associated. It must not be specified with the THREADPRIVATE directive.

If a common block is specified on a THREADPRIVATE directive, it must be specified with the directive at all declarations. The specified common block is host or use associated into this scope, but it is not specified in its declaring scope with the THREADPRIVATE directive. THREADPRIVATE may be specified with a use associated common block only as a confirming declaration. ie: It is specified with THREADPRIVATE in the declaring module. Thus the directive can be used as a method of determining if the common block is declared in the module with THREADPRIVATE.

Message ID: ERROR_1485


Error : Storage block must be declared as a common block before being specified with the THREADPRIVATE directive.

Only common blocks can be specified with the THREADPRIVATE directive. The same storage block, must not be specified with the TASKCOMMON or AUXILIARY directives. It must not be specified with the TASKCOMMON statement.

Message ID: ERROR_1486


Error : A variable subobject is not allowed on this compiler directive.

Variable subobjects (array elements or sections, character substrings, structure component references) are not allowed on the following directives: SUPPRESS Only variable names are allowed. CACHE_ALIGN Only variable names and common blocks are allowed. ALIGN_SYMBOL FILL_SYMBOL Only common block variables and automatic variables are allowed. A common block or module name may also be specified. If a module name is specified, that applies the directive to all non COMMON storage in that module. SECTION_GP SECTION_NON_GP Only common block variables and SAVE variables are allowed. A common block or module name may also be specified. If a module name is specified, that applies the directive to all non COMMON storage in that module.

Message ID: ERROR_1487


Error : This, a member of a common block, must not be equivalenced because that directive has been specified for the block.

If the ALIGN_SYMBOL or FILL_SYMBOL directive is specified for a common block, no members of the common block may be equivalenced.

Message ID: ERROR_1488


Error : This, a member of a module, must not be equivalenced because that directive has been specified for the module.

If the ALIGN_SYMBOL or FILL_SYBMOL directive is specified for a module, then all static objects in the module that are not specified in common blocks are affected by the directive. Anything with the ALIGN_SYMBOL or FILL_SYMBOL directive must not be equivalenced.

Message ID: ERROR_1489


Error : Storage block or module has one directive specified for it, so the conflicting directive must not also be specified.

The ALIGN_SYMBOL and FILL_SYMBOL directives are mutually exclusive. If on directive is specified for a common block or module, the other must not be specified.

Message ID: ERROR_1490


Error : If compiler directive is specified for a module name, it must be for the current module being compiled.

The SECTION_GP, SECTION_NON_GP, ALIGN_SYMBOL and FILL_SYMBOL compiler directives may be specified for a module. But they can only be specified for the current module being compiled. The directive then applies to all static non-common storage in the module

Message ID: ERROR_1491


Error : Dummy argument has the INTENT(IN) attribute. It must be definable to be declared in this clause.

Dummy arguments that have the INTENT(IN) attribute are not definable. All variables that are specified in the PRIVATE, FIRSTPRIVATE, LASTPRIVATE, or REDUCTION clauses of OpenMP directives must be definable.

Message ID: ERROR_1492


Error : Variable is in a procedure and cannot be defined. It must be definable to be specified in a this clause.

All variables specified in the PRIVATE, FIRSTPRIVATE, LASTPRIVATE, or REDUCTION clauses of OpenMP directives must be definable. A constraint to PURE procedures in the Fortran standard, prohibits the following dummy arguments from being defined within a PURE subprogram: all dummy arguments to a function subprogram and all dummy arguments with the INTENT(IN) attribute with a subroutine subprogram. A constraint also prohibits the name of a common, host associated or use associated variable from appearing in a statement that would change the variable's value. The variable can be used but not redefined inside a pure subprogram. By definition, an elemental subprogram is pure, so the above constraints also apply to dummy arguments and variables within elemental subprograms.

Message ID: ERROR_1493


Warning : Variable is referenced but not defined in this program unit.

The compiler has detected a variable that is referenced in this program unit but never defined. This variable is not a dummy argument, in a common block or use associated, thus if it is referenced in this program unit, it also needs to be defined in this program unit.

Message ID: WARNING_1494


Inline : Routine was not inlined because it is a module procedure and NOMODINLINE is in effect.

There is no information available to inline because the module procedure in question is under the control of NOMODINLINE. NOMODINLINE could have been specified via the command line or thru the use of a NOMODINLINE compiler directive.

Message ID: INLINE_1495


Error : This is not a module in this scope, therefore it must not be specified on the implicit use option as a module-name.

The name specified on the implicit use command line option as a module name is already known to this scope as something other than a module name. The module_name can only be a module name.

Message ID: ERROR_1496


Error : This is specified with that directive. It must be a common block name, a module name, or in static storage.

Only statically allocated variables may be specified with the SECTION_GP and SECTION_NON_GP compiler directives. (Using the SAVE statement, will force a variable to be statically allocated.) A common block or module name may also be specified. If a module name is specified, that applies the directive to all non COMMON storage in that module.

Message ID: ERROR_1497


Error : Module name, not the object name, must be specified on this directive.

Kay - to be supplied

Message ID: ERROR_1498


Error : The value for this work distribution must be a positive integer.

For the DO ALL and DO PARALLEL compiler directives, the value specified for work distributions CHUNKSIZE and NUMCHUNKS must be an integer value greater than zero.

Message ID: ERROR_1499


Error : The overall size of the dummy argument array is greater than the size of this actual argument.

The overall size of an array dummy argument must be less than or equal to the size of the associated actual argument array when they are sequence associated. If the type of the array is character, then the total length of the character dummy argument array must be less than or equal to the total length of the character actual argument array sequence.

Message ID: ERROR_1500


Error : This has been referenced in the function character length expression. It must not be declared with that directive.

The compiler detected a conflict between a use and a declaration for an object. The object being declared was referenced in the function character length expression, which prohibits it from being declared with the specified compiler directive.

Message ID: ERROR_1501


Error : Common block is specified in this directive, therefore it must be specified in a COMMON statement.

If a common block is specified in a CDIR$ (!DIR$) CACHE_ALIGN statement, a $OMP THREADPRIVATE directive, or with one of the following \*!*$* directives (\*SECTION_GP, SECTION_NON_GP), the common block must also be declared in a COMMON statement.

Message ID: ERROR_1502


Error : Illegal branch into or out of a region.

It is illegal to branch into or out of the structured blocks created by OpenMP directives PARALLEL, DO, SECTIONS, SINGLE, PARALLEL DO, PARALLEL SECTIONS, MASTER, CRITICAL, and ORDERED. This includes GOTO statements as well as ERR=, EOF= or EOR= branches from IO statements and alternate return branches from subroutine calls.

Message ID: ERROR_1503


Error : Illegal branch into or out of a region.

It is illegal to branch into or out of the structured blocks created by -mp directives DOACROSS, PSECTION, SECTION, PDO, PARALLEL DO, PARALLEL, CRITICAL SECTION, and SINGLE PROCESS. This includes GOTO statements as well as ERR=, EOF= or EOR= branches from IO statements and alternate return branches from subroutine calls.

Message ID: ERROR_1504


Error : This is specified with that directive, therefore it must be a dummy argument.

If an object is specified with the IGNORE_TKR directive, it must be declared as a dummy argument.

Message ID: ERROR_1505


Error : An ORDERED directive can only appear in the dynamic extent of a DO or PARALLEL DO directive.

An ORDERED OpenMP directive was encountered that did not bind to an enclosing DO or PARALLEL DO directive. This was detected because the ORDERED directive was within the static extent of a PARALLEL directive. A directive can never bind to any directive outside the closest enclosing PARALLEL directive. The PARALLEL SECTIONS directive implies a PARALLEL directive.

Message ID: ERROR_1506


Error : It is illegal for an ORDERED directive to bind to a DO directive that does not have the ORDERED clause specified.

An ORDERED directive must bind to an enclosing DO or PARALLEL DO directive. The ORDERED clause must be specified on that directive.

Message ID: ERROR_1507


Error : This directive must be specified within the declaration part of a module.

The compiler has detected the specified directive within the scope of a PROGRAM, BLOCKDATA, external SUBROUTINE or external FUNCTION. This directive must only be specified in the declaration part of a module.

Message ID: ERROR_1508


Error : Do loop control variable is in a parallel region and must be in the PRIVATE list if autoscope is not specified.

All user variables used in a parallel region or DOALL loop must be in either the SHARED or PRIVATE list if AUTOSCOPE is not specified. Do loop control variables cannot be scoped SHARED, so they must be specified in the PRIVATE list.

Message ID: ERROR_1509


Error : Variable must have its data scope explicitly declared because DEFAULT(NONE) was specified.

The use of the DEFAULT(NONE) clause on the !$OMP PARALLEL, !$OMP PARALLEL DO, and !$OMP PARALLEL SECTIONS directives means that all variables encountered within these regions be explicitly scoped.

Message ID: ERROR_1510


Error : The expression in an IF clause must be a scalar Fortran logical expression.

If an IF clause is present in an !$OMP PARALLEL, !$OMP PARALLEL DO, or !$OMP PARALLEL SECTIONS directive, it must have a scalar Fortran logical expression as it argument.

Message ID: ERROR_1511


Error : Variable was privatized in the enclosing PARALLEL region. It cannot be privatized again.

Variables that are privatized in a parallel region cannot be privatized again on an enclosed work-sharing directive. As a result, variables that appear in the PRIVATE, FIRSTPRIVATE, LASTPRIVATE and RDUCTION clauses on a work-sharing directive must have shared scope in the enclosing parallel region. Work-sharing directives are !$OMP DO, !$OMP SECTIONS, and !$OMP SINGLE.

Message ID: ERROR_1512


Error : This directive must appear immediately after the end of the Do loop.

If used, the !$OMP END DO, !$OMP END PARALLEL DO, or the !DIR$ META END DO directive must appear immediately after the DO loop.

Message ID: ERROR_1513


Error : The DO loop iteration variable must be of type integer when within an OpenMP work-sharing construct.

The DO loop iteration variable must be of type integer when the DO loop is within a !$OMP DO or !$OMP PARALLEL DO work-sharing construct.

Message ID: ERROR_1514


Ansi : Procedure has multiple explicit interfaces declared in the same scope. This is nonstandard.

The compiler allows an interface body that describes the program unit being compiled, if the two explicit interfaces agree completely. The keyword (dummy argument) names and number must be the same. The kind, type and rank of each dummy argument must be the same. If the procedure is a function the kind, type, rank and result name must be the same. This is not allowed by the Fortran standard.

Message ID: ANSI_1515


Error : Procedure has multiple explicit interfaces declared in this scope. The interfaces must agree completely.

The compiler allows an interface body that describes the program unit being compiled, if the two explicit interfaces agree completely. The keyword (dummy argument) names and number must be the same. The kind, type and rank of each dummy argument must be the same. If the procedure is a function the kind, type, rank and result name must be the same. The compiler has detected a difference.

Message ID: ERROR_1516


Error : Invalid clause.

A directive was encountered with an unrecognized clause.

Message ID: ERROR_1517


Warning : This is an extension to the OpenMP standard. It should have the !$SGI sentinel.

The mp clauses AFFINITY and NEST are allowed to be used with OpenMP directives but should be used with the !$SGI sentinel so that the code remains portable. The following code fragment illustrates how they should be used. !$OMP DO !$SGI+ NEST (i) do i = 1,100 a(i) = 0 enddo Also the mp directives DISTRIBUTE, DISTRIBUTE_RESHAPE, REDISTRIBUTE, DYNAMIC, and PAGE_PLACE can be specified with the !$SGI sentinel, but they should not be specified with the !$OMP sentinel.

Message ID: WARNING_1518


Error : The autotasking directive WAIT must not be specified within a %s region.

!MIC$ WAIT must be specified within a DOALL or DOPARALLEL region. It must not be allowed within a CASE or GUARD region.

Message ID: ERROR_1519


Error : The autotasking directive must be specified within a DOPARALLEL or DOALL region.

The autotasking directives WAIT and SEND must be specified within a DOALL or DOPARALLEL region.

Message ID: ERROR_1520


Error : All WAIT/SEND pairs within a loop except one must be numbered. The numbers must be unique.

Within a loop containing more than one section of dependent code, all WAIT/SEND pairs except one must be numbered. If the point value is an integer variable, its value must be unique for each WAIT/SEND pair.

Message ID: ERROR_1521


Error : Object must not be used as an argument to the KIND intrinsic before being typed.

An object used as an argument to the KIND intrinsic must be typed before being used. The compiler has detected an object being typed after it is referenced as an argument to the KIND intrinsic.

Message ID: ERROR_1522


Error : A WAIT/SEND pair must both have the same POINT value or neither of them should have a POINT value.

The compiler has detected a mismatch for the POINT value in a WAIT/SEND pair. If a POINT value is specified for the WAIT directive, the same POINT value must be specified for the SEND directive. If no POINT value is specified for the WAIT directive, then no POINT value should be specified for the SEND directive.

Message ID: ERROR_1523


Warning : COMMON block is increasing in length due to the inline expansion of routine %s.

A routine is begin inlined which happens to contain an identical COMMON block in the caller. The length of the COMMON block in the callee is greater than the length of the COMMON block in the caller. Thus, the length of the merged COMMON block is the length of the longer of the two.

Message ID: WARNING_1524


Error : Multiple spans within a loop are not allowed.

All spans specified within a loop must be the same. The compiler has detected different spans.

Message ID: ERROR_1525


Error : The maximum number of wait/send directive pairs for this loop is %d and has been exceeded.

The limit on the total number of unspanned WAIT/SEND directive pairs within a DOALL/PARALLEL loop is 65. This number includes one unnumbered WAIT/SEND directive pair and 64 uniquely numbered WAIT/SEND directive pairs. If an unnumbered WAIT/SEND pair is not used, the limit is 64. If this limit is exceeded, compiler errors will result. For spanned WAIT/SEND directive pairs, the limit is "64/span value". For example, for a span value of 4, the limit is 16, including one unnumbered WAIT/SEND pair, and 15 uniquely numbered WAIT/SEND pairs. Furthermore, the POINTs associated with each WAIT/SEND pair must fall within the 1 <= n <= 15 range. This limit is the same, even if an unnumbered WAIT/SEND pair is not used. If this limit is exceeded, compiler errors will result.

Message ID: ERROR_1526


Error : This POINT does not match the other POINT in this loop.

The compiler has detected a SEND or a WAIT directive without a matching WAIT or SEND directive. The directives are matched on the POINT value or lack of a POINT value.

Message ID: ERROR_1527


Error : Constant point values must not exceed the maximum number of wait/send directive pairs.

If the point values are constant values the value must not exceed the maximum number of allowed wait/send directive pairs. The value is calculated as follows: The limit on the total number of unspanned WAIT/SEND directive pairs within a DOALL/PARALLEL loop is 65. This number includes one unnumbered WAIT/SEND directive pair and 64 uniquely numbered WAIT/SEND directive pairs. If an unnumbered WAIT/SEND pair is not used, the limit is 64. If this limit is exceeded, compiler errors will result. For spanned WAIT/SEND directive pairs, the limit is "64/span value". For example, for a span value of 4, the limit is 16, including one unnumbered WAIT/SEND pair, and 15 uniquely numbered WAIT/SEND pairs. Furthermore, the POINTs associated with each WAIT/SEND pair must fall within the 1 <= n <= 15 range. This limit is the same, even if an unnumbered WAIT/SEND pair is not used. If this limit is exceeded, compiler errors will result.

Message ID: ERROR_1528


Error : Object is already a module procedure within this module, so it must not be declared again as a module procedure.

The object being declared is already a module procedure. A module procedure must not be declared more than once in a module.

Message ID: ERROR_1529


Warning : This directive is obsolete and will be removed in the next major release.

The MAXCPUS directive is obsolete and will be removed in the next major release of the compiler. (3.2 on PVP's). The MAXCPUS clause on the PARALLEL or DO ALL directives should be used instead.

Message ID: WARNING_1530


Error : This initialization expression has a non-constant value. It must evaluate to a constant value at compile time.

An initialization expression, by definition, must evaluate to a constant value at compile time. This initialization expression does not evaluate to a constant value. Major uses of Initialization expressions are component declarations and parameter declarations.

Message ID: ERROR_1531


Error : If SPAN is specified, it must be an integer constant value in the range 1 to 64.

The SPAN argument to the WAIT directive must be an integer constant in the range 1 to 64. The SPAN argument is optional. If SPAN is specified for any WAIT directive within the range of a DOALL/DOPARALLEL directive, the same SPAN must be specified for all WAITs within that range.

Message ID: ERROR_1532


Error : The argument must be default integer type.

The argument must be of default integer type.

Message ID: ERROR_1533


Internal : All specifics that are intrinsic, must follow all non-inrinsic specifics. Intrinsic is out of order.

The compiler has found an unexpected ordering for specifics within a generic interface. The compiler did not get the ordering correct. Please report this problem. You may be able to reorder some specifics or USE statements as a work around.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that the compiler does not try to issue this message.

Message ID: INTERNAL_1534


Log_Error : "-O " is specified, therefore an incompatible "-O" must not be specified.

If an optimization level is specified on the command line using -O num, none of the following options may be specified on the command line: -O scalar0 -O vector0 -O task0 -O scalar1 -O vector1 -O task1 -O scalar2 -O vector2 -O task2 -O scalar3 -O vector3 -O task3

Message ID: LOG_ERROR_1535


Log_Warning : The optimization level should be compatible with the debugging level.

The optimization level is set too high for the debug level. Lower the optimization level using the -O command-line option.

Message ID: LOG_WARNING_1536


Error : A component reference is not allowed in an EQUIVALENCE statement.

Component references are not allowed in an EQUIVALENCE statement.

Message ID: ERROR_1537


Warning : Array is specified on the -O reshape command line option. It is not an array in this scope.

The compiler has found an object with the same name as an array specified on the reshape dimension command line. It is not an array.

Message ID: WARNING_1538


Error : Array must be an explicit shape constant or variable sized array to be specified with -O reshape.

If an array is specified with the reshape dimensions command line option the array must be an explicit shape constant size array or an explicit shape variable sized array.

Message ID: ERROR_1539


Log_Error : The -O inlinefrom= option must be specified when the -O inlinepgm= option is specified.

The -O inlinepgm= option requires the -O inlinefrom= option.

Message ID: LOG_ERROR_1540


Error : Support for passing a DISTRIBUTE_RESHAPE array to an assumed-shape dummy argument is deferred.

The association of an assumed-shape array dummy argument with an array actual argument that has been specified in a DISTRIBUTE_RESHAPE compiler directive is not supported in this release of the compiler. The support has been deferred until a future release.

Message ID: ERROR_1541


Warning : Initializing a named common block member in a program unit other than a block data is not legal for this architecture.

An object is being initialized either by a DATA statement or by initialization on a type declaration statement. The object is a member of a named common block. The Fortran standard states that if an object is a member of a named common block it should only be initialized in a block data program unit. Initializing a named common block member in a program unit other than a block data program unit could lead to multiple initializations for the same common block. Multiple initializations of the same common block are not allowed on this architecture.

Message ID: WARNING_1542


Inline : Routine was not inlined because the routine is not a leaf routine in the call graph.

Routines which are not leaf routines in the call graph computed for this program are not expanded inline. A leaf routine is a routine which calls no other routines.

Message ID: INLINE_1543


Error : The loop that follows this directive cannot be a DO WHILE or a DO loop without loop control.

The DO loop that follows a !$OMP DO or !$OMP PARALLEL DO directive must be an iterative DO loop. It cannot be a DO WHILE or a DO loop without loop controls.

Message ID: ERROR_1544


Inline : Routine was not inlined because the rank of the actual and dummy arguments are not identical.

When mapping an actual argument to a dummy argument the ranks must be identical. eg. program boo dimension a(10,10) call sam(a) ! will not inline end subroutine sam(b) dimension b(100) print *, b end

Message ID: INLINE_1545


Inline : Routine was not inlined because the extents are not identical in all dimensions.

The extents must be identical in each dimension of the associated actual and dummy argument for inlining to take place. eg. program boo dimension a(11,10) call sam(a) ! will not inline because first dimension extents not equal end subroutine sam(b) dimension b(10,10) print *, b end

Message ID: INLINE_1546


Error : Module name, not the variable name, must be specified on this directive.

Specific non-common variables within a module must not be specified individually with the SECTION_GP and SECTION_NON_GP directives. The SECTION_GP and SECTION_NON_GP directives may be applied to non-common variables within a module by specifing the module name with the directive. Then all non-common static storage within the module will have the SECTION_GP or SECTION_NON_GP directive applied to it.

Message ID: ERROR_1547


Log_Warning : This s no longer the most aggressive form of inlining. Please see explain for this message number.

The most aggressive form of inlining is now obtained thru -Oinline4. -Oinline3 is a new form of inlining. -Oinline3 invokes leaf routine inlining. A leaf routine is a routine which calls no other routines. With -Oinline3 only leaf routines are expanded inline in the program.

Message ID: LOG_WARNING_1548


Warning : Macro is used within its own definition.

A macro name cannot be used within its own definition as this would cause an unending recursive macro expansion. This warning means that the specified macro remains undefined.

Message ID: WARNING_1549


Warning : Too few arguments in invocation of macro.

The number of arguments in this macro invocation does not match the definition. This warning means that the macro expansion did not occur.

Message ID: WARNING_1550


Warning : Too many arguments in invocation of macro.

The number of arguments in this macro invocation does not match the definition. This warning means that the macro expansion did not occur.

Message ID: WARNING_1551


Error : This has the ALLOCATABLE attribute, therefore it must be specified as a deferred-shape co-array.

If an object is declared to be an allocatable co-array, it must be declared to be a deferred-shape co-array. The following are two correct ways of declaring A to be an allocatable co-array. ALLOCATABLE :: A(:)[:] REAL, ALLOCATABLE :: A DIMENSION A(:)[:] The following are not legal. ALLOCATABLE :: A(:)[8] REAL, ALLOCATABLE :: A DIMENSION A(:)[8]

Message ID: ERROR_1552


Inline : Routine was not inlined because the actual argument is a structure reference.

The compiler cannot support mappings where the actual argument is the whole derived type.

Message ID: INLINE_1553


Inline : Routine was not inlined because the actual argument is a character constant.

The inliner cannot expand character constants actual arguments.

Message ID: INLINE_1554


Inline : Routine was not inlined because it contains DATA statements.

Routines containing static initialization such as DATA statements cannot be expanded inline.

Message ID: INLINE_1555


Inline : Routine was not inlined because the routine contains a parallel region.

This routine was not expanded inline because the routine contains a parallel region and the call site that is being inlined already exists within a parallel region. Parallel regions cannot exists within other parallel regions.

Message ID: INLINE_1556


Error : Illegal placement of the NULL intrinsic.

The NULL intrinsic can appear in the following places: 1) right side of a pointer assignment 2) initialization for an object in a declaration 3) default initialization for a component 4) in a structure constructor 5) as an actual argument 6) in a DATA statement

Message ID: ERROR_1557


Error : This ALLOCATE shape specifier is malformed.

The compiler encountered a malformed ALLOCATE shape specifier. If the ':' is used, then both the lower and upper bound must be specified. All of the following examples will produce this message. ALLOCATE ( a(:) ) ALLOCATE ( a(1:) ) ALLOCATE ( a(:10) )

Message ID: ERROR_1558


Error : This can only be initialized with the NULL intrinsic in this context.

Pointers can only be intialized statically with the NULL intrinsic.

Message ID: ERROR_1559


Error : Invalid CHUNK value.

The value of the CHUNK argument to the OpenMP SCHEDULE clause must be greater than zero.

Message ID: ERROR_1560


Error : This must be a locally declared variable to be specified in the list of this directive.

An object other than a variable is in a SHARED or PRIVATE list on a compiler directive statement. The variable must also be locally declared. The variable cannot be host associated or use associated.

Message ID: ERROR_1561


Error : Illegal pointer assignment.

This is not a valid pointer assignment statement.

Message ID: ERROR_1562


Comment : The "* [,]" form of character declaration is an obsolesent form.

Instead of the form * [,] for character declarations use the form: * () [,] OR (LEN=) [,] Please see the manual for more alternatives.

An obsolescent feature is a feature of FORTRAN 77 or Fortran 90 that is redundant and for which a better method is available in Fortran 95. The ANSI Fortran committee recommends that programmers use the preferred method in new programs and convert existing code to the preferred method. If the use of an obsolescent feature becomes insignificant in Fortran programs, a future Fortran standards committee may consider deleting it from the standard.

Message ID: COMMENT_1563


Error : Function declared in this way must not be declared CHARACTER*(*).

A constraint in the Fortran standard states that a function name declared with an asterisk char-len-param-value shall not be array-valued, pointer-valued, recursive or pure. From 12.7.1. an elemental sub-program is a pure sub-program

Message ID: ERROR_1564


Comment : Assumed length character functions are obsolescent.

From the Fortran standard: Assumed character length for functions is an irregularity in the language since elsewhere in Fortran the philosophy is that the attributes of a function result depend only on the actual arguments of the invocation and on any data accessible by the function through host or use association. Some uses of this facility can be replaced with an automatic character length function, where the length of the function result is declared in a specification expression. Other uses can be replaced by the use of a subroutine whose arguments correspond to the function result and the function arguments. Note that dummy arguments of a function may be assumed character length. An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which a better method is available in Fortran 95. The ANSI Fortran committee recommends that programmers use the preferred method in new programs and convert existing code to the preferred method. If the use of an obsolescent feature becomes insignificant in Fortran programs, a future Fortran standards committee may consider deleting it from the standard.

Message ID: COMMENT_1565


Warning : Assumed length character function cannot be invoked. There is no way to match caller/callee characteristics.

From the Fortran standard: An interface body may be specified for a dummy or external function whose result has a character length parameter of * only if the function is not invoked. This is because this characteristic has to be specified to be the same in the interface body as in the procedure definition, but in order to invoke such a procedure, the calling routine is required to specify a length other than *.

Message ID: WARNING_1566


Ansi : Transfer of control to an END IF statement from outside the IF construct is an extension to the Fortran standard.

Instead of branching to the END IF statement from outside its IF construct, branch to the statement following the END IF. This may require program logic changes if the statement following the END IF is not a valid branch target statement.

This is a deleted feature from the FORTRAN 77 standard. A deleted feature is a feature of FORTRAN 77 that is redundant and for which a better method is available in Fortran 95. The ANSI Fortran committee recommends that programmers use the preferred method in new programs and convert existing code to the preferred method. This compiler will continue to support this feature as an extension to the Fortran 95 standard.

Message ID: ANSI_1567


Ansi : This statement is an extension to the Fortran standard.

The listed statement is now a deleted feature in the Fortran 95 standard. A deleted feature is a feature of FORTRAN 77 that is redundant and for which a better method is available in Fortran 95. This compiler will continue to support these statements as extensions to the Fortran standard.

The ASSIGN statement allows a label to be dynamically assigned to an integer variable, and the assigned GO TO statement allows "indirect branching" through this variable. This hinders the readability of the program flow, especially if the integer variable also is used in arithmetic operations. The two totally different usages of the integer variable can be an obscure source of error.

These statements have commonly been used to simulate internal procedures that can now be coded directly.

In most cases, the functionality of a PAUSE statement can be achieved in a portable manner with the use of a READ statement that awaits some input data.

Message ID: ANSI_1568


Ansi : A DO loop variable or expression of type default real or double precision real is an extension to the Fortran standard.

A real or double precision real variable or DO loop expression is a deleted feature. (A deleted feature is a feature of FORTRAN 77 that is redundant and for which a better method is available in Fortran 95.) This compiler will continue to support this feature as an extension to the Fortran standard.

A DO variable or expression of type integer should be used in place of the DO loop expression or variable that is of type default real or double precision real.

The DO variable in an io_implied_do should be a scalar of type integer rather than default real or double precision real.

Message ID: ANSI_1569


Log_Error : The -O stream command line option must not be specified with the %s command line option.

-Ostream, -Ostream and -Ostream must not be specified with the -Z option.

Message ID: LOG_ERROR_1570


Comment : Positioning the DATA statement amongst executable statements is an obsolescent feature.

The DATA statement amongst executable statements is an obsolescent feature. From the ANSI Fortran standard B.2.4: The statement ordering rules of FORTRAN 66, and hence FORTRAN 77 and Fortran 90/95 for compatibility, allowed DATA statements to appear anywhere in a program unit after the specification statements. The ability to position DATA statements amongst executable statements is very rarely used, is unnecessary and is a potential source of error. An obsolescent feature is a feature of FORTRAN 77 that is redundant and for which a better method is available in Fortran 95. The ANSI Fortran committee recommends that programmers use the preferred method in new programs and convert existing code to the preferred method. If the use of an obsolescent feature becomes insignificant in Fortran programs, a future Fortran standards committee may consider deleting it from the standard.

Message ID: COMMENT_1571


Error : Pointer assignment for components of derived type co-arrays is not supported.

In the initial implementation of Fortran with co-arrays, POINTER components of co-array derived type variables are treated as if they were ALLOCATABLE objects. This means that pointer assignment is not allowed for these components.

Message ID: ERROR_1572


Error : The MOLD argument is not a valid argument to the NULL intrinsic in this context.

The MOLD argument is not allowed in initialization or DATA statements.

Message ID: ERROR_1573


Error : The MOLD argument must have the POINTER attribute.

MOLD must have the pointer attribute.

Message ID: ERROR_1574


Error : This argument to the THIS_IMAGE intrinsic must be a co-array.

Only a co-array may be specified to the THIS_IMAGE intrinsic as the optional argument ARRAY.

Message ID: ERROR_1575


Error : The final co-array bound must be '*'.

Co-array bounds declarations must be assumed size. The total size of the co-array is always equal to the number of images and so the final bound must always be specified as '*'.

Message ID: ERROR_1576


Error : This is an automatic variable. It must not have the co-array DIMENSION attribute.

Automatic variable are not permitted to be co-arrays.

Message ID: ERROR_1577


Error : Variable has a co-array subobject. Co-array subobjects must not be specified in %s statements.

A co-array subobject must not be specified in an EQUIVALENCE or DATA statement.

Message ID: ERROR_1578


Error : Component of derived type has the co-array DIMENSION attribute. This is not permitted.

Co-arrays may be of derived type but components of derived types are not permitted to be co-arrays. In other words, the square bracket notation is not allowed in a component declaration statement.

Message ID: ERROR_1579


Error : Pure or elemental subprogram must not contain this, which is a co-array variable or intrinsic.

A pure procedure is not allowed to contain any co-array Fortran features. If the message refers to the USE statement, then the a variable with the co-array DIMENSION attribute is being use associated. The message also can refer to a host associated variable with the co-array DIMENSION attribute. None of the co-array Fortran intrinsics can be called in a pure or elemental procudure either. By definition an elemental subprogram is pure, so the above constraint also applies to elemental subprograms.

Message ID: ERROR_1580


Error : All statements must be contained within a program unit and followed by END.

The compiler has detected a trailing statement following all program units. All valid Fortran statements must be contained within a program unit. A program unit should start with BLOCKDATA, MODULE, PROGRAM, SUBROUTINE or FUNCTION, although the program unit statement is optional. A program unit ends with an END statement. The END statement is not optional.

Message ID: ERROR_1581


Comment : Fixed source form is an obsolescent feature in Fortran 95.

Fixed source form is an obsolescent feature in the Fortran standard. Free format is the preferred method. An obsolescent feature is a feature of FORTRAN 77 or Fortran 90 that is redundant and for which a better method is available in Fortran 95. The ANSI Fortran committee recommends that programmers use the preferred method in new programs and convert existing code to the preferred method. If the use of an obsolescent feature becomes insignificant in Fortran programs, a future Fortran standards committee may consider deleting it from the standard.

Message ID: COMMENT_1582


Error : Support for some features of co-array Fortran is deferred.

The support some features of co-array Fortran is deferred in the initial prototype release.

Message ID: ERROR_1583


Error : This actual argument must be a co-array in order to be associated with a co-array dummy argument.

In order to ensure that copy-in or copy-out is not needed for a co-array dummy argument, the actual arument must be the name of a co-array or a subobject of a co-array.

Message ID: ERROR_1584


Error : Only variables with a 64 bit type are currently supported in co-array references.

In the initial prototype of co-array Fortran on the T3E, only 64 bit types are supported in co-array references.

Message ID: ERROR_1585


Error : Illegal branch into or out of a region.

It is illegal to branch into or out of the structured blocks created by the a tasking DO directive. This includes GOTO statements as well as ERR=, EOF= or EOR= branches from IO statements and alternate return branches from subroutine calls.

Message ID: ERROR_1586


Error : Co-array must have the ALLOCATABLE attribute in order to have a deferred shape in the co-array dimensions.

All co-array dimensions must be explicit shape bounds unless the co-array has the ALLOCATABLE attribute. The following is legal. integer, allocatable :: a(:)[:] The following statment will produce this error. integer :: a (10)[:]

Message ID: ERROR_1587


Error : This statement is not allowed in a parallel or work sharing region.

A compiler directive was encountered prior to the current statement that created a parallel or work sharing region. The current statement is not allowed in this context. This code will produce the message. SUBROUTINE S(N) C$OMP PARALLEL INTEGER N C$OMP END PARALLEL END

Message ID: ERROR_1588


Error : This must not be specified in a DATA statement. It is typed as a derived type which is default initialized.

From the Fortran 95 standard: If a nonpointer object or subobject has been specified with default initialization in a type definition, it shall not appear in a data-object-list. In other words, if an object is typed as a derived type that has default initialization, the time must not be specified in a DATA statement. The default initialization may be overridden by specifying initialization on the type declaration statement.

Message ID: ERROR_1589


Error : This is an assumed size array with INTENT(OUT). It must not be typed in this way, because that type is default initialized.

The standard prohibits a dummy argument that is an assumed size array with the INTENT(OUT) attribute from being typed as a derived type that is default initialized.

Message ID: ERROR_1590


Error : This must not be equivalenced to an object in a common block, as its type is default initialized.

From the Fortran 95 standard. Equivalence association shall not cause a derived type object with default initialization to be associated with an object in a common block.

Message ID: ERROR_1591


Internal : ntr_stor_blk_tbl has been called with an invalid storage block type. This should never happen.

The routine ntr_stor_blk_tbl has been called with an invalid or unknown storage block type.

This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that the compiler does not try to issue this message.

Message ID: INTERNAL_1592


Limit : Macro expansion has caused a continued statement to exceed the size of an internal source buffer.

A character array is used to store a complete fortran statement so that the source preprocessor can scan for macros. Although this array is quite large, it is possible to overflow this buffer.

Message ID: LIMIT_1593


Error : In an ALLOCATE statement for a co-array, the upper bound for the final co-dimension must always be '*'.

To allocate an ALLOCATABLE co-array, the co-dimensions must be specified with an assumed-size shape specifier, (*). INTEGER, ALLOCATABLE :: A(:)[:] ALLOCATE(a(10)[2,*])

Message ID: ERROR_1594


Error : Transfer of control into the FORALL construct starting at that line is not allowed.

The statement is attempting to transfer control to a statement in the FORALL construct. In a FORALL construct, only the FORALL construct statement itself can be a branch target.

Message ID: ERROR_1595


Warning : Label is defined in the FORALL construct starting at that line.

The label in the ASSIGN statement is defined on a statement contained in a FORALL construct. Transfer of control to the interior of a FORALL construct is prohibited.

Message ID: WARNING_1596


Error : This statement is not allowed in a FORALL construct.

Only assignment, pointer assigment, WHERE, and FORALL statements or constructs are allowed within a FORALL construct.

Message ID: ERROR_1597


Error : The index-name in a FORALL header must be a named scalar variable of type INTEGER.

The index-name used in a FORALL statement or construct must be a named scalar variable of type INTEGER. It cannot be a named constant, a variable subobject or array element.

Message ID: ERROR_1598


Error : Index-name is already an index-name for an enclosing FORALL construct.

Within the scope of a FORALL construct, a nested FORALL statement or FORALL construct shall not have the same index-name.

Message ID: ERROR_1599


Error : Object is typed as derived type with default initialization. It must not also be a common block object.

A constraint in the Fortran standard states: If a common-block-object is of a derived type, it shall be a sequence type with no default initialization. The compiler has detected a common block object that is of a sequence derived type that contains default initialization.

Message ID: ERROR_1600


Inline : Routine was not inlined because it has a Co-array dummy argument.

In the initial implementation of Co-array fortran, inlining is not supported when the procedure has co-array dummy arguments.

Message ID: INLINE_1601


Warning : Common block is used in multiple program units. It must be specified with the %s directive in all uses.

In this compilation, a common block is used in multiple program units. If the common block is specified with a directive describing storage or how offsets will be assigned within the block, it must have the same directive specified in each block. The directives are ALIGN_SYBMOL, FILL_SYMBOL, SECTION_GP, SECTION_NON_GP and CACHE_ALIGN. (Note: not all of these directives are available on all platforms.) A Fortran feature that can be used to prevent these types of problems, is to declare the Common block in a module and then USE the module where ever the Common block is declared. In this way, it is guaranteed that the Common block will be declared the same everywhere it is used.

Message ID: WARNING_1602


Caution : Common block is declared in multiple program units. One or more common objects differ in type, kind or rank.

During a compilation, the compiler keeps track of all common blocks and the objects in the common block. The compiler has found at least one object that differs in kind, type and/or rank from an object in a previous declaration of the same common block.

Message ID: CAUTION_1603


Error : The subscript or stride in a forall-triplet-spec must be a scalar integer expression.

A subscript or stride expression, used in a forall-triplet-spec, must be a scalar integer expression.

Message ID: ERROR_1604


Error : A subscript or stride must not reference an index-name in the forall-triplet-spec-list in which it appears.

A subscript or stride expression, used in a forall-triplet-spec, must not reference an index-name from the same FORALL header. A nested FORALL statement or construct may reference the index-names from enclosing FORALL constructs.

Message ID: ERROR_1605


Error : The stride value in a forall-triplet-spec must not be zero.

The stride value used in a forall-triplet-spec must not evaluate to zero.

Message ID: ERROR_1606


Error : The scalar-mask-expr for a FORALL statement must be a scalar logical expression.

If present, the scalar-mask-expr for a FORALL statement or construct must be a scalar expression of type logical.

Message ID: ERROR_1607


Error : The FORALL index must not be defined while it is active.

The name of an active FORALL index appeared in a statement that would change its value. The FORALL index can be used but not redefined within the range of the FORALL construct or statement where it appears.

Message ID: ERROR_1608


Error : A masked ELSE WHERE block must not follow an ELSE WHERE block.

If a WHERE construct contains an ELSE WHERE block, the ELSE WHERE must be the last block in the construct. Thus, a masked ELSE WHERE block can not follow an ELSE WHERE block.

Message ID: ERROR_1609


Error : All mask expression within a WHERE construct must have the same shape.

If a WHERE construct contains a WHERE statement, a masked ELSEWHERE statement, or another WHERE construct then each mask expression within the WHERE construct must have the same shape. A mask expression was encountered that did not have the same shape as a mask expression of an enclosing WHERE construct.

Message ID: ERROR_1610


Error : Procedure is referenced within a FORALL. It must be a PURE procedure.

Any procedure referenced in the scalar-mask-expr of a FORALL statement or construct, or referenced in a forall-body-construct, including one referenced by a defined operation or assignment, shall be a PURE procedure.

Message ID: ERROR_1611


Inline : Routine was not inlined because it was called with a Co-array actual argument.

In the initial implementation of Co-array fortran, inlining is not supported when the procedure has been called with co-array actual arguments.

Message ID: INLINE_1612


Inline : Routine was not inlined because it shares a common block with a Co-array member.

In the initial implementation of Co-array fortran, inlining is not supported when the procedure shares a common block that has at least one co-array member.

Message ID: INLINE_1613


Caution : Procedure is also referenced at another line. The type and rank of the function result of this argument do not agree.

The scope of a global name is the entire compilation, so a global (or external) name must be defined and referenced consistently throughout the compilation. The compiler has found that a reference or definition of this global name differs with another reference or definition for this name. There is a mismatch between a dummy argument and an actual argument. The type of actual arguments associated with dummy arguments must agree. If these are both function definitions, then the type and rank of the function result of the dummy procedures must agree. If the dummy procedure is being compared to an actual procedure then the type and rank of the function result must agree.

Message ID: CAUTION_1614


Warning : Procedure is defined at another line. Dummy argument is an array argument. This argument is scalar.

The scope of a global name is the entire compilation, so a global (or external) name must be defined and referenced consistently throughout the compilation. The compiler has found that a reference or definition of this global name differs with another reference or definition for this name. The compiler is comparing two definitions or a definition and a reference to the listed procedure. If the compiler is comparing two definitions, then the compiler has found that in one definition, a dummy argument is an array argument, but the corresponding dummy argument in the second definition is a scalar argument. The arguments must be the same. If the compiler is comparing a reference with its definition, then it has found an array dummy argument associated with a scalar actual argument or vice versa. Again, the arguments must either both be scalar or both be arrays. (Note: In a reference, an array element is considered a scalar.)

Message ID: WARNING_1615


Caution : Procedure is also referenced at another line. Argument there is scalar. This argument is array-valued.

The scope of a global name is the entire compilation, so a global (or external) name must be defined and referenced consistently throughout the compilation. The compiler has found that a reference or definition of this global name differs with another reference or definition for this name.

Message ID: CAUTION_1616


Caution : Function is also referenced at another line. The function result type and rank differ for the two references.

The scope of a global name is the entire compilation, so a global (or external) name must be defined and referenced consistently throughout the compilation. The compiler has found that a reference or definition of this global name differs with another reference or definition for this name. If the same function is referenced in several places during compilation, the function result type and rank should agree.

Message ID: CAUTION_1617


Warning : Function is referenced at another line. The function result type and rank differ from this definition.

The scope of a global name is the entire compilation, so a global (or external) name must be defined and referenced consistently throughout the compilation. The compiler has found that a reference or definition of this global name differs with another reference or definition for this name. If the same function is referenced in several places during compilation, the function result type and rank should agree.

Message ID: WARNING_1618


Caution : Procedure is also referenced at another line. Argument is array-valued. This argument is scalar.

The scope of a global name is the entire compilation, so a global (or external) name must be defined and referenced consistently throughout the compilation. The compiler has found that a reference or definition of this global name differs with another reference or definition for this name.

Message ID: CAUTION_1619


Warning : Program unit is referenced in one way at another line, but is defined or referenced differently here.

The scope of a global name is the entire compilation, so a global (or external) name must only be declared once. Any references to this global name, must be correct and match the definition of this name. The compiler has found a program unit referenced and definition that do not match or two references that do not match. See message 1293 for an example.

Message ID: WARNING_1620


Warning : This is also referenced at another line. Argument is a label in one reference but not the other. They should be the same.

The scope of a global name is the entire compilation, so a global (or external) name must be defined and referenced consistently throughout the compilation. The compiler has found that a reference or definition of this global name differs with another reference or definition for this name. A reference to a Subroutine contains a user label as an actual argument. In the other reference, that argument is not a user label. Corresponding arguments should be the same thing, either both labels, both program units, or both data objects.

Message ID: WARNING_1621


Warning : This is referenced at another line. Argument is a user label. The dummy argument must be an alternate return argument.

The scope of a global name is the entire compilation, so a global (or external) name must be defined and referenced consistently throughout the compilation. The compiler has found that a reference or definition of this global name differs with another reference or definition for this name. An explicit interface or the Subroutine definition defines this dummy argument as an alternate return argument (*), but the call site does not supply a user label as the corresponding actual argument.

Message ID: WARNING_1622


Warning : This is also defined at another line. Argument must be an alternate return argument in both definitions.

The scope of a global name is the entire compilation, so a global (or external) name must be defined and referenced consistently throughout the compilation. The compiler has found that a reference or definition of this global name differs with another reference or definition for this name. This subroutine has more than one explicit interace. (This could be the actual definition or multiple interface blocks for the Subroutine.) In both definitions, the dummy arguments should be the same, but they are not. In one definition, the dummy argument is an alternate return argument. In the other definition, it is not. They should be the same.

Message ID: WARNING_1623


Error :This is also defined at another line. This attribute is specified in only one of the definitions. It should be in both.

During global semantics for this compilation, the compiler found that the actual program unit definition disagrees with an interface block or another program unit definition. These should be the same. Attributes checked include pure, elemental and recursive. NOTE: For PURE - If PURE is specified on the definition, it does not need to be specified in the interface body.

Message ID: ERROR_1624


Error :This is also referenced at another line. This directive is specified in one location, but not the other.

During global semantics for this compilation, the compiler found that two references in separate program units disagree with each other. A call to a procedure is made in two separate program units. In one program unit the callee is declared with the specified directive. This directive is not specified for the callee in the second program unit. The directives being checked are NOSIDE EFFECTS and VFUNCTION.

Message ID: ERROR_1625


Ansi : Omitting the field width for this edit descriptor is an extension to the Fortran standard.

This message is issued when an edit-descriptor appears without any width (or digits or exponent) field. Examples: (I) (F) (G)

Message ID: ANSI_1626


Error : Equivalence-objects that are substrings, must not have a length of zero.

A constraint in the Fortran standard states that if the equivalence-object is a substring, the substring shall not have length zero.

Message ID: ERROR_1627


Ansi : Omitting the field width for this edit descriptor is an extension to the Fortran standard.

This message is issued when a zero is used for the field width for an edit descriptor, which the standard states should not have a zero width. Examples: (L0) (I0) in FORTRAN 77 and Fortran 90 only--ok for Fortran95 (and later)

Message ID: ANSI_1628


Error : Certain letter(s) were specified in a previous IMPLICIT statement, so must not be specified again.

A letter must only be specified once in an IMPLICIT type statement in a scoping unit and only once in an IMPLICIT storage statement in a scoping unit. For example: IMPLICIT INTEGER (A) IMPLICIT REAL (A,B) ! Illegal This is illegal, because A was specified in the previous IMPLICIT type statement.

Message ID: ERROR_1629


Log_Error : Macro exceeds maximum supported number of characters.

The given macro has a definition which is longer than the supported limit. Reducing the length of the macro, perhaps by splitting it into several smaller macros, will solve the problem.

Message ID: LOG_ERROR_1630


Warning : Unterminated character literal encountered in preprocessing directive.

The source preprocessor encountered a character literal with no closing delimiter within a source preprocessing directive.

Message ID: WARNING_1631


Error : The symbolic constant must not be defined.

Symbolic constants must not be defined.

Message ID: ERROR_1632


Warning : The array subscript for this dimension does not fall within the defined range.

An array reference was encountered where a subscript was out of bounds for the array. The subscript could be either a single value, or a triplet section. The compiler will check array bounds at compile time if -Rb is specified and the subscript and bounds values are constant. The BOUNDS and NOBOUNDS compiler directives will control the issuing of this message for specific ranges of code or for specific variables. The following code shows three cases where this message would be issued. integer i(10) i(11) = 1 i(1:11:1) = 1 i(-1:10:1) = 1

Message ID: WARNING_1633


Warning : The substring start or end value are outside the defined range.

A character substring reference has an improper substring designator. In the following character substring reference, the substring designators, begin and end, designate the beginning and ending character positions of the substring: CHAR ([begin]:[end]) If the substring has length greater than 0 then begin and end must be greater than 0 and less than or equal to the number of characters in the entity, CHAR. If end is less than begin the substring has length 0.

Message ID: WARNING_1634


Error : Argument mismatch: These must both be functions or both be subroutines and have the same number of arguments.

An explicit interface has been declared for both the actual and dummy procedures. The compiler has found that one is a function and one is a subroutine or that the number of arguments is not the same for both the actual and dummy arguments.

Message ID: ERROR_1635


Log_Summary The explain command gives more information about each message

The explain command gives a more verbose description of the message and why it was issued. See man explain for details on the explain command. For example: To get more info about message 33 use the command this way: f90-724 f90: ERROR MAIN__, File = d.f, Line = 1, Column = 14 Unknown statement. Expected assignment statement but found "EOS" instead of "=" or "=>". explain f90-724

Message ID: LOG_SUMMARY_1636


Comment : Command line option has been applied to this array.

The specified array has been reshaped because it is specified on the reshape command line option or because the generic reshape command line option has been specified and this array meets the necessary criteria.

Message ID: COMMENT_1637


Error : A WHERE assignment statement that is a defined assignment must be elemental.

If an assignment in a WHERE statement or WHERE construct is a defined assignment, the subroutine must be elemental.

Message ID: ERROR_1638


Error : This is an elemental procedure. It must not be used as an actual argument.

A constraint to the Fortran standard states that a non-intrinsic elemental procedure must not be used as an actual argument.

Message ID: ERROR_1639


Ansi : The Fortran standard does not allow the END statement to be continued.

A constraint in the Fortran standard states that the END statement must not be continued.

Message ID: ANSI_1640


Ansi : The standard states that ALLOCATABLE, POINTER or SAVE must be specified as it is default initialized type.

A constraint to the Fortran standard reads: "If an object of a type for which component-initialization is specified appears in the specification-part of a module and does not have the ALLOCATABLE or POINTER attribute, the object shall have the SAVE attribute." This constraint refers to objects declared in the specification part of the module that are not members of a common block and that are not constants. If the object is defined as a derived-type for which default-initialization has been specified, then the SAVE attribute must be specified for the object. This compiler has relaxed this rule and does not require SAVE to be specified, as objects specified in the specification-part of a module are treated as SAVEd objects.

Message ID: ANSI_1641


Error : This procedure is being passed to a PURE procedure. It must also be PURE.

A constraint in the Fortran standard requires that all procedures passed to a PURE procedure must be PURE.

Message ID: ERROR_1642


Internal : This enum has been changed.

The compiler has detected a change in the listed enum. This enum must not change in this manner. This message should never be generated. Please notify your product support organization with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_1643


Error : Array must not be statically intialized to be specified with -O reshape.

Arrays which have been statically intialized may not be reshaped.

Message ID: ERROR_1644


Error : Common block cannot be specified in both a !$OMP THREADPRIVATE directive and a !*$* SECTION_GP directive.

The !$OMP THREADPRIVATE directive prevents any common block from being placed in a GP-rel area. Any SECTION_GP directive which specifies a THREADPRIVATE common block will cause this error message to be issued.

Message ID: ERROR_1645


Error : Rank of the actual argument is less than the rank of the dummy argument.

With the -Oreshape option specified the user cannot map an actual argument with a lesser rank than the dummy argument it is associated with.

Message ID: ERROR_1646


Warning : This is a CRI Pointee. It will not be default initialized.

CRI Pointees may be declared as derived type, but they will not be default initialized, since there is no storage associated with a CRI Pointee until it is assigned storage.

Message ID: WARNING_1647


Error : The data-stmt-constant must be a named or literal constant or NULL() or a structure-constructor.

KAY - Update The data-stmt-repeat is defined as follows: data-stmt-repeate is scalar-int-constant scalar-int-constant-subobject The following restrictions apply: The data-stmt-repeat shall be positive or zero. If the data-stmt-repeat is a named constant, it shall have been declared previously in the socping unit or made addciessible by use association or host association. In a scalar-constant-subobject that is a data-stmt-repeat any subscript shall be an initialization expression.

Message ID: ERROR_1648


Warning : A divisor of zero was detected in an expression.

When a divisor of zero is detected by the compiler and it is used within an expression that does not need to be evaluated at compile time, this Warning level message is issued for a possible user error. If the expression is a constant expression that is evaluated at compile time, then an Error level message is issued.

Message ID: WARNING_1649


Error : This argument cannot be a constant.

This actual argument may not be a constant.

Message ID: ERROR_1650


Error : DO SERIAL autotasking directive is already within this region.

To be supplied.

Message ID: ERR_WAS_DOSERIAL


Error : Object has bad alignment forced by equivalence.

A object was equivalenced to another object in such a way that its offset into the equivalence group is not aligned as strictly as the object would normally be aligned. For example:

   INTEGER(2) A		! Normally A is 16-bit aligned
   INTEGER(1) B(2)
   EQUIVALENCE(A,B(2))	! Equivalence causes A to be only 8-bit aligned
   

Message ID: ERR_BAD_ALIGNMENT


???

This message is no longer used. Use DEFAULT_HTML_LINK2..

Message ID: DEFAULT_HTML_LINK


Error : Subscript out of range.

An array reference was encountered where a subscript was out of bounds for the array. The compiler will check array bounds at compile time if "-C" is specified and the subscript and bounds values are constant.

Message ID: WARNING_1911


Error : Data type is not supported on x86 platforms.

128-bit floating point operations are not supported on x86 platforms. This includes REAL*16, REAL(KIND=16), DOUBLE PRECISION*16, COMPLEX*32, COMPLEX(KIND=16).

Message ID: IA32_ERROR_1912


Error : KIND value ###### is not supported for ###### type on x86 platforms.

To be supplied.

Message ID: IA32_ERROR_1913


Warning : Compiler directive #### must appear before the target subprogram.

To be supplied.

Message ID: WARNING_1914


Log_Error : option has an illegal argument.

The argument for the specified option is illegal.

Message ID: ERROR_ERROFF


INTERNAL COMPILER ERROR: Internal error from FW part of compiler.

To be supplied.

Message ID: FW_INTERNAL_ERROR_1


INTERNAL COMPILER ERROR: %s : %s %d.

To be supplied.

Message ID: FW_INTERNAL_ERROR_2


INTERNAL COMPILER ERROR: Internal error from FW part of compiler.

To be supplied.

Message ID: FW_INTERNAL_ERROR_3


INTERNAL COMPILER ERROR: Internal error from FW part of compiler.

To be supplied.

Message ID: FW_INTERNAL_ERROR_4


INTERNAL COMPILER ERROR: Internal error from FW part of compiler.

Message ID: FW_INTERNAL_ERROR_5


INTERNAL COMPILER ERROR: Internal error from FW part of compiler.

Message ID: FW_INTERNAL_ERROR_6


ERROR_IVAL_EQUIV Equivalence of this object and that object is not allowed.

To be supplied.

Message ID: ERROR_IVAL_EQUIV


ERROR_IVAL_EQUIV_KIND Equivalence of these interval objects with different kind type parameters is not allowed.

To be supplied.

Message ID: ERROR_IVAL_EQUIV_KIND


ERROR_IVAL_CONST The left endpoint of the interval constant must be less than or equal to the right endpoint.

To be supplied.

Message ID: ERROR_IVAL_CONST


ERROR_IVAL_INTERVAL_ARG Dummy argument X is type interval, thus dummy argument Y must not be present.

To be supplied.

Message ID: ERROR_IVAL_INTERVAL_ARG


WARN_IVAL_DEFOP_WIDESTNEED Widest-need evaluation does not apply to arguments of user-defined operation.

To be supplied.

Message ID: WARN_IVAL_DEFOP_WIDESTNEED


WARN_IVAL_REAL_PARAM A \"%s\" parameter is not necessarily equal to the mathematical value of its defining constant expression.

To be supplied.

Message ID: WARN_IVAL_REAL_PARAM


ERROR_IVAL_OP_KIND_MISMATCH Operands with different kind type parameter values are not allowed for the operation \"%s\".

To be supplied.

Message ID: ERROR_IVAL_OP_KIND_MISMATCH


ERROR_IVAL_ASSIGN_KIND_MISMATCH Assignment of a an interval expression to a an interval variable is not allowed when they have different kind type parameter values.

To be supplied.

Message ID: ERROR_IVAL_ASSIGN_KIND_MISMATCH


Error : The SIZEOF intrinsic cannot be applied to arrays of an assumed-size.

Message ID: SIZEOF_ERROR_01


Error : The SIZEOF intrinsic cannot be applied to characters of a length that is passed.

Message ID: SIZEOF_ERROR_02


Error : Cray character pointers may not point to CHARACTER*(*) variables.

A Cray pointer may not point to a data object that is declared to be assumed-length character (CHARACTER*(*)).

Message ID: ERROR_CRICHARPTR


Error : Variable \"%s\" doesn't appear in any THREADPRIVATE common block, therefore it cannot be used as argument of COPYIN directive.

Message ID: ERR_NO_THREADPRIVATE_VAR


Error : Common block \"%s\" is not THREADPRIVATE, therefore it cannot be used as argument of COPYIN directive.

Message ID: ERR_NO_THREADPRIVATE_COMMON


INTERNAL COMPILER ERROR: filename linenum: shiftcount is out of range in ar_dblshift.

While performing a shift operation, the compiler detected a shift count out of the valid range.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2000


INTERNAL COMPILER ERROR: filename linenum: shiftcount is out of range in ar_divide_integer.

While performing a shift during an integral divide operation, the compiler detected a shift count out of the valid range.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2001


INTERNAL COMPILER ERROR: filename linenum: invalid multiply and/or add in AR_convert_str_to_int.

While evaluating an integral constant value, the compiler detected an error in an internal multiplication and/or addition operation.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2002


INTERNAL COMPILER ERROR: filename linenum: invalid divide in AR_convert_int_to_str.

While converting an integral value to a printable string, the compiler detected an error in an internal multiplication and/or addition operation.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2003


INTERNAL COMPILER ERROR: filename linenum: ar_clear_unused_bits called with floating or other invalid type.

The compiler internal function, ar_clear_unused_bits, was called with an an invalid argument of floating type. This function is called when evaluating compile-time expressions.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2004


INTERNAL COMPILER ERROR: filename linenum: AR_c2fapprox not loaded.

The CRAY-2 reciprocal and reciprocal square root approximation emulator function, AR_c2fapprox, is not part of the arith library built into the compiler. The compiler is unable to evaluate \s-1CRAY-2\s+1 arithmetic expressions at compilation time.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2005


INTERNAL COMPILER ERROR: filename linenum: double complex routines not loaded.

The interface to the double precision complex routines in the math libraries is not part of the arith library built into the compiler.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2006


INTERNAL COMPILER ERROR: filename linenum: ARERP%%/merrp%% called within math library.

During compilation outside the constant folding library, a call to a math library function aborted and tried to call the math library error processing routine ARERP% (or, on CRAY-2 systems, merrp%). This behavior sometimes results from division by zero in the compiler.

The ARERP% routine is overridden in the compiler so that the compiler can attempt to fold calls to some math library intrinsic functions without danger of aborting compilation entirely on bad data.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2007


INTERNAL COMPILER ERROR: filename linenum: truncation bits out of range.

The compiler internal function, AR_CRAY_64_trunc, was called with an an invalid truncation value. This function is called when evaluating compile-time floating-point expressions.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2008


INTERNAL COMPILER ERROR: filename linenum: cannot open intrinsic simulation file.

The compiler simulates intrinsic functions for the target platform when it encounters constant expressions involving these intrinsics. The file containing the intrinsic function instructions and data could not be opened. It is apparently not accessible on this system.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2009


INTERNAL COMPILER ERROR: filename linenum: invalid intrinsic simulation file.

The compiler simulates intrinsic functions for the target platform when it encounters constant expressions involving these intrinsics. The file containing the intrinsic function instructions and data is not in the correct format or cannot be read. The format should be that of a truncated executable a.out file on the target platform with version information consistent with the released version of Craylibs.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2010


INTERNAL COMPILER ERROR: filename linenum: unsupported intrinsic function.

The compiler simulates intrinsic functions for the target platform when it encounters constant expressions involving these intrinsics. Not all intrinsic functions are available to the compiler. The compiler has requested the evaluation of an intrinsic function which is not available.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2011


INTERNAL COMPILER ERROR: filename linenum: simulated intrinsic function error.

The compiler simulates intrinsic functions for the target platform when it encounters constant expressions involving these intrinsics. This simulation uses the exact instructions and data from the libraries on the target system. Some end case situations may not be allowed in the simulation. For example, calls to memory management routines to allocate more space is not simulated. Calls to these routines have been stubbed out to return an error condition. The most probable cause of this error is a very long input numeric character string. Other causes may be due to changes in the system library routines themselves which have not been reflected in the simulation routines or attempts to write over read-only intrinsic data.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2012


INTERNAL COMPILER ERROR: filename linenum: unsimulated instruction encountered.

The compiler simulates intrinsic functions for the target platform when it encounters constant expressions involving these intrinsics. This simulation does not simulate all of the instructions of the target system hardware--only those necessary to simulate the supported intrinsic functions. An instruction has been encountered which is not simulated. The most probable cause of this error may be a new version of a system library intrinsic routine containing a new instruction heretofore not simulated.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2013


INTERNAL COMPILER ERROR: filename linenum: simulated intrinsic interface error.

The compiler simulates intrinsic functions for the target platform when it encounters constant expressions involving these intrinsics. The file containing the intrinsic function instructions and data has a new interface to the simulated intrinsic functions. This is incompatible with an older interface with which the compiler was built. The compiler needs to be rebuilt with a later version of Craylibs which supports the new interface.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2014


INTERNAL COMPILER ERROR: filename linenum intrname: unsupported intrinsic function.

The compiler simulates intrinsic functions for the target platform when it encounters constant expressions involving these intrinsics. The compiler has requested the evaluation of an unknown intrinsic function. This may be because a newer compiler is using an old version of the file containing the intrinsic function instructions and data. This older file does not contain all of the intrinsic functions that the newer compiler wants to evaluate at compile time. A version of Craylibs that is compatible with the newer compiler needs to be installed.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2015


WARNING: architecture simulation: potentially different intrinsic function values.

The compiler simulates intrinsic functions for the target platform when it encounters constant expressions involving these intrinsics. The evaluation performed at compile time is using a different version of the intrinsic library than that which may be used to load the compiled program. As a consequence, slightly different numerical results are possible depending upon which intrinsic functions are used and what changes have occurred in the Craylibs libraries. Generally the version of Craylibs released with a compiler should be used with that compiler.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: WARNING_2016


INTERNAL COMPILER ERROR: intrinsicname linenum: intrinsic routine not loaded.

The interface to the given intrinsic routine in the math libraries is not part of the arith library built into the compiler.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2017


INTERNAL COMPILER ERROR: filename linenum: inconsistent floating point format.

The compiler simulates intrinsic functions for the target platform when it encounters constant expressions involving these intrinsics. The file containing the intrinsic function instructions and data uses a floating point format that differs from that requested by the compiler. For example, the opened file uses Cray floating point format, but the compiler is requesting an IEEE floating point result.

This message should never be generated. Notify your system support staff with this error message number and any supporting information. This message does not indicate a problem with your code, although you may be able to change your code so that this error is not encountered.

Message ID: INTERNAL_2018


INTERNAL COMPILER ERROR: Internal error from target library.

The compiler is unable to determine either the host or the target architecture for the compilation.

Message ID: INTERNAL_2019


Comment : The "* [,]" form of character declaration is an obsolescent form.

Instead of the form * [,] for character declarations use the form: * () [,] OR (LEN=) [,] Please see the manual for more alternatives.

An obsolescent feature is a feature of FORTRAN 77 or Fortran 90 that is redundant and for which a better method is available in Fortran 95. The ANSI Fortran committee recommends that programmers use the preferred method in new programs and convert existing code to the preferred method. If the use of an obsolescent feature becomes insignificant in Fortran programs, a future Fortran standards committee may consider deleting it from the standard.

Message ID: COMMENT_1744


Error : The intrinsic call \"%s\" is not valid in a specification expression when its arguments are not the restricted expressions.

Message ID: ERR_INTR_IN_SPEC_EXPR


Error : The implied-DO nesting depth exceeded the compiler limit.

Message ID: ERR_IMPLIED_DO_NESTING


workshop.f90l.sparc

Message ID: LIC_SUNPRO_FEATURE_F90L


Error : Constant length character array constructor values with unequal lengths are nonstandard and not supported.

Section 4.5 of the Fortran standard mandates that all the elements in an array constructor must be of the same length.

Message ID: ERR_UNEQUAL_LENGTH_CONSTRUCTORS


Error : Violation of permissable array bounds.

Message ID: ERR_BOUND_OUT_OF_RANGE


WARNING : The starting point exceeds the ending point for substring.

Both the starting point and the ending point must be within the range of the character string unless the starting point exceeds the ending point, in which case the substring has length zero. The compiler will check this case at compile time if "-C" is specified and the substring values are constant.

Message ID: WARNING_SUBSTRING


Error : This clause is not allowed with the OpenMP directive.

A clause was encountered that was not supported on the OpenMP directive specified.

Message ID: ERR_OPENMP_CLAUSE_NOT_ALLOW


Error : The intrinsic KIND got prohibited type as actual.

The intrinsic KIND gets prohibited type as actual.

Message ID: ERR_KIND_ARG_PROHIBITED


INTERNAL COMPILER ERROR: The intrinsic SIZEOF got unexpected type of actual.

The intrinsic SIZEOF got unexpected type of actual.

Message ID: INTERNAL_2020


WARNING : Substring out of range.

Both the starting point and the ending point must be within the range of the character string unless the starting point exceeds the ending point, in which case the substring has length zero. The compiler will check this case at compile time if "-C" is specified and the substring values are constant.

Message ID: WARNING_SUBSTR_RANGE


Error : Unformatted read/write statement is not allowed/valid for an internal file.

Section 9.2.2.2 of the Fortran 95 standard. An internal file has the following restriction: (1) Reading and writing records shall be accomplished only by sequential access formatted i/o statements that do not specify namelist formatting.

Message ID: ERR_UNFMT_IO_ON_INTERNAL


Error : Subscript out of range.

An array reference was encountered where a subscript was out of bounds for the array. The compiler will check array bounds at compile time if "-C" is specified and the subscript and bounds values are constant.

Message ID: ERR_OUT_OF_RANGE


Error : Data initialization of a subcomponent of a pointer component

A data-initialization was encountered where a pointer component was not the rightmost part-ref in the initialization; for example, DATA T % P % I /0/ where P is a pointer. This is not allowed by the standard. Only the pointer P itself can be initialized, and only to the NULL() function.

Message ID: ERR_PTR_CPNT_INIT


Ansi : Omitting the KIND keyword when length-selector is declared first and LEN keyword is present is an extension to the Fortran standard.

Omitting the KIND keyword when length-selector is declared first and LEN keyword is present is an extension to the Fortran standard: see R507 (J3/97-007R2)

Message ID: ANSI_OMMITED_KIND


Error : The SIZEOF intrinsic cannot be applied to dynamically-sized argument.

Message ID: SIZEOF_ERROR_03


Error : The next statement must be a DO statement.

The statement following a parallel directive that applies to DO loops must be a DO statement.

Message ID: ERR_STMT_NOT_DO


attr-spec

Technical term from Fortran standard.

Message ID: ANNEX_D_ATTR_SPEC


block-data-name

Technical term from Fortran standard.

Message ID: ANNEX_D_BLOCK_DATA_NAME


comma or data-stmt-object or EOS

Technical term from Fortran standard.

Message ID: ANNEX_D_COMMA_DSTMT_OBJECT_EOS


common-block-name

Technical term from Fortran standard.

Message ID: ANNEX_D_COMMON_BLOCK_NAME


(/common-block-name/)

Technical term from Fortran standard.

Message ID: ANNEX_D_CBLOCK_NAME_DELIMITED


/common-block-name/

Technical term from Fortran standard.

Message ID: ANNEX_D_CBLOCK_NAME_DELIMITED2


common-block-name or /

Technical term from Fortran standard.

Message ID: ANNEX_D_CBLOCK_NAME_OR_SLASH


common-block-object

Technical term from Fortran standard.

Message ID: ANNEX_D_COMMON_BLOCK_OBJECT


common-block-object or /

Technical term from Fortran standard.

Message ID: ANNEX_D_CBLOCK_OBJECT_OR_SLASH


component-name

Technical term from Fortran standard.

Message ID: ANNEX_D_COMPONENT_NAME


construct-name

Technical term from Fortran standard.

Message ID: ANNEX_D_CONSTRUCT_NAME


construct-name or EOS

Technical term from Fortran standard.

Message ID: ANNEX_D_CONSTRUCT_NAME_OR_EOS


data-i-do-object

Technical term from Fortran standard.

Message ID: ANNEX_D_DATA_I_DO_OBJECT


data-i-do-object or data-i-do-variable

Technical term from Fortran standard.

Message ID: ANNEX_D_DATA_I_DO_OBJ_OR_VAR


data-i-do-variable

Technical term from Fortran standard.

Message ID: ANNEX_D_DATA_I_DO_VARIABLE


data-stmt-constant

Technical term from Fortran standard.

Message ID: ANNEX_D_DATA_STMT_CONSTANT


data-stmt-repeat

Technical term from Fortran standard.

Message ID: ANNEX_D_DATA_STMT_REPEAT


data-stmt-repeat or data-stmt-constant

Technical term from Fortran standard.

Message ID: ANNEX_D_DATA_STMT_REPT_OR_CONS


data-stmt-object

Technical term from Fortran standard.

Message ID: ANNEX_D_DATA_STMT_OBJECT


defined-operator

Technical term from Fortran standard.

Message ID: ANNEX_D_DEFINED_OPERATOR


digit-string

Technical term from Fortran standard.

Message ID: ANNEX_D_DIGIT_STRING


dimension-spec

Technical term from Fortran standard.

Message ID: ANNEX_D_DIMENSION_SPEC


( dimension-spec )

Technical term from Fortran standard.

Message ID: ANNEX_D_DIMENSION_SPEC_W_PARS


do-variable

Technical term from Fortran standard.

Message ID: ANNEX_D_DO_VARIABLE


do-variable or WHILE

Technical term from Fortran standard.

Message ID: ANNEX_D_DO_VARIABLE_OR_WHILE


dummy-arg-name

Technical term from Fortran standard.

Message ID: ANNEX_D_DUMMY_ARG_NAME


entry-name

Technical term from Fortran standard.

Message ID: ANNEX_D_ENTRY_NAME


= or comma or '(subscript-list)'

Technical term from Fortran standard.

Message ID: ANNEX_D_EQ_COMMA_SUBLIST_W_PARS


equivalence-object

Technical term from Fortran standard.

Message ID: ANNEX_D_EQUIVALENCE_OBJECT


forall-body-construct

Technical term from Fortran standard.

Message ID: ANNEX_D_FORALL_BODY_CONSTRUCT


function-name

Technical term from Fortran standard.

Message ID: ANNEX_D_FUNCTION_NAME


generic-name

Technical term from Fortran standard.

Message ID: ANNEX_D_GENERIC_NAME


if-construct-name

Technical term from Fortran standard.

Message ID: ANNEX_D_IF_CONSTRUCT_NAME


implied-do-object

Technical term from Fortran standard.

Message ID: ANNEX_D_IMPLIED_DO_OBJECT


implied-do-object or do-variable

Technical term from Fortran standard.

Message ID: ANNEX_D_IMPLIED_DO_OBJ_OR_VAR


index-name

Technical term from Fortran standard.

Message ID: ANNEX_D_INDEX_NAME


index-name or mask expression

Technical term from Fortran standard.

Message ID: ANNEX_D_INDEX_NAME_OR_MASK_EXPR


internal-procedure

Technical term from Fortran standard.

Message ID: ANNEX_D_INTERNAL_PROCEDURE


( or , or :: or type-name

Technical term from Fortran standard.

Message ID: ANNEX_D_LP_COMMA_DOTS_TYPE_NAME


module-name

Technical term from Fortran standard.

Message ID: ANNEX_D_MODULE_NAME


module-procedure

Technical term from Fortran standard.

Message ID: ANNEX_D_MODULE_PROCEDURE


named-constant

Technical term from Fortran standard.

Message ID: ANNEX_D_NAMED_CONSTANT


namelist-group-name

Technical term from Fortran standard.

Message ID: ANNEX_D_NAMELIST_GROUP_NAME


namelist-group-object

Technical term from Fortran standard.

Message ID: ANNEX_D_NAMELIST_GROUP_OBJECT


object-name

Technical term from Fortran standard.

Message ID: ANNEX_D_OBJECT_NAME


object-name or /

Technical term from Fortran standard.

Message ID: ANNEX_D_OBJECT_NAME_OR_SLASH


ONLY or use-name

Technical term from Fortran standard.

Message ID: ANNEX_D_ONLY_OR_USE_NAME


OPERATOR or ASSIGNMENT or generic-name

Technical term from Fortran standard.

Message ID: ANNEX_D_OP_ASG_GENERIC_NAME


program-name

Technical term from Fortran standard.

Message ID: ANNEX_D_PROGRAM_NAME


procedure-name

Technical term from Fortran standard.

Message ID: ANNEX_D_PROCEDURE_NAME


result-name

Technical term from Fortran standard.

Message ID: ANNEX_D_RESULT_NAME


scalar-int-literal-constant

Technical term from Fortran standard.

Message ID: ANNEX_D_SCALAR_INT_LIT_CONS


scalar-int-literal-constant or (

Technical term from Fortran standard.

Message ID: ANNEX_D_SCALAR_INT_LIT_CONS_LP


scalar-int-variable

Technical term from Fortran standard.

Message ID: ANNEX_D_SCALAR_INT_VARIABLE


scalar-mask-expression

Technical term from Fortran standard.

Message ID: ANNEX_D_SCALAR_MASK_EXPR


subroutine-name

Technical term from Fortran standard.

Message ID: ANNEX_D_SUBROUTINE_NAME


subroutine-list

Technical term from Fortran standard.

Message ID: ANNEX_D_SUBSCRIPT_LIST


type-name

Technical term from Fortran standard.

Message ID: ANNEX_D_TYPE_NAME


use-name

Technical term from Fortran standard.

Message ID: ANNEX_D_USE_NAME


variable-name

Technical term from Fortran standard.

Message ID: ANNEX_D_VARIABLE_NAME


where-construct-name

Technical term from Fortran standard.

Message ID: ANNEX_D_WHERE_CONSTRUCT_NAME


Warning : Module "MODULE" and this compilation must both be compiled with an option causing 8-byte alignment of data (-fast, -dalign, or -f), or both without any.

Message ID: DALIGN_OPTION_WARNING


Error : The argument to the given clause must be a scalar INTEGER expression.

Message ID: CLAUSE_MUST_BE_INTEGER


Error : Object \"%s\" is used in a THREADPRIVATE directive, therefore it must be a variable.

Message ID: ERR_THREADPRIVATE_NO_VAR


Error : %s \"%s\" is used in a THREADPRIVATE directive, but it is prohibited for such kind of objects.

Message ID: ERR_THREADPRIVATE_ATTR


Error : Variable \"%s\" is used in a THREADPRIVATE directive, therefore it must not be part of common block.

Message ID: ERR_COMMON_VAR_IN_THREADPRIVATE


Error : Variable \"%s\" is used in a THREADPRIVATE directive, therefore it cannot be declared in EQUIVALENCE statement.

Message ID: ERR_EQU_VAR_IN_THREADPRIVATE


Error : Variable \"%s\" is used in a THREADPRIVATE directive and it is not declared in the scope of module, therefore it must have the SAVE attribute.

Message ID: ERR_NO_SAVE_IN_THREADPRIVATE


Error : This statement is not allowed in !$OMP WORKSHARE construct.

Only assignment, WHERE, and FORALL statements or constructs are allowed within a WORKSHARE construct.

Message ID: ERR_BAD_WORKSHARE_STMT


Error : Variable \"%s\" doesn't appear in any THREADPRIVATE common block, therefore it cannot be used as argument of COPYPRIVATE directive.

Message ID: ERR_WRONG_COPYPRIVATE_VAR


Error : Common block \"%s\" is not THREADPRIVATE, therefore it cannot be used as argument of COPYPRIVATE directive.

Message ID: ERR_WRONG_COPYPRIVATE_COMMON


Error : AFFINITY clause is specified, therefore SCHEDULE clause must not be specified.

Message ID: ERR_SCHEDULE_AND_AFFINITY


Error : Dummy argument has the ALLOCATABLE attribute. It requires an actual argument with the ALLOCATABLE attribute.

A dummy argument that has the ALLOCATABLE attribute must be matched with an actual argument that has the ALLOCATABLE attribute.

Message ID: ERROR_1836


Error : Equivalence-object is of a derived type that has an ultimate component that has the ALLOCATABLE attribute.

An equivalence-object of a derived type has a component that is an allocatable array. Derived types with allocatable components cannot be equivalenced.

Message ID: ERROR_1837


Error : I/O list items of a derived type which have a allocatable component are not allowed.

If a derived type ultimately contains an allocatable component, an object of this type must not appear as an I/O input item nor as the result of the evaluation of an I/O output list item.

Message ID: ERROR_1838


Error : This is of a derived type that has an ultimate allocatable component, therefore it must not be a named constant.

A named constant must not be given the ALLOCATABLE attribute and must not be of a derived type that has an allocatable components.

Message ID: ERROR_1839


Error : Dummy argument has the INTENT(IN) attribute, therefore it must not be used in an ALLOCATE/DEALLOCATE statement.

A dummy argument with INTENT(IN) cannot have its allocation status altered within the called procedure.

Message ID: ERROR_1840


Error : Only MAX, MIN, IAND, IOR, or IEOR intrinsics can be used in a REDUCTION clause.

Message ID: ERR_WRONG_REDUCTION_INTRINSIC


Error : Array %s must not be deffered shape, assumed shape, or assumed size to be in the REDUCTION clause of the %s directive.

Message ID: ERROR_WRONG_REDUCION_ARRAY


Error : If the VALUE attribute is specified for a dummy argument of type character, the length parameter shall be omitted or shall be specified by an initialization expression with the value one.

Message ID: VALUE_CHARACTER


If the VALUE attribute is specified, the [...] INTENT(INOUT) or INTENT(OUT) attribute shall not be specified

Message ID: VALUE_INTENTOUT


Error : This has an attribute which means it must not now be in a common block.

A common-block-object shall not be a derived type object with an ultimate component that is an allocatable array.

Message ID: ERROR_COMMON_ALLOCAT_CMPT


Error : %s and %s clauses must not be specified together in %s directive.

Technical term from Fortran standard.

Message ID: ERR_INCOMPATIBLE_CLAUSES


Error : Structure-name expected

Message ID: ANNEX_D_STRUCT_NAME


Error : A structure type-name cannot be defined more than once.

A structure type-name must only be defined once. The compiler found a type-name being used a subsequent time to define another structure.

Message ID: ERR_DUP_STRUCT


Error : A structure needs to be defined in a STRUCTURE declaration before it can be used in a RECORD statement.

A structure needs to be defined in a STRUCTURE declaration before it can be used in a RECORD statement.

Message ID: ERR_UNDEF_STRUCT


Error : Only a structure type is allowed in a RECORD statement.

A RECORD statement must use a previously-declared structure type.

Message ID: ERR_NOT_STRUCT_TYPE


Error : A UNION type is found where it is not expected.

A UNION item is present where it is not expected.

Message ID: ERR_UNION_NOT_EXPECTED


Error : Only a sequence derived type is allowed inside a structure declaration

A derived type component is used inside a structure but the derived type is not declared as a sequence derived type

Message ID: ERR_SEQUENCE_TYPE_REQUIRED


Error : Only %FILL is allowed as a structure component name after a percent.

A structure component name is preceded by a '%' character but is not followed by "FILL"

Message ID: ERR_FILL_EXPECTED


Warn : A structure name is limited to 30 character. When it is longer than 30 characters then it is truncated to 30 characters and may collide with other symbols.

A structure name is specified which is longer than 30 characters. Therefore it is truncated to 30 characters.

Message ID: ERR_LONG_STRUCT_NAME


Ansi : STRUCTURE/UNION/MAP/RECORD and correspoding END statements are extensions to the Fortran standard.

The STRUCTURE, END STRUCTURE, UNION, END UNION, MAP, END MAP, and RECORD statements are not part of the Fortran standard.

Message ID: ANSI_VAX_STRUCTURE


Warning : Procedure is defined at a previous line. Illegal association of scalar actual argument with array dummy argument.

Global semantics detected a difference between a definition and a reference in another program unit. An array dummy argument cannot have a scalar actual argument associated with it. An array element is okay here.

Message ID: WARNING_ILLEGAL_ASSOC


Error : Function \"%s\" is not ELEMENTAL, therefore it cannot be used in WORKSHARE block.

Message ID: ERR_NO_ELEMENTAL_IN_WORKSHARE


Error : A STRUCTURE statement is declared inside another structure but is not followed by a list of record names.

When a STRUCTURE statement is used inside another structure it needs to be followed by a list of record names.

Message ID: WARN_NESTED_STRUCT_NEED_REC


Error : Only MAP definition is allowed in a UNION definition.

The only statements allowed in the scope of a UNION definition are MAP and ENDMAP.

Message ID: NOT_IN_UNION


Error : A Vax STRUCTURE/RECORD declaration is used on an item which cannot be declared as a record.

This symbol cannot be declared to have a Vax Structure type.

Message ID: STRUCTURE_NOT_ALLOWED


Error : This statement cannot be used inside a VAX Structure/Map definition.

The only statements allowed in the scope of a STRUCTURE/MAP definition are type declarations for the Structure/Map components.

Message ID: NOT_IN_STRUCTURE


Error : If the UNIT= specifier refers to an internal file, the POS= specifier must not be present.

Message ID: ERR_POS_SPEC_ON_INTERNAL


Error : If a POS= specifier is present, the shall not contain a REC= specifier.

Message ID: ERR_POS_AND_REC_TOGETHER


Error : If a DECIMAL= or ROUND= specifier is present, a or shall also appear.

Message ID: ERR_DECIMAL_OR_ROUND_NEED_FMT


Error : an I/O specifier is not implemented in the compiler library.

Message ID: ERR_SPECIFIER_NOT_IMPLEMENTED


Error : The DO control variable must not be SHARED in a %s loop.

The DO variable of a DOALL and OpenMP loop must not be specified with the SHARED attribute.

Message ID: ERR_SHARED_DO_VAR


Error : A STRUCTURE statement is declared inside another structure but is not followed by a list of record names.

When a STRUCTURE statement is used inside another structure it needs to be followed by a list of record names.

Message ID: NESTED_STRUCT_NEED_REC


Error : An explicit type must be specified for this object, because -u, the IMPLICIT NONE commandline option is specified.

The -u commandline option causes an IMPLICIT NONE to be specified in each procedure in the compilation. This commandline option is in effect for this compilation. The listed object needs to have an explicit type specified.

Message ID: ERR_TYPE_MUST_BE_EXPLICIT


Error : The lower bound for dimension %d of the array %s is out of range.

Violation of permissable array bounds.

Message ID: ERR_LOWER_BOUND_OUT_OF_RANGE


Error : The upper bound for dimension %d of the array %s is out of range.

Violation of permissable array bounds.

Message ID: ERR_UPPER_BOUND_OUT_OF_RANGE


Error : Cray pointer \"%s\" associated with Cray pointee \"%s\" is in a parallel region and it must be in the shared or private list if autoscope is not specified.

Message ID: WAR_DEFAULT_POINTEE


Error : Procedure FOO is referenced at line 199 (foo.f90). It must have an explicit interface specified.

The compiler has detected that an external procedure should have an explicit interface (12.3.1.1 of F95 standard). The compiler displays the error if the earlier call of this procedure has no explicit interface.

Message ID: ERR_NEED_EXPL_INTRFC


Error : Array %s must not be deferred shape and assumed size to be in the REDUCTION clause of the %s directive.

Message ID: ERROR_WRONG_ARRAY_REDUCTION


Error : Assumed-size array ARR cannot be specified as COPYPRIVATE.

Assumed-size arrays cannot be specified in the COPYPRIVATE clause of OpenMP directives.

Message ID: ERR_WRONG_ARRAY_IN_COPYPRIVATE


Error : Variable A appears in REDUCTION list in an enclosing PARALLEL region. Therefore, it cannot be privatized.

Message ID: ERR_REDUCTION_PRIVATIZATED


Part : 199 (foo.f90)

This message is a part of other messages.

Message ID: PART_LINE_AND_FILE


Ansi : Fortran standard requires an "&" as the first nonblank character of continuation line in free source form.

The section 3.3.1.3.1 "Nocharacter context continuation" contains the following assertion: "If a lexical token is split across the end of a line, the first nonblank character on the first following noncomment line shall be an "&" immediately followed by the successive characters of the split token."

Message ID: ANSI_NOT_AMPERSAND


Error :CRITICAL directives with the same name are not allowed to be nested one inside the other.

Message ID: ERR_WRONG_NESTED_CRITICAL


Error : DO, SECTIONS, SINGLE, and WORKSHARE directives are not allowed to be nested.

DO, SECTIONS, SINGLE, and WORKSHARE directives that bind to the same PARALLEL directive are not allowed to be nested one inside the other. The PARALLEL DO, PARALLEL WORKSHARE, and PARALLEL SECTIONS directives can be viewed as a PARALLEL directive followed by the appropriate work sharing directive. Therefore DO, SECTIONS, SINGLE, and WORKSHARE directives cannot be nested directly within a PARALLEL DO, PARALLEL WORKSHARE, or PARALLEL SECTIONS region.

Message ID: ERR_WRONG_NESTING


Error : Variable "A" is shared in an enclosing PARALLEL region. Therefore, it cannot be used in COPYPRIVATE clause.

Message ID: ERR_SHARED_COPYPRIVATE


Error : Variable "A" appears in REDUCTION clause. Therefore, it must be SHARED in the enclosing context.

Message ID: ERR_PRIVATE_REDUCTION


BLOCK, CYCLIC, or *

Message ID: ANNEX_DIST_FORMAT


WARNING : The first subscript is greater than the second subscript when stride is positive in subscript triplet.

When the stride is positive, and if the first subscript is greater than the second subscript in subscript triplet, the array section has zero size. The compiler will check this case at compile time if "-C" is specified and subscripts are constant.

Message ID: WARNING_EMPTY_TRIPLET


WARNING : The second subscript is greater than first subscript for negative stride in subscript triplet.

When the stride is negative, and if the second subscript is greater than the first subscript in subscript triplet, the array section has zero size. The compiler will check this case at compile time if "-C" is specified and subscripts are constant.

Message ID: WARNING_EMPTY_TRIPLET2


Ansi : Fortran standard requires "program-name" in "program-stmt".

F95 rule: R1102 program-stmt is PROGRAM program-name But, f90 allows program-stmt without program-name.

Message ID: ANSI_TERM_ABSENT


program-stmt

Technical term from Fortran standard.

Message ID: ANNEX_D_PROGRAM_STMT


Warning : Procedure "SUB"is referenced at line 2 (foo.f) and has 2 actual argument(s). This definition has 3 dummy argument(s) specified.

During global semantic analysis for this compilation, the compiler found that the actual program unit definition disagrees with a reference to the procedure. The number of dummy arguments in the actual program unit definition differs from the number of actual arguments specified on this reference.

Message ID: WARNING_REF_DEF_ARGS


Warning : Procedure "SUB" is defined at line 2 (foo.f) and has 2 dummy argument(s). This definition has 3 dummy argument(s) specified.

During global semantic analysis for this compilation, the compiler found that the actual program unit definition disagrees with its previous definition. The number of dummy arguments in the actual program unit definition differs from the number of dummy arguments specified before.

Message ID: WARNING_DEF_DEF_ARGS


Error : This directive cannot be specified within this region.

An improper use of a compiler directive was detected. Many directives have regions of code that they cannot be specified in. An example would be the use of a C$PAR PDO directive specified within a critical section bounded by C$PAR CRITICAL SECTION / C$PAR END CRITICAL SECTION.

Message ID: ERR_BAD_REGION_FOR_DIRECTIVE


Error : This directive must be specified within this region.

An improper use of a compiler directive was detected. Many directives can only be specified within certain regions of code. An example would be that a C$PAR PDO directive can only be specified within a parallel region bounded by C$PAR PARALLEL / C$PAR END PARALLEL.

Message ID: ERR_REGIONS_FOR_DIRECTIVE


Part : , or

This message is a part of other messages.

Message ID: COMMA_OR


Ansi : Fortran standard only allow '=' when initializing a variable in a type declaration statement

Section 5.1 on "Type Declaration Statements"

Message ID: ANSI_SLASH_INIT


Ansi : The edit descriptor without input/output width field is an extension to the Fortran standard.

The Fortran standard does not allow an edit descriptor without input/output width field.

Message ID: EDIT_DESCRIPTOR_WITHOUT_W


The directory name used in the MODDIR environment variable to put the modules in is not valid.

The MODDIR environment variable is set to a value which is not a valid directory name. As the result, the compiled modules cannot be put into that location.

Message ID: ERR_INVALID_MODDIR_ENV


The directory name used in the -moddir option to put the modules in is not valid.

The -moddir option has the syntax -moddir=. Either the option is specified with incorrect syntax or the directory name is not a valid. As the result, the compiled modules cannot be put into that location.

Message ID: ERR_INVALID_MODDIR


Ansi : Fortran standard does not allow IMPLICIT statement after type declaration statements.

Message ID: ANSI_IMPLICIT


Ansi : Fortran standard does not allow non-integers to be used as array subscripts.

Message ID: ANSI_F77_SUBSCRIPT


Ansi : Fortran standard does not allow non-integers to be used as bounds of array dimensions.

Message ID: ANSI_F77_BOUND


Ansi : Fortran standard does not allow non-integers to be used in substring range.

Message ID: ANSI_F77_SUBSTRING


Error : A fatal error occurred while checking for a valid serial license.

This message is no longer used.

Message ID: LICENSE_ERROR


Ansi : the declared type BYTE is not a part of the Fortran standard.

Message ID: ANSI_BYTE_TYPE


Warning : EXTERNAL attribute will not be applied to this subprogram.

When a function is included in a library named by the -xknown_lib option, its semantics are strictly defined by that flag and may not be altered by giving it the EXTERNAL attribute. In particular, the function may not be implemented by any library other than the known library, or by any user-supplied code.

Message ID: WARNING_IGNORING_EXTERNAL


Warning : User code will not be compiled into result.

When a function is included in a library named by the -xknown_lib option, its semantics are strictly defined by that flag and any user code for the function must be ignored.

Message ID: WARNING_IGNORING_USER_CODE


Ansi : Debugging lines starting with D or d is an extension to the Fortran standard.

Message ID: ANSI_F77_D


ACCESS='APPEND' will be ignored, because -f77=input/output option is absent

Message ID: WARNING_ACCESS_APPEND


Ansi : ACCESS='APPEND' is an extension to the Fortran standard.

Message ID: ANSI_ACCESS_APPEND


Ansi : Non-integer in the expression of the computed GOTO is an extension to the Fortran standard.

Message ID: ANSI_F77_GOTO


FILEOPT= will be ignored, because -f77=input/output option is absent

Message ID: WARNING_FILEOPT


Ansi : FILEOPT= is an extension to the Fortran standard.

Message ID: ANSI_FILEOPT


Error : This is not allowed in the %s of the %s directive.

Fortran pointers, allocatable arrays, and Cray pointers are only allowed in the SHARED and PRIVATE clauses. They are disallowed in REDUCTION lists, FIRSTPRIVATE, LASTPRIVATE, and COPYIN clauses.

Message ID: DISALLOWED_IN_CLAUSE


Warning : A non-fatal error occurred while checking for a valid serial license.

This message is no longer used.

Message ID: LICENSE_WARNING


Error : A fatal error occurred while checking for a valid serial number.

This message is generated by the serial number library.

Message ID: SERIAL_ERROR


Warning : A non-fatal error occurred while checking for a valid serial number.

This message is generated by the serial number library.

Message ID: SERIAL_WARNING


Error : IMPLICIT UNDEFINED is specified in the local scope, therefore an explicit type must be specified for this data object.

When IMPLICIT UNDEFINED is specified, all data objects must have an explicit type.

Message ID: ERROR_IMPLICIT_UNDEFINED


Error : IMPLICIT UNDEFINED is specified in the host scope, therefore an explicit type must be specified for this data object.

When IMPLICIT UNDEFINED is specified, all data objects must have an explicit type.

Message ID: ERROR_IMPLICIT_HOST_UNDEFINED


%s function treated as LOC

Message ID: WARNING_PERCENT_LOC


The value of the constant is out of range.

Message ID: VALUE_OUT_OF_RANGE


Ansi : Direct access to the internal file is an extension to the Fortran 95 standard.

Message ID: ANSI_DIRECT_INTERNAL


NAME= will be ignored, because -f77=input/output option is absent

Message ID: WARNING_OPEN_NAME


Ansi : NAME= is an extension to the Fortran 95 standard.

Message ID: ANSI_OPEN_NAME


FORM='PRINT' will be ignored, because -f77=input/output option is absent

Message ID: WARNING_FORM_PRINT


Ansi : FORM='PRINT' is an extension to the Fortran standard.

Message ID: ANSI_FORM_PRINT


READONLY will be ignored, because -f77=input/output option is absent

Message ID: WARNING_OPEN_READONLY


Ansi : READONLY is an extension to the Fortran standard.

Message ID: ANSI_OPEN_READONLY


Log_Summary : f90comp: %d SOURCE LINES

This message reports the number of lines of source code read from the input file and from any INCLUDE files specified on INCLUDE lines.

Message ID: LOG_SUMMARY_1925


Log_Summary : f90comp: %d ERRORS, %d WARNINGS, %d OTHER MESSAGES, %d ANSI

This message gives a summary of messages issued during compilation.

Message ID: LOG_SUMMARY_1926


Warning : Common block \"%s\" is accessed by a USE statement and cannot be referenced in a COPYIN clause

The OpenMP standard does not allow common block names that are not local to a program unit to be used in a COPYIN clause. You should use the variable names instead.

Message ID: WARN_THREADPRIVATE_HOST_ASSOC


Error : Arguments to the COPYIN directive must be THREADPRIVATE.

Each item in a C$COPYIN directive must be a threadprivate data item.

Message ID: ERROR_THREADPRIVATE_COPYIN


size of common block \"%s\" is greater than is supported on the target platform

Message ID: SIZE_OF_COMMON


Error : This allocatable component is to the right of a part-ref with nonzero rank.

A part_ref with a nonzero rank cannot have another part_ref to the right with the ALLOCATABLE attribute.

Message ID: ERR_ALLOC_ATTRIB


Ansi : A comma between these format fields is required by the Fortran-77 standard.

Message ID: S_COMMA_F77_REQUIRED


Error : Expecting -nP, -nX, or +nP, but found something else.

Message ID: NEGATIVE_SPECIFIER


Ansi : The IOLENGTH= specifier in an INQUIRE statement with non default kind parameter is an extension to the Fortran 95 standard.

Message ID: ANSI_NODEFINT_IOLENGTH


Error : For the nR format specifier the value of n should be more or equal to 2 and less or equal to 36.

Message ID: E_INVALID_RADIX_CONTROL


Error : \"%s\" is used as a name of a common block, therefore it must be specified in a COMMON statement.

Common block must be defined before use.

Message ID: ERROR_NO_COMMON


Warning : DISP= will be ignored, because -f77=input/output option is absent.

Message ID: WARNING_CLOSE_DISP


Ansi : DISP= is an extension to the Fortran 95 standard for compatibility with Fortran 77.

Message ID: ANSI_CLOSE_DISP


Warning : DISPOSE= will be ignored, because -f77=input/output option is absent.

Message ID: WARNING_CLOSE_DISPOSE


Ansi : DISPOSE= is an extension to the Fortran 95 standard for compatibility with Fortran 77.

Message ID: ANSI_CLOSE_DISPOSE


DISASSOCIATED POINTER

Message ID: ILLEGAL_NULL


Warning: The -xalias=overindex flag has no effect on array syntax.

Message ID: WARNING_OVERINDEX_ARRAY_SYNTAX


Ansi : Use of non-default INTEGER kind type parameters in calls to RANDOM_SEED is an extension to the Fortran 95 standard.

Message ID: ANSI_RAN_SEED


Error : Arguments to RANDOM_SEED must be 4-byte or 8-byte integers.

Message ID: ERROR_RAN_SEED


Ansi : Use of a COMPLEX variable as the argument to RANDOM_NUMBER is an extension to the Fortran 95 standard.

Message ID: ANSI_RAN_HARVEST


WARNING: The type of this argument of "%REF" function is CHARACTER

Message ID: WARNING_PERCENT_REF_CHARACTER


Error: Two or more elements in bind-entity-list are not allowed with NAME= specifier.

Message ID: ERROR_BIND_LIST


Error: \"::\" expected before the enumerator-list when \"scalar-int-initialization-expr\" appears in an ENUMERATOR statement.

Technical term from Fortran standard.

Message ID: ERROR_ENUM_COLON


type-alias-name

Technical term from Fortran standard.

Message ID: ANNEX_D_TYPE_ALIAS_NAME


declaration-type-spec

Message ID: ANNEX_D_TYPE_SPEC


Error: "A" has the same associated name as "B"

Message ID: ERROR_DOUBLE_BIND_NAME


Error: A derived type with the BIND attribute shall not be a SEQUENCE type.

Message ID: ERROR_BIND_DERIVED_SEQUENCE


Error: Each component of a derived type with the BIND attribute shall be a nonpointer, nonallocatable data component with interoperable type and type parameters.

Message ID: ERROR_BIND_DERIVED_PARAMETERS


Error: A derived type with the BIND attribute shall not have the EXTENSIBLE or EXTENDS attribute.

Message ID: ERROR_BIND_EXTENS


Error: Each component of a derived type with the BIND attribute shall be a nonpointer, nonallocatable data component with interoperable type and type parameters.

Message ID: ERROR_BIND_POINTER


Error : The BIND(C) attribute is specified more than once for this derived type.

Message ID: ERROR_BIND_DOUBLE


Error : The type-alias-name shall not be the same as the name of any intrinsic type.

Message ID: ERROR_TYPEALIAS_NAME


Error : Arguments to the COPYIN clause must be THREADPRIVATE.

Each item in a COPYIN clause must be a threadprivate data item.

Message ID: ERROR_THREADPRIVATE_COPYIN_OMP


Error : The buffer size value in a FILEOPT= specifier must be greater than zero.

Message ID: ERROR_FILEOPT_NONPOSIT_BUFFERN


Warning : The buffer size value in a FILEOPT= specifier is out of range.

Message ID: WARNING_FILEOPT_OVERFL_BUFFERN


Error : Module name length exceeds the maximum of %d characters.

The compiler detected a module name whose length exceeds MAX_MODULE_NAME_LEN characters. The Fortran standard limits module name length to MAX_MODULE_NAME_LEN characters.

Message ID: ERROR_LENGTH_MODULE_NAME


Error : This statement is not valid in a !$OMP ATOMIC directive.

The statement following a !$OMP ATOMIC directive must have one of these forms:

   	x = x operator expr
   	x = expr operator x
   	x = intrinsic(x, expr-list)
   	x = intrinsic(expr-list, x)
   
where x is a scalar variable reference of intrinsic type, expr is a scalar expression that does not reference x, intrinsic is MIN, MAX, IAND, IOR, or IEOR, and operator is +, *, -, /, .AND., .OR., .EQV., or .NEQV..

Message ID: ERROR_BAD_OMP_ATOMIC


Error : Identifier length exceeds the maximum of MAX_ANSI_ID_LEN characters.

The compiler detected an identifier whose length exceeds MAX_ANSI_ID_LEN characters. The ANSI standard limits identifer length to 31 characters for f90 and 6 characters for f77.

Message ID: ANSI_LENGTH_ID_NAME


Error : Incorrect argument type/attribute in generic procedure call \"%s\"

The actual argument does not match the expected type/attribute of the dummy argument. To obtain a more detailed error message, please replace the generic function call with the intended specific function, if available.

Message ID: ERROR_INCORRECT_ARG_TYPE


Error : Incorrect type/attribute of actual argument number %d in generic procedure call \"%s\"

This actual argument does not match the expected type/attribute of the dummy arguments.

Message ID: ERROR_INCORRECT_ARGNUM_TYPE


Error : Incorrect argument class in generic procedure call \"%s\"

The actual argument does not match the expected class of the dummy argument. This message would be given, for example, if a dummy procedure is expected but the actual argument supplied is a data object. To obtain a more detailed error message, please replace the generic function call with the intended specific function, if available.

Message ID: ERROR_INCORRECT_ARG_CLASS


Error : Incorrect class of actual argument number %d in the generic procedure call \"%s\".

This actual argument does not match the expected class of the dummy arguments.

Message ID: ERROR_INCORRECT_ARGNUM_CLASS


Error : Incorrect argument rank in generic procedure call \"%s\"

The actual argument does not match the expected rank of the dummy argument. To obtain a more detailed error message, please replace the generic function call with the intended specific function, if available.

Message ID: ERROR_INCORRECT_ARG_RANK


Error : Incorrect rank of actual argument number %d in the generic procedure call \"%s\".

This actual argument does not match the expected rank of the dummy argument.

Message ID: ERROR_INCORRECT_ARGNUM_RANK


Error : There are fewer actual arguments than non-optional dummy arguments in the generic procedure call \"%s\".

There are fewer actual arguments than non-optional dummy arguments

Message ID: ERROR_TOO_FEW_ACTUALS


Error : There are more actual arguments than dummy arguments in the generic procedure call \"%s\".

There are more actual arguments in the generic function call than dummy arguments in the specific functions.

Message ID: ERROR_TOO_MANY_ACTUALS


Error : Invalid keyword used in the generic procedure call \"%s\".

There is at least one keyword which is not valid in this generic function call.

Message ID: ERROR_INCORRECT_KEYWORD


Warning: Binding label "a$4" on "A" is not interoperable with any C name.

Message ID: WARN_BIND_NAME


Error: Unexpected syntax: binding label "a b" is wrong.

Message ID: ERR_BIND_NAME


Warning: Duplicate name specification with BIND attribute.

Message ID: DUPL_BIND_NAME


entity-name or /common-block-name/

Technical term from Fortran standard.

Message ID: ANNEX_D_BIND_ENTITY


Ansi : The type UNSIGNED is an extension to the Fortran standard.

The declared nonstandard type is not a part of the Fortran standard.

Message ID: ANSI_NONSTANDARD_TYPE


Error : The type UNSIGNED is not allowed in this context.

An object of any type (example: UNSIGNED type) is found where it is not expected.

Message ID: ERR_THIS_TYPE_NOT_EXPECTED


Error: C_LOC function argument must be a procedure that is interoperable, a variable that has the TARGET attribute and is interoperable, or an allocated allocatable variable that has the target attribute and has interoperable type and type parameters.

Message ID: ERR_C_LOC


Error: "A" with BIND attribute and type LOGICAL*2 is not interoperable with any C entity.

Message ID: ERR_BIND_TYPE


Error: The size of "SHAPE" should be equal to the rank of "FPTR".

Specification of C_F_POINTER subroutine.

Message ID: ERR_C_F_POINTER_SIZE


Error: Type alias name "EN1" is not allowed in this context.

Message ID: ERROR_TYPEALIAS_EXPR


Error: Asynchronous input/output is permitted only for external files.

Message ID: ERROR_AIO_TO_INTERNAL


Error: Asynchronous input/output is not permitted for STDIO.

Message ID: ERROR_AIO_TO_STDIO


Error: This ID= specifier requires ASYNCHRONOUS='YES' specifier as well.

Message ID: ERROR_ID_WTOUT_ASYNC


Warning: This ASYNCHONOUS= specifier is ignored. Its initialization expression has a non-constant value, therefore the %s will be performed synchronously.

Message ID: WARN_ASYNC_INIT_VAL


Error: This ID= specifier requires a PENDING= specifier as well.

Message ID: ERROR_ID_WTOUT_PEND


Error : The variable with the PROTECTED attribute shall not appear in a variable definition context.

The variable with the PROTECTED attribute must not be defined other than within the module in which an entity is given the PROTECTED attribute.

Message ID: NO_DEF_PROTECTED


Error : The variable with the PROTECTED attribute shall not appear as a pointer-object in a pointer-assignment statement or nullify statement.

Message ID: ASG_PTR_PROTECTED


Error : The variable with the PROTECTED attribute shall not appear as the data-target or proc-target in a pointer-assignment statement.

Message ID: TRG_PTR_PROTECTED


Error : The variable with the PROTECTED attribute shall not appear as an allocate-object in an allocate or deallocate statement.

Message ID: ALLOC_PTR_PROTECTED


Error : The variable with the PROTECTED attribute shall not appear in a variable definition context.

Message ID: NML_READ_PROTECTED


Warning : Evaluation of this INTEGER(kind=4) expression produced a value which is out of UNSIGNED(kind=4) range.

Message ID: WARN_EXPR_OUT_OF_RANGE


Error : Common block was specified in a BIND(C) statement, but has not been specified in a COMMON statement.

Message ID: ERR_BIND_WITH_COMMON


Error :The variable "A" has the BIND(C) attribute and shall not appear in common block.

Message ID: ERR_BIND_IN_COMMON


Error: Non-scalar value for a VFE is not allowed.

Message ID: VFE_ARRAY


Ansi : Use of a VFE is an extension to the Fortran 95 standard.

Message ID: VFE_ANSI


Error : The label of VFE format variable can't be assigned.

Message ID: VFE_ASSIGN


Comment : The implied-do loop with consecutive elements is treated as an array section for improved I/O performance.

The implied-do loop with consecutive elements is treated as an array section for improved I/O performance. This can cause a difference in the value of the implied-do variable if there is an I/O error on the implied-do loop. The value of the implied-do variable is undefined in this case according to the Fortran standard.

Message ID: IMPLIED_DO_CONVERTED


Warning: This directive always occurs as part of a pair, but the compiler can not find its matching directive.

For example, a C$PRAGMA END ASSUME directive must always occur after a matching C$PRAGMA BEGIN ASSUME directive. In this case the directive will simply be ignored.

Message ID: WARNING_NO_MATCHING_DIRECTIVE


Warning : The module was compiled for a different architecture from the one specified for the current compilation. This difference is usually harmless unless the module uses or declares explicit pointers.

Message ID: WARNING_ARCH


Warning : The module was compiled with a different default integer size from the one specified for the current compilation. This difference is usually harmless.

Message ID: WARNING_INTEGER_SIZE


Warning : The module was compiled with a different default real size from the one specified for the current compilation. This difference is usually harmless.

Message ID: WARNING_REAL_SIZE


Warning : The module was compiled with a different double precision size from the one specified for the current compilation. This difference is usually harmless.

Message ID: WARNING_DOUBLE_SIZE


Warning : The module was compiled with a different default interval size from the one specified for the current compilation. This difference is usually harmless.

Message ID: WARNING_INTERVAL_SIZE


Warning : The module was compiled with a different maximum alignment from the one specified for the current compilation. This difference might be harmless.

Message ID: WARNING_ALIGNMENT


Log_Error : The module file has been improperly altered since it was written.

Message ID: LOG_ERROR_CORRUPT_MOD_FILE


Error: This specifier requires ADVANCE='NO' specifier as well.

Message ID: WTOUT_ADVANCE_NO


Error : This is specified as the intrinsic module name on a USE statement, but it is not an intrinsic module.

The compiler cannot locate the intrinsic module name specified on the USE statement.

Message ID: NO_INTRINSIC_MODULE


Error: The value of type character is not allowed in the variable format expression.

Message ID: VFE_TYPE


Warning : The total memory usage of the arrays, structures, and common blocks in this file exceeds the memory available on a 32-bit system. To get it to work, the program must be compiled for 64-bit addressing, and run on a system with sufficient memory and swap space.

Message ID: MEMORY_LIMIT


The size of array \"%s\" is greater than it is supported on the target platform

Message ID: SIZE_OF_ARRAY


Error : No variable format expression is allowed for the "H" edit descriptor.

Message ID: VFE_HOLLER


Log_Error : The optional pad amount specified on the -xpad=common[:n] commandline option must be between 0 and 4096.

An optional pad amount may be specified on the -xpad=common[:n] commandline option. This number must be an integer literal constant greater than zero and less than 4096. The number specified is not within this range.

Message ID: LOG_ERROR_PAD


Ansi : Using real edit descriptor without width of the fractional part is an extension to the Fortran standard.

Message ID: EDIT_DESCRIPTOR_WITHOUT_D


Error : nP or nX edit descriptors require "P" or "X" symbols, but found something else.

Message ID: NEGATIVE_FMT_SPECIFIER


Ansi : The use of this edit descriptor is an extension to the Fortran standard.

Message ID: NON_STD_FMT_SPECIFIER


Warning: The -xalias=overindex flag has no effect on private variables.

Message ID: WARNING_OVERINDEX_PRIVATE


Error : Cannot write to the Compiler Information File.

The compiler cannot write a record to the Compiler Information File (CIF). The most likely reason is that the file system has run out of disk space.

Message ID: WRITE_CIF_FILE


Ansi : "IOMSG=" specifier is an extension to the Fortran standard.

Message ID: NON_STD_SPECIFIER


Ansi : ACCESS='STREAM' is an extension to the Fortran standard.

Message ID: NON_STD_SPECIFIERS_VALUE


Error : If an equivalence-object has the PROTECTED attribute, all of the objects in the EQUIVALENCE set shall have the PROTECTED attribute.

Message ID: EQUIV_PROTECTED


Error : The second argument to PRAGMA ASSUME if present, must be a constant value between 0 and 1.

Message ID: BAD_PROBABILITY


Error : The first argument to PRAGMA ASSUME may not contain a function or intrinsic call, except those specified in the specification: __branchexp, __invariant, __ispowerof, max, min, __no_overlap, __tripcount, and __unique.

Message ID: CALL_IN_ASSERT_EXPR


Error : This argument to the PRAGMA ASSUME intrinsic %s must be a variable reference.

Message ID: ASSERT_NOT_LVALUE


Error : The first argument to PRAGMA ASSUME must be a scalar logical expression.

Message ID: ASSERT_NOT_LOGICAL


Error : The arguments to __unique must be references to the same array that have a positive difference in exactly one dimension.

Message ID: UNIQUE_BAD_ARRAY


Error : A point ASSUME containing __tripcount must immediately precede a DO LOOP.

Message ID: BAD_TRIPCOUNT


Error : An ASSUME containing __branchexp must immediately precede a branching statement.

Message ID: BAD_BRANCHEXP


Warning : This BOZ-constant will be converted into INTEGER*4 constant.

Message ID: BOZ_CNST_DFLT_INT_CNVRT


Error : The TO argument of MVBITS intrinsic must have the same type and type parameters as FROM.

PP The TO argument of MVBITS intrinsic must have the same type and type parameters as FROM.

Message ID: MVBITS_FROM_TO


Warning : This directive was ignored. Only the first in a sequence of DOALL/DOSERIAL directives is honored.

Message ID: DO_DIR_ACTIVE


Warning : Ignoring unimplemented feature: %DESCR() function.

Message ID: WARNING_PERCENT_FEATURE


This intrinsic has been specified in a range ASSUME pragma, but it is only allowed in a point ASSUME pragma.

Message ID: NOT_IN_POINT_ASSUME


Error : Non zero initialization for large array or common block.

PP

Message ID: F77_BIG_ARR


Warning : This directive is not allowed in this context.

Message ID: WARNING_DIRECTIVE


Error : If the ADVANCE= specifier is present, the FMT= specifier must not specify list-directed formatting.

Message ID: ADVANCE_LIST_DIRECT


Warning : OpenMP, Sun and Cray Parallelization directives is not allowed in a PURE or ELEMENTAL subprogram.

Message ID: PURE_DIRECTIVE


Warning : The extra comma after io-control-spec-list in READ/WRITE statements is non-standard syntax.

Message ID: EXTRA_COMMA


Error : No more than 5 decimal digits can be specified in STOP or PAUSE statement.

Message ID: STOP_OVER


Error : This argument is an array, therefore 3rd argument shall be present.

Message ID: ERR_C_F_POINTER_SHAPE


Error : This argument size shall be equal to the rank of 2nd argument.

Message ID: ERR_C_F_POINTER_SHAPE_SIZE


Warning : This argument is ignored as 2nd argument is a scalar.

Message ID: WAR_C_F_POINTER_SCALAR


Error : A BIND attribute shall not be specified for an internal procedure.

Message ID: ERR_C_INTERNAL_PROC


Error : "A" is typed as INTEGER*8, therefore it should not be typed as INTEGER*4.

Message ID: ERR_TYPED_TWICE


Error : This variable cannot be declared in the REDUCTION clause of this directive.

Message ID: ERR_REDUCTION


Error : Only common blocks and variables declared in the scope of a module can be interoperable with C.

Message ID: ERR_LOCAL_C_BIND


Ansi : Arguments which have TYPELESS type are not standard.

Message ID: ANSI_NON_STANDARD_ARG


Error : The length of initialized variable should not exceeds 2**31 -1 bytes.

Message ID: LIMIT_INIT


Error : The statement following the preceding directive(s) must be a DO statement.

The statement following a preceding directive that applies to DO loops must be a DO statement.

Message ID: STMT_MUST_BE_DO


Caution : Procedure has the RECURSIVE attribute, so local variables in this procedure will be put on the stack and undefined.

Message ID: CAUTION_1103_SUN


Error : This type specification or length specification is not allowed for REAL.

Message ID: ERROR_0125_SUN


Error : This kind type parameter is not valid for type REAL.

Message ID: ERROR_0130_SUN


Error : This length specification is not allowed for CHARACTER.

Message ID: ERROR_0125_CH_LEN_SUN


Warning : The function being compiled cannot be USE-associated. When an external procedure interface for the current procedure is imported from a module file, the procedure interface will be ignored.

Message ID: ANSI_EXT_PROC


Part : PRIVATE, SHARED, __AUTO or NONE

This message is a part of other messages.

Message ID: PRIV_SHAR_AUTO_NONE


Part : into

This message is a part of other messages.

Message ID: INTO


Part : out of

This message is a part of other messages.

Message ID: OUT_OF


Error : Too few ONTO values.

The ONTO clause of the DISTRIBUTE, DISTRIBUTE_RESHAPE, and REDISTRIBUTE directives, if it is specified, must have exactly the same number of values as there are BLOCK or CYCLIC distribution specifications. You do not specify an ONTO value for the '*' distribution specification.

Message ID: ERROR_FEW_ONTO


Error : Too many ONTO values.

The ONTO clause of the DISTRIBUTE, DISTRIBUTE_RESHAPE, and REDISTRIBUTE directives, if it is specified, must have exactly the same number of values as there are BLOCK or CYCLIC distribution specifications. You do not specify an ONTO value for the '*' distribution specification.

Message ID: ERROR_MANY_ONTO


Error : The length of result of REPEAT intrinsic exceeds the maximum length supported on the target platform.

The maximum character length was exceeded.

Message ID: REPEAT_LENGTH


Error : This has the wrong attribute. It must not be used in this specification expression because it is not a constant.

Message ID: ERROR_0210_SUN


Error : This must be a constant to be used in this specification expression.

Message ID: ERROR_0276_SUN


Warning : Unsupported compiler directive.

The compiler encountered a compiler directive that is recognized but not supported. This occurs because the compiler directive is not relevant to supported hardware.

Message ID: UCD


WARNING_SUBSTR_RANGE Substring out of range. The starting point has value -10 for substring of 'S'

This message is a part of other messages.

Message ID: STARTING


WARNING_SUBSTR_RANGE Substring out of range. The ending point has value -10 for substring of "S"

This message is a part of other messages.

Message ID: ENDING


Unexpected syntax: "operand" or ":" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_D_OPERAND_OR_COLON


Unexpected syntax: "operand" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_D_OPERAND


Unexpected syntax: "operand", ",", or ")" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_D_OPERAND_COMMA_OR_P


Unexpected syntax: "operand" or ":" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_EOS


Unexpected syntax: "(" or "EOS" was expected but found "S".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_L_PAR_OR_EOS


Unexpected syntax: "SUBROUTINE NAME" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_SUBROUTINE_NAME


Unexpected syntax: "," or ")" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_COMMA_OR_R_PAR


Unexpected syntax: "(" or "DEFAULT" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_L_PAR_OR_DEFAULT


Unexpected syntax: "scalar integer STAT variable" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_SCALAR_INT_STAT_VARIABLE


Unexpected syntax: "allocation object" or "STAT =" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_ALLOC_OBJ_OR_STAT


Unexpected syntax: "(" or "=" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_L_PAR_OR_EQUALS


Unexpected syntax: "," or "EOS" was expected but found "S".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_COMMA_OR_EOS


Unexpected syntax: "colon", "comma", or "right parenthesis" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_COLON_COMMA_OR_R_PAR


Unexpected syntax: "=" or ")" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_EQUALS_R_PAR


Unexpected syntax: "identifier" or "EOS" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_IDENTIFIER_OR_EOS


Unexpected syntax: "," or "(" or "EOS" was expected but found "S".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_COMMA_OR_L_PAR_OR_EOS


Unexpected syntax: "LABEL" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_LABEL


Unexpected syntax: "IDENTIFIER" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_IDENTIFIER


Unexpected syntax: "statement label" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_STATEMENT_LABEL


Unexpected syntax: "operator" or "EOS" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_OPERATOR_OR_EOS


Unexpected syntax: "CONSTANT" was expected but found "]".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_CONSTANT


Unexpected syntax: "/" or "," or "EOS" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_SLASH_OR_COMMA_OR_EOS


Unexpected syntax: "POINTER" or "DIMENSION" was expected but found "X".

The syntax of this derived type declaration statement is incorrect type S REAL, X end type This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_POINTER_OR_DIMENSION


Unexpected syntax: "," or "/" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_COMMA_OR_SLASH


Unexpected syntax: ",", "*", or "/" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_COMMA_OR_ASTER_OR_SLASH


Unexpected syntax: "A","B","C","D","E","F","G","H","J","K","L","M","N","O","P","Q","R","S","T","U","V","W","X","Y" or "Z" was expected but found "5".

The syntax of this statement is incorrect IMPLICIT real (5) This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_ALPHABET


Unexpected syntax: "INTEGER", "REAL", "DOUBLE", "COMPLEX", "LOGICAL", "CHARACTER" or "TYPE" was expected but found "EOS".

The syntax of this statement is incorrect IMPLICIT This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_TYPE_DECL


Unexpected syntax: "PUBLIC", "PRIVATE", "EXTENSIBLE", "EXTENDS" or "BIND(C)" was expected but found ":".

The syntax of this derived type declaration statement is incorrect type, :: S REAL X end type This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_ACCESS_ATTRIBUTE


Unexpected syntax: "INTRINSIC" or "NON_INTRINSIC" was expected but found "EOS".

The syntax of this USE statement is incorrect USE, IEEE_ARITHMETIC This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_INTRINSIC_OR_NON_INTRIN


Unexpected syntax: "," or "::" was expected but found "Y".

The syntax of this type declaration statement is incorrect real, parameter Y This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_COMMA_OR_COLON_SEPARATOR


Unexpected syntax: "ALLOCATABLE", "BIND", "DIMENSION", "EXTERNAL", "INTENT", "INTRINSIC", "OPTIONAL", "PARAMETER", "POINTER", "PRIVATE", "PUBLIC", "PROTECTED", "SAVE" or "TARGET" was expected but found ":".

The syntax of this type declaration statement is incorrect real, :: Y This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_ATTRIBUTE


128 or EOS

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_128_OR_EOS


Unexpected syntax: "FUNCTION", "SUBROUTINE", "INTEGER", "LOGICAL", "DOUBLE PRECISION", "REAL", "COMPLEX", "CHARACTER" or "TYPE" was expected but found "A".

The syntax of this procedure definition is incorrect pure a() This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_PROG_OR_TYPE_DECL


Unexpected syntax: "RESULT" or "EOS" was expected but found "R".

The syntax of this procedure definition is incorrect real function a(b) resul(bb), This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_RESULT_OR_EOS


Unexpected syntax: "pointee name" was expected but found ")".

The syntax of this statement is incorrect pointer( rr,) This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_POINTEE_NAME


Unexpected syntax: "Cray pointer name" was expected but found ")".

The syntax of this statement is incorrect pointer( ) This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_CRAY_POINTER_NAME


Unexpected syntax: "Cray pointee" was expected but found ",".

The syntax of this statement is incorrect pointer( ,cc) This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_CRAY_POINTEE


A derived type with the BIND attribute shall not have the "EXTENSIBLE" or "EXTENDS" attribute.

This message is a part of other messages like #1958 ERROR_BIND_EXTENS.

Message ID: ANNEX_EXTENSIBLE_OR_EXTENDS


"ARR" has the Initialized attribute, therefore it must not be declared as an explicit-shape array with nonconstant bounds.

This message is a part of other messages like #582 ERROR_0582.

Message ID: ANNEX_INITIALIZED


Unexpected syntax: "END ENUM" or "ENUMERATOR" was expected but found "REAL".

The syntax of this statement is incorrect enum :: digits real t This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_ENDENUM_OR_ENUMERATOR


"SS" has the CHARACTER attribute, therefore it must not be declared as a Cray pointer.

character ss pointer(ss,i ) This message is a part of other messages like #552 ERROR_0552.

Message ID: ANNEX_CRAY_POINTER


"I" has the INTEGER attribute, therefore it must not be declared as a Cray character pointer.

character ss pointer(i,ss ) This message is a part of other messages like #552 ERROR_0552.

Message ID: ANNEX_CRAY_CHARACTER_POINTER


"B" is a dummy-argument, therefore it must not be declared as a Cray pointee.

This message is a part of other messages like #553 ERROR_0553.

Message ID: ANNEX_DUMMY_ARGUMENT


"B" is a dummy-argument, therefore it must not be declared as a pointee.

This message is a part of other messages like #553 ERROR_0553.

Message ID: ANNEX_POINTEE


Unexpected syntax: "operator" was expected but found "logical literal constant".

The syntax of this statement is incorrect bb = i.TRUE. This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_OPERATOR


Unexpected syntax: "operator" was expected but found "logical literal constant".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_LOGICAL_LITERAL_CONSTANT


Unexpected syntax: "a number" was expected but found "]".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_A_NUMBER


Unexpected syntax: "," or "]" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_COMMA_OR_R_SQUARE_BRACKET


This ALLOCATE shape specifier has missing lower bound.

This message is a part of other messages like #1604 ERROR_1558.

Message ID: ANNEX_LOWER_BOUND


This ALLOCATE shape specifier has missing upper bound.

This message is a part of other messages like #1604 ERROR_1558.

Message ID: ANNEX_UPPER_BOUND


Unexpected syntax: "IN" or "OUT" or "INOUT" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_IN_OR_OUT_OR_INOUT


Unexpected syntax: "IN" or "OUT" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_IN_OR_OUT


Unexpected syntax: "COMPLEX" or "PRECISION" was expected but found "S".

The syntax of this type declaration statement is incorrect DOUBLE ss This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_COMPLEX_OR_PRECISION


Invalid source for DECODE. It must be a variable, array element or whole array reference.

This message is a part of other messages like #1112 ERROR_1112.

Message ID: ANNEX_SOURSE


Invalid destination for ENCODE. It must be a variable, array element or whole array reference.

This message is a part of other messages like #1112 ERROR_1112.

Message ID: ANNEX_DESTINATION


"ARR" has the assumed-size DIMENSION attribute, therefore it must not be declared with the explicit-shape DIMENSION attribute.

This message is a part of other messages like #550 ERROR_0550.

Message ID: ANNEX_EXPLISIT_SHP_ARR


"ARR" has the explicit-shape DIMENSION attribute, therefore it must not be declared with the assumed-size DIMENSION attribute.

This message is a part of other messages like #550 ERROR_0550.

Message ID: ANNEX_ASUMED_SIZE_ARR


"ARR" has the explicit-shape DIMENSION attribute, therefore it must not be declared with the deferred-shape DIMENSION attribute.

This message is a part of other messages like #550 ERROR_0550.

Message ID: ANNEX_DEFERRED_SHP_ARR


"ARR" has the explicit-shape DIMENSION attribute, therefore it must not be declared with the assumed-shape DIMENSION attribute.

This message is a part of other messages like #550 ERROR_0550.

Message ID: ANNEX_ASUMED_SHP_ARR


"ARR" has the DATA initialized attribute, therefore it must not be declared with the ALLOCATABLE attribute.

This message is a part of other messages like #550 ERROR_0550.

Message ID: ANNEX_DATA_INITIALIZED


"ARR" has the co-array DIMENSION attribute, therefore it must not be declared as a Cray pointer.

This message is a part of other messages like #552 ERROR_0552.

Message ID: ANNEX_CO_ARRAY_DIMENSION


"S" is a variable, therefore it must not be declared with the PARAMETER attribute.

This message is a part of other messages like #551 ERROR_0551.

Message ID: ANNEX_VARIABLE


"S" is a Cray character pointee, therefore it must not be declared with the SAVE attribute.

This message is a part of other messages like #551 ERROR_0551.

Message ID: ANNEX_CRAY_CHARACTER_POINTEE


"P" is a module-subprogram, therefore it must not be declared with the SAVE attribute.

This message is a part of other messages like #551 ERROR_0551.

Message ID: ANNEX_MODULE_SUBPROGRAM


"F" is a statement function, therefore it must not be declared with the SAVE attribute.

This message is a part of other messages like #551 ERROR_0551.

Message ID: ANNEX_STATEMENT_FUNCTION


"F" is a intrinsic function, therefore it must not be declared with the SAVE attribute.

This message is a part of other messages like #551 ERROR_0551.

Message ID: ANNEX_INTRINSIC_FUNCTION


"F" is a intrinsic subroutine, therefore it must not be declared with the SAVE attribute.

This message is a part of other messages like #551 ERROR_0551.

Message ID: ANNEX_INTRINSIC_SUBROUTINE


"F" is a block-data, therefore it must not be declared with the SAVE attribute.

This message is a part of other messages like #551 ERROR_0551.

Message ID: ANNEX_BLOCK_DATA


"F" is a internal function, therefore it must not be declared with the SAVE attribute.

This message is a part of other messages like #551 ERROR_0551.

Message ID: ANNEX_INTERNAL_FUNCTION


"F" is a internal subroutine, therefore it must not be declared with the SAVE attribute.

This message is a part of other messages like #551 ERROR_0551.

Message ID: ANNEX_INTERNAL_SUBROUTINE


"B" is a function entry, therefore it must not be declared as a pointee.

This message is a part of other messages like #553 ERROR_0553.

Message ID: ANNEX_FUNCTION_ENTRY


"B" is a subroutine entry, therefore it must not be declared as a pointee.

This message is a part of other messages like #553 ERROR_0553.

Message ID: ANNEX_SUBROUTINE_ENTRY


"B" is a module procedure function, therefore it must not be declared as a pointee.

This message is a part of other messages like #553 ERROR_0553.

Message ID: ANNEX_PROCEDURE_FUNCTION


"B" is a module procedure subroutine, therefore it must not be declared as a pointee.

This message is a part of other messages like #553 ERROR_0553.

Message ID: ANNEX_PROCEDURE_SUBROUTINE


"B" is a statement function dummy argument, therefore it must not be declared as a pointer.

This message is a part of other messages like #553 ERROR_0553.

Message ID: ANNEX_SF_DARG


Unexpected syntax: "OpenMP directive keyword" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_OPENMP_DIRECTIVE_KEYWORD


Unexpected syntax: "array name" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_ARRAY_NAME


Unexpected syntax: "SPAN" or "EOS" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_SPAN_OR_EOS


Unexpected syntax: "POINT", "SPAN" or "EOS" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_POINT_SPAN_OR_EOS


Unexpected syntax: "IF" or "EOS" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_IF_OR_EOS


Unexpected syntax: "MP_SCHEDTYPE mode" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_MP_SCHEDTYPE_MODE


Unexpected syntax: "RD" or "WR" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_RD_OR_WR


Unexpected syntax: "PREFETCH_REF clause" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_PREFETCH_REF_CLAUSE


Unexpected syntax: "ORDERED clause" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_ORDERED_CLAUSE


Unexpected syntax: "mp clause" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_MP_CLAUSE


More than one CHUNK or BLOCKED clause has been specified for this PARALLEL directive.

This message is a part of other messages like #1360 ERROR_1360.

Message ID: ANNEX_CHUNK_OR_BLOCKED


The AFFINITY clause is an extension to the OpenMP standard. It should have the !$SGI sentinel.

This message is a part of other messages like #1564 WARNING_1518.

Message ID: ANNEX_AFFINITY_CLAUSE


Unexpected syntax: "DATA" or "THREAD" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_DATA_OR_THREAD


The LOCAL or PRIVATE clause is not allowed with the mp directive.

This message is a part of other messages like #1370 ERROR_1370.

Message ID: ANNEX_LOCAL_OR_PRIVATE


Unexpected syntax: "ONTO" or "EOS" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_ONTO_OR_EOS


Unexpected syntax: "comma" or "data-stmt-object" or "EOS" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_COMMA_DSTMT_OBJECT_EOS


Unexpected syntax: "common-block-name" or "/" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_CBLOCK_NAME_OR_SLASH


Unexpected syntax: "common-block-object" or "/" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_CBLOCK_OBJECT_OR_SLASH


Unexpected syntax: "data-i-do-object" or "data-i-do-variable" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_DATA_I_DO_OBJ_OR_VAR


Unexpected syntax: "data-stmt-repeat" or "data-stmt-constant" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_DATA_STMT_REPT_OR_CONS


Unexpected syntax: "=" or "," or "(subscript-list)" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_EQ_COMMA_SUBLIST_W_PARS


Unexpected syntax: "(" or "," or "::" or "type-name" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_LP_COMMA_DOTS_TYPE_NAME


Unexpected syntax: "ONLY" or "use-name" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_ONLY_OR_USE_NAME


Unexpected syntax: "entity-name" or "/common-block-name/" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_BIND_ENTITY


Unexpected syntax: "implied-do-object" or "do-variable" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_IMPLIED_DO_OBJ_OR_VAR


Unexpected syntax: "construct-name" or "EOS" was expected but found ")".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_CONSTRUCT_NAME_OR_EOS


Unexpected syntax: "do-variable" or "WHILE" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_DO_VARIABLE_OR_WHILE


Unexpected syntax: "object-name" or "/" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_OBJECT_NAME_OR_SLASH


Unexpected syntax: "OPERATOR" or "ASSIGNMENT" or "generic-name" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_OP_ASG_GENERIC_NAME


Unexpected syntax: "scalar-int-literal-constant" or "(" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_SCALAR_INT_LIT_CONS_LP


Unexpected syntax: "BLOCK", "CYCLIC", or "*" was expected but found ",".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_D_DIST_FORMAT


Ansi : Usage the TYPE statement as an output statement is an extension to the Fortran standard.

Message ID: ANSI_TYPE_AS_PRINT


Warning : This name of nonintrinsic module may disguise the name of intrinsic module ISO_C_BINDING.

Message ID: NON_INTRINSIC_MODULE


Error : A READ statement is not allowed in the pure subprogram "FUNC" if io-unit is an external-file-unit or "*".

Message ID: READ_WRITE_EXT_UNIT_IN_PURE


Warning : Bad alignment of the component "CMPN_NAME" of the Derived Type "DER_TYPE_NAME" may lead to incorrect result.

Message ID: BAD_DER_TYPE_ALIGN_WARN


Caution : Alignment of the component "CMPN_NAME" of the Derived Type "DER_TYPE_NAME" may cause performance degradation.

Message ID: BAD_DER_TYPE_ALIGN_CAUT


Warning : Empty nested structure declaration will be ignored.

Message ID: EMPTY_SUBSTRUCT_DECLARE


Ansi : Usage of a non pure external function "NONPURE_EXT_FUNC" in a bounds specification expression is an extension to Fortran standard.

Message ID: NONPURE_FUNC_SPEC_EXPR


Ansi : Usage of a recursive external function "RECURSIVE_EXT_FUNC" in a bounds specification expression is an extension to Fortran standard.

Message ID: RECURSIVE_FUNC_SPEC_EXPR


Ansi : The implied-DO objects list containing the nested parentheses with a list of expressions or implied-DO cycles is an extension to Fortran standard.

Message ID: IMPLIED_DO_NESTED_PARENT


Error : Entry points must both have the ALLOCATABLE attribute.

PP If the result of any entry point of a function with one or more ENTRY statements has the ALLOCATABLE attribute, then all entry points in that function must return a result with the ALLOCATABLE attribute.

Message ID: ERROR_ENTRY_ALLOC


Error : We do not support the import of old modules which have been unlowered into a new module.

PP Starting from the S1S8 release, the Fortran compiler does not allow older modules, which were created with the FD7 release or earlier and with -O option, to be used to create a new module, due to an incompatible module format. The old module compiled with -O option can still be used in a subprogram scope, but not in a module scope.

Message ID: ERROR_MOD_KRA_O3


Warning : Conditional compilation blocking error. No matching "IF", "IFDEF", or "IFNDEF" directive

This message is a part of other messages like #1166 ERROR_1166.

Message ID: ANNEX_IF_IFDEF_OR_IFNDEF


Warning : Conditional compilation has unexpected syntax. Expected expression

This message is a part of other messages like #1165 ERROR_1165.

Message ID: ANNEX_EXPRESSION


Warning : Conditional compilation has unexpected syntax. Expected INCLUDE file name

This message is a part of other messages like #1165 ERROR_1165.

Message ID: ANNEX_INCLUDE_FILE_NAME


Warning : Conditional compilation has unexpected syntax. Expected conditional compilation directive

This message is a part of other messages like #1165 ERROR_1165.

Message ID: ANNEX_COND_COMP_DIR


Warning : Conditional compilation has unexpected syntax. Expected identifier or integer constant

This message is a part of other messages like #1165 ERROR_1165.

Message ID: ANNEX_IDENTIFIER_OR_INT_CONST


Unexpected syntax: "INTEGER", "INTERVAL", "REAL", "DOUBLE", "COMPLEX", "LOGICAL", "CHARACTER" or "TYPE" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_TYPE_DECL_WITH_INTERVAL


Error : More than one MODE or MP_SCHEDTYPE clause has been specified for this directive.

This message is a part of other messages like #1360 ERROR_1360.

Message ID: ANNEX_MODE_OR_MP_SCHEDTYPE


Warning : OpenMP, Sun and Cray Parallelization directives is not allowed in a PURE or ELEMENTAL subprogram.

This message is a part of other messages like #2042 PURE_DIRECTIVE.

Message ID: ANNEX_CRAY_PARALLELIZATION


Warning : OpenMP, Sun and Cray Parallelization directives is not allowed in a PURE or ELEMENTAL subprogram.

This message is a part of other messages like #2042 PURE_DIRECTIVE.

Message ID: ANNEX_SUN_PARALLELIZATION


Warning : The DISTRIBUTE directive is an extension to the OpenMP standard. It should have the !$SGI sentinel.

This message is a part of other messages like #1564 WARNING_1518

Message ID: ANNEX_DISTRIBUTE_DIRECTIVE


Warning : The DISTRIBUTE_RESHAPE directive is an extension to the OpenMP standard. It should have the !$SGI sentinel.

This message is a part of other messages like #1564 WARNING_1518

Message ID: ANNEX_DISTRIBUTE_RESHAPE_DIR


Warning : The DYNAMIC directive is an extension to the OpenMP standard. It should have the !$SGI sentinel.

This message is a part of other messages like #1564 WARNING_1518

Message ID: ANNEX_DYNAMIC_DIRECTIVE


Warning : The PAGE_PLACE directive is an extension to the OpenMP standard. It should have the !$SGI sentinel.

This message is a part of other messages like #1564 WARNING_1518

Message ID: ANNEX_PAGE_PLACE_DIRECTIVE


Warning : The REDISTRIBUTE directive is an extension to the OpenMP standard. It should have the !$SGI sentinel.

This message is a part of other messages like #1564 WARNING_1518

Message ID: ANNEX_REDISTRIBUTE_DIRECTIVE


Warning : The ONTO clause is an extension to the OpenMP standard. It should have the !$SGI sentinel.

This message is a part of other messages like #1564 WARNING_1518

Message ID: ANNEX_ONTO_CLAUSE


Warning : The NEST clause is an extension to the OpenMP standard. It should have the !$SGI sentinel.

This message is a part of other messages like #1564 WARNING_1518

Message ID: ANNEX_NEST_CLAUSE


Unexpected syntax: "OpenMP clausee" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_OPENMP_CLAUSE


Error : The C$OMP SECTION directive must be specified within a C$OMP PARALLEL SECTIONS region, or C$OMP SECTIONS region.

This message is a part of other messages like #1458 ERROR_1412.

Message ID: ANNEX_OMP_SECTION


Error : The C$OMP SECTION directive must be specified within a C$OMP PARALLEL SECTIONS region, or C$OMP SECTIONS region.

This message is a part of other messages like #1458 ERROR_1412.

Message ID: ANNEX_OMP_PARALLEL_SECTION


Unexpected syntax: "OpenMP End Single clause" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_OPENMP_END_SINGLE_CLAUSE


Unexpected syntax: "L1cacheline, L2cacheline, or page" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_CACHLINE


Unexpected syntax: "HERE", "ROUTINE", or "GLOBAL" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_HERE_ROUTINE_OR_GLOBAL


Unexpected syntax: "MAX", "MIN", "IAND", "IOR", "IEOR" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_MAX_MIN_IAND_IOR_IEOR


Unexpected syntax: "+", "*", "-", ".AND.", ".OR.", ".EQV.", or ".NEQV" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_AND_OR_EQV_OR_NEQV


Unexpected syntax: "operator" or "intrinsic" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_OPERATOR_OR_INTRINSIC


Unexpected syntax: "SCHEDULE type" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_SCHEDULE_TYPE


Unexpected syntax: "PRIVATE" or "SHARED" was expected but found "EOS".

This message is a part of other messages like #197 ERROR_0197.

Message ID: ANNEX_PRIVATE_OR_SHARED


Error : The module file contains an invalid expression.

The module contains an invalid expression which cannot be processed by the compiler. The most likely cause is that the module file has been corrupted and need to be recompiled with a later version of the compiler. If the error persists after recompilation then this might be the result of a compiler bug and the problem should be reported.

Message ID: ERR_BAD_MODULE


Error : The -xfilebyteorder option has a file or unit specified inconsistently.

The characteristics of a file or logical unit can only specified once. It is an error to specify the same file or logical unit with different characteristics.

Message ID: ERR_BAD_FILEBYTEORDER_SPEC


Error : The specified option is being not used correctly.

The option is not being used correctly, probably by a typographical error. Please check the man page for correct usage.

Message ID: GENERIC_BAD_OPTION


Warning : A tab-formatted source line can be truncated in fixed-formatting mode if the -f77=tab option is not used.

By default, the Fortran compiler truncates a source line at column 73 in fixed-formatting mode. This includes lines starting with a character. To allow a tab-formtted line to extend beyond this limit, the -f77=tab option can be used to compile the file.

Message ID: TAB_FORMATTED_LINE_TRUNCATED


Warning : Variables that appear in namelist statements may not appear in a private, firstprivate, or lastprivate clause.

According to the OpenMP specification, variables that appear in namelist statements may not appear in a private firstprivate, or lastprivate clause. If the namelist statement is not referenced in this construct, you may safely ignore this warning. If you are satisfied that the namelist statement references the local private, firstprivate, or lastprivate version of the variable, then you may also choose to ignore this warning.

Message ID: WAR_OMP_NAMELIST_VAR_BAD


Warning : Variables that appear in statement function definitions may not appear in a private, firstprivate, or lastprivate clause.

According to the OpenMP specification, variables that appear in statement function definitions may not appear in a private firstprivate, or lastprivate clause. If the namelist statement is not referenced in this construct, you may safely ignore this warning. If you are satisfied that the namelist statement references the local private, firstprivate, or lastprivate version of the variable, then you may also choose to ignore this warning.

Message ID: WAR_OMP_STMT_FUNC_VAR_BAD


Warning : Variables that appear in variable format expressions may not appear in a private, firstprivate, or lastprivate clause.

According to the OpenMP specification, variables that appear in variable format expressions may not appear in a private firstprivate, or lastprivate clause. If the namelist statement is not referenced in this construct, you may safely ignore this warning. If you are satisfied that the namelist statement references the local private, firstprivate, or lastprivate version of the variable, then you may also choose to ignore this warning.

Message ID: WAR_OMP_VFE_VAR_BAD


Warning : Variables that appear in threadprivate directives may not be the loop iteration variable for an OpenMP loop construct.

The OpenMP specification does not permit variables that appear in threadprivate directives to be used as the loop iteration variable for an OpenMP loop construct.

Message ID: ERR_OMP_THREADPRIVATE_LCV_BAD


Warning : INTERFACE block declaration will not be used for this subprogram.

When a function is included in a library named by the -xknown_lib option, its semantics are strictly defined by that flag and may not be altered by declaring it in an INTERFACE block. Specifically, any user-supplied definition of the subprogram will be ignored.

Message ID: WARNING_IGNORING_INTERFACE


Error : There is a storage conflict in a padded common block with EQUIVALENCE statements

Padding options such as -dalign, -aligncommon, etc. are not always usable. Sometimes, they can produce storage conflicts with the EQUIVALENCE statements due to the extra padded spaces which are inserted against standard Fortran to improve runtime performance. In this case, the padding option should be removed to avoid the compilation error.

Message ID: ERR_PADDING_OPTION


Caution : A symbol can only be declared in one module. If the same symbol is declared in multiple modules which are USEd by the current program unit then that symbol cannot be referenced.

The named symbol is declared in at least two modules and therefore it cannot be used in this program unit. It has to be renamed in one of the modules if the two modules declared different entities.

Message ID: CAUTION_NOT_VISIBLE


Ansi : The COMMA before BIND(C) in subroutine definition statement is nonstandard.

The COMMA before BIND(C) in subroutine definition statement is nonstandard.

Message ID: ANSI_COMMA_BEFORE_BIND


Error : An intrinsic function %s has been defined in the same scope where this contains procedure of the same name is defined.

There is a name conflict between a generic intrinsic interface and a contains procedure. The contains procedure should be renamed, or the interface declaration removed, to avoid the conflict.

Message ID: ERR_INTRINSIC_USER_COLLISION


Error : Each value in a pragma loop clause must be an integer literal.

Each value in a pragma loop clause must be an integer literal.

Message ID: ERR_PRAGMA_LOOP_VAL


Error: C_FUNLOC function argument must be a procedure that is interoperable.

Message ID: ERR_C_FUNLOC


Error: C_LOC function argument must be a variable that has the TARGET attribute and is interoperable, or an allocated allocatable variable that has the target attribute and has interoperable type and type parameters.

Message ID: ERR_C_LOC_1


Ansi : When a scalar of type character is used as an actual argument, Fortran 2003 allows it to be treated as an element sequence. Fortran 95 only allows array element subscript designator to be treated as element sequence.

A scalar variable of type CHARACTER*10, for example, is treated as an element sequence in Fortran 2003 and, therefore, will not result in a compilation error if the corresponding dummy argument is an array.

Message ID: ANSI_CHARACTER_SEQUENCE_2003