Skip to content

Commit c127a68

Browse files
committed
remove intReg which was archived
1 parent 1492c22 commit c127a68

File tree

5 files changed

+3
-67
lines changed

5 files changed

+3
-67
lines changed

DESCRIPTION

+3-3
Original file line numberDiff line numberDiff line change
@@ -1,7 +1,7 @@
11
Package: svrepmisc
22
Type: Package
33
Title: svrepmisc: Miscellaneous Functions for Replicate Weights
4-
Version: 0.2.1
4+
Version: 0.2.2
55
Authors@R: c(
66
person("Carl", "Ganz", email="[email protected]",role=c("aut","cre")),
77
person("Joseph", "Larmarange", email = "[email protected]", role = "ctb")
@@ -11,8 +11,8 @@ Description: Miscellaneous wrappers for implementing regression types from vario
1111
for complex survey data using the survey package's withReplicates function.
1212
License: GPL-3
1313
LazyData: TRUE
14-
RoxygenNote: 6.0.1
14+
RoxygenNote: 6.1.1
1515
URL: https://github.com/carlganz/svrepmisc
16-
Imports: survey, MASS, nnet, quantreg, crch, intReg, broom, ordinal
16+
Imports: survey, MASS, nnet, quantreg, crch, broom, ordinal
1717
BugReports: https://github.com/carlganz/svrepmisc/issues
1818
Suggests: covr, pander, testthat

NAMESPACE

-2
Original file line numberDiff line numberDiff line change
@@ -5,7 +5,6 @@ S3method(print,svrepstatmisc)
55
S3method(tidy,svrepstatmisc)
66
export(svyclm)
77
export(svycrch)
8-
export(svyintReg)
98
export(svymultinom)
109
export(svynb)
1110
export(svyrq)
@@ -16,7 +15,6 @@ importFrom(MASS,glm.nb)
1615
importFrom(broom,tidy)
1716
importFrom(crch,crch)
1817
importFrom(crch,trch)
19-
importFrom(intReg,intReg)
2018
importFrom(nnet,multinom)
2119
importFrom(ordinal,clm)
2220
importFrom(quantreg,rq)

R/svymisc.R

-21
Original file line numberDiff line numberDiff line change
@@ -152,27 +152,6 @@ svycrch <- function(formula, design, subset, ..., scale.weights=FALSE) {
152152

153153
}
154154

155-
#' Wrapper for Interval Regression
156-
#'
157-
#' Wrapper for \code{\link[intReg]{intReg}} for replicate weights
158-
#'
159-
#' @importFrom intReg intReg
160-
#' @param formula Model formula
161-
#' @param design Survey design from \code{\link[survey]{svrepdesign}}
162-
#' @param subset Expression to select a subpopulation
163-
#' @param ... Other arugments passed to \code{\link[intReg]{intReg}}
164-
#' @param scale.weights Indicate whether to rescale weights (defaults to false)
165-
#' @export
166-
#' @seealso \code{\link[survey]{withReplicates}} \code{\link[intReg]{intReg}}
167-
#' @references Lumley, Thomas. Complex Surveys: A Guide to Analisys Using R.
168-
#' Hoboken, NJ: Wiley, 2010. Print.
169-
170-
svyintReg <- function(formula, design, subset, ..., scale.weights = FALSE) {
171-
wR(intReg::intReg, formula, design, subset, ..., scale.weights = scale.weights)
172-
173-
}
174-
175-
176155
#' Wrapper for Ordinal Logistic Regression (cumulative link model) for Replicate Weights
177156
#'
178157
#' Uses \code{\link[survey]{withReplicates}} and \code{\link[ordinal]{clm}} to generate

man/svyintReg.Rd

-29
This file was deleted.

tests/testthat/test-test_coefs.R

-12
Original file line numberDiff line numberDiff line change
@@ -6,7 +6,6 @@ library(nnet)
66
library(quantreg)
77
library(MASS)
88
library(crch)
9-
library(intReg)
109

1110
# use survey package example
1211
# replicate weights - jackknife (this is slower)
@@ -56,14 +55,3 @@ test_that("coefs work for censored reg", {
5655
reg <- as.vector(reg)
5756
expect_equal(svy,reg)
5857
})
59-
60-
test_that("coefs work for intreg",{
61-
newVar <- sample(1:3,200,replace=TRUE)
62-
apistrat$low <- c(10000,50000,100000)[newVar]
63-
apistrat$high <- c(49999,99999,199999)[newVar]
64-
jkstrat <- update(jkstrat,low = c(10000,50000,100000)[newVar],high = c(49999,99999,199999)[newVar])
65-
svy <- as.vector(svyintReg(cbind(low,high)~api00+api99+factor(sch.wide)+meals,jkstrat))
66-
reg <- coef(intReg(cbind(low,high)~api00+api99+factor(sch.wide)+meals,data=apistrat,weights=apistrat$pw))
67-
reg <- as.vector(reg)
68-
expect_equal(svy,reg)
69-
})

0 commit comments

Comments
 (0)