2 ! { dg-options "-fdump-tree-original" }
5 ! Check that the string length of BOUNDARY is added to the library-eoshift
6 ! call even if BOUNDARY is missing (as it is optional).
7 ! This is the original test from the PR.
9 ! Contributed by Kazumoto Kojima.
11 CHARACTER(LEN
=3), DIMENSION(10) :: Z
14 subroutine test_eoshift
15 CHARACTER(LEN
=1), DIMENSION(10) :: chk
19 if (any (EOSHIFT(Z(:)(2:2),2) .ne
. chk
)) call abort
23 ! Check that _gfortran_eoshift* is called with 8 arguments:
24 ! { dg-final { scan-tree-dump "_gfortran_eoshift\[0-9_\]+char \\(\[&a-zA-Z0-9._\]*, \[&a-zA-Z0-9._\]*, \[&a-zA-Z0-9._\]*, \[&a-zA-Z0-9._\]*, \[&a-zA-Z0-9._\]*, \[&a-zA-Z0-9._\]*, \[&a-zA-Z0-9._\]*, \[&a-zA-Z0-9._\]*\\)" "original" } }