New URL for NEMO forge!   http://forge.nemo-ocean.eu

Since March 2022 along with NEMO 4.2 release, the code development moved to a self-hosted GitLab.
This present forge is now archived and remained online for history.
Changeset 14072 for NEMO/trunk/src/ICE/icectl.F90 – NEMO

Ignore:
Timestamp:
2020-12-04T08:48:38+01:00 (3 years ago)
Author:
laurent
Message:

Merging branch "2020/dev_r13648_ASINTER-04_laurent_bulk_ice", ticket #2369

File:
1 edited

Legend:

Unmodified
Added
Removed
  • NEMO/trunk/src/ICE/icectl.F90

    r14005 r14072  
    1212   !!   'key_si3'                                       SI3 sea-ice model 
    1313   !!---------------------------------------------------------------------- 
    14    !!    ice_cons_hsm     : conservation tests on heat, salt and mass during a  time step (global)  
     14   !!    ice_cons_hsm     : conservation tests on heat, salt and mass during a  time step (global) 
    1515   !!    ice_cons_final   : conservation tests on heat, salt and mass at end of time step (global) 
    1616   !!    ice_cons2D       : conservation tests on heat, salt and mass at each gridcell 
     
    5555   CHARACTER(LEN=50)   ::   clname="icedrift_diagnostics.ascii"   ! ascii filename 
    5656   INTEGER             ::   numicedrift                           ! outfile unit 
    57    REAL(wp)            ::   rdiag_icemass, rdiag_icesalt, rdiag_iceheat  
    58    REAL(wp)            ::   rdiag_adv_icemass, rdiag_adv_icesalt, rdiag_adv_iceheat  
    59     
     57   REAL(wp)            ::   rdiag_icemass, rdiag_icesalt, rdiag_iceheat 
     58   REAL(wp)            ::   rdiag_adv_icemass, rdiag_adv_icesalt, rdiag_adv_iceheat 
     59 
    6060   !! * Substitutions 
    6161#  include "do_loop_substitute.h90" 
     
    7777      !!              It prints in ocean.output if there is a violation of conservation at each time-step 
    7878      !!              The thresholds (zchk_m, zchk_s, zchk_t) determine violations 
    79       !!              For salt and heat thresholds, ice is considered to have a salinity of 10  
    80       !!              and a heat content of 3e5 J/kg (=latent heat of fusion)  
     79      !!              For salt and heat thresholds, ice is considered to have a salinity of 10 
     80      !!              and a heat content of 3e5 J/kg (=latent heat of fusion) 
    8181      !!------------------------------------------------------------------- 
    8282      INTEGER         , INTENT(in)    ::   icount        ! called at: =0 the begining of the routine, =1  the end 
     
    148148         zetrp = glob_sum( 'icectl', diag_adv_heat * e1e2t ) 
    149149 
    150          ! ice area (+epsi10 to set a threshold > 0 when there is no ice)  
     150         ! ice area (+epsi10 to set a threshold > 0 when there is no ice) 
    151151         zarea = glob_sum( 'icectl', SUM( a_i + epsi10, dim=3 ) * e1e2t ) 
    152152 
     
    191191      !!              It prints in ocean.output if there is a violation of conservation at each time-step 
    192192      !!              The thresholds (zchk_m, zchk_s, zchk_t) determine the violations 
    193       !!              For salt and heat thresholds, ice is considered to have a salinity of 10  
    194       !!              and a heat content of 3e5 J/kg (=latent heat of fusion)  
     193      !!              For salt and heat thresholds, ice is considered to have a salinity of 10 
     194      !!              and a heat content of 3e5 J/kg (=latent heat of fusion) 
    195195      !!------------------------------------------------------------------- 
    196196      CHARACTER(len=*), INTENT(in) ::   cd_routine    ! name of the routine 
     
    214214      !!   &                                          ) * e1e2t ) 
    215215 
    216       ! ice area (+epsi10 to set a threshold > 0 when there is no ice)  
     216      ! ice area (+epsi10 to set a threshold > 0 when there is no ice) 
    217217      zarea = glob_sum( 'icectl', SUM( a_i + epsi10, dim=3 ) * e1e2t ) 
    218218 
     
    243243      !! 
    244244      REAL(wp), DIMENSION(jpi,jpj) ::   zdiag_mass, zdiag_salt, zdiag_heat, & 
    245          &                              zdiag_amin, zdiag_vmin, zdiag_smin, zdiag_emin !!, zdiag_amax   
     245         &                              zdiag_amin, zdiag_vmin, zdiag_smin, zdiag_emin !!, zdiag_amax 
    246246      INTEGER ::   jl, jk 
    247247      LOGICAL ::   ll_stop_m = .FALSE. 
     
    261261            &       wfx_snw_sni + wfx_snw_sum + wfx_snw_dyn + wfx_snw_sub + wfx_ice_sub + wfx_spr 
    262262         ! salt flux 
    263          pdiag_fs = sfx_bri + sfx_bog + sfx_bom + sfx_sum + sfx_sni + sfx_opw + sfx_res + sfx_dyn + sfx_sub + sfx_lam  
     263         pdiag_fs = sfx_bri + sfx_bog + sfx_bom + sfx_sum + sfx_sni + sfx_opw + sfx_res + sfx_dyn + sfx_sub + sfx_lam 
    264264         ! heat flux 
    265          pdiag_ft =   hfx_sum + hfx_bom + hfx_bog + hfx_dif + hfx_opw + hfx_snw  &  
     265         pdiag_ft =   hfx_sum + hfx_bom + hfx_bog + hfx_dif + hfx_opw + hfx_snw  & 
    266266            &       - hfx_thd - hfx_dyn - hfx_res - hfx_sub - hfx_spr 
    267267 
     
    283283         ! -- heat diag -- ! 
    284284         zdiag_heat =   ( SUM( SUM( e_i, dim=4 ), dim=3 ) + SUM( SUM( e_s, dim=4 ), dim=3 ) - pdiag_t ) * r1_Dt_ice & 
    285             &         + (  hfx_sum + hfx_bom + hfx_bog + hfx_dif + hfx_opw + hfx_snw                                &  
     285            &         + (  hfx_sum + hfx_bom + hfx_bog + hfx_dif + hfx_opw + hfx_snw                                & 
    286286            &            - hfx_thd - hfx_dyn - hfx_res - hfx_sub - hfx_spr )                                        & 
    287287            &         - pdiag_ft 
     
    324324         IF( ll_stop_s )   CALL ctl_stop( 'STOP', cd_routine//': ice salt conservation issue' ) 
    325325         IF( ll_stop_t )   CALL ctl_stop( 'STOP', cd_routine//': ice heat conservation issue' ) 
    326           
     326 
    327327      ENDIF 
    328328 
     
    332332      !!--------------------------------------------------------------------- 
    333333      !!                 ***  ROUTINE ice_cons_wri  *** 
    334       !!         
    335       !! ** Purpose :   create a NetCDF file named cdfile_name which contains  
     334      !! 
     335      !! ** Purpose :   create a NetCDF file named cdfile_name which contains 
    336336      !!                the instantaneous fields when conservation issue occurs 
    337337      !! 
     
    340340      CHARACTER(len=*), INTENT( in ) ::   cdfile_name      ! name of the file created 
    341341      REAL(wp), DIMENSION(:,:), INTENT( in ) ::   pdiag_mass, pdiag_salt, pdiag_heat, & 
    342          &                                        pdiag_amin, pdiag_vmin, pdiag_smin, pdiag_emin !!, pdiag_amax   
     342         &                                        pdiag_amin, pdiag_vmin, pdiag_smin, pdiag_emin !!, pdiag_amax 
    343343      !! 
    344344      INTEGER ::   inum 
    345345      !!---------------------------------------------------------------------- 
    346       !  
     346      ! 
    347347      IF(lwp) WRITE(numout,*) 
    348348      IF(lwp) WRITE(numout,*) 'ice_cons_wri : single instantaneous ice state' 
    349349      IF(lwp) WRITE(numout,*) '~~~~~~~~~~~~~  named :', cdfile_name, '...nc' 
    350       IF(lwp) WRITE(numout,*)                 
     350      IF(lwp) WRITE(numout,*) 
    351351 
    352352      CALL iom_open( TRIM(cdfile_name), inum, ldwrt = .TRUE., kdlev = jpl, cdcomp = 'ICE' ) 
    353        
     353 
    354354      CALL iom_rstput( 0, 0, inum, 'cons_mass', pdiag_mass(:,:) , ktype = jp_r8 )    ! ice mass spurious lost/gain 
    355355      CALL iom_rstput( 0, 0, inum, 'cons_salt', pdiag_salt(:,:) , ktype = jp_r8 )    ! ice salt spurious lost/gain 
    356356      CALL iom_rstput( 0, 0, inum, 'cons_heat', pdiag_heat(:,:) , ktype = jp_r8 )    ! ice heat spurious lost/gain 
    357357      ! other diags 
    358       CALL iom_rstput( 0, 0, inum, 'aneg_count', pdiag_amin(:,:) , ktype = jp_r8 )    !  
    359       CALL iom_rstput( 0, 0, inum, 'vneg_count', pdiag_vmin(:,:) , ktype = jp_r8 )    !  
    360       CALL iom_rstput( 0, 0, inum, 'sneg_count', pdiag_smin(:,:) , ktype = jp_r8 )    !  
    361       CALL iom_rstput( 0, 0, inum, 'eneg_count', pdiag_emin(:,:) , ktype = jp_r8 )    !  
     358      CALL iom_rstput( 0, 0, inum, 'aneg_count', pdiag_amin(:,:) , ktype = jp_r8 )    ! 
     359      CALL iom_rstput( 0, 0, inum, 'vneg_count', pdiag_vmin(:,:) , ktype = jp_r8 )    ! 
     360      CALL iom_rstput( 0, 0, inum, 'sneg_count', pdiag_smin(:,:) , ktype = jp_r8 )    ! 
     361      CALL iom_rstput( 0, 0, inum, 'eneg_count', pdiag_emin(:,:) , ktype = jp_r8 )    ! 
    362362      ! mean state 
    363363      CALL iom_rstput( 0, 0, inum, 'icecon'    , SUM(a_i ,dim=3) , ktype = jp_r8 )    ! 
     
    366366      CALL iom_rstput( 0, 0, inum, 'pndvol'    , SUM(v_ip,dim=3) , ktype = jp_r8 )    ! 
    367367      CALL iom_rstput( 0, 0, inum, 'lidvol'    , SUM(v_il,dim=3) , ktype = jp_r8 )    ! 
    368        
     368 
    369369      CALL iom_close( inum ) 
    370370 
    371371   END SUBROUTINE ice_cons_wri 
    372     
     372 
    373373   SUBROUTINE ice_ctl( kt ) 
    374374      !!------------------------------------------------------------------- 
    375       !!                   ***  ROUTINE ice_ctl ***  
    376       !!                  
     375      !!                   ***  ROUTINE ice_ctl *** 
     376      !! 
    377377      !! ** Purpose :   control checks 
    378378      !!------------------------------------------------------------------- 
     
    386386      inb_alp(:) = 0 
    387387      ialert_id = 0 
    388        
     388 
    389389      ! Alert if very high salinity 
    390390      ialert_id = ialert_id + 1 ! reference number of this alert 
     
    430430         END_3D 
    431431      END DO 
    432    
     432 
    433433      ! Alert if very warm ice 
    434434      ialert_id = ialert_id + 1 ! reference number of this alert 
     
    444444         END_3D 
    445445      END DO 
    446        
     446 
    447447      ! Alerte if very thick ice 
    448448      ialert_id = ialert_id + 1 ! reference number of this alert 
    449449      cl_alname(ialert_id) = ' Very thick ice ' ! name of the alert 
    450       jl = jpl  
     450      jl = jpl 
    451451      DO_2D( 1, 1, 1, 1 ) 
    452452         IF( h_i(ji,jj,jl) > 50._wp ) THEN 
     
    460460      ialert_id = ialert_id + 1 ! reference number of this alert 
    461461      cl_alname(ialert_id) = ' Very thin ice ' ! name of the alert 
    462       jl = 1  
     462      jl = 1 
    463463      DO_2D( 1, 1, 1, 1 ) 
    464464         IF( h_i(ji,jj,jl) < rn_himin ) THEN 
     
    484484      cl_alname(ialert_id) = ' Ice on continents ' ! name of the alert 
    485485      DO_2D( 1, 1, 1, 1 ) 
    486          IF( tmask(ji,jj,1) == 0._wp .AND. ( at_i(ji,jj) > 0._wp .OR. vt_i(ji,jj) > 0._wp ) ) THEN  
     486         IF( tmask(ji,jj,1) == 0._wp .AND. ( at_i(ji,jj) > 0._wp .OR. vt_i(ji,jj) > 0._wp ) ) THEN 
    487487            WRITE(numout,*) ' ALERTE :   Ice on continents ',at_i(ji,jj),vt_i(ji,jj) 
    488488            WRITE(numout,*) ' at i,j = ',ji,jj 
     
    496496      DO_2D( 1, 1, 1, 1 ) 
    497497         IF(  ( vt_i(ji,jj) == 0._wp .AND. at_i(ji,jj) >  0._wp ) .OR. & 
    498             & ( vt_i(ji,jj) >  0._wp .AND. at_i(ji,jj) == 0._wp ) ) THEN  
     498            & ( vt_i(ji,jj) >  0._wp .AND. at_i(ji,jj) == 0._wp ) ) THEN 
    499499            WRITE(numout,*) ' ALERTE :   Incompatible ice conc and vol ',at_i(ji,jj),vt_i(ji,jj) 
    500500            WRITE(numout,*) ' at i,j = ',ji,jj 
     
    520520     ! 
    521521   END SUBROUTINE ice_ctl 
    522   
     522 
    523523   SUBROUTINE ice_prt( kt, ki, kj, kn, cd1 ) 
    524524      !!------------------------------------------------------------------- 
    525       !!                   ***  ROUTINE ice_prt ***  
    526       !!                  
    527       !! ** Purpose :   Writes global ice state on the (i,j) point  
    528       !!                in ocean.ouput  
    529       !!                3 possibilities exist  
     525      !!                   ***  ROUTINE ice_prt *** 
     526      !! 
     527      !! ** Purpose :   Writes global ice state on the (i,j) point 
     528      !!                in ocean.ouput 
     529      !!                3 possibilities exist 
    530530      !!                n = 1/-1 -> simple ice state 
    531531      !!                n = 2    -> exhaustive state 
    532532      !!                n = 3    -> ice/ocean salt fluxes 
    533533      !! 
    534       !! ** input   :   point coordinates (i,j)  
     534      !! ** input   :   point coordinates (i,j) 
    535535      !!                n : number of the option 
    536536      !!------------------------------------------------------------------- 
     
    550550            !  Simple state 
    551551            !---------------- 
    552              
     552 
    553553            IF ( kn == 1 .OR. kn == -1 ) THEN 
    554554               WRITE(numout,*) ' ice_prt - Point : ',ji,jj 
     
    566566               WRITE(numout,*) ' - Cell values ' 
    567567               WRITE(numout,*) '   ~~~~~~~~~~~ ' 
    568                WRITE(numout,*) ' at_i          : ', at_i(ji,jj)        
    569                WRITE(numout,*) ' ato_i         : ', ato_i(ji,jj)        
    570                WRITE(numout,*) ' vt_i          : ', vt_i(ji,jj)        
    571                WRITE(numout,*) ' vt_s          : ', vt_s(ji,jj)        
     568               WRITE(numout,*) ' at_i          : ', at_i(ji,jj) 
     569               WRITE(numout,*) ' ato_i         : ', ato_i(ji,jj) 
     570               WRITE(numout,*) ' vt_i          : ', vt_i(ji,jj) 
     571               WRITE(numout,*) ' vt_s          : ', vt_s(ji,jj) 
    572572               DO jl = 1, jpl 
    573573                  WRITE(numout,*) ' - Category (', jl,')' 
     
    592592            !  Exhaustive state 
    593593            !-------------------- 
    594              
     594 
    595595            IF ( kn .EQ. 2 ) THEN 
    596596               WRITE(numout,*) ' ice_prt - Point : ',ji,jj 
     
    598598               WRITE(numout,*) ' Exhaustive state ' 
    599599               WRITE(numout,*) ' lat - long ', gphit(ji,jj), glamt(ji,jj) 
    600                WRITE(numout,*)  
     600               WRITE(numout,*) 
    601601               WRITE(numout,*) ' - Cell values ' 
    602602               WRITE(numout,*) '   ~~~~~~~~~~~ ' 
    603                WRITE(numout,*) ' at_i          : ', at_i(ji,jj)        
    604                WRITE(numout,*) ' vt_i          : ', vt_i(ji,jj)        
    605                WRITE(numout,*) ' vt_s          : ', vt_s(ji,jj)        
     603               WRITE(numout,*) ' at_i          : ', at_i(ji,jj) 
     604               WRITE(numout,*) ' vt_i          : ', vt_i(ji,jj) 
     605               WRITE(numout,*) ' vt_s          : ', vt_s(ji,jj) 
    606606               WRITE(numout,*) ' u_ice(i-1,j)  : ', u_ice(ji-1,jj) 
    607607               WRITE(numout,*) ' u_ice(i  ,j)  : ', u_ice(ji,jj) 
     
    610610               WRITE(numout,*) ' strength      : ', strength(ji,jj) 
    611611               WRITE(numout,*) 
    612                 
     612 
    613613               DO jl = 1, jpl 
    614614                  WRITE(numout,*) ' - Category (',jl,')' 
    615                   WRITE(numout,*) '   ~~~~~~~~         '  
     615                  WRITE(numout,*) '   ~~~~~~~~         ' 
    616616                  WRITE(numout,*) ' h_i        : ', h_i(ji,jj,jl)              , ' h_s        : ', h_s(ji,jj,jl) 
    617617                  WRITE(numout,*) ' t_i        : ', t_i(ji,jj,1:nlay_i,jl) 
    618618                  WRITE(numout,*) ' t_su       : ', t_su(ji,jj,jl)             , ' t_s        : ', t_s(ji,jj,1:nlay_s,jl) 
    619619                  WRITE(numout,*) ' s_i        : ', s_i(ji,jj,jl)              , ' o_i        : ', o_i(ji,jj,jl) 
    620                   WRITE(numout,*) ' a_i        : ', a_i(ji,jj,jl)              , ' a_i_b      : ', a_i_b(ji,jj,jl)    
    621                   WRITE(numout,*) ' v_i        : ', v_i(ji,jj,jl)              , ' v_i_b      : ', v_i_b(ji,jj,jl)    
    622                   WRITE(numout,*) ' v_s        : ', v_s(ji,jj,jl)              , ' v_s_b      : ', v_s_b(ji,jj,jl)   
    623                   WRITE(numout,*) ' e_i1       : ', e_i(ji,jj,1,jl)            , ' ei1        : ', e_i_b(ji,jj,1,jl)  
    624                   WRITE(numout,*) ' e_i2       : ', e_i(ji,jj,2,jl)            , ' ei2_b      : ', e_i_b(ji,jj,2,jl)   
    625                   WRITE(numout,*) ' e_snow     : ', e_s(ji,jj,1,jl)            , ' e_snow_b   : ', e_s_b(ji,jj,1,jl)  
    626                   WRITE(numout,*) ' sv_i       : ', sv_i(ji,jj,jl)             , ' sv_i_b     : ', sv_i_b(ji,jj,jl)    
     620                  WRITE(numout,*) ' a_i        : ', a_i(ji,jj,jl)              , ' a_i_b      : ', a_i_b(ji,jj,jl) 
     621                  WRITE(numout,*) ' v_i        : ', v_i(ji,jj,jl)              , ' v_i_b      : ', v_i_b(ji,jj,jl) 
     622                  WRITE(numout,*) ' v_s        : ', v_s(ji,jj,jl)              , ' v_s_b      : ', v_s_b(ji,jj,jl) 
     623                  WRITE(numout,*) ' e_i1       : ', e_i(ji,jj,1,jl)            , ' ei1        : ', e_i_b(ji,jj,1,jl) 
     624                  WRITE(numout,*) ' e_i2       : ', e_i(ji,jj,2,jl)            , ' ei2_b      : ', e_i_b(ji,jj,2,jl) 
     625                  WRITE(numout,*) ' e_snow     : ', e_s(ji,jj,1,jl)            , ' e_snow_b   : ', e_s_b(ji,jj,1,jl) 
     626                  WRITE(numout,*) ' sv_i       : ', sv_i(ji,jj,jl)             , ' sv_i_b     : ', sv_i_b(ji,jj,jl) 
    627627               END DO !jl 
    628                 
     628 
    629629               WRITE(numout,*) 
    630630               WRITE(numout,*) ' - Heat / FW fluxes ' 
     
    634634               WRITE(numout,*) ' qns_ini       : ', (1._wp-at_i_b(ji,jj)) * qns(ji,jj) + SUM( a_i_b(ji,jj,:) * qns_ice(ji,jj,:) ) 
    635635               WRITE(numout,*) 
    636                WRITE(numout,*)  
    637                WRITE(numout,*) ' sst        : ', sst_m(ji,jj)   
    638                WRITE(numout,*) ' sss        : ', sss_m(ji,jj)   
    639                WRITE(numout,*)  
     636               WRITE(numout,*) 
     637               WRITE(numout,*) ' sst        : ', sst_m(ji,jj) 
     638               WRITE(numout,*) ' sss        : ', sss_m(ji,jj) 
     639               WRITE(numout,*) 
    640640               WRITE(numout,*) ' - Stresses ' 
    641641               WRITE(numout,*) '   ~~~~~~~~ ' 
    642                WRITE(numout,*) ' utau_ice   : ', utau_ice(ji,jj)  
     642               WRITE(numout,*) ' utau_ice   : ', utau_ice(ji,jj) 
    643643               WRITE(numout,*) ' vtau_ice   : ', vtau_ice(ji,jj) 
    644                WRITE(numout,*) ' utau       : ', utau    (ji,jj)  
     644               WRITE(numout,*) ' utau       : ', utau    (ji,jj) 
    645645               WRITE(numout,*) ' vtau       : ', vtau    (ji,jj) 
    646646            ENDIF 
    647              
     647 
    648648            !--------------------- 
    649649            ! Salt / heat fluxes 
    650650            !--------------------- 
    651              
     651 
    652652            IF ( kn .EQ. 3 ) THEN 
    653653               WRITE(numout,*) ' ice_prt - Point : ',ji,jj 
     
    664664               WRITE(numout,*) ' qt_atm_oi    : ', qt_atm_oi(ji,jj) 
    665665               WRITE(numout,*) ' qt_oce_ai    : ', qt_oce_ai(ji,jj) 
    666                WRITE(numout,*) ' dhc          : ', diag_heat(ji,jj)               
     666               WRITE(numout,*) ' dhc          : ', diag_heat(ji,jj) 
    667667               WRITE(numout,*) 
    668668               WRITE(numout,*) ' hfx_dyn      : ', hfx_dyn(ji,jj) 
    669669               WRITE(numout,*) ' hfx_thd      : ', hfx_thd(ji,jj) 
    670670               WRITE(numout,*) ' hfx_res      : ', hfx_res(ji,jj) 
    671                WRITE(numout,*) ' qsb_ice_bot  : ', qsb_ice_bot(ji,jj)  
     671               WRITE(numout,*) ' qsb_ice_bot  : ', qsb_ice_bot(ji,jj) 
    672672               WRITE(numout,*) ' qlead        : ', qlead(ji,jj) * r1_Dt_ice 
    673673               WRITE(numout,*) 
     
    680680               WRITE(numout,*) 
    681681               WRITE(numout,*) ' - Momentum fluxes ' 
    682                WRITE(numout,*) ' utau      : ', utau(ji,jj)  
     682               WRITE(numout,*) ' utau      : ', utau(ji,jj) 
    683683               WRITE(numout,*) ' vtau      : ', vtau(ji,jj) 
    684             ENDIF  
     684            ENDIF 
    685685            WRITE(numout,*) ' ' 
    686686            ! 
     
    694694      !!                  ***  ROUTINE ice_prt3D *** 
    695695      !! 
    696       !! ** Purpose : CTL prints of ice arrays in case sn_cfctl%prtctl is activated  
     696      !! ** Purpose : CTL prints of ice arrays in case sn_cfctl%prtctl is activated 
    697697      !! 
    698698      !!------------------------------------------------------------------- 
    699699      CHARACTER(len=*), INTENT(in) ::   cd_routine    ! name of the routine 
    700700      INTEGER                      ::   jk, jl        ! dummy loop indices 
    701        
     701 
    702702      CALL prt_ctl_info(' ========== ') 
    703703      CALL prt_ctl_info( cd_routine ) 
     
    718718      CALL prt_ctl(tab2d_1=delta_i    , clinfo1=' delta_i     :') 
    719719      CALL prt_ctl(tab2d_1=u_ice      , clinfo1=' u_ice       :', tab2d_2=v_ice      , clinfo2=' v_ice       :') 
    720         
     720 
    721721      DO jl = 1, jpl 
    722722         CALL prt_ctl_info(' ') 
     
    735735         CALL prt_ctl(tab2d_1=sv_i       (:,:,jl)        , clinfo1= ' sv_i        : ') 
    736736         CALL prt_ctl(tab2d_1=oa_i       (:,:,jl)        , clinfo1= ' oa_i        : ') 
    737           
     737 
    738738         DO jk = 1, nlay_i 
    739739            CALL prt_ctl_info(' - Layer : ', ivar=jk) 
     
    742742         END DO 
    743743      END DO 
    744        
     744 
    745745      CALL prt_ctl_info(' ') 
    746746      CALL prt_ctl_info(' - Stresses : ') 
     
    748748      CALL prt_ctl(tab2d_1=utau       , clinfo1= ' utau      : ', tab2d_2=vtau       , clinfo2= ' vtau      : ') 
    749749      CALL prt_ctl(tab2d_1=utau_ice   , clinfo1= ' utau_ice  : ', tab2d_2=vtau_ice   , clinfo2= ' vtau_ice  : ') 
    750        
     750 
    751751   END SUBROUTINE ice_prt3D 
    752752 
     
    853853      !!---------------------------------------------------------------------- 
    854854      !!                  ***  ROUTINE ice_drift_init  *** 
    855       !!                    
     855      !! 
    856856      !! ** Purpose :   create output file, initialise arrays 
    857857      !!---------------------------------------------------------------------- 
     
    879879      ! 
    880880   END SUBROUTINE ice_drift_init 
    881        
     881 
    882882#else 
    883883   !!---------------------------------------------------------------------- 
Note: See TracChangeset for help on using the changeset viewer.