Package lsmeans. February 15, 2013

Size: px
Start display at page:

Download "Package lsmeans. February 15, 2013"

Transcription

1 Type Package Title Least-squares means Version Date Encoding latin1 Author Russell V. Lenth Package lsmeans February 15, 2013 Maintainer Russ Lenth Suggests nlme, lme4, pbkrtest, multcomp Enhances multcomp Imports Matrix, multcomp LazyData yes Description This package provides the function lsmeans for outputting so-called least-squares means for factor combinations in an lm, lme, or lmer object. It can also compute contrasts or linear combinations of these least-squares means, and several standard contrast families are provided. License GPL-2 Repository CRAN Date/Publication :35:49 NeedsCompilation no R topics documented: lsmeans-package fiber lsmeans nutrition pairwise.lsmc

2 2 fiber Index 12 lsmeans-package Least-squares means Description Details This package provides the function lsmeans for outputting so-called least-squares means for factor combinations in an lm, lme, gls, or lmer object. It can also compute contrasts or linear combinations of these least-squares means, and several standard contrast families are provided. It may also be used for the obtaining linear predictors and contrasts thereof in glm and glmer objects. Popular adjustments for multiple-comparisons are provided; optionally, contrasts may instead be passed to glht, if the multcomp package is installed. In analyzing mer objects, if the pbkrtest package is installed, its vcovadj function is used to bias-adjust the covariance matrix and obtain degrees of freedom. Examples and discussion are available via vignette("using-lsmeans", package="lsmeans"). Package: Type: Version: Date: License: lsmeans Package See DESCRIPTION See DESCRIPTION GPL-2 See the documentation for lsmeans. Author(s) Russell V. Lenth Maintainer: Russ Lenth See Also nlme lme4 multcomp pbkrtest fiber Fiber data Description Fiber data from Montgomery Design (8th ed.), p.656 (Table 15.10). Useful as a simple analysis-ofcovariance example.

3 lsmeans 3 Usage fiber Format Details Source A data frame with 15 observations on the following 3 variables. machine a factor with levels A B C. The primary factor of interest. strength a numeric vector. The response variable. diameter a numeric vector. A covariate. The goal of the experiment is to compare the mean breaking strength of fibers produced by the three machines. When testing this, the technician also measured the diameter of each fiber, and this measurement may be used as a concomitant variable to improve precision of the estimates. Montgomery, D. C. (2013) Design and Analysis of Experiments (8th ed.). John Wiley and Sons, ISBN Examples require(lsmeans) fiber.lm <- lm(strength ~ diameter + machine, data=fiber) lsmeans(fiber.lm, pairwise ~ machine) lsmeans Least-squares means Description Usage Compute least-squares means for specified factors or factor combinations in a linear model, and optionally comparisons or contrasts among them. lsmeans(object, specs, adjust = c("auto","tukey","sidak", p.adjust.methods), conf =.95, at, trend, contr = list(), cov.reduce = function(x, name) mean(x), fac.reduce = function(coefs, lev) apply(coefs, 2, mean), glhargs = NULL, lf = FALSE,...) ## S3 method for class lsm print(x, omit = NULL,...) ## S3 method for class data.frame.lsm

4 4 lsmeans print(x,...) lsm(...) ## S3 method for class lsmlf glht(model, linfct,...) Arguments object specs A lm, aov (with no Error component), glm, lme, gls, lmer, or glmer object having at least one fixed factor among the predictors. A formula, or a list of formulas, specifying the desired families of least-squares means. The right-hand side of each formula specifies the desired factor levels. The optional left-hand side specifies what kind of comparisons or contrasts are desired. For example, ~ treatment requests least-squares means for each level of treatment, and pairwise ~ treatments requests those results, plus pairwise comparisons among them. As another example, in a three-factor model, trt.vs.ctrl1 ~ A B:C requests least-squares means for all combinations of factors A, B, and C, as well as treatment-minus-control comparisons of A for each combination of B and C, where the first level of A is considered the control level. adjust Adjustment method for the p values of tests of contrasts. "auto" uses the method returned in the "adjust" attribute of the contrast function; "tukey" computes p values using the Studentized range distribution with the number of means in the family; "sidak" replaces each p value by 1 - (1 - p)^c, where c is the number of contrasts; "none" makes no adjustments to the p values. In addition, the Bonferroni-inequality-based adjustment methods in p.adjust are available; many of those involve step-down testing with a stopping rule, whereas "tukey", "sidak", "bonferroni", and "none" anticipate that all contrasts will be tested. In many cases, these adjustments are only approximate, especially when the degrees of freedom vary greatly within the family of comparisons. For more accurate adjustments, use glhargs instead. conf at trend contr Desired confidence level for intervals. For robustness, you may specify either a fraction or a percentage; i.e.,.975 and 97.5 yield the same results. An optional named list or named vector of covariate values at which predictions are computed (give only one value for each covariate). If no value is found in at for a particular covariate, then cov.reduce is called. If non-missing and trend is the name of a numeric predictor or a term in object s model, then the linear trends for this predictor are estimated and compared instead of the least-squares means. This is useful in models where the specified variable or term interacts with one or more of the factors in the righthand side of specs. In multi-factor cases, sets of regression coefficients are averaged using fac.reduce, just as with least-squares means. An optional named list. Each entry is itself a list or a data.frame specifying contrast coefficients. If the left-hand side of a formula in specs matches a name in contr, then those contrasts are estimated with the specified leastsquares means. An error will result if the length or one or more contrast vectors mismatches the number of levels of the factor or factor combination. Actually,

5 lsmeans 5 cov.reduce fac.reduce glhargs lf model linfct it is not necessary that they be contrasts; one may use this argument to estimate arbitrary linear combinations of the least-squares means. A function with arguments x and name that should return the value to use in prediction for the covariate with name name and values x. By default, the mean is used. The name argument may help distinguish one covariate from another. A function of coefs and lev where lev is the level of a factor or factor combination at which a least-squares mean is calculated. The argument coefs is a matrix whose rows correspond to the combinations of all factors in the model other than those involved in the lsmeans specification. Each row has the coefficients for the linear combination of the regression coefficients to be used in that case. By default, these rows are averaged together (mimicking SAS), but the user may override that behavior. Besides lev, names(lev) will provide the name of the factor or factor combination, and the row.names of coefs provide the levels of the extraneous factors. If this is a list, the object and specified contrasts are passed to the function glht in the multcomp package, with the contents of glhargs as additional arguments. (If you do not wish to provide additional arguments, use glsargs=list().) If glhargs is left at NULL, or if the multcomp package is not installed, then glht is not called, and the contrast results are produced internally by lsmeans. This argument affects only the results from contrasts and not those for the lsmeans themselves. Note: If glhargs is used, the adjust argument is ignored. If only one set of lsmeans or contrasts thereof is desired, an alternative is to call glht with an lsm call as the linfct argument. If TRUE, the linear functions of the regression coefficients are returned unevaluated. model argument for glht linfct argument for glht... Additional argument(s) passed to the contrast function, or to glht; see Details. x omit Details Object of class "lsm" Indexes of elements of x that you do not want printed. Least-squares means, popularized by SAS, are predictions from a linear model at combinations of specified factors. SAS s documentation describes them as predicted population margins that is, they estimate the marginal means over a balanced population (SAS Institute 2012). In generalized linear models, least-squares means are marginal linear predictions that can be transformed back to the response scale via the inverse-link function. Unspecified factors and covariates are handled by summarizing the predictions over those factors and variables. For example, if the fitted model has formula response ~ x1 + x2 + treat where a1 and x2 are numeric and treat is a factor, the least-squares means will be the predicted response for each treatment, at some specified values of x1 and x2. By default, the means of the two covariates will be used, resulting in what ANOVA textbooks often call the adjusted means. We may use that at argument to instead make predictions at other values of x1 and x2. Now consider the model response ~ A + B + A:B, where A and B are both factors. If we ask for least-squares means for A, then at each level of A we are faced with a different prediction for each

6 6 lsmeans Value level of B. Blind (and default) use of least-squares means would result in these predictions being averaged together with equal weight, and this may be inappropriate, especially when the interaction effect is strong. (A warning is generated in such potentially inappropriate cases.) Like most statistical calculations, it is possible to use least-squares means inappropriately. The fac.reduce argument at least expands one s options in producing meaningful results in multi-factor situations. One other note concerning covariates: One must be careful with covariates that depend on one another. For example, if a model contains covariates x and xsq where xsq = x^2, the default behavior will make predictions at x = mean(x) and xsq = mean(xsq), which probably isn t a valid combination (we need x = mean(x) and xsq = mean(x)^2). The inconsistency is avoided if the model specifis poly(x,2) (or even x + I(x^2)) instead of x + xsq, because then only x is averaged, and everything remains consistent. The built-in contrast methods that can be used in specs formulas are pairwise, revpairwise, poly, trt.vs.ctrl, trt.vs.ctrl1, and trt.vs.ctrlk. They are implemented as functions having the same names with.lsmc added (e.g., pairwise.lsmc). Users may write additional.lsmc functions that generate custom families of contrasts. See the documentation for pairwise.lsmc for an example. When trend is specified and it names a predictor variable in the model, the trend is estimated using a difference quotient over 1/1000 the range of the predictor (centered at the predictor s at value or its cov.reduce result). If trend instead names a model term, then the trend is determined symbolically. It could be informative to run with lf=true. See the examples. Degrees of freedom are currently not provided for lme or glme objects, or for mer objects arising from generalized linear models; in those cases, asymptotic results are printed, and this fact is emphasized by displaying NA for the defrees of freedom. For linear mer objects, degrees of freedom are computed using the Kenward and Roger (1997) method, provided the pbkrtest package is installed (the package is loaded if needed). Moreover, in that case, the adjusted covariance matrix from the vcovadj() function in the pbkrtest package is used to calculate standard errors. See Halekoh and H?jsgaard (2012) and the documentation for KRmodcomp for more details. Degrees of freedom are not known to glht except in the case of lm objects. Note that glht requires the degrees of freedom to be an integer; accordingly, if df is included in glhargs, it is coerced to an integer value of max(1, as.integer(df +.2)). That is, it is forced to be at least 1, and it is taken up to the next higher integer if its fractional part is at least.8. For users of the package multcomp, linear functions corresponding to specs may be passed to glht in two different ways. One is to call glht from within lsmeans by specifying glhtargs. The other way is to call lsmeans from within glht by supplying a call to lsm in its linfct argument. The first way provides summary.glht objects for all contrast results (but not for the lsmeans). The second way passes just one set of linear functions to glht; in particular, only the first element of specs is used, and the last set of linear functions from that specification are given to glht. Thus, glht(model, lsm(~treat)) will estimate the lsmeans of treatments, while glht(model, lsm(pairwise~treat)) will estimate the pairwise comparisons. If the model contains a matrix among its predictors, each column is averaged using the function specified in cov.reduce. There is no provision for matrices in the at argument. If lf==false, lsmeans returns an object of class "lsm", which inherits from "list". Each element of the list is either of class data.frame.lsm or "summary.glht" (see the documentation for glht). (The latter occur only if glhargs is non-null.) Each element summarizes a family of least-squares

7 lsmeans 7 Note means or contrasts among them. Each data.frame.lsm element is an extension of a data.frame and contains lsmeans or contrast estimates and associated quantities. If lf==true, lsmeans returns a list of matrices containing the linear functions generated by specs. The "lsm" and "data.frame.lsm" classes each have only a print method, which exist to display results in the desired format. The lsm function returns an object of class "lsmlf", and may be used in a manner similar to mcp in a call to glht. This is implemented via the provided S3 method for glht for "lsmlf" objects. See the examples. The functions mcp (in multcomp)) and popmeans (in doby) also provide least-squares means, with a different user interface. Author(s) Russell V. Lenth, The University of Iowa References Halekoh, U. and H?jsgaard, S. (2012) A Kenward-Roger Approximation and parametric bootsrap methods for tests in linear mixed models the R package pbkrtest, submitted. Kenward, M.G. and Roger, J.H. (1997) Small sample inference for fixed effects from restricted maximum likelihood, Biometrics, 53, SAS Institute Inc. (2012) Online documentation; Shared concepts; LSMEANS statement, support.sas.com/documentation/cdl/en/statug/63962/html/default/viewer.htm#statug_ introcom_a htm, accessed August 15, See Also pairwise.lsmc, glht Examples require(lsmeans) ### Covariance example (from Montgomery Design (8th ed.), p.656) # Uses supplied dataset fiber fiber.lm <- lm(strength ~ diameter + machine, data = fiber) # adjusted means and comparisons, treating machine C as control lsmeans (fiber.lm, trt.vs.ctrlk ~ machine) ### Factorial experiment warp.lm <- lm(breaks ~ wool * tension, data = warpbreaks) #-- We only need to see the wool*tension means listed once... print(lsmeans (warp.lm, list(pairwise ~ wool tension, poly ~ tension wool)), omit=3)

8 8 lsmeans ### Unbalanced split-plot example ### #-- The imbalance is imposed deliberately to illustrate that #-- the variance estimates become biased require(nlme) Oats.lme <- lme(yield ~ factor(nitro) + Variety, random = ~1 Block/Variety, subset = -c(1,2,3,5,8,13,21,34,55), data=oats) lsmeans(oats.lme, list(poly ~ nitro, pairwise ~ Variety)) # Compare with lmer result (if pbkrtest installed, provides df, bias-adjusted SEs) if (require(pbkrtest)) { require(lme4) Oats.lmer <- lmer(yield ~ factor(nitro) + Variety + (1 Block/Variety), subset = -c(1,2,3,5,8,13,21,34,55), data=oats) lsmeans(oats.lmer, list(poly ~ nitro, pairwise ~ Variety)) } # Using in conjunction with glht (note -- this does not use adjusted vcov) if (require(multcomp)) { # calling glht from lsmeans... lsmeans(oats.lmer, pairwise ~ Variety, glhargs=list(df=9)) # calling lsmeans from glht to get simultaneous CIs confint(glht(oats.lmer, linfct = lsm(~ Variety), df=9)) } # Custom contrasts lsmeans(oats.lmer, my.own ~ Variety, contr = list(my.own = list(g.vs.m = c(1,-1,0), GM.vs.V = c(.5,.5,-1)))) #### Examples with trends... # Model with interaction fiber.lm2 = lm(strength ~ diameter * machine, data = fiber) # Compare the linear trends for diameter lsmeans(fiber.lm2, pairwise ~ machine, trend = "diameter") # Model with log(diameter) as the covariate fiber.lm3 = lm(strength ~ log(diameter) * machine, data = fiber) # Compare the fitted linear trends for log(diameter) lsmeans(fiber.lm3, pairwise ~ machine, trend = "log(diameter)") # Compare the fitted linear trends for diameter itself # - this is done via a diff quotient - compare with fiber.lm2 results lsmeans(fiber.lm3, pairwise ~ machine, trend = "diameter") # Examine the linear functions generated for these examples lsmeans(fiber.lm2, ~ machine, trend = "diameter", lf = TRUE) lsmeans(fiber.lm3, ~ machine, trend = "log(diameter)", lf = TRUE) lsmeans(fiber.lm3, ~ machine, trend = "diameter", lf = TRUE)

9 nutrition 9 nutrition Nutrition data Description Usage Format Details Source This observational dataset involves three factors, but where several factor combinations are missing. It is used as a case study in Milliken and Johnson, Chapter 17, p.202. (You may also find it in the second edition, p.278.) nutrition A data frame with 107 observations on the following 4 variables. age a factor with levels Mother s age group. group a factor with levels FoodStamps NoAid. Whether or not the family receives food stamp assistance. race a factor with levels Black Hispanic White. Mother s race. gain a numeric vector (the response variable). Gain score (posttest minus pretest) on knowledge of nutrition. A survey was conducted by home economists to study how much lower-socioeconomic-level mothers knew about nutrition and to judge the effect of a training program designed to increase therir knowledge of nutrition. This is a messy dataset with several empty cells. Milliken, G. A. and Johnson, D. E. (1984) Analysis of Messy Data Volume I: Designed Experiments. Van Nostrand, ISBN Examples require(lsmeans) nutr.aov <- aov(gain ~ (group + age + race)^2, data = nutrition) # Summarize predictions for age group 3 nutr.lsm <- lsmeans(nutr.aov, list(pairwise ~ group race, pairwise ~ race group), at = list(age="3")) with(nutr.lsm[[1]], interaction.plot(group, race, lsmean, type="b")) # Hispanics seem exceptional; but, this doesn t test out due to very sparse data print(nutr.lsm, omit=3)

10 10 pairwise.lsmc pairwise.lsmc Contrast families Description Usage These functions return standard sets of contrast coefficients. The name of any of these functions (with the.lsmc omitted) may be used in the left-hand side of a spec formula in lsmeans. pairwise.lsmc(levs,...) revpairwise.lsmc(levs,...) poly.lsmc(levs, max.degree = min(6, k - 1)) trt.vs.ctrl.lsmc(levs, ref = 1) trt.vs.ctrl1.lsmc(levs,...) trt.vs.ctrlk.lsmc(levs,...) Arguments levs Vector of factor levels... Additional arguments, ignored but needed to make these functions interchangeable max.degree ref Details Value The maximum degree of the polynomial contrasts in poly.lsmc Reference level (or control group) in trt.vs.ctrl.lsmc pairwise.lsmc and revpairwise.lsmc generate contrasts for all pairwise comparisons among least-squares means at the levels in levs. The distinction is in which direction they are subtracted. For factor levels A, B, C, D, pairwise.lsmc generates the comparisons A-B, A-C, A-D, B-C, B-D, and C-D, wereas revpairwise.lsmc generates B-A, C-A, C-B, D-A, D-B, and D-C. poly.lsmc generates orthogonal polynomial contrasts, assuming equally-spaced factor levels. These are derived from the poly function, but an ad hoc algorithm is used to scale them to integer coefficients that are (usually) the same as in published tables of orthogonal polynomial contrasts. trt.vs.ctrl.lsmc and its relatives generate contrasts for comparing one level (or the average over specified levels) with each of the other levels. The argument ref should be the index(es) (not the labels) of the reference level(s). trt.vs.ctrl1.lsmc is the same as trt.vs.ctrl, ref=1), and trt.vs.ctrlk.lsmc is the same as trt.vs.ctrl, ref=length(levs)) A data.frame, each column containing contrast coefficients for levs. The "desc" attribute is used to label the results in lsmeans, and the "adjust" attribute gives the default adjustment method for multiplicity.

11 pairwise.lsmc 11 Note You may create your own contrast functions, using these as guides. A function named mycont.lsmc may be invoked in lsmeans via lsmeans(object, mycontr ~ factor). The "desc" and "adjust" attributes are optional; if absent, the root name of the function is used as "desc", and no adjustment is requested for p values. See the examples. Author(s) See Also Russell V. Lenth, The University of Iowa lsmeans Examples ### View orthogonal polynomials for 4 levels poly.lsmc(1:4) ## Not run: ### Setting up a custom contrast function helmert.lsmc <- function(levs,...) { M <- as.data.frame(contr.helmert(levs)) names(m) <- paste(levs[-1],"vs earlier") attr(m, "desc") <- "Helmert contrasts" M } lsmeans(oats.lme, helmert ~ Variety) ## End(Not run)

12 Index Topic datasets fiber, 2 nutrition, 9 Topic htest lsmeans, 3 lsmeans-package, 2 pairwise.lsmc, 10 Topic models lsmeans, 3 lsmeans-package, 2 pairwise.lsmc, 10 Topic package lsmeans-package, 2 Topic regression lsmeans, 3 lsmeans-package, 2 pairwise.lsmc, 10 poly, 10 poly.lsmc (pairwise.lsmc), 10 popmeans, 7 print.data.frame.lsm (lsmeans), 3 print.lsm (lsmeans), 3 revpairwise.lsmc (pairwise.lsmc), 10 trt.vs.ctrl.lsmc (pairwise.lsmc), 10 trt.vs.ctrl1.lsmc (pairwise.lsmc), 10 trt.vs.ctrlk.lsmc (pairwise.lsmc), 10 vcovadj, 2 data.frame, 7 fiber, 2 glht, 2, 5 7 glht.lsmlf (lsmeans), 3 KRmodcomp, 6 lme4, 2 lsm (lsmeans), 3 lsmeans, 2, 3, 10, 11 lsmeans-package, 2 mcp, 7 multcomp, 2 nlme, 2 nutrition, 9 p.adjust, 4 pairwise.lsmc, 6, 7, 10 pbkrtest, 2 12

Package tukeytrend. June 20, 2017

Package tukeytrend. June 20, 2017 Type Package Version 0.4 Package tukeytrend June 20, 2017 Title Tukeys Trend Test via Multiple Marginal Models Date 2017-06-20 Author Frank Schaarschmidt [aut, cre], Christian Ritz [aut], Ludwig Hothorn

More information

Package lsmeans. November 5, 2017

Package lsmeans. November 5, 2017 Type Package Title Least-Squares Means Version 2.27-61 Date 2017-11-05 Depends methods, R (>= 3.2) Package lsmeans November 5, 2017 Suggests car, lattice, MCMCpack, mediation, multcompview, ordinal, pbkrtest

More information

Package simr. April 30, 2018

Package simr. April 30, 2018 Type Package Package simr April 30, 2018 Title Power Analysis for Generalised Linear Mixed Models by Simulation Calculate power for generalised linear mixed models, using simulation. Designed to work with

More information

Package lsmeans. February 7, 2016

Package lsmeans. February 7, 2016 Type Package Title Least-Squares Means Version 2.22-1 Date 2016-02-07 Depends estimability, methods, R (>= 3.2) Package lsmeans February 7, 2016 Suggests car, lattice, MCMCpack, mediation, multcompview,

More information

Recall the expression for the minimum significant difference (w) used in the Tukey fixed-range method for means separation:

Recall the expression for the minimum significant difference (w) used in the Tukey fixed-range method for means separation: Topic 11. Unbalanced Designs [ST&D section 9.6, page 219; chapter 18] 11.1 Definition of missing data Accidents often result in loss of data. Crops are destroyed in some plots, plants and animals die,

More information

BIOMETRICS INFORMATION

BIOMETRICS INFORMATION BIOMETRICS INFORMATION (You re 95% likely to need this information) PAMPHLET NO. # 57 DATE: September 5, 1997 SUBJECT: Interpreting Main Effects when a Two-way Interaction is Present Interpreting the analysis

More information

Package reghelper. April 8, 2017

Package reghelper. April 8, 2017 Type Package Title Helper Functions for Regression Analysis Version 0.3.3 Date 2017-04-07 Package reghelper April 8, 2017 A set of functions used to automate commonly used methods in regression analysis.

More information

Package addhaz. September 26, 2018

Package addhaz. September 26, 2018 Package addhaz September 26, 2018 Title Binomial and Multinomial Additive Hazard Models Version 0.5 Description Functions to fit the binomial and multinomial additive hazard models and to estimate the

More information

Package glmnetutils. August 1, 2017

Package glmnetutils. August 1, 2017 Type Package Version 1.1 Title Utilities for 'Glmnet' Package glmnetutils August 1, 2017 Description Provides a formula interface for the 'glmnet' package for elasticnet regression, a method for cross-validating

More information

Package modmarg. R topics documented:

Package modmarg. R topics documented: Package modmarg February 1, 2018 Title Calculating Marginal Effects and Levels with Errors Version 0.9.2 Calculate predicted levels and marginal effects, using the delta method to calculate standard errors.

More information

Statistics Lab #7 ANOVA Part 2 & ANCOVA

Statistics Lab #7 ANOVA Part 2 & ANCOVA Statistics Lab #7 ANOVA Part 2 & ANCOVA PSYCH 710 7 Initialize R Initialize R by entering the following commands at the prompt. You must type the commands exactly as shown. options(contrasts=c("contr.sum","contr.poly")

More information

Package lcc. November 16, 2018

Package lcc. November 16, 2018 Type Package Title Longitudinal Concordance Correlation Version 1.0 Author Thiago de Paula Oliveira [aut, cre], Rafael de Andrade Moral [aut], John Hinde [aut], Silvio Sandoval Zocchi [aut, ctb], Clarice

More information

Package OLScurve. August 29, 2016

Package OLScurve. August 29, 2016 Type Package Title OLS growth curve trajectories Version 0.2.0 Date 2014-02-20 Package OLScurve August 29, 2016 Maintainer Provides tools for more easily organizing and plotting individual ordinary least

More information

Package caic4. May 22, 2018

Package caic4. May 22, 2018 Type Package Package caic4 May 22, 2018 Title Conditional Akaike Information Criterion for 'lme4' Version 0.4 Date 2018-05-22 Author Benjamin Saefken and David Ruegamer, with contributions from Sonja Greven

More information

Lab #9: ANOVA and TUKEY tests

Lab #9: ANOVA and TUKEY tests Lab #9: ANOVA and TUKEY tests Objectives: 1. Column manipulation in SAS 2. Analysis of variance 3. Tukey test 4. Least Significant Difference test 5. Analysis of variance with PROC GLM 6. Levene test for

More information

Package dglm. August 24, 2016

Package dglm. August 24, 2016 Version 1.8.3 Date 2015-10-27 Title Double Generalized Linear Models Package dglm August 24, 2016 Author Peter K Dunn and Gordon K Smyth Maintainer Robert Corty

More information

Package permuco. February 14, Type Package

Package permuco. February 14, Type Package Type Package Package permuco February 14, 2018 Title Permutation Tests for Regression, (Repeated Measures) ANOVA/ANCOVA and Comparison of Signals Version 1.0.1 Date 2018-09-01 Functions to compute p-values

More information

Package GLMMRR. August 9, 2016

Package GLMMRR. August 9, 2016 Type Package Package GLMMRR August 9, 2016 Title Generalized Linear Mixed Model (GLMM) for Binary Randomized Response Data Version 0.2.0 Date 2016-08-08 Author Jean-Paul Fox [aut], Konrad Klotzke [aut],

More information

Package MOST. November 9, 2017

Package MOST. November 9, 2017 Type Package Title Multiphase Optimization Strategy Version 0.1.0 Depends R (>= 2.15.0) Copyright The Pennsylvania State University Package MOST November 9, 2017 Description Provides functions similar

More information

Organizing data in R. Fitting Mixed-Effects Models Using the lme4 Package in R. R packages. Accessing documentation. The Dyestuff data set

Organizing data in R. Fitting Mixed-Effects Models Using the lme4 Package in R. R packages. Accessing documentation. The Dyestuff data set Fitting Mixed-Effects Models Using the lme4 Package in R Deepayan Sarkar Fred Hutchinson Cancer Research Center 18 September 2008 Organizing data in R Standard rectangular data sets (columns are variables,

More information

Package GWRM. R topics documented: July 31, Type Package

Package GWRM. R topics documented: July 31, Type Package Type Package Package GWRM July 31, 2017 Title Generalized Waring Regression Model for Count Data Version 2.1.0.3 Date 2017-07-18 Maintainer Antonio Jose Saez-Castillo Depends R (>= 3.0.0)

More information

Package DTRreg. August 30, 2017

Package DTRreg. August 30, 2017 Package DTRreg August 30, 2017 Type Package Title DTR Estimation and Inference via G-Estimation, Dynamic WOLS, and Q-Learning Version 1.3 Date 2017-08-30 Author Michael Wallace, Erica E M Moodie, David

More information

Problem set for Week 7 Linear models: Linear regression, multiple linear regression, ANOVA, ANCOVA

Problem set for Week 7 Linear models: Linear regression, multiple linear regression, ANOVA, ANCOVA ECL 290 Statistical Models in Ecology using R Problem set for Week 7 Linear models: Linear regression, multiple linear regression, ANOVA, ANCOVA Datasets in this problem set adapted from those provided

More information

Correctly Compute Complex Samples Statistics

Correctly Compute Complex Samples Statistics SPSS Complex Samples 15.0 Specifications Correctly Compute Complex Samples Statistics When you conduct sample surveys, use a statistics package dedicated to producing correct estimates for complex sample

More information

Package MatchIt. April 18, 2017

Package MatchIt. April 18, 2017 Version 3.0.1 Date 2017-04-18 Package MatchIt April 18, 2017 Title Nonparametric Preprocessing for Parametric Casual Inference Selects matched samples of the original treated and control groups with similar

More information

Package factorplot. R topics documented: June 23, Type Package Title Graphical Presentation of Simple Contrasts Version Date

Package factorplot. R topics documented: June 23, Type Package Title Graphical Presentation of Simple Contrasts Version Date Type Package Title Graphical Presentation of Simple Contrasts Version 1.1-2 Date 2016-06-22 Package factorplot June 23, 2016 Author Dave Armstrong (Department of Political Science, UW-Milwaukee) Maintainer

More information

Package glmmml. R topics documented: March 25, Encoding UTF-8 Version Date Title Generalized Linear Models with Clustering

Package glmmml. R topics documented: March 25, Encoding UTF-8 Version Date Title Generalized Linear Models with Clustering Encoding UTF-8 Version 1.0.3 Date 2018-03-25 Title Generalized Linear Models with Clustering Package glmmml March 25, 2018 Binomial and Poisson regression for clustered data, fixed and random effects with

More information

Package gamm4. July 25, Index 10

Package gamm4. July 25, Index 10 Version 0.2-5 Author Simon Wood, Fabian Scheipl Package gamm4 July 25, 2017 Maintainer Simon Wood Title Generalized Additive Mixed Models using 'mgcv' and 'lme4' Description

More information

Package gee. June 29, 2015

Package gee. June 29, 2015 Title Generalized Estimation Equation Solver Version 4.13-19 Depends stats Suggests MASS Date 2015-06-29 DateNote Gee version 1998-01-27 Package gee June 29, 2015 Author Vincent J Carey. Ported to R by

More information

Package CausalImpact

Package CausalImpact Package CausalImpact September 15, 2017 Title Inferring Causal Effects using Bayesian Structural Time-Series Models Date 2017-08-16 Author Kay H. Brodersen , Alain Hauser

More information

Package anidom. July 25, 2017

Package anidom. July 25, 2017 Type Package Package anidom July 25, 2017 Title Inferring Dominance Hierarchies and Estimating Uncertainty Version 0.1.2 Date 2017-07-25 Author Damien R. Farine and Alfredo Sanchez-Tojar Maintainer Damien

More information

Package intccr. September 12, 2017

Package intccr. September 12, 2017 Type Package Package intccr September 12, 2017 Title Semiparametric Competing Risks Regression under Interval Censoring Version 0.2.0 Author Giorgos Bakoyannis , Jun Park

More information

Package mwa. R topics documented: February 24, Type Package

Package mwa. R topics documented: February 24, Type Package Type Package Package mwa February 24, 2015 Title Causal Inference in Spatiotemporal Event Data Version 0.4.1 Date 2015-02-21 Author Sebastian Schutte and Karsten Donnay Maintainer Sebastian Schutte

More information

SAS PROC GLM and PROC MIXED. for Recovering Inter-Effect Information

SAS PROC GLM and PROC MIXED. for Recovering Inter-Effect Information SAS PROC GLM and PROC MIXED for Recovering Inter-Effect Information Walter T. Federer Biometrics Unit Cornell University Warren Hall Ithaca, NY -0 biometrics@comell.edu Russell D. Wolfinger SAS Institute

More information

The multcomp Package

The multcomp Package The multcomp Package October 18, 2007 Title Simultaneous Inference for General Linear Hypotheses Version 0.992-6 Date $Date: 2007-10-16 15:58:46 +0200 (Tue, 16 Oct 2007) $ Author Torsten Hothorn, Frank

More information

9.1 Random coefficients models Constructed data Consumer preference mapping of carrots... 10

9.1 Random coefficients models Constructed data Consumer preference mapping of carrots... 10 St@tmaster 02429/MIXED LINEAR MODELS PREPARED BY THE STATISTICS GROUPS AT IMM, DTU AND KU-LIFE Module 9: R 9.1 Random coefficients models...................... 1 9.1.1 Constructed data........................

More information

Package blocksdesign

Package blocksdesign Type Package Package blocksdesign June 12, 2018 Title Nested and Crossed Block Designs for Factorial, Fractional Factorial and Unstructured Treatment Sets Version 2.9 Date 2018-06-11" Author R. N. Edmondson.

More information

Package citools. October 20, 2018

Package citools. October 20, 2018 Type Package Package citools October 20, 2018 Title Confidence or Prediction Intervals, Quantiles, and Probabilities for Statistical Models Version 0.5.0 Maintainer John Haman Functions

More information

Package svalues. July 15, 2018

Package svalues. July 15, 2018 Type Package Package svalues July 15, 2018 Title Measures of the Sturdiness of Regression Coefficients Version 0.1.6 Author Carlos Cinelli Maintainer Carlos Cinelli Implements

More information

Package CausalGAM. October 19, 2017

Package CausalGAM. October 19, 2017 Package CausalGAM October 19, 2017 Version 0.1-4 Date 2017-10-16 Title Estimation of Causal Effects with Generalized Additive Models Author Adam Glynn , Kevin Quinn

More information

Package DBfit. October 25, 2018

Package DBfit. October 25, 2018 Type Package Package DBfit October 25, 2018 Title A Double Bootstrap Method for Analyzing Linear Models with Autoregressive Errors Version 1.0 Date 2018-10-16 Author Joseph W. McKean and Shaofeng Zhang

More information

Package rpst. June 6, 2017

Package rpst. June 6, 2017 Type Package Title Recursive Partitioning Survival Trees Version 1.0.0 Date 2017-6-6 Author Maintainer Package rpst June 6, 2017 An implementation of Recursive Partitioning Survival Trees

More information

Statistical Analysis of Series of N-of-1 Trials Using R. Artur Araujo

Statistical Analysis of Series of N-of-1 Trials Using R. Artur Araujo Statistical Analysis of Series of N-of-1 Trials Using R Artur Araujo March 2016 Acknowledgements I would like to thank Boehringer Ingelheim GmbH for having paid my tuition fees at the University of Sheffield

More information

Package quickreg. R topics documented:

Package quickreg. R topics documented: Package quickreg September 28, 2017 Title Build Regression Models Quickly and Display the Results Using 'ggplot2' Version 1.5.0 A set of functions to extract results from regression models and plot the

More information

R-Square Coeff Var Root MSE y Mean

R-Square Coeff Var Root MSE y Mean STAT:50 Applied Statistics II Exam - Practice 00 possible points. Consider a -factor study where each of the factors has 3 levels. The factors are Diet (,,3) and Drug (A,B,C) and there are n = 3 observations

More information

Package PTE. October 10, 2017

Package PTE. October 10, 2017 Type Package Title Personalized Treatment Evaluator Version 1.6 Date 2017-10-9 Package PTE October 10, 2017 Author Adam Kapelner, Alina Levine & Justin Bleich Maintainer Adam Kapelner

More information

Package interplot. R topics documented: June 30, 2018

Package interplot. R topics documented: June 30, 2018 Package interplot June 30, 2018 Title Plot the Effects of Variables in Interaction Terms Version 0.2.1 Maintainer Yue Hu Description Plots the conditional coefficients (``marginal

More information

Package lmesplines. R topics documented: February 20, Version

Package lmesplines. R topics documented: February 20, Version Version 1.1-10 Package lmesplines February 20, 2015 Title Add smoothing spline modelling capability to nlme. Author Rod Ball Maintainer Andrzej Galecki

More information

Package oaxaca. January 3, Index 11

Package oaxaca. January 3, Index 11 Type Package Title Blinder-Oaxaca Decomposition Version 0.1.4 Date 2018-01-01 Package oaxaca January 3, 2018 Author Marek Hlavac Maintainer Marek Hlavac

More information

Package palmtree. January 16, 2018

Package palmtree. January 16, 2018 Package palmtree January 16, 2018 Title Partially Additive (Generalized) Linear Model Trees Date 2018-01-15 Version 0.9-0 Description This is an implementation of model-based trees with global model parameters

More information

Package rptr. January 4, 2018

Package rptr. January 4, 2018 Package rptr January 4, 2018 Title Repeatability Estimation for Gaussian and Non-Gaussian Data Version 0.9.21 Depends R (>= 3.2.1) Date 2018-01-04 Author Martin Stoffel ,

More information

Package datasets.load

Package datasets.load Title Interface for Loading Datasets Version 0.1.0 Package datasets.load December 14, 2016 Visual interface for loading datasets in RStudio from insted (unloaded) s. Depends R (>= 3.0.0) Imports shiny,

More information

SAS/STAT 13.1 User s Guide. The NESTED Procedure

SAS/STAT 13.1 User s Guide. The NESTED Procedure SAS/STAT 13.1 User s Guide The NESTED Procedure This document is an individual chapter from SAS/STAT 13.1 User s Guide. The correct bibliographic citation for the complete manual is as follows: SAS Institute

More information

Package blocksdesign

Package blocksdesign Type Package Package blocksdesign September 11, 2017 Title Nested and Crossed Block Designs for Factorial, Fractional Factorial and Unstructured Treatment Sets Version 2.7 Date 2017-09-11 Author R. N.

More information

SAS data statements and data: /*Factor A: angle Factor B: geometry Factor C: speed*/

SAS data statements and data: /*Factor A: angle Factor B: geometry Factor C: speed*/ STAT:5201 Applied Statistic II (Factorial with 3 factors as 2 3 design) Three-way ANOVA (Factorial with three factors) with replication Factor A: angle (low=0/high=1) Factor B: geometry (shape A=0/shape

More information

Package mvprobit. November 2, 2015

Package mvprobit. November 2, 2015 Version 0.1-8 Date 2015-11-02 Title Multivariate Probit Models Package mvprobit November 2, 2015 Author Arne Henningsen Maintainer Arne Henningsen

More information

Package qvcalc. R topics documented: September 19, 2017

Package qvcalc. R topics documented: September 19, 2017 Package qvcalc September 19, 2017 Version 0.9-1 Date 2017-09-18 Title Quasi Variances for Factor Effects in Statistical Models Author David Firth Maintainer David Firth URL https://github.com/davidfirth/qvcalc

More information

Package GFD. January 4, 2018

Package GFD. January 4, 2018 Type Package Title Tests for General Factorial Designs Version 0.2.5 Date 2018-01-04 Package GFD January 4, 2018 Author Sarah Friedrich, Frank Konietschke, Markus Pauly Maintainer Sarah Friedrich

More information

Package ridge. R topics documented: February 15, Title Ridge Regression with automatic selection of the penalty parameter. Version 2.

Package ridge. R topics documented: February 15, Title Ridge Regression with automatic selection of the penalty parameter. Version 2. Package ridge February 15, 2013 Title Ridge Regression with automatic selection of the penalty parameter Version 2.1-2 Date 2012-25-09 Author Erika Cule Linear and logistic ridge regression for small data

More information

General Factorial Models

General Factorial Models In Chapter 8 in Oehlert STAT:5201 Week 9 - Lecture 2 1 / 34 It is possible to have many factors in a factorial experiment. In DDD we saw an example of a 3-factor study with ball size, height, and surface

More information

for statistical analyses

for statistical analyses Using for statistical analyses Robert Bauer Warnemünde, 05/16/2012 Day 6 - Agenda: non-parametric alternatives to t-test and ANOVA (incl. post hoc tests) Wilcoxon Rank Sum/Mann-Whitney U-Test Kruskal-Wallis

More information

Package rfsa. R topics documented: January 10, Type Package

Package rfsa. R topics documented: January 10, Type Package Type Package Package rfsa January 10, 2018 Title Feasible Solution Algorithm for Finding Best Subsets and Interactions Version 0.9.1 Date 2017-12-21 Assists in statistical model building to find optimal

More information

STATISTICS FOR PSYCHOLOGISTS

STATISTICS FOR PSYCHOLOGISTS STATISTICS FOR PSYCHOLOGISTS SECTION: JAMOVI CHAPTER: USING THE SOFTWARE Section Abstract: This section provides step-by-step instructions on how to obtain basic statistical output using JAMOVI, both visually

More information

Chemical Reaction dataset ( https://stat.wvu.edu/~cjelsema/data/chemicalreaction.txt )

Chemical Reaction dataset ( https://stat.wvu.edu/~cjelsema/data/chemicalreaction.txt ) JMP Output from Chapter 9 Factorial Analysis through JMP Chemical Reaction dataset ( https://stat.wvu.edu/~cjelsema/data/chemicalreaction.txt ) Fitting the Model and checking conditions Analyze > Fit Model

More information

Introduction to Mixed Models: Multivariate Regression

Introduction to Mixed Models: Multivariate Regression Introduction to Mixed Models: Multivariate Regression EPSY 905: Multivariate Analysis Spring 2016 Lecture #9 March 30, 2016 EPSY 905: Multivariate Regression via Path Analysis Today s Lecture Multivariate

More information

Package mtsdi. January 23, 2018

Package mtsdi. January 23, 2018 Version 0.3.5 Date 2018-01-02 Package mtsdi January 23, 2018 Author Washington Junger and Antonio Ponce de Leon Maintainer Washington Junger

More information

CCSSM Curriculum Analysis Project Tool 1 Interpreting Functions in Grades 9-12

CCSSM Curriculum Analysis Project Tool 1 Interpreting Functions in Grades 9-12 Tool 1: Standards for Mathematical ent: Interpreting Functions CCSSM Curriculum Analysis Project Tool 1 Interpreting Functions in Grades 9-12 Name of Reviewer School/District Date Name of Curriculum Materials:

More information

Package ETC. February 19, 2015

Package ETC. February 19, 2015 Type Package Title Equivalence to control Version 1.3 Date 2009-01-30 Author Suggests SimComp, multcomp, mratios Imports mvtnorm Package ETC February 19, 2015 Maintainer The

More information

Example 5.25: (page 228) Screenshots from JMP. These examples assume post-hoc analysis using a Protected LSD or Protected Welch strategy.

Example 5.25: (page 228) Screenshots from JMP. These examples assume post-hoc analysis using a Protected LSD or Protected Welch strategy. JMP Output from Chapter 5 Factorial Analysis through JMP Example 5.25: (page 228) Screenshots from JMP. These examples assume post-hoc analysis using a Protected LSD or Protected Welch strategy. Fitting

More information

Package UNF. June 13, 2017

Package UNF. June 13, 2017 Version 2.0.6 Package UNF June 13, 2017 Title Tools for Creating Universal Numeric Fingerprints for Data Date 2017-06-13 Description Computes a universal numeric fingerprint (UNF) for an R data object.

More information

Package PrivateLR. March 20, 2018

Package PrivateLR. March 20, 2018 Type Package Package PrivateLR March 20, 2018 Title Differentially Private Regularized Logistic Regression Version 1.2-22 Date 2018-03-19 Author Staal A. Vinterbo Maintainer Staal

More information

Package plsrbeta. February 20, 2015

Package plsrbeta. February 20, 2015 Version 0.2.0 Date 2014-12-12 Depends R (>= 2.4.0) Package plsrbeta February 20, 2015 Imports mvtnorm, boot, Formula, plsdof, MASS, betareg, plsrglm Enhances Suggests pls Title Partial Least Squares Regression

More information

Package spark. July 21, 2017

Package spark. July 21, 2017 Title 'Sparklines' in the 'R' Terminal Version 2.0.0 Author Gábor Csárdi Package spark July 21, 2017 Maintainer Gábor Csárdi A 'sparkline' is a line chart, without axes and labels.

More information

Package sparsereg. R topics documented: March 10, Type Package

Package sparsereg. R topics documented: March 10, Type Package Type Package Package sparsereg March 10, 2016 Title Sparse Bayesian Models for Regression, Subgroup Analysis, and Panel Data Version 1.2 Date 2016-03-01 Author Marc Ratkovic and Dustin Tingley Maintainer

More information

Data Management - 50%

Data Management - 50% Exam 1: SAS Big Data Preparation, Statistics, and Visual Exploration Data Management - 50% Navigate within the Data Management Studio Interface Register a new QKB Create and connect to a repository Define

More information

610 R12 Prof Colleen F. Moore Analysis of variance for Unbalanced Between Groups designs in R For Psychology 610 University of Wisconsin--Madison

610 R12 Prof Colleen F. Moore Analysis of variance for Unbalanced Between Groups designs in R For Psychology 610 University of Wisconsin--Madison 610 R12 Prof Colleen F. Moore Analysis of variance for Unbalanced Between Groups designs in R For Psychology 610 University of Wisconsin--Madison R is very touchy about unbalanced designs, partly because

More information

Package GWAF. March 12, 2015

Package GWAF. March 12, 2015 Type Package Package GWAF March 12, 2015 Title Genome-Wide Association/Interaction Analysis and Rare Variant Analysis with Family Data Version 2.2 Date 2015-03-12 Author Ming-Huei Chen

More information

Package snm. July 20, 2018

Package snm. July 20, 2018 Type Package Title Supervised Normalization of Microarrays Version 1.28.0 Package snm July 20, 2018 Author Brig Mecham and John D. Storey SNM is a modeling strategy especially designed

More information

5:2 LAB RESULTS - FOLLOW-UP ANALYSES FOR FACTORIAL

5:2 LAB RESULTS - FOLLOW-UP ANALYSES FOR FACTORIAL 5:2 LAB RESULTS - FOLLOW-UP ANALYSES FOR FACTORIAL T1. n F and n C for main effects = 2 + 2 + 2 = 6 (i.e., 2 observations in each of 3 cells for other factor) Den t = SQRT[3.333x(1/6+1/6)] = 1.054 Den

More information

Package GLDreg. February 28, 2017

Package GLDreg. February 28, 2017 Type Package Package GLDreg February 28, 2017 Title Fit GLD Regression Model and GLD Quantile Regression Model to Empirical Data Version 1.0.7 Date 2017-03-15 Author Steve Su, with contributions from:

More information

Package StVAR. February 11, 2017

Package StVAR. February 11, 2017 Type Package Title Student's t Vector Autoregression (StVAR) Version 1.1 Date 2017-02-10 Author Niraj Poudyal Maintainer Niraj Poudyal Package StVAR February 11, 2017 Description Estimation

More information

Package multihiccompare

Package multihiccompare Package multihiccompare September 23, 2018 Title Normalize and detect differences between Hi-C datasets when replicates of each experimental condition are available Version 0.99.44 multihiccompare provides

More information

Package lucid. August 24, 2018

Package lucid. August 24, 2018 Version 1.6 Package lucid August 24, 2018 Title Printing Floating Point Numbers in a Human-Friendly Format Description Print vectors (and data frames) of floating point numbers using a non-scientific format

More information

Package svmpath. R topics documented: August 30, Title The SVM Path Algorithm Date Version Author Trevor Hastie

Package svmpath. R topics documented: August 30, Title The SVM Path Algorithm Date Version Author Trevor Hastie Title The SVM Path Algorithm Date 2016-08-29 Version 0.955 Author Package svmpath August 30, 2016 Computes the entire regularization path for the two-class svm classifier with essentially the same cost

More information

Package robustreg. R topics documented: April 27, Version Date Title Robust Regression Functions

Package robustreg. R topics documented: April 27, Version Date Title Robust Regression Functions Version 0.1-10 Date 2017-04-25 Title Robust Regression Functions Package robustreg April 27, 2017 Author Ian M. Johnson Maintainer Ian M. Johnson Depends

More information

RSM Split-Plot Designs & Diagnostics Solve Real-World Problems

RSM Split-Plot Designs & Diagnostics Solve Real-World Problems RSM Split-Plot Designs & Diagnostics Solve Real-World Problems Shari Kraber Pat Whitcomb Martin Bezener Stat-Ease, Inc. Stat-Ease, Inc. Stat-Ease, Inc. 221 E. Hennepin Ave. 221 E. Hennepin Ave. 221 E.

More information

Panel Data 4: Fixed Effects vs Random Effects Models

Panel Data 4: Fixed Effects vs Random Effects Models Panel Data 4: Fixed Effects vs Random Effects Models Richard Williams, University of Notre Dame, http://www3.nd.edu/~rwilliam/ Last revised April 4, 2017 These notes borrow very heavily, sometimes verbatim,

More information

Package endogenous. October 29, 2016

Package endogenous. October 29, 2016 Package endogenous October 29, 2016 Type Package Title Classical Simultaneous Equation Models Version 1.0 Date 2016-10-25 Maintainer Andrew J. Spieker Description Likelihood-based

More information

An introduction to SPSS

An introduction to SPSS An introduction to SPSS To open the SPSS software using U of Iowa Virtual Desktop... Go to https://virtualdesktop.uiowa.edu and choose SPSS 24. Contents NOTE: Save data files in a drive that is accessible

More information

Package cosinor. February 19, 2015

Package cosinor. February 19, 2015 Type Package Package cosinor February 19, 2015 Title Tools for estimating and predicting the cosinor model Version 1.1 Author Michael Sachs Maintainer Michael Sachs

More information

Package irrna. April 11, 2018

Package irrna. April 11, 2018 Type Package Package irrna April 11, 2018 Title Coefficients of Interrater Reliability - Generalized for Randomly Incomplete Datasets Version 0.1.4 Date 2018-04-10 Author Markus Brueckl [aut, cre], Florian

More information

General Factorial Models

General Factorial Models In Chapter 8 in Oehlert STAT:5201 Week 9 - Lecture 1 1 / 31 It is possible to have many factors in a factorial experiment. We saw some three-way factorials earlier in the DDD book (HW 1 with 3 factors:

More information

Output from redwing3.r

Output from redwing3.r Output from redwing3.r # redwing3.r library(doby) library(nlme) library(lsmeans) #library(lme4) # not used #library(lmertest) # not used #library(multcomp) # get the data # you may want to change the path

More information

Package PCADSC. April 19, 2017

Package PCADSC. April 19, 2017 Type Package Package PCADSC April 19, 2017 Title Tools for Principal Component Analysis-Based Data Structure Comparisons Version 0.8.0 A suite of non-parametric, visual tools for assessing differences

More information

Correctly Compute Complex Samples Statistics

Correctly Compute Complex Samples Statistics PASW Complex Samples 17.0 Specifications Correctly Compute Complex Samples Statistics When you conduct sample surveys, use a statistics package dedicated to producing correct estimates for complex sample

More information

Logical operators: R provides an extensive list of logical operators. These include

Logical operators: R provides an extensive list of logical operators. These include meat.r: Explanation of code Goals of code: Analyzing a subset of data Creating data frames with specified X values Calculating confidence and prediction intervals Lists and matrices Only printing a few

More information

Package ANOVAreplication

Package ANOVAreplication Type Package Version 1.1.2 Package ANOVAreplication September 30, 2017 Title Test ANOVA Replications by Means of the Prior Predictive p- Author M. A. J. Zondervan-Zwijnenburg Maintainer M. A. J. Zondervan-Zwijnenburg

More information

Package bife. May 7, 2017

Package bife. May 7, 2017 Type Package Title Binary Choice Models with Fixed Effects Version 0.4 Date 2017-05-06 Package May 7, 2017 Estimates fixed effects binary choice models (logit and probit) with potentially many individual

More information

Package geojsonsf. R topics documented: January 11, Type Package Title GeoJSON to Simple Feature Converter Version 1.3.

Package geojsonsf. R topics documented: January 11, Type Package Title GeoJSON to Simple Feature Converter Version 1.3. Type Package Title GeoJSON to Simple Feature Converter Version 1.3.0 Date 2019-01-11 Package geojsonsf January 11, 2019 Converts Between GeoJSON and simple feature objects. License GPL-3 Encoding UTF-8

More information

Output from redwing2.r

Output from redwing2.r Output from redwing2.r # redwing2.r library(lsmeans) library(nlme) #library(lme4) # not used #library(lmertest) # not used library(multcomp) # get the data # you may want to change the path to where you

More information