require("plyr")
## Loading required package: plyr
require("openair")
## Loading required package: openair
require("knitr")
## Loading required package: knitr
setwd("~/ADBHM/pauliceia/simctl_roilan_marcelo/SOURCE/R_SCRIPTS/")
    # Lendo os dados
    files <- list.files(path = "../../DADOS/estacoes", full.names = T )
        estacoes <- gsub(pattern = ".csv", replacement = "", x = basename(files))
        
    dados <- lapply(1:length(estacoes), 
                    function(i){ #i=1
                        data <- read.csv(file = files[i], header = T, na.strings = "-9999")
                        data$date <- as.POSIXct(data$date, tz = "UTC")
                        print(range(data$date))
                        data <- selectByDate(data, year = 2009:2014 )
                            acum <- ifelse(is.na(data$prec), 0.0, data$prec)
                        data$acum <- c(cumsum(acum[which(format(data$date, "%Y") == "2009") ]),
                                       cumsum(acum[which(format(data$date, "%Y") == "2010") ]),
                                       cumsum(acum[which(format(data$date, "%Y") == "2011") ]),
                                       cumsum(acum[which(format(data$date, "%Y") == "2012") ]),
                                       cumsum(acum[which(format(data$date, "%Y") == "2013") ]),
                                       cumsum(acum[which(format(data$date, "%Y") == "2014") ]))
                        print(range(data$date))
                        return(data)
                    })    
## [1] "2000-01-01 UTC" "2014-12-31 UTC"
## [1] "2009-01-01 UTC" "2014-12-31 UTC"
## [1] "2000-01-01 UTC" "2014-12-31 UTC"
## [1] "2009-01-01 UTC" "2014-12-31 UTC"
## [1] "2000-01-01 UTC" "2014-12-31 UTC"
## [1] "2009-01-01 UTC" "2014-12-31 UTC"
## [1] "2000-01-01 UTC" "2014-12-31 UTC"
## [1] "2009-01-01 UTC" "2014-12-31 UTC"
## [1] "2000-01-01 UTC" "2014-12-31 UTC"
## [1] "2009-01-01 UTC" "2014-12-31 UTC"
## [1] "2000-01-01 UTC" "2014-12-31 UTC"
## [1] "2009-01-01 UTC" "2014-12-31 UTC"
        str(dados)
## List of 6
##  $ :'data.frame':    2191 obs. of  15 variables:
##   ..$ date: POSIXct[1:2191], format: "2009-01-01" ...
##   ..$ site: int [1:2191] 83630 83630 83630 83630 83630 83630 83630 83630 83630 83630 ...
##   ..$ prec: num [1:2191] 26.7 0 22.6 10.6 14.4 0 0 0 0 3.4 ...
##   ..$ tar : num [1:2191] 21.8 24.1 19.7 19.3 19.4 ...
##   ..$ tw  : num [1:2191] 20.1 20.8 18.5 18.9 17.4 ...
##   ..$ tmax: num [1:2191] 25.8 27.7 26.4 23 25 27.2 28.8 30.5 28.8 27.8 ...
##   ..$ tmin: num [1:2191] 18.1 18.3 18.1 17 16.6 15.9 17 18.4 19.2 18.6 ...
##   ..$ patm: num [1:2191] 903 901 898 898 900 ...
##   ..$ wd  : int [1:2191] 36 360 360 27 360 360 360 360 36 36 ...
##   ..$ n   : num [1:2191] 1.9 0.6 0.5 0 4 8.3 6.5 9.4 3.4 1.9 ...
##   ..$ cc  : num [1:2191] 8.67 7 9.33 10 8 3.67 2.67 2 7 9 ...
##   ..$ evap: num [1:2191] 0.6 1 1 1.4 0.5 2.1 3 4.3 4.7 2.5 ...
##   ..$ ur  : num [1:2191] 85.5 79.5 90.8 98 79.5 ...
##   ..$ ws  : num [1:2191] 1.67 1.33 2.33 1.33 0.67 1.33 1.67 3.67 3 2.33 ...
##   ..$ acum: num [1:2191] 26.7 26.7 49.3 59.9 74.3 74.3 74.3 74.3 74.3 77.7 ...
##  $ :'data.frame':    2191 obs. of  15 variables:
##   ..$ date: POSIXct[1:2191], format: "2009-01-01" ...
##   ..$ site: int [1:2191] 83669 83669 83669 83669 83669 83669 83669 83669 83669 83669 ...
##   ..$ prec: num [1:2191] 26.6 0 35 19.7 1.2 0.7 0 0 0 24.2 ...
##   ..$ tar : num [1:2191] 23.2 23.3 23 20.6 21.8 ...
##   ..$ tw  : num [1:2191] 20.9 21.9 21.1 19.5 18.9 ...
##   ..$ tmax: num [1:2191] 29.4 28.1 27.3 23.6 28.3 30.8 32 33.8 32.4 30 ...
##   ..$ tmin: num [1:2191] 19.4 19.9 19.8 18.2 16.5 16.2 17.1 17.5 18.8 19.9 ...
##   ..$ patm: num [1:2191] 942 941 938 938 940 ...
##   ..$ wd  : int [1:2191] 9 0 360 360 0 360 360 360 360 0 ...
##   ..$ n   : num [1:2191] 0.7 0.1 0.7 0 5.2 10.9 10.8 11.1 6.7 1.6 ...
##   ..$ cc  : num [1:2191] 9.67 10 8.67 10 7.67 4.33 1.33 1.67 3.67 9.67 ...
##   ..$ evap: num [1:2191] 2.9 3.2 3 2.5 1.2 3.5 5.1 6.2 6.1 3.8 ...
##   ..$ ur  : num [1:2191] 81.2 93.5 81.2 91.2 74.5 ...
##   ..$ ws  : num [1:2191] 0.67 0 0.67 0.33 0 0.33 0.67 0.33 0.33 0 ...
##   ..$ acum: num [1:2191] 26.6 26.6 61.6 81.3 82.5 ...
##  $ :'data.frame':    2191 obs. of  15 variables:
##   ..$ date: POSIXct[1:2191], format: "2009-01-01" ...
##   ..$ site: int [1:2191] 83676 83676 83676 83676 83676 83676 83676 83676 83676 83676 ...
##   ..$ prec: num [1:2191] 5.4 0 24.8 19.2 0.6 0 0 0 0 0 ...
##   ..$ tar : num [1:2191] 25 24.7 24 23.3 23.7 ...
##   ..$ tw  : num [1:2191] 21.6 22.4 21.6 20.7 19.3 ...
##   ..$ tmax: num [1:2191] 29 29.8 29.8 24.6 28.8 29.7 31.8 33.4 33.8 32.1 ...
##   ..$ tmin: num [1:2191] 20.8 21.5 20.1 20.6 17.3 16.9 16.5 19 21.6 20.8 ...
##   ..$ patm: num [1:2191] 949 947 945 944 946 ...
##   ..$ wd  : int [1:2191] 36 23 5 36 23 18 14 14 14 14 ...
##   ..$ n   : num [1:2191] 0.4 3.1 2.2 0.4 9.5 10.7 5.3 11.6 9.2 7.3 ...
##   ..$ cc  : num [1:2191] 8.67 8.33 9 8.67 5 2.33 3 1.67 2.67 5.67 ...
##   ..$ evap: num [1:2191] 4.4 4.8 2 4.7 2.3 5.8 6.5 10.2 9.4 6.9 ...
##   ..$ ur  : num [1:2191] 76.5 88.2 75.2 80.8 61.8 ...
##   ..$ ws  : num [1:2191] 1.67 2.67 3 2 2 2.33 2.33 1 2.67 2.33 ...
##   ..$ acum: num [1:2191] 5.4 5.4 30.2 49.4 50 50 50 50 50 50 ...
##  $ :'data.frame':    2191 obs. of  15 variables:
##   ..$ date: POSIXct[1:2191], format: "2009-01-01" ...
##   ..$ site: int [1:2191] 83683 83683 83683 83683 83683 83683 83683 83683 83683 83683 ...
##   ..$ prec: num [1:2191] 24.5 0 3.3 26.8 4.4 0 0 0 0 7 ...
##   ..$ tar : num [1:2191] 22 23.8 23.6 21.3 19.2 ...
##   ..$ tw  : num [1:2191] 20.3 21.9 20.8 19.9 17.8 ...
##   ..$ tmax: num [1:2191] 27.3 27.6 27.3 25.6 23 27.4 29.5 30.6 31 28.4 ...
##   ..$ tmin: num [1:2191] 18.3 19.7 18.8 17.9 15.8 15.8 15.2 15.3 17.5 19 ...
##   ..$ patm: num [1:2191] 915 913 910 909 913 ...
##   ..$ wd  : int [1:2191] 18 23 27 27 18 360 18 360 360 36 ...
##   ..$ n   : num [1:2191] 0.7 0.3 1.6 0.3 0.3 6 8.4 9.1 8.6 0.4 ...
##   ..$ cc  : num [1:2191] 10 8 9 9.33 10 7.33 6.67 6 6.33 10 ...
##   ..$ evap: num [1:2191] 1.3 0.9 2.6 1.5 1 1 2.5 2.8 3.5 3.1 ...
##   ..$ ur  : num [1:2191] 82.5 83.2 83.2 88.2 88.8 ...
##   ..$ ws  : num [1:2191] 0.67 0.83 0.5 1.33 0.5 0.5 0.33 0.67 1.03 0.5 ...
##   ..$ acum: num [1:2191] 24.5 24.5 27.8 54.6 59 59 59 59 59 66 ...
##  $ :'data.frame':    2191 obs. of  15 variables:
##   ..$ date: POSIXct[1:2191], format: "2009-01-01" ...
##   ..$ site: int [1:2191] 83726 83726 83726 83726 83726 83726 83726 83726 83726 83726 ...
##   ..$ prec: num [1:2191] 68.9 0 31.7 24.3 3.6 0 0 0 0 10.3 ...
##   ..$ tar : num [1:2191] 21.8 22.4 22.1 19 20.1 ...
##   ..$ tw  : num [1:2191] 20.4 20.9 20.4 18 17.6 ...
##   ..$ tmax: num [1:2191] 27.3 23 24.7 21.2 24.8 28.7 29.7 31.2 32.1 28.1 ...
##   ..$ tmin: num [1:2191] 18.1 19.6 19 16.2 14.9 14.8 15.7 16.9 18.9 19 ...
##   ..$ patm: num [1:2191] 918 916 913 913 915 ...
##   ..$ wd  : int [1:2191] 14 36 36 32 32 14 18 18 14 360 ...
##   ..$ n   : num [1:2191] 0.5 0.1 0.5 0.2 5.3 9.8 10.4 11 8.7 3.3 ...
##   ..$ cc  : num [1:2191] 9.67 10 10 10 8 4.67 6 2.67 3 9.33 ...
##   ..$ evap: num [1:2191] 1.5 1.5 0.4 1.1 1.7 1.8 3.5 4.7 5.5 3.1 ...
##   ..$ ur  : num [1:2191] 87 91.5 86 88.8 78.5 ...
##   ..$ ws  : num [1:2191] 0.67 1 2 1 1.67 1.67 1.67 1.67 1.33 1.67 ...
##   ..$ acum: num [1:2191] 68.9 68.9 100.6 124.9 128.5 ...
##  $ :'data.frame':    2191 obs. of  15 variables:
##   ..$ date: POSIXct[1:2191], format: "2009-01-01" ...
##   ..$ site: int [1:2191] 83851 83851 83851 83851 83851 83851 83851 83851 83851 83851 ...
##   ..$ prec: num [1:2191] 65 21.6 33.8 9.2 0 0 0 0 0 0 ...
##   ..$ tar : num [1:2191] 24.5 24.6 22 21.9 20.9 ...
##   ..$ tw  : num [1:2191] 21.7 22.4 21.3 19.3 17.8 ...
##   ..$ tmax: num [1:2191] 30 26 25.8 23.2 24.9 27.3 30.2 32.4 34 32.5 ...
##   ..$ tmin: num [1:2191] 20.3 20.3 20.3 18.2 15.8 16.8 17 16.7 18 20.9 ...
##   ..$ patm: num [1:2191] NA NA NA NA NA NA NA NA NA NA ...
##   ..$ wd  : int [1:2191] 14 32 360 36 18 14 14 360 14 14 ...
##   ..$ n   : num [1:2191] 5.4 0.1 0.3 1.5 4.3 9.7 10.6 10.7 11.4 7.5 ...
##   ..$ cc  : num [1:2191] 9.67 10 10 9.67 9.33 3.33 6 2.67 3.33 7.33 ...
##   ..$ evap: num [1:2191] 2.7 2.7 0.8 2.6 2.8 3.2 3.7 4.4 5.5 5.4 ...
##   ..$ ur  : num [1:2191] 73 91.8 91.5 75.2 75.2 ...
##   ..$ ws  : num [1:2191] 1.33 0.33 1 1 1 1.33 0.67 0.67 0.67 1 ...
##   ..$ acum: num [1:2191] 65 86.6 120.4 129.6 129.6 ...
# Torre    
    torre <- read.table(file = "../../DADOS/dbhm/99010.dbhm",header = F,na.strings =  "32766")
    names(torre) <- c("std_id","ano","mes","dia", "tm","tmax" ,"tmin","um" , "umin" , "n_sum"  ,
                      "n_lown" ,"fsm","fmaxx","fmaxs" ,"rsum", "d0m", "sun","E01", 
                      "snow","mslp","patm")
    
    torre$date <- seq.POSIXt(from = as.POSIXct("2009-07-01 00:00", tz = "UTC"),
                             to = as.POSIXct("2014-09-17 23:00:00", tz = "UTC"),
                             by = "day")
    
    len <- length(torre$std_id)
    
    torre0 <- data.frame(date = dados[[1]]$date)
      
    torre1 <- data.frame(date = torre$date,
                        site = torre$std_id,
                        prec = torre$rsum/10,
                        tar = torre$tm/10,
                        tw = as.numeric(rep(NA, times= len)),
                        tmax = torre$tmax/10,
                        tmin = torre$tmin/10,
                        patm = torre$patm/10,
                        wd = torre$fmaxx,
                        n = torre$sun/10,
                        cc = as.numeric(torre$n_lown),
                        evap = as.numeric(torre$E01),
                        ur = as.numeric(torre$um),
                        ws = torre$fmaxs/10)
        acum <- ifelse(is.na(torre1$prec), 0.0,torre1$prec)
    torre1$acum <- c(cumsum(acum[which(format(torre1$date, "%Y") == "2009") ]),
                     cumsum(acum[which(format(torre1$date, "%Y") == "2010") ]),
                     cumsum(acum[which(format(torre1$date, "%Y") == "2011") ]),
                     cumsum(acum[which(format(torre1$date, "%Y") == "2012") ]),
                     cumsum(acum[which(format(torre1$date, "%Y") == "2013") ]),
                     cumsum(acum[which(format(torre1$date, "%Y") == "2014") ]))
    str(torre1)
## 'data.frame':    1905 obs. of  15 variables:
##  $ date: POSIXct, format: "2009-07-01" "2009-07-02" ...
##  $ site: int  99010 99010 99010 99010 99010 99010 99010 99010 99010 99010 ...
##  $ prec: num  0 0.3 0 0 0 0 0 0 0 0 ...
##  $ tar : num  22.9 18.6 17.6 17.4 18.2 18.9 19.5 19.7 20.5 21.3 ...
##  $ tw  : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ tmax: num  22.9 18.6 17.6 17.4 18.2 18.9 19.5 19.7 20.5 21.3 ...
##  $ tmin: num  21.4 15.7 14.7 13.5 12.8 15.1 15.3 15.4 15.2 17.5 ...
##  $ patm: num  94.5 94.5 94.6 94.7 94.8 94.9 94.9 94.8 94.7 94.5 ...
##  $ wd  : int  5 146 147 148 136 83 58 58 51 20 ...
##  $ n   : num  8 5.6 3.2 9.1 10.1 10.2 10.1 9 9.7 4.7 ...
##  $ cc  : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ evap: num  NA NA NA NA NA NA NA NA NA NA ...
##  $ ur  : num  55 71 80 83 73 70 69 68 63 63 ...
##  $ ws  : num  3.2 7.7 4.4 3.2 5.4 6 5.3 5 4.5 4.4 ...
##  $ acum: num  0 0.3 0.3 0.3 0.3 0.3 0.3 0.3 0.3 0.3 ...
    torre <- merge(torre0, torre1, all.x = T)
        torre$site[is.na(torre$site)] <-  "99010"
# Vertedor
     vertedor <- read.table(file = "../../DADOS/dbhm/99009.dbhm",header = F,na.strings =  "32766")
    names(vertedor) <- c("std_id","ano","mes","dia", "tm","tmax" ,"tmin","um" , "umin" , "n_sum"  ,
                      "n_lown" ,"fsm","fmaxx","fmaxs" ,"rsum", "d0m", "sun","E01", 
                      "snow","mslp","patm")

        
    vertedor$date <- seq.POSIXt(from = as.POSIXct("2009-07-01 00:00", tz = "UTC"),
                             to = as.POSIXct("2014-09-17 23:00:00", tz = "UTC"),
                             by = "day")
    
    len <- length(vertedor$std_id)
    
    vertedor0 <- data.frame(date = dados[[1]]$date)
      
    vertedor1 <- data.frame(date = vertedor$date,
                        site = vertedor$std_id,
                        prec = vertedor$rsum/10.,
                        tar = vertedor$tm/10.,
                        tw = vertedor$tm/10.,
                        tmax = vertedor$tmax/10.,
                        tmin = vertedor$tmin/10.,
                        patm = vertedor$patm/10.,
                        wd = as.integer(vertedor$fmaxx),
                        n = vertedor$sun/10.,
                        cc = as.numeric(vertedor$n_lown),
                        evap = as.numeric(vertedor$E01),
                        ur = as.numeric(vertedor$um),
                        ws = vertedor$fmaxs/10)
        acum <- ifelse(is.na(vertedor1$prec), 0.0,vertedor1$prec)
        vertedor1$acum <-c(cumsum(acum[which(format(vertedor1$date, "%Y") == "2009") ]),
                           cumsum(acum[which(format(vertedor1$date, "%Y") == "2010") ]),
                           cumsum(acum[which(format(vertedor1$date, "%Y") == "2011") ]),
                           cumsum(acum[which(format(vertedor1$date, "%Y") == "2012") ]),
                           cumsum(acum[which(format(vertedor1$date, "%Y") == "2013") ]),
                           cumsum(acum[which(format(vertedor1$date, "%Y") == "2014") ]))
    str(vertedor1)
## 'data.frame':    1905 obs. of  15 variables:
##  $ date: POSIXct, format: "2009-07-01" "2009-07-02" ...
##  $ site: int  99009 99009 99009 99009 99009 99009 99009 99009 99009 99009 ...
##  $ prec: num  0 0.3 0 0 0 0 0 0 0 0 ...
##  $ tar : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ tw  : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ tmax: num  NA NA NA NA NA NA NA NA NA NA ...
##  $ tmin: num  NA NA NA NA NA NA NA NA NA NA ...
##  $ patm: num  NA NA NA NA NA NA NA NA NA NA ...
##  $ wd  : int  NA NA NA NA NA NA NA NA NA NA ...
##  $ n   : num  8 5.6 3.2 9.1 10.1 10.2 10.1 9 9.7 4.7 ...
##  $ cc  : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ evap: num  NA NA NA NA NA NA NA NA NA NA ...
##  $ ur  : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ ws  : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ acum: num  0 0.3 0.3 0.3 0.3 0.3 0.3 0.3 0.3 0.3 ...
    vertedor <- merge(vertedor0, vertedor1, all.x = T)
    str(vertedor)
## 'data.frame':    2191 obs. of  15 variables:
##  $ date: POSIXct, format: "2009-01-01" "2009-01-02" ...
##  $ site: int  NA NA NA NA NA NA NA NA NA NA ...
##  $ prec: num  NA NA NA NA NA NA NA NA NA NA ...
##  $ tar : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ tw  : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ tmax: num  NA NA NA NA NA NA NA NA NA NA ...
##  $ tmin: num  NA NA NA NA NA NA NA NA NA NA ...
##  $ patm: num  NA NA NA NA NA NA NA NA NA NA ...
##  $ wd  : int  NA NA NA NA NA NA NA NA NA NA ...
##  $ n   : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ cc  : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ evap: num  NA NA NA NA NA NA NA NA NA NA ...
##  $ ur  : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ ws  : num  NA NA NA NA NA NA NA NA NA NA ...
##  $ acum: num  NA NA NA NA NA NA NA NA NA NA ...
        vertedor$site[is.na(vertedor$site)] <-  as.character("99009")
        dados[[length(estacoes)+1]] <- torre
        dados[[length(estacoes)+2]] <- vertedor
            estacoes <- c(estacoes, "99010", "99009")
            names(dados) <- estacoes
        estc <- ldply(.data = dados, .fun = rbind) 
        str(estc)
## 'data.frame':    17528 obs. of  16 variables:
##  $ .id : chr  "83630" "83630" "83630" "83630" ...
##  $ date: POSIXct, format: "2009-01-01" "2009-01-02" ...
##  $ site: chr  "83630" "83630" "83630" "83630" ...
##  $ prec: num  26.7 0 22.6 10.6 14.4 0 0 0 0 3.4 ...
##  $ tar : num  21.8 24.1 19.7 19.3 19.4 ...
##  $ tw  : num  20.1 20.8 18.5 18.9 17.4 ...
##  $ tmax: num  25.8 27.7 26.4 23 25 27.2 28.8 30.5 28.8 27.8 ...
##  $ tmin: num  18.1 18.3 18.1 17 16.6 15.9 17 18.4 19.2 18.6 ...
##  $ patm: num  903 901 898 898 900 ...
##  $ wd  : int  36 360 360 27 360 360 360 360 36 36 ...
##  $ n   : num  1.9 0.6 0.5 0 4 8.3 6.5 9.4 3.4 1.9 ...
##  $ cc  : num  8.67 7 9.33 10 8 3.67 2.67 2 7 9 ...
##  $ evap: num  0.6 1 1 1.4 0.5 2.1 3 4.3 4.7 2.5 ...
##  $ ur  : num  85.5 79.5 90.8 98 79.5 ...
##  $ ws  : num  1.67 1.33 2.33 1.33 0.67 1.33 1.67 3.67 3 2.33 ...
##  $ acum: num  26.7 26.7 49.3 59.9 74.3 74.3 74.3 74.3 74.3 77.7 ...

1 Temperatura do ar

    timePlot(estc, "tar", type = "site",
             group = T, stack = F, lwd = 1.5, lty = 1, 
             name.pol = estacoes, 
             layout = c(1,8), key.columns = 4
             )

2 Precipitação

    timePlot(estc, "prec", type = "site",
             group = F, stack = F, 
             lwd = 1.5, lty = 1, cols = c("blue","gray"), plot.type = "l",
             name.pol = estacoes, 
             layout = c(1,8),
             ylab = "Precipitação [mm]",
             main = "Precipítação [mm]", key.columns = 4
             )
        virada <- which(format(dados[[1]]$date, "%m-%d") == "12-31")
        
        acumulados <- data.frame(date = dados[[1]]$date, 
              "Est.83630" = dados$`83630`$acum,
              "Est.83669" = dados$`83669`$acum,
              "Est.83676" = dados$`83676`$acum,
              "Est.83683" = dados$`83683`$acum,
              "Est.83726" = dados$`83726`$acum,
              "Est.83851" = dados$`83851`$acum,
              "Est.99010" = dados$`99010`$acum)
        acumulados[virada,-1] <- NA
    timePlot(acumulados, names(acumulados[,-1]),
             group = T, stack = F, 
             lwd = 2, lty = 1, plot.type = "l",
             name.pol = estacoes,
             ylab = "Precipitação [mm]",
             main = "Precipítação, acumulados anuais [mm]", key.columns = 4
             )

Acumulados anuais de precipitação por estação.

Anos Est.83630 Est.83669 Est.83676 Est.83683 Est.83726 Est.83851 Est.99009 Est.99010
2009 2036.1 1943.8 1617.6 1758.0 2093.1 1781.2 539.6 1016.8
2010 1628.9 1140.7 949.5 1172.6 1228.2 1224.6 1068.8 1209.9
2011 1628.0 1412.0 1298.5 1618.1 1771.7 1383.0 1425.9 1460.1
2012 1538.9 1190.2 1115.4 1390.7 1548.4 1460.9 1353.1 1187.2
2013 1729.8 1354.2 1203.7 1686.9 1539.8 1167.0 1438.0 1274.6
2014 1093.2 825.9 992.8 967.7 1111.7 1107.3 NA NA

3 Umidade relativa

    timePlot(estc, "ur", type = "site",
             group = F, stack = F, lwd = 1.5, lty = 1, 
             name.pol = estacoes, 
             layout = c(1,8), key.columns = 4
             )

4 Vento

    windRose(estc, ws = "ws", wd = "wd", type = "site")
     timePlot(estc, "ws", type = "site",
             group = F, stack = F, lwd = 1.5, lty = 1, 
             name.pol = estacoes,
             layout = c(1,8), key.columns = 4
             )

5 Número de horas de brilho solar

    timePlot(estc, "n", type = "site",
             group = F, stack = F, lwd = 1.5, lty = 1, 
             name.pol = estacoes,
             layout = c(1,8), key.columns = 4
             )