source: palm/trunk/SOURCE/user_data_output_dvrp.f90 @ 225

Last change on this file since 225 was 211, checked in by raasch, 15 years ago

user interface was split into one single file per subroutine

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