Ignore:
Timestamp:
03/30/21 18:25:37 (3 years ago)
Author:
ymipsl
Message:

Merge fortran interface functionnalities from trunk :

  • sendField & recvField with field handle
  • getCurrentContext

YM

File:
1 edited

Legend:

Unmodified
Added
Removed
  • XIOS/dev/dev_ym/XIOS_COUPLING/src/interface/fortran/context_interface.f90

    r545 r2121  
    1616      END SUBROUTINE cxios_context_get_current 
    1717 
     18      SUBROUTINE cxios_context_get_id(context, idt, idt_size) BIND(C) 
     19         import C_CHAR, C_INTPTR_T, C_INT 
     20         INTEGER (kind = C_INTPTR_T) :: context 
     21         CHARACTER(kind = C_CHAR)    , DIMENSION(*) :: idt 
     22         INTEGER  (kind = C_INT)     , VALUE        :: idt_size 
     23     END SUBROUTINE cxios_context_get_id 
     24 
    1825      SUBROUTINE cxios_context_set_current(context, withswap) BIND(C) 
    1926         import C_BOOL, C_INT, C_INTPTR_T 
Note: See TracChangeset for help on using the changeset viewer.