* tree-loop-distribution.c (struct partition): New field recording
[official-gcc.git] / gcc / testsuite / gfortran.dg / pr71649.f90
blobf20b7687e6f330ad4d98cd59f3fe3cfc4dfe45b3
1 ! { dg-do compile }
2 ! PR71649 Internal Compiler Error
3 SUBROUTINE Compiler_Options ( Options, Version, WriteOpt )
4 USE ISO_FORTRAN_ENV, ONLY : Compiler_Version, Compiler_Options ! { dg-error "already declared" }
5 IMPLICIT NONE
6 CHARACTER (LEN=*), INTENT(OUT) :: Options
7 CHARACTER (LEN=*), INTENT(OUT) :: Version
8 LOGICAL, INTENT(IN), OPTIONAL :: WriteOpt
9 Version = Compiler_Version()
10 Options = Compiler_Options() ! { dg-error "Unexpected use of subroutine name" }
11 RETURN
12 END SUBROUTINE Compiler_Options