Commit Graph

13 Commits

Author SHA1 Message Date
giannozz c60df7459d Added k-resolved dos (GuidoF) + source "normalization"
git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@6840 c92efa57-630b-4861-b058-cf58834340f0
2010-06-14 13:45:31 +00:00
nn245 3f393f442b Cleanup of sources to simplify machine-parsing: PROGRAM name matches name of target executable, cleanup EXTERNAL statements (N. Nemec)
git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@6506 c92efa57-630b-4861-b058-cf58834340f0
2010-03-17 12:01:50 +00:00
giannozz afec752184 End of this set of not-so-fundamental changes. Summary:
1) no more f_defs.h file to be included in fortran files
2) all CMPLX explicitly defined as CMPLX(...,KIND=dp)
3) blas/lapack names in lowercase (not all of them, actually)
4) documentation accordingly updated (plus unrelated changes to user_guide)


git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@5805 c92efa57-630b-4861-b058-cf58834340f0
2009-08-03 09:19:02 +00:00
giannozz 134f077ee9 There were a few occurrences of "cmplx(a,b)" (lowercase, not preprocessed).
This is a very bad thing since the result is returned in single precision.


git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@5783 c92efa57-630b-4861-b058-cf58834340f0
2009-07-31 16:37:18 +00:00
dalcorso a2b5ab5e50 Minor partial cleanup. Many routines declared unused variables. Many others
could be cleaned.


git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@5445 c92efa57-630b-4861-b058-cf58834340f0
2009-02-25 15:58:53 +00:00
giannozz 3a98e2d9d4 More patches from Axel:
- correct an unquoted string (iosys) in PW/input.f90:483
(this was the cause of tonight compilation failere)
- correct a few incorrect format strings
- make more use of the constants module and thus
  provide more consistent units. NOTE, this has some
  numerical changes in the outputs, as in some places
  rather low precision and inconsistent numbers were
  used for unit conversion.
- convert all(?) single precision constants to double
  using the attached little perl program.
  exceptions: efermi.f90 (as it is supposed to be rewritten
  anyways), plotbands.f90 (it uses single precision everywhere,
  which may result in saving a significant amount of memory,
  so i converted the two double precision constants to single).
Unused routine 'set_fft_grid' removed


git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@3602 c92efa57-630b-4861-b058-cf58834340f0
2006-12-14 08:53:47 +00:00
giannozz 19aaac89fa More miscellanous cleanup from Axel:
- disable locales via use of LC_ALL=C in all shell scripts
   (which will hopefully make sorted lists more consistent
    between people running with different locales).
 - remove redundant files from PW, NMR_new, VdW, VIB;
   rename subroutines if their functionality is noI
   unchanged from the original source it was taken from.
 - corresponding updates to Makefiles and dependencies.
 - whitespace cleanups (eleminate remaining tabs).
 - a few more float->DBLE


git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@3596 c92efa57-630b-4861-b058-cf58834340f0
2006-12-12 11:02:09 +00:00
giannozz d1682a7121 Updated wfdd from Manu
git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@2816 c92efa57-630b-4861-b058-cf58834340f0
2006-02-14 16:05:48 +00:00
giannozz f533b052d5 dbl => DP (defined as previously dbl was)
syntax for declarations: real(DP), without "kind="


git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@2135 c92efa57-630b-4861-b058-cf58834340f0
2005-08-28 14:09:42 +00:00
giannozz bf4bfe222f General cleanup of intrinsic functions:
conversion to real    => DBLE
(including real part of a complex number)
conversion to complex => CMPLX
complex conjugate     => CONJG
imaginary part        => AIMAG

All functions are uppercase.
CMPLX is preprocessed by f_defs.h and performs an explicit cast:
#define CMPLX(a,b)  cmplx(a,b,kind=DP)
This implies that 1) f_defs.h must be included whenever a CMPLX is present,
2) CMPLX should stay in a single line, 3) DP must be defined.

All occurrences of real, float, dreal, dfloat, dconjg, dimag, dcmplx
removed - please do not reintroduce any of them.
Tested only with ifc7 and g95 - beware unintended side effects

Maybe not the best solution (explicit casts everywhere would be better)
but it can be easily changed with a script if the need arises.
The following code might be used to test for possible trouble:

program test_intrinsic

  implicit none
  integer, parameter :: dp = selected_real_kind(14,200)
  real (kind=dp) :: a = 0.123456789012345_dp
  real (kind=dp) :: b = 0.987654321098765_dp
  complex (kind=dp) :: c = ( 0.123456789012345_dp, 0.987654321098765_dp)

  print *, '      A = ', a
  print *, ' DBLE(A)= ', DBLE(a)
  print *, '      C = ', c
  print *, 'CONJG(C)= ', CONJG(c)
  print *, 'DBLE(c),AIMAG(C)  = ', DBLE(c), AIMAG(c)
  print *, 'CMPLX(A,B,kind=dp)= ', CMPLX( a, b, kind=dp)

end program test_intrinsic

Note that CMPLX and REAL without a cast yield single precision numbers on
ifc7 and g95 !!!


git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@2133 c92efa57-630b-4861-b058-cf58834340f0
2005-08-26 17:44:42 +00:00
ballabio 69c501c5f2 more end --> end subroutine [Gerardo]
git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@1859 c92efa57-630b-4861-b058-cf58834340f0
2005-05-12 15:19:08 +00:00
giannozz 94d6a5c291 Added copyright notice where missing (please check)
Modified copyright notice to make it compatible with script
"check_license"
efg: added missing broadcast of a variable


git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@1729 c92efa57-630b-4861-b058-cf58834340f0
2005-03-21 13:43:38 +00:00
cavazzon e163a007ef - further merging of low level subroutine between FPMD and CP
( cell_move in Module/cell_base.f90 )
- More input parameters check in Module/read_namelists
- For CP, restart file is saved in working directory like in FPMD
  and not in output_dir where MD data are saved, this is because
  usually one keep MD trajectories in home dir.
- added pseudopotential for wannier dynamics example
- added Wannier postprocessing (from Manu Sharma )
- fixed a small bug for FPMD and 'diis' electron dynamics


git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@1083 c92efa57-630b-4861-b058-cf58834340f0
2004-07-19 17:19:16 +00:00