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

Subversion Repositories openrisc

[/] [openrisc/] [tags/] [gnu-src/] [gcc-4.5.1/] [gcc-4.5.1-or32-1.0rc3/] [gcc/] [testsuite/] [gfortran.dg/] [used_before_typed_4.f90] - Rev 516

Compare with Previous | Blame | View Log

! { dg-do compile }
! { dg-options "-std=f95" }

! Test for a special case of the used-before-typed errors, when the symbols
! not-yet-typed are indices.

SUBROUTINE test (n, arr1, m, arr2) ! { dg-error "has no IMPLICIT type" }
  IMPLICIT NONE

  INTEGER :: myarr(42)

  INTEGER :: arr1(SIZE (myarr(1:n))) ! { dg-error "'n' is used before" }
  INTEGER :: n

  INTEGER :: arr2(LEN ("hello"(1:m))) ! { dg-error "'m' is used before" }
  INTEGER :: m

  WRITE (*,*) SIZE (arr1)
  WRITE (*,*) SIZE (arr2)
END SUBROUTINE test

PROGRAM main
  IMPLICIT NONE
  INTEGER :: arr1(42), arr2(42)
  CALL test (3, arr1, 2, arr2)
END PROGRAM main

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.