Imported Upstream version 4.8.1
[platform/upstream/gcc48.git] / gcc / testsuite / gfortran.dg / abstract_type_6.f03
index de1cea3..5eefcb8 100644 (file)
@@ -10,7 +10,7 @@
 module m
 TYPE, ABSTRACT :: top
 CONTAINS
-   PROCEDURE(xxx), DEFERRED :: proc_a ! { dg-error "must be a module procedure" }
+   PROCEDURE(xxx), DEFERRED :: proc_a ! { dg-error "must be explicit" }
    ! some useful default behaviour
    PROCEDURE :: proc_c => top_c ! { dg-error "must be a module procedure" }
 END TYPE top
@@ -50,4 +50,3 @@ SUBROUTINE bottom_c(obj)
    ! other stuff
 END SUBROUTINE bottom_c 
 end module
-! { dg-final { cleanup-modules "m" } }