A RetroSearch Logo

Home - News ( United States | United Kingdom | Italy | Germany ) - Football scores

Search Query:

Showing content from http://cran.rstudio.com/web/packages/Rcpp/../sparseDFM/../Rcpp/../Colossus/vignettes/SMR_Analysis.R below:

## ----include = FALSE---------------------------------------------------------- knitr::opts_chunk$set( collapse = TRUE, comment = "#>" ) ## ----setup-------------------------------------------------------------------- library(Colossus) library(survival) ## ----eval=TRUE---------------------------------------------------------------- data(cancer, package = "survival") cancer$status <- as.integer(cancer$status == 2) cancer$time <- cancer$time / 100 cancer$erate <- 0.5 ## ----eval=TRUE---------------------------------------------------------------- pyr <- "time" event <- "status" names <- c("erate") term_n <- c(0) tform <- c("lin") keep_constant <- c(0) a_n <- c(1) modelform <- "M" control <- list( "ncores" = 1, "maxiter" = 20, "halfmax" = 5, "epsilon" = 1e-9, "deriv_epsilon" = 1e-9, "verbose" = 2 ) e <- RunPoissonRegression_Omnibus( cancer, pyr, event, names, term_n, tform, keep_constant, a_n, modelform, control ) Interpret_Output(e) ## ----eval=TRUE---------------------------------------------------------------- names <- c("erate", "sex") term_n <- c(0, 1) tform <- c("lin", "lin") keep_constant <- c(0, 0) a_n <- c(1, 1) e <- RunPoissonRegression_Omnibus( cancer, pyr, event, names, term_n, tform, keep_constant, a_n, modelform, control = control ) Interpret_Output(e)

RetroSearch is an open source project built by @garambo | Open a GitHub Issue

Search and Browse the WWW like it's 1997 | Search results from DuckDuckGo

HTML: 3.2 | Encoding: UTF-8 | Version: 0.7.4