Thanks for taking the time to read this.
The code below creates a graph that takes 100 samples that are between 5% and 15% of the population (400).
What I'd like to do, however, is add two other sections to the graph. It would look something like this:
from 1-100 samples take 100 samples that are between 5% and 15% of the population (400). From 101-200 take 100 samples that are between 5% and 15% of the population (800). From 201-300 take 100 samples that are between 5% and 15% of the population (300).
I assume this would require a nested for loop. Does anyone have advice as to how to do this?
Thanks for your time. Kirsten
N <- 400
pop <- c(1:N)
lower.bound <- round(x = .05 * N, digits = 0)
lower.bound ## Smallest possible sample size
upper.bound <- round(x = .15 * N, digits = 0)
upper.bound ## Largest possible sample size
length.ss.interval <- length(c(lower.bound:upper.bound))
length.ss.interval ## total possible sample sizes, ranging form lower.bound
to upper.bound
sample(x = c(lower.bound:upper.bound),
size = 1,
prob = c(rep(1/length.ss.interval, length.ss.interval)))
n.samples <- 100
dat <- matrix(data = NA,
nrow = length(pop),
ncol = n.samples + 1)
dat[,1] <- pop
for(i in 2:ncol(dat)) {
a.sample <- sample(x = pop,
size = sample(x = c(lower.bound:upper.bound),
size = 1,
prob = c(rep(1/length.ss.interval,
length.ss.interval))),
replace = FALSE)
dat[,i] <- dat[,1] %in% a.sample
}
schnabel.comp <- data.frame(sample = 1:n.samples,
n.sampled = apply(X = dat, MARGIN = 2, FUN =
sum)[2:length(apply(X = dat, MARGIN = 2, FUN = sum))]
)
n.prev.sampled <- c(0, rep(NA, n.samples-1))
n.prev.sampled
n.prev.sampled[2] <- sum(ifelse(test = dat[,3] == 1 & dat[,2] == 1,
yes = 1,
no = 0))
for(i in 4:ncol(dat)) {
n.prev.sampled[i-1] <- sum(ifelse(test = dat[,i] == 1 &
rowSums(dat[,2:(i-1)]) > 0,
yes = 1,
no = 0))
}
schnabel.comp$n.prev.sampled <- n.prev.sampled
schnabel.comp$n.newly.sampled <- with(schnabel.comp,
n.sampled - n.prev.sampled)
schnabel.comp$cum.sampled <- c(0,
cumsum(schnabel.comp$n.newly.sampled)[2:n.samples-1])
schnabel.comp$numerator <- with(schnabel.comp,
n.sampled * cum.sampled)
schnabel.comp$pop.estimate <- NA
for(i in 1:length(schnabel.comp$pop.estimate)) {
schnabel.comp$pop.estimate[i] <- sum(schnabel.comp$numerator[1:i]) /
sum(schnabel.comp$n.prev.sampled[1:i])
}
if (!require("ggplot2")) {install.packages("ggplot2"); require("ggplot2")}
if (!require("scales")) {install.packages("scales"); require("scales")}
small.sample.dat <- schnabel.comp
small.sample <- ggplot(data = small.sample.dat,
mapping = aes(x = sample, y = pop.estimate)) +
geom_point(size = 2) +
geom_line() +
geom_hline(yintercept = N, col = "red", lwd = 1) +
coord_cartesian(xlim = c(0:100), ylim = c(300:500)) +
scale_x_continuous(breaks = pretty_breaks(11)) +
scale_y_continuous(breaks = pretty_breaks(11)) +
labs(x = "\nSample", y = "Population estimate\n",
title = "Sample sizes are between 5% and 15%\nof the population") +
theme_bw(base_size = 12) +
theme(aspect.ratio = 1)
My idea was to create a nested ifelse statement using the following:
N.2 <- 800
N.3 <- 300
pop.2 <- c(401:N.2)
pop.3 <- c(801:N)
lower.bound.2 <- round(x = .05 * N.2, digits = 0)
upper.bound.2 <- round(x = .15 * N.2, digits = 0)
lower.bound.3 <- round(x = .05 * N.3, digits = 0)
upper.bound.3 <- round(x = .15 * N.3, digits = 0)
perhaps some permutation of...
dat <- imatrix(ifelse(n.samples ,= 100),
yes = nrow = length(pop),
no = ifelse(n.samples > 100 & > 201),
yes = nrow = length(pop.2),
no = nrow = length(pop.3),
ncol = n.samples + 1)
Does this do what you want? The function I wrote below, mark_recapture
, takes four arguments (number of samples, lower and upper bounds of the samples, and population size), and outputs a matrix where the rows represent individuals in the population and the columns represent samples. If an individual was captured in a given sample, it gets a 1, otherwise it gets a 0. After defining the function, you can just run it 3 times with 3 different population sizes to get 3 different matrices.
# define variables
num_samp <- 100
lower_sampsize <- 0.05
upper_sampsize <- 0.15
# define sampling function that outputs matrix
mark_recapture <- function (num_samp, pop_size, lower_sampsize, upper_sampsize) {
# empty matrix
mat <- matrix(0, pop_size, num_samp)
# min and max sample size
min <- ceiling(lower_sampsize*pop_size)
max <- floor(upper_sampsize*pop_size)
# vector of random sample sizes between min and max
samp_sizes <- sample(min:max, num_samp, replace=TRUE)
# draw the samples and fill in the matrix
for (i in 1:num_samp) {mat[sample(1:pop_size, samp_sizes[i]),i] <- 1}
# return matrix
return(mat)
}
# do the sampling from the 3 populations
mat1 <- mark_recapture(num_samp=num_samp, pop_size=400, lower_sampsize=lower_sampsize, upper_sampsize=upper_sampsize)
mat2 <- mark_recapture(num_samp=num_samp, pop_size=800, lower_sampsize=lower_sampsize, upper_sampsize=upper_sampsize)
mat3 <- mark_recapture(num_samp=num_samp, pop_size=300, lower_sampsize=lower_sampsize, upper_sampsize=upper_sampsize)
Although it is beyond the scope of this question, I will just mention that there are dedicated R packages to analyzing and simulating mark-recapture data, e.g., multimark. Just Google "CRAN mark recapture" and you will find a number of options. I would suggest looking through those and thinking carefully about what are you trying to achieve here, because you might be trying to reinvent the wheel.