blob: bf80c4e00e61fb66abd1495e8d32feeace784de1 (
plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
|
! { dg-do compile }
!
! PR 41556
! Contributed by Damian Rouson <damian@rouson.net>
implicit none
type ,abstract :: object
contains
procedure(assign_interface) ,deferred :: assign
generic :: assignment(=) => assign
end type
abstract interface
subroutine assign_interface(lhs,rhs)
import :: object
class(object) ,intent(inout) :: lhs
class(object) ,intent(in) :: rhs
end subroutine
end interface
! PR 41937
! Contributed by Juergen Reuter <reuter@physik.uni-freiburg.de>
type, abstract :: cuba_abstract_type
integer :: dim_f = 1
real, dimension(:), allocatable :: integral
end type cuba_abstract_type
contains
subroutine cuba_abstract_alloc_dim_f(this)
class(cuba_abstract_type) :: this
allocate(this%integral(this%dim_f))
end subroutine cuba_abstract_alloc_dim_f
end
|