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 character*3 seq,atom,res
19 write(iout,*) 'pdbread'
21 read (ipdbin,'(a80)',end=10) card
22 if (card(:3).eq.'END') then
24 else if (card(:3).eq.'TER') then
27 itype(ires_old-1)=ntyp1
30 c write (iout,*) "Chain ended",ires,ishift,ires_old
31 call sccenter(ires,iii,sccor)
33 C Fish out the ATOM cards.
34 if (index(card(1:4),'ATOM').gt.0) then
35 read (card(14:16),'(a3)') atom
36 if (atom.eq.'CA' .or. atom.eq.'CH3') then
37 C Calculate the CM of the preceding residue.
39 call sccenter(ires,iii,sccor)
42 c write (iout,'(a80)') card
43 read (card(24:26),*) ires
44 read (card(18:20),'(a3)') res
47 if (res.ne.'GLY' .and. res.ne. 'ACE') then
51 c write (iout,*) "ires",ires," ibeg",ibeg," ishift",ishift
53 else if (ibeg.eq.2) then
55 ishift=-ires_old+ires-1
56 c write (iout,*) "New chain started",ires,ishift
60 c write (2,*) "ires",ires," ishift",ishift
61 if (res.eq.'ACE') then
64 itype(ires)=rescode(ires,res,0)
66 read(card(31:54),'(3f8.3)') (c(j,ires),j=1,3)
67 write (iout,'(2i3,2x,a,3f8.3)')
68 & ires,itype(ires),res,(c(j,ires),j=1,3)
71 sccor(j,iii)=c(j,ires)
73 else if (atom.ne.'O '.and.atom(1:1).ne.'H' .and.
74 & atom.ne.'N ' .and. atom.ne.'C ') then
76 read(card(31:54),'(3f8.3)') (sccor(j,iii),j=1,3)
80 10 write (iout,'(a,i5)') ' Nres: ',ires
81 C Calculate dummy residue coordinates inside the "chain" of a multichain
85 c write (iout,*) i,itype(i)
86 if (itype(i).eq.ntyp1) then
87 if (itype(i+1).eq.ntyp1) then
89 c write (iout,*) "dummy",i,itype(i)
91 C c(j,i)=((c(j,i-1)+c(j,i+1))/2+2*c(j,i-1)-c(j,i-2))/2
92 c c(j,i)=(c(j,i-1)+c(j,i+1))/2
96 dcj=(c(j,i-2)-c(j,i-3))/2.0
101 else !itype(i+1).eq.ntyp1
103 dcj=(c(j,i+3)-c(j,i+2))/2.0
108 endif !itype(i+1).eq.ntyp1
109 endif !itype.eq.ntyp1
111 C Calculate the CM of the last side chain.
112 call sccenter(ires,iii,sccor)
115 if (itype(nres).ne.10) then
119 dcj=(c(j,nres-2)-c(j,nres-3))/2.0
120 c(j,nres)=c(j,nres-1)+dcj
121 c(j,2*nres)=c(j,nres)
131 c(j,2*nres)=c(j,nres)
133 if (itype(1).eq.ntyp1) then
137 dcj=(c(j,4)-c(j,3))/2.0
142 C Calculate internal coordinates.
144 write (iout,'(2i3,2x,a,3f8.3,5x,3f8.3)')
145 & ires,itype(ires),restyp(itype(ires)),(c(j,ires),j=1,3),
146 & (c(j,nres+ires),j=1,3)
148 call int_from_cart1(.false.)
149 call int_from_cart(.true.,.false.)
150 call sc_loc_geom(.true.)
151 write (iout,*) "After int_from_cart"
155 dc(j,i)=c(j,i+1)-c(j,i)
156 dc_norm(j,i)=dc(j,i)*vbld_inv(i+1)
161 dc(j,i+nres)=c(j,i+nres)-c(j,i)
162 dc_norm(j,i+nres)=dc(j,i+nres)*vbld_inv(i+nres)
164 c write (iout,*) i,(dc(j,i+nres),j=1,3),(dc_norm(j,i+nres),j=1,3),
172 theta_ref(i)=theta(i)
178 C Copy the coordinates to reference coordinates
190 cc write (iout,*) "spraw lancuchy",(c(j,i),j=1,3)
192 if ((itype(i-1).eq.ntyp1).and.(i.gt.2)) then
195 c write (iout,*) "spraw lancuchy",(c(j,i),j=1,3)
201 cref(j,i+nres,cou)=c(j,i+nres)
203 chain_rep(j,lll,kkk)=c(j,i)
204 chain_rep(j,lll+nres,kkk)=c(j,i+nres)
209 chain_rep(j,chain_length,symetr)=chain_rep(j,chain_length,1)
210 chain_rep(j,chain_length+nres,symetr)
211 &=chain_rep(j,chain_length+nres,1)
214 if (symetr.gt.1) then
221 c write(iout,*) "tabperm", (tabperm(i,kkk),kkk=1,4)
227 c write (iout,*) i,icha
228 do lll=1,chain_length
230 if (cou.le.nres) then
232 kupa=mod(lll,chain_length)
233 iprzes=(kkk-1)*chain_length+lll
234 if (kupa.eq.0) kupa=chain_length
235 c write (iout,*) "kupa", kupa
236 cref(j,iprzes,i)=chain_rep(j,kupa,icha)
237 cref(j,iprzes+nres,i)=chain_rep(j,kupa+nres,icha)
245 C-koniec robienia kopidm
248 write (iout,*) "nowa struktura", nperm
250 write (iout,110) restyp(itype(i)),i,cref(1,i,kkk),
252 &cref(3,i,kkk),cref(1,nres+i,kkk),
253 &cref(2,nres+i,kkk),cref(3,nres+i,kkk)
255 100 format (//' alpha-carbon coordinates ',
256 & ' centroid coordinates'/
257 1 ' ', 6X,'X',11X,'Y',11X,'Z',
258 & 10X,'X',11X,'Y',11X,'Z')
259 110 format (a,'(',i3,')',6f12.5)
266 c---------------------------------------------------------------------------
267 subroutine int_from_cart(lside,lprn)
268 implicit real*8 (a-h,o-z)
270 include 'COMMON.LOCAL'
272 include 'COMMON.CHAIN'
273 include 'COMMON.INTERACT'
274 include 'COMMON.IOUNITS'
276 include 'COMMON.NAMES'
277 character*3 seq,atom,res
279 dimension sccor(3,20)
284 & 'Internal coordinates calculated from crystal structure.'
286 write (iout,'(8a)') ' Res ',' dvb',' Theta',
287 & ' Phi',' Dsc_id',' Dsc',' Alpha',
290 write (iout,'(4a)') ' Res ',' dvb',' Theta',
297 c write (iout,*) i,dist(i,i-1)
298 if ((dist(i,i-1).lt.2.0D0 .or. dist(i,i-1).gt.5.0D0)
299 &.and.(iti.ne.ntyp1).and.(itype(i-1).ne.ntyp1)) then
300 write (iout,'(a,i4)') 'Bad Cartesians for residue',i
303 theta(i+1)=alpha(i-1,i,i+1)
304 if (i.gt.2) phi(i+1)=beta(i-2,i-1,i,i+1)
309 c(j,maxres2)=0.5D0*(c(j,i-1)+c(j,i+1))
314 alph(i)=alpha(nres+i,i,maxres2)
315 omeg(i)=beta(nres+i,i,maxres2,i+1)
318 & write (iout,'(a3,i4,7f10.3)') restyp(iti),i,dist(i,i-1),
319 & rad2deg*theta(i),rad2deg*phi(i),dsc(iti),di,rad2deg*alph(i),
325 write (iout,'(a3,i4,7f10.3)') restyp(iti),i,dist(i,i-1),
326 & rad2deg*theta(i),rad2deg*phi(i)
332 c-------------------------------------------------------------------------------
333 subroutine sc_loc_geom(lprn)
334 implicit real*8 (a-h,o-z)
336 include 'COMMON.LOCAL'
338 include 'COMMON.CHAIN'
339 include 'COMMON.INTERACT'
340 include 'COMMON.IOUNITS'
342 include 'COMMON.NAMES'
343 include 'COMMON.CONTROL'
344 include 'COMMON.SETUP'
345 double precision x_prime(3),y_prime(3),z_prime(3)
349 dc_norm(j,i)=vbld_inv(i+1)*(c(j,i+1)-c(j,i))
353 if (itype(i).ne.10 .and. itype(i).ne.ntyp1) then
355 dc_norm(j,i+nres)=vbld_inv(i+nres)*(c(j,i+nres)-c(j,i))
359 dc_norm(j,i+nres)=0.0d0
364 costtab(i+1) =dcos(theta(i+1))
365 sinttab(i+1) =dsqrt(1-costtab(i+1)*costtab(i+1))
366 cost2tab(i+1)=dsqrt(0.5d0*(1.0d0+costtab(i+1)))
367 sint2tab(i+1)=dsqrt(0.5d0*(1.0d0-costtab(i+1)))
368 cosfac2=0.5d0/(1.0d0+costtab(i+1))
369 cosfac=dsqrt(cosfac2)
370 sinfac2=0.5d0/(1.0d0-costtab(i+1))
371 sinfac=dsqrt(sinfac2)
373 if (it.ne.10 .and. itype(i).ne.ntyp1) then
375 C Compute the axes of tghe local cartesian coordinates system; store in
376 c x_prime, y_prime and z_prime
384 x_prime(j) = (dc_norm(j,i) - dc_norm(j,i-1))*cosfac
385 y_prime(j) = (dc_norm(j,i) + dc_norm(j,i-1))*sinfac
387 call vecpr(x_prime,y_prime,z_prime)
389 C Transform the unit vector of the ith side-chain centroid, dC_norm(*,i),
390 C to local coordinate system. Store in xx, yy, zz.
396 xx = xx + x_prime(j)*dc_norm(j,i+nres)
397 yy = yy + y_prime(j)*dc_norm(j,i+nres)
398 zz = zz + z_prime(j)*dc_norm(j,i+nres)
413 if(me.eq.king.or..not.out1file)
414 & write (iout,'(a3,i4,3f10.5)') restyp(iti),i,xxref(i),
420 c---------------------------------------------------------------------------
421 subroutine sccenter(ires,nscat,sccor)
422 implicit real*8 (a-h,o-z)
424 include 'COMMON.CHAIN'
425 dimension sccor(3,20)
429 sccmj=sccmj+sccor(j,i)
431 dc(j,ires)=sccmj/nscat
435 c----------------------------------------------------------------------
436 subroutine readpdb_template(k)
437 C Read the PDB file for read_constr_homology with read2sigma
438 C and convert the peptide geometry into virtual-chain geometry.
439 implicit real*8 (a-h,o-z)
441 include 'COMMON.LOCAL'
443 include 'COMMON.CHAIN'
444 include 'COMMON.INTERACT'
445 include 'COMMON.IOUNITS'
447 include 'COMMON.NAMES'
448 include 'COMMON.CONTROL'
449 include 'COMMON.SETUP'
450 integer i,j,ibeg,ishift1,ires,iii,ires_old,ishift,ity
451 logical lprn /.false./,fail
452 double precision e1(3),e2(3),e3(3)
453 double precision dcj,efree_temp
457 double precision sccor(3,20)
458 integer rescode,iterter(maxres)
467 c write (2,*) "UNRES_PDB",unres_pdb
475 read (ipdbin,'(a80)',end=10) card
476 if (card(:3).eq.'END') then
478 else if (card(:3).eq.'TER') then
481 itype(ires_old-1)=ntyp1
482 iterter(ires_old-1)=1
483 itype(ires_old)=ntyp1
486 write (iout,*) "Chain ended",ires,ishift,ires_old
489 dc(j,ires)=sccor(j,iii)
492 call sccenter(ires,iii,sccor)
495 C Fish out the ATOM cards.
496 if (index(card(1:4),'ATOM').gt.0) then
497 read (card(12:16),*) atom
498 c write (iout,*) "! ",atom," !",ires
499 c if (atom.eq.'CA' .or. atom.eq.'CH3') then
500 read (card(23:26),*) ires
501 read (card(18:20),'(a3)') res
502 c write (iout,*) "ires",ires,ires-ishift+ishift1,
503 c & " ires_old",ires_old
504 c write (iout,*) "ishift",ishift," ishift1",ishift1
505 c write (iout,*) "IRES",ires-ishift+ishift1,ires_old
506 if (ires-ishift+ishift1.ne.ires_old) then
507 C Calculate the CM of the preceding residue.
511 dc(j,ires)=sccor(j,iii)
514 call sccenter(ires_old,iii,sccor)
519 if (res.eq.'Cl-' .or. res.eq.'Na+') then
522 else if (ibeg.eq.1) then
523 c write (iout,*) "BEG ires",ires
525 if (res.ne.'GLY' .and. res.ne. 'ACE') then
529 ires=ires-ishift+ishift1
531 c write (iout,*) "ishift",ishift," ires",ires,
532 c & " ires_old",ires_old
533 c write (iout,*) "ires",ires," ibeg",ibeg," ishift",ishift
535 else if (ibeg.eq.2) then
537 ishift=-ires_old+ires-1
539 write (iout,*) "New chain started",ires,ishift
542 ishift=ishift-(ires-ishift+ishift1-ires_old-1)
543 ires=ires-ishift+ishift1
546 if (res.eq.'ACE' .or. res.eq.'NHE') then
549 itype(ires)=rescode(ires,res,0)
552 ires=ires-ishift+ishift1
554 c write (iout,*) "ires_old",ires_old," ires",ires
555 c if (card(27:27).eq."A" .or. card(27:27).eq."B") then
558 c write (2,*) "ires",ires," res ",res," ity",ity
559 if (atom.eq.'CA' .or. atom.eq.'CH3' .or.
560 & res.eq.'NHE'.and.atom(:2).eq.'HN') then
561 read(card(31:54),'(3f8.3)') (c(j,ires),j=1,3)
562 c write (iout,*) "backbone ",atom ,ires,res, (c(j,ires),j=1,3)
564 c write (iout,'(2i3,2x,a,3f8.3)')
565 c & ires,itype(ires),res,(c(j,ires),j=1,3)
569 sccor(j,iii)=c(j,ires)
571 if (ishift.ne.0) then
572 ires_ca=ires+ishift-ishift1
576 c write (*,*) card(23:27),ires,itype(ires)
577 else if (atom.ne.'O'.and.atom(1:1).ne.'H' .and.
578 & atom.ne.'N' .and. atom.ne.'C' .and.
579 & atom(:2).ne.'1H' .and. atom(:2).ne.'2H' .and.
580 & atom.ne.'OXT' .and. atom(:2).ne.'3H') then
581 c write (iout,*) "sidechain ",atom
583 read(card(31:54),'(3f8.3)') (sccor(j,iii),j=1,3)
587 10 if(me.eq.king.or..not.out1file)
588 & write (iout,'(a,i5)') ' Nres: ',ires
589 C Calculate dummy residue coordinates inside the "chain" of a multichain
593 c write (iout,*) i,itype(i),itype(i+1)
594 if (itype(i).eq.ntyp1.and.iterter(i).eq.1) then
595 if (itype(i+1).eq.ntyp1.and.iterter(i+1).eq.1 ) then
596 C 16/01/2014 by Adasko: Adding to dummy atoms in the chain
597 C first is connected prevous chain (itype(i+1).eq.ntyp1)=true
598 C second dummy atom is conected to next chain itype(i+1).eq.ntyp1=false
600 C 2/15/2013 by Adam: corrected insertion of the last dummy residue
601 call refsys(i-3,i-2,i-1,e1,e2,e3,fail)
608 c(j,i)=c(j,i-1)-1.9d0*e2(j)
612 dcj=(c(j,i-2)-c(j,i-3))/2.0
613 if (dcj.eq.0) dcj=1.23591524223
618 else !itype(i+1).eq.ntyp1
620 C 2/15/2013 by Adam: corrected insertion of the first dummy residue
621 call refsys(i+1,i+2,i+3,e1,e2,e3,fail)
628 c(j,i)=c(j,i+1)-1.9d0*e2(j)
632 dcj=(c(j,i+3)-c(j,i+2))/2.0
633 if (dcj.eq.0) dcj=1.23591524223
638 endif !itype(i+1).eq.ntyp1
639 endif !itype.eq.ntyp1
641 C Calculate the CM of the last side chain.
644 dc(j,ires)=sccor(j,iii)
647 call sccenter(ires,iii,sccor)
651 if (itype(nres).ne.10) then
655 C 2/15/2013 by Adam: corrected insertion of the last dummy residue
656 call refsys(nres-3,nres-2,nres-1,e1,e2,e3,fail)
663 c(j,nres)=c(j,nres-1)-1.9d0*e2(j)
667 dcj=(c(j,nres-2)-c(j,nres-3))/2.0
668 if (dcj.eq.0) dcj=1.23591524223
669 c(j,nres)=c(j,nres-1)+dcj
670 c(j,2*nres)=c(j,nres)
681 c(j,2*nres)=c(j,nres)
683 if (itype(1).eq.ntyp1) then
687 C 2/15/2013 by Adam: corrected insertion of the first dummy residue
688 call refsys(2,3,4,e1,e2,e3,fail)
695 c(j,1)=c(j,2)-1.9d0*e2(j)
699 dcj=(c(j,4)-c(j,3))/2.0
705 C Copy the coordinates to reference coordinates
711 C Calculate internal coordinates.
714 & "Cartesian coordinates of the reference structure"
715 write (iout,'(a,3(3x,a5),5x,3(3x,a5))')
716 & "Residue","X(CA)","Y(CA)","Z(CA)","X(SC)","Y(SC)","Z(SC)"
718 write (iout,'(a3,1x,i3,3f8.3,5x,3f8.3)')
719 & restyp(itype(ires)),ires,(c(j,ires),j=1,3),
720 & (c(j,ires+nres),j=1,3)
723 C Calculate internal coordinates.
724 if(me.eq.king.or..not.out1file)then
726 & "Backbone and SC coordinates as read from the PDB"
728 write (iout,'(2i3,2x,a,3f8.3,5x,3f8.3)')
729 & ires,itype(ires),restyp(itype(ires)),(c(j,ires),j=1,3),
730 & (c(j,nres+ires),j=1,3)
733 call int_from_cart1(.false.)
734 call int_from_cart(.true.,.false.)
735 call sc_loc_geom(.false.)
742 dc(j,i)=c(j,i+1)-c(j,i)
743 dc_norm(j,i)=dc(j,i)*vbld_inv(i+1)
748 dc(j,i+nres)=c(j,i+nres)-c(j,i)
749 dc_norm(j,i+nres)=dc(j,i+nres)*vbld_inv(i+nres)
751 c write (iout,*) i,(dc(j,i+nres),j=1,3),(dc_norm(j,i+nres),j=1,3),
755 C Copy the coordinates to reference coordinates
756 C Splits to single chain if occurs
762 cc write (iout,*) "spraw lancuchy",(c(j,i),j=1,3)
764 if ((itype(i-1).eq.ntyp1).and.(i.gt.2)) then
767 c write (iout,*) "spraw lancuchy",(c(j,i),j=1,3)
773 cref(j,i+nres,cou)=c(j,i+nres)
775 chain_rep(j,lll,kkk)=c(j,i)
776 chain_rep(j,lll+nres,kkk)=c(j,i+nres)
782 c chomo(j,i,k)=c(j,i)
786 write (iout,*) chain_length
787 if (chain_length.eq.0) chain_length=nres
789 chain_rep(j,chain_length,symetr)=chain_rep(j,chain_length,1)
790 chain_rep(j,chain_length+nres,symetr)
791 &=chain_rep(j,chain_length+nres,1)
794 c write (iout,*) "spraw lancuchy",chain_length,symetr
796 c do kkk=1,chain_length
797 c write (iout,*) itype(kkk),(chain_rep(j,kkk,i), j=1,3)