Ignore:
Timestamp:
02/13/12 19:35:25 (12 years ago)
Author:
ymipsl
Message:

nouvelle version de developpement de xios

  • nouvelle interface fortran
  • recodage complet de la couche de communication
  • et bien d'autres choses...

YM

File:
1 edited

Legend:

Unmodified
Added
Removed
  • XMLIO_V2/dev/common/src/fortran/filegroup_interface.f90

    r286 r300  
    5858      END SUBROUTINE cxios_filegroup_valid_id 
    5959 
     60      SUBROUTINE cxios_set_filegroup_type(filegroup_hdl, type ,type_size) BIND(C) 
     61         USE ISO_C_BINDING 
     62         INTEGER  (kind = C_INTPTR_T), VALUE        :: filegroup_hdl 
     63         CHARACTER(kind = C_CHAR)    , DIMENSION(*) :: type 
     64         INTEGER  (kind = C_INT)     , VALUE        :: type_size 
     65      END SUBROUTINE cxios_set_filegroup_type 
     66       
    6067   END INTERFACE 
    6168    
Note: See TracChangeset for help on using the changeset viewer.