OpenCores
URL https://opencores.org/ocsvn/openrisc/openrisc/trunk

Subversion Repositories openrisc

[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.fortran-torture/] [compile/] [vrp_1.f90] - Rev 705

Go to most recent revision | Compare with Previous | Blame | View Log

      SUBROUTINE STONUM(STRVAR,LENGTH)
      CHARACTER STRVAR*(*) , CHK
      LOGICAL MEND , NMARK , MMARK , EMARK
      NMARK = .FALSE.
      MMARK = .FALSE.
      DO WHILE ( .NOT.MEND )
            IF ( CHK.GE.'0' .AND. CHK.LE.'9' ) THEN
               IF ( CHK.EQ.'E' ) THEN
                  NMARK = .TRUE.
               ELSEIF ( .NOT.MMARK .AND. CHK.EQ.'*' .AND. .NOT.NMARK )  &
     &                  THEN
                  MMARK = .TRUE.
               ENDIF
            ENDIF
      ENDDO
      END

Go to most recent revision | Compare with Previous | Blame | View Log

powered by: WebSVN 2.1.0

© copyright 1999-2024 OpenCores.org, equivalent to Oliscience, all rights reserved. OpenCores®, registered trademark.