Skip to content

Commit

Permalink
ALL CAPS formatting
Browse files Browse the repository at this point in the history
  • Loading branch information
IvanaEscobar committed Nov 15, 2024
1 parent cdd59dd commit 0c953e8
Show file tree
Hide file tree
Showing 14 changed files with 940 additions and 960 deletions.
4 changes: 2 additions & 2 deletions pkg/profiles/active_file_control_profiles.F
Original file line number Diff line number Diff line change
Expand Up @@ -115,7 +115,7 @@ SUBROUTINE ACTIVE_READ_PROFILE_RL(

READ(fid,rec=jrec+1) vec_tmp
#ifdef _BYTESWAPIO
call MDS_BYTESWAPR8(nactive_var+1,vec_tmp)
CALL MDS_BYTESWAPR8(nactive_var+1,vec_tmp)
#endif
DO ivar=1,nactive_var
active_var(ivar)=vec_tmp(ivar)
Expand Down Expand Up @@ -177,7 +177,7 @@ SUBROUTINE ACTIVE_READ_PROFILE_RL(

READ(fid,rec=jrec+1) vec_tmp
#ifdef _BYTESWAPIO
call MDS_BYTESWAPR8(nactive_var+1,vec_tmp)
CALL MDS_BYTESWAPR8(nactive_var+1,vec_tmp)
#endif
DO ivar=1,nactive_var
active_data_t(ivar)=vec_tmp(ivar)
Expand Down
149 changes: 74 additions & 75 deletions pkg/profiles/active_file_profiles.F
Original file line number Diff line number Diff line change
@@ -1,24 +1,24 @@
#include "PROFILES_OPTIONS.h"

c ==================================================================
c
c active_file.F: Routines to handle the I/O of the active file for
c the adjoint calculations. All files are direct
c access files.
c
c Routines
c
c o active_read_profile - Read an active 1D record.
c o active_write_profile - Write an active 1D record.
c
c
c changed: gforget@ocean.mit.edu 23-Mar-2006
c
c ==================================================================
C ==================================================================
C
C active_file.F: Routines to handle the I/O of the active file for
C the adjoint calculations. All files are direct
C access files.
C
C Routines
C
C o active_read_profile - Read an active 1D record.
C o active_write_profile - Write an active 1D record.
C
C
C changed: gforget@ocean.mit.edu 23-Mar-2006
C
C ==================================================================

C !ROUTINE: active_read_profile
C !INTERFACE:
subroutine active_read_profile(
SUBROUTINE ACTIVE_READ_PROFILE(
I active_num_file,
I nactive_var,
O active_var,
Expand All @@ -28,63 +28,63 @@ subroutine active_read_profile(
I myOptimIter,
I bi,
I bj,
I mythid,
I myThid,
I dummy
& )

c ==================================================================
c SUBROUTINE active_read_profile
c ==================================================================
c o Read an active 1D record from an profile data file.
c ==================================================================
C ==================================================================
C SUBROUTINE active_read_profile
C ==================================================================
C o Read an active 1D record from an profile data file.
C ==================================================================

implicit none
c == global variables ==
IMPLICIT NONE
C == global variables ==
#include "EEPARAMS.h"
#include "SIZE.h"
#ifdef ALLOW_PROFILES
# include "PROFILES_SIZE.h"
# include "profiles.h"
#endif

c == routine arguments ==
c active_var_file: filename
c nactive_var: integer size of active_var
c active_var: array
c active_varname: name fo the quantity to save
c irec: record number
c myOptimIter: number of optimization iteration (default: 0)
c mythid: thread number for this instance
c lAdInit: initialisation of corresponding adjoint
c variable and write to active file
integer nactive_var,active_num_file
_RL active_var(nactive_var)
integer irec,active_varnum
integer myOptimIter
integer bi,bj,mythid
logical lAdInit
C == routine arguments ==
C active_var_file: filename
C nactive_var: integer size of active_var
C active_var: array
C active_varname: name fo the quantity to save
C irec: record number
C myOptimIter: number of optimization iteration (default: 0)
C myThid: thread number for this instance
C lAdInit: initialisation of corresponding adjoint
C variable and write to active file
INTEGER nactive_var,active_num_file
_RL active_var(nactive_var)
INTEGER irec,active_varnum
INTEGER myOptimIter
INTEGER bi,bj,myThid
LOGICAL lAdInit
_RL dummy

#ifdef ALLOW_PROFILES

call active_read_profile_rl( fidforward(active_num_file,bi,bj),
CALL ACTIVE_READ_PROFILE_RL( fidforward(active_num_file,bi,bj),
& active_num_file,
& nactive_var, active_var, active_varnum, lAdInit,
& irec, prof_ind_glob(active_num_file,irec,bi,bj),
& FORWARD_SIMULATION, myOptimIter,bi,bj, mythid)
& FORWARD_SIMULATION, myOptimIter,bi,bj, myThid)

#endif

return
end
RETURN
END

c ==================================================================
c ==================================================================
c ==================================================================
C ==================================================================
C ==================================================================
C ==================================================================

C !ROUTINE: active_write_profile
C !INTERFACE:
subroutine active_write_profile(
SUBROUTINE ACTIVE_WRITE_PROFILE(
I active_num_file,
I nactive_var,
I active_var,
Expand All @@ -93,56 +93,55 @@ subroutine active_write_profile(
I myOptimIter,
I bi,
I bj,
I mythid,
I myThid,
I dummy
& )

C !DESCRIPTION: \bv
c ==================================================================
c SUBROUTINE active_write_profile
c ==================================================================
c o Write an active 1D record from file.
c ==================================================================
C ==================================================================
C SUBROUTINE active_write_profile
C ==================================================================
C o Write an active 1D record from file.
C ==================================================================

C !USES:
implicit none
IMPLICIT NONE

c == global variables ==
C == global variables ==
#include "EEPARAMS.h"
#include "SIZE.h"
#ifdef ALLOW_PROFILES
# include "PROFILES_SIZE.h"
# include "profiles.h"
#endif

c == routine arguments ==
c active_var_file: filename
c nactive_var: integer size of active_var
c active_var: array
c active_varname: name fo the quantity to save
c irec: record number
c myOptimIter: number of optimization iteration (default: 0)
c mythid: thread number for this instance
integer nactive_var,active_num_file, active_varnum
_RL active_var(nactive_var)
integer irec
integer myOptimIter
integer bi,bj,mythid
C == routine arguments ==
C active_var_file: filename
C nactive_var: integer size of active_var
C active_var: array
C active_varname: name fo the quantity to save
C irec: record number
C myOptimIter: number of optimization iteration (default: 0)
C myThid: thread number for this instance
INTEGER nactive_var,active_num_file, active_varnum
_RL active_var(nactive_var)
INTEGER irec
INTEGER myOptimIter
INTEGER bi,bj,myThid
_RL dummy

#ifdef ALLOW_PROFILES

call active_write_profile_rl( fidforward(active_num_file,bi,bj),
CALL ACTIVE_WRITE_PROFILE_RL( fidforward(active_num_file,bi,bj),
& active_num_file,
& nactive_var, active_var, active_varnum,
& irec, prof_ind_glob(active_num_file,irec,bi,bj),
& FORWARD_SIMULATION, myOptimIter,bi,bj, mythid)
& FORWARD_SIMULATION, myOptimIter,bi,bj, myThid)

#endif

return
end

c ==================================================================
RETURN
END

C ==================================================================

Loading

0 comments on commit 0c953e8

Please sign in to comment.