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') then
47 else if (card(:3).eq.'TER') then
52 c write (iout,*) "Chain ended",ires,ishift,ires_old
55 dc(j,ires)=sccor(j,iii)
58 call sccenter(ires,iii,sccor)
61 C Fish out the ATOM cards.
62 if (index(card(1:4),'ATOM').gt.0) then
63 read (card(14:16),'(a3)') atom
64 if (atom.eq.'CA' .or. atom.eq.'CH3') then
65 C Calculate the CM of the preceding residue.
69 dc(j,ires+nres)=sccor(j,iii)
72 call sccenter(ires,iii,sccor)
76 c write (iout,'(a80)') card
77 read (card(24:26),*) ires
78 read (card(18:20),'(a3)') res
81 if (res.ne.'GLY' .and. res.ne. 'ACE') then
85 c write (iout,*) "ires",ires," ibeg",ibeg," ishift",ishift
87 else if (ibeg.eq.2) then
89 ishift=-ires_old+ires-1
90 c write (iout,*) "New chain started",ires,ishift
94 c write (2,*) "ires",ires," ishift",ishift
95 if (res.eq.'ACE') then
98 itype(ires)=rescode(ires,res,0)
100 read(card(31:54),'(3f8.3)') (c(j,ires),j=1,3)
101 if(me.eq.king.or..not.out1file)
102 & write (iout,'(2i3,2x,a,3f8.3)')
103 & ires,itype(ires),res,(c(j,ires),j=1,3)
106 sccor(j,iii)=c(j,ires)
108 else if (atom.ne.'O '.and.atom(1:1).ne.'H' .and.
109 & atom.ne.'N ' .and. atom.ne.'C ') then
111 read(card(31:54),'(3f8.3)') (sccor(j,iii),j=1,3)
115 10 if(me.eq.king.or..not.out1file)
116 & write (iout,'(a,i5)') ' Nres: ',ires
117 C Calculate dummy residue coordinates inside the "chain" of a multichain
121 c write (iout,*) i,itype(i)
122 if (itype(i).eq.21) then
123 c write (iout,*) "dummy",i,itype(i)
125 c(j,i)=((c(j,i-1)+c(j,i+1))/2+2*c(j,i-1)-c(j,i-2))/2
126 c c(j,i)=(c(j,i-1)+c(j,i+1))/2
131 C Calculate the CM of the last side chain.
134 dc(j,ires)=sccor(j,iii)
137 call sccenter(ires,iii,sccor)
141 if (itype(nres).ne.10) then
145 C 2/15/2013 by Adam: corrected insertion of the last dummy residue
146 call refsys(nres-3,nres-2,nres-1,e1,e2,e3,fail)
153 c(j,nres)=c(j,nres-1)-3.8d0*e2(j)
157 dcj=c(j,nres-2)-c(j,nres-3)
158 c(j,nres)=c(j,nres-1)+dcj
159 c(j,2*nres)=c(j,nres)
170 c(j,2*nres)=c(j,nres)
172 if (itype(1).eq.21) then
176 C 2/15/2013 by Adam: corrected insertion of the first dummy residue
177 call refsys(2,3,4,e1,e2,e3,fail)
184 c(j,1)=c(j,2)-3.8d0*e2(j)
194 C Calculate internal coordinates.
195 if(me.eq.king.or..not.out1file)then
197 write (iout,'(2i3,2x,a,3f8.3,5x,3f8.3)')
198 & ires,itype(ires),restyp(itype(ires)),(c(j,ires),j=1,3),
199 & (c(j,nres+ires),j=1,3)
202 call int_from_cart(.true.,.false.)
203 call sc_loc_geom(.true.)
210 dc(j,i)=c(j,i+1)-c(j,i)
211 dc_norm(j,i)=dc(j,i)*vbld_inv(i+1)
216 dc(j,i+nres)=c(j,i+nres)-c(j,i)
217 dc_norm(j,i+nres)=dc(j,i+nres)*vbld_inv(i+nres)
219 c write (iout,*) i,(dc(j,i+nres),j=1,3),(dc_norm(j,i+nres),j=1,3),
223 C Copy the coordinates to reference coordinates
224 C Splits to single chain if occurs
230 cc write (iout,*) "spraw lancuchy",(c(j,i),j=1,3)
232 if ((itype(i-1).eq.21)) then
235 c write (iout,*) "spraw lancuchy",(c(j,i),j=1,3)
241 cref(j,i+nres,cou)=c(j,i+nres)
243 chain_rep(j,lll,kkk)=c(j,i)
244 chain_rep(j,lll+nres,kkk)=c(j,i+nres)
249 chain_rep(j,chain_length,symetr)=chain_rep(j,chain_length,1)
250 chain_rep(j,chain_length+nres,symetr)
251 &=chain_rep(j,chain_length+nres,1)
254 c write (iout,*) "spraw lancuchy",chain_length,symetr
256 c do kkk=1,chain_length
257 c write (iout,*) itype(kkk),(chain_rep(j,kkk,i), j=1,3)
261 C makes copy of chains
262 write (iout,*) "symetr", symetr
264 if (symetr.gt.1) then
271 write(iout,*) (tabperm(i,kkk),kkk=1,4)
277 c write (iout,*) i,icha
278 do lll=1,chain_length
280 if (cou.le.nres) then
282 kupa=mod(lll,chain_length)
283 iprzes=(kkk-1)*chain_length+lll
284 if (kupa.eq.0) kupa=chain_length
285 c write (iout,*) "kupa", kupa
286 cref(j,iprzes,i)=chain_rep(j,kupa,icha)
287 cref(j,iprzes+nres,i)=chain_rep(j,kupa+nres,icha)
294 C-koniec robienia kopii
297 write (iout,*) "nowa struktura", nperm
299 write (iout,110) restyp(itype(i)),i,cref(1,i,kkk),
301 &cref(3,i,kkk),cref(1,nres+i,kkk),
302 &cref(2,nres+i,kkk),cref(3,nres+i,kkk)
304 100 format (//' alpha-carbon coordinates ',
305 & ' centroid coordinates'/
306 1 ' ', 6X,'X',11X,'Y',11X,'Z',
307 & 10X,'X',11X,'Y',11X,'Z')
308 110 format (a,'(',i3,')',6f12.5)
314 bfrag(i,j)=bfrag(i,j)-ishift
320 hfrag(i,j)=hfrag(i,j)-ishift
326 c---------------------------------------------------------------------------
327 subroutine int_from_cart(lside,lprn)
328 implicit real*8 (a-h,o-z)
333 include 'COMMON.LOCAL'
335 include 'COMMON.CHAIN'
336 include 'COMMON.INTERACT'
337 include 'COMMON.IOUNITS'
339 include 'COMMON.NAMES'
340 include 'COMMON.CONTROL'
341 include 'COMMON.SETUP'
342 character*3 seq,atom,res
344 dimension sccor(3,20)
348 if(me.eq.king.or..not.out1file)then
352 & 'Internal coordinates calculated from crystal structure.'
354 write (iout,'(8a)') ' Res ',' dvb',' Theta',
355 & ' Phi',' Dsc_id',' Dsc',' Alpha',
358 write (iout,'(4a)') ' Res ',' dvb',' Theta',
367 if (iti.ne.21 .and. itype(i+1).ne.21 .and.
368 & (dist(i,i+1).lt.2.0D0 .or. dist(i,i+1).gt.5.0D0)) then
369 write (iout,'(a,i4)') 'Bad Cartesians for residue',i
372 vbld(i+1)=dist(i,i+1)
373 vbld_inv(i+1)=1.0d0/vbld(i+1)
374 if (i.gt.1) theta(i+1)=alpha(i-1,i,i+1)
375 if (i.gt.2) phi(i+1)=beta(i-2,i-1,i,i+1)
377 c if (unres_pdb) then
378 c if (itype(1).eq.21) then
379 c theta(3)=90.0d0*deg2rad
380 c phi(4)=180.0d0*deg2rad
382 c vbld_inv(2)=1.0d0/vbld(2)
384 c if (itype(nres).eq.21) then
385 c theta(nres)=90.0d0*deg2rad
386 c phi(nres)=180.0d0*deg2rad
388 c vbld_inv(nres)=1.0d0/vbld(2)
394 c(j,maxres2)=0.5D0*(2*c(j,i)+(c(j,i-1)-c(j,i))*vbld_inv(i)
395 & +(c(j,i+1)-c(j,i))*vbld_inv(i+1))
400 if (itype(i).ne.10) then
401 vbld_inv(i+nres)=1.0d0/di
403 vbld_inv(i+nres)=0.0d0
406 alph(i)=alpha(nres+i,i,maxres2)
407 omeg(i)=beta(nres+i,i,maxres2,i+1)
409 if(me.eq.king.or..not.out1file)then
411 & write (iout,'(a3,i4,7f10.3)') restyp(iti),i,vbld(i),
412 & rad2deg*theta(i),rad2deg*phi(i),dsc(iti),vbld(nres+i),
413 & rad2deg*alph(i),rad2deg*omeg(i)
419 if(me.eq.king.or..not.out1file)
420 & write (iout,'(a3,i4,7f10.3)') restyp(iti),i,dist(i,i-1),
421 & rad2deg*theta(i),rad2deg*phi(i)
426 c-------------------------------------------------------------------------------
427 subroutine sc_loc_geom(lprn)
428 implicit real*8 (a-h,o-z)
433 include 'COMMON.LOCAL'
435 include 'COMMON.CHAIN'
436 include 'COMMON.INTERACT'
437 include 'COMMON.IOUNITS'
439 include 'COMMON.NAMES'
440 include 'COMMON.CONTROL'
441 include 'COMMON.SETUP'
442 double precision x_prime(3),y_prime(3),z_prime(3)
446 dc_norm(j,i)=vbld_inv(i+1)*(c(j,i+1)-c(j,i))
450 if (itype(i).ne.10 .and. itype(i).ne.21) then
452 dc_norm(j,i+nres)=vbld_inv(i+nres)*(c(j,i+nres)-c(j,i))
456 dc_norm(j,i+nres)=0.0d0
461 costtab(i+1) =dcos(theta(i+1))
462 sinttab(i+1) =dsqrt(1-costtab(i+1)*costtab(i+1))
463 cost2tab(i+1)=dsqrt(0.5d0*(1.0d0+costtab(i+1)))
464 sint2tab(i+1)=dsqrt(0.5d0*(1.0d0-costtab(i+1)))
465 cosfac2=0.5d0/(1.0d0+costtab(i+1))
466 cosfac=dsqrt(cosfac2)
467 sinfac2=0.5d0/(1.0d0-costtab(i+1))
468 sinfac=dsqrt(sinfac2)
470 if (it.ne.10 .and. itype(i).ne.21) then
472 C Compute the axes of tghe local cartesian coordinates system; store in
473 c x_prime, y_prime and z_prime
481 x_prime(j) = (dc_norm(j,i) - dc_norm(j,i-1))*cosfac
482 y_prime(j) = (dc_norm(j,i) + dc_norm(j,i-1))*sinfac
484 call vecpr(x_prime,y_prime,z_prime)
486 C Transform the unit vector of the ith side-chain centroid, dC_norm(*,i),
487 C to local coordinate system. Store in xx, yy, zz.
493 xx = xx + x_prime(j)*dc_norm(j,i+nres)
494 yy = yy + y_prime(j)*dc_norm(j,i+nres)
495 zz = zz + z_prime(j)*dc_norm(j,i+nres)
511 if(me.eq.king.or..not.out1file)
512 & write (iout,'(a3,i4,3f10.5)') restyp(iti),i,xxref(i),
515 write (iout,'(a3,i4,3f10.5)') restyp(iti),i,xxref(i),yyref(i),
522 c---------------------------------------------------------------------------
523 subroutine sccenter(ires,nscat,sccor)
524 implicit real*8 (a-h,o-z)
526 include 'COMMON.CHAIN'
527 dimension sccor(3,20)
531 sccmj=sccmj+sccor(j,i)
533 dc(j,ires)=sccmj/nscat
537 c---------------------------------------------------------------------------
538 subroutine bond_regular
539 implicit real*8 (a-h,o-z)
542 include 'COMMON.LOCAL'
543 include 'COMMON.CALC'
544 include 'COMMON.INTERACT'
545 include 'COMMON.CHAIN'
548 vbld_inv(i+1)=1.0d0/vbld(i+1)
549 vbld(i+1+nres)=dsc(itype(i+1))
550 vbld_inv(i+1+nres)=dsc_inv(itype(i+1))
551 c print *,vbld(i+1),vbld(i+1+nres)