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
25 read (ipdbin,'(a80)',end=10) card
26 if (card(:5).eq.'HELIX') then
29 read(card(22:25),*) hfrag(1,nhfrag)
30 read(card(34:37),*) hfrag(2,nhfrag)
32 if (card(:5).eq.'SHEET') then
35 read(card(24:26),*) bfrag(1,nbfrag)
36 read(card(35:37),*) bfrag(2,nbfrag)
37 crc----------------------------------------
38 crc to be corrected !!!
39 bfrag(3,nbfrag)=bfrag(1,nbfrag)
40 bfrag(4,nbfrag)=bfrag(2,nbfrag)
41 crc----------------------------------------
43 if (card(:3).eq.'END') then
45 else if (card(:3).eq.'TER') then
50 c write (iout,*) "Chain ended",ires,ishift,ires_old
53 dc(j,ires)=sccor(j,iii)
56 call sccenter(ires,iii,sccor)
59 C Fish out the ATOM cards.
60 if (index(card(1:4),'ATOM').gt.0) then
61 read (card(14:16),'(a3)') atom
62 if (atom.eq.'CA' .or. atom.eq.'CH3') then
63 C Calculate the CM of the preceding residue.
67 dc(j,ires+nres)=sccor(j,iii)
70 call sccenter(ires,iii,sccor)
74 c write (iout,'(a80)') card
75 read (card(24:26),*) ires
76 read (card(18:20),'(a3)') res
79 if (res.ne.'GLY' .and. res.ne. 'ACE') then
83 c write (iout,*) "ires",ires," ibeg",ibeg," ishift",ishift
85 else if (ibeg.eq.2) then
87 ishift=-ires_old+ires-1
88 c write (iout,*) "New chain started",ires,ishift
92 c write (2,*) "ires",ires," ishift",ishift
93 if (res.eq.'ACE') then
96 itype(ires)=rescode(ires,res,0)
98 read(card(31:54),'(3f8.3)') (c(j,ires),j=1,3)
99 if(me.eq.king.or..not.out1file)
100 & write (iout,'(2i3,2x,a,3f8.3)')
101 & ires,itype(ires),res,(c(j,ires),j=1,3)
104 sccor(j,iii)=c(j,ires)
106 else if (atom.ne.'O '.and.atom(1:1).ne.'H' .and.
107 & atom.ne.'N ' .and. atom.ne.'C ') then
109 read(card(31:54),'(3f8.3)') (sccor(j,iii),j=1,3)
113 10 if(me.eq.king.or..not.out1file)
114 & write (iout,'(a,i5)') ' Nres: ',ires
115 C Calculate dummy residue coordinates inside the "chain" of a multichain
119 c write (iout,*) i,itype(i)
120 if (itype(i).eq.21) then
121 c write (iout,*) "dummy",i,itype(i)
123 c(j,i)=((c(j,i-1)+c(j,i+1))/2+2*c(j,i-1)-c(j,i-2))/2
124 c c(j,i)=(c(j,i-1)+c(j,i+1))/2
129 C Calculate the CM of the last side chain.
132 dc(j,ires)=sccor(j,iii)
135 call sccenter(ires,iii,sccor)
139 if (itype(nres).ne.10) then
143 c(1,nres)=c(1,nres-1)+3.8d0
144 c(2,nres)=c(2,nres-1)
145 c(3,nres)=c(3,nres-1)
148 dcj=c(j,nres-2)-c(j,nres-3)
149 c(j,nres)=c(j,nres-1)+dcj
150 c(j,2*nres)=c(j,nres)
161 c(j,2*nres)=c(j,nres)
163 if (itype(1).eq.21) then
178 C Calculate internal coordinates.
179 if(me.eq.king.or..not.out1file)then
181 write (iout,'(2i3,2x,a,3f8.3,5x,3f8.3)')
182 & ires,itype(ires),restyp(itype(ires)),(c(j,ires),j=1,3),
183 & (c(j,nres+ires),j=1,3)
186 call int_from_cart(.true.,.false.)
187 call sc_loc_geom(.true.)
194 dc(j,i)=c(j,i+1)-c(j,i)
195 dc_norm(j,i)=dc(j,i)*vbld_inv(i+1)
200 dc(j,i+nres)=c(j,i+nres)-c(j,i)
201 dc_norm(j,i+nres)=dc(j,i+nres)*vbld_inv(i+nres)
203 c write (iout,*) i,(dc(j,i+nres),j=1,3),(dc_norm(j,i+nres),j=1,3),
207 C Copy the coordinates to reference coordinates
208 C Splits to single chain if occurs
214 cc write (iout,*) "spraw lancuchy",(c(j,i),j=1,3)
215 if ((itype(i-1).eq.21)) then
218 c write (iout,*) "spraw lancuchy",(c(j,i),j=1,3)
224 chain_rep(j,lll,kkk)=c(j,i)
225 chain_rep(j,lll+nres,kkk)=c(j,i+nres)
230 cc write (iout,*) "spraw lancuchy",chain_length,symetr
232 cc do kkk=1,chain_length
233 cc write (iout,*) itype(kkk),(chain_rep(j,kkk,i), j=1,3)
237 C makes copy of chains
238 c write (iout,*) "symetr", symetr
240 if (symetr.gt.1) then
247 write(iout,*) (tabperm(i,kkk),kkk=1,4)
252 write (iout,*) i,icha
253 do lll=1,chain_length
255 cref(j,lll,i)=chain_rep(j,lll,icha)
256 cref(j,lll+nres,i)=chain_rep(j,lll+nres,icha)
262 C-koniec robienia kopii
266 c write (iout,*) itype(lll),(cref(j,lll,kkk),j=1,3)
272 bfrag(i,j)=bfrag(i,j)-ishift
278 hfrag(i,j)=hfrag(i,j)-ishift
284 c---------------------------------------------------------------------------
285 subroutine int_from_cart(lside,lprn)
286 implicit real*8 (a-h,o-z)
291 include 'COMMON.LOCAL'
293 include 'COMMON.CHAIN'
294 include 'COMMON.INTERACT'
295 include 'COMMON.IOUNITS'
297 include 'COMMON.NAMES'
298 include 'COMMON.CONTROL'
299 include 'COMMON.SETUP'
300 character*3 seq,atom,res
302 dimension sccor(3,20)
306 if(me.eq.king.or..not.out1file)then
310 & 'Internal coordinates calculated from crystal structure.'
312 write (iout,'(8a)') ' Res ',' dvb',' Theta',
313 & ' Phi',' Dsc_id',' Dsc',' Alpha',
316 write (iout,'(4a)') ' Res ',' dvb',' Theta',
325 if (iti.ne.21 .and. itype(i+1).ne.21 .and.
326 & (dist(i,i+1).lt.2.0D0 .or. dist(i,i+1).gt.5.0D0)) then
327 write (iout,'(a,i4)') 'Bad Cartesians for residue',i
330 vbld(i+1)=dist(i,i+1)
331 vbld_inv(i+1)=1.0d0/vbld(i+1)
332 if (i.gt.1) theta(i+1)=alpha(i-1,i,i+1)
333 if (i.gt.2) phi(i+1)=beta(i-2,i-1,i,i+1)
335 c if (unres_pdb) then
336 c if (itype(1).eq.21) then
337 c theta(3)=90.0d0*deg2rad
338 c phi(4)=180.0d0*deg2rad
340 c vbld_inv(2)=1.0d0/vbld(2)
342 c if (itype(nres).eq.21) then
343 c theta(nres)=90.0d0*deg2rad
344 c phi(nres)=180.0d0*deg2rad
346 c vbld_inv(nres)=1.0d0/vbld(2)
352 c(j,maxres2)=0.5D0*(2*c(j,i)+(c(j,i-1)-c(j,i))*vbld_inv(i)
353 & +(c(j,i+1)-c(j,i))*vbld_inv(i+1))
358 if (itype(i).ne.10) then
359 vbld_inv(i+nres)=1.0d0/di
361 vbld_inv(i+nres)=0.0d0
364 alph(i)=alpha(nres+i,i,maxres2)
365 omeg(i)=beta(nres+i,i,maxres2,i+1)
367 if(me.eq.king.or..not.out1file)then
369 & write (iout,'(a3,i4,7f10.3)') restyp(iti),i,vbld(i),
370 & rad2deg*theta(i),rad2deg*phi(i),dsc(iti),vbld(nres+i),
371 & rad2deg*alph(i),rad2deg*omeg(i)
377 if(me.eq.king.or..not.out1file)
378 & write (iout,'(a3,i4,7f10.3)') restyp(iti),i,dist(i,i-1),
379 & rad2deg*theta(i),rad2deg*phi(i)
384 c-------------------------------------------------------------------------------
385 subroutine sc_loc_geom(lprn)
386 implicit real*8 (a-h,o-z)
391 include 'COMMON.LOCAL'
393 include 'COMMON.CHAIN'
394 include 'COMMON.INTERACT'
395 include 'COMMON.IOUNITS'
397 include 'COMMON.NAMES'
398 include 'COMMON.CONTROL'
399 include 'COMMON.SETUP'
400 double precision x_prime(3),y_prime(3),z_prime(3)
404 dc_norm(j,i)=vbld_inv(i+1)*(c(j,i+1)-c(j,i))
408 if (itype(i).ne.10 .and. itype(i).ne.21) then
410 dc_norm(j,i+nres)=vbld_inv(i+nres)*(c(j,i+nres)-c(j,i))
414 dc_norm(j,i+nres)=0.0d0
419 costtab(i+1) =dcos(theta(i+1))
420 sinttab(i+1) =dsqrt(1-costtab(i+1)*costtab(i+1))
421 cost2tab(i+1)=dsqrt(0.5d0*(1.0d0+costtab(i+1)))
422 sint2tab(i+1)=dsqrt(0.5d0*(1.0d0-costtab(i+1)))
423 cosfac2=0.5d0/(1.0d0+costtab(i+1))
424 cosfac=dsqrt(cosfac2)
425 sinfac2=0.5d0/(1.0d0-costtab(i+1))
426 sinfac=dsqrt(sinfac2)
428 if (it.ne.10 .and. itype(i).ne.21) then
430 C Compute the axes of tghe local cartesian coordinates system; store in
431 c x_prime, y_prime and z_prime
439 x_prime(j) = (dc_norm(j,i) - dc_norm(j,i-1))*cosfac
440 y_prime(j) = (dc_norm(j,i) + dc_norm(j,i-1))*sinfac
442 call vecpr(x_prime,y_prime,z_prime)
444 C Transform the unit vector of the ith side-chain centroid, dC_norm(*,i),
445 C to local coordinate system. Store in xx, yy, zz.
451 xx = xx + x_prime(j)*dc_norm(j,i+nres)
452 yy = yy + y_prime(j)*dc_norm(j,i+nres)
453 zz = zz + z_prime(j)*dc_norm(j,i+nres)
469 if(me.eq.king.or..not.out1file)
470 & write (iout,'(a3,i4,3f10.5)') restyp(iti),i,xxref(i),
473 write (iout,'(a3,i4,3f10.5)') restyp(iti),i,xxref(i),yyref(i),
480 c---------------------------------------------------------------------------
481 subroutine sccenter(ires,nscat,sccor)
482 implicit real*8 (a-h,o-z)
484 include 'COMMON.CHAIN'
485 dimension sccor(3,20)
489 sccmj=sccmj+sccor(j,i)
491 dc(j,ires)=sccmj/nscat
495 c---------------------------------------------------------------------------
496 subroutine bond_regular
497 implicit real*8 (a-h,o-z)
500 include 'COMMON.LOCAL'
501 include 'COMMON.CALC'
502 include 'COMMON.INTERACT'
503 include 'COMMON.CHAIN'
506 vbld_inv(i+1)=1.0d0/vbld(i+1)
507 vbld(i+1+nres)=dsc(itype(i+1))
508 vbld_inv(i+1+nres)=dsc_inv(itype(i+1))
509 c print *,vbld(i+1),vbld(i+1+nres)