2 C Read the PDB file and convert the peptide geometry into virtual-chain
4 implicit real*8 (a-h,o-z)
9 include 'COMMON.INTERACT'
10 include 'COMMON.IOUNITS'
12 include 'COMMON.NAMES'
13 include 'COMMON.CONTROL'
14 include 'COMMON.DISTFIT'
15 include 'COMMON.SETUP'
16 character*3 seq,atom,res
19 double precision e1(3),e2(3),e3(3)
27 read (ipdbin,'(a80)',end=10) card
28 if (card(:5).eq.'HELIX') then
31 read(card(22:25),*) hfrag(1,nhfrag)
32 read(card(34:37),*) hfrag(2,nhfrag)
34 if (card(:5).eq.'SHEET') then
37 read(card(24:26),*) bfrag(1,nbfrag)
38 read(card(35:37),*) bfrag(2,nbfrag)
39 crc----------------------------------------
40 crc to be corrected !!!
41 bfrag(3,nbfrag)=bfrag(1,nbfrag)
42 bfrag(4,nbfrag)=bfrag(2,nbfrag)
43 crc----------------------------------------
45 if (card(:3).eq.'END' .or. card(:3).eq.'TER') goto 10
46 C Fish out the ATOM cards.
47 if (index(card(1:4),'ATOM').gt.0) then
48 read (card(14:16),'(a3)') atom
49 if (atom.eq.'CA' .or. atom.eq.'CH3') then
50 C Calculate the CM of the preceding residue.
54 dc(j,ires+nres)=sccor(j,iii)
57 call sccenter(ires,iii,sccor)
61 read (card(24:26),*) ires
62 read (card(18:20),'(a3)') res
65 if (res.ne.'GLY' .and. res.ne. 'ACE') then
72 if (res.eq.'ACE') then
75 itype(ires)=rescode(ires,res,0)
77 read(card(31:54),'(3f8.3)') (c(j,ires),j=1,3)
78 c if(me.eq.king.or..not.out1file)
79 c & write (iout,'(2i3,2x,a,3f8.3)')
80 c & ires,itype(ires),res,(c(j,ires),j=1,3)
83 sccor(j,iii)=c(j,ires)
85 else if (atom.ne.'O '.and.atom(1:1).ne.'H' .and.
86 & atom.ne.'N ' .and. atom.ne.'C ') then
88 read(card(31:54),'(3f8.3)') (sccor(j,iii),j=1,3)
92 10 if(me.eq.king.or..not.out1file)
93 & write (iout,'(a,i5)') ' Nres: ',ires
94 C Calculate the CM of the last side chain.
97 dc(j,ires+nres)=sccor(j,iii)
100 call sccenter(ires,iii,sccor)
105 if (itype(nres).ne.10) then
109 C 2/15/2013 by Adam: corrected insertion of the last dummy residue
110 call refsys(nres-3,nres-2,nres-1,e1,e2,e3,fail)
117 c(j,nres)=c(j,nres-1)-3.8d0*e2(j)
121 dcj=c(j,nres-2)-c(j,nres-3)
122 c(j,nres)=c(j,nres-1)+dcj
123 c(j,2*nres)=c(j,nres)
134 c(j,2*nres)=c(j,nres)
136 if (itype(1).eq.21) then
140 C 2/15/2013 by Adam: corrected insertion of the first dummy residue
141 call refsys(2,3,4,e1,e2,e3,fail)
148 c(j,1)=c(j,2)-3.8d0*e2(j)
158 C Calculate internal coordinates.
159 if(me.eq.king.or..not.out1file)then
161 & "Backbone and SC coordinates as read from the PDB"
163 write (iout,'(2i3,2x,a,3f8.3,5x,3f8.3)')
164 & ires,itype(ires),restyp(itype(ires)),(c(j,ires),j=1,3),
165 & (c(j,nres+ires),j=1,3)
168 call int_from_cart(.true.,.false.)
169 call sc_loc_geom(.false.)
176 dc(j,i)=c(j,i+1)-c(j,i)
177 dc_norm(j,i)=dc(j,i)*vbld_inv(i+1)
182 dc(j,i+nres)=c(j,i+nres)-c(j,i)
183 dc_norm(j,i+nres)=dc(j,i+nres)*vbld_inv(i+nres)
185 c write (iout,*) i,(dc(j,i+nres),j=1,3),(dc_norm(j,i+nres),j=1,3),
189 C Copy the coordinates to reference coordinates
199 bfrag(i,j)=bfrag(i,j)-ishift
205 hfrag(i,j)=hfrag(i,j)-ishift
211 c---------------------------------------------------------------------------
212 subroutine int_from_cart(lside,lprn)
213 implicit real*8 (a-h,o-z)
216 include 'COMMON.LOCAL'
218 include 'COMMON.CHAIN'
219 include 'COMMON.INTERACT'
220 include 'COMMON.IOUNITS'
222 include 'COMMON.NAMES'
223 include 'COMMON.CONTROL'
224 include 'COMMON.SETUP'
225 character*3 seq,atom,res
227 dimension sccor(3,20)
230 if(me.eq.king.or..not.out1file)then
233 & 'Internal coordinates calculated from crystal structure.'
235 write (iout,'(8a)') ' Res ',' dvb',' Theta',
236 & ' Gamma',' Dsc_id',' Dsc',' Alpha',
239 write (iout,'(4a)') ' Res ',' dvb',' Theta',
246 if (dist(i,i+1).lt.2.0D0 .or. dist(i,i+1).gt.5.0D0) then
247 write (iout,'(a,i4)') 'Bad Cartesians for residue',i
250 vbld(i+1)=dist(i,i+1)
251 vbld_inv(i+1)=1.0d0/vbld(i+1)
252 if (i.gt.1) theta(i+1)=alpha(i-1,i,i+1)
254 if (i.le.nres) phi(i+1)=beta(i-2,i-1,i,i+1)
255 if ((itype(i).ne.10).and.(itype(i-1).ne.10)) then
256 tauangle(3,i+1)=beta(i+nres-1,i-1,i,i+nres)
258 if (itype(i-1).ne.10) then
259 tauangle(1,i+1)=beta(i-1+nres,i-1,i,i+1)
260 omicron(1,i)=alpha(i-2,i-1,i-1+nres)
261 omicron(2,i)=alpha(i-1+nres,i-1,i)
263 if (itype(i).ne.10) then
264 tauangle(2,i+1)=beta(i-2,i-1,i,i+nres)
268 c if (unres_pdb) then
269 c if (itype(1).eq.21) then
270 c theta(3)=90.0d0*deg2rad
271 c phi(4)=180.0d0*deg2rad
273 c vbld_inv(2)=1.0d0/vbld(2)
275 c if (itype(nres).eq.21) then
276 c theta(nres)=90.0d0*deg2rad
277 c phi(nres)=180.0d0*deg2rad
279 c vbld_inv(nres)=1.0d0/vbld(2)
285 c(j,maxres2)=0.5D0*(2*c(j,i)+(c(j,i-1)-c(j,i))*vbld_inv(i)
286 & +(c(j,i+1)-c(j,i))*vbld_inv(i+1))
290 C 9/29/12 Adam: Correction for zero SC-SC bond length
291 if (itype(i).ne.10 .and. itype(i).ne.21. and. di.eq.0.0d0)
294 if (itype(i).ne.10) then
295 vbld_inv(i+nres)=1.0d0/di
297 vbld_inv(i+nres)=0.0d0
300 alph(i)=alpha(nres+i,i,maxres2)
301 omeg(i)=beta(nres+i,i,maxres2,i+1)
303 if(me.eq.king.or..not.out1file)then
305 & write (iout,'(a3,i4,7f10.3)') restyp(iti),i,vbld(i),
306 & rad2deg*theta(i),rad2deg*phi(i),dsc(iti),vbld(nres+i),
307 & rad2deg*alph(i),rad2deg*omeg(i)
313 if(me.eq.king.or..not.out1file)
314 & write (iout,'(a3,i4,7f10.3)') restyp(iti),i,dist(i,i-1),
315 & rad2deg*theta(i),rad2deg*phi(i)
320 c-------------------------------------------------------------------------------
321 subroutine sc_loc_geom(lprn)
322 implicit real*8 (a-h,o-z)
325 include 'COMMON.LOCAL'
327 include 'COMMON.CHAIN'
328 include 'COMMON.INTERACT'
329 include 'COMMON.IOUNITS'
331 include 'COMMON.NAMES'
332 include 'COMMON.CONTROL'
333 include 'COMMON.SETUP'
334 double precision x_prime(3),y_prime(3),z_prime(3)
338 dc_norm(j,i)=vbld_inv(i+1)*(c(j,i+1)-c(j,i))
342 if (itype(i).ne.10) then
344 dc_norm(j,i+nres)=vbld_inv(i+nres)*(c(j,i+nres)-c(j,i))
348 dc_norm(j,i+nres)=0.0d0
353 costtab(i+1) =dcos(theta(i+1))
354 sinttab(i+1) =dsqrt(1-costtab(i+1)*costtab(i+1))
355 cost2tab(i+1)=dsqrt(0.5d0*(1.0d0+costtab(i+1)))
356 sint2tab(i+1)=dsqrt(0.5d0*(1.0d0-costtab(i+1)))
357 cosfac2=0.5d0/(1.0d0+costtab(i+1))
358 cosfac=dsqrt(cosfac2)
359 sinfac2=0.5d0/(1.0d0-costtab(i+1))
360 sinfac=dsqrt(sinfac2)
364 C Compute the axes of tghe local cartesian coordinates system; store in
365 c x_prime, y_prime and z_prime
373 x_prime(j) = (dc_norm(j,i) - dc_norm(j,i-1))*cosfac
374 y_prime(j) = (dc_norm(j,i) + dc_norm(j,i-1))*sinfac
376 call vecpr(x_prime,y_prime,z_prime)
378 C Transform the unit vector of the ith side-chain centroid, dC_norm(*,i),
379 C to local coordinate system. Store in xx, yy, zz.
385 xx = xx + x_prime(j)*dc_norm(j,i+nres)
386 yy = yy + y_prime(j)*dc_norm(j,i+nres)
387 zz = zz + z_prime(j)*dc_norm(j,i+nres)
402 if(me.eq.king.or..not.out1file)
403 & write (iout,'(a3,i4,3f10.5)') restyp(iti),i,xxref(i),
409 c---------------------------------------------------------------------------
410 subroutine sccenter(ires,nscat,sccor)
411 implicit real*8 (a-h,o-z)
413 include 'COMMON.CHAIN'
414 dimension sccor(3,20)
418 sccmj=sccmj+sccor(j,i)
420 dc(j,ires)=sccmj/nscat
424 c---------------------------------------------------------------------------
425 subroutine bond_regular
426 implicit real*8 (a-h,o-z)
429 include 'COMMON.LOCAL'
430 include 'COMMON.CALC'
431 include 'COMMON.INTERACT'
432 include 'COMMON.CHAIN'
435 vbld_inv(i+1)=1.0d0/vbld(i+1)
436 vbld(i+1+nres)=dsc(itype(i+1))
437 vbld_inv(i+1+nres)=dsc_inv(itype(i+1))
438 c print *,vbld(i+1),vbld(i+1+nres)