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

Subversion Repositories openrisc

[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.dg/] [finalize_1.f08] - Rev 694

Compare with Previous | Blame | View Log

! { dg-do compile }

! Parsing of finalizer procedure definitions.
! Check that CONTAINS is allowed in TYPE definition; but empty only for F2008

MODULE final_type
  IMPLICIT NONE

  TYPE :: mytype
    INTEGER, ALLOCATABLE :: fooarr(:)
    REAL :: foobar
  CONTAINS
  END TYPE mytype

CONTAINS
  
  SUBROUTINE bar
    TYPE :: t
    CONTAINS ! This is ok
    END TYPE t
    ! Nothing
  END SUBROUTINE bar

END MODULE final_type

PROGRAM finalizer
  IMPLICIT NONE
  ! Do nothing here
END PROGRAM finalizer

! { dg-final { cleanup-modules "final_type" } }

Compare with Previous | Blame | View Log

powered by: WebSVN 2.1.0

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