LF90 v4.0 Spezifikationen / Befehlsumfang




     

    LF90 Spezikationen

    Compilerschalter

    -[n]ap             Guarantee consistency of REAL and COMPLEX
                         calculations
    -[n]bind           Bind DOS-Extender to application
    -block <value>     Set default blocksize for OPEN statements
    -[n]c              Compile only
    -[n]chk            Check substrings and array subscripts
    -[n]co             Display compiler options
    -[n]dal            Automatically deallocate allocatable arrays
    -[n]dbl            Extend all REAL and COMPLEX variables, arrays,
                         constants, and functions to KIND 8
    -[n]dll            Generate a dynamic link library
    -[n]f90[f]         Generate warning or fatal messages for
                         non-standard Fortran 90 code
    -[n]file           Ensure driver interprets filename as name of
                         file and not a switch argument
    -[n]fix            Interpret source files as Fortran 90 fixed or
                         free source form
    -[n]g              Information for debugger
    -[n]hed            Include headers on direct files
    -i <path>          Specify search path for Fortran INCLUDE
                         files
    -[n]in             Equivalent to including an IMPLICIT NONE
                         statement in each program unit
    -[n]inln           Generate in-line code for numeric intrinsics
                         for increased execution speed
    -[n]lisk           Compile code that contains Lahey/INTERACTER
                         Starter Kit calls
    -[n]lst <args>     Create source listings
    -[n]maxfatals      Specify maximum number of fatal errors allowed
                         before stopping compilation
    -[n]ml <arg>       Generate code compatible with other languages
    -mod <path>        Specify search path for module files
    -o0                Optimization Level 0: perform no optimizations
                         beyond instruction scheduling and register
                         management
    -o1                Optimization Level 1: perform machine-                    independent optimizations like loop
                         unrolling, constant folding, and
                         induction variable simplification
    -o3                Optimization Level 3: perform interprocedural
                         optimizations and create opportunities for
                         further optimizations
    -o name            Override default object file name
    -out <name>        Specify output file name
    -[n]pca            Protect constant arguments by preventing
                         invoked subprograms from storing into
                         arithmetic constants
    -[n]sav            Allocate local variables in compiler-
                         generated SAVE area
    -[n]stchk          Check for stack overflows
    -[n]swm <args>     Suppress warning messages
    -[n]syn            Check program syntax and semantics only
    -t3                Target Processor is 386
    -t4                Target Processor is 486
    -tp                Target Processor is Pentium
    -tpp               Target Processor is Pentium Pro
    -[n]trap <args>    Trap numeric data processor (NDP)
                         exceptions at execution
    -[n]trace          Location and call traceback for runtime
                         errors
    -[n]vax            Compile code that contains DEC/VAX and
                         IBM/VS extensions
    -[n]vm             Bind virtual memory manager to application
    -[n]w              Generate warning messages
    -[n]win            Create Windows application
    -[n]win32s         Create Windows application compatible with
                         Win32s
    -[n]wisk           Compile code that contains Winteracter
                         Starter Kit calls

    -[n]winconsole     Create Windows Console application
    -[n]wo             Generate warning messages for obsolescent
                         Fortran 90 code
    -[n]wrap           Format error messages
    -[n]xref <args>    Create cross-reference listings



     




     

    Profiling Commands

    C  Count invocations of specified program units, blocks, or lines

         within specified range

    Y Record program execution time for specified program units,

         blocks, or lines within specified range

    U Display all statistics, statistics for executed lines, or

         statistics for unexecuted lines

    E Exclude program units from the debugger/profiler command processor

    Utility Procedures

    BREAK Handle break interrrupts during execution of program

    CARG Pass item to procedure as C data type by value

    DVCHK Mask divide-by-zero interrupt on floating-point unit

    FLUSH Empty buffer for input/output unit by writing to file

    GETCL Get command line

    INTRUP Execute DOS or BIOS function

    INVALOP Mask invalid operator interrupt of floating-point unit

    IOSTAT_MSG runtime I/O error message

    NBREAK Ignore break interrupts

    NDPERR Report floating-point exceptions

    NDPEXC Mask all floating point exceptions

    OVEFEL Mask overflow interrupt on floating-point unit

    PRECFILL Set fill character numeric fields that are wider than

         supplied numeric precision

    PROMPT Set prompt for subsequent READ statements

    SYSTEM Execute DOS command as if from the DOS command line

    UNDFL Mask the underflow interrupt on the floating-point unit

    VAL Pass item to procedure by value

    Fortran 90 Intrinsics

    ABS CABS DABS IABS

    ACHAR

    ACOS DACOS

    ADJUSTL

    ADJUSTR

    AIMAG

    AINT DINT

    ALL

    ALLOCATED

    ANINT  DNINT

    ANY

    ASIN DASIN

    ASSOCIATED

    ATAN DATAN 

    ATAN2  DATAN2

    BIT_SIZE

    BTEST

    CEILING

    CHAR

    CMPLX

    CONJG

    COS  CCOS  DCOS

    COSH DCOSH

    COUNT

    CSHIFT

    DATE_AND_TIME

    DBLE

    DIGITS

    DIM  DDIM  IDIM

    DOT_PRODUCT

    DPROD

    EOSHIFT

    EPSILON

    EXP  CEXP  DEXP

    EXPONENT

    FLOOR

    FRACTION

    HUGE

    IACHAR

    IAND

    IBCLR

    IBITS

    IBSET

    ICHAR

    IEOR

    INDEX

    INT  IFIX  IDINT

    IOR

    ISHFT

    ISHFTC

    KIND

    LBOUND

    LEN

    LEN_TRIM

    LGE

    LGT

    LLE

    LLT

    LOG  ALOG  CLOG  DLOG

    LOG10  ALOG10  DLOG10

    LOGICAL

    MATMUL

    MAX MAX0,1 AMAX0,1 DMAX1MAXEXPONENT

    MAXLOC

    MAXVAL

    MERGE

    MIN MIN0,1 AMIN0,1 DMIN1

    MINEXPONENT

    MINLOC

    MINVAL

    MOD  AMOD  DMOD

    MODULO

    MVBITS

    NEAREST

    NINT IDNINT

    NOT

    PACK

    PRECISION

    PRESENT

    PRODUCT

    RADIX

    RANDOM_NUMBER

    RANDOM_SEED

    RANGE

    REAL FLOAT  SNGL

    REPEAT

    RESHAPE

    RRSPACING

    SCALE

    SCAN

    SELECTED_INT_KIND

    SELECTED_REAL_KIND

    SET_EXPONENT

    SHAPE

    SIGN DSIGN  ISIGN

    SIN  CSIN  DSIN

    SINH DSINH

    SIZE

    SPACING

    SPREAD

    SQRT CSQRT  DSQRT

    SUM

    SYSTEM_CLOCK

    TAN  DTAN

    TANH DTANH

    TINY

    TRANSFER

    TRANSPOSE

    TRIM

    UBOUND

    UNPACK

    VERIFY

    VAX and IBM Intrinsics

    ACOSD  DACOSD

    AJMAX0 AIMAX0

    AJMIN0 AIMIN0

    ALGAMA DLGAMA

    ASIND  DASIND

    ATAN2D DATAN2D

    ATAND  DATAND

    BJTEST BITEST

    JIABS  CDABS IIABS

    CDCOS

    CDEXP

    CDLOG

    CDSIN

    CDSQRT

    COSD DCOSD

    COTAN  DCOTAN

    DCMPLX

    DCONJG

    DFLOAT DFLOTI DFLOTJ

    DIMAG

    DREAL

    ERF  DERF

    ERFC DERFC

    FLOATJ FLOATI

    GAMMA  DGAMMA

    JIAND  IIAND

    JIBCLR IIBCLR

    JIBITS IIBITS

    JIBSET IIBSET

    JIDIM  IIDIM

    JIEOR  IIEOR

    JIFIX  IIFIX HFIX

    JINT IINT IIDINT JIDINT

    JIOR IIOR

    JISHFT IISHFT

    JISHFTC  IISHFTC

    JISIGN IISIGN

    JMAX0  IMAX0

    JMAX1  IMAX1

    JMIN0  IMIN0

    JMIN1  IMIN1

    JMOD IMOD

    JNINT ININT IIDNNT JIDNNT

    JNOT INOT

    SIND CDSIN  DSIND

    TAND DTAND

    JZEXT  JZEXT2  JZEXT4 IZEXT  IZEXT2

    VAX and IBM Intrinsics

    ALLOCATABLE

    ALLOCATE

    BACKSPACE

    BLOCK DATA

    CALL

    CASE DEFAULT

    CASE

    CHARACTER

    CLOSE

    COMMON

    COMPLEX

    CONTAINS

    CONTINUE

    CYCLE

    DATA

    DEALLOCATE

    DIMENSION

    DO

    DOUBLE

    ELSE

    ELSE IF

    ELSEWHERE

    END

    END BLOCK DATA

    END DO

    END FUNCTION

    END IF

    END INTERFACE

    END MODULE

    END PROGRAM

    END SELECT

    END SUBROUTINE

    END TYPE

    END WHERE

    ENDFILE

    ENTRY

    EQUIVALENCE

    EXIT

    EXTERNAL

    FORMAT

    FUNCTION

    GO TO (COMPUTED)

    GO TO (UNCONDITIONAL)

    IF (LOGICAL)

    IF...THEN

    IMPLICIT

    INCLUDE

    INQUIRE

    INTEGER

    INTENT

    INTERFACE ASSIGNMENT

    INTERFACE OPERATOR

    INTERFACE

    INTRINSIC

    LOGICAL

    MODULE PROCEDURE

    MODULE

    NAMELIST

    NULLIFY

    OPEN

    OPTIONAL

    PARAMETER

    POINTER

    PRECISION

    PRINTPRIVATE

    PROGRAM

    PUBLIC

    READ

    REAL

    RETURN

    REWIND

    SAVE

    SELECT CASE

    SEQUENCE

    STOP

    SUBROUTINE

    TARGET

    TYPE

    USE

    WHERE

    WRITE





    Zurück zu Lahey Fortran 90


    Zurück zur Startseite