2 C Read the PDB file and convert the peptide geometry into virtual-chain
4 implicit real*8 (a-h,o-z)
6 include 'DIMENSIONS.ZSCOPT'
7 include 'DIMENSIONS.FREE'
11 include 'COMMON.CHAIN'
12 include 'COMMON.INTERACT'
13 include 'COMMON.IOUNITS'
15 include 'COMMON.NAMES'
16 include 'COMMON.CONTROL'
17 c include 'COMMON.DISTFIT'
18 include 'COMMON.SETUP'
19 integer i,j,ibeg,ishift1,ires,iii,ires_old,ishift,ity
21 logical lprn /.false./,fail
22 double precision e1(3),e2(3),e3(3)
23 double precision dcj,efree_temp
27 double precision sccor(3,20)
34 c write (2,*) "UNRES_PDB",unres_pdb
42 read (ipdbin,'(a80)',end=10) card
43 c write (iout,'(a)') card
44 if (card(:5).eq.'HELIX') then
47 read(card(22:25),*) hfrag(1,nhfrag)
48 read(card(34:37),*) hfrag(2,nhfrag)
50 if (card(:5).eq.'SHEET') then
53 read(card(24:26),*) bfrag(1,nbfrag)
54 read(card(35:37),*) bfrag(2,nbfrag)
55 crc----------------------------------------
56 crc to be corrected !!!
57 bfrag(3,nbfrag)=bfrag(1,nbfrag)
58 bfrag(4,nbfrag)=bfrag(2,nbfrag)
59 crc----------------------------------------
61 if (card(:3).eq.'END' .or. card(:3).eq.'TER') goto 10
63 if (index(card,"FREE ENERGY").gt.0) read(card(35:),*) efree_temp
64 C Fish out the ATOM cards.
65 if (index(card(1:4),'ATOM').gt.0) then
66 read (card(12:16),*) atom
67 c write (iout,*) "! ",atom," !",ires
68 c if (atom.eq.'CA' .or. atom.eq.'CH3') then
69 read (card(23:26),*) ires
70 read (card(18:20),'(a3)') res
71 c write (iout,*) "ires",ires,ires-ishift+ishift1,
72 c & " ires_old",ires_old
73 c write (iout,*) "ishift",ishift," ishift1",ishift1
74 c write (iout,*) "IRES",ires-ishift+ishift1,ires_old
75 if (ires-ishift+ishift1.ne.ires_old) then
76 C Calculate the CM of the preceding residue.
77 c if (ibeg.eq.0) call sccenter(ires,iii,sccor)
79 c write (iout,*) "Calculating sidechain center iii",iii
82 c dc(j,ires)=sccor(j,iii)
85 call sccenter(ires_old,iii,sccor)
90 if (res.eq.'Cl-' .or. res.eq.'Na+') then
93 else if (ibeg.eq.1) then
94 c write (iout,*) "BEG ires",ires
96 if (res.ne.'GLY' .and. res.ne. 'ACE') then
100 ires=ires-ishift+ishift1
102 c write (iout,*) "ishift",ishift," ires",ires,
103 c & " ires_old",ires_old
106 ishift=ishift-(ires-ishift+ishift1-ires_old-1)
107 ires=ires-ishift+ishift1
110 if (res.eq.'ACE' .or. res.eq.'NHE') then
113 itype(ires)=rescode(ires,res,0)
116 ires=ires-ishift+ishift1
118 c write (iout,*) "ires_old",ires_old," ires",ires
119 if (card(27:27).eq."A" .or. card(27:27).eq."B") then
122 c write (2,*) "ires",ires," res ",res," ity",ity
123 if (atom.eq.'CA' .or. atom.eq.'CH3' .or.
124 & res.eq.'NHE'.and.atom(:2).eq.'HN') then
125 read(card(31:54),'(3f8.3)') (c(j,ires),j=1,3)
126 c write (iout,*) "backbone ",atom
128 write (iout,'(2i3,2x,a,3f8.3)')
129 & ires,itype(ires),res,(c(j,ires),j=1,3)
133 sccor(j,iii)=c(j,ires)
135 if (ishift.ne.0) then
136 ires_ca=ires+ishift-ishift1
140 c write (*,*) card(23:27),ires,itype(ires)
141 else if (atom.ne.'O'.and.atom(1:1).ne.'H' .and.
142 & atom.ne.'N' .and. atom.ne.'C' .and.
143 & atom(:2).ne.'1H' .and. atom(:2).ne.'2H' .and.
144 & atom.ne.'OXT' .and. atom(:2).ne.'3H') then
145 c write (iout,*) "sidechain ",atom
147 read(card(31:54),'(3f8.3)') (sccor(j,iii),j=1,3)
153 write (iout,'(a,i5)') ' Number of residues found: ',ires
155 if (ires.eq.0) return
156 C Calculate the CM of the last side chain.
158 c if (unres_pdb) then
160 c dc(j,ires)=sccor(j,iii)
163 call sccenter(ires,iii,sccor)
169 if (itype(nres).ne.10) then
173 dcj=c(j,nres-2)-c(j,nres-3)
174 c(j,nres)=c(j,nres-1)+dcj
175 c(j,2*nres)=c(j,nres)
185 c(j,2*nres)=c(j,nres)
187 if (itype(1).eq.21) then
190 c if (unres_pdb) then
191 C 2/15/2013 by Adam: corrected insertion of the first dummy residue
192 c call refsys(2,3,4,e1,e2,e3,fail)
199 c c(j,1)=c(j,2)-3.8d0*e2(j)
209 C Copy the coordinates to reference coordinates
215 C Calculate internal coordinates.
218 & "Cartesian coordinates of the reference structure"
219 write (iout,'(a,3(3x,a5),5x,3(3x,a5))')
220 & "Residue","X(CA)","Y(CA)","Z(CA)","X(SC)","Y(SC)","Z(SC)"
222 write (iout,'(a3,1x,i3,3f8.3,5x,3f8.3)')
223 & restyp(itype(ires)),ires,(c(j,ires),j=1,3),
224 & (c(j,ires+nres),j=1,3)
227 C Calculate internal coordinates.
228 if(me.eq.king.or..not.out1file)then
230 & "Backbone and SC coordinates as read from the PDB"
232 write (iout,'(2i3,2x,a,3f8.3,5x,3f8.3)')
233 & ires,itype(ires),restyp(itype(ires)),(c(j,ires),j=1,3),
234 & (c(j,nres+ires),j=1,3)
237 call int_from_cart1(.false.)
238 call int_from_cart(.true.,.false.)
239 call sc_loc_geom(.false.)
245 theta_ref(i)=theta(i)
253 dc(j,i)=c(j,i+1)-c(j,i)
254 dc_norm(j,i)=dc(j,i)*vbld_inv(i+1)
259 dc(j,i+nres)=c(j,i+nres)-c(j,i)
260 dc_norm(j,i+nres)=dc(j,i+nres)*vbld_inv(i+nres)
262 c write (iout,*) i,(dc(j,i+nres),j=1,3),(dc_norm(j,i+nres),j=1,3),
267 C Copy the coordinates to reference coordinates
277 bfrag(i,j)=bfrag(i,j)-ishift
283 hfrag(i,j)=hfrag(i,j)-ishift
289 c---------------------------------------------------------------------------
290 subroutine int_from_cart(lside,lprn)
291 implicit real*8 (a-h,o-z)
293 include 'DIMENSIONS.ZSCOPT'
294 include 'DIMENSIONS.FREE'
298 include 'COMMON.LOCAL'
300 include 'COMMON.CHAIN'
301 include 'COMMON.INTERACT'
302 include 'COMMON.IOUNITS'
304 include 'COMMON.NAMES'
305 include 'COMMON.CONTROL'
306 include 'COMMON.SETUP'
307 character*3 seq,atom,res
310 double precision sccor(3,20)
311 c dimension sccor(3,20)
314 double precision dist,alpha,beta,di
315 if(me.eq.king.or..not.out1file)then
318 & 'Internal coordinates calculated from crystal structure.'
320 write (iout,'(8a)') ' Res ',' dvb',' Theta',
321 & ' Gamma',' Dsc_id',' Dsc',' Alpha',
324 write (iout,'(4a)') ' Res ',' dvb',' Theta',
331 if (dist(i,i+1).lt.2.0D0 .or. dist(i,i+1).gt.5.0D0) then
332 write (iout,'(a,i4)') 'Bad Cartesians for residue',i
335 vbld(i+1)=dist(i,i+1)
336 vbld_inv(i+1)=1.0d0/vbld(i+1)
337 if (i.gt.1) theta(i+1)=alpha(i-1,i,i+1)
338 if (i.gt.2) phi(i+1)=beta(i-2,i-1,i,i+1)
340 c if (unres_pdb) then
341 c if (itype(1).eq.21) then
342 c theta(3)=90.0d0*deg2rad
343 c phi(4)=180.0d0*deg2rad
345 c vbld_inv(2)=1.0d0/vbld(2)
347 c if (itype(nres).eq.21) then
348 c theta(nres)=90.0d0*deg2rad
349 c phi(nres)=180.0d0*deg2rad
351 c vbld_inv(nres)=1.0d0/vbld(2)
357 c(j,maxres2)=0.5D0*(2*c(j,i)+(c(j,i-1)-c(j,i))*vbld_inv(i)
358 & +(c(j,i+1)-c(j,i))*vbld_inv(i+1))
362 C 10/03/12 Adam: Correction for zero SC-SC bond length
363 if (itype(i).ne.10 .and. itype(i).ne.21. and. di.eq.0.0d0)
366 if (itype(i).ne.10) then
367 vbld_inv(i+nres)=1.0d0/di
369 vbld_inv(i+nres)=0.0d0
372 alph(i)=alpha(nres+i,i,maxres2)
373 omeg(i)=beta(nres+i,i,maxres2,i+1)
375 if(me.eq.king.or..not.out1file)then
377 & write (iout,'(a3,i4,7f10.3)') restyp(iti),i,vbld(i),
378 & rad2deg*theta(i),rad2deg*phi(i),dsc(iti),vbld(nres+i),
379 & rad2deg*alph(i),rad2deg*omeg(i)
385 if(me.eq.king.or..not.out1file)
386 & write (iout,'(a3,i4,7f10.3)') restyp(iti),i,dist(i,i-1),
387 & rad2deg*theta(i),rad2deg*phi(i)
392 c-------------------------------------------------------------------------------
393 subroutine sc_loc_geom(lprn)
394 implicit real*8 (a-h,o-z)
396 include 'DIMENSIONS.ZSCOPT'
397 include 'DIMENSIONS.FREE'
401 include 'COMMON.LOCAL'
403 include 'COMMON.CHAIN'
404 include 'COMMON.INTERACT'
405 include 'COMMON.IOUNITS'
407 include 'COMMON.NAMES'
408 include 'COMMON.CONTROL'
409 include 'COMMON.SETUP'
410 double precision x_prime(3),y_prime(3),z_prime(3)
414 dc_norm(j,i)=vbld_inv(i+1)*(c(j,i+1)-c(j,i))
418 if (itype(i).ne.10) then
420 dc_norm(j,i+nres)=vbld_inv(i+nres)*(c(j,i+nres)-c(j,i))
424 dc_norm(j,i+nres)=0.0d0
429 costtab(i+1) =dcos(theta(i+1))
430 sinttab(i+1) =dsqrt(1-costtab(i+1)*costtab(i+1))
431 cost2tab(i+1)=dsqrt(0.5d0*(1.0d0+costtab(i+1)))
432 sint2tab(i+1)=dsqrt(0.5d0*(1.0d0-costtab(i+1)))
433 cosfac2=0.5d0/(1.0d0+costtab(i+1))
434 cosfac=dsqrt(cosfac2)
435 sinfac2=0.5d0/(1.0d0-costtab(i+1))
436 sinfac=dsqrt(sinfac2)
440 C Compute the axes of tghe local cartesian coordinates system; store in
441 c x_prime, y_prime and z_prime
449 x_prime(j) = (dc_norm(j,i) - dc_norm(j,i-1))*cosfac
450 y_prime(j) = (dc_norm(j,i) + dc_norm(j,i-1))*sinfac
452 call vecpr(x_prime,y_prime,z_prime)
454 C Transform the unit vector of the ith side-chain centroid, dC_norm(*,i),
455 C to local coordinate system. Store in xx, yy, zz.
461 xx = xx + x_prime(j)*dc_norm(j,i+nres)
462 yy = yy + y_prime(j)*dc_norm(j,i+nres)
463 zz = zz + z_prime(j)*dc_norm(j,i+nres)
478 if(me.eq.king.or..not.out1file)
479 & write (iout,'(a3,i4,3f10.5)') restyp(iti),i,xxref(i),
485 c---------------------------------------------------------------------------
486 subroutine sccenter(ires,nscat,sccor)
487 implicit real*8 (a-h,o-z)
489 include 'COMMON.CHAIN'
490 dimension sccor(3,20)
494 sccmj=sccmj+sccor(j,i)
496 dc(j,ires)=sccmj/nscat
500 c---------------------------------------------------------------------------
501 subroutine bond_regular
502 implicit real*8 (a-h,o-z)
505 include 'COMMON.LOCAL'
506 include 'COMMON.CALC'
507 include 'COMMON.INTERACT'
508 include 'COMMON.CHAIN'
511 vbld_inv(i+1)=1.0d0/vbld(i+1)
512 vbld(i+1+nres)=dsc(itype(i+1))
513 vbld_inv(i+1+nres)=dsc_inv(itype(i+1))
514 c print *,vbld(i+1),vbld(i+1+nres)