repo.or.cz
/
official-gcc
/
graphite-test-results.git
/
blob
commit
grep
author
committer
pickaxe
?
search:
re
summary
|
log
|
graphiclog1
|
graphiclog2
|
commit
|
commitdiff
|
tree
|
refs
|
edit
|
fork
blame
|
history
|
raw
|
HEAD
Remove outermost loop parameter.
[official-gcc/graphite-test-results.git]
/
gcc
/
testsuite
/
gfortran.dg
/
finalize_1.f08
blob
e1501ef66b82e47dea284e7adfd103dada8cd638
1
! { dg-do compile }
2
3
! Parsing of finalizer procedure definitions.
4
! Check that CONTAINS is allowed in TYPE definition; but empty only for F2008
5
6
MODULE final_type
7
IMPLICIT NONE
8
9
TYPE :: mytype
10
INTEGER, ALLOCATABLE :: fooarr(:)
11
REAL :: foobar
12
CONTAINS
13
END TYPE mytype
14
15
CONTAINS
16
17
SUBROUTINE bar
18
TYPE :: t
19
CONTAINS ! This is ok
20
END TYPE t
21
! Nothing
22
END SUBROUTINE bar
23
24
END MODULE final_type
25
26
PROGRAM finalizer
27
IMPLICIT NONE
28
! Do nothing here
29
END PROGRAM finalizer
30
31
! { dg-final { cleanup-modules "final_type" } }