aboutsummaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/pointer_array_8.f90
blob: 1cc1787948be283e1562734b4ae74669667e9c7d (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
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
! { dg-do run }
!
! Make sure that the fix for pr34640 works with class pointers.
!
  type :: mytype
    real :: r
    integer :: i
  end type

  type :: thytype
    real :: r
    integer :: i
    type(mytype) :: der
  end type

  type(thytype), dimension(0:2), target :: tgt
  class(*), dimension(:), pointer :: cptr
  class(mytype), dimension(:), pointer :: cptr1
  integer :: i
  integer(8) :: s1, s2

  tgt = [(thytype(int(i), i, mytype(int(2*i), 2*i)), i= 1,3)]

  cptr => tgt%i
  if (lbound (cptr, 1) .ne. 1)  STOP 1! Not a whole array target!

  s1 = loc(cptr)
  call foo (cptr, s2)                          ! Check bounds not changed...
  if (s1 .ne. s2) STOP 2! ...and that the descriptor is passed.

  select type (cptr)
    type is (integer)
      if (any (cptr .ne. [1,2,3])) STOP 3! Check the scalarizer works.
      if (cptr(2) .ne. 2) STOP 4! Check ordinary array indexing.
  end select

  cptr(1:3) => tgt%der%r                       ! Something a tad more complicated!

  select type (cptr)
    type is (real)
      if (any (int(cptr) .ne. [2,4,6])) STOP 5
      if (any (int(cptr([2,3,1])) .ne. [4,6,2])) STOP 6
      if (int(cptr(3)) .ne. 6) STOP 7
  end select

  cptr1(1:3) => tgt%der

  s1 = loc(cptr1)
  call bar(cptr1, s2)
  if (s1 .ne. s2) STOP 8! Check that the descriptor is passed.

  select type (cptr1)
    type is (mytype)
      if (any (cptr1%i .ne. [2,4,6])) STOP 9
      if (cptr1(2)%i .ne. 4) STOP 10
  end select

contains

  subroutine foo (arg, addr)
    class(*), dimension(:), pointer :: arg
    integer(8) :: addr
    addr = loc(arg)
    select type (arg)
      type is (integer)
        if (any (arg .ne. [1,2,3])) STOP 11! Check the scalarizer works.
        if (arg(2) .ne. 2) STOP 12! Check ordinary array indexing.
    end select
  end subroutine

  subroutine bar (arg, addr)
    class(mytype), dimension(:), pointer :: arg
    integer(8) :: addr
    addr = loc(arg)
    select type (arg)
      type is (mytype)
        if (any (arg%i .ne. [2,4,6])) STOP 13
        if (arg(2)%i .ne. 4) STOP 14
    end select
  end subroutine
end