Ignore:
Timestamp:
Oct 7, 2015 11:56:08 PM (9 years ago)
Author:
knoop
Message:

Code annotations made doxygen readable

File:
1 edited

Legend:

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

    r1321 r1682  
    1  SUBROUTINE user_define_netcdf_grid( variable, found, grid_x, grid_y, grid_z )
    2 
     1!> @file user_define_netcdf_grid.f90
    32!--------------------------------------------------------------------------------!
    43! This file is part of PALM.
     
    2019! Current revisions:
    2120! -----------------
    22 !
     21! Code annotations made doxygen readable
    2322!
    2423! Former revisions:
     
    3837! Description:
    3938! ------------
    40 ! Set the grids on which user-defined output quantities are defined.
    41 ! Allowed values for grid_x are "x" and "xu", for grid_y "y" and "yv", and
    42 ! for grid_z "zu" and "zw".
     39!> Set the grids on which user-defined output quantities are defined.
     40!> Allowed values for grid_x are "x" and "xu", for grid_y "y" and "yv", and
     41!> for grid_z "zu" and "zw".
    4342!------------------------------------------------------------------------------!
     43 SUBROUTINE user_define_netcdf_grid( variable, found, grid_x, grid_y, grid_z )
     44 
    4445
    4546    USE kinds
     
    4950    IMPLICIT NONE
    5051
    51     CHARACTER (LEN=*) ::  grid_x     !:
    52     CHARACTER (LEN=*) ::  grid_y     !:
    53     CHARACTER (LEN=*) ::  grid_z     !:
    54     CHARACTER (LEN=*) ::  variable   !:
     52    CHARACTER (LEN=*) ::  grid_x     !<
     53    CHARACTER (LEN=*) ::  grid_y     !<
     54    CHARACTER (LEN=*) ::  grid_z     !<
     55    CHARACTER (LEN=*) ::  variable   !<
    5556
    56     LOGICAL ::  found   !:
     57    LOGICAL ::  found   !<
    5758
    5859
Note: See TracChangeset for help on using the changeset viewer.