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

Subversion Repositories openrisc

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

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

Line No. Rev Author Line
1 694 jeremybenn
! { dg-do compile }
2
!
3
! PR fortran/45211
4
!
5
! Contributed by Scot Breitenfeld
6
!
7
module m
8
contains
9
  FUNCTION liter_cb(link_info) bind(C)
10
    USE ISO_C_BINDING
11
    IMPLICIT NONE
12
 
13
    INTEGER(c_int) liter_cb
14
 
15
    TYPE, bind(C) :: info_t
16
       INTEGER(c_int) :: type
17
    END TYPE info_t
18
 
19
    TYPE(info_t) :: link_info
20
 
21
    liter_cb = 0
22
  END FUNCTION liter_cb
23
end module m
24
 
25
! { dg-final { cleanup-modules "m" } }

powered by: WebSVN 2.1.0

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