require(XML)  
## Loading required package: XML
require(reshape2)
## Loading required package: reshape2
require(plyr)
## Loading required package: plyr
require(methods)
require(dygraphs)
## Loading required package: dygraphs
require(xts)
## Loading required package: xts
## Loading required package: zoo
## 
## Attaching package: 'zoo'
## The following objects are masked from 'package:base':
## 
##     as.Date, as.Date.numeric
require(validate)
## Loading required package: validate
require(plotly)
## Loading required package: plotly
## Loading required package: ggplot2
## 
## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2':
## 
##     last_plot
## The following object is masked from 'package:graphics':
## 
##     layout
require(quantmod)
## Loading required package: quantmod
## Loading required package: TTR
## Version 0.4-0 included new data defaults. See ?getSymbols.
require(knitr)
## Loading required package: knitr
require(rmarkdown)
## Loading required package: rmarkdown
require(sqldf)
## Loading required package: sqldf
## Loading required package: gsubfn
## Loading required package: proto
## Loading required package: RSQLite
## Loading required package: DBI
#variables
endpoint <- "http://data.hbrc.govt.nz/envirodata/wqfortrend.hts"
measure <- "Dissolved Reactive Phosphorus"
date1 <- "2005-01-01"
date2 <- "2016-01-01"

print("VALIDATION REPORT HILLTOP DATA - WATER QUALITY DATA")
## [1] "VALIDATION REPORT HILLTOP DATA - WATER QUALITY DATA"
print("Council: Hawke's Bay Regional Council")
## [1] "Council: Hawke's Bay Regional Council"
print(endpoint)
## [1] "http://data.hbrc.govt.nz/envirodata/wqfortrend.hts"
print(measure)
## [1] "Dissolved Reactive Phosphorus"
print(paste("start date: ", date1))
## [1] "start date:  2005-01-01"
print(paste("finish date: ", date2))
## [1] "finish date:  2016-01-01"
ld <- function(url){
  (download.file(url,destfile="tmp",method="wininet"))
  xmlfile <- xmlParse(file = "tmp")
  unlink("tmp")
  return(xmlfile)
}
url <- "https://hbrcwebmap.hbrc.govt.nz/arcgis/services/emar/MonitoringSiteReferenceData/MapServer/WFSServer?request=GetFeature&service=WFS&typename=MonitoringSiteReferenceData&srsName=urn:ogc:def:crs:EPSG:6.9:4326"
xmldata<-ld(url)
#print(xmldata)
m <- getNodeSet(xmldata,paste("//wfs:FeatureCollection/gml:member", sep=""))
#print(m)
for (ms in 1:length(m)){
  member <- getNodeSet(xmldata,paste("//gml:member[",ms,"]", sep=""))
  #print(member)
  
  q<- getNodeSet(xmldata, paste("//gml:member[",ms,"]/emar:MonitoringSiteReferenceData/emar:SWQuality",sep=""))
  
  s<- getNodeSet(xmldata, paste("//gml:member[",ms,"]/emar:MonitoringSiteReferenceData/emar:CouncilSiteID",sep=""))
  
  for (qs in 1:length(q)){
    xmldataframe <- xmlToDataFrame(getNodeSet(xmldata, paste("//gml:member[",ms,"]/emar:MonitoringSiteReferenceData/emar:SWQuality[",qs,"]", sep="")))
    status <- (xmldataframe$text)
    #print(status)
    if (status == "Yes"){
      #print(paste("H"))
      xmldataframe <- xmlToDataFrame(getNodeSet(xmldata, paste("//gml:member[",ms,"]/emar:MonitoringSiteReferenceData/emar:CouncilSiteID", sep="")))
      siteid <- (xmldataframe$text)
      print(siteid)
      url<-paste(endpoint,"?service=Hilltop&Request=GetData&Site=",siteid,"&Measurement=",measure,"&From=",date1,"&To=",date2, sep="")
      #print(url)
      measxml<-xmlInternalTreeParse(url)
      error<-as.character(sapply(getNodeSet(doc=measxml, path="//Error"), xmlValue))
      #print(error)
      if(length(error)==0){
        
        m<-getNodeSet(measxml, "//Hilltop/Measurement")
        
        for(ms in 1:length(m)){
          d <- getNodeSet(measxml, paste("//Measurement[",ms,"]/Data",sep=""))
          
          for(ds in 1:length(d)){
            e <- getNodeSet(measxml, paste("//Measurement[",ms,"]/Data[",ds,"]/E",sep=""))
            
            mes_df = NULL
            for(es in 1:length(e)){
              timexmldf <- xmlToDataFrame(getNodeSet(measxml, paste("//Measurement[",ms,"]/Data[",ds,"]/E[",es,"]/T",sep="")))
              #t = rbind(t, data.frame(timexmldf))
              #Time1<-as.POSIXct(strptime(timexmldf,format="%Y-%m-%dT%H:%M:%S"))
              valuexmldf <- xmlToDataFrame(getNodeSet(measxml, paste("//Measurement[",ms,"]/Data[",ds,"]/E[",es,"]/Value",sep="")))
              #print(valuexmldf)
              #v = rbind(v, data.frame(valuexmldf))
              mes_df = rbind(mes_df,data.frame(timexmldf,valuexmldf))
              
              
              ##Value1<-(as.character(valuexmldf))
              #print(Value1)
              #Value_df[nrow(Value_df) + 1, ] <- valuexmldf       
              #mydata <- merge(timexmldf, valuexmldf)
              #mes_df[nrow(mes_df) + 1, ] <- c(Time1, valuexmldf)
              #mes_df <- rbind(timexmldf, valuexmldf)
              #print(mes_df)
              #mes_df2[nrow(mes_df) + 1, ] <- mes_df
              
            }
            #print(mes)
            
            #print(mes_df)
            names(mes_df) <- c("Time", "Value")
            #print(mes_df)
            
            #Finding strings starting with "<"
            #m<-grepl(pattern = "^<",x =  mes_df$Value,perl = TRUE)
            l<-grepl(pattern = "<",x =  mes_df$Value,perl = TRUE)
            m<-grepl(pattern = ">",x =  mes_df$Value,perl = TRUE)
            
            low<-(sum(l))
            print(paste("Total Number of records with values below the detection range: ", low))
            
            # Select rows and do something
            print(mes_df[which(l==TRUE),])

            ab<-(sum(m))
            print(paste("Total Number of records with values of more than the detection range: ", ab))
            
            # Select rows and do something
            print(mes_df[which(m==TRUE),])
            
            new_mes_df <-(mes_df[which(l==FALSE),])
            #print(new_mes_df)
            new_mes_df2 = NULL
            Time1<-as.POSIXct(strptime(new_mes_df$Time,format="%Y-%m-%dT%H:%M:%S"))
            Value1<-(as.numeric(as.character(new_mes_df$Value)))
            new_mes_df2 = rbind(new_mes_df2,data.frame(Time1,Value1))
            #print(new_mes_df2)
            
            print(ggplot(new_mes_df2, aes(Time1, Value1)) +
                    geom_point(na.rm=TRUE, color="blue", size=3, pch=18) +
                    ggtitle(paste(measure,"\n ",siteid)) +
                    xlab("Date - below and above detection values excluded") + ylab(measure))
            
            
          }
          
        }
      }
      else
      {print(paste("URL Does not exist"))}
    }
    else
    {print(paste("ignore me"))}
  }
}
## [1] "ignore me"
## [1] Aniwaniwa Stream at Aniwaniwa
## Levels: Aniwaniwa Stream at Aniwaniwa
## [1] "Total Number of records with values below the detection range:  41"
##                   Time  Value
## 2  2005-05-16T12:55:00 <0.004
## 4  2005-11-21T13:00:00 <0.004
## 5  2006-02-13T14:15:00 <0.004
## 6  2006-05-29T13:50:00 <0.004
## 7  2006-08-15T13:30:00 <0.004
## 8  2006-11-27T13:00:00 <0.004
## 9  2007-02-26T13:35:00 <0.004
## 10 2007-05-30T15:15:00 <0.004
## 11 2007-08-27T14:30:00 <0.004
## 12 2007-11-15T14:00:00 <0.004
## 13 2008-02-25T15:27:00 <0.004
## 14 2008-05-14T15:30:00 <0.004
## 15 2008-08-06T15:20:00 <0.004
## 16 2008-11-10T15:23:00 <0.004
## 20 2009-11-17T07:30:00 <0.004
## 21 2010-02-10T08:45:00 <0.004
## 22 2010-05-25T08:30:00 <0.004
## 23 2010-08-30T12:00:00 <0.004
## 24 2010-11-30T13:00:00 <0.004
## 27 2011-08-29T12:30:00 <0.004
## 29 2012-02-20T14:00:00 <0.004
## 30 2012-06-05T11:53:00 <0.004
## 31 2012-07-25T11:06:00 <0.004
## 32 2012-08-21T11:00:00 <0.004
## 33 2012-09-25T11:09:00 <0.004
## 34 2012-11-07T11:03:00 <0.004
## 35 2012-12-18T10:03:00 <0.004
## 36 2013-02-19T10:55:00 <0.004
## 37 2013-04-02T12:30:00 <0.004
## 42 2013-08-27T12:59:00 <0.004
## 43 2013-09-26T12:50:00 <0.004
## 44 2013-10-30T12:12:00 <0.004
## 45 2013-11-28T11:30:07 <0.004
## 46 2013-12-19T12:06:58 <0.004
## 48 2014-02-24T13:16:36 <0.004
## 49 2014-03-26T11:39:55 <0.004
## 51 2014-05-28T12:11:43 <0.004
## 54 2014-09-02T13:35:00 <0.004
## 55 2014-10-10T09:06:34 <0.004
## 57 2014-11-24T16:30:00 <0.004
## 61 2015-03-31T14:19:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Aropaoanui River at Aropaoanui
## Levels: Aropaoanui River at Aropaoanui
## [1] "Total Number of records with values below the detection range:  1"
##                   Time  Value
## 32 2012-08-23T14:46:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Awanui Stream at Flume
## Levels: Awanui Stream at Flume
## [1] "Total Number of records with values below the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Esk River at Berry Road
## Levels: Esk River at Berry Road
## [1] "Total Number of records with values below the detection range:  1"
##                   Time  Value
## 13 2008-02-27T08:30:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Esk River at Waipunga Bridge
## Levels: Esk River at Waipunga Bridge
## [1] "Total Number of records with values below the detection range:  2"
##                   Time  Value
## 13 2008-02-27T10:15:00 <0.004
## 21 2010-02-26T00:00:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Hangaroa River at Doneraille Park
## Levels: Hangaroa River at Doneraille Park
## [1] "Total Number of records with values below the detection range:  17"
##                   Time  Value
## 4  2005-11-22T10:15:00 <0.004
## 5  2006-02-14T10:00:00 <0.004
## 9  2007-02-27T10:25:00 <0.004
## 11 2007-08-28T08:35:00 <0.004
## 13 2008-02-26T10:04:00 <0.004
## 16 2008-11-11T00:00:00 <0.004
## 18 2009-05-18T17:00:00 <0.004
## 23 2010-12-01T10:00:00 <0.004
## 26 2011-08-30T10:00:00 <0.004
## 27 2011-11-15T13:17:00 <0.004
## 28 2012-02-21T09:13:00 <0.004
## 33 2012-11-07T15:30:00 <0.004
## 34 2012-12-18T12:46:00 <0.004
## 35 2013-02-19T14:55:00 <0.004
## 38 2013-05-22T14:20:00 <0.004
## 43 2013-10-30T15:31:00 <0.004
## 54 2014-10-09T15:45:32 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Herehere Stream at Te Aute Road
## Levels: Herehere Stream at Te Aute Road
## [1] "Total Number of records with values below the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Karewarewa Stream at Paki Paki
## Levels: Karewarewa Stream at Paki Paki
## [1] "Total Number of records with values below the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Kopuawhara Stream at Railway Bridge
## Levels: Kopuawhara Stream at Railway Bridge
## [1] "Total Number of records with values below the detection range:  33"
##                   Time  Value
## 4  2005-11-22T07:00:00 <0.004
## 5  2006-02-14T07:12:00 <0.004
## 6  2006-05-30T07:50:00 <0.004
## 8  2006-11-28T07:15:00 <0.004
## 9  2007-02-27T07:15:00 <0.004
## 10 2007-05-31T11:20:00 <0.004
## 11 2007-08-28T12:10:00 <0.004
## 12 2007-11-19T07:20:00 <0.008
## 13 2008-02-26T07:30:00 <0.004
## 17 2009-02-11T07:00:00 <0.004
## 18 2009-05-20T07:15:00 <0.004
## 20 2009-11-18T06:30:00 <0.004
## 21 2010-02-10T08:50:00 <0.004
## 24 2010-12-01T13:00:00 <0.004
## 28 2011-08-30T11:40:00 <0.004
## 29 2011-11-16T08:23:00 <0.004
## 30 2012-02-21T14:47:00 <0.004
## 31 2012-06-06T10:19:00 <0.004
## 34 2012-09-26T08:19:00 <0.004
## 36 2012-12-19T07:28:00 <0.004
## 37 2013-02-20T08:01:00 <0.004
## 38 2013-04-03T07:00:00 <0.004
## 39 2013-04-24T08:40:00 <0.004
## 40 2013-05-23T08:25:00 <0.004
## 43 2013-08-28T09:50:00 <0.004
## 45 2013-10-31T09:04:00 <0.004
## 47 2013-12-20T08:36:52 <0.004
## 49 2014-02-25T08:39:00 <0.004
## 50 2014-03-27T08:51:01 <0.004
## 52 2014-05-29T09:22:43 <0.004
## 57 2014-10-31T10:15:34 <0.004
## 61 2015-02-18T12:42:00 <0.004
## 62 2015-04-01T09:32:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Makaretu Stream at State Highway 50
## Levels: Makaretu Stream at State Highway 50
## [1] "Total Number of records with values below the detection range:  12"
##                   Time  Value
## 13 2006-01-19T08:45:00 <0.004
## 22 2006-10-30T10:25:00 <0.004
## 24 2006-12-20T09:40:00 <0.004
## 25 2007-01-26T09:45:00 <0.004
## 43 2008-08-12T11:00:00 <0.004
## 44 2008-08-28T11:40:00 <0.004
## 46 2008-10-30T10:19:00 <0.004
## 50 2009-02-18T11:30:00 <0.004
## 58 2009-10-27T12:00:00 <0.004
## 59 2009-11-12T12:06:00 <0.004
## 71 2010-11-11T10:05:00 <0.004
## 87 2011-12-22T11:00:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Mangakuri River at Kairakau
## Levels: Mangakuri River at Kairakau
## [1] "Total Number of records with values below the detection range:  43"
##                   Time  Value
## 2  2005-05-11T08:55:00 <0.004
## 3  2005-08-03T12:10:00 <0.004
## 4  2005-11-09T11:45:00 <0.004
## 5  2006-02-01T11:10:00 <0.004
## 8  2006-11-01T07:30:00 <0.004
## 9  2007-02-14T12:15:00 <0.004
## 12 2007-11-27T12:00:00 <0.004
## 13 2008-02-11T08:05:00 <0.004
## 14 2008-05-01T09:20:00 <0.004
## 15 2008-08-04T00:40:00 <0.004
## 16 2008-11-18T09:35:00 <0.004
## 17 2009-02-19T09:40:00 <0.004
## 20 2009-11-19T09:10:00 <0.004
## 24 2010-11-24T11:40:00 <0.004
## 25 2011-03-08T09:30:00 <0.004
## 26 2011-05-16T10:13:00 <0.004
## 27 2011-08-09T13:00:00 <0.004
## 28 2011-11-10T15:30:00 <0.004
## 29 2012-02-23T16:00:00 <0.004
## 31 2012-07-18T13:39:00 <0.004
## 33 2012-09-12T14:25:00 <0.004
## 34 2012-10-24T12:35:00 <0.004
## 35 2012-11-09T12:45:00 <0.004
## 36 2012-12-10T11:10:00 <0.004
## 37 2013-01-16T12:40:00 <0.004
## 38 2013-02-18T13:56:00 <0.004
## 39 2013-04-10T15:40:00 <0.004
## 44 2013-09-23T14:37:00 <0.004
## 47 2013-12-18T10:15:00 <0.004
## 48 2014-01-16T14:13:46 <0.004
## 49 2014-02-28T12:44:00 <0.004
## 50 2014-03-24T14:00:00 <0.004
## 52 2014-05-14T16:00:47 <0.004
## 53 2014-06-23T13:30:00 <0.004
## 55 2014-08-14T15:47:00 <0.004
## 57 2014-10-16T15:26:14 <0.004
## 59 2014-12-03T14:13:00 <0.004
## 60 2015-01-29T15:20:00 <0.004
## 62 2015-03-11T15:00:00 <0.004
## 63 2015-04-29T10:57:00 <0.004
## 68 2015-09-17T15:53:00 <0.001
## 69 2015-10-21T15:33:00 <0.001
## 70 2015-11-17T14:00:00 <0.001
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Mangaone River at Rissington
## Levels: Mangaone River at Rissington
## [1] "Total Number of records with values below the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Mangaonuku Stream at Waipawa Tikokino Rd
## Levels: Mangaonuku Stream at Waipawa Tikokino Rd
## [1] "Total Number of records with values below the detection range:  9"
##                   Time  Value
## 11 2007-11-30T08:20:00 <0.004
## 21 2008-09-25T08:45:00 <0.004
## 22 2008-10-30T14:11:00 <0.004
## 25 2009-01-20T10:00:00 <0.004
## 33 2009-09-10T10:45:00 <0.004
## 35 2009-11-12T09:40:00 <0.004
## 39 2010-03-22T09:50:00 <0.004
## 40 2010-04-13T11:10:00 <0.004
## 81 2013-10-21T11:00:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Mangaorapa Stream at Mangaorapa Road
## Levels: Mangaorapa Stream at Mangaorapa Road
## [1] "Total Number of records with values below the detection range:  48"
##                   Time  Value
## 2  2005-05-11T10:35:00 <0.004
## 3  2005-08-03T10:10:00 <0.004
## 4  2005-11-09T09:00:00 <0.004
## 5  2006-02-01T08:30:00 <0.004
## 8  2006-11-01T09:45:00 <0.004
## 9  2007-02-14T10:05:00 <0.004
## 10 2007-05-29T11:40:00 <0.004
## 12 2007-11-27T09:05:00 <0.004
## 13 2008-02-11T10:33:00 <0.004
## 14 2008-05-01T11:00:00 <0.004
## 15 2008-08-04T22:40:00 <0.004
## 16 2008-11-18T12:15:00 <0.004
## 17 2009-02-19T12:40:00 <0.004
## 18 2009-05-18T13:15:00 <0.004
## 19 2009-08-20T13:20:00 <0.004
## 21 2010-02-17T11:45:00 <0.004
## 22 2010-05-03T12:58:00 <0.004
## 24 2010-11-24T13:45:00 <0.004
## 25 2011-03-08T14:00:00 <0.004
## 26 2011-05-16T12:18:00 <0.004
## 28 2011-11-10T10:12:00 <0.004
## 29 2012-02-23T10:30:00 <0.004
## 33 2012-09-12T11:59:00 <0.004
## 34 2012-10-24T10:15:00 <0.004
## 35 2012-11-09T10:56:00 <0.004
## 36 2012-12-10T13:30:00 <0.004
## 37 2013-01-16T10:10:00 <0.004
## 38 2013-02-18T09:44:00 <0.004
## 39 2013-04-10T11:00:00 <0.004
## 40 2013-05-22T11:30:00 <0.004
## 44 2013-09-23T11:50:00 <0.004
## 45 2013-10-15T11:00:00 <0.004
## 47 2013-12-18T11:40:00 <0.004
## 48 2014-01-16T10:59:07 <0.004
## 49 2014-02-28T10:30:00 <0.004
## 50 2014-03-24T11:30:00 <0.004
## 52 2014-05-14T13:05:30 <0.004
## 54 2014-07-17T11:18:34 <0.004
## 56 2014-09-09T10:42:49 <0.004
## 57 2014-10-16T11:18:19 <0.004
## 58 2014-11-20T11:42:00 <0.004
## 59 2014-12-03T11:59:00 <0.004
## 60 2015-01-29T12:28:00 <0.004
## 61 2015-02-19T11:58:00 <0.004
## 62 2015-03-11T11:00:00 <0.004
## 68 2015-09-17T11:41:00 <0.001
## 69 2015-10-21T11:27:00 <0.001
## 70 2015-11-17T14:00:00 <0.001
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Mangatarata Stream at Mangatarata Road
## Levels: Mangatarata Stream at Mangatarata Road
## [1] "Total Number of records with values below the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Maraetotara River at Te Awanga
## Levels: Maraetotara River at Te Awanga
## [1] "Total Number of records with values below the detection range:  20"
##                   Time  Value
## 4  2005-11-10T09:25:00 <0.004
## 10 2007-05-18T08:55:00 <0.004
## 12 2007-11-08T08:05:00 <0.004
## 13 2008-02-13T08:00:00 <0.004
## 16 2008-11-14T00:00:00 <0.004
## 20 2009-11-05T00:00:00 <0.004
## 22 2010-05-05T08:25:00 <0.004
## 28 2011-11-11T09:35:00 <0.004
## 29 2012-02-19T00:00:00 <0.004
## 34 2012-10-03T15:30:00 <0.004
## 35 2012-11-06T12:15:00 <0.004
## 36 2012-12-13T13:00:00 <0.004
## 38 2013-02-13T08:30:00 <0.004
## 40 2013-04-16T10:51:00 <0.004
## 45 2013-09-24T13:51:00 <0.004
## 46 2013-10-08T00:00:00 <0.004
## 48 2013-12-13T00:00:00 <0.004
## 49 2014-01-20T10:00:00 <0.004
## 59 2014-11-21T09:02:00 <0.004
## 64 2015-04-09T09:17:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Maraetotara River at Waimarama Road
## Levels: Maraetotara River at Waimarama Road
## [1] "Total Number of records with values below the detection range:  9"
##                   Time  Value
## 13 2008-02-13T09:10:00 <0.004
## 17 2009-02-13T10:40:00 <0.004
## 20 2009-11-05T07:30:00 <0.004
## 22 2010-05-05T09:30:00 <0.004
## 35 2012-11-06T11:30:00 <0.004
## 36 2012-12-13T12:15:00 <0.004
## 38 2013-02-13T13:45:00 <0.004
## 45 2013-09-24T12:46:00 <0.004
## 48 2014-01-20T09:30:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Mokomokonui Stream U/S Waipunga
## Levels: Mokomokonui Stream U/S Waipunga
## [1] "Total Number of records with values below the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Ngaruroro River at Fernhill
## Levels: Ngaruroro River at Fernhill
## [1] "Total Number of records with values below the detection range:  13"
##                   Time  Value
## 9  2007-02-15T10:40:00 <0.004
## 10 2007-05-25T09:30:00 <0.004
## 12 2007-11-21T09:10:00 <0.004
## 13 2008-02-15T13:57:00 <0.004
## 17 2009-02-27T13:36:00 <0.004
## 20 2009-11-04T13:15:00 <0.004
## 24 2010-11-09T13:00:00 <0.004
## 36 2012-12-04T13:11:00 <0.004
## 37 2013-01-10T12:10:00 <0.004
## 39 2013-03-05T13:30:00 <0.004
## 40 2013-04-09T11:20:00 <0.004
## 50 2014-02-20T13:30:00 <0.004
## 61 2015-01-21T15:30:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] Ngaruroro River at Whanawhana
## Levels: Ngaruroro River at Whanawhana
## [1] "Total Number of records with values below the detection range:  50"
##                   Time  Value
## 3  2005-08-08T12:50:00 <0.004
## 4  2005-11-17T11:40:00 <0.004
## 5  2006-02-27T00:00:00 <0.004
## 6  2006-05-26T12:30:00 <0.004
## 8  2006-11-08T10:15:00 <0.004
## 9  2007-02-16T10:05:00 <0.004
## 10 2007-05-25T12:30:00 <0.004
## 11 2007-08-10T09:30:00 <0.004
## 12 2007-11-20T08:45:00 <0.004
## 13 2008-02-15T00:00:00 <0.004
## 14 2008-05-21T09:25:00 <0.004
## 15 2008-08-18T14:00:00 <0.004
## 16 2008-11-04T12:10:00 <0.004
## 17 2009-02-26T09:00:00 <0.004
## 18 2009-05-05T09:00:00 <0.004
## 19 2009-08-06T09:10:00 <0.004
## 21 2010-02-04T08:58:00 <0.004
## 24 2010-11-09T08:45:00 <0.004
## 25 2011-03-15T07:55:00 <0.004
## 27 2011-08-23T09:40:00 <0.004
## 28 2011-11-09T08:15:00 <0.004
## 29 2012-03-14T07:53:00 <0.004
## 30 2012-05-22T09:48:00 <0.004
## 31 2012-07-03T09:31:00 <0.004
## 33 2012-09-06T10:25:00 <0.004
## 34 2012-10-01T10:00:00 <0.004
## 35 2012-11-15T12:15:00 <0.004
## 36 2012-12-04T09:22:00 <0.004
## 37 2013-01-10T07:00:00 <0.004
## 38 2013-02-05T11:00:00 <0.004
## 39 2013-03-05T10:57:00 <0.004
## 40 2013-04-09T12:00:00 <0.004
## 41 2013-05-08T11:15:00 <0.004
## 42 2013-06-05T11:35:00 <0.004
## 43 2013-07-02T11:31:00 <0.004
## 45 2013-09-11T11:28:00 <0.004
## 48 2013-12-11T12:30:00 <0.004
## 49 2014-01-29T11:26:07 <0.004
## 50 2014-02-20T13:23:44 <0.004
## 51 2014-03-25T11:30:00 <0.004
## 53 2014-05-20T14:30:00 <0.004
## 55 2014-07-24T12:18:36 <0.004
## 56 2014-08-21T14:07:00 <0.004
## 57 2014-09-22T12:54:22 <0.004
## 58 2014-10-22T13:32:17 <0.004
## 59 2014-11-18T12:53:00 <0.004
## 60 2014-12-09T11:00:00 <0.004
## 61 2015-01-21T10:50:00 <0.004
## 62 2015-02-04T12:20:00 <0.004
## 64 2015-04-08T09:23:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Porangahau River at SH52 Opposite Quarry
## Levels: Porangahau River at SH52 Opposite Quarry
## [1] "Total Number of records with values below the detection range:  38"
##                   Time  Value
## 1  2005-01-31T09:50:00 <0.004
## 3  2005-08-03T10:50:00 <0.004
## 4  2005-11-09T11:00:00 <0.004
## 5  2006-02-01T09:30:00 <0.004
## 8  2006-11-01T09:15:00 <0.004
## 9  2007-02-14T10:45:00 <0.004
## 10 2007-05-29T09:50:00 <0.004
## 12 2007-11-27T09:55:00 <0.004
## 13 2008-02-11T09:48:00 <0.004
## 14 2008-05-01T10:25:00 <0.004
## 16 2008-11-18T11:30:00 <0.004
## 17 2008-12-18T10:00:00 <0.004
## 18 2009-02-19T11:45:00 <0.004
## 19 2009-05-18T12:15:00 <0.004
## 21 2009-11-19T11:00:00 <0.004
## 23 2010-05-03T12:20:00 <0.004
## 25 2010-11-24T13:15:00 <0.004
## 26 2011-03-08T12:15:00 <0.004
## 30 2012-02-23T00:00:00 <0.004
## 34 2012-09-12T12:45:00 <0.004
## 35 2012-10-24T10:50:00 <0.004
## 36 2012-11-09T11:28:00 <0.004
## 37 2012-12-10T13:10:00 <0.004
## 38 2013-01-16T10:30:00 <0.004
## 39 2013-02-18T12:00:00 <0.004
## 40 2013-04-10T12:00:00 <0.004
## 41 2013-05-22T12:04:00 <0.004
## 49 2014-01-16T11:44:37 <0.004
## 50 2014-02-28T11:00:00 <0.004
## 51 2014-03-24T12:30:00 <0.004
## 55 2014-07-17T11:42:10 <0.004
## 59 2014-11-20T12:35:00 <0.004
## 60 2014-12-03T12:37:00 <0.004
## 61 2015-01-29T13:19:00 <0.004
## 62 2015-02-18T13:25:00 <0.004
## 63 2015-03-11T12:00:00 <0.004
## 64 2015-04-29T11:12:00 <0.004
## 69 2015-09-17T12:32:00 <0.001
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Porangahau Stream at Oruawhara Road
## Levels: Porangahau Stream at Oruawhara Road
## [1] "Total Number of records with values below the detection range:  8"
##                    Time  Value
## 14  2006-02-22T10:00:00 <0.004
## 25  2007-01-26T10:10:00 <0.004
## 37  2008-01-30T10:55:00 <0.004
## 38  2008-02-28T11:00:00 <0.004
## 49  2009-01-20T14:30:00 <0.004
## 50  2009-02-18T10:30:00 <0.004
## 59  2009-11-12T12:30:00 <0.004
## 109 2013-10-21T11:39:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Poukawa Stream at Stock Road
## Levels: Poukawa Stream at Stock Road
## [1] "Total Number of records with values below the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Puhokio Stream at Te Apiti Rd
## Levels: Puhokio Stream at Te Apiti Rd
## [1] "Total Number of records with values below the detection range:  28"
##                   Time  Value
## 5  2005-11-10T08:35:00 <0.004
## 6  2006-02-02T09:40:00 <0.004
## 10 2007-02-19T11:10:00 <0.004
## 11 2007-05-18T11:20:00 <0.004
## 14 2008-02-13T11:10:00 <0.004
## 18 2009-02-13T13:00:00 <0.004
## 30 2012-02-19T12:28:00 <0.004
## 34 2012-09-05T11:42:00 <0.004
## 35 2012-10-03T12:50:00 <0.004
## 36 2012-11-06T10:40:00 <0.004
## 37 2012-12-13T10:30:00 <0.004
## 38 2013-01-17T11:30:00 <0.004
## 39 2013-02-13T10:40:00 <0.004
## 40 2013-03-13T10:45:00 <0.004
## 41 2013-04-16T12:56:00 <0.004
## 42 2013-05-16T11:20:00 <0.004
## 46 2013-09-24T11:04:00 <0.004
## 47 2013-10-08T10:30:00 <0.004
## 49 2013-12-13T10:00:00 <0.004
## 50 2014-01-20T09:00:00 <0.004
## 51 2014-02-19T09:10:11 <0.004
## 59 2014-10-28T13:09:40 <0.004
## 60 2014-11-21T11:49:00 <0.004
## 62 2015-01-08T09:37:00 <0.004
## 63 2015-02-11T10:44:00 <0.004
## 64 2015-03-23T10:00:00 <0.004
## 65 2015-04-09T12:06:00 <0.004
## 71 2015-10-28T11:07:00 <0.001
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] Ripia River U/S Mohaka
## Levels: Ripia River U/S Mohaka
## [1] "Total Number of records with values below the detection range:  21"
##                   Time  Value
## 5  2006-02-08T12:10:00 <0.004
## 7  2006-08-14T08:50:00 <0.004
## 9  2007-02-22T14:50:00 <0.004
## 12 2007-12-06T11:00:00 <0.004
## 13 2008-02-22T09:30:00 <0.004
## 16 2008-11-20T09:23:00 <0.004
## 20 2009-11-18T09:00:00 <0.004
## 22 2010-05-19T09:45:00 <0.004
## 24 2010-11-16T09:30:00 <0.004
## 25 2011-02-22T12:25:00 <0.004
## 27 2011-08-19T11:00:00 <0.004
## 38 2012-11-22T00:00:00 <0.004
## 39 2012-12-05T08:47:00 <0.004
## 40 2013-01-17T09:00:00 <0.004
## 41 2013-01-23T10:34:00 <0.004
## 43 2013-02-26T11:39:00 <0.004
## 45 2013-04-11T14:00:00 <0.004
## 55 2014-02-14T12:12:23 <0.004
## 56 2014-03-12T11:30:00 <0.004
## 66 2015-02-05T11:23:00 <0.004
## 67 2015-03-05T14:19:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Ruakituri River at Sports Ground
## Levels: Ruakituri River at Sports Ground
## [1] "Total Number of records with values below the detection range:  25"
##                   Time  Value
## 4  2005-11-22T11:00:00 <0.004
## 5  2006-02-14T10:50:00 <0.004
## 8  2006-11-28T09:20:00 <0.004
## 9  2007-02-27T09:45:00 <0.004
## 10 2007-05-31T09:30:00 <0.004
## 12 2007-11-15T10:15:00 <0.004
## 13 2008-02-26T10:53:00 <0.004
## 15 2008-08-07T09:00:00 <0.004
## 16 2008-11-11T08:27:00 <0.004
## 17 2009-02-10T15:00:00 <0.004
## 18 2009-05-18T17:00:00 <0.004
## 20 2009-11-17T15:37:00 <0.004
## 24 2010-12-01T11:15:00 <0.004
## 27 2011-08-30T09:10:00 <0.004
## 34 2012-11-07T14:30:00 <0.004
## 35 2012-12-18T14:30:00 <0.004
## 36 2013-02-19T12:25:00 <0.004
## 37 2013-04-02T15:00:00 <0.004
## 39 2013-05-22T13:30:00 <0.004
## 42 2013-08-27T16:39:00 <0.004
## 44 2013-10-30T16:27:00 <0.004
## 48 2014-02-24T15:37:56 <0.004
## 51 2014-05-28T15:02:00 <0.004
## 55 2014-10-09T14:03:29 <0.004
## 61 2015-03-31T16:08:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Sandy Creek U/S Lake Tutira Outlet
## Levels: Sandy Creek U/S Lake Tutira Outlet
## [1] "Total Number of records with values below the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] Taharua Stream at Wairango Rd
## Levels: Taharua Stream at Wairango Rd
## [1] "Total Number of records with values below the detection range:  3"
##                   Time  Value
## 35 2007-12-05T09:00:00 <0.004
## 48 2009-02-25T14:30:00 <0.004
## 53 2009-07-16T09:15:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Taharua Stream at Wrights Twin Culvert
## Levels: Taharua Stream at Wrights Twin Culvert
## [1] "Total Number of records with values below the detection range:  5"
##                   Time  Value
## 7  2005-07-21T11:10:00 <0.004
## 47 2009-01-27T13:00:00 <0.004
## 53 2009-07-16T09:50:00 <0.004
## 59 2010-01-28T14:00:00 <0.004
## 94 2013-02-04T15:00:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Taipo Stream at Church Road
## Levels: Taipo Stream at Church Road
## [1] "Total Number of records with values below the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Taurekaitai Stream at Wallingford
## Levels: Taurekaitai Stream at Wallingford
## [1] "Total Number of records with values below the detection range:  17"
##                   Time  Value
## 1  2005-01-31T08:00:00 <0.004
## 3  2005-08-03T09:10:00 <0.004
## 4  2005-11-09T08:30:00 <0.004
## 5  2006-02-01T07:45:00 <0.004
## 10 2007-11-27T08:25:00 <0.004
## 13 2008-11-18T13:00:00 <0.004
## 19 2010-05-03T13:50:00 <0.004
## 31 2012-10-24T09:30:00 <0.004
## 32 2012-11-09T10:24:00 <0.004
## 33 2012-12-10T14:30:00 <0.004
## 35 2013-02-18T08:26:00 <0.004
## 36 2013-04-10T10:30:00 <0.004
## 45 2014-01-16T10:30:36 <0.004
## 46 2014-02-28T09:30:00 <0.004
## 47 2014-03-24T11:00:00 <0.004
## 56 2014-12-03T11:08:00 <0.004
## 58 2015-02-19T11:07:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Tukipo River at State Highway 50
## Levels: Tukipo River at State Highway 50
## [1] "Total Number of records with values below the detection range:  5"
##                   Time  Value
## 25 2007-01-26T09:25:00 <0.004
## 59 2009-11-12T11:30:00 <0.004
## 63 2010-03-22T10:55:00 <0.004
## 71 2010-11-11T10:20:00 <0.004
## 78 2011-06-23T12:15:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Tukituki River at Ashcott Bridge S.H. 50
## Levels: Tukituki River at Ashcott Bridge S.H. 50
## [1] "Total Number of records with values below the detection range:  62"
##                    Time  Value
## 6   2005-06-28T10:15:00 <0.004
## 7   2005-07-28T11:45:00 <0.004
## 9   2005-09-26T12:05:00 <0.004
## 10  2005-10-27T11:08:00 <0.004
## 11  2005-11-25T09:40:00 <0.004
## 13  2006-01-19T09:55:00 <0.004
## 14  2006-02-22T11:20:00 <0.004
## 17  2006-05-25T09:40:00 <0.004
## 21  2006-09-28T10:45:00 <0.004
## 22  2006-10-30T08:45:00 <0.004
## 23  2006-11-30T08:15:00 <0.004
## 24  2006-12-20T09:10:00 <0.004
## 25  2007-01-26T09:05:00 <0.004
## 26  2007-02-20T10:15:00 <0.004
## 28  2007-04-26T10:20:00 <0.004
## 29  2007-06-05T10:15:00 <0.004
## 32  2007-08-30T10:15:00 <0.004
## 33  2007-09-27T09:55:00 <0.004
## 35  2007-11-30T09:05:00 <0.004
## 36  2008-01-11T10:15:00 <0.004
## 37  2008-01-30T09:50:00 <0.004
## 38  2008-02-28T08:30:00 <0.004
## 39  2008-03-27T10:30:00 <0.004
## 41  2008-05-29T10:00:00 <0.004
## 42  2008-06-23T11:30:00 <0.004
## 43  2008-08-12T09:35:00 <0.004
## 44  2008-08-28T12:20:00 <0.004
## 46  2008-10-30T08:21:00 <0.004
## 47  2008-11-18T00:00:00 <0.004
## 48  2008-12-17T11:30:00 <0.004
## 49  2009-01-20T11:50:00 <0.004
## 50  2009-02-18T14:30:00 <0.004
## 56  2009-08-13T12:45:00 <0.004
## 58  2009-10-27T01:40:00 <0.004
## 59  2009-11-12T11:00:00 <0.004
## 62  2010-03-22T10:50:00 <0.004
## 63  2010-04-12T11:45:00 <0.004
## 64  2010-05-17T13:30:00 <0.004
## 70  2010-11-11T11:20:00 <0.004
## 72  2011-01-19T10:55:00 <0.004
## 73  2011-02-16T12:00:00 <0.004
## 77  2011-06-23T11:45:00 <0.004
## 79  2011-08-18T00:00:00 <0.004
## 80  2011-09-13T12:18:00 <0.004
## 81  2011-10-26T11:46:00 <0.004
## 86  2011-12-22T09:45:00 <0.004
## 87  2012-01-17T09:45:00 <0.004
## 88  2012-01-26T15:00:00 <0.004
## 89  2012-01-31T15:14:00 <0.004
## 90  2012-02-08T14:30:00 <0.004
## 91  2012-02-20T13:30:00 <0.004
## 95  2012-05-29T10:40:00 <0.004
## 97  2012-07-31T08:15:00 <0.004
## 99  2012-09-27T09:44:00 <0.004
## 102 2013-02-01T08:30:00 <0.004
## 103 2013-02-21T09:26:00 <0.004
## 113 2013-12-17T09:33:29 <0.004
## 114 2014-01-22T11:00:00 <0.004
## 115 2014-02-26T10:46:02 <0.004
## 123 2014-10-21T11:10:56 <0.004
## 126 2015-01-27T14:15:00 <0.004
## 128 2015-04-02T13:06:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Tukituki River at Black Bridge
## Levels: Tukituki River at Black Bridge
## [1] "Total Number of records with values below the detection range:  28"
##                    Time  Value
## 11  2005-11-25T06:10:00 <0.004
## 22  2006-11-30T12:00:00 <0.004
## 23  2006-12-20T12:25:00 <0.004
## 24  2007-01-26T12:45:00 <0.004
## 25  2007-02-21T09:35:00 <0.004
## 26  2007-03-28T13:55:00 <0.004
## 27  2007-04-26T14:00:00 <0.004
## 28  2007-06-05T14:30:00 <0.004
## 34  2007-11-30T12:30:00 <0.004
## 35  2008-01-11T13:30:00 <0.004
## 37  2008-02-27T11:53:00 <0.004
## 44  2008-09-26T12:20:00 <0.004
## 47  2009-01-20T07:30:00 <0.004
## 48  2009-02-18T06:30:00 <0.004
## 49  2009-03-30T07:00:00 <0.004
## 51  2009-05-11T08:05:00 <0.004
## 57  2009-11-12T07:00:00 <0.004
## 61  2010-03-22T07:00:00 <0.004
## 62  2010-04-13T09:00:00 <0.004
## 69  2010-11-11T15:35:00 <0.004
## 70  2010-12-22T07:05:00 <0.004
## 76  2011-06-23T08:26:00 <0.004
## 82  2011-12-22T14:30:00 <0.004
## 96  2013-04-17T09:45:00 <0.004
## 97  2013-05-20T08:45:00 <0.004
## 105 2014-01-22T15:59:24 <0.004
## 118 2015-02-24T09:28:00 <0.004
## 119 2015-04-02T17:13:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Tukituki River at Red Bridge
## Levels: Tukituki River at Red Bridge
## [1] "Total Number of records with values below the detection range:  44"
##                    Time  Value
## 8   2005-08-29T08:20:00 <0.004
## 11  2005-11-25T06:30:00 <0.004
## 13  2006-01-19T06:40:00 <0.004
## 14  2006-02-22T07:40:00 <0.004
## 21  2006-09-28T13:30:00 <0.004
## 23  2006-11-30T11:30:00 <0.004
## 24  2006-12-20T11:55:00 <0.004
## 25  2007-01-26T12:10:00 <0.004
## 26  2007-02-21T10:25:00 <0.004
## 27  2007-03-28T13:20:00 <0.004
## 28  2007-04-26T13:40:00 <0.004
## 35  2007-11-30T12:00:00 <0.004
## 36  2008-01-11T12:00:00 <0.004
## 37  2008-01-30T12:40:00 <0.004
## 38  2008-02-27T11:25:00 <0.004
## 39  2008-03-28T07:30:00 <0.004
## 45  2008-09-26T13:00:00 <0.004
## 46  2008-10-31T08:13:00 <0.004
## 47  2008-11-05T00:00:00 <0.004
## 48  2008-12-18T08:50:00 <0.004
## 49  2009-01-20T08:33:00 <0.004
## 50  2009-02-18T15:30:00 <0.004
## 51  2009-03-30T07:40:00 <0.004
## 52  2009-04-24T08:30:00 <0.004
## 53  2009-05-11T08:45:00 <0.004
## 57  2009-09-10T08:20:00 <0.004
## 59  2009-11-12T07:45:00 <0.004
## 63  2010-03-22T07:20:00 <0.004
## 64  2010-04-13T09:20:00 <0.004
## 65  2010-05-17T10:20:00 <0.004
## 71  2010-11-11T15:03:00 <0.004
## 73  2011-01-19T09:00:00 <0.004
## 74  2011-02-16T15:40:00 <0.004
## 75  2011-03-17T14:02:00 <0.004
## 89  2012-05-29T16:50:00 <0.004
## 97  2013-02-21T16:00:00 <0.004
## 98  2013-03-21T11:10:00 <0.004
## 99  2013-05-20T10:30:00 <0.004
## 107 2014-01-22T14:57:33 <0.004
## 108 2014-02-26T15:30:00 <0.004
## 117 2014-11-19T13:57:00 <0.004
## 118 2014-12-11T13:43:00 <0.004
## 120 2015-02-24T10:44:00 <0.004
## 121 2015-04-02T16:10:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Tukituki River at Tamumu Br.
## Levels: Tukituki River at Tamumu Br.
## [1] "Total Number of records with values below the detection range:  9"
##                   Time  Value
## 3  2005-03-31T11:00:00 <0.004
## 13 2006-01-19T07:30:00 <0.004
## 25 2007-01-26T11:10:00 <0.004
## 38 2008-02-28T12:25:00 <0.004
## 50 2009-02-18T09:00:00 <0.004
## 59 2009-11-12T09:00:00 <0.004
## 63 2010-03-22T09:00:00 <0.004
## 73 2011-01-19T09:50:00 <0.004
## 74 2011-02-16T14:30:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] Tutaekuri River at Brookfields Bridge
## Levels: Tutaekuri River at Brookfields Bridge
## [1] "Total Number of records with values below the detection range:  3"
##                   Time  Value
## 10 2007-05-16T12:20:00 <0.004
## 13 2008-02-12T12:20:00 <0.004
## 38 2013-02-19T17:00:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Tutaekuri River at Lawrence Hut
## Levels: Tutaekuri River at Lawrence Hut
## [1] "Total Number of records with values below the detection range:  28"
##                   Time  Value
## 1  2005-02-03T09:15:00 <0.004
## 3  2005-08-08T09:30:00 <0.004
## 5  2006-02-10T08:10:00 <0.004
## 9  2007-02-16T11:35:00 <0.004
## 10 2007-05-16T09:30:00 <0.004
## 12 2007-11-13T10:35:00 <0.004
## 13 2008-02-12T07:45:00 <0.004
## 14 2008-05-13T09:40:00 <0.004
## 15 2008-08-15T10:10:00 <0.004
## 22 2009-11-16T12:00:00 <0.004
## 25 2010-08-26T10:05:00 <0.004
## 27 2011-03-09T08:48:00 <0.004
## 28 2011-05-18T13:00:00 <0.004
## 29 2011-08-25T09:38:00 <0.004
## 32 2012-05-21T10:43:00 <0.004
## 38 2012-12-14T08:05:00 <0.004
## 40 2013-02-19T07:00:00 <0.004
## 41 2013-03-25T09:15:00 <0.004
## 42 2013-04-22T08:48:00 <0.004
## 43 2013-05-14T09:19:00 <0.004
## 44 2013-06-10T09:30:00 <0.004
## 45 2013-07-10T09:00:00 <0.004
## 48 2013-10-09T10:04:00 <0.004
## 49 2013-11-12T09:00:19 <0.004
## 53 2014-04-03T08:46:13 <0.004
## 63 2015-01-09T09:49:00 <0.004
## 65 2015-03-27T00:00:00 <0.004
## 66 2015-04-28T10:02:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Tutaekuri Waimate Stm at Chesterhope
## Levels: Tutaekuri Waimate Stm at Chesterhope
## [1] "Total Number of records with values below the detection range:  1"
##                   Time  Value
## 19 2010-05-11T15:00:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Waiarua at S.H.5
## Levels: Waiarua at S.H.5
## [1] "Total Number of records with values below the detection range:  11"
##                   Time  Value
## 5  2006-02-08T07:45:00 <0.004
## 12 2007-12-05T11:15:00 <0.004
## 13 2008-02-22T07:35:00 <0.004
## 16 2008-11-20T10:05:00 <0.004
## 17 2009-02-23T11:00:00 <0.004
## 25 2011-02-23T10:10:00 <0.004
## 26 2011-05-24T09:00:00 <0.004
## 40 2013-01-23T00:00:00 <0.004
## 42 2013-02-26T09:46:00 <0.004
## 44 2013-04-03T09:30:00 <0.004
## 66 2015-03-02T14:00:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Waikari River at Glenbrook Road
## Levels: Waikari River at Glenbrook Road
## [1] "Total Number of records with values below the detection range:  9"
##                   Time  Value
## 4  2005-11-21T08:00:00 <0.004
## 7  2006-08-15T09:10:00 <0.004
## 15 2008-08-06T10:15:00 <0.004
## 20 2009-11-18T10:00:00 <0.004
## 23 2010-08-31T12:00:00 <0.004
## 26 2011-04-21T09:50:00 <0.004
## 29 2011-11-18T11:28:00 <0.004
## 46 2013-10-31T14:03:00 <0.004
## 57 2014-10-10T11:47:25 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Waingongoro Stream at Waimarama Road
## Levels: Waingongoro Stream at Waimarama Road
## [1] "Total Number of records with values below the detection range:  1"
##                   Time  Value
## 22 2010-05-05T10:00:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Waipawa River at State Highway 50
## Levels: Waipawa River at State Highway 50
## [1] "Total Number of records with values below the detection range:  68"
##                    Time  Value
## 3   2005-03-31T13:00:00 <0.004
## 6   2005-06-28T10:00:00 <0.004
## 7   2005-07-28T12:40:00 <0.004
## 8   2005-08-29T12:35:00 <0.004
## 9   2005-09-26T12:25:00 <0.004
## 10  2005-10-27T12:08:00 <0.004
## 11  2005-11-25T10:55:00 <0.004
## 13  2006-01-19T10:20:00 <0.004
## 14  2006-02-22T11:51:00 <0.004
## 17  2006-05-25T09:15:00 <0.004
## 22  2006-10-30T08:25:00 <0.004
## 23  2006-11-30T08:00:00 <0.004
## 24  2006-12-20T08:50:00 <0.004
## 25  2007-01-26T08:45:00 <0.004
## 26  2007-04-27T09:50:00 <0.004
## 27  2007-06-05T09:50:00 <0.004
## 30  2007-08-30T09:50:00 <0.004
## 31  2007-09-27T09:35:00 <0.004
## 33  2007-11-30T08:45:00 <0.004
## 34  2008-01-11T08:50:00 <0.004
## 35  2008-01-30T09:35:00 <0.004
## 36  2008-02-28T08:07:00 <0.004
## 37  2008-03-27T09:30:00 <0.004
## 41  2008-08-12T09:00:00 <0.004
## 42  2008-08-28T12:40:00 <0.004
## 43  2008-09-25T10:15:00 <0.004
## 44  2008-10-30T07:45:00 <0.004
## 45  2008-11-05T00:00:00 <0.004
## 46  2008-12-17T10:50:00 <0.004
## 47  2009-01-20T11:35:00 <0.004
## 48  2009-02-18T14:00:00 <0.004
## 49  2009-03-30T10:35:00 <0.004
## 54  2009-08-13T13:00:00 <0.004
## 55  2009-09-10T11:30:00 <0.004
## 56  2009-10-27T10:00:00 <0.004
## 57  2009-11-12T10:30:00 <0.004
## 60  2010-01-16T11:00:00 <0.004
## 61  2010-03-22T10:10:00 <0.004
## 62  2010-04-13T14:30:00 <0.004
## 63  2010-05-17T13:00:00 <0.004
## 67  2010-09-23T11:35:00 <0.004
## 69  2010-11-11T12:45:00 <0.004
## 70  2010-12-22T10:20:00 <0.004
## 71  2011-01-19T10:40:00 <0.004
## 72  2011-02-16T12:40:00 <0.004
## 73  2011-03-17T10:45:00 <0.004
## 76  2011-06-23T11:10:00 <0.004
## 78  2011-08-18T14:30:00 <0.004
## 79  2011-09-13T12:45:00 <0.004
## 80  2011-10-26T12:34:00 <0.004
## 81  2011-11-22T14:23:00 <0.004
## 82  2011-12-22T08:55:00 <0.004
## 84  2012-02-28T15:00:00 <0.004
## 86  2012-05-29T09:30:00 <0.004
## 87  2012-06-26T08:00:00 <0.004
## 90  2012-09-27T08:57:00 <0.004
## 91  2012-10-23T07:30:00 <0.004
## 92  2012-11-21T08:40:00 <0.004
## 93  2012-12-20T10:00:00 <0.004
## 94  2013-02-01T08:00:00 <0.004
## 95  2013-02-21T08:33:00 <0.004
## 96  2013-03-21T09:04:00 <0.004
## 106 2014-01-22T10:00:00 <0.004
## 107 2014-02-26T09:54:47 <0.004
## 116 2014-11-19T10:37:00 <0.004
## 118 2015-01-27T13:40:00 <0.004
## 119 2015-02-24T16:23:00 <0.004
## 120 2015-04-02T10:53:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Wairoa River at Railway Br.
## Levels: Wairoa River at Railway Br.
## [1] "Total Number of records with values below the detection range:  19"
##                   Time  Value
## 2  2005-05-16T16:30:00 <0.004
## 4  2005-11-22T09:15:00 <0.004
## 7  2006-08-15T16:20:00 <0.004
## 8  2006-11-27T15:50:00 <0.004
## 10 2007-05-31T10:20:00 <0.004
## 11 2007-08-28T10:15:00 <0.004
## 13 2008-02-26T11:45:00 <0.004
## 17 2009-02-11T09:30:00 <0.004
## 18 2009-05-20T09:50:00 <0.004
## 20 2009-11-17T12:30:00 <0.004
## 34 2012-12-19T10:30:00 <0.004
## 35 2013-02-20T12:44:00 <0.004
## 36 2013-04-03T11:25:00 <0.004
## 41 2013-08-28T12:42:00 <0.004
## 46 2014-01-28T11:51:36 <0.004
## 56 2014-11-25T12:51:00 <0.004
## 58 2015-01-29T12:53:00 <0.004
## 59 2015-02-18T15:34:00 <0.004
## 60 2015-04-01T12:48:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Waitio Stream at Ohiti Road
## Levels: Waitio Stream at Ohiti Road
## [1] "Total Number of records with values below the detection range:  1"
##                   Time  Value
## 13 2008-02-15T13:35:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Ngaruroro River D/S Hawkes Bay Dairies
## Levels: Ngaruroro River D/S Hawkes Bay Dairies
## [1] "Total Number of records with values below the detection range:  24"
##                   Time  Value
## 4  2005-11-17T11:30:00 <0.004
## 6  2006-05-26T11:25:00 <0.004
## 8  2006-11-08T12:00:00 <0.004
## 9  2007-02-16T08:35:00 <0.004
## 10 2007-05-25T11:20:00 <0.004
## 12 2007-11-21T12:30:00 <0.004
## 13 2008-02-15T12:07:00 <0.004
## 17 2009-02-27T11:12:00 <0.004
## 18 2009-05-05T10:47:00 <0.004
## 20 2009-11-04T10:30:00 <0.004
## 21 2010-02-04T10:00:00 <0.004
## 22 2010-05-11T11:00:00 <0.004
## 24 2010-11-09T10:30:00 <0.004
## 35 2012-11-15T13:50:00 <0.004
## 36 2012-12-04T11:00:00 <0.004
## 37 2013-01-10T10:00:00 <0.004
## 38 2013-02-05T13:09:00 <0.004
## 39 2013-03-05T13:40:00 <0.004
## 43 2013-07-02T13:10:00 <0.004
## 49 2014-01-29T13:05:09 <0.004
## 50 2014-02-20T15:12:57 <0.004
## 59 2014-11-18T14:32:00 <0.004
## 61 2015-01-21T12:45:00 <0.004
## 62 2015-02-04T15:27:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Clive River U/S Whakatu Rail Bridge
## Levels: Clive River U/S Whakatu Rail Bridge
## [1] "Total Number of records with values below the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] Taharua Stream at Red Hut Mohaka Confl
## Levels: Taharua Stream at Red Hut Mohaka Confl
## [1] "Total Number of records with values below the detection range:  19"
##                   Time  Value
## 6  2008-09-23T13:12:00 <0.004
## 15 2009-07-16T11:00:00 <0.004
## 20 2010-01-28T10:05:00 <0.004
## 22 2010-03-23T09:00:00 <0.004
## 35 2011-05-04T10:05:00 <0.004
## 36 2011-05-23T10:35:00 <0.004
## 37 2011-06-21T10:10:00 <0.004
## 43 2011-12-20T11:47:00 <0.004
## 44 2012-02-02T14:00:00 <0.004
## 47 2012-04-11T11:47:00 <0.004
## 56 2012-11-28T12:05:00 <0.004
## 57 2012-12-21T10:15:00 <0.004
## 58 2013-01-23T11:08:00 <0.004
## 59 2013-02-04T11:00:00 <0.004
## 60 2013-02-20T12:52:00 <0.004
## 61 2013-02-26T12:45:00 <0.004
## 73 2014-02-18T13:13:55 <0.004
## 74 2014-03-11T13:11:00 <0.004
## 85 2015-02-25T11:39:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Mohaka River D/S Taharua River Confluence
## Levels: Mohaka River D/S Taharua River Confluence
## [1] "URL Does not exist"
## [1] Mohaka River U/S Taharua River Confluence
## Levels: Mohaka River U/S Taharua River Confluence
## [1] "URL Does not exist"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] Mohaka River D/S Waipunga River
## Levels: Mohaka River D/S Waipunga River
## [1] "Total Number of records with values below the detection range:  24"
##                   Time  Value
## 2  2009-09-17T14:00:00 <0.004
## 3  2009-10-29T11:30:00 <0.004
## 5  2009-12-09T12:14:00 <0.004
## 6  2010-01-06T14:30:00 <0.004
## 8  2010-03-11T11:00:00 <0.004
## 9  2010-04-15T13:35:00 <0.004
## 16 2010-11-16T10:55:00 <0.004
## 17 2010-12-22T11:20:00 <0.004
## 19 2011-02-22T14:05:00 <0.004
## 21 2011-05-03T12:07:00 <0.004
## 27 2011-10-11T11:58:00 <0.004
## 29 2011-12-21T12:30:00 <0.004
## 31 2012-03-02T15:00:00 <0.004
## 34 2012-06-21T11:56:00 <0.004
## 40 2012-12-05T11:48:00 <0.004
## 41 2013-01-17T12:01:00 <0.004
## 43 2013-03-07T13:16:00 <0.004
## 44 2013-04-11T10:00:00 <0.004
## 53 2014-01-09T13:30:00 <0.004
## 54 2014-02-14T14:08:06 <0.004
## 55 2014-03-12T15:20:00 <0.004
## 56 2014-04-07T14:55:17 <0.004
## 58 2014-06-05T12:30:00 <0.004
## 66 2015-02-05T14:36:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] Mohaka River D/S Ripia River
## Levels: Mohaka River D/S Ripia River
## [1] "Total Number of records with values below the detection range:  23"
##                   Time  Value
## 3  2009-10-29T12:30:00 <0.004
## 5  2009-12-09T13:45:00 <0.004
## 7  2010-03-11T14:30:00 <0.004
## 8  2010-04-15T15:20:00 <0.004
## 13 2010-10-28T09:20:00 <0.004
## 16 2011-02-22T10:05:00 <0.004
## 24 2011-10-11T10:04:00 <0.004
## 26 2011-12-21T08:57:00 <0.004
## 27 2012-01-19T10:00:00 <0.004
## 28 2012-03-02T10:30:00 <0.004
## 31 2012-06-21T09:28:00 <0.004
## 36 2012-11-15T10:06:00 <0.004
## 37 2012-12-05T09:25:00 <0.004
## 38 2013-01-17T10:00:00 <0.004
## 39 2013-02-14T11:20:00 <0.004
## 40 2013-03-07T09:18:00 <0.004
## 41 2013-04-11T15:30:00 <0.004
## 50 2014-01-09T09:20:00 <0.004
## 51 2014-02-14T09:38:30 <0.004
## 52 2014-03-12T09:54:00 <0.004
## 53 2014-04-07T12:25:25 <0.004
## 55 2014-06-05T09:00:00 <0.004
## 63 2015-02-05T12:16:00 <0.004
## [1] "Total Number of records with values of more than the detection range:  0"
## [1] Time  Value
## <0 rows> (or 0-length row.names)

## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"
## [1] "ignore me"