1!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
2! Copyright 2010.  Los Alamos National Security, LLC. This material was    !
3! produced under U.S. Government contract DE-AC52-06NA25396 for Los Alamos !
4! National Laboratory (LANL), which is operated by Los Alamos National     !
5! Security, LLC for the U.S. Department of Energy. The U.S. Government has !
6! rights to use, reproduce, and distribute this software.  NEITHER THE     !
7! GOVERNMENT NOR LOS ALAMOS NATIONAL SECURITY, LLC MAKES ANY WARRANTY,     !
8! EXPRESS OR IMPLIED, OR ASSUMES ANY LIABILITY FOR THE USE OF THIS         !
9! SOFTWARE.  If software is modified to produce derivative works, such     !
10! modified software should be clearly marked, so as not to confuse it      !
11! with the version available from LANL.                                    !
12!                                                                          !
13! Additionally, this program is free software; you can redistribute it     !
14! and/or modify it under the terms of the GNU General Public License as    !
15! published by the Free Software Foundation; version 2.0 of the License.   !
16! Accordingly, this program is distributed in the hope that it will be     !
17! useful, but WITHOUT ANY WARRANTY; without even the implied warranty of   !
18! MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General !
19! Public License for more details.                                         !
20!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
21
22FUNCTION DSLMMPDB(L, M, MP, ALPHA, COSBETA)
23
24  ! Build derivative defined in PRB 72 165107 eq. (17)
25
26  USE MYPRECISION
27
28  IMPLICIT NONE
29
30  INTEGER :: L, M, MP
31  REAL(LATTEPREC) :: ALPHA, COSBETA, DSLMMPDB
32  REAL(LATTEPREC), EXTERNAL :: AM, DWIGNERDDB
33
34  DSLMMPDB = AM(M, ALPHA) * (REAL((-1)**MP, LATTEPREC) * &
35       DWIGNERDDB(L, ABS(M), MP, COSBETA) + DWIGNERDDB(L, ABS(M), -MP, COSBETA))
36
37  RETURN
38
39END FUNCTION DSLMMPDB
40