aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.9/gcc/testsuite/gfortran.dg/auto_char_dummy_array_1.f90
blob: 6a660c203883da50a8ea2ef291cc5bdb7d0f7f8a (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
! { dg-do run }
! This tests the fix for pr15809 in which automatic character length,
! dummy, pointer arrays were broken.
!
! contributed by Paul Thomas  <pault@gcc.gnu.org>
!
module global
  character(12), dimension(2), target :: t
end module global

program oh_no_not_pr15908_again
  character(12), dimension(:), pointer :: ptr

  call a (ptr, 12)
  if (.not.associated (ptr) ) call abort ()
  if (any (ptr.ne."abc")) call abort ()

  ptr => null ()              ! ptr points to 't' here.
  allocate (ptr(3))
  ptr = "xyz"
  call a (ptr, 12)

  if (.not.associated (ptr)) call abort ()
  if (any (ptr.ne."lmn")) call abort ()

  call a (ptr, 0)

  if (associated (ptr)) call abort ()

contains

  subroutine a (p, l)
    use global
    character(l), dimension(:), pointer :: p
    character(l), dimension(3)          :: s

    s = "lmn"

    if (l.ne.12) then
      deallocate (p)           ! ptr was allocated in main.
      p => null ()
      return
    end if

    if (.not.associated (p)) then
      t = "abc"
      p => t
    else
      if (size (p,1).ne.3) call abort ()
      if (any (p.ne."xyz")) call abort ()
      p = s
    end if
  end subroutine a

end program oh_no_not_pr15908_again