2 ! { dg-options "-Wsurprising" }
11 ! Failed for -Wsurprising with an ICE as SIZE was assumed to be constant
13 SUBROUTINE CGBRFSX(N
, RWORK
)
17 PARAMETER (ZERO
= 0.0E+0)
18 call foo(TRANSFER (RWORK(1:2*N
), (/ (ZERO
, ZERO
) /), N
))
22 ! Failed with a bogus size warning if the source's size is not known at compile
23 ! time (for substrings, the length wasn't set)
27 character(len
=4) :: record_type
30 i
= transfer (record_type
, i
) ! no warning
31 i
= transfer (record_type(1:4), i
) ! gave a warning
32 i
= transfer (record_type(1:j
), i
) ! gave a warning