Ignore:
Timestamp:
09/26/11 14:19:55 (13 years ago)
Author:
hozdoba
Message:
 
File:
1 edited

Legend:

Unmodified
Added
Removed
  • XMLIO_V2/dev/dev_rv/src/xmlio/fortran/context_interface.f90

    r270 r285  
    4040      SUBROUTINE xios_context_create(context, context_id, context_id_size, calendar_type, & 
    4141                                     year, month, day, hour, minute, second) BIND(C) 
    42          import C_CHAR, C_INT, C_INTPTR_T 
     42         USE ISO_C_BINDING 
    4343         INTEGER  (kind = C_INTPTR_T)               :: context 
    4444         CHARACTER(kind = C_CHAR)    , DIMENSION(*) :: context_id 
     
    4646         INTEGER  (kind = C_INT)     , VALUE        :: calendar_type, year, month, day, hour, minute, second 
    4747      END SUBROUTINE xios_context_create 
    48       
     48 
     49      SUBROUTINE xios_context_valid_id(ret, idt, idt_size) BIND(C) 
     50         USE ISO_C_BINDING 
     51         LOGICAL  (kind = C_BOOL)                   :: ret 
     52         CHARACTER(kind = C_CHAR)    , DIMENSION(*) :: idt 
     53         INTEGER  (kind = C_INT)     , VALUE        :: idt_size 
     54      END SUBROUTINE xios_context_valid_id 
     55 
    4956   END INTERFACE 
    5057      
Note: See TracChangeset for help on using the changeset viewer.