Welcome to mirror list, hosted at ThFree Co, Russian Federation.

github.com/llvm/llvm-project.git - Unnamed repository; edit this file 'description' to name the repository.
summaryrefslogtreecommitdiff
diff options
context:
space:
mode:
Diffstat (limited to 'flang/test/Semantics/selecttype03.f90')
-rw-r--r--flang/test/Semantics/selecttype03.f909
1 files changed, 7 insertions, 2 deletions
diff --git a/flang/test/Semantics/selecttype03.f90 b/flang/test/Semantics/selecttype03.f90
index bfb1bd4535e5..f7070f7bb0d6 100644
--- a/flang/test/Semantics/selecttype03.f90
+++ b/flang/test/Semantics/selecttype03.f90
@@ -110,11 +110,16 @@ contains
if (i>0) then
foo = array1(2,U)
else if (i<0) then
- !ERROR: No intrinsic or user-defined ASSIGNMENT(=) matches operand types CLASS(t1) and CLASS(t2)
- foo = array2(2,U)
+ foo = array2(2,U) ! ok: t2 extends t1
end if
end function
+ function foo2()
+ class(t2),DIMENSION(:),allocatable :: foo2
+ !ERROR: No intrinsic or user-defined ASSIGNMENT(=) matches operand types CLASS(t2) and CLASS(t1)
+ foo2 = array1(2,:)
+ end function
+
subroutine sub_with_in_and_inout_param(y, z)
type(t2), INTENT(IN) :: y
class(t2), INTENT(INOUT) :: z