aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.9/gcc/testsuite/gfortran.dg/array_assignment_5.f90
blob: 6d585270ceac1a48a77748be801df76ffc81f0a9 (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
! { dg-do run }
! { dg-options "-ffrontend-optimize" }
! PR 62214 - this used to give the wrong result.
! Original test case by Oliver Fuhrer
PROGRAM test
  IMPLICIT NONE
  CHARACTER(LEN=20)   :: fullNames(2)
  CHARACTER(LEN=255)  :: pathName
  CHARACTER(LEN=5)    :: fileNames(2)
  
  pathName = "/dir1/dir2/"
  fileNames = (/ "file1", "file2" /)
  fullNames = SPREAD(TRIM(pathName),1,2) // fileNames
  if (fullNames(1) /= '/dir1/dir2/file1' .or. &
       & fullnames(2) /= '/dir1/dir2/file2') call abort
END PROGRAM test