2 ! { dg-options "-std=f95" }
4 ! Access specifications: Invalid Fortran 95 code
9 public
:: x
! { dg-error "was already specified" }
10 private
:: x
! { dg-error "was already specified" }
18 integer, public
:: y
! { dg-error "Fortran 2003: Attribute PUBLIC" }
19 integer, public
:: z
! { dg-error "Fortran 2003: Attribute PUBLIC" }
20 end type ! { dg-error "Derived type definition at" }
24 private
:: x
! { dg-error "only allowed in the specification part of a module" }
25 type, private
:: t
! { dg-error "only be PRIVATE in the specification part of a module" }
27 end type t
! { dg-error "Expecting END SUBROUTINE statement" }
29 integer,public
:: z
! { dg-error "not allowed outside of the specification part of a module" }
30 end type ttt
! { dg-error "Derived type definition at" }
37 public
:: i
! { dg-error "only allowed in the specification part of a module" }
38 integer,public
:: j
! { dg-error "not allowed outside of the specification part of a module" }