Ignore:
Timestamp:
02/16/09 14:24:05 (15 years ago)
Author:
ymipsl
Message:

Correction de bugs pour portage sur Mercure

File:
1 edited

Legend:

Unmodified
Added
Removed
  • XMLIO_SERVER/trunk/src/IOSERVER/mod_interface_ioipsl.f90

    r8 r17  
    125125       
    126126     CALL sorted_list__find(sorted_id,hash(varname),pos,found) 
     127 
    127128     IF (found) THEN 
    128129       pt_field_base=>field_id%at(pos)%pt 
     
    154155         
    155156     CALL sorted_list__find(sorted_id,hash(varname),pos,found) 
    156      pt_field_base=>field_id%at(pos)%pt 
    157       
    158      DO i=1,pt_field_base%field_out%size 
    159        pt_field=>pt_field_base%field_out%at(i)%pt%field 
    160        ioipsl_file_id=pt_field%internal(id_file) 
    161        CALL histwrite(ioipsl_file_id, TRIM(pt_field%name), timestep_nb, var, size(var), nindex) 
    162      ENDDO 
    163       
     157 
     158     IF (found) THEN 
     159       pt_field_base=>field_id%at(pos)%pt 
     160      
     161       DO i=1,pt_field_base%field_out%size 
     162         pt_field=>pt_field_base%field_out%at(i)%pt%field 
     163         ioipsl_file_id=pt_field%internal(id_file) 
     164         CALL histwrite(ioipsl_file_id, TRIM(pt_field%name), timestep_nb, var, size(var), nindex) 
     165       ENDDO 
     166     ENDIF 
    164167   END SUBROUTINE write_ioipsl_3d 
    165168            
Note: See TracChangeset for help on using the changeset viewer.