Ignore:
Timestamp:
Aug 25, 2009 8:06:27 AM (15 years ago)
Author:
raasch
Message:

speed optomizations +bugfix in init_ocean

File:
1 edited

Legend:

Unmodified
Added
Removed
  • palm/trunk/SOURCE/user_last_actions.f90

    r226 r366  
    44! Actual revisions:
    55! -----------------
    6 !
     6! Output on unit 14 only if requested by write_binary
    77!
    88! Former revisions:
     
    1818!------------------------------------------------------------------------------!
    1919
     20    USE control_parameters
    2021    USE user
    2122
     
    2526!-- Here the user-defined actions at the end of a job follow.
    2627!-- Sample for user-defined output:
    27 !    IF ( ALLOCATED( u2_av ) )  THEN
    28 !       WRITE ( 14 )  'u2_av               ';  WRITE ( 14 )  u2_av
    29 !    ENDIF
     28    IF ( write_binary(1:4) == 'true' )  THEN
     29!       IF ( ALLOCATED( u2_av ) )  THEN
     30!          WRITE ( 14 )  'u2_av               ';  WRITE ( 14 )  u2_av
     31!       ENDIF
    3032
    31     WRITE ( 14 )  '*** end user ***    '
     33       WRITE ( 14 )  '*** end user ***    '
     34
     35    ENDIF
    3236
    3337 END SUBROUTINE user_last_actions
Note: See TracChangeset for help on using the changeset viewer.