Back to All Intel Fortran Compiler Diagnostics
- 8000: There is a conflict between local interface block and external interface block.
- 8001: The type of the element in a structure-constructor differs from the type of the component in the derived-type-def.
- 8002: An array name is required as the first option in a MEMORYTOUCH directive.
- 8003: Invalid data type for array used in MEMORYTOUCH directive.
- 8004: Invalid schedule or initialization type specified in a MEMORYTOUCH directive. Valid types are STATIC, DYNAMIC, GUIDED, RUNTIME, STORE, and LOAD.
- 8005: Invalid schedule type specified in SCHEDULE clause of a MEMORYTOUCH directive. Valid schedule types are STATIC, DYNAMIC, GUIDED, and RUNTIME
- 8006: Invalid initialization type specified in INITIALIZATION clause of a MEMORYTOUCH directive. Valid initialization types are STORE and LOAD
- 8007: Intrinsic operator can not be used as the name of a locally defined operator in an OPERATOR rename clause
- 8008: A common block or variable may not exceed 2147483647 bytes
- 8009: A pointer dummy argument with the INTENT(IN) attribute shall not appear as an allocate-object in an allocate or a deallocate statement.
- 8010: A pointer dummy argument with the INTENT(IN) attribute shall not appear as an pointer-object in a pointer-assignment-stmt or nullify-stmt.
- 8011: A pointer dummy argument with the INTENT(IN) attribute shall not appear as an actual argument if the associated dummy argument has the INTENT(OUT) or INTENT(INOUT) attribute.
- 8012: Fortran xx does not allow this sequence of length selector and array specifier.
- 8013: The dummy argument of a derived type containing a pointer component has the INTENT(IN) attribute therefore it shall not appear as the expr of an assignment-stmt in a PURE procedure.
- 8014: The common-block-object, or object storage associated with a common-block-object of a derived type containing a pointer component shall not appear as the expr of an assignment-stmt in a PURE procedure.
- 8015: The use associated object of a derived type containing a pointer component shall not appear as the expr of an assignment-stmt in a PURE procedure.
- 8016: The host associated object of a derived type containing a pointer component shall not appear as the expr of an assignment-stmt in a PURE procedure.
- 8017: The memory reference associated with an ASSUME_ALIGNED directive must be an array or subscripted array reference.
- 8018: The memory reference associated with an ASSUME_ALIGNED directive must not be in COMMON, a field reference, use associated, or host associated.
- 8019: Invalid alignment value specified for ASSUME_ALIGNED directive.
- 8020: The first argument to MM_PREFETCH must be an address.
- 8021: Intrinsic operator can not be used on the right hand side of an OPERATOR rename clause
- 8022: A locally defined operator name has been used multiple times.
- 8023: The shift count must be positive.
- 8024: The shift count must be non-negative and less than or equal to 64.
- 8025: An error occurred converting to an INTEGER(2) value.
- 8026: An error occurred converting to an INTEGER(4) value.
- 8027: An error occurred converting to an INTEGER(8) value.
- 8028: An error occurred converting to a REAL(4) value.
- 8029: An error occurred converting to a REAL(8) value.
- 8030: An error occurred converting to a REAL(16) value.
- 8031: Use of EXTERNAL to match subroutine argument in generic resolution is non-standard
- 8032: Generic procedure reference has two or more specific procedure with the same type/rank/keyword signature.
- 8033: This equivalence-object has the PROTECTED attribute, all of the objects in the equivalence set shall have the PROTECTED attribute.
- 8034: Vector subscripts followed by other vector subscripts or slices in data initialization is currently not implemented
- 8035: The double precision arguments to the DPROD intrinsic function are not standard conforming.
- 8036: A Hollerith constant is not allowed in this context
- 8037: If an object of a type for which component-initialization is specified appears in the specification-part of a MODULE and does not have ALLOCATABLE or POINTER attribute, the object shall have the SAVE attribute.
- 8038: A referenced intrinsic procedure can not have the same name as a common block.
- 8039: The INTENT(OUT) or INTENT(INOUT) attribute is not allowed for arguments received by value.
- 8040: Invalid type-name in a derived type definition.
- 8041: The IMPORT statement is not positioned correctly within the scoping unit.
- 8042: This argument must be of type character of length 1.
- 8043: The extra characters in the format specification will be ignored
- 8044: Declaring a FUNCTION subprogram without an argument list is non-standard
- 8045: Renaming user defined operators in USE statement is an extension of Standard Fxx.
- 8046: The 'KIND' argument for this intrinsic function is an extension of Standard Fxx.
- 8047: The IOMSG= specifier is an extension of Standard Fxx.
- 8048: An equivalenced data object must not be a structure component (field) of a derived type.
- 8049: Fortran xx does not allow branching to an END SELECT stmt from outside its CASE construct. Branch to the statement following the END SELECT.
- 8050: The IMPORT statement is not supported on this platform.
- 8051: The data type of the argument to HUGE is invalid.
- 8052: The data type of the argument to TINY is invalid.
- 8053: The data type of the argument to EPSILON is invalid.
- 8054: It is invalid to specify a common block on an IMPORT statement.
- 8055: The procedure has a dummy argument that has the ALLOCATABLE, ASYNCHRONOUS, OPTIONAL, POINTER, TARGET, VALUE or VOLATILE attribute. Required explicit interface is missing from original source.
- 8056: The ASYNCHRONOUS= specifier value in a data transfer statement is not known at compile time; the specifier will be ignored.
- 8057: Asynchronous input/output is not implemented in internal routines therefore this statement will be executed synchronously.
- 8058: Asynchronous input/output does not support variable format expression; therefore this statement will be executed synchronously.
- 8059: The module-name on a USE statement can not be used with both an INTRINSIC and NON_INTRINSIC module-nature specified.
- 8060: A dummy argument with the VALUE attribute can not have the VOLATILE attribute (Constraint C527).
- 8061: A dummy argument with the VALUE attribute can not have the EXTERNAL attribute (Constraint C527).
- 8062: A dummy argument with the VALUE attribute can not have the POINTER attribute (Constraint C527).
- 8063: The character length of a dummy argument with the VALUE attribute must be an initialization expression (Constraint C528).
- 8064: This syntax is invalid; the keyword C is required when using the BIND attribute.
- 8065: This syntax is invalid; the keyword NAME is required in NAME= specifier when using the BIND attribute.
- 8066: The NAME= specifier in BIND statement or in the BIND attribute specification of a type declaration statement must be a character initialization expression.
- 8067: If any bind-entity in a bind-stmt is an entity-name, the bind-stmt shall appear in the specification part of a module (Constraint C550).
- 8068: If the language-binding-spec has a NAME= specifier, the bind-entity-list shall consist of a single bind-entity (Constraint C551).
- 8069: This symbol has multiple BIND statement/attribute declarations which is not allowed.
- 8070: The ASYNCHRONOUS= specifier in a data transfer statement must be a character initialization expression (Constraint C924).
- 8071: An integer constant expression is required in this context; the directive will be ignored.
- 8072: This keyword is invalid for the LOOPCOUNT directive; the directive will be ignored.
- 8073: The LOOPCOUNT directive only allows 1 MIN, MAX and AVG keyword specified; the directive will be ignored.
- 8074: The LOOPCOUNT directive with keywords is not supported in this release; the directive will be ignored.
- 8075: The argument SHIFT to the SHIFTA/SHIFTR/SHIFTL intrinsic function is out-of-range.
- 8076: A proc-language-binding-spec is not standard Fortran xx.
- 8077: A proc-language-binding-spec shall not be specified for an internal procedure.
- 8078: A derived type with the BIND attribute is not standard Fortran xx.
- 8079: A derived type with the BIND attribute shall not be SEQUENCE type
- 8080: Each component of a derived type with the BIND attribute shall be a nonpointer, nonallocatable data component with interoperable type and type parameters
- 8081: The variable with the BIND(C) attribute shall not appear in common block.
- 8082: The NULLIFY attribute may only be used for a dummy argument that has both the POINTER and INTENT(OUT) attributes.
- 8083: The DLLEXPORT attribute should not be specified for a type.
- 8084: An internal file unit must be of type character.
- 8085: A procedure entry and the procedure must have the same use of the STDCALL attribute.
- 8086: This host associated name shall not appear as a construct name.
- 8087: The characteristics of the result of the function named in the FUNCTION statement are not standard conforming.
- 8088: The characteristics of the result of the function named in the ENTRY statement are not standard conforming.
- 8089: Parentheses around an I/O list is an extension to Standard Fxx.
- 8090: There are more than 5 decimal digits specified in a STOP or PAUSE statement. This is an extension to Standard Fxx.
- 8091: Invalid argument greater than 2147483647 in either a PAUSE, STOP or ERROR STOP statement.
- 8092: A do-variable within a DO body shall not appear as a stat-variable in an allocate or a deallocate statement.
- 8093: A do-variable within a DO body shall not appear in a variable definition context.
- 8094: The array-spec for a function name with ALLOCATABLE or POINTER attribute must be a deferred-shape-array.
- 8095: The name of the internal procedure conflicts with a procedure name in the MODULE PROCEDURE statement.
- 8096: The use-name in the rename clause has not been resolved in the module.
- 8097: This name has the EXTERNAL attribute, therefore it shall not be declared with VOLATILE attribute.
- 8098: DEC$ OPTIMIZE directive must be within the body of a procedure program unit; directive ignored.
- 8099: The rank of the function reference does not match the rank of the function definition.
- 8100: The actual argument is an array section or assumed-shape array, corresponding dummy argument that has either the VOLATILE or ASYNCHRONOUS attribute shall be an assumed-shape array.
- 8101: The actual argument is a pointer array, corresponding dummy argument that has either the VOLATILE or ASYNCHRONOUS attribute shall be an assumed-shape array or a pointer array.
- 8102: The name of this intrinsic module has been previously referenced as non-intrinsic in this scoping unit.
- 8103: The name of this non-intrinsic module has been previously referenced as intrinsic in this scoping unit.
- 8104: A common-block-object of a nonsequence derived type is an extension of Standard Fxx.
- 8105: Required explicit interface for an elemental procedure is missing from original source.
- 8106: This binary constant is too large in this context.
- 8107: Required explicit interface for a procedure with BIND attribute is missing from original source.
- 8108: The data-i-do-object shall be an array-element, scalar-structure-component or data-implied-do.
- 8109: The scalar-structure-component is used as a data-i-do-object. It shall contain at least one part-ref that contains a subscript-list.
- 8110: The module file for compiler-generated interface was generated for a different platform or by an incompatible compiler or compiler release. It cannot be read. Use -gen-interfaces option.
- 8111: The same name cannot be specified more than once in an ALLOCATE statement.
- 8112: The same name cannot be specified more than once in a DEALLOCATE statement.
- 8113: Fxx standard only allows CHARACTER(LEN=1) arrays with BIND(C).
- 8114: This intrinsic procedure reference must not have more than one argument present.
- 8115: The argument BOUNDARY to the EOSHIFT intrinsic function shall not be omitted when the argument ARRAY is of a derived type.
- 8116: DLLIMPORT and DLLEXPORT symbols may not be specified as COPYPRIVATE, FIRSTPRIVATE, LASTPRIVATE, PRIVATE, or THREADPRIVATE.
- 8117: DLLIMPORT and DLLEXPORT symbols may not be specified in a COPYIN or REDUCTION list.
- 8118: DLLIMPORT and DLLEXPORT symbols may not default to PRIVATE or FIRSTPRIVATE in a parallel region.
- 8119: The character length of a dummy argument with the VALUE attribute must be 1. Only the first character is passed.
- 8120: The character length of a dummy argument with the VALUE attribute may not be zero.
- 8121: A data-stmt-object shall not be a subobject of a pointer.
- 8122: An unterminated block exists before a CASE statement
- 8123: %VAL or %REF is invalid in this context.
- 8124: In a format list, the required scale factor for the P edit descriptor is missing. This is an extension to Standard Fxx.
- 8125: This type conflicts with a previous implicit typing of a namelist group object with the same name, it is prohibited by Fortran standard
- 8126: An equivalence-object shall not be a variable with the BIND attribute or a variable in a common block that has the BIND attribute.
- 8127: A null argument is not permitted when calling a Fortran routine which has an explicit interface defined.
- 8128: The BIND attribute of the associated actual procedure differs from the BIND attribute of the dummy procedure.
- 8129: A common-block-object which is neither a sequence derived type nor a derived type with the BIND attribute is an extension of Standard Fxx.
- 8130: Nested enumeration definitions are not permitted.
- 8131: An END ENEM statement occurred without a corresponding ENUM statement.
- 8132: This syntax is invalid; the BIND(C) attribute is required on an enumeration statement.
- 8133: This statement is not permitted within an enumeration.
- 8134: An enumeration must have at least one ENUMERATOR statement.
- 8135: The value of the enumerator must be a scalar integer initialization expression.
- 8136: This ENUMERATOR constant name is invalid in this context.
- 8137: The ENUMERATOR constant name cannot have the target/pointer/adjustable attribute.
- 8138: The syntax is incorrect, the keyword BIND is expected in this context.
- 8139: An END ENUM statement is missing in an enumeration definition.
- 8140: The argument for UNROLL or UNROLL_AND_JAM must be an integer constant expression in the range 0 through 255.
- 8141: A variable is required in the list associated with the VECTOR NONTEMPORAL directive.
- 8142: The specification-part of a PURE procedure shall specify that all its dummy procedures are PURE.
- 8143: The BIND(C) attribute for this symbol conflicts with a DEC$ ATTRIBUTES ALIAS, DECORATE, STDCALL, C, [NO_]MIXED_STR_LEN_ARG or REFERENCE attribute for this symbol.
- 8144: ASSOCIATE construct is not available in Fortran xx
- 8145: The ASSOCIATE constructs are nested too deeply.
- 8146: An END ASSOCIATE occurred without a corresponding ASSOCIATE statement.
- 8147: DO construct with a construct name must be terminated by an ENDDO statement with the same name.
- 8148: STAT= may not appear more than once in an ALLOCATE or a DEALLOCATE statement.
- 8149: Source expression in SOURCE= or MOLD= specifiers may not appear more than once in an ALLOCATE statement.
- 8150: An object with the PROTECTED attribute may not be the ERRMSG= variable in an ALLOCATE or DEALLOCATE statement.
- 8151: Fortran xx does not allow ERRMSG= keyword in an ALLOCATE or a DEALLOCATE statement.
- 8152: Neither the ERRMSG= variable nor any part of the source expression in SOURCE= or MOLD= specifiers may be allocated in the ALLOCATE statement in which it appears.
- 8153: If SOURCE= appears, the ALLOCATE statement may contain only one object to allocate.
- 8154: In an ALLOCATE statement the SOURCE= expression must be a scalar or have the same rank as the object being allocated.
- 8155: In an ALLOCATE statement the source expression in SOURCE= or MOLD= specifiers must be of the same type and kind type parameters as the object being allocated.
- 8156: The ERRMSG= variable must not be deallocated in the DEALLOCATE statement in which it appears.
- 8157: If source expression in SOURCE= or MOLD= specifiers in an ALLOCATE statement, a TYPE specification must not appear for the object being allocated.
- 8158: Fortran xx does not allow SOURCE= specifier in an ALLOCATE statement.
- 8159: Only STAT=, ERRMSG=, SOURCE= and MOLD= are allowed as specifiers in ALLOCATE statement.
- 8160: ERRMSG= may not appear more than once in an ALLOCATE or a DEALLOCATE statement.
- 8161: The SCALAR argument of the ALLOCATED inquiry intrinsic function shall be an allocatable scalar.
- 8162: The fxx standard requires that the argument of the ALLOCATED inquiry intrinsic function shall be an allocatable array.
- 8163: Only STAT= and ERRMSG= are allowed as options in DEALLOCATE statement.
- 8164: A generic interface name shall not be used as an actual argument.
- 8165: Fortran xx standard does not allow a CHARACTER type of argument in this intrinsic procedure.
- 8166: Multiple OMP COLLAPSE clauses in a parallel region are not allowed
- 8167: COLLAPSE operand must be an integer expression
- 8168: Parentheses are required after the PROCEDURE keyword.
- 8169: The specified interface is not declared.
- 8170: The passed-object dummy argument is missing from the procedure interface.
- 8171: This is not a valid attribute for the procedure declaration statement.
- 8172: This is not a valid attribute for the procedure component definition statement.
- 8173: The PASS and NOPASS attributes must not be both specified.
- 8174: The POINTER attribute must be specified for a procedure component definition.
- 8175: The NOPASS attribute must be specified for a procedure component with an implicit interface.
- 8176: The default passed-object dummy argument is missing from the procedure interface (may need the NOPASS attribute).
- 8177: The POINTER attribute must be specified if the procedure has the INTENT or SAVE attribute.
- 8178: The procedure pointer and the procedure target must have matching arguments.
- 8179: The procedure pointer and the procedure target must both be functions or subroutines.
- 8180: The procedure pointer and the procedure target must have matching result types.
- 8181: An ALLOCATE object must not be a procedure pointer.
- 8182: The name is neither an abstract interface nor a procedure with an explicit interface.
- 8183: This intrinsic procedure is not allowed as an interface name in the procedure statement.
- 8184: This intrinsic procedure is not allowed as a procedure target.
- 8185: A procedure pointer must not be specified with the BIND attribute with a NAME= specifier.
- 8186: A dummy procedure must not be specified with the BIND attribute with a NAME= specifier.
- 8187: Only one procedure is allowed in a procedure declaration statement if the BIND attribute with a NAME= is specified.
- 8188: An interface name should be specified in a procedure declaration statement if the BIND attribute is specified.
- 8189: The interface name should also be declared with the BIND attribute.
- 8190: Argument checking is not yet supported for procedures declared with an intrinsic procedure as interface.
- 8191: The procedure target must be a procedure or a procedure pointer.
- 8192: A procedure declaration statement is not standard Fortran xx.
- 8193: A procedure component is not standard Fortran xx.
- 8194: The COLLAPSE clause requires perfectly nested loops: no code may appear before or after the loops being collapsed.
- 8195: The argument to the MOVE_ALLOC intrinsic subroutine shall be an allocatable object.
- 8196: An ALLOCATE shape must not be given for a scalar object.
- 8197: A shape specification or a SOURCE expression must be given for an array.
- 8198: If the ALLOCATE object is an array and there is no allocate shape specification, source expression in SOURCE= or MOLD= specifiers must appear with the same rank as the ALLOCATE object.
- 8199: The fxx standard requires a shape specification when the ALLOCATE object is an array.
- 8200: SOURCE= expression does not conform with an ALLOCATE shape.
- 8201: Associate name cannot be a pointer
- 8202: A type with the EXTENDS attribute cannot also include the BIND attribute or SEQUENCE property.
- 8203: The parent of an extended type must be a previously defined type.
- 8204: The parent of an extended type cannot have the BIND attribute or SEQUENCE property.
- 8205: A component declared in an extended type cannot have the same name as any accessible component of its parent type.
- 8206: A BIND or EXTENDS attribute may be specified only once per type declaration.
- 8207: A derived type with the EXTENDS attribute is not standard Fortran xx.
- 8208: If type specification is omitted, each ac-value expression in the array constructor of type CHARACTER must have the same length type parameters.
- 8209: If type specification is omitted, each element in an array-constructor must have the same type and kind type parameters.
- 8210: Fortran xx does not allow type specification in an array constructor.
- 8211: This component-spec has already been specified.
- 8212: Omitted field is not initialized. Field initialization missing:
- 8213: A keyword in the structure constructor is not the name of a type component.
- 8214: Fxx standard requires all arguments be of default integer type
- 8215: FROM and TO arguments of IMVBITS must be of type INTEGER(2)
- 8216: FROM and TO arguments of HMVBITS must be of type INTEGER(2)
- 8217: FROM and TO arguments of BMVBITS must be of type INTEGER(1)
- 8218: Associate name cannot appear in an ASSIGN statement.
- 8219: Fortran xx does not allow a subroutine dummy argument to be used in generic selection
- 8220: An integer constant outside the default integer range is not standard Fortran xx - using INTEGER(4).
- 8221: An integer constant outside the default integer range is not standard Fortran xx - using INTEGER(8).
- 8222: Missing comma, dash, or right paren.
- 8223: An entity declared with the CLASS keyword shall be a dummy argument or have the ALLOCATABLE or POINTER attribute.
- 8224: A derived type used with the CLASS keyword shall not have the BIND attribute or SEQUENCE property.
- 8225: The CLASS keyword is not standard Fortran xx.
- 8226: The variable typing occurred after the DATA statement and changed its implicit typing.
- 8227: The type of the target is not a dynamic type of the pointer.
- 8228: An array dimension specification preceded by a character length is not standard Fortran xx.
- 8229: Fortran xx does not allow type specification in an allocate statement.
- 8230: In an ALLOCATE statement the type parameter values in type specification must be the same as a corresponding nondeferred values of the objects being allocated.
- 8231: In an ALLOCATE statement the type parameter values in type specification shall be an asterisk if and only if each object being allocated is a dummy argument for which the type parameter is assumed.
- 8232: If any object being allocated in the ALLOCATE statement has deferred type parameter, either type specification or SOURCE= or MOLD= specifiers shall appear.
- 8233: If any object being allocated in the ALLOCATE statement is unlimited polymorphic, either type specification or SOURCE= or MOLD= specifiers shall appear.
- 8234: If type specification appears, it shall specify a type with which each object being allocated is type compatible.
- 8235: If type specification appears, the type and kind type parameters of each object being allocated must be the same as type and kind type parameters of the type specification.
- 8236: Deferred character length in a data object or component declaration is an extension of Standard Fxx.
- 8237: The character length in a component declaration shall either be a colon, be an initialization expression, or be a specification expression.
- 8238: A colon may be used as a type parameter value only in the declaration of an entity or component that has the POINTER or ALLOCATABLE attribute.
- 8239: Type of this field is PRIVATE, Standard Fxx does not allow such fields in public types.
- 8240: The kind type parameter of this argument is too small.
- 8241: A function or subroutine name within an ABSTRACT INTERFACE block can not be the same as the name of an intrinsic type
- 8242: SELECT TYPE construct is not available in Fortran xx
- 8243: A type guard exists without a preceding SELECT TYPE statement.
- 8244: An unterminated block exists before a TYPE IS/CLASS IS statement
- 8245: SELECT TYPE statement must be immediately followed by CLASS IS, TYPE IS, CLASS DEFAULT or END SELECT statement.
- 8246: Only one type guard expression of the SELECT TYPE statements may be DEFAULT.
- 8247: Selector in SELECT TYPE statements must be polymorphic value.
- 8248: Duplicate type guard in SELECT TYPE
- 8249: Type in TYPE IS or CLASS IS statement is unrelated to the type of selector in SELECT TYPE statement
- 8250: The argument to the SAME_TYPE_AS intrinsic function must be an object of extensible type.
- 8251: An input item must not appear as the implied-DO variable of any implied-DO loop that contains the input item.
- 8252: A DATA implied-DO variable must be an array element or scalar structure component that has at least one subscript list.
- 8253: If selector expression in SELECT TYPE is not a named variable, associate-name=> shall appear.
- 8254: A type bound procedure is an extension of Standard Fxx.
- 8255: The DEFERRED and NON_OVERRIDABLE attributes must not be both specified.
- 8256: If an interface name appears in the type bound procedure definition statement, a DEFERRED attribute must appear.
- 8257: This is not a valid attribute for the type bound procedure definition statement.
- 8258: The interface name in the type bound procedure definition statement must be the name of an abstract interface or of a procedure that has an explicit interface.
- 8259: The type bound procedure definition statement must contains only one binding name.
- 8260: If '=> procedure' name appears in the type bound procedure definition statement, an interface name must not appear.
- 8261: If DEFERRED attribute appears in the type bound procedure definition statement, an interface name must appear.
- 8262: The passed-object dummy argument must be dummy data object with the same declared type as the type being defined.
- 8263: The passed-object dummy argument must be a scalar, nonpointer, nonallocatable dummy data object.
- 8264: The passed-object dummy argument must be a polymorphic dummy data object if the type being defined is extensible.
- 8265: The CONTAINS statement in derived type definition is an extension of Standard Fxx.
- 8266: Standard Fxx does not allow an internal procedure to be a procedure target.
- 8267: A type with the ABSTRACT attribute cannot also include the BIND attribute or SEQUENCE property.
- 8268: A derived type with the ABSTRACT attribute is not standard Fortran xx.
- 8269: An ABSTRACT attribute may be specified only once per type declaration.
- 8270: A deferred binding may appear only in the definition of an abstract type.
- 8271: Standard Fxx does not allow an assumed length CHARACTER result for a PURE CHARACTER function.
- 8272: A SEQUENCE derived type cannot have any type-bound procedures.
- 8273: An inherited binding with the NON_OVERRIDABLE attribute must not be overridden.
- 8274: If either an overriding binding or an overridden binding has a passed-object dummy argument, then the other must also.
- 8275: An overriding binding must only have the DEFERRED attribute if the binding it overrides is deferred.
- 8276: If either an overriding binding or an overridden binding is PURE then the other must be also.
- 8277: If either an overriding binding or an overridden binding is ELEMENTAL then the other must be also.
- 8278: An overriding binding and its corresponding overridden binding must have the same number of dummy arguments.
- 8279: The passed-object dummy arguments of an overriding and overridden binding must correspond by name and position.
- 8280: An overriding binding and its corresponding overridden binding must both be either subroutines or functions with the same result type, kind, and shape.
- 8281: If the overridden binding is PUBLIC than the overriding binding cannot be PRIVATE.
- 8282: If any object being allocated in the ALLOCATE statement is of abstract type, either type specification or SOURCE= or MOLD= specifiers shall appear.
- 8283: If the dummy argument is an assumed-shape array, the value of the character length parameter of the actual argument must be agree with that of the dummy argument.
- 8284: If the actual argument is scalar, the dummy argument shall be scalar unless the actual argument is of type character or is an element of an array that is not assumed shape, pointer, or polymorphic.
- 8285: Fortran xx does not allow a NAMELIST group object to be an allocatable object, a pointer, or a variable of a type that has an ultimate component that is a pointer or an allocatable array.
- 8286: Fortran xx does not allow NAMELIST group object to be a function result.
- 8287: The parent type of this type bound procedure is use associated with the PRIVATE type bound procedure part
- 8288: A private type bound procedure is accessible only within the module containing the type definition
- 8289: A private component name is accessible only within the module containing the type definition
- 8290: Recommended relationship between field width 'W' and the number of fractional digits 'D' in this edit descriptor is 'W>=D+3'.
- 8291: Recommended relationship between field width 'W' and the number of fractional digits 'D' in this edit descriptor is 'W>=D+7'.
- 8292: Recommended relationship between field width 'W' and the number of fractional digits 'D' in this edit descriptor is 'W>=D+9'.
- 8293: Recommended relationship between field width 'W', the number of fractional digits 'D' and the number of exponential digits 'E' in this edit descriptor is 'W>=D+E+5'.
- 8294: This field width 'W' must be immediately followed by a dot (.)
- 8295: Source expression in SOURCE= or MOLD= specifiers or length type parameter must not depend on the value of the STAT= variable or the ERRMSG= variable
- 8296: A bound in the shape specification in an ALLOCATE must not depend on the value of the STAT= variable or the ERRMSG= variable
- 8297: The type specification in TYPE IS or CLASS IS statement must specify that each length type parameter is assumed
- 8298: The type specification in TYPE IS or CLASS IS statement must not specify a sequence derived type or a type with the BIND attribute
- 8299: Bad alignment for object. Please recompile the module.
- 8300: If a dummy argument is allocatable or a pointer, the associated actual argument shall be polymorphic if and only if the dummy argument is polymorphic.
- 8301: A component declared with the CLASS keyword shall have the ALLOCATABLE or POINTER attribute.
- 8302: A derived type definition without any component definition statement is an extension of Standard Fxx.
- 8303: The type bound procedure part in derived type definition must have at least one procedure binding statement.
- 8304: In an intrinsic assignment statement, variable shall not be polymorphic.
- 8305: The NAME= specifier in the language-binding-spec must be a character initialization expression with nonzero length.
- 8306: Associate name defined in ASSOCIATE or SELECT TYPE statements doesn't have ALLOCATABLE or POINTER attribute
- 8307: If a dummy argument is allocatable or a pointer, the associated actual argument shall have deferred length parameter if and only if the dummy argument has deferred length parameter.
- 8308: For the SPREAD intrinsic function, the rank of the SOURCE argument must be less than 7.
- 8309: A list item shall not be polymorphic unless it is processed by a user-defined derived-type input/output procedure.
- 8310: The sequence of extensions of this derived type is too long.
- 8311: If data reference is an array, the referenced type bound procedure must have the PASS and ELEMENTAL attributes
- 8312: The derived type specifier shall not specify an abstract type.
- 8313: The TYPE(derived-type-spec) shall not specify an abstract type.
- 8314: If the rightmost part-name is of abstract type, data-ref shall be polymorphic
- 8315: Declaration of the routine conflicts with a previous declaration.
- 8316: A NAMELIST group object must not be a CLASS object.
- 8317: A CONTAINS statement without any internal or module subprogram is an extension of Standard Fxx.
- 8318: A recursive allocatable component is an extension of Standard Fxx.
- 8319: A namelist-group-object must not be an assumed-size array.
- 8320: An array with nonconstant bounds is an extension of Standard Fxx.
- 8321: The rank of an array more then 15 is an extension of Standard Fxx.
- 8322: A deferred binding is inherited by non-abstract type; It must be overridden
- 8323: Duplicate option in CDEC$ directive.
- 8324: Conflicting options in CDEC$ directive.
- 8325: Subobjects are not allowed in PRIVATE/FIRSTPRIVATE/LASTPRIVATE clause; a named variable must be specified.
- 8326: Variables that appear in namelist statements may not appear in a PRIVATE/FIRSTPRIVATE/LASTPRIVATE clause.
- 8327: Duplicate variable in list.
- 8328: A variable in the PRIVATE clause must not be specified in the FIRSTPRIVATE/LASTPRIVATE clause.
- 8329: Fortran pointers, Cray pointers, and assumed-size arrays may not appear in a LASTPRIVATE clause.
- 8330: Polymorphic variables may not appear in a PRIVATE/FIRSTPRIVATE/LASTPRIVATE clause.
- 8331: Size may be specified only for array variables.
- 8332: Size of variable must be an integer expression.
- 8333: Privatized part of variable exceeds variable size.
- 8334: The argument I to the MASKR/MASKL intrinsic function must be non-negative.
- 8335: The argument I to the MASKR/MASKL intrinsic function is out-of-range.
- 8336: The arguments I and J must not both be boz-literal-constant.
- 8337: This boz-literal-constant is too large in this context and will be truncated on the left.
- 8338: A final subroutine name must be the name of a module procedure with exactly one dummy argument.
- 8339: The dummy argument of a final subroutine must be a variable of the derived type being defined and cannot be optional, pointer, allocatable, or polymorphic.
- 8340: The dummy argument of final subroutine must not have the INTENT (OUT) or VALUE attribute.
- 8341: Final subroutines are not inherited through type extension and cannot be overridden.
- 8342: A final subroutine name must not be the same as any other name previously specified as a final subroutine for the given type.
- 8343: A final subroutine shall not have a dummy argument with the same kind type parameters and rank as the dummy argument of another final subroutine of that type.
- 8344: A FINAL subroutine statement is an extension of Standard Fxx.
- 8345: A FINAL subroutine statement is permitted only within the type bound procedure part of a derived type.
- 8346: A function reference cannot be used as the leftmost part-ref of structure component.
- 8347: Coarray is not supported on this platform
- 8348: A coarray is not interoperable.
- 8349: A Cray pointer cannot be a coarray.
- 8350: A Cray pointee cannot be a coarray.
- 8351: An entity with the POINTER attribute shall not be a coarray.
- 8352: A coarray with the ALLOCATABLE attribute shall have a coarray-spec that is a deferred-coshape-spec list.
- 8353: An entity with the VALUE attribute shall be a dummy data object that is a coarray, and does not have a coarray ultimate component.
- 8354: The codimension specifications are incompatible.
- 8355: An entity with the AUTOMATIC attribute shall not be a coarray.
- 8356: A coarray component shall be a deferred-coshape-spec-list and have the ALLOCATABLE attribute.
- 8357: A coarray that does not have the ALLOCATABLE attribute shall have a coarray-spec that is an explicit coshape-spec.
- 8358: A coarray shall not be of type C PTR or C FUNPTR.
- 8359: An equivalence-object shall not be a coarray.
- 8360: A common-block-object shall not be a coarray.
- 8361: A coarray or an object with a coarray ultimate component shall be a dummy argument or have the ALLOCATABLE or SAVE attribute.
- 8362: Invalid coarray reference.
- 8363: An entity is not a coarray.
- 8364: There are missing arguments in an array reference.
- 8365: Image selector can't be subscript-triplet.
- 8366: The number of cosubscripts is incorrect.
- 8367: If CONTIGUOUS attribute is specified, the component must be an array with POINTER attribute
- 8368: An entity with CONTIGUOUS attribute must be an array
- 8369: An entity with the CONTIGUOUS attribute shall be an array pointer or an assumed-shape array.
- 8370: This symbol has multiple CONTIGUOUS statement/attribute declarations which is not allowed.
- 8371: If pointer is declared CONTIGUOUS, target must be contiguous as well.
- 8372: If dummy argument is declared CONTIGUOUS, actual argument must be contiguous as well.
- 8373: Array section is not contiguous if it has a vector subscript.
- 8374: Array section is not contiguous with such set of indices.
- 8375: Array section is not contiguous if it has stride other than unity.
- 8376: Substring of character array section is contiguous only if the substring range specifies all characters of the array item.
- 8377: An array is not contiguous if any part other than final has non-zero rank.
- 8378: Pointer array is not contiguous unless it is declared CONTIGUOUS.
- 8379: The argument SHIFT to the DSHIFTR/DSHIFTL intrinsic function is out-of-range.
- 8380: Attribute CONTIGUOUS is an extension of Standard Fxx.
- 8381: The type bound procedure cannot be passed as an actual argument.
- 8382: The dummy arguments of an overriding and overridden binding that correspond by position must have the same names.
- 8383: The dummy arguments of an overriding and overridden binding that correspond by position must have the same characteristics, except for the type of the passed object dummy arguments.
- 8384: COARRAY argument of IMAGE_INDEX intrinsic function shall be a coarray.
- 8385: SUB argument of IMAGE_INDEX intrinsic function shall be a rank-one integer array of size equal to the corank of COARRAY.
- 8386: COARRAY argument of THIS_IMAGE intrinsic function shall be a coarray.
- 8387: COARRAY argument of LCOBOUND/UCOBOUND intrinsic function shall be a coarray.
- 8388: Fortran xx does not allow MOLD= specifier in an ALLOCATE statement.
- 8389: Fortran xx does not allow G0 or G0.d format specifier.
- 8390: Fortran xx does not allow unlimited format item.
- 8391: An entity with the INTENT(OUT) attribute must not be an allocatable coarray or have a subobject that is an allocatable coarray.
- 8392: If the actual argument is a polymorphic coindexed object, the dummy argument must not be polymorphic.
- 8393: If the actual argument is a coindexed object with an allocatable ultimate component, the nonallocatable nonpointer dummy argument must have the INTENT (IN) or the VALUE attribute.
- 8394: If the actual argument is a coindexed object, the allocatable or pointer dummy argument must have the INTENT (IN) attribute.
- 8395: An actual argument that is a coindexed object with the ASYNCHRONOUS or VOLATILE attribute must not correspond to a dummy argument that has either the ASYNCHRONOUS or VOLATILE attribute.
- 8396: If the dummy argument is a coarray, the corresponding actual argument must be a coarray and must have the VOLATILE attribute if and only if the dummy argument has the VOLATILE attribute.
- 8397: The corank of the actual argument must be the same as that of the dummy argument.
- 8398: A dum-arg of a procedure with the ELEMENTAL prefix-pec must not be a coarray.
- 8399: Vector length must be an integer value that is a power of two and is between 2 and 16
- 8400: Duplicate value in list.
- 8401: Expression must be of basic type.
- 8402: Expression must be l-value.
- 8403: Named variable is expected.
- 8404: Step value must be of numeric type.
- 8405: Step value must be either a literal numerical constant or a variable.
- 8406: The REDUCTION clause operator must be +, *, -, MAX, MIN, .AND., .OR., .EQV., or .NEQV..
- 8407: The data type of the variable is not defined for the operator or intrinsic specified on the REDUCTION clause.
- 8408: The variable is specified in another REDUCTION clause.
- 8409: Directive SIMD must not be followed by another SIMD directive.
- 8410: Directive SIMD must be followed by counted DO loop.
- 8411: DO loop preceded by directive SIMD must not contain inner loops.
- 8412: DO loop preceded by directive SIMD must not contain EXIT statements.
- 8413: Either file number specifier or NEWUNIT specifier must be specified in OPEN statement.
- 8414: If NEWUNIT appears in OPEN statement either FILE or STATUS (with value SCRATCH) specifiers must appear.
- 8415: Either UNIT= specifier or NEWUNIT= specifier is required for OPEN statement.
- 8416: Unlimited format item shall be specified ONLY once.
- 8417: The sum of the rank and corank of a coarray shall not exceed 31.
- 8418: The sum of the rank and corank of a coarray more then 15 is an extension of Standard Fxx.
- 8419: Within the specification part of a module all GENERIC bindings with the same generic-spec must specify, either implicitly or explicitly, the same accessibility in the same derived type.
- 8420: If generic-spec is OPERATOR or ASSIGNMENT, each of its specific bindings must have a passed object dummy argument.
- 8421: A GENERIC type bound procedure name is not permitted to be the same as a specific type bound procedure name in the same type.
- 8422: If the component immediately preceding the type-bound procedure is abstract, the entire data reference before the procedure name must be polymorphic.
- 8423: In GENERIC type bound procedure definition each binding name must be the name of a specific binding of the type.
- 8424: A GENERIC binding is an extension of Standard Fxx.
- 8425: The argument N to the Bessel intrinsic function must be non-negative.
- 8426: The argument N1 to the Bessel intrinsic function must be non-negative.
- 8427: The argument N2 to the Bessel intrinsic function must be non-negative.
- 8428: The value of the argument X to the Bessel intrinsic function must be greater than zero.
- 8429: The value of the argument X must not be zero.
- 8430: Using constant expression as a stop code is an extension of Standard Fxx.
- 8431: A RETURN statement shall not appear within a DO CONCURRENT construct.
- 8432: An EXIT statement shall not belong to a DO CONCURRENT construct.
- 8433: A CYCLE statement shall not appear within the range of a DO CONCURRENT construct if it belongs to an outer construct.
- 8434: An EXIT statement shall not appear within the range of a DO CONCURRENT construct if it belongs to an outer construct.
- 8435: A reference to a nonpure procedure shall not appear within a DO CONCURRENT construct.
- 8436: Reference to this procedure is prohibited in the body of DO CONCURRENT statement.
- 8437: The type/rank signature for the arguments of this specific subroutine matches another specific subroutine that shares the same ASSIGNMENT generic binding.
- 8438: The INTENT declaration is incorrect for this dummy argument of the specific procedure in an ASSIGNMENT generic binding.
- 8439: The fortran standard does not allow OPTIONAL arguments of a specific procedure in an ASSIGNMENT generic binding.
- 8440: The Fortran standard requires an explicit INTENT(OUT) or INTENT(INOUT) for the first dummy argument of a subroutine in an ASSIGNMENT generic binding.
- 8441: The Fortran standard does not allow OPTIONAL arguments of a specific procedure in an OPERATOR generic binding.
- 8442: The INTENT declaration is incorrect for this dummy argument of a specific procedure in an OPERATOR generic binding.
- 8443: This generic type bound procedure reference has two or more specific procedures with the same type/rank/keyword signature.
- 8444: The specific subroutines in an ASSIGNMENT generic binding must have exactly two dummy arguments.
- 8445: The OPERATOR generic binding may not be specified for functions with no arguments or for functions with more than two arguments.
- 8446: A specific procedure must be a subroutine for an ASSIGNMENT generic binding.
- 8447: A specific procedure must be a function for an OPERATOR generic binding.
- 8448: An explicit INTENT(IN) declaration is expected for this dummy argument of a specific procedure in an OPERATOR generic binding.
- 8449: The type/rank/keyword signature for this specific procedure matches another specific procedure that shares the same generic binding name.
- 8450: The type/rank signature for this specific function and its arguments matches another specific function that shares the same OPERATOR generic binding.
- 8451: For the Gw.dEe edit descriptor, e may not be specified if w is zero.
- 8452: REAL(KIND=16) and COMPLEX(KIND=32) are treated the same as REAL(KIND=8) and COMPLEX(KIND=16).
- 8453: Unlimited-format-item is *(format-item-list). Format-item in list must not be empty
- 8454: STAT= may not appear more than once in an image control statements.
- 8455: ERRMSG= may not appear more than once in an image control statements.
- 8456: Only STAT= and ERRMSG= are allowed as specifiers in a SYNC ALL, SYNC IMAGES, or SYNC MEMORY statements.
- 8457: A reference to an image control statement must not appear within a DO CONCURRENT construct.
- 8458: A pure subprogram must not contain an image control statements.
- 8459: An image-set must be scalar or of rank one.
- 8460: An END CRITICAL statement exists without an associated CRITICAL statement.
- 8461: An unterminated block exists before an END CRITICAL statement.
- 8462: A CYCLE statement in a critical-construct that transfers control outside the critical-construct is not permitted.
- 8463: An EXIT statement in a critical-construct that transfers control outside the critical-construct is not permitted.
- 8464: The block of a critical-construct shall not contain a RETURN statement.
- 8465: The block of a critical-construct shall not contain an image control statement.
- 8466: A statement that branches from the block of a critical-construct to outside the critical-construct is not permitted.
- 8467: An image-set value must be positive.
- 8468: The BIND statement may specify the BIND attribute only for variables and common blocks.
- 8469: This derived type component is not a procedure and cannot be called.
- 8470: Unsupported target.
- 8471: This expression must be a scalar of integer type.
- 8472: Duplicate modifier.
- 8473: The OMP OFFLOAD directive must be followed by one of the OpenMP* directives PARALLEL, PARALLEL SECTIONS, or PARALLEL DO.
- 8474: A data component whose type has a coarray ultimate component must be a nonpointer nonallocatable scalar.
- 8475: An entity whose type has a coarray ultimate component must be a nonpointer nonallocatable scalar.
- 8476: An entity whose type has a coarray ultimate component must not be a coarray.
- 8477: If a coarray-spec appears, the component must not be of type C_PTR or C_FUNPTR.
- 8478: A named variable of type LOCK_TYPE or a named variable with a noncoarray sub-component of type LOCK TYPE must be a coarray.
- 8479: A lock variable or a variable with a subobject of type LOCK TYPE shall not appear in this definition context.
- 8480: A lock-variable must be of type LOCK TYPE.
- 8481: A variable with BIND(C) attribute cannot have either the ALLOCATABLE or the POINTER attribute.
- 8482: A variable with BIND(C) attribute cannot be a deffered shape array.
- 8483: A variable with BIND(C) attribute cannot be a coarray.
- 8484: The argument to STORAGE_SIZE is invalid.
- 8485: There is no matching specific function for this type bound generic function reference.
- 8486: There is no matching specific subroutine for this type bound generic subroutine call.
- 8487: The definition of a function that returns a procedure pointer is not yet supported.
- 8488: This syntax is invalid; the procedure name is required in procedure binding statement after '=>'.
- 8489: A GENERIC binding is permitted only within the type bound procedure part of a derived type.
- 8490: Transfer of control to the interior of this block from outside the block is prohibited.
- 8491: A branch within a DO CONCURRENT construct shall not have a branch target that is outside the construct.
- 8492: This directive is ignored due to current command line options.
- 8493: Only STAT= and ERRMSG= are allowed as specifiers in the UNLOCK statement.
- 8494: Only STAT=, ERRMSG= and ACQUIRED_LOCK= are allowed as specifiers in the LOCK statement.
- 8495: ACQUIRED_LOCK= may not appear more than once in the LOCK statement.
- 8496: A use associated object that has the PROTECTED attribute shall not appear as a lock-variable in the LOCK statement.
- 8497: Illegal use of a procedure name in an expression, possibly a function call missing parenthesis.
- 8498: An EXTERNAL procedure name must not appear in an input/output item list.
- 8499: The procedure has a dummy argument that is polymorphic. Required explicit interface is missing from original source.