source: palm/tags/release-3.6/SOURCE/user_data_output_dvrp.f90 @ 2977

Last change on this file since 2977 was 226, checked in by raasch, 15 years ago

preparations for the next release

  • Property svn:keywords set to Id
File size: 1.6 KB
Line 
1 SUBROUTINE user_data_output_dvrp( output_variable, local_pf )
2
3!------------------------------------------------------------------------------!
4! Actual revisions:
5! -----------------
6!
7!
8! Former revisions:
9! -----------------
10! $Id: user_data_output_dvrp.f90 226 2009-02-02 07:39:34Z kanani $
11!
12! 211 2008-11-11 04:46:24Z raasch
13! Former file user_interface.f90 split into one file per subroutine
14!
15! Description:
16! ------------
17! Execution of user-defined dvrp output
18!------------------------------------------------------------------------------!
19
20    USE control_parameters
21    USE indices
22    USE pegrid
23    USE user
24
25    IMPLICIT NONE
26
27    CHARACTER (LEN=*) ::  output_variable
28
29    INTEGER ::  i, j, k
30
31    REAL, DIMENSION(nxl:nxr+1,nys:nyn+1,nzb:nz_do3d) ::  local_pf
32
33!
34!-- Here the user-defined DVRP output follows:
35
36!
37!-- Move original array to intermediate array
38    SELECT CASE ( output_variable )
39
40!       CASE ( 'u2', 'u2_xy', 'u2_xz', 'u2_yz'  )
41!!
42!!--       Here the user can add user_defined output quantities.
43!!--       Uncomment and extend the following lines, if necessary.
44!          DO  i = nxl, nxr+1
45!             DO  j = nys, nyn+1
46!                DO  k = nzb, nz_do3d
47!                   local_pf(i,j,k) = u2(k,j,i)
48!                ENDDO
49!             ENDDO
50!          ENDDO
51
52
53       CASE DEFAULT
54!
55!--       The DEFAULT case is reached if output_variable contains a
56!--       wrong character string that is neither recognized in data_output_dvrp
57!--       nor here in user_data_output_dvrp.
58          IF ( myid == 0 )  THEN
59             PRINT*,'+++ (user_)data_output_dvrp: no output possible for: ', &
60                  output_variable
61          ENDIF
62
63    END SELECT
64
65
66 END SUBROUTINE user_data_output_dvrp
67
Note: See TracBrowser for help on using the repository browser.