source: palm/trunk/SOURCE/user_module.f90 @ 222

Last change on this file since 222 was 220, checked in by raasch, 15 years ago

some small bugfixes in user_module, user_read_restart_data, read_3d_binary, flow_statistics and mrun

  • Property svn:keywords set to Id
File size: 1.5 KB
Line 
1 MODULE user
2
3!------------------------------------------------------------------------------!
4! Actual revisions:
5! -----------------
6! Former file user_interface.f90 split into one file per subroutine,
7! revision history cleaned up
8!
9! Former revisions:
10! -----------------
11! $Id: user_module.f90 220 2008-12-18 07:00:36Z letzel $
12!
13! 159 2008-04-09 08:06:03Z raasch
14! bugfix in user_read_restart_data
15! small bugfixes for sample code (comments):
16! - initialize ustvst with 0.0 as it is now computed only until nxr and nyn
17! - two ALLOCATE statements moved from user_read_restart_data back to user_init
18! - remove 'READ (13) u2_av' statement in user_read_restart_data
19! +routines user_read_restart_data, user_spectra
20!
21! RCS Log replace by Id keyword, revision history cleaned up
22!
23! Revision 1.18  2006/06/02 15:25:00  raasch
24! +change of grid-defining arguments in routine user_define_netcdf_grid,
25! new argument "found" in user_data_output_2d and user_data_output_3d
26!
27! Revision 1.1  1998/03/24 15:29:04  raasch
28! Initial revision
29!
30!
31! Description:
32! ------------
33! Declaration of user-defined variables. This module may only be used
34! in the user-defined routines (contained in user_interface.f90).
35!------------------------------------------------------------------------------!
36
37    INTEGER ::  dots_num_palm, user_idummy
38    LOGICAL ::  user_defined_namelist_found = .FALSE.
39    REAL    ::  user_rdummy
40
41!
42!-- Sample for user-defined output
43!    REAL, DIMENSION(:,:,:), ALLOCATABLE ::  u2, u2_av
44!    REAL, DIMENSION(:,:,:), ALLOCATABLE ::  ustvst
45
46    SAVE
47
48 END MODULE user
Note: See TracBrowser for help on using the repository browser.