Ignore:
Timestamp:
Apr 8, 2014 3:21:23 PM (10 years ago)
Author:
heinze
Message:

REAL constants provided with KIND-attribute

File:
1 edited

Legend:

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

    r1323 r1353  
    2020! Current revisions:
    2121! -----------------
    22 !
     22! REAL constants provided with KIND-attribute
    2323!
    2424! Former revisions:
     
    131131!
    132132!-- Set clipping to default (total domain), if not set by user
    133     IF ( clip_dvrp_l == 9999999.9 )  clip_dvrp_l = 0.0
    134     IF ( clip_dvrp_r == 9999999.9 )  clip_dvrp_r = ( nx + 1 ) * dx
    135     IF ( clip_dvrp_s == 9999999.9 )  clip_dvrp_s = 0.0
    136     IF ( clip_dvrp_n == 9999999.9 )  clip_dvrp_n = ( ny + 1 ) * dy
     133    IF ( clip_dvrp_l == 9999999.9_wp )  clip_dvrp_l = 0.0_wp
     134    IF ( clip_dvrp_r == 9999999.9_wp )  clip_dvrp_r = ( nx + 1 ) * dx
     135    IF ( clip_dvrp_s == 9999999.9_wp )  clip_dvrp_s = 0.0_wp
     136    IF ( clip_dvrp_n == 9999999.9_wp )  clip_dvrp_n = ( ny + 1 ) * dy
    137137
    138138!
     
    256256!
    257257!--       Compute center of domain and distance of camera from center
    258           center(1) = ( clip_dvrp_l + clip_dvrp_r ) * 0.5 * superelevation_x
    259           center(2) = ( clip_dvrp_s + clip_dvrp_n ) * 0.5 * superelevation_y
    260           center(3) = ( zu(nz_do3d) - zu(nzb) ) * 0.5 * superelevation
    261           distance  = 1.5 * MAX( (clip_dvrp_r-clip_dvrp_l) * superelevation_x, &
    262                                  (clip_dvrp_n-clip_dvrp_s) * superelevation_y, &
    263                                  ( zu(nz_do3d) - zu(nzb) ) * superelevation )
     258          center(1) = ( clip_dvrp_l + clip_dvrp_r ) * 0.5_wp * superelevation_x
     259          center(2) = ( clip_dvrp_s + clip_dvrp_n ) * 0.5_wp * superelevation_y
     260          center(3) = ( zu(nz_do3d) - zu(nzb) ) * 0.5_wp * superelevation
     261          distance  = 1.5_wp * MAX(                                            &
     262                           (clip_dvrp_r-clip_dvrp_l) * superelevation_x,       &
     263                           (clip_dvrp_n-clip_dvrp_s) * superelevation_y,       &
     264                                ( zu(nz_do3d) - zu(nzb) ) * superelevation          &
     265                                       )
    264266
    265267!
     
    302304!
    303305!--       Define bounding box material and create a bounding box
    304           tmp_r = 0.5;  tmp_g = 0.5;  tmp_b = 0.5;  tmp_t = 0.0
     306          tmp_r = 0.5_wp;  tmp_g = 0.5_wp;  tmp_b = 0.5_wp;  tmp_t = 0.0_wp
    305307          CALL DVRP_MATERIAL_RGB( m-1, 1, tmp_r, tmp_g, tmp_b, tmp_t )
    306308
    307           tmp_1 = 0.01;
     309          tmp_1 = 0.01_wp;
    308310          tmp_2 = clip_dvrp_l * superelevation_x
    309311          tmp_3 = clip_dvrp_s * superelevation_y
    310           tmp_4 = 0.0
     312          tmp_4 = 0.0_wp
    311313          tmp_5 = (clip_dvrp_r+dx) * superelevation_x
    312314          tmp_6 = (clip_dvrp_n+dy) * superelevation_y
     
    386388             tmp_g = topography_color(2)
    387389             tmp_b = topography_color(3)
    388              tmp_t = 0.0
     390             tmp_t = 0.0_wp
    389391             CALL DVRP_MATERIAL_RGB( m-1, 1, tmp_r, tmp_g, tmp_b, tmp_t )
    390392
     
    393395             ALLOCATE( local_pf(nxl_dvrp:nxr_dvrp+1,nys_dvrp:nyn_dvrp+1, &
    394396                                nzb:nz_do3d) )
    395              local_pf = 0.0
     397             local_pf = 0.0_wp
    396398             IF ( dvrp_overlap )  THEN
    397399                DO  i = nxl_dvrp, nxr_dvrp+1
    398400                   DO  j = nys_dvrp, nyn_dvrp+1
    399401                      IF ( nzb_s_inner(j,i) > 0 )  THEN
    400                          local_pf(i,j,nzb:nzb_s_inner(j,i)) = 1.0
     402                         local_pf(i,j,nzb:nzb_s_inner(j,i)) = 1.0_wp
    401403                      ENDIF
    402404                   ENDDO
     
    407409                             cyclic_dvrp, cyclic_dvrp, cyclic_dvrp )
    408410
    409              tmp_th = 1.0
     411             tmp_th = 1.0_wp
    410412             CALL DVRP_THRESHOLD( m-1, tmp_th )
    411413
     
    428430!--             ATTENTION: A seperate procedure for setting cluster_alpha will
    429431!--                        be in the next version of libDVRP (Feb 09)
    430                 cluster_alpha = 38.0
     432                cluster_alpha = 38.0_wp
    431433                CALL DVRP_THRESHOLD( -(m-1)-1, cluster_alpha )
    432434
     
    512514          tmp_g = groundplate_color(2)
    513515          tmp_b = groundplate_color(3)
    514           tmp_t = 0.0
     516          tmp_t = 0.0_wp
    515517          CALL DVRP_MATERIAL_RGB( m-1, 1, tmp_r, tmp_g, tmp_b, tmp_t )
    516518
     
    519521          ALLOCATE( local_pf(nxl_dvrp:nxr_dvrp+1,nys_dvrp:nyn_dvrp+1, &
    520522                             nzb:nz_do3d) )
    521           local_pf = 0.0
    522           IF (dvrp_overlap )  local_pf(:,:,0) = 1.0
     523          local_pf = 0.0_wp
     524          IF (dvrp_overlap )  local_pf(:,:,0) = 1.0_wp
    523525
    524526          CALL DVRP_DATA( m-1, local_pf, 1, nx_dvrp, ny_dvrp, nz_dvrp, &
    525527                          cyclic_dvrp, cyclic_dvrp, cyclic_dvrp )
    526           tmp_th = 1.0
     528          tmp_th = 1.0_wp
    527529          CALL DVRP_THRESHOLD( m-1, tmp_th )
    528530
     
    543545!--       ATTENTION: A seperate procedure for setting cluster_alpha will be in
    544546!--                  the next version of libDVRP (Feb 09)
    545           cluster_alpha = 38.0
     547          cluster_alpha = 38.0_wp
    546548          CALL DVRP_THRESHOLD( -(m-1)-1, cluster_alpha )
    547549
     
    581583
    582584                IF ( do3d(0,vn)(1:1) == 'w' )  THEN
    583                    steering_dvrp(pn)%min  = -4.0
    584                    steering_dvrp(pn)%max  =  5.0
     585                   steering_dvrp(pn)%min  = -4.0_wp
     586                   steering_dvrp(pn)%max  =  5.0_wp
    585587                ELSE
    586                    steering_dvrp(pn)%min  = 288.0
    587                    steering_dvrp(pn)%max  = 292.0
     588                   steering_dvrp(pn)%min  = 288.0_wp
     589                   steering_dvrp(pn)%max  = 292.0_wp
    588590                ENDIF
    589591
     
    690692       IF ( mode_dvrp(m) == 'pathlines' )  THEN
    691693
    692           tmp_x1 = 0.0;  tmp_y1 = 0.0;  tmp_z1 = 0.0
    693           tmp_x2 = 1.0;  tmp_y2 = 1.0;  tmp_z2 = 0.3
     694          tmp_x1 = 0.0_wp;  tmp_y1 = 0.0_wp;  tmp_z1 = 0.0_wp
     695          tmp_x2 = 1.0_wp;  tmp_y2 = 1.0_wp;  tmp_z2 = 0.3_wp
    694696          CALL DVRP_CUBIC_SEEDING( m-1, tmp_x1, tmp_y1, tmp_z1, tmp_x2, tmp_y2,&
    695697                                   tmp_z2, pathlines_linecount, 2, 0 )
     
    703705!--       Set pathline length
    704706          CALL DVRP_PATHLINES_SETMAXHISTORY( m-1, pathlines_maxhistory )
    705           CALL DVRP_PATHLINES_SETFADING( m-1, 1, 0.0 )
     707          CALL DVRP_PATHLINES_SETFADING( m-1, 1, 0.0_wp )
    706708
    707709          CALL DVRP_INIT_PATHLINES( m-1, 0 )
     
    823825!
    824826!-- If required, close dvrp-software and logging of dvrp-calls
    825     IF ( dt_dvrp /= 9999999.9 )  THEN
     827    IF ( dt_dvrp /= 9999999.9_wp )  THEN
    826828       m = 1
    827829       DO WHILE ( mode_dvrp(m) /= ' ' )
Note: See TracChangeset for help on using the changeset viewer.