OpenCores
URL https://opencores.org/ocsvn/openrisc/openrisc/trunk

Subversion Repositories openrisc

[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.dg/] [alloc_comp_optional_1.f90] - Blame information for rev 749

Go to most recent revision | Details | Compare with Previous | View Log

Line No. Rev Author Line
1 694 jeremybenn
! { dg-do run }
2
! Tests the fix for PR38602, a regression caused by a modification
3
! to the nulling of INTENT_OUT dummies with allocatable components
4
! that caused a segfault with optional arguments.
5
!
6
! Contributed by David Kinniburgh 
7
!
8
program test_iso
9
  type ivs
10
     character(LEN=1), dimension(:), allocatable :: chars
11
  end type ivs
12
  type(ivs) :: v_str
13
  integer :: i
14
  call foo(v_str, i)
15
  if (v_str%chars(1) .ne. "a") call abort
16
  if (i .ne. 0) call abort
17
  call foo(flag = i)
18
  if (i .ne. 1) call abort
19
contains
20
  subroutine foo (arg, flag)
21
    type(ivs), optional, intent(out) :: arg
22
    integer :: flag
23
    if (present(arg)) then
24
      arg = ivs([(char(i+96), i = 1,10)])
25
      flag = 0
26
    else
27
      flag = 1
28
    end if
29
  end subroutine
30
end
31
 

powered by: WebSVN 2.1.0

© copyright 1999-2024 OpenCores.org, equivalent to Oliscience, all rights reserved. OpenCores®, registered trademark.