SUBROUTINE INTERPOLQ ( )

Description
                                                                        * 
  Copyright (C) 1996 Leif Laaksonen, Dage Sundholm                      * 
  Copyright (C) 1996-2010 Jacek Kobus               * 
                                                                        * 
  This program is free software; you can redistribute it and/or modify  * 
  it under the terms of the GNU General Public License version 2 as     * 
  published by the Free Software Foundation.                            * 
                                                                        * 
 
### interpolq ### 
 
    This routine works for ngrids<=3
Source file:quadp.f
I/O Operations:
Unit ID  Unit No       Access  Form   Operation
  IOUT6                   SEQ  FMTD           W  

Operation codes A=rewind,B=backspace,C=close,E=endfile
                I=inquire,O=open,R=read,W=write
Intrinsic Functions Called
DOUBLE PRECISION   DBLE
External Functions and Subroutines Called
REAL*8             VPOLY1Q
SUBROUTINE         LPCOEFFQ
Local Variables (+ indicates altered content)
INTEGER           +I,         +IMU,       +K,         +MUP
REAL*8             COEFFQ(9), +HMU1,      +HMU2,      +HMU3
REAL*8            +XMU
Referenced Common Block Variables (+ indicates altered content)
DEBUG              INTEGER            IDBG(1000)
GRIDI              INTEGER            IEMU(10),  NGRIDS
GRIDR              REAL*8             HMU(10),   VMU(2500)
INTERP             INTEGER           +IADINT2(4)
INTERP             INTEGER           +IADINT3L(4)
INTERP             INTEGER           +IADINT3R(4)
INTERP             INTEGER           +IADINT4(4)
INTERP             REAL*8            +CINT2(9,4)
INTERP             REAL*8            +CINT3L(9,4)
INTERP             REAL*8            +CINT3R(9,4)
INTERP             REAL*8            +CINT4(9,4)
IOCHAN             INTEGER            IOUT6
QPREC              INTEGER           +IORD,     +IORD2
QPREC              INTEGER           +KBEG,     +KEND

REAL FUNCTION VPOLY1Q ( X, A )

Argument Definitions (+ indicates altered content)
REAL*8             A(9),       X
Description
### vpoly1q ### 
 
    This function uses the Horner scheme to calculate value of the polynomial 
    stored in array a at a particular point
Source file:quadp.f
Local Variables (+ indicates altered content)
INTEGER           +I
Referenced Common Block Variables (+ indicates altered content)
QPREC              INTEGER            IORD

SUBROUTINE LAGRPOLQ ( DC1, DC2 )

Argument Definitions (+ indicates altered content)
REAL*8            +DC1(9,7,9),            +DC2(9,7,9)
Description
### lagrpolq ###
Source file:quadp.f
External Functions and Subroutines Called
REAL*8             VPOLYQ
SUBROUTINE         LPCOEFFQ,   LPDERQ
Local Variables (+ indicates altered content)
INTEGER           +I,         +IB,        +IE,        +IG
INTEGER           +IMUP,      +K,         +MUP
REAL*8             COEFF1(9),  COEFF2(9),  COEFFQ(9)
Referenced Common Block Variables (+ indicates altered content)
GRIDI              INTEGER            IEMU(10),  MXNMU
GRIDI              INTEGER            NGRIDS
GRIDR              REAL*8             VMU(2500)
QPREC              INTEGER           +IORD,     +KBEG
QPREC              INTEGER           +KEND
QPREC              REAL*8            +VMUQ(2500)

SUBROUTINE LPCOEFFQ ( MUP, K, COEFFQ )

Argument Definitions (+ indicates altered content)
INTEGER            K,          MUP
REAL*8            +COEFFQ(9)
Description
### lpcoeffq ### 
 
    This routine calculates coefficients of the (sub)Lagrange 
    polynomial for a grid point k 
    \prod_{i=1,i\ne k}^{9} {(x-x_{i}) \over (x_{k}-x_{i})} 
 
    x_{k}= vmu(mup-5+k), k=1,...,9 
 
    Last modification: 2.01.01
Source file:quadp.f
Local Variables (+ indicates altered content)
INTEGER           +I,         +IB,        +IC1,       +IC2
INTEGER           +J
REAL*8            +A(12),     +B(12),     +C1,        +DENOM
Referenced Common Block Variables (+ indicates altered content)
QPREC              INTEGER            IORD,      KBEG
QPREC              INTEGER            KEND
QPREC              REAL*8             VMUQ(2500)

SUBROUTINE LPDERQ ( A, A1, A2 )

Argument Definitions (+ indicates altered content)
REAL*8             A(9),      +A1(9),     +A2(9)
Description
### lpderq ### 
 
    This routine calculates coefficients of the first and second 
    derivative of the polynomial stored in a
Source file:quadp.f
Intrinsic Functions Called
DOUBLE PRECISION   DBLE
Local Variables (+ indicates altered content)
INTEGER           +I
Referenced Common Block Variables (+ indicates altered content)
QPREC              INTEGER            IORD

REAL FUNCTION VPOLYQ ( MUP, A )

Argument Definitions (+ indicates altered content)
INTEGER            MUP
REAL*8             A(9)
Description
### vpolyq ### 
 
    This function uses the Horner scheme to calculate value of the polynomial 
    stored in array a at a particular point
Source file:quadp.f
Local Variables (+ indicates altered content)
INTEGER           +I
REAL*8            +X
Referenced Common Block Variables (+ indicates altered content)
QPREC              INTEGER            IORD
QPREC              REAL*8             VMUQ(2500)