summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/deferred_type_param_9.f90
diff options
context:
space:
mode:
Diffstat (limited to 'gcc/testsuite/gfortran.dg/deferred_type_param_9.f90')
-rw-r--r--gcc/testsuite/gfortran.dg/deferred_type_param_9.f904
1 files changed, 2 insertions, 2 deletions
diff --git a/gcc/testsuite/gfortran.dg/deferred_type_param_9.f90 b/gcc/testsuite/gfortran.dg/deferred_type_param_9.f90
index a6e685753f4..0f3d409f121 100644
--- a/gcc/testsuite/gfortran.dg/deferred_type_param_9.f90
+++ b/gcc/testsuite/gfortran.dg/deferred_type_param_9.f90
@@ -12,11 +12,11 @@ contains
SUBROUTINE get (c_val)
CHARACTER( : ), INTENT( INOUT ), ALLOCATABLE, OPTIONAL :: c_val
CHARACTER( 10 ) :: c_val_tmp
- if(present(c_val)) call abort()
+ if(present(c_val)) STOP 1
END SUBROUTINE get
SUBROUTINE get2 (c_val)
CHARACTER( : ), INTENT( OUT ), ALLOCATABLE, OPTIONAL :: c_val
CHARACTER( 10 ) :: c_val_tmp
- if(present(c_val)) call abort()
+ if(present(c_val)) STOP 2
END SUBROUTINE get2
END PROGRAM main