Ignore:
Timestamp:
02/14/12 15:36:14 (12 years ago)
Author:
ymipsl
Message:

suppress old fortran interface

YM

File:
1 edited

Legend:

Unmodified
Added
Removed
  • XIOS/trunk/src/fortran/context_interface.f90

    r286 r312  
    3838      END SUBROUTINE cxios_context_set_current 
    3939 
    40       SUBROUTINE cxios_context_create(context, context_id, context_id_size, calendar_type, & 
    41                                      year, month, day, hour, minute, second) BIND(C) 
    42          USE ISO_C_BINDING 
    43          INTEGER  (kind = C_INTPTR_T)               :: context 
    44          CHARACTER(kind = C_CHAR)    , DIMENSION(*) :: context_id 
    45          INTEGER  (kind = C_INT)     , VALUE        :: context_id_size 
    46          INTEGER  (kind = C_INT)     , VALUE        :: calendar_type, year, month, day, hour, minute, second 
    47       END SUBROUTINE cxios_context_create 
    48  
    4940      SUBROUTINE cxios_context_valid_id(ret, idt, idt_size) BIND(C) 
    5041         USE ISO_C_BINDING 
Note: See TracChangeset for help on using the changeset viewer.