Package interspread. September 7, Index 11. InterSpread Plus: summary information

Size: px
Start display at page:

Download "Package interspread. September 7, Index 11. InterSpread Plus: summary information"

Transcription

1 Package interspread September 7, 2012 Version Date Title Functions for analysing InterSpread Plus simulation output Author Mark Stevenson A package for analysing InterSpread Plus simulation output. Maintainer Mark Stevenson Depends R (>= 2.7.0), sp, sm, spatstat, RColorBrewer, spatialkernel License GPL (>= 2) URL R topics documented: is.about is.act is.boundary is.describemovt is.epicurve is.farms is.move is.sim Index 11 is.about InterSpread Plus: summary information A collection of functions for analysing InterSpread Plus simulation output. is.about() 1

2 2 is.boundary Details The most recent version of the interspread package can be obtained from: massey.ac.nz/ Author(s) Mark Stevenson, EpiCentre, IVABS, Massey University, Palmerston North New Zealand. is.act Details from an outbreak of foot-and-mouth disease This data set provides infection dates and location details of farms infected during an outbreak of foot-and-mouth disease. data(is.act) Format A data frame with the following variables: itno iteration number. time the estimated day of infection (relative to the date of infection of the index case). id farm identifier. type farm type. xcoord easting coordinate of the farm centroid. ycoord northing coordinate of the farm centroid. data(is.act) is.boundary Boundary of study area Polygon defining the boundary of a hypothetical study area. data(is.boundary)

3 is.describemovt 3 Format A two column data frame with the following variables: xcoord easting coordinates of the boundary vertices. ycoord northing coordinates of the boundary vertices. data(is.boundary) ## Not run: library(spatstat) ## Create an observation window. is.boundary is two column data frame with ## 173 rows. Reverse the row order and drop the last set of coordinates to ## coerce the data into a suitable format for spatstat: is.ow <- owin(poly = as.matrix(is.boundary[172:1,]), unitname = c("metre", "metres")) ## Method for SpatialPolygonsDataFrame object: ## is.ow <- as(as(is.boundary, "SpatialPolygonsDataFrame"), "owin") plot(is.ow, axes = TRUE) ## End(Not run) is.describemovt InterSpread Plus: describe parameterised movement patterns Returns descriptive statistics of the predicted number of events per iteration. is.describemovt(movements, ngrid = 100, min = 5, transform = 1000) Arguments movements ngrid min transform an eight column matrix listing the following data (in order): iteration number, time, outcome, easting of the location acting as the source of movement, northing of the location acting as the source of the movement, easting of the destination location, northing of the destination location, movement type. integer, specifying the number of grids to use for the smoothing function. integer, the minimum number of eligible distances required to compute a density estimate. scalar, distance values will be divided by this value (useful for converting metres into kilometres.)

4 4 is.epicurve ## Load data: data(is.move) move <- is.move$ex1 ## Select movements where type equals "MovementType10": id <- move[,8] == "MovementType10" move <- move[id, 1:8] rval <- is.describemovt(move, ngrid = 100, min = 5, transform = 1000) dim <- dim(rval$estimate) plot(rval$eval.points[,1], rval$estimate[,1], type = "l", xlim = c(0, 100), ylim = c(0, 0.1), xlab = "Distance (km)", ylab = "Density", col = "gray") for(i in 2:dim[2]){ lines(rval$eval.points[,i], rval$estimate[,i], col = "gray") } is.epicurve InterSpread Plus: epidemic curve Computes the cumulative number of locations predicted to experience an event as a function of time, suitable for plotting as an epidemic curve. is.epicurve(dat, daylim, xlim, ylim, n.iterations = 5, stats = FALSE, type = "cumulative", quant = c(0.25, 0.75)) Arguments dat daylim xlim ylim n.iterations stats a four column matrix listing the following data (in order): iteration number, time, easting of the location experiencing the event, northing of the location experiencing the event. vector of length two, defining the start and the end of the simulation period. vector of length two, defining map limits in the easting direction. vector of length two, defining map limits in the northing direction. integer defining the number of Interspread Plus iterations to be included. logical, if TRUE descriptive statistics of the cumulative number of infected premises at each epidemic time period are calculated. If FALSE the cumulative number of infected premises is reported for each iteration. type string indicating the type of analysis to performed. cumulative returns the cumulative number of events, frequency returns the count of events for each time period. quant vector of length two, defines the quantiles to be computed. Only used if stats = TRUE

5 is.farms 5 ## Load data: data(is.act) data(is.sim) ## Details of observed epidemic: act <- is.act[, c(1,2,5,6)] act[,3:4] <- act[,3:4]/1000 tmp <- as.data.frame(table(act$time)) tmp[,1] <- as.numeric(as.character(tmp[,1])) names(tmp) <- c("day", "n") ## Set boundaries of study area: xlim <- c(173,273) ylim <- c(340,440) ## Details of premises predicted to become infected by InterSpread Plus: inf <- is.sim$inf[, c(1,2,5,6)] inf[,3:4] <- inf[,3:4]/1000 ## Compare actual epidemic curve with that predicted by InterSpread Plus: fmd.pred <- is.epicurve(inf, daylim = c(0,60), xlim = xlim, ylim = ylim, n.iterations = 9, stats = FALSE, type = "cumulative", quant = c(0.25,0.75)) ## Plot results: plot(c(0,60), c(0,60), type = "n", xlab = "Simulation day", ylab = "Cumulative number of infected premises") for(i in 1:9){ lines(fmd.pred[,1], fmd.pred[,1+i], type = "s", lwd = 1) } lines(tmp$day, cumsum(tmp$n), type = "s", lwd = 2, col = "red") ## Compare actual epidemic curve with median, 25th percentile and 75th ## percentile, predicted by InterSpread Plus: fmd.pred <- is.epicurve(inf, daylim = c(0,60), xlim = xlim, ylim = ylim, n.iterations = 9, stats = TRUE, type = "cumulative") ## Plot results: plot(c(0, 60), c(0, 60), type = "n", xlab = "Simulation day", ylab = "Cumulative number of infected premises") lines(fmd.pred[,1], fmd.pred[,4], type = "s", lwd = 2) lines(fmd.pred[,1], fmd.pred[,5], type = "s", lwd = 1) lines(fmd.pred[,1], fmd.pred[,6], type = "s", lwd = 1) lines(tmp$day, cumsum(tmp$n), type = "s", lwd = 2, col = "red") legend(0, 50, legend = c("actual cumulative number IPs", "Predicted cumulative IPs (median of 9 iterations)", "25th and 75th prediction quartiles"), col = c("red", "black", "black"), lwd = c(3, 3, 1), bty = "n") is.farms Farm details

6 6 is.farms Format This data set provides, for a set of farms within a defined study area, details of location and the number of animals present. data(is.farms) A data frame with the following variables: id the primary farm identifier. farmid the secondary farm identifier. type farm type. cattle the number of cattle present. other the number of other (foot-and-mouth disease susceptible) species present. pigs the number of pigs present. xcoord easting coordinate of the farm centroid. ycoord northing coordinate of the farm centroid. data(is.farms) ## Not run: library(spatstat); library(rcolorbrewer); library(spatialkernel) data(is.boundary) data(is.farms) ## Create an observation window: is.ow <- owin(poly = as.matrix(is.boundary[172:1,]), unitname = c("metre", "metres")) ## Method for SpatialPolygonsDataFrame object: ## is.ow <- as(as(is.boundary, "SpatialPolygonsDataFrame"), "owin") # Create ppp object: farms.ppp <- ppp(x = is.farms$xcoord, y = is.farms$ycoord, window = is.ow) xylims <- rbind(range(is.farms$xcoord), range(is.farms$ycoord)) ## Method for SpatialPolygonsDataFrame object: ## xylims <- attr(is.boundary, "bbox") ratio <- (xylims[2,2] - xylims[2,1]) / (xylims[1,2] - xylims[1,1]) x.points <- seq(from = , to = , by = 10000); x.lab <- x.points/1000 y.points <- seq(from = , to = , by = 10000); y.lab <- y.points/1000 ## Plot farm locations: par(pin = c(1 * 5, ratio * 5), omi = c(0.5,0,0,0)) plot(x = xylims[1,], y = xylims[2,], xaxt = "n", yaxt = "n", type = "n", xlab = "", ylab = "", axes = TRUE)

7 is.move 7 points(x = is.farms$xcoord, y = is.farms$ycoord, col = "gray") plot(is.ow, add = TRUE) axis(side = 1, at = x.points, labels = x.lab, tick = TRUE, cex.axis = 0.80) axis(side = 2, at = y.points, labels = y.lab, tick = TRUE, cex.axis = 0.80) mtext("easting (km)", side = 1, line = 3, cex = 1.0) mtext("northing (km)", side = 2, line = 3, cex = 1.0) legend(x = "topleft", legend = "Farm locations", pch = 1, col = "gray", bty = "n") ## Set the bandwidth and grid dimensions: sigma <- 1200; dimyx = c(200, 200) ## Kernel smooth: farms.den <- density(farms.ppp, sigma = sigma, dimyx = dimyx) ## The density.ppp function returns an estimate of the intensity of the ## underlying point process, that is the expected number of points per unit ## area (in this case, the number of points per metre). Express results as ## the number of points per square kilometre (1 square metre = ## square kilometres): farms.den$v <- farms.den$v / summary(as.vector(farms.den$v)) ## Maximum farm density is 7 per farms per square kilometre. ## Image plot of farm density: breaks <- seq(from = 0, to = 7, length = 5) col <- brewer.pal(n = 4, name = "Blues") par(pin = c(1 * 5, ratio * 5), omi = c(0.5,0,0,0)) plot(x = xylims[1,], y = xylims[2,], type = "n", xlab = "Easting (m)", ylab = "Northing (m)", xaxt = "n", yaxt = "n") image(x = farms.den$xcol, y = farms.den$yrow, z = t(farms.den$v), zlim = c(0, 7), col = col, breaks = breaks, add = TRUE) plot(is.ow, add = TRUE) axis(side = 1, at = x.points, labels = x.lab, tick = TRUE, cex.axis = 0.80) axis(side = 2, at = y.points, labels = y.lab, tick = TRUE, cex.axis = 0.80) metre(xl = xylims[1,1], yb = xylims[2,1], xr = xylims[1,1] , yt = xylims[2,1] , lab = breaks, cols = col, shift = 0, cex = 0.75) ## End(Not run) is.move Movement details from an InterSpread Plus simulation This data set provides details of movement events generated during a typical InterSpread Plus simulation. data(is.move)

8 8 is.sim Format A list containing the following data frames: ex1 an eight column data frame listing the following (in order): itno iteration number, time time, outcome infection outcome (infected or not infected), src.xcoord easting of the location acting as the source of movement, src.ycoord northing of the location acting as the source of the movement, des.xcoord easting of the destination location, src.ycoord northing of the destination location, type movement type. ex2 an eight column data frame listing the following (in order): itno iteration number, time time, outcome infection outcome (infected or not infected), src.xcoord easting of the location acting as the source of movement, src.ycoord northing of the location acting as the source of the movement, des.xcoord easting of the destination location, src.ycoord northing of the destination location, type movement type. data(is.move) is.sim Details from an InterSpread Plus simulation This data set provides details from a typical InterSpread Plus simulation. data(is.sim) Format A list containing the following data frames: dep a nine column data frame listing the following (in order): itno iteration number, time time, id farm identifier, type depopulation resource, xcoord easting coordinate, xcoord northing coordinate, cattle cattle numbers, other other stock numbers, pigs pig numbers. det a six column data frame listing the following (in order): itno iteration number, time time, id farm identifier, type detection resource, xcoord easting coordinate, ycoord northing coordinate. inf a six column data frame listing the following (in order): itno iteration number, time time, id farm identifier, type infection mechanism, xcoordeasting coordinate, ycoord northing coordinate. vac a nine column data frame listing the following (in order): itno iteration number, time time, id farm identifier, type vaccination resource, xcoord easting coordinate, ycoord northing coordinate, cattle cattle numbers, other other stock numbers, pigs pig numbers.

9 is.sim 9 data(is.sim) ## Not run: library(spatstat); library(rcolorbrewer); library(spatialkernel) data(is.boundary) data(is.farms) ## Create an observation window: is.ow <- owin(poly = as.matrix(is.boundary[172:1,]), unitname = c("metre", "metres")) ## Method for SpatialPolygonsDataFrame object: ## is.ow <- as(as(is.boundary, "SpatialPolygonsDataFrame"), "owin") # Create ppp objects: farms.ppp <- ppp(x = is.farms$xcoord, y = is.farms$ycoord, window = is.ow) sim.ppp <- ppp(x = is.sim$inf$xcoord, y = is.sim$inf$ycoord, window = is.ow) xylims <- rbind(range(is.farms$xcoord), range(is.farms$ycoord)) ## Method for SpatialPolygonsDataFrame object: ## xylims <- attr(is.boundary, "bbox") ratio <- (xylims[2,2] - xylims[2,1]) / (xylims[1,2] - xylims[1,1]) x.points <- seq(from = , to = , by = 10000); x.lab <- x.points/1000 y.points <- seq(from = , to = , by = 10000); y.lab <- y.points/1000 ## Set the bandwidth and grid dimensions: sigma <- 1200; dimyx = c(200, 200) ## Kernel smooth: farms.den <- density(farms.ppp, sigma = sigma, dimyx = dimyx) sim.den <- density(sim.ppp, sigma = sigma, dimyx = dimyx) ## The density.ppp function returns an estimate of the intensity of the ## underlying point process, that is the expected number of points per unit ## area (in this case, the number of points per metre). Express results as ## the number of points per square kilometre (1 square metre = ## square kilometres): farms.den$v <- farms.den$v / summary(as.vector(farms.den$v)) ## Maximum farm density is 7 per farms per square kilometre. ## Do the same for the simulations. Note the division by 9, because simulation ## results are for 9 iterations: sim.den$v <- sim.den$v / summary(as.vector(sim.den$v) / 9) ## Image plot of farm density with superimposed contour plot to identify ## areas where the density of farms predicted to become infected was ## relatively high: breaks <- seq(from = 0, to = 7, length = 5) col <- brewer.pal(n = 4, name = "Blues")

10 10 is.sim par(pin = c(1 * 5, ratio * 5), omi = c(0.5,0,0,0)) plot(x = xylims[1,], y = xylims[2,], type = "n", xlab = "Easting (m)", ylab = "Northing (m)", xaxt = "n", yaxt = "n") image(x = farms.den$xcol, y = farms.den$yrow, z = t(farms.den$v), zlim = c(0, 7), col = col, breaks = breaks, add = TRUE) contour(x = sim.den$xcol, y = sim.den$yrow, z = t(sim.den$v / 9), levels = 0.02, col = "red", add = TRUE) plot(is.ow, add = TRUE) axis(side = 1, at = x.points, labels = x.lab, tick = TRUE, cex.axis = 0.80) axis(side = 2, at = y.points, labels = y.lab, tick = TRUE, cex.axis = 0.80) metre(xl = xylims[1,1], yb = xylims[2,1], xr = xylims[1,1] , yt = xylims[2,1] , lab = breaks, cols = col, shift = 0, cex = 0.75) ## End(Not run)

11 Index Topic datasets is.act, 2 is.boundary, 2 is.farms, 5 is.move, 7 is.sim, 8 Topic univar is.about, 1 is.describemovt, 3 is.epicurve, 4 is.about, 1 is.act, 2 is.boundary, 2 is.describemovt, 3 is.epicurve, 4 is.farms, 5 is.move, 7 is.sim, 8 11

Package leiv. R topics documented: February 20, Version Type Package

Package leiv. R topics documented: February 20, Version Type Package Version 2.0-7 Type Package Package leiv February 20, 2015 Title Bivariate Linear Errors-In-Variables Estimation Date 2015-01-11 Maintainer David Leonard Depends R (>= 2.9.0)

More information

Package bivariate. December 10, 2018

Package bivariate. December 10, 2018 Title Bivariate Probability Distributions Version 0.3.0 Date 2018-12-10 License GPL (>= 2) Package bivariate December 10, 2018 Maintainer Abby Spurdle Author Abby Spurdle URL https://sites.google.com/site/asrpws

More information

Package depth.plot. December 20, 2015

Package depth.plot. December 20, 2015 Package depth.plot December 20, 2015 Type Package Title Multivariate Analogy of Quantiles Version 0.1 Date 2015-12-19 Maintainer Could be used to obtain spatial depths, spatial ranks and outliers of multivariate

More information

Online Appendix to Mixed Modeling for Irregularly Sampled and Correlated Functional Data: Speech Science Spplications

Online Appendix to Mixed Modeling for Irregularly Sampled and Correlated Functional Data: Speech Science Spplications Online Appendix to Mixed Modeling for Irregularly Sampled and Correlated Functional Data: Speech Science Spplications Marianne Pouplier, Jona Cederbaum, Philip Hoole, Stefania Marin, Sonja Greven R Syntax

More information

Package gma. September 19, 2017

Package gma. September 19, 2017 Type Package Title Granger Mediation Analysis Version 1.0 Date 2018-08-23 Package gma September 19, 2017 Author Yi Zhao , Xi Luo Maintainer Yi Zhao

More information

Package clustergeneration

Package clustergeneration Version 1.3.4 Date 2015-02-18 Package clustergeneration February 19, 2015 Title Random Cluster Generation (with Specified Degree of Separation) Author Weiliang Qiu , Harry Joe

More information

Package rnmf. February 20, 2015

Package rnmf. February 20, 2015 Type Package Title Robust Nonnegative Matrix Factorization Package rnmf February 20, 2015 An implementation of robust nonnegative matrix factorization (rnmf). The rnmf algorithm decomposes a nonnegative

More information

Package mpmcorrelogram

Package mpmcorrelogram Type Package Package mpmcorrelogram Title Multivariate Partial Mantel Correlogram Version 0.1-4 Depends vegan Date 2017-11-17 Author Marcelino de la Cruz November 17, 2017 Maintainer Marcelino de la Cruz

More information

Package pearson7. June 22, 2016

Package pearson7. June 22, 2016 Version 1.0-2 Date 2016-06-21 Package pearson7 June 22, 2016 Title Maximum Likelihood Inference for the Pearson VII Distribution with Shape Parameter 3/2 Author John Hughes Maintainer John Hughes

More information

Canadian climate: function-on-function regression

Canadian climate: function-on-function regression Canadian climate: function-on-function regression Sarah Brockhaus Institut für Statistik, Ludwig-Maximilians-Universität München, Ludwigstraße 33, D-0539 München, Germany. The analysis is based on the

More information

The evdbayes Package

The evdbayes Package The evdbayes Package April 19, 2006 Version 1.0-5 Date 2006-18-04 Title Bayesian Analysis in Extreme Theory Author Alec Stephenson and Mathieu Ribatet. Maintainer Mathieu Ribatet

More information

Package CorrMixed. R topics documented: August 4, Type Package

Package CorrMixed. R topics documented: August 4, Type Package Type Package Package CorrMixed August 4, 2016 Title Estimate Correlations Between Repeatedly Measured Endpoints (E.g., Reliability) Based on Linear Mixed-Effects Models Version 0.1-13 Date 2015-03-08 Author

More information

Package CEC. R topics documented: August 29, Title Cross-Entropy Clustering Version Date

Package CEC. R topics documented: August 29, Title Cross-Entropy Clustering Version Date Title Cross-Entropy Clustering Version 0.9.4 Date 2016-04-23 Package CEC August 29, 2016 Author Konrad Kamieniecki [aut, cre], Przemyslaw Spurek [ctb] Maintainer Konrad Kamieniecki

More information

Package bpp. December 13, 2016

Package bpp. December 13, 2016 Type Package Package bpp December 13, 2016 Title Computations Around Bayesian Predictive Power Version 1.0.0 Date 2016-12-13 Author Kaspar Rufibach, Paul Jordan, Markus Abt Maintainer Kaspar Rufibach Depends

More information

Metric Predicted Variable on Two Groups

Metric Predicted Variable on Two Groups Metric Predicted Variable on Two Groups Tim Frasier Copyright Tim Frasier This work is licensed under the Creative Commons Attribution 4.0 International license. Click here for more information. Goals

More information

Matematisk statistik allmän kurs, MASA01:A, HT-15 Laborationer

Matematisk statistik allmän kurs, MASA01:A, HT-15 Laborationer Lunds universitet Matematikcentrum Matematisk statistik Matematisk statistik allmän kurs, MASA01:A, HT-15 Laborationer General information on labs During the rst half of the course MASA01 we will have

More information

Metric Predicted Variable on One Group

Metric Predicted Variable on One Group Metric Predicted Variable on One Group Tim Frasier Copyright Tim Frasier This work is licensed under the Creative Commons Attribution 4.0 International license. Click here for more information. Prior Homework

More information

Package gumbel. February 15, 2013

Package gumbel. February 15, 2013 Package gumbel February 15, 2013 Type Package Title Gumbel copula Version 1.04 Date 2012-07-31 Author Anne-Lise Caillat, Christophe Dutang, V eronique Larrieu and Triet Nguyen Maintainer Christophe Dutang

More information

Package jmcm. November 25, 2017

Package jmcm. November 25, 2017 Type Package Package jmcm November 25, 2017 Title Joint Mean-Covariance Models using 'Armadillo' and S4 Version 0.1.8.0 Maintainer Jianxin Pan Fit joint mean-covariance models

More information

Package ForwardSearch

Package ForwardSearch Package ForwardSearch February 19, 2015 Type Package Title Forward Search using asymptotic theory Version 1.0 Date 2014-09-10 Author Bent Nielsen Maintainer Bent Nielsen

More information

Package diffeq. February 19, 2015

Package diffeq. February 19, 2015 Version 1.0-1 Package diffeq February 19, 2015 Title Functions from the book Solving Differential Equations in R Author Karline Soetaert Maintainer Karline Soetaert

More information

Package PolynomF. May 17, 2018

Package PolynomF. May 17, 2018 Type Package Title Polynomials in R Package PolynomF May 17, 2018 Implements univariate polynomial operations in R, including polynomial arithmetic, finding zeros, plotting, and some operations on lists

More information

Package SK. May 16, 2018

Package SK. May 16, 2018 Type Package Package SK May 16, 2018 Title Segment-Based Ordinary Kriging and Segment-Based Regression Kriging for Spatial Prediction Date 2018-05-10 Version 1.1 Maintainer Yongze Song

More information

Package msir. R topics documented: April 7, Type Package Version Date Title Model-Based Sliced Inverse Regression

Package msir. R topics documented: April 7, Type Package Version Date Title Model-Based Sliced Inverse Regression Type Package Version 1.3.1 Date 2016-04-07 Title Model-Based Sliced Inverse Regression Package April 7, 2016 An R package for dimension reduction based on finite Gaussian mixture modeling of inverse regression.

More information

Package SpatPCA. R topics documented: February 20, Type Package

Package SpatPCA. R topics documented: February 20, Type Package Type Package Package SpatPCA February 20, 2018 Title Regularized Principal Component Analysis for Spatial Data Version 1.2.0.0 Date 2018-02-20 URL https://github.com/egpivo/spatpca BugReports https://github.com/egpivo/spatpca/issues

More information

Package idmtpreg. February 27, 2018

Package idmtpreg. February 27, 2018 Type Package Package idmtpreg February 27, 2018 Title Regression Model for Progressive Illness Death Data Version 1.1 Date 2018-02-23 Author Leyla Azarang and Manuel Oviedo de la Fuente Maintainer Leyla

More information

The Bernstein Mechansim

The Bernstein Mechansim The Bernstein Mechansim diffpriv team July 18, 2017 Abstract This vignette presents a short tutorial on the application of the generic Bernstein mechanism DPMechBernstein for differentially-private release

More information

Package clogitboost. R topics documented: December 21, 2015

Package clogitboost. R topics documented: December 21, 2015 Package December 21, 2015 Type Package Title Boosting Conditional Logit Model Version 1.1 Date 2015-12-09 Author Haolun Shi and Guosheng Yin Maintainer A set of functions to fit a boosting conditional

More information

Lecture 5 : The Poisson Distribution

Lecture 5 : The Poisson Distribution Lecture 5 : The Poisson Distribution Jonathan Marchini November 5, 2004 1 Introduction Many experimental situations occur in which we observe the counts of events within a set unit of time, area, volume,

More information

Package face. January 19, 2018

Package face. January 19, 2018 Package face January 19, 2018 Title Fast Covariance Estimation for Sparse Functional Data Version 0.1-4 Author Luo Xiao [aut,cre], Cai Li [aut], William Checkley [aut], Ciprian Crainiceanu [aut] Maintainer

More information

Package sklarsomega. May 24, 2018

Package sklarsomega. May 24, 2018 Type Package Package sklarsomega May 24, 2018 Title Measuring Agreement Using Sklar's Omega Coefficient Version 1.0 Date 2018-05-22 Author John Hughes Maintainer John Hughes

More information

Watersheds : Spatial watershed aggregation and spatial drainage network analysis

Watersheds : Spatial watershed aggregation and spatial drainage network analysis Watersheds : Spatial watershed aggregation and spatial drainage network analysis Jairo A. Torres Institute for Geoinformatics, University of Münster, Münster, Germany arturo.torres@uni-muenster.de August

More information

Package DiscreteLaplace

Package DiscreteLaplace Type Package Title Discrete Laplace Distributions Version 1.1.1 Date 2016-04-29 Package DiscreteLaplace May 1, 2016 Author Alessandro Barbiero , Riccardo Inchingolo

More information

Problems from Chapter 3 of Shumway and Stoffer s Book

Problems from Chapter 3 of Shumway and Stoffer s Book UNIVERSITY OF UTAH GUIDED READING TIME SERIES Problems from Chapter 3 of Shumway and Stoffer s Book Author: Curtis MILLER Supervisor: Prof. Lajos HORVATH November 10, 2015 UNIVERSITY OF UTAH DEPARTMENT

More information

Package msbp. December 13, 2018

Package msbp. December 13, 2018 Type Package Package msbp December 13, 2018 Title Multiscale Bernstein Polynomials for Densities Version 1.4 Date 2018-12-13 Author Antonio Canale Maintainer Antonio Canale Performs

More information

Measurement, Scaling, and Dimensional Analysis Summer 2017 METRIC MDS IN R

Measurement, Scaling, and Dimensional Analysis Summer 2017 METRIC MDS IN R Measurement, Scaling, and Dimensional Analysis Summer 2017 Bill Jacoby METRIC MDS IN R This handout shows the contents of an R session that carries out a metric multidimensional scaling analysis of the

More information

The sbgcop Package. March 9, 2007

The sbgcop Package. March 9, 2007 The sbgcop Package March 9, 2007 Title Semiparametric Bayesian Gaussian copula estimation Version 0.95 Date 2007-03-09 Author Maintainer This package estimates parameters of

More information

k-means clustering mark = which(md == min(md)) nearest[i] = ifelse(mark <= 5, "blue", "orange")}

k-means clustering mark = which(md == min(md)) nearest[i] = ifelse(mark <= 5, blue, orange)} 1 / 16 k-means clustering km15 = kmeans(x[g==0,],5) km25 = kmeans(x[g==1,],5) for(i in 1:6831){ md = c(mydist(xnew[i,],km15$center[1,]),mydist(xnew[i,],km15$center[2, mydist(xnew[i,],km15$center[3,]),mydist(xnew[i,],km15$center[4,]),

More information

ensemblebma: An R Package for Probabilistic Forecasting using Ensembles and Bayesian Model Averaging

ensemblebma: An R Package for Probabilistic Forecasting using Ensembles and Bayesian Model Averaging ensemblebma: An R Package for Probabilistic Forecasting using Ensembles and Bayesian Model Averaging Chris Fraley, Adrian E. Raftery Tilmann Gneiting, J. McLean Sloughter Technical Report No. 516 Department

More information

SUPPLEMENTARY MATERIAL TECHNICAL APPENDIX Article: Comparison of control charts for monitoring clinical performance using binary data

SUPPLEMENTARY MATERIAL TECHNICAL APPENDIX Article: Comparison of control charts for monitoring clinical performance using binary data SUPPLEMENTARY MATERIAL TECHNICAL APPENDIX Article: Comparison of control charts for monitoring clinical performance using binary data APPENDIX TABLES Table A1 Comparison of out-of-control ARLs, in number

More information

Package MTA. R topics documented: May 14, Title Multiscalar Territorial Analysis Version 0.1.2

Package MTA. R topics documented: May 14, Title Multiscalar Territorial Analysis Version 0.1.2 Title Multiscalar Territorial Analysis Version 0.1.2 Package MTA May 14, 2018 Build multiscalar territorial analysis based on various contexts. License GPL-3 URL https://github.com/riatelab/mta/ BugReports

More information

Package ZIM. R topics documented: August 29, Type Package. Title Statistical Models for Count Time Series with Excess Zeros. Version 1.

Package ZIM. R topics documented: August 29, Type Package. Title Statistical Models for Count Time Series with Excess Zeros. Version 1. Package ZIM August 29, 2013 Type Package Title Statistical Models for Count Time Series with Excess Zeros Version 1.0 Date 2013-06-15 Author Ming Yang, Gideon K. D. Zamba, and Joseph E. Cavanaugh Maintainer

More information

Package hierdiversity

Package hierdiversity Version 0.1 Date 2015-03-11 Package hierdiversity March 20, 2015 Title Hierarchical Multiplicative Partitioning of Complex Phenotypes Author Zachary Marion, James Fordyce, and Benjamin Fitzpatrick Maintainer

More information

ensemblebma: An R Package for Probabilistic Forecasting using Ensembles and Bayesian Model Averaging

ensemblebma: An R Package for Probabilistic Forecasting using Ensembles and Bayesian Model Averaging ensemblebma: An R Package for Probabilistic Forecasting using Ensembles and Bayesian Model Averaging Chris Fraley, Adrian E. Raftery Tilmann Gneiting, J. McLean Sloughter Technical Report No. 516R Department

More information

First steps of multivariate data analysis

First steps of multivariate data analysis First steps of multivariate data analysis November 28, 2016 Let s Have Some Coffee We reproduce the coffee example from Carmona, page 60 ff. This vignette is the first excursion away from univariate data.

More information

The crossdes Package

The crossdes Package Date 2007-04-16 The crossdes Package April 16, 2007 Title Design and Randomization in Crossover Studies Version 1.0-7 Author Martin Oliver Sailer Depends AlgDesign, gtools,

More information

Metric Predicted Variable With One Nominal Predictor Variable

Metric Predicted Variable With One Nominal Predictor Variable Metric Predicted Variable With One Nominal Predictor Variable Tim Frasier Copyright Tim Frasier This work is licensed under the Creative Commons Attribution 4.0 International license. Click here for more

More information

Modern Regression HW #6 Solutions

Modern Regression HW #6 Solutions 36-401 Modern Regression HW #6 Solutions Problem 1 [32 points] (a) (4 pts.) DUE: 10/27/2017 at 3PM Given : Chick 50 150 300 50 150 300 50 150 300 50 150 300 Weight 50 150 300 50 150 300 50 150 300 Figure

More information

Package hds. December 31, 2016

Package hds. December 31, 2016 Type Package Version 0.8.1 Title Hazard Discrimination Summary Package hds December 31, 2016 Functions for calculating the hazard discrimination summary and its standard errors, as described in Liang and

More information

Package ensemblepp. R topics documented: September 20, Title Ensemble Postprocessing Data Sets. Version

Package ensemblepp. R topics documented: September 20, Title Ensemble Postprocessing Data Sets. Version Title Ensemble Postprocessing Data Sets Version 0.1-0 Date 2017-08-29 Author Jakob Messner [aut, cre] Package ensemblepp September 20, 2017 Maintainer Jakob Messner Depends R (>=

More information

Package Watersheds. R topics documented: February 9, Type Package

Package Watersheds. R topics documented: February 9, Type Package Type Package Package Watersheds February 9, 2016 Title Spatial Watershed Aggregation and Spatial Drainage Network Analysis Version 1.1 Date 2016-02-08 Author J.A. Torres-Matallana Maintainer J. A. Torres-Matallana

More information

Package RootsExtremaInflections

Package RootsExtremaInflections Type Package Package RootsExtremaInflections May 10, 2017 Title Finds Roots, Extrema and Inflection Points of a Curve Version 1.1 Date 2017-05-10 Author Demetris T. Christopoulos Maintainer Demetris T.

More information

Gov 2000: 7. What is Regression?

Gov 2000: 7. What is Regression? Gov 2000: 7. What is Regression? Matthew Blackwell Harvard University mblackwell@gov.harvard.edu October 15, 2016 Where are we? Where are we going? What we ve been up to: estimating parameters of population

More information

Package EDR. September 14, 2016

Package EDR. September 14, 2016 Version 0.6-6 Date 2016-09-06 Package EDR September 14, 2016 Title Estimation of the Effective Dimension Reduction ('EDR') Space Author Joerg Polzehl Maintainer Joerg Polzehl

More information

Package gwqs. R topics documented: May 7, Type Package. Title Generalized Weighted Quantile Sum Regression. Version 1.1.0

Package gwqs. R topics documented: May 7, Type Package. Title Generalized Weighted Quantile Sum Regression. Version 1.1.0 Package gwqs May 7, 2018 Type Package Title Generalized Weighted Quantile Sum Regression Version 1.1.0 Author Stefano Renzetti, Paul Curtin, Allan C Just, Ghalib Bello, Chris Gennings Maintainer Stefano

More information

Package FDRSeg. September 20, 2017

Package FDRSeg. September 20, 2017 Type Package Package FDRSeg September 20, 2017 Title FDR-Control in Multiscale Change-Point Segmentation Version 1.0-3 Date 2017-09-20 Author Housen Li [aut], Hannes Sieling [aut], Timo Aspelmeier [cre]

More information

Package sbgcop. May 29, 2018

Package sbgcop. May 29, 2018 Package sbgcop May 29, 2018 Title Semiparametric Bayesian Gaussian Copula Estimation and Imputation Version 0.980 Date 2018-05-25 Author Maintainer Estimation and inference for parameters

More information

Introduction to the North Carolina SIDS data set

Introduction to the North Carolina SIDS data set Introduction to the North Carolina SIDS data set Roger Bivand August 14, 2006 1 Introduction This data set was presented first in Symons et al. (1983), analysed with reference to the spatial nature of

More information

Package cartogram. June 21, 2018

Package cartogram. June 21, 2018 Title Create Cartograms with R Version 0.1.0 Package cartogram June 21, 2018 Description Construct continuous and non-contiguous area cartograms. URL https://github.com/sjewo/cartogram BugReports https://github.com/sjewo/cartogram/issues

More information

Package NonpModelCheck

Package NonpModelCheck Type Package Package NonpModelCheck April 27, 2017 Title Model Checking and Variable Selection in Nonparametric Regression Version 3.0 Date 2017-04-27 Author Adriano Zanin Zambom Maintainer Adriano Zanin

More information

The reldist Package. April 5, 2006

The reldist Package. April 5, 2006 The reldist Package April 5, 2006 Version 1.5-4 Date April 1, 2006 Title Relative Distribution Methods Author Mark S. Handcock Maintainer Mark S. Handcock

More information

Package Select. May 11, 2018

Package Select. May 11, 2018 Package Select May 11, 2018 Title Determines Species Probabilities Based on Functional Traits Version 1.4 The objective of these functions is to derive a species assemblage that satisfies a functional

More information

Package r2glmm. August 5, 2017

Package r2glmm. August 5, 2017 Type Package Package r2glmm August 5, 2017 Title Computes R Squared for Mixed (Multilevel) Models Date 2017-08-04 Version 0.1.2 The model R squared and semi-partial R squared for the linear and generalized

More information

A Handbook of Statistical Analyses Using R 3rd Edition. Torsten Hothorn and Brian S. Everitt

A Handbook of Statistical Analyses Using R 3rd Edition. Torsten Hothorn and Brian S. Everitt A Handbook of Statistical Analyses Using R 3rd Edition Torsten Hothorn and Brian S. Everitt CHAPTER 12 Quantile Regression: Head Circumference for Age 12.1 Introduction 12.2 Quantile Regression 12.3 Analysis

More information

Package plw. R topics documented: May 7, Type Package

Package plw. R topics documented: May 7, Type Package Type Package Package plw May 7, 2018 Title Probe level Locally moderated Weighted t-tests. Version 1.40.0 Date 2009-07-22 Author Magnus Astrand Maintainer Magnus Astrand

More information

Using Relative Distribution Software

Using Relative Distribution Software Michele L SHAFFER and Mark S HANDCOCK Using Relative Distribution Software Relative distribution methods are a nonparametric statistical approach to the comparison of distribution These methods combine

More information

Package locfdr. July 15, Index 5

Package locfdr. July 15, Index 5 Version 1.1-8 Title Computes Local False Discovery Rates Package locfdr July 15, 2015 Maintainer Balasubramanian Narasimhan License GPL-2 Imports stats, splines, graphics Computation

More information

Explore the data. Anja Bråthen Kristoffersen Biomedical Research Group

Explore the data. Anja Bråthen Kristoffersen Biomedical Research Group Explore the data Anja Bråthen Kristoffersen Biomedical Research Group density 0.2 0.4 0.6 0.8 Probability distributions Can be either discrete or continuous (uniform, bernoulli, normal, etc) Defined by

More information

Package alphaoutlier

Package alphaoutlier Type Package Package Outlier September 9, 2016 Title Obtain Alpha-Outlier Regions for Well-Known Probability Distributions Version 1.2.0 Date 2016-09-09 Author Andre Rehage, Sonja Kuhnt Maintainer Andre

More information

(Re)introduction to Statistics Dan Lizotte

(Re)introduction to Statistics Dan Lizotte (Re)introduction to Statistics Dan Lizotte 2017-01-17 Statistics The systematic collection and arrangement of numerical facts or data of any kind; (also) the branch of science or mathematics concerned

More information

Package ProbForecastGOP

Package ProbForecastGOP Type Package Package ProbForecastGOP February 19, 2015 Title Probabilistic weather forecast using the GOP method Version 1.3.2 Date 2010-05-31 Author Veronica J. Berrocal , Yulia

More information

Introduction to Statistics and R

Introduction to Statistics and R Introduction to Statistics and R Mayo-Illinois Computational Genomics Workshop (2018) Ruoqing Zhu, Ph.D. Department of Statistics, UIUC rqzhu@illinois.edu June 18, 2018 Abstract This document is a supplimentary

More information

Package ExtremeBounds

Package ExtremeBounds Type Package Title Extreme Bounds Analysis (EBA) Version 0.1.6 Date 2018-01-03 Package ExtremeBounds January 3, 2018 Author Marek Hlavac Maintainer Marek Hlavac

More information

Package Rarity. December 23, 2016

Package Rarity. December 23, 2016 Type Package Package Rarity December 23, 2016 Title Calculation of Rarity Indices for Species and Assemblages of Species Version 1.3-6 Date 2016-12-23 Author Boris Leroy Maintainer Boris Leroy

More information

Package unbalhaar. February 20, 2015

Package unbalhaar. February 20, 2015 Type Package Package unbalhaar February 20, 2015 Title Function estimation via Unbalanced Haar wavelets Version 2.0 Date 2010-08-09 Author Maintainer The package implements top-down

More information

Package STMedianPolish

Package STMedianPolish Type Package Title Spatio-Temporal Median Polish Version 0.2 Date 2017-03-07 Package STMedianPolish March 8, 2017 Author William Martínez [aut, cre], Melo Carlos [aut],melo Oscar [aut]. Maintainer William

More information

Package misctools. November 25, 2016

Package misctools. November 25, 2016 Version 0.6-22 Date 2016-11-25 Title Miscellaneous Tools and Utilities Author, Ott Toomet Package misctools November 25, 2016 Maintainer Depends R (>= 2.14.0) Suggests Ecdat

More information

Prediction problems 3: Validation and Model Checking

Prediction problems 3: Validation and Model Checking Prediction problems 3: Validation and Model Checking Data Science 101 Team May 17, 2018 Outline Validation Why is it important How should we do it? Model checking Checking whether your model is a good

More information

Algebra vocabulary CARD SETS Frame Clip Art by Pixels & Ice Cream

Algebra vocabulary CARD SETS Frame Clip Art by Pixels & Ice Cream Algebra vocabulary CARD SETS 1-7 www.lisatilmon.blogspot.com Frame Clip Art by Pixels & Ice Cream Algebra vocabulary Game Materials: one deck of Who has cards Objective: to match Who has words with definitions

More information

Package SightabilityModel

Package SightabilityModel Type Package Title Wildlife Sightability Modeling Version 1.3 Date 2014-10-03 Author John Fieberg Package SightabilityModel Maintainer John Fieberg February 19, 2015 Uses logistic regression

More information

Quartiles, Deciles, and Percentiles

Quartiles, Deciles, and Percentiles Quartiles, Deciles, and Percentiles From the definition of median that it s the middle point in the axis frequency distribution curve, and it is divided the area under the curve for two areas have the

More information

Package ChIPtest. July 20, 2016

Package ChIPtest. July 20, 2016 Type Package Package ChIPtest July 20, 2016 Title Nonparametric Methods for Identifying Differential Enrichment Regions with ChIP-Seq Data Version 1.0 Date 2017-07-07 Author Vicky Qian Wu ; Kyoung-Jae

More information

Key for Unit I Exam: Out-of-Class Portion

Key for Unit I Exam: Out-of-Class Portion Key for Unit I Exam: Out-of-Class Portion The out-of-class portion of the exam consists of three problems on the modeling of equilibrium systems. The first problem extends an earlier case study and is

More information

A Handbook of Statistical Analyses Using R 2nd Edition. Brian S. Everitt and Torsten Hothorn

A Handbook of Statistical Analyses Using R 2nd Edition. Brian S. Everitt and Torsten Hothorn A Handbook of Statistical Analyses Using R 2nd Edition Brian S. Everitt and Torsten Hothorn CHAPTER 12 Analysing Longitudinal Data I: Computerised Delivery of Cognitive Behavioural Therapy Beat the Blues

More information

Package bayeslm. R topics documented: June 18, Type Package

Package bayeslm. R topics documented: June 18, Type Package Type Package Package bayeslm June 18, 2018 Title Efficient Sampling for Gaussian Linear Regression with Arbitrary Priors Version 0.8.0 Date 2018-6-17 Author P. Richard Hahn, Jingyu He, Hedibert Lopes Maintainer

More information

Package Perc. R topics documented: December 5, Type Package

Package Perc. R topics documented: December 5, Type Package Type Package Package Perc December 5, 2016 Title Using Percolation and Conductance to Find Information Flow Certainty in a Direct Network Version 0.1.2 Date 2016-05-04 To find the certainty of dominance

More information

Package LPTime. March 3, 2015

Package LPTime. March 3, 2015 Type Package Package LPTime March 3, 2015 Title LP Nonparametric Approach to Non-Gaussian Non-Linear Time Series Modelling Version 1.0-2 Date 2015-03-03 URL http://sites.temple.edu/deepstat/d-products/

More information

Package generalhoslem

Package generalhoslem Package generalhoslem December 2, 2017 Type Package Title Goodness of Fit Tests for Logistic Regression Models Version 1.3.2 Date 2017-12-02 Author Matthew Jay [aut, cre] Maintainer Matthew Jay

More information

Package IDmining. October 25, 2017

Package IDmining. October 25, 2017 Type Package Title Intrinsic Dimension for Data Mining Version 1.0.3 Author Jean Golay and Mohamed Laib Maintainer Jean Golay Package IDmining October 25, 2017 Contains techniques

More information

Package timelines. August 29, 2016

Package timelines. August 29, 2016 Type Package Title Timeline and Time Duration-Related Tools Version 0.1.1 Date 2016-08-21 Author Dahee Lee [aut, cre], Dustin Tingley [aut] Maintainer Dahee Lee Package timelines August

More information

STAT2201 Assignment 3 Semester 1, 2017 Due 13/4/2017

STAT2201 Assignment 3 Semester 1, 2017 Due 13/4/2017 Class Example 1. Single Sample Descriptive Statistics (a) Summary Statistics and Box-Plots You are working in factory producing hand held bicycle pumps and obtain a sample of 174 bicycle pump weights in

More information

Galaxy Dataset Analysis

Galaxy Dataset Analysis UNIVERSITY OF UTAH MATH 6010 LINEAR MODELS Galaxy Dataset Analysis Author: Curtis MILLER Instructor: Dr. Lajos HORVÀTH November 15, 2015 UNIVERSITY OF UTAH DEPARTMENT OF MATHEMATICS MATH 6010 Project 5

More information

Topic 2 Part 1 [195 marks]

Topic 2 Part 1 [195 marks] Topic 2 Part 1 [195 marks] The distribution of rainfall in a town over 80 days is displayed on the following box-and-whisker diagram. 1a. Write down the median rainfall. 1b. Write down the minimum rainfall.

More information

The locfdr Package. August 19, hivdata... 1 lfdrsim... 2 locfdr Index 5

The locfdr Package. August 19, hivdata... 1 lfdrsim... 2 locfdr Index 5 Title Computes local false discovery rates Version 1.1-2 The locfdr Package August 19, 2006 Author Bradley Efron, Brit Turnbull and Balasubramanian Narasimhan Computation of local false discovery rates

More information

Package mmm. R topics documented: February 20, Type Package

Package mmm. R topics documented: February 20, Type Package Package mmm February 20, 2015 Type Package Title an R package for analyzing multivariate longitudinal data with multivariate marginal models Version 1.4 Date 2014-01-01 Author Ozgur Asar, Ozlem Ilk Depends

More information

Spatial is special. The earth is not flat (coordinate reference systems) Size: lots and lots of it, multivariate, time series

Spatial is special. The earth is not flat (coordinate reference systems) Size: lots and lots of it, multivariate, time series Spatial data with Spatial is special Complex: geometry and attributes The earth is not flat (coordinate reference systems) Size: lots and lots of it, multivariate, time series Special plots: maps First

More information

Package TSPred. April 5, 2017

Package TSPred. April 5, 2017 Type Package Package TSPred April 5, 2017 Title Functions for Benchmarking Time Series Prediction Version 3.0.2 Date 2017-04-05 Author Rebecca Pontes Salles [aut, cre, cph] (CEFET/RJ), Eduardo Ogasawara

More information

Package jmuoutlier. February 17, 2017

Package jmuoutlier. February 17, 2017 Type Package Package jmuoutlier February 17, 2017 Title Permutation Tests for Nonparametric Statistics Version 1.3 Date 2017-02-17 Author Steven T. Garren [aut, cre] Maintainer Steven T. Garren

More information

Package clr. December 3, 2018

Package clr. December 3, 2018 Type Package Package clr December 3, 2018 Title Curve Linear Regression via Dimension Reduction Version 0.1.0 Author Amandine Pierrot with contributions and/or help from Qiwei Yao, Haeran Cho, Yannig Goude

More information

Package dhsic. R topics documented: July 27, 2017

Package dhsic. R topics documented: July 27, 2017 Package dhsic July 27, 2017 Type Package Title Independence Testing via Hilbert Schmidt Independence Criterion Version 2.0 Date 2017-07-24 Author Niklas Pfister and Jonas Peters Maintainer Niklas Pfister

More information