PEdaily_Oudin.R 1.76 KiB
PEdaily_Oudin <- function(JD, Temp, LatRad, Lat, LatUnit = c("rad", "deg")) {
  ## ---------- check arguments
  if (!missing(LatRad)) {
    warning("Deprecated \"LatRad\" argument. Please, use \"Lat\" instead.")
    if (missing(Lat)) {
      Lat <- LatRad
  if (!inherits(JD, "numeric")) {
    stop("'JD' must be of class 'numeric'")
  if (!inherits(Temp, "numeric")) {
    stop("'Temp' must be of class 'numeric'")
  if (length(JD) != length(Temp)) {
    stop("'Temp' and 'LatUnit' must have the same length")
  if (!any(LatUnit %in% c("rad", "deg"))) {
    stop("'LatUnit' must be \"rad\" or \"deg\"")
  if (!inherits(Lat, "numeric") | length(Lat) != 1) {
    stop("'Lat' must be a 'numeric' of length one")
  if (LatUnit[1L] == "rad") {
    FI <- Lat
  if (LatUnit[1L] == "deg") {
    FI <- Lat / (180 / pi)
  ## ---------- Oudin's formula
  PE_Oudin_D <- rep(NA, length(Temp))
  COSFI <- cos(FI)
  AFI <- abs(FI / 42) 
  for (k in seq_along(Temp)) {
    TETA <- 0.4093 * sin(JD[k] / 58.1 - 1.405)
    COSTETA <- cos(TETA)
    COSGZ <- max(0.001, cos(FI - TETA))
    GZ <- acos(COSGZ)
    COSOM <- 1 - COSGZ / COSFI / COSTETA
    if (COSOM < -1) {
      COSOM <- -1
    if (COSOM > 1) {
      COSOM <-  1
    COSOM2 <- COSOM * COSOM
    if (COSOM2 >= 1) {
      SINOM <- 0
    } else {
      SINOM <- sqrt(1 - COSOM2)
    OM <- acos(COSOM)
    COSPZ <- COSGZ + COSFI * COSTETA * (SINOM/OM - 1)
    if (COSPZ < 0.001) {
      COSPZ <- 0.001
71727374757677787980818283848586
ETA <- 1 + cos(JD[k] / 58.1) / 30 GE <- 446 * OM * COSPZ * ETA if (Temp[k] >= -5.0) { PE_Oudin_D[k] <- GE * (Temp[k] + 5) / 100 / 28.5 } else { PE_Oudin_D[k] <- 0 } } return(PE_Oudin_D) }