[flang][openacc] Use OpenACC terminator instead of fir.unreachable after Stop stmt...
[llvm-project.git] / flang / test / Lower / read-write-buffer.f90
blob889209242cb4ab4f38dbc6ee6f7bf5aa1b690fec
1 ! RUN: bbc -emit-fir %s -o - | FileCheck %s
3 ! Test that we are passing the correct length when using character array as
4 ! Format (Fortran 2018 12.6.2.2 point 3)
5 ! CHECK-LABEL: func @_QPtest_array_format
6 subroutine test_array_format
7 ! CHECK-DAG: %[[c2:.*]] = arith.constant 2 : index
8 ! CHECK-DAG: %[[c10:.*]] = arith.constant 10 : index
9 ! CHECK-DAG: %[[mem:.*]] = fir.alloca !fir.array<2x!fir.char<1,10>>
10 character(10) :: array(2)
11 array(1) ="(15HThis i"
12 array(2) ="s a test.)"
13 ! CHECK: %[[shape:.*]] = fir.shape %c2{{.*}} (index) -> !fir.shape<1>
14 ! CHECK: %[[fmtBox:.*]] = fir.embox %[[mem]](%[[shape]]) : (!fir.ref<!fir.array<2x!fir.char<1,10>>>, !fir.shape<1>) -> !fir.box<!fir.array<2x!fir.char<1,10>>>
15 ! CHECK: %[[fmtArg:.*]] = fir.zero_bits !fir.ref<i8>
16 ! CHECK: %[[fmtLenArg:.*]] = fir.zero_bits i64
17 ! CHECK: %[[fmtDesc:.*]] = fir.convert %[[fmtBox]] : (!fir.box<!fir.array<2x!fir.char<1,10>>>) -> !fir.box<none>
18 ! CHECK: fir.call @_FortranAioBeginExternalFormattedOutput(%[[fmtArg]], %[[fmtLenArg]], %[[fmtDesc]], {{.*}})
19 write(*, array)
20 end subroutine
22 ! A test to check the buffer and it's length.
23 ! CHECK-LABEL: @_QPsome
24 subroutine some()
25 character(LEN=255):: buffer
26 character(LEN=255):: greeting
27 10 format (A255)
28 ! CHECK: fir.address_of(@_QQcl.636F6D70696C6572) :
29 write (buffer, 10) "compiler"
30 read (buffer, 10) greeting
31 end
32 ! CHECK-LABEL: fir.global linkonce @_QQcl.636F6D70696C6572
33 ! CHECK: %[[lit:.*]] = fir.string_lit "compiler"(8) : !fir.char<1,8>
34 ! CHECK: fir.has_value %[[lit]] : !fir.char<1,8>
35 ! CHECK: }