dcdfort
Modern Fortran library for analyzing DCD trajectories
All Classes Namespaces Files Functions Variables Pages
Data Types | Functions/Subroutines
dcdfort_reader Module Reference

Module that contains dcdreader class. More...

Data Types

type  dcdfile
 dcdwriter class More...
 

Functions/Subroutines

subroutine dcdfile_open (this, filename)
 Opens file to read from. More...
 
subroutine dcdfile_read_header (this, nframes, istart, nevery, iend, timestep, natoms)
 Reads header of open DCD file. More...
 
subroutine dcdfile_close (this)
 Closes DCD file. More...
 
subroutine dcdfile_read_next (this, xyz, box)
 Reads next frame into memory. More...
 
subroutine dcdfile_skip_next (this, n)
 Skips reading this frame into memory. More...
 

Detailed Description

Module that contains dcdreader class.

Function/Subroutine Documentation

◆ dcdfile_close()

subroutine dcdfort_reader::dcdfile_close ( class(dcdfile), intent(inout)  this)
private

Closes DCD file.

Parameters
[in,out]thisdcdreader object
193 
194  implicit none
195  class(dcdfile), intent(inout) :: this
196 
197  deallocate(this%titles)
198  close(this%u)
199 

◆ dcdfile_open()

subroutine dcdfort_reader::dcdfile_open ( class(dcdfile), intent(inout)  this,
character(len=*), intent(in)  filename 
)

Opens file to read from.

Also detects if the DCD file is compatible with this library and swaps endinness if necessary.

Parameters
[in,out]thisdcdreader object
[in]filenamename of of DCD file to read from
59 
60  implicit none
61  character(len=*), parameter :: magic_string = "CORD"
62  integer(int32), parameter :: magic_number = 84
63  character(len=*), intent(in) :: filename
64  class(dcdfile), intent(inout) :: this
65  integer(kind=int32) :: line1, charmm_version, has_extra_block, four_dimensions
66  character(len=4) :: line2
67  logical :: ex
68 
69  ! Does file exist?
70  inquire(file=trim(filename), exist=ex, size=this%filesize)
71  if (ex .eqv. .false.) then
72  call error_stop_program("The specified DCD file '"//trim(filename)//"' does not exist.")
73  end if
74 
75  ! Open file in native endinness
76  open(newunit=this%u, file=trim(filename), form="unformatted", access="stream", status="old")
77 
78  ! Read in magic number of magic string
79  read(this%u,pos=1) line1
80  read(this%u) line2
81 
82  ! Ensure the magic number and string are correct, if not we'll swap the endinness
83  if (line1 .ne. magic_number .or. line2 .ne. magic_string) then
84 
85  ! Try converting to the reverse endianness
86  close(this%u)
87  open(newunit=this%u, file=trim(filename), form="unformatted", access="stream", status="old", convert="swap")
88 
89  read(this%u,pos=1) line2
90  read(this%u) line2
91 
92  ! We tried both native and reverse endiness and didn't have magic number or string
93  if (line1 .ne. magic_number .or. line2 .ne. magic_string) then
94  call error_stop_program("This DCD file format is not supported, or the file header is corrupt.")
95  end if
96 
97  end if
98 
99  ! Check if the file identifies as CHARMM (LAMMPS pretends to be CHARMM v. 24)
100  read(this%u, pos=85) charmm_version
101  if (charmm_version .eq. 0) then
102  call error_stop_program("DCD file indicates it is not CHARMM. Only CHARMM-style DCD files are supported.")
103  end if
104 
105  ! We only support files with the extra unitcell block
106  read(this%u, pos=49) has_extra_block
107  if (has_extra_block .ne. 1) then
108  call error_stop_program("DCD file indicates it does not have unit cell information. Only DCD files with&
109  & unit cell information are supported.")
110  end if
111 
112  ! We don't support files with four dimensions
113  read(this%u) four_dimensions
114  if (four_dimensions .eq. 1) then
115  call error_stop_program("DCD file indicates it has four dimensions. Only DCD files with three dimensions&
116  & are supported.")
117  end if
118 

◆ dcdfile_read_header()

subroutine dcdfort_reader::dcdfile_read_header ( class(dcdfile), intent(inout)  this,
integer(kind=int32), intent(out)  nframes,
integer(kind=int32), intent(out)  istart,
integer(kind=int32), intent(out)  nevery,
integer(kind=int32), intent(out)  iend,
real(kind=real32), intent(out)  timestep,
integer(kind=int32), intent(out)  natoms 
)
private

Reads header of open DCD file.

Should be called after open()

Parameters
[in,out]thisdcdreader object
[in]nframesrnumber of frames (snapshots) in file
[out]istartfirst timestep of trajectory file
[out]neveryhow often (in timesteps) file was written to
[out]iendlast timestep of trajectory file
[out]timesteptimestep of simulation
[out]natomsnumber of atoms in each snapshot
131 
132  implicit none
133 
134  integer(kind=int32), intent(out) :: nframes, istart, nevery, iend, natoms
135  integer(kind=int32) :: i, ntitle, n, dummy, pos
136  integer(kind=int64) :: nframes2
137  character(len=80) :: title_string
138  real(kind=real32), intent(out) :: timestep
139  class(dcdfile), intent(inout) :: this
140 
141  read(this%u, pos=9) nframes, istart, nevery, iend
142 
143  read(this%u, pos=45) timestep
144 
145  read(this%u, pos=97) ntitle
146  if (ntitle > 0) then
147  write(error_unit,'(a)') prompt//"The following titles were found:"
148  end if
149  allocate(this%titles(ntitle))
150  do i = 1, ntitle
151  read(this%u) title_string
152 
153  n = 1
154  do while (n .le. 80 .and. title_string(n:n) .ne. c_null_char)
155  n = n + 1
156  end do
157 
158  this%titles(i) = trim(title_string(1:n-1))
159  write(error_unit,'(a)') prompt//" "//this%titles(i)
160  end do
161 
162  read(this%u) dummy, dummy
163  if (dummy .ne. 4) then
164  call error_stop_program("This DCD file format is not supported, or the file header is corrupt.")
165  end if
166 
167  ! Number of atoms in each snapshot
168  read(this%u) natoms, dummy
169  if (dummy .ne. 4) then
170  call error_stop_program("This DCD file format is not supported, or the file header is corrupt.")
171  end if
172 
173  inquire(unit=this%u, pos=pos)
174  pos = pos - 1
175 
176  ! Each frame has natoms*3 (4 bytes each) = natoms*12
177  ! plus 6 box dimensions (8 bytes each) = 48
178  ! Additionally there are 32 bytes of file information in each frame
179  this%framesize = natoms*12 + 80
180  ! Header is typically 276 bytes, but inquire gives us exact size
181  nframes2 = (this%filesize-pos)/this%framesize
182  if ( nframes2 .ne. nframes) then
183  write(error_unit,'(a,i0,a,i0,a)') prompt//"WARNING: Header indicates ", nframes, &
184  &" frames, but file size indicates ", nframes2, "."
185  nframes = int(nframes2)
186  end if
187 

◆ dcdfile_read_next()

subroutine dcdfort_reader::dcdfile_read_next ( class(dcdfile), intent(inout)  this,
real(kind=real32), dimension(:,:), intent(inout), allocatable  xyz,
real(kind=real64), dimension(6), intent(inout)  box 
)
private

Reads next frame into memory.

Parameters
[in,out]thisdcdreader object
[in,out]xyzcoordinates of all atoms in snapshot. First dimension is atom number, second dimension is x, y, or z !coordinate.
[in,out]boxdimensions of snapshot. Array containing 6 elements, ordered as A, B, C, alpha, beta, gamma. A = length of unit cell vector along x-axis; B = length of unit cell vector in xy-plane; C = length of unit cell vector in yz-plane; alpha = cosine of angle between B and C; beta = cosine of angle between A and C; gamma = cosine of angle between A and B;
215 
216  implicit none
217  real(kind=real32), allocatable, intent(inout) :: xyz(:,:)
218  real(kind=real64), intent(inout) :: box(6)
219  integer(kind=int32) :: dummy(6), nbytes, ndims, i
220  class(dcdfile), intent(inout) :: this
221 
222  nbytes = size(xyz,1)*4
223  ndims = size(xyz,2)
224 
225  if (ndims /= 3) then
226  call error_stop_program("Number of dimensions of xyz array is incorrect.")
227  end if
228 
229  read(this%u) dummy(1)
230  if (dummy(1) /= 48) then
231  call error_stop_program("Problem reading in DCD snapshot.")
232  end if
233 
234  ! A gamma B beta alpha C
235  read(this%u) box(1), box(6), box(2), box(5), box(4), box(3)
236  if (box(1) < 0 .or. box(2) < 0 .or. box(3) < 0) then
237  call error_stop_program("Problem reading in DCD snapshot box dimensions.")
238  end if
239 
240  ! 48, then no. of bytes for x coordinates, x coordinates (repeat for y and z coordinates)
241  read(this%u) dummy(1:2), xyz(:,1), dummy(3:4), xyz(:,2), dummy(5:6), xyz(:,3)
242 
243  if (dummy(1) /= 48) then
244  call error_stop_program("Problem reading in DCD snapshot coordinates.")
245  end if
246 
247  do i = 2, 6
248  if (dummy(i) /= nbytes) then
249  call error_stop_program("Number of bytes in DCD snapshot is incorrect for size of xyz array passed.")
250  end if
251  end do
252 
253  read(this%u) dummy(1)
254  if (dummy(1) .ne. nbytes) then
255  call error_stop_program("Problem reading in DCD snapshot.")
256  end if
257 

◆ dcdfile_skip_next()

subroutine dcdfort_reader::dcdfile_skip_next ( class(dcdfile), intent(inout)  this,
integer(kind=int32), intent(in), optional  n 
)
private

Skips reading this frame into memory.

Parameters
[in,out]thisdcdreader object
[in]nnumber of frames to skip
264 
265  implicit none
266  integer(kind=int32) :: dummy
267  integer(kind=int64) :: pos, newpos
268  integer(kind=int32), intent(in), optional :: n
269  class(dcdfile), intent(inout) :: this
270 
271  ! Where are we?
272  inquire(unit=this%u, pos=pos)
273 
274  ! We subtract 4 bytes so that the next read of the 4-byte integer will line things up properly for the next read
275  if (.not. present(n)) then
276  newpos = pos + this%framesize - 4
277  else
278  newpos = pos + this%framesize*n - 4
279  end if
280 
281  read(this%u, pos=newpos) dummy
282