aboutsummaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/char4_decl.f90
blob: bb6b6a8318a4ae9c2169ffec1b8c807df37fb0dd (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
! { dg-do run }
! { dg-additional-options "-fdump-tree-original" }

! In this program shall be no kind=1,
! except for the 'argv' of the 'main' program.

! Related PR fortran/107266

! { dg-final { scan-tree-dump-times "kind=1" 1 "original" } }
! { dg-final { scan-tree-dump-times "character\\(kind=1\\) \\* \\* argv\\)" 1 "original" } }

program testit
  implicit none (type, external)
  character (kind=4, len=:), allocatable :: aa
  character (kind=4, len=:), pointer :: pp

  pp => NULL ()

  call frobf (aa, pp)
  if (.not. allocated (aa)) stop 101
  if (storage_size(aa) /= storage_size(4_'foo')) stop 1
  if (aa .ne. 4_'foo') stop 102
  if (.not. associated (pp)) stop 103
  if (storage_size(pp) /= storage_size(4_'bar')) stop 2
  if (pp .ne. 4_'bar') stop 104

  pp => NULL ()

  call frobc (aa, pp)
  if (.not. allocated (aa)) stop 105
  if (storage_size(aa) /= storage_size(4_'frog')) stop 3
  if (aa .ne. 4_'frog') stop 106
  if (.not. associated (pp)) stop 107
  if (storage_size(pp) /= storage_size(4_'toad')) stop 4
  if (pp .ne. 4_'toad') stop 108


  contains

    subroutine frobf (a, p)
      character (kind=4, len=:), allocatable :: a
      character (kind=4, len=:), pointer :: p
      allocate (character(kind=4, len=3) :: p)
      a = 4_'foo'
      p = 4_'bar'
    end subroutine

    subroutine frobc (a, p)
      character (kind=4, len=:), allocatable :: a
      character (kind=4, len=:), pointer :: p
      allocate (character(kind=4, len=4) :: p)
      a = 4_'frog'
      p = 4_'toad'
    end subroutine

end program