diff --git a/.gitignore b/.gitignore index d30723a..f51dd44 100644 --- a/.gitignore +++ b/.gitignore @@ -8,3 +8,6 @@ *lesson.html *lesson_files/ rsconnect/ + +*.html +drafts/ diff --git a/07-adv-model-infer/01-lesson/07-01-lesson.Rmd b/07-adv-model-infer/01-lesson/07-01-lesson.Rmd new file mode 100644 index 0000000..3b2a91c --- /dev/null +++ b/07-adv-model-infer/01-lesson/07-01-lesson.Rmd @@ -0,0 +1,305 @@ +--- +title: "Advanced Inference: 1 - Interactions" +output: + learnr::tutorial: + progressive: true + allow_skip: true +runtime: shiny_prerendered +--- + +```{r setup, message=FALSE, warning=FALSE, include=FALSE} +#devtools::install_github("rundel/learnrhash") +#devtools::install_git("git@github.com:rundel/learnrhash.git") + +library(learnr) +library(tidyverse) +library(openintro) +library(grid) +library(png) +library(ggplot2) +#library(emo) + +knitr::opts_chunk$set(echo = FALSE, + fig.align = "center", + fig.height = 3, + fig.width = 5, + message = FALSE, + warning = FALSE) + +tutorial_options(exercise.eval = FALSE) + +# Hash generation helpers +# Should ideally be loaded from the imstutorials package when it exists +is_server_context <- function(.envir) { + # We are in the server context if there are the follow: + # * input - input reactive values + # * output - shiny output + # * session - shiny session + # + # Check context by examining the class of each of these. + # If any is missing then it will be a NULL which will fail. + + inherits(.envir$input, "reactivevalues") & + inherits(.envir$output, "shinyoutput") & + inherits(.envir$session, "ShinySession") +} + +check_server_context <- function(.envir) { + if (!is_server_context(.envir)) { + calling_func <- deparse(sys.calls()[[sys.nframe() - 1]]) + err <- paste0("Function `", calling_func, "`", " must be called from an Rmd chunk where `context = \"server\"`") + stop(err, call. = FALSE) + } +} +encoder_logic <- function(strip_output = FALSE) { + p <- parent.frame() + check_server_context(p) + # Make this var available within the local context below + assign("strip_output", strip_output, envir = p) + # Evaluate in parent frame to get input, output, and session + local( + { + encoded_txt <- shiny::eventReactive( + input$hash_generate, + { + # shiny::getDefaultReactiveDomain()$userData$tutorial_state + state <- learnr:::get_tutorial_state() + shiny::validate(shiny::need(length(state) > 0, "No progress yet.")) + shiny::validate(shiny::need(nchar(input$name) > 0, "No name entered.")) + shiny::validate(shiny::need(nchar(input$studentID) > 0, "Please enter your student ID")) + user_state <- purrr::map_dfr(state, identity, .id = "label") + user_state <- dplyr::group_by(user_state, label, type, correct) + user_state <- dplyr::summarize( + user_state, + answer = list(answer), + timestamp = dplyr::first(timestamp), + .groups = "drop" + ) + user_state <- dplyr::relocate(user_state, correct, .before = timestamp) + user_info <- tibble( + label = c("student_name", "student_id"), + type = "identifier", + answer = as.list(c(input$name, input$studentID)), + timestamp = format(Sys.time(), "%Y-%m-%d %H:%M:%S %Z", tz = "UTC") + ) + learnrhash::encode_obj(bind_rows(user_info, user_state)) + } + ) + output$hash_output <- shiny::renderText(encoded_txt()) + }, + envir = p + ) +} + +hash_encoder_ui <- { + shiny::div("If you have completed this tutorial and are happy with all of your", "solutions, please enter your identifying information, then click the button below to generate your hash", textInput("name", "What's your name?"), textInput("studentID", "What is your student ID?"), renderText({ + input$caption + }), ) +} +``` + +## Welcome + +In the previous tutorials, you've learned how to perform multiple regression for inference and prediction. We will build on these skills in this tutorial, and in particular learn how to adapt models where two or more variables interact with each other and the outcome of interest. + +As a simple example, suppose we want to predict how much food cats will eat in a week. We have a sample of 16 pet cats, and have recorded their ages, weights, and body lengths, as well as how many grams of food they eat. Many of these variables are inter-correlated: kittens eat less than adult cats, and they are also smaller by weight and length. Similarly, many larger cats by length also weigh more (and eat more) than their shorter peers. In a situation like this, it's difficult to tease apart the relationships between the covariates and the outcome. We will learn how to address this below. + + +### Example: demographic data + +An academic advisor wants to study the career outcomes of former students under her mentorship. She collects the following data on 16 recent graduates: + +- `income` - annual income, in tens of thousands of USD +- `experience` - years of work experience +- `gender` - factor indicating gender + +Here's what a scatterplot of the data looks like: + +```{r, echo=FALSE} +inc <- c(43, 48, 52, 70, 61, 83, 96, 100, + 36, 40, 39, 44, 46, 49, 50, 53) +exp <- c(1, 2, 4, 6, 5, 3, 8, 10, + 1, 3, 2, 5, 8, 6, 7, 10) +gen <- c("male", "male", "male", "male", "male", "male", "male", "male", + "female", "female", "female", "female", "female", "female", "female", + "female") + +data <- data.frame(inc, exp, gen) +colnames(data) <- c("income", "experience", "gender") + +ggplot(data=data, aes(y=income, x=experience, col=gender)) + + geom_point() +``` + + +### Modeling the demographic data + +Let's fit a linear model to these data, using all the covariates we have. + +```{r, include=TRUE} +m1 <- lm(data=data, income ~ .) +summary(m1) +``` + + +### Adding interactions to our model + +In R, the syntax for adding an interaction term within the linear model `lm()` is `lm(y ~ x1 + x2 + x1:x2)`, where $y$ is the dependent variable and $x_1, x_2$ are two covariates. + +```{r, include=TRUE} +m2 <- lm(data=data, income ~ experience + gender + experience:gender) +summary(m2) +``` + + +### Assessing model fit + +```{r, echo=FALSE} +ggplot(data=data, aes(x=experience, y=income)) + + geom_point(aes(col=gender)) + + geom_smooth(method='lm', se=FALSE) + + ggtitle('Linear model without interaction term') + +tab <- matrix(c(0.733, 0.692, 11.1, 0.833, 0.791, 9.1), ncol=3, byrow=TRUE) +colnames(tab) <- c('Multiple R-squared', 'Adjusted R-squared', 'Residual SE') +rownames(tab) <- c('m1', 'm2') +tab <- as.table(tab) +print(tab) +``` + +We can see that the model that includes an interaction term performs better by the measures of goodness of fit that we know: the $R^2$ and adjusted $R^2$ are higher, and the SE's are lower. + + +## Your turn! + +### Data exploration + +Now we'll turn to a more interesting problem that does not have a categorical variable, but where our model can still benefit from including interactions. In this analysis, we are interested in determining what factors influence ice cream consumption from an ice cream truck with a route that travels across different neighborhoods. The variables are: + +- `cons` - ice cream consumption +- `temp` - outdoor temperature +- `income` - average neighborhood income +- `price` - ice cream price + +To start, load the `icecream.csv` data file into a DataFrame and create scatterplots to examine the relationships between the varables. + +```{r ex1, exercise = TRUE} +# Load data +icecream <- _______("data/icecream.csv") + +# View some of the variables +head(icecream) + +# Plot ice cream consumption vs outside temperature +ggplot(data=icecream, aes(y=_______, x=_______)) + + geom_point() + +# Plot ice cream consumption vs ice cream price, colored by outside temperature +ggplot(data=icecream, aes(y=_______, x=_______, col=temp)) + + geom_point() + +# Plot ice cream consumption vs consumer income, colored by price +ggplot(data=icecream, aes(y=_______, x=_______, col=_______)) + + geom_point() +``` + +```{r ex1-hint-1} +# Try the following command for loading the csv file: +read.csv("data/icecream.csv") +``` + +```{r ex1-solution} +# Solution +icecream <- read.csv("data/icecream.csv") + +ggplot(data=icecream, aes(y=cons, x=temp)) + + geom_point() + +ggplot(data=icecream, aes(y=cons, x=price, col=temp)) + + geom_point() + +ggplot(data=icecream, aes(y=cons, x=income, col=temp)) + + geom_point() +``` + +```{r mc1} +question("What is the relationship between ice cream consumption and temperature?", + answer("Positive and somewhat linear", correct=TRUE), + answer("Positive and strongly linear"), + answer("Negative and non-linear"), + answer("There is no correlation")) +``` + +### Modeling icecream consumption + +We can see that ice cream consumption and temperature have a positive and somewhat linear relationship; that is, when temperature increases, we observe that consumption is also likely to increase. But, we have two other variables in the dataset: price and income. Could these two variables be inter-related? + +First, let's write a model for the data: if $y$ is consumption, then with the variables we explored above the model can be expressed as + +$y = \beta_0 + \beta_{\rm temp}x_{\rm temp} + \beta_{\rm price}x_{\rm price} + \beta_{\rm income}x_{\rm income} + residuals$ + +Now, fit this model below: + +```{r ex2, exercise = TRUE} +m1 <- ____ + +summary(m1) +``` + +```{r ex2-solution} +# Add the independent variables (covariates) after the ~ and separated by + +m1 <- lm(data=icecream, cons ~ temp + price + income) + +summary(m1) +``` + + +### Interactions between non-categorical variables + +Now add the interaction term corresponding to the written model below: + +$y = \beta_0 + \beta_{\rm temp}x_{\rm temp} + \beta_{\rm price}x_{\rm price} + \beta_{\rm income}x_{\rm income} + \beta_{\rm price:income}x_{\rm price}x_{\rm income} + residuals$ + +Note that all of these are continuous variables, not categorical. + +```{r ex3, exercise = TRUE} +m2 <- ____ + +summary(m2) +``` + +```{r ex3-solution} +# Add the independent variables (covariates) after the ~ and separated by + +m2 <- lm(data=icecream, cons ~ temp + price + income + price:income) + +summary(m2) +``` + + +### Assessing model fit + +```{r, echo=FALSE} +tab <- matrix(c(0.719, 0.687, 0.037, 0.759, 0.721, 0.035), ncol=3, byrow=TRUE) +colnames(tab) <- c('Multiple R-squared', 'Adjusted R-squared', 'Residual SE') +rownames(tab) <- c('m1', 'm2') +tab <- as.table(tab) +print(tab) +``` + +```{r mc2} +question("Given the measures of model fit above, which model do you think fits the icecream consumption data better?", + answer("m1, linear model with no interactions"), + answer("m2, linear model with interaction between price and income", correct=TRUE), + answer("Not sure")) +``` + + +## Submit + +```{r, echo=FALSE, context="server"} +encoder_logic() +``` + +```{r encode, echo=FALSE} +learnrhash::encoder_ui(ui_before = hash_encoder_ui) +``` diff --git a/07-adv-model-infer/01-lesson/data/icecream.csv b/07-adv-model-infer/01-lesson/data/icecream.csv new file mode 100644 index 0000000..eeb7f03 --- /dev/null +++ b/07-adv-model-infer/01-lesson/data/icecream.csv @@ -0,0 +1,31 @@ +rownames,cons,income,price,temp +1,0.386,78,0.27,41 +2,0.374,79,0.282,56 +3,0.393,81,0.277,63 +4,0.425,80,0.28,68 +5,0.406,76,0.272,69 +6,0.344,78,0.262,65 +7,0.327,82,0.275,61 +8,0.288,79,0.267,47 +9,0.269,76,0.265,32 +10,0.256,79,0.277,24 +11,0.286,82,0.282,28 +12,0.298,85,0.27,26 +13,0.329,86,0.272,32 +14,0.318,83,0.287,40 +15,0.381,84,0.277,55 +16,0.381,82,0.287,63 +17,0.47,80,0.28,72 +18,0.443,78,0.277,72 +19,0.386,84,0.277,67 +20,0.342,86,0.277,60 +21,0.319,85,0.292,44 +22,0.307,87,0.287,40 +23,0.284,94,0.277,32 +24,0.326,92,0.285,27 +25,0.309,95,0.282,28 +26,0.359,96,0.265,33 +27,0.376,94,0.265,41 +28,0.416,96,0.265,52 +29,0.437,91,0.268,64 +30,0.548,90,0.26,71 \ No newline at end of file diff --git a/07-adv-model-infer/02-lesson/07-02-lesson.Rmd b/07-adv-model-infer/02-lesson/07-02-lesson.Rmd new file mode 100644 index 0000000..2cb7e68 --- /dev/null +++ b/07-adv-model-infer/02-lesson/07-02-lesson.Rmd @@ -0,0 +1,296 @@ +--- +title: "Advanced Inference: 2 - Nonlinear Regression" +output: + learnr::tutorial: + progressive: true + allow_skip: true +runtime: shiny_prerendered +--- + +```{r setup, message=FALSE, warning=FALSE, include=FALSE} +#devtools::install_github("rundel/learnrhash") +#devtools::install_git("git@github.com:rundel/learnrhash.git") + +library(learnr) +library(tidyverse) +library(openintro) +library(grid) +library(png) +#library(emo) + +knitr::opts_chunk$set(echo = FALSE, + fig.align = "center", + fig.height = 3, + fig.width = 5, + message = FALSE, + warning = FALSE) + +tutorial_options(exercise.eval = FALSE) + +# Hash generation helpers +# Should ideally be loaded from the imstutorials package when it exists +is_server_context <- function(.envir) { + # We are in the server context if there are the follow: + # * input - input reactive values + # * output - shiny output + # * session - shiny session + # + # Check context by examining the class of each of these. + # If any is missing then it will be a NULL which will fail. + + inherits(.envir$input, "reactivevalues") & + inherits(.envir$output, "shinyoutput") & + inherits(.envir$session, "ShinySession") +} + +check_server_context <- function(.envir) { + if (!is_server_context(.envir)) { + calling_func <- deparse(sys.calls()[[sys.nframe() - 1]]) + err <- paste0("Function `", calling_func, "`", " must be called from an Rmd chunk where `context = \"server\"`") + stop(err, call. = FALSE) + } +} +encoder_logic <- function(strip_output = FALSE) { + p <- parent.frame() + check_server_context(p) + # Make this var available within the local context below + assign("strip_output", strip_output, envir = p) + # Evaluate in parent frame to get input, output, and session + local( + { + encoded_txt <- shiny::eventReactive( + input$hash_generate, + { + # shiny::getDefaultReactiveDomain()$userData$tutorial_state + state <- learnr:::get_tutorial_state() + shiny::validate(shiny::need(length(state) > 0, "No progress yet.")) + shiny::validate(shiny::need(nchar(input$name) > 0, "No name entered.")) + shiny::validate(shiny::need(nchar(input$studentID) > 0, "Please enter your student ID")) + user_state <- purrr::map_dfr(state, identity, .id = "label") + user_state <- dplyr::group_by(user_state, label, type, correct) + user_state <- dplyr::summarize( + user_state, + answer = list(answer), + timestamp = dplyr::first(timestamp), + .groups = "drop" + ) + user_state <- dplyr::relocate(user_state, correct, .before = timestamp) + user_info <- tibble( + label = c("student_name", "student_id"), + type = "identifier", + answer = as.list(c(input$name, input$studentID)), + timestamp = format(Sys.time(), "%Y-%m-%d %H:%M:%S %Z", tz = "UTC") + ) + learnrhash::encode_obj(bind_rows(user_info, user_state)) + } + ) + output$hash_output <- shiny::renderText(encoded_txt()) + }, + envir = p + ) +} + +hash_encoder_ui <- { + shiny::div("If you have completed this tutorial and are happy with all of your", "solutions, please enter your identifying information, then click the button below to generate your hash", textInput("name", "What's your name?"), textInput("studentID", "What is your student ID?"), renderText({ + input$caption + }), ) +} +``` + +## Welcome + +In this lesson, we'll learn how to model data that may not be linear. See the data table below: + +```{r, echo=FALSE} +knitr::opts_chunk$set(echo = TRUE) +library(ggplot2) + +# Simulate some data +x <- runif(n=100, min=0, max=10) +epsilon <- rnorm(n=100, mean=0, sd=1) +y <- 2*x**2 + epsilon*((1+x**2)) + +data <- data.frame(x,y) +head(data) +``` + + +### Visualize data + +Let's examine the data. First, generate a scatterplot of x and y. +```{r} +ggplot(data=data, aes(x=x, y=y)) + + geom_point() +``` + +```{r mc1, echo=FALSE} +question("Is the relationship between x and y linear?", + answer("Yes"), + answer("No", correct=TRUE), + answer("Not sure")) +``` + +Now let's look at the histograms of x and y, below. Notice that x looks more or less uniformly distributed, but y is highly skewed. This is another clue that the relationship between the variables is not linear. + +```{r} +ggplot(data=data, aes(x=x)) + + geom_histogram() + +ggplot(data=data, aes(x=y)) + + geom_histogram() +``` + + +### Adding a transformation + +Compute y_ = sqrt(y) and add it to the dataframe. Then, plot the relationship between x and y_. +```{r ex2, exercise=TRUE} +data$y_ <- _____ + +ggplot(data=data, aes(x=_____, y=_____)) + + geom_point() +``` + +```{r ex2-solution} +data$y_ = sqrt(data$y) + +ggplot(data=data, aes(x=x, y=y_)) + + geom_point() +``` + +Does the relationship between x and y_ look linear? +```{r mc2, echo=FALSE} +question("Is the relationship between x and y_ linear?", + answer("Yes", correct=TRUE), + answer("No"), + answer("Not sure")) +``` + + +### Modeling the transformed data + +Now, fit a linear model for x and y_. + +```{r ex3, exercise=TRUE} +model <- lm(______) +summary(model) +``` + +```{r ex3-solution} +model <- lm(data=data, y_ ~ x) +summary(model) +``` + + +### Back-transformation + +Now we need to back-transform the data in order to plot the best-fit line on +the original (non-transformed) domain of y. + +$y* = 0.557 + 1.268x + residuals$ + +$\sqrt{y}= 0.557 + 1.268x + residuals$ + +$y = (0.557 + 1.268x + residuals)^2$ + +The model on the last line is shown below. + +```{r} +ggplot(data=data, aes(x=x, y=y)) + + geom_point() + + geom_smooth(method="lm", formula=y~poly(x,2), se=FALSE) +``` + +Note: after transforming the data, you will need to take care when interpreting the coefficients of the model. As we showed, we cannot describe changes in $y$ as linear with respect to changes in $x$. Instead, in this specific case the change in $y$ is *quadratic* with changes in $x$. + + +## Your turn! + +Now try repeating the same analysis on MLB salary data. Here's a preview of what the dataset, called `Hitters`, looks like: + +```{r, echo=FALSE} +library(ISLR2) +data(Hitters) + +head(Hitters) +``` + + +Create a scatterplot of players' salaries vs RBI. RBI, coarsely speaking, measures how many points the team scores as a result of a player's at-bat. Check the linearity of the data with the scatterplot. + +```{r ex4, exercise=TRUE} +``` + +```{r ex4-solution} +ggplot(data=Hitters, aes(x=RBI, y=Salary)) + + geom_point() +``` + + +### A Different Transformation + +So the Salaries are not linear, and you'll have to transform them again. Take another look at the scatterplot above. + +```{r mc3, echo=FALSE} +question("What relationship does MLB players' salary and RBI seem to have?", + answer("Linear"), + answer("Exponential", correct=TRUE), + answer("Cubic"), + answer("Not sure")) +``` + + +### Modeling Exponential Data + +Perform a log transformation on the Salary variable, and add it to the dataframe. Then use the transformed variable in a linear model as you did with the quadratic example above. + +```{r ex5, exercise=TRUE} +Hitters$logSalary <- _____ +``` + +```{r ex5-solution} +Hitters$logSalary <- log(Hitters$Salary) +``` + +```{r mc4, echo=FALSE} +question("What inverse operation will you need to perform on the model for the correct back-transformation?", + answer("(...)^2"), + answer("exp(...) or e^(...)", correct=TRUE), + answer("sqrt(...)"), + answer("1/(...)")) +``` + + +### Back Transformation + +After back-transforming, your model will be: + +$y = e^{\beta_0 + \beta_1x_{RBI} + residuals}$ + + +### Interpretation + +Now on a log scale, `logSalary` appears linear with RBI: + +```{r, include=FALSE} +Hitters$logSalary <- log(Hitters$Salary) +``` + +```{r} +ggplot(data=Hitters, aes(x=RBI, y=logSalary)) + + geom_point() + + geom_smooth(method="lm", formula=(y~x), se=FALSE, color="blue") +``` + +Note the difference in the scales on the y-axis compared to the first scatterplot you made, because now we're on a log scale. + + +## Submit + +```{r, echo=FALSE, context="server"} +encoder_logic() +``` + +```{r encode, echo=FALSE} +learnrhash::encoder_ui(ui_before = hash_encoder_ui) +``` diff --git a/07-adv-model-infer/03-lesson/07-03-lesson.Rmd b/07-adv-model-infer/03-lesson/07-03-lesson.Rmd new file mode 100644 index 0000000..3096035 --- /dev/null +++ b/07-adv-model-infer/03-lesson/07-03-lesson.Rmd @@ -0,0 +1,798 @@ +--- +title: "Advanced Inference: 3 - Inference and Prediction" +output: + learnr::tutorial: + progressive: true + allow_skip: true +runtime: shiny_prerendered +--- + +```{r setup, message=FALSE, warning=FALSE, include=FALSE} +#devtools::install_github("rundel/learnrhash") + +library(learnr) +library(tidyverse) +library(openintro) +library(grid) +library(png) +#library(emo) + +knitr::opts_chunk$set(echo = FALSE, + fig.align = "center", + fig.height = 3, + fig.width = 5, + message = FALSE, + warning = FALSE) + +tutorial_options(exercise.eval = FALSE) + +# Hash generation helpers +# Should ideally be loaded from the imstutorials package when it exists +is_server_context <- function(.envir) { + # We are in the server context if there are the follow: + # * input - input reactive values + # * output - shiny output + # * session - shiny session + # + # Check context by examining the class of each of these. + # If any is missing then it will be a NULL which will fail. + + inherits(.envir$input, "reactivevalues") & + inherits(.envir$output, "shinyoutput") & + inherits(.envir$session, "ShinySession") +} + +check_server_context <- function(.envir) { + if (!is_server_context(.envir)) { + calling_func <- deparse(sys.calls()[[sys.nframe() - 1]]) + err <- paste0("Function `", calling_func, "`", " must be called from an Rmd chunk where `context = \"server\"`") + stop(err, call. = FALSE) + } +} +encoder_logic <- function(strip_output = FALSE) { + p <- parent.frame() + check_server_context(p) + # Make this var available within the local context below + assign("strip_output", strip_output, envir = p) + # Evaluate in parent frame to get input, output, and session + local( + { + encoded_txt <- shiny::eventReactive( + input$hash_generate, + { + # shiny::getDefaultReactiveDomain()$userData$tutorial_state + state <- learnr:::get_tutorial_state() + shiny::validate(shiny::need(length(state) > 0, "No progress yet.")) + shiny::validate(shiny::need(nchar(input$name) > 0, "No name entered.")) + shiny::validate(shiny::need(nchar(input$studentID) > 0, "Please enter your student ID")) + user_state <- purrr::map_dfr(state, identity, .id = "label") + user_state <- dplyr::group_by(user_state, label, type, correct) + user_state <- dplyr::summarize( + user_state, + answer = list(answer), + timestamp = dplyr::first(timestamp), + .groups = "drop" + ) + user_state <- dplyr::relocate(user_state, correct, .before = timestamp) + user_info <- tibble( + label = c("student_name", "student_id"), + type = "identifier", + answer = as.list(c(input$name, input$studentID)), + timestamp = format(Sys.time(), "%Y-%m-%d %H:%M:%S %Z", tz = "UTC") + ) + learnrhash::encode_obj(bind_rows(user_info, user_state)) + } + ) + output$hash_output <- shiny::renderText(encoded_txt()) + }, + envir = p + ) +} + +hash_encoder_ui <- { + shiny::div("If you have completed this tutorial and are happy with all of your", "solutions, please enter your identifying information, then click the button below to generate your hash", textInput("name", "What's your name?"), textInput("studentID", "What is your student ID?"), renderText({ + input$caption + }), ) +} +``` + +## Welcome + +In this tutorial, you'll learn more about inference and prediction for regression models. Our main goal is to learn how to quantify uncertainty not just in our model parameters, but also in the predictions that we make with them. To start, let's review the workflow for estimating parameters. + + +### Review: estimate parameters + +Fit a linear model to the following dataset containing records of flights out of New York City in 2013. In particular, model the relationship between distance (in miles) and air time (in minutes). Then print a summary of the model results. + +```{r, echo=FALSE} +set.seed(42) + +# Dataset is too big for our purposes, just take 40 samples and select the +# two columns of interest +nycflights <- nycflights %>% + select(distance, air_time) %>% + sample_n(size=40) + +# Add some extra noise +nycflights$air_time <- nycflights$air_time + rnorm(n=nrow(nycflights), sd=5) +head(nycflights) + +# Store model object, can't knit otherwise +model <- lm(data=nycflights, air_time ~ distance) +``` + +```{r ex1, exercise=TRUE} +model <- lm(data=nycflights, ____) +summary(model) +``` + +```{r ex1-solution} +model <- lm(data=nycflights, air_time ~ distance) +summary(model) +``` + +### + +```{r, echo=FALSE} +ggplot(data=nycflights, aes(x=distance, y=air_time)) + + geom_point() + + geom_smooth(method="lm", formula=(y~x), se=FALSE, color="blue") +``` + +```{r mc1, echo=FALSE} +question("Is there a correlation between flight distance and air time?", + answer("Yes", correct=TRUE), + answer("No"), + answer("Not sure")) +``` + +### + +Here is the model you should've gotten from your summary: + +$y = 18.36 + 0.126x + residuals$ + +```{r mc2, echo=FALSE} +question("How would you interpret the model parameters above?", + answer("For each one-mile increase in flight distance, the model predicts that the corresponding air time increases by 12.6 minutes"), + answer("For each one-mile increase in flight distance, the model predicts that the corresponding air time increases by 0.126 minutes.", correct=TRUE), + answer("For each one-mile increase in flight distance, the model predicts that the corresponding air time increases by 18.36 minutes."), + answer("For each one-mile increase in flight distance, the model predicts that the corresponding air time increases by 1.836 minutes."), + answer("Not sure")) +``` + + +### Review: quantifying (un)certainty + +As we would expect, there is a strong correlation between flight distance and air time ($R^2$=0.97). The average increase of $0.126$ minutes is a point estimate based on a sample of $n=40$ flights. Given the model output above and any relevant R functions, construct a $95\%$ confidence interval to give an interval estimate of the true $\beta_1$: + +```{r ex2, exercise=TRUE} +``` + +```{r ex2-hint1} +# You have the point estimate, b1=0.126, and the model summary gives you the +# standard error for this estimate: SE = 0.002978 +``` + +```{r ex2-hint2} +# You have the point estimate, b1=0.126, and the model summary gives you the +# standard error for this estimate: SE = 0.002978 + +# Now for the degrees of freedom: you have n=40 samples, so df = n-2 = 38 +``` + +```{r ex2-hint3} +# You have the point estimate, b1=0.126, and the model summary gives you the +# standard error for this estimate: SE = 0.002978 + +# Now for the degrees of freedom: you have n=40 samples, so df = n-2 = 38 + +# To compute the critical t value, use the qt() function: +t_crit <- qt(p=0.05/2, df=38) +``` + +```{r ex2-solution} +# You have the point estimate, b1=0.126, and the model summary gives you the +# standard error for this estimate: SE = 0.002978 + +# Now for the degrees of freedom: you have n=40 samples, so df = n-2 = 38 + +# To compute the critical t value, use the qt() function, and remember we are +# computing a two-sided CI: +t_crit <- qt(p=0.05/2, df=38) + +# Now compute the full interval: +0.126 + c(-1,1)*t_crit*0.002978 +``` + + +## Predicting future values + +***TODO: add concept check MC questions*** + +Now imagine you're flying direct from NYC to BOS - about 187 miles. Your model can predict how long this flight might take: + +$\hat{y} = 18.36 + (0.126\times187) = 41.92$ minutes + +But we know this model is based on our sample of 40 flights, and that the estimate might be different if we had generated the model from a different sample (this is called *sampling variability*). Another way to think about it is this: imagine we knew $\beta_0$ and $\beta_1$ exactly. Then we would know $y$, too, right? + +### + +### Model-based analysis + +Well, no - we still don't know $\epsilon$, the `residuals` in the equation $y = \beta_0 + \beta_1x + residuals$. $\epsilon$ is a random variable, and we assume it has a normal distribution with mean 0 and variance $\sigma^2$. In the process of performing linear regression we estimate $\hat\sigma^2$, but there is still uncertainty inherent to the model. + +For example, there are two rows in the dataset corresponding to a flight distance of 529 miles: + +```{r} +subset(nycflights, distance == 529) +``` + +Note how different the response values $y$ are! To visualize this, let's plot our regression line and the two `distance=529` points below: + +```{r, echo=FALSE} +x <- seq(100,1000) +example <- data.frame(x) +example$yhat <- 18.36 + 0.126*x + +subset <- subset(nycflights, distance == 529) + +ggplot() + + geom_line(data=example, aes(x=x,y=yhat), color='blue') + + geom_point(data=subset, aes(x=distance, y=air_time)) + + xlim(c(100,1000)) +``` + +The uncertainty here, shown by the marked difference between our predicted values (blue line) and the observed values (points), is determined by the `residuals` term in our model. In the next section we'll use different approaches to analyze this uncertainty. First, we'll computed bootstrapped estimates of the linear model coefficients, and then we'll discuss extrapolation. + + +## Bootstrap Simulation + +### + +In this simulation, we'll use bootstrapping to take a closer look at sample variation (introduced above). The model you generated for flight distance vs air time, $y = 18.66 + 0.1269x + residuals$, was based on a sample of $n=40$ flights. If you had a slightly different sample, then the model would be different too. + +Recall from Tutorial 5 the lesson on bootstrapping: from our data sample, we generated more data by sampling from the original dataset (under the null hypothesis) with replacement. If we repeat that many times for this example, we can show how the models change with each new sample set. + + +### Computing Bootstrap Estimates + +***TODO: add concept check MC questions*** + +First, let's fit a sequence of 100 bootstrap estimates for our intercept and slope parameters: + +```{r, echo=TRUE} +# using infer package, as in tutorial 5 +# https://infer.netlify.app/articles/infer#introduction +library(infer) + +# Generate fitted models from 100 bootstrapped estimates: +boots <- nycflights |> + specify(air_time ~ distance) |> + generate(reps=100, type="bootstrap") |> + fit() + +head(boots) # display the table of estimated parameters + +# Grab the parameters +bIntercepts <- subset(data.frame(boots), term=="intercept")["estimate"] +bSlopes <- subset(data.frame(boots), term=="distance")["estimate"] +``` + +### + +Now let's compute the predicted values for each bootstrapped model, so we can plot them and see how they differ: + +```{r, echo=TRUE} +# Create a matrix to hold the predicted values +bPredictions <- matrix(nrow=nrow(bIntercepts)*nrow(nycflights), ncol=5) +colnames(bPredictions) <- c("distance", "yhat", "y", "residuals", "bootstrapLine") +bPredictions <- data.frame(bPredictions) + +bPredictions$distance <- rep(nycflights$distance, nrow(bIntercepts)/nrow(nycflights)) +bPredictions$y <- rep(nycflights$air_time, nrow(bIntercepts)/nrow(nycflights)) +bPredictions$yhat <- bIntercepts$estimate + (bPredictions$distance * bSlopes$estimate) +bPredictions$residuals <- bPredictions$yhat - bPredictions$y +names <- seq(1:nrow(bIntercepts)) +bPredictions$bootstrapLine <- rep(names, nrow(nycflights)) + +head(bPredictions) +``` + +Plot the boostrapped models overlaid with a scatterplot of the original data: + +```{r, echo=TRUE} +ggplot() + + geom_line(data=bPredictions, aes(x=distance, y=yhat, color=factor(bootstrapLine)), alpha=0.6) + + geom_point(data=nycflights, aes(x=distance, y=air_time)) + + theme(legend.position = "none") +``` + +### + +Now let's look at the boostrap models' residual standard error, and the standard error of each bootstrapped parameter: + +```{r, echo=TRUE} +# Compute the SE for each parameter +se_bInt <- sd(bIntercepts$estimate) +se_bSlopes <- sd(bSlopes$estimate) + +# Compute the residual SE +se_bResid <- sd(bPredictions$residuals) + +# Original model SE values: +se_mInt <- summary(model)$coefficients[,2][[1]] +se_mSlope <- summary(model)$coefficients[,2][[2]] +se_mResid <- sd(summary(model)$residuals) + +# Create a table of values +se_tab <- matrix(c(se_mInt, se_bInt, se_mSlope, se_bSlopes, se_mResid, se_bResid), + ncol=2, byrow=TRUE) +colnames(se_tab) <- c("Original model", "Bootstraps") +rownames(se_tab) <- c("Intercept SE", "Slope SE", "Residual SE") +se_tab <- as.table(se_tab) +print(se_tab) +``` + +### + +Note how the bootstrap standard error values are larger than the original model's. This extra uncertainty comes from our bootstrap resampling procedure. To be more concrete, we can examine the formula for the residual SE: for a chosen predictor value $x^*$, our prediction is given by $\hat{y}^* = \beta_0 + \beta_1x^*$, and + +$$SE = \sqrt{s_e^2 +\frac{s_e^2}{n} + (SE_{\beta_1})^2 \times (x^*-\bar{x})^2}$$ +Let's look at each term in sequence: + +- $s_e^2$, the _variance of the residuals_, represents the uncertainty associated with the residuals +- $\frac{s_e^2}{n}$ represents the average contribution to the variance of the residuals of each data pair $(x^*, \hat{y}^*)$ +- $(SE_{\beta_1})^2 \times (x^*-\bar{x})^2$: note that this term increases as the distance between $x^*$ and $\bar{x}$ increases, which means that our uncertainty increases as we move away from predicting values near the mean of $x$ + + +## Your turn! +In this section, you'll repeat the bootstrap analysis on a dataset we've already seen. + +### + +We return to the `possum` dataset from Tutorial 3, where we first reviewed how to find a line of best fit. Here's a scatterplot of the variables `total_l`, the total length in centimeters of a possum, vs `tail_l`, the length in centimeters of its tail: + +```{r, echo=TRUE} +ggplot(data=possum, aes(x=tail_l, y=total_l)) + + geom_point() +``` + +Now load the data, fit a linear model, and output the model summary. Note the parameter and residual standard error here - we will return to these values later. + +```{r ex3, exercise=TRUE} +model <- ____ +summary(model) +``` + +```{r ex3-solution} +model <- lm(data=possum, total_l ~ tail_l) +summary(model) +``` + +***TODO: keep this part?*** +Take a subset of the data where `tail_l=38` and plot your model from above alongside this subset: + +```{r ex4, exercise=TRUE} +subset <- subset(data=possum, ____) +head(subset) + +# Generate x values for plotting +x <- seq(32:42) + +# Predict y~x using model coefficients from before +# TODO: leave these blank and ask them to extract the coeffs, so they learn how? +ypred <- model$coefficients[[1]] + x * model$coefficients[[2]] + +# Add the x and predicted y values to a dataframe +line <- data.frame(x) +line$ypred <- ypred +colnames(line) <- c("tail_l", "pred_total_l") + +ggplot() + + geom_point(data=subset, aes(x=____, y=____)) + + geom_line(data=line, aes(x=____, y=____), color='blue') +``` + +```{r ex4-solution} +subset <- subset(possum, tail_l == 38) +head(subset) + +# Generate x values for plotting +x <- seq(32,42) + +# Predict y~x using model coefficients from before +# TODO: leave these blank and ask them to extract the coeffs, so they learn how? +ypred <- model$coefficients[[1]] + x * model$coefficients[[2]] + +# Add the x and predicted y values to a dataframe +line <- data.frame(x) +line$ypred <- ypred +colnames(line) <- c("tail_l", "pred_total_l") + +# Plot +ggplot() + + geom_point(data=subset, aes(x=tail_l, y=total_l)) + + geom_line(data=line, aes(x=tail_l, y=pred_total_l), color='blue') +``` + +Again, even if we knew the exact $\beta_0$ and $\beta_1$ terms, there is still uncertainty in our predictions of `total_l`. + +### + +Now, generate 500 bootstrapped estimates for the possum data: + +```{r ex5, exercise=TRUE} +bootsp <- possum |> + specify(___) |> + generate(reps=500, type=___) |> + fit() + +# Grab the parameters +pIntercepts <- subset(data.frame(bootsp), term==____)["estimate"] +pSlopes <- subset(data.frame(bootsp), term==____)["estimate"] + +``` + +```{r ex5-solution} +bootsp <- possum |> + specify(total_l ~ tail_l) |> + generate(reps=500, type="bootstrap") |> + fit() + +# Grab the parameters +pIntercepts <- subset(data.frame(bootsp), term=="intercept")["estimate"] +pSlopes <- subset(data.frame(bootsp), term=="tail_l")["estimate"] +``` + +```{r, echo=FALSE} +# Need to include this in a separate chunk or the below won't knit +bootsp <- possum |> + specify(total_l ~ tail_l) |> + generate(reps=500, type="bootstrap") |> + fit() +pIntercepts <- subset(data.frame(bootsp), term=="intercept")["estimate"] +pSlopes <- subset(data.frame(bootsp), term=="tail_l")["estimate"] +``` + +```{r} +head(bootsp) +``` + +```{r, echo=FALSE} +# Compute predictions and residuals for the bootstrapped possum models +# Hidden from students now but can show if desired + +# Create a matrix to hold the predicted values +pPredictions <- matrix(nrow=nrow(pIntercepts)*nrow(possum), ncol=5) +colnames(pPredictions) <- c("tail_l", "yhat", "y", "residuals", "bootstrapLine") +pPredictions <- data.frame(pPredictions) + +pPredictions$tail_l <- rep(possum$tail_l, nrow(pIntercepts)/nrow(possum)) +pPredictions$y <- rep(possum$total_l, nrow(pIntercepts)/nrow(possum)) +pPredictions$yhat <- pIntercepts$estimate + (pPredictions$tail_l * pSlopes$estimate) +pPredictions$residuals <- pPredictions$yhat - pPredictions$y +names <- seq(1:nrow(pIntercepts)) +pPredictions$bootstrapLine <- rep(names, nrow(possum)) + +head(pPredictions) +``` + +Plot the boostrapped models overlaid with a scatterplot of the original data: + +```{r, echo=TRUE} +ggplot() + + geom_line(data=pPredictions, aes(x=tail_l, y=yhat, color=factor(bootstrapLine)), alpha=0.6) + + geom_point(data=possum, aes(x=tail_l, y=total_l)) + + theme(legend.position = "none") +``` + +Note how different all of the lines are from each other! + +### + +```{r mc4, echo=FALSE} +question("Do you expect the bootstrapped models for the possum data to have higher, lower, or the same standard errors than your baseline linear model?", + answer("The bootstrapped models should have higher standard error.", correct=TRUE), + answer("The bootstrapped models should have lower standard error."), + answer("The bootstrapped models should have the same standard error as my model."), + answer("Not sure")) +``` + +### + +```{r mc5, echo=FALSE} +question("How do you compute the standard error for each parameter?", + answer("Compute the standard deviation of the parameter estimates.", correct=TRUE), + answer("Compute the standard deviation of the model residuals."), + answer("Compute the mean of the parameter estimates."), + answer("Not sure")) +``` + +Compute $s_e^2$ for the slope and intercept parameters of your bootstrapped models: + +```{r ex6, exercise=TRUE} +se_pInt <- ____ +se_pSlopes <- ____ +``` + +```{r ex6-solution} +se_pInt <- sd(pIntercepts$estimate) +se_pSlopes <- sd(pSlopes$estimate) +``` + +And the residual SE: + +```{r ex7, exercise=TRUE} +se_pResid <- ____ +``` + +```{r ex7-solution} +se_pResid <- sd(pPredictions$residuals) +``` + +And now we compare the standard error for our bootstrapped models vs our baseline model: + +```{r, echo=FALSE} +se_pInt <- sd(pIntercepts$estimate) +se_pSlopes <- sd(pSlopes$estimate) +se_pResid <- sd(pPredictions$residuals) + +# Original model SE values: +se_mInt <- summary(model)$coefficients[,2][[1]] +se_mSlope <- summary(model)$coefficients[,2][[2]] +se_mResid <- sd(summary(model)$residuals) + +# Create a table of values +se_tab <- matrix(c(se_mInt, se_pInt, se_mSlope, se_pSlopes, se_mResid, se_pResid), + ncol=2, byrow=TRUE) +colnames(se_tab) <- c("Original model", "Bootstraps") +rownames(se_tab) <- c("Intercept SE", "Slope SE", "Residual SE") +se_tab <- as.table(se_tab) +print(se_tab) +``` + + +## Extrapolation + +```{r, include=FALSE} +# Simulate a dataset that makes extrapolation outside of a given range tricky +x <- c(5,6,7,11,12,13,14) +y <- c(8,12,11,21,23,26,25) +observed <- data.frame(cbind(x,y)) + +x <- c(3,3.5,4.5,15:20) +y <- c(0,4,5,26,23,25,22,20,19) +unobserved <- data.frame(cbind(x,y)) +``` + +In this section, we'll look at the difference between _interpolation_ and _extrapolation_ in inference and prediction, and how to choose the correct approach. Below, you're given a dataframe called `observed` that contains all of the data you observe. How might you try to model these data? + +```{r, echo=FALSE} +ggplot(data=observed, aes(x=x,y=y)) + + geom_point() + + xlim(c(0,20)) +``` + +### + +Let's try fitting a linear model, in particular to fill the gap in the neighborhood of x=10. We call this _interpolation_: making predictions based on observed data on new values that are still within the observed range. + +```{r} +ggplot(data=observed, aes(x=x,y=y)) + + geom_point() + + geom_smooth(method='lm', se=FALSE) + + xlim(c(0,20)) +``` + +```{r, include=FALSE} +observed$observed <- rep(TRUE, nrow(observed)) +unobserved$observed <- rep(FALSE, nrow(unobserved)) +fullData <- rbind(observed, unobserved) +``` + +### + +You're fairly confident that your model can predict the values around x=10, but what about x=0 or x=20? Since these values lie outside the observed range of your data, such a prediction task is called _extrapolation_. Say you make your extrapolations using the model based on observed data, and then new data comes in: + +```{r} +ggplot(data=fullData, aes(x=x,y=y,color=observed)) + + geom_point() + + geom_smooth(data=observed, method='lm', formula=y~x, se=FALSE) +``` + +As you can see, the model based on observed data is not likely to extrapolate well if you want to predict values far outside the observed range. + + +## Your turn! + +First, we load the following dataset, which contains many observations of mammal size in different stages of the animals' lives. + +```{r, echo=TRUE} +# .csv file is tab-delimited, so need sep="\t" argument in function call +mammals <- read.csv("data/sizeHistory.tsv", sep="\t") +head(mammals) +``` + +### + +We will need to log-transform both the response and the independent variables in this dataset. If we want to model adult mass (`mass.g.`) vs newborn mass (`newborn.g.`), perform the log transformations below: + +```{r ex8, exercise=TRUE} +mammals$logAdultMass <- _____ + +mammals$logNewbornMass <- _____ +``` + +```{r ex8-solution} +mammals$logAdultMass <- log(mammals$mass.g.) +mammals$logNewbornMass <- log(mammals$newborn.g.) +``` + +Create a scatterplot of the log-adult mass (`logAdultMass`) and newborn mass (`logNewbornMass`). +```{r ex9, exercise=TRUE} +ggplot(data=____, aes(x=_____, y=_____)) + + _____ +``` + +```{r ex9-solution} +ggplot(data=mammals, aes(x=logNewbornMass, y=logAdultMass)) + + geom_point() +``` + +### + +Now, let's try to predict the log-adult mass of mammals with the following log-newborn masses: + +- 0.1 (remember that this is a log scale - this newborn is very small!) +- 12.0 (newborn mass around $e^{12}$ grams, near the maximum observed) +- 20 (newborn mass around $e^{20}$ grams, well beyond the maximum observed) + +First, create a linear regression model for the data and print the model summary: + +```{r ex10, exercise=TRUE} +``` + +```{r ex10-solution} +model <- lm(data=mammals, logAdultMass ~ logNewbornMass) +summary(model) +``` + +### + +Now take the model parameters and generate new predictions: + +```{r ex11, exercise=TRUE} +# Grab the parameters from the model object +intercept <- ____ +slope <- ____ + +# Compute: +yhat1 <- ____ # the first prediction, for x=0.1 +yhat2 <- ____ # the second prediction, for x=12.0 +yhat3 <- ____ # the third prediction, for x=20.0 +``` + +```{r ex11-hint1} +# Grab the parameters from the model object +intercept <- model$coefficients[[1]] +slope <- model$coefficients[[2]] +``` + +```{r ex11-solution} +# Grab the parameters from the model object +intercept <- model$coefficients[[1]] +slope <- model$coefficients[[2]] + +# Compute: +yhat1 <- intercept + slope*(0.1) # the first prediction, for x=0.1 +yhat2 <- intercept + slope*(12.0) # the second prediction, for x=12.0 +yhat3 <- intercept + slope*(20.0) # the third prediction, for x=20.0 +``` + +Recall our formula for the standard error of a prediction $\hat{y}^* = \beta_0 + \beta_1 x^*$ on a new value $x^*$: + +$$SE = \sqrt{s_e^2 +\frac{s_e^2}{n} + (SE_{\beta_1})^2 \times (x^*-\bar{x})^2}$$ +### + +```{r mc6, echo=FALSE} +question("Which value of x* would you expect to have the highest value of SE?", + answer("x* = 0.1"), + answer("x* = 12.0"), + answer("x* = 20.0", correct=TRUE), + answer("Not sure")) +``` + +### + +Now we'll walk through computing the standard error for each of your 3 predictions above, step by step. To start, let's compute the first term, $s^2_e$ + +```{r ex12, exercise=TRUE} +# From your model, you can grab the variance of the residuals: +se2 <- ____ + +# How many observations do you have? +n <- ____ +``` + +```{r ex12-hint1} +# From your model, you can grab the variance of the residuals: +se2 <- var(model$residuals) +``` + +```{r ex12-hint2} +# From your model, you can grab the variance of the residuals: +se2 <- var(model$residuals) + +# How many observations do you have? +n <- nrow(mammals) +``` + +### + +And now the second term, $\frac{s^2_e}{n}$, and $SE_{\beta_1}$: + +```{r, echo=TRUE} +# Compute the average contribution of each observation to the variance +se2_n <- se2 / n + +# Compute the SE of your slope parameter +se_b1 <- summary(model)$coefficients[,2][[2]] +``` + +### + +Lastly, we need to compute $(x^*-\bar{x})^2$ for each value of $x^*$: + +```{r ex13, exercise=TRUE} +# Compute xbar +xbar <- ____ + +# Compute the squared distance between each new x* and the mean xbar + +``` + +```{r ex13-solution} +xs <- c(0.1, 12.0, 20.0) +dev <- c(0.0, 0.0, 0.0) + +for(i in 1:length(xs)) { + dev[i] <- (xbar - xs[i])**2 +} +``` + +### + +Finally, put it all together to compute $SE$ from the formula: + +```{r ex14, exercise=TRUE} +``` + +```{r ex14-solution} +for(i in 1:length(xs)) { + SE <- sqrt(se2 + se2_n + se_b1*dev[i]) + print(SE) +} +``` + +### + +```{r mc7, echo=FALSE} +question("Which value of x* does have the highest value of SE?", + answer("x* = 0.1"), + answer("x* = 12.0"), + answer("x* = 20.0", correct=TRUE), + answer("Not sure")) +``` + + +## Submit + +```{r, echo=FALSE, context="server"} +encoder_logic() +``` + +```{r encode, echo=FALSE} +learnrhash::encoder_ui(ui_before = hash_encoder_ui) +``` \ No newline at end of file diff --git a/07-adv-model-infer/03-lesson/data/sizeHistory.tsv b/07-adv-model-infer/03-lesson/data/sizeHistory.tsv new file mode 100644 index 0000000..73f3613 --- /dev/null +++ b/07-adv-model-infer/03-lesson/data/sizeHistory.tsv @@ -0,0 +1,1441 @@ +order family Genus species mass(g) gestation(mo) newborn(g) weaning(mo) wean mass(g) AFR(mo) max. life(mo) litter size litters/year refs +Artiodactyla Antilocapridae Antilocapra americana 45375.00 8.13 3246.36 3.00 8900.00 13.53 142 1.85 1.00 "1,2,6,9,23,26,27" +Artiodactyla Bovidae Addax nasomaculatus 182375.00 9.39 5480.00 6.50 -999.00 27.27 308 1.00 0.99 "1,2,17,23,26" +Artiodactyla Bovidae Aepyceros melampus 41480.00 6.35 5093.00 5.63 15900.00 16.66 213 1.00 0.95 "1,2,8,9,23,29" +Artiodactyla Bovidae Alcelaphus buselaphus 150000.00 7.90 10166.67 6.50 -999.00 23.02 240 1.00 -999.00 "1,2,17,23" +Artiodactyla Bovidae Ammodorcas clarkei 28500.00 6.80 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Artiodactyla Bovidae Ammotragus lervia 55500.00 5.08 3810.00 4.00 -999.00 14.89 251 1.37 2.00 "1,2,9,11,17,23,29" +Artiodactyla Bovidae Antidorcas marsupialis 30000.00 5.72 3910.00 4.04 -999.00 10.23 228 1.00 -999.00 "1,2,9,23,27" +Artiodactyla Bovidae Antilope cervicapra 37500.00 5.50 3846.00 2.13 -999.00 20.13 255 1.00 1.89 "1,2,17" +Artiodactyla Bovidae Bison bison 497666.67 8.93 20000.00 10.71 157500.00 29.45 300 1.00 1.00 "1,2,6,11,13,17,23" +Artiodactyla Bovidae Bison bonasus 500000.00 9.14 23000.08 6.60 -999.00 29.99 324 1.00 1.00 "1,2,13,17,19" +Artiodactyla Bovidae Bos grunniens 333000.00 8.88 18000.00 7.33 -999.00 24.27 300 1.00 0.75 "1,2,17,29" +Artiodactyla Bovidae Bos frontalis 800000.00 9.02 23033.33 4.50 -999.00 24.16 314 1.17 0.89 "1,2,23" +Artiodactyla Bovidae Bos javanicus 666666.67 9.83 -999.00 9.50 -999.00 25.54 319 1.33 1.00 "1,2,23" +Artiodactyla Bovidae Boselaphus tragocamelus 169000.00 8.51 5875.00 -999.00 -999.00 29.97 260 1.51 1.13 "1,2,17,29" +Artiodactyla Bovidae Bubalus depressicornis -999.00 10.00 -999.00 -999.00 -999.00 -999.00 433 1.00 -999.00 "1,2,17" +Artiodactyla Bovidae Bubalus mindorensis 233333.33 9.85 -999.00 -999.00 -999.00 -999.00 300 1.00 0.50 "11,13" +Artiodactyla Bovidae Bubalus bubalis 950000.00 10.47 37500.00 7.50 -999.00 19.88 348 1.33 0.50 "1,2,15,29" +Artiodactyla Bovidae Budorcas taxicolor 302000.00 8.29 6000.00 -999.00 -999.00 30.00 235 1.17 1.00 "1,2,11,17" +Artiodactyla Bovidae Capra caucasica 55000.00 5.17 3850.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2,17" +Artiodactyla Bovidae Capra falconeri 41000.00 5.36 -999.00 5.50 -999.00 24.50 144 2.00 -999.00 "1,2,17" +Artiodactyla Bovidae Capra ibex 71500.00 5.60 2791.43 7.50 -999.00 29.24 -999 1.25 0.75 "1,2,9,17,23,29" +Artiodactyla Bovidae Capra cylindricornis 50000.00 5.29 3787.50 6.00 -999.00 33.50 264 1.10 1.00 "1,2,11" +Artiodactyla Bovidae Capra hircus 60000.00 5.22 2200.00 5.00 -999.00 16.00 249 1.61 1.00 "1,2,9,15" +Artiodactyla Bovidae Cephalophus niger 18100.00 4.20 -999.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 "1,2,16" +Artiodactyla Bovidae Cephalophus nigrifrons 13900.00 -999.00 -999.00 -999.00 -999.00 -999.00 236 -999.00 -999.00 "2,16" +Artiodactyla Bovidae Cephalophus natalensis 10000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Artiodactyla Bovidae Cephalophus leucogaster 12700.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Artiodactyla Bovidae Cephalophus ogilbyi 20000.00 4.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Artiodactyla Bovidae Cephalophus zebra -999.00 7.47 1707.50 -999.00 -999.00 -999.00 -999 1.00 -999.00 1 +Artiodactyla Bovidae Cephalophus rufilatus 12500.00 7.82 965.00 -999.00 -999.00 13.78 -999 1.00 -999.00 "1,2,16,23" +Artiodactyla Bovidae Cephalophus dorsalis 11600.00 7.75 1610.00 -999.00 -999.00 19.00 -999 1.00 -999.00 "1,16" +Artiodactyla Bovidae Cephalophus monticola 6250.00 6.43 800.00 -999.00 -999.00 16.00 144 1.00 -999.00 "1,2,13" +Artiodactyla Bovidae Cephalophus silvicultor 62500.00 5.43 2400.00 1.25 20512.50 -999.00 -999 1.00 1.00 "1,2,11,29" +Artiodactyla Bovidae Cephalophus maxwellii 9000.00 4.00 832.00 2.00 -999.00 32.00 120 1.00 1.00 "1,2,11" +Artiodactyla Bovidae Connochaetes gnou 132250.00 8.50 11000.00 7.50 -999.00 25.10 235 1.01 -999.00 "1,11,27" +Artiodactyla Bovidae Connochaetes taurinus 164500.00 8.32 17716.67 8.00 -999.00 20.40 -999 1.00 1.00 "1,9,23,25,29" +Artiodactyla Bovidae Damaliscus hunteri 159000.00 9.30 8350.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Artiodactyla Bovidae Damaliscus pygargus 84500.00 8.20 6792.00 5.00 -999.00 23.26 260 1.25 -999.00 "1,2,9,23" +Artiodactyla Bovidae Damaliscus lunatus 128000.00 7.81 11100.00 -999.00 -999.00 21.00 -999 1.00 0.57 "1,8,13" +Artiodactyla Bovidae Gazella soemmerringii 40000.00 6.50 -999.00 -999.00 -999.00 19.90 -999 -999.00 -999.00 "1,18,23" +Artiodactyla Bovidae Gazella rufifrons 27000.00 5.75 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Artiodactyla Bovidae Gazella dama 73000.00 6.84 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Artiodactyla Bovidae Gazella leptoceros 23600.00 5.42 4640.00 -999.00 -999.00 5.17 -999 1.00 -999.00 "1,18,23" +Artiodactyla Bovidae Gazella granti 47636.36 6.45 5602.50 -999.00 -999.00 8.25 -999 1.00 -999.00 "1,16,27,29" +Artiodactyla Bovidae Gazella spekei 20000.00 6.48 1253.33 -999.00 -999.00 16.80 -999 1.00 -999.00 "1,18" +Artiodactyla Bovidae Gazella cuvieri 17500.00 5.61 -999.00 -999.00 -999.00 11.46 -999 1.46 -999.00 "1,18" +Artiodactyla Bovidae Gazella dorcas 16985.00 4.74 1500.63 2.75 7000.00 22.27 -999 1.18 1.00 "1,11,23,29" +Artiodactyla Bovidae Gazella subgutturosa 25500.00 5.37 2426.67 3.50 13500.00 18.50 188 1.44 1.00 "1,11" +Artiodactyla Bovidae Gazella thomsonii 16300.00 5.37 2553.75 3.35 -999.00 12.18 -999 1.00 1.50 "1,2,16,23,29" +Artiodactyla Bovidae Gazella gazella 20750.00 6.00 -999.00 3.00 -999.00 13.20 219 1.60 1.50 "1,2,11" +Artiodactyla Bovidae Hemitragus hylocrius -999.00 6.17 -999.00 5.00 -999.00 20.50 -999 1.00 -999.00 "1,2,13" +Artiodactyla Bovidae Hemitragus jemlahicus 35200.00 6.00 2000.00 4.97 -999.00 24.00 261 1.03 1.00 "1,2,8,17" +Artiodactyla Bovidae Hippotragus equinus 242000.00 9.32 15166.67 6.00 -999.00 23.50 -999 1.00 -999.00 "1,2,16,17,23" +Artiodactyla Bovidae Hippotragus niger 200500.00 8.87 15447.14 7.00 -999.00 24.51 267 1.00 1.00 "1,2,16,23,29" +Artiodactyla Bovidae Kobus megaceros 17500.00 -999.00 -999.00 -999.00 -999.00 19.67 -999 -999.00 -999.00 23 +Artiodactyla Bovidae Kobus vardonii 63950.00 8.50 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Artiodactyla Bovidae Kobus leche 81733.33 7.57 5100.00 4.50 -999.00 23.31 180 1.00 -999.00 "1,2,13,16,17,23,25" +Artiodactyla Bovidae Kobus ellipsiprymnus 175333.33 8.91 9000.00 7.39 -999.00 25.34 222 1.10 1.10 "1,2,8,9,23,25" +Artiodactyla Bovidae Kobus kob 58600.00 8.38 4937.50 6.39 31600.00 11.60 263 1.00 1.30 "1,2,8,23" +Artiodactyla Bovidae Litocranius walleri 41333.33 6.76 -999.00 -999.00 -999.00 11.83 156 1.00 -999.00 "1,2,23" +Artiodactyla Bovidae Madoqua saltiana 3250.00 -999.00 690.00 1.50 -999.00 10.00 -999 1.00 -999.00 "1,18" +Artiodactyla Bovidae Madoqua guentheri 4550.00 5.84 681.67 2.75 2825.50 -999.00 -999 1.00 2.00 11 +Artiodactyla Bovidae Madoqua kirkii 4876.67 5.77 654.00 2.35 1780.00 8.77 171 1.00 2.00 "1,2,9,11,23,27,29" +Artiodactyla Bovidae Naemorhedus crispus 30000.00 7.15 3510.50 -999.00 -999.00 42.00 223 1.00 -999.00 "1,2,16" +Artiodactyla Bovidae Naemorhedus sumatraensis 87500.00 7.50 -999.00 -999.00 -999.00 -999.00 -999 1.00 1.00 "16,17" +Artiodactyla Bovidae Naemorhedus goral 27666.67 7.69 2000.00 -999.00 -999.00 31.20 -999 1.00 1.00 "1,11,17,23" +Artiodactyla Bovidae Neotragus batesi 2500.00 6.00 500.00 -999.00 -999.00 9.33 -999 -999.00 -999.00 "1,2" +Artiodactyla Bovidae Neotragus moschatus 7166.67 6.00 -999.00 -999.00 -999.00 6.05 162 1.00 -999.00 "1,2,23" +Artiodactyla Bovidae Oreamnos americanus 82350.00 5.78 3176.67 2.67 -999.00 29.99 230 1.32 1.00 "1,2,6,11,23,26,29" +Artiodactyla Bovidae Oreotragus oreotragus 13000.00 6.79 1065.00 4.50 -999.00 12.00 214 1.00 -999.00 "1,2" +Artiodactyla Bovidae Oryx dammah 177500.00 8.22 10316.67 -999.00 -999.00 21.30 -999 1.00 -999.00 "1,2,16,23,29" +Artiodactyla Bovidae Oryx leucoryx 121350.00 8.00 -999.00 4.50 -999.00 26.11 -999 1.00 1.00 "1,2,16,23" +Artiodactyla Bovidae Oryx gazella 195000.00 9.01 12015.00 -999.00 -999.00 25.02 240 1.00 1.33 "1,2,13,16,27" +Artiodactyla Bovidae Ourebia ourebi 17500.00 6.95 2235.00 4.50 -999.00 12.62 190 1.00 1.53 "1,2,23" +Artiodactyla Bovidae Ovibos moschatus 258000.00 8.48 11077.40 6.21 -999.00 37.33 288 1.01 0.75 "1,2,9,17,23,29" +Artiodactyla Bovidae Ovis nivicola 50500.00 -999.00 -999.00 -999.00 -999.00 24.00 -999 1.00 -999.00 "1,16" +Artiodactyla Bovidae Ovis vignei 60000.00 6.00 -999.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 "1,2" +Artiodactyla Bovidae Ovis dalli 57666.67 5.62 3500.00 4.33 -999.00 26.57 -999 1.18 0.75 "1,8,9,26,27" +Artiodactyla Bovidae Ovis canadensis 68166.67 5.99 4266.67 4.86 28666.67 23.07 240 1.06 1.00 "1,2,9,11,17,23,26,29" +Artiodactyla Bovidae Ovis ammon 180000.00 5.61 2375.00 4.50 -999.00 11.67 -999 1.20 1.00 "1,2,17" +Artiodactyla Bovidae Ovis aries 50000.00 5.02 2277.08 6.00 17500.00 18.23 -999 1.35 1.00 "1,9,29" +Artiodactyla Bovidae Pantholops hodgsonii 27500.00 7.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2,17" +Artiodactyla Bovidae Pelea capreolus 25000.00 8.70 -999.00 -999.00 -999.00 -999.00 148 1.00 -999.00 "1,2" +Artiodactyla Bovidae Procapra gutturosa 24000.00 6.43 2900.00 -999.00 -999.00 17.50 84 1.33 -999.00 "1,2,11" +Artiodactyla Bovidae Pseudois nayaur 46666.67 5.16 -999.00 6.00 -999.00 18.61 180 1.50 -999.00 "1,11,13,23" +Artiodactyla Bovidae Raphicerus campestris 11333.33 6.53 936.00 3.00 -999.00 7.50 -999 1.00 -999.00 "1,16" +Artiodactyla Bovidae Redunca arundinum 48850.00 7.32 4500.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16,25" +Artiodactyla Bovidae Redunca redunca 40000.00 7.50 -999.00 -999.00 -999.00 120.00 216 1.00 -999.00 "1,2,13,16" +Artiodactyla Bovidae Redunca fulvorufula 30000.00 7.57 2600.00 -999.00 -999.00 12.96 144 1.00 1.09 "1,2,9,13,23,27" +Artiodactyla Bovidae Rupicapra rupicapra 26100.00 5.83 2652.86 3.70 -999.00 30.55 -999 1.00 0.94 "1,8,17,29" +Artiodactyla Bovidae Saiga tatarica 38250.00 4.94 3365.33 2.92 14500.00 9.15 144 1.65 1.00 "1,2,9,11,17,23,29" +Artiodactyla Bovidae Sigmoceros lichtensteinii 153000.00 7.76 15000.00 -999.00 -999.00 16.58 -999 1.00 -999.00 "1,2" +Artiodactyla Bovidae Sylvicapra grimmia 19000.00 5.08 1202.86 -999.00 -999.00 9.90 172 1.01 1.38 "1,2,9" +Artiodactyla Bovidae Syncerus caffer 504666.67 11.03 42862.50 9.18 166000.00 47.92 354 1.08 0.40 "1,2,8,9,23,29" +Artiodactyla Bovidae Taurotragus derbianus 680000.00 8.67 -999.00 -999.00 -999.00 36.40 -999 1.00 -999.00 "16,17" +Artiodactyla Bovidae Taurotragus oryx 432500.00 8.64 28325.00 6.00 -999.00 26.99 282 1.00 -999.00 "1,2,9,11,17,23,25,29" +Artiodactyla Bovidae Tetracerus quadricornis 19000.00 7.34 1033.00 -999.00 -999.00 13.20 130 1.57 -999.00 "1,2,17" +Artiodactyla Bovidae Tragelaphus buxtoni 218000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "2,13,17" +Artiodactyla Bovidae Tragelaphus eurycerus 186250.00 9.57 19240.00 -999.00 -999.00 27.94 233 1.00 0.73 "1,2,11,23" +Artiodactyla Bovidae Tragelaphus spekii 87500.00 8.13 4000.00 -999.00 -999.00 13.17 258 1.00 1.00 "1,2,17,23" +Artiodactyla Bovidae Tragelaphus strepsiceros 190000.00 7.41 16150.00 6.00 -999.00 18.40 267 1.00 1.00 "1,2,23,29" +Artiodactyla Bovidae Tragelaphus angasii 100666.67 7.37 5232.50 7.00 -999.00 14.85 192 1.00 1.21 "1,2,13,23" +Artiodactyla Bovidae Tragelaphus imberbis 64500.00 8.01 5760.00 -999.00 -999.00 25.89 -999 1.00 1.33 "1,2,9,23" +Artiodactyla Bovidae Tragelaphus scriptus 36250.00 6.17 3800.00 -999.00 -999.00 16.32 144 1.00 1.50 "1,2,9,13,23,29" +Artiodactyla Camelidae Camelus bactrianus -999.00 13.18 35000.00 10.50 -999.00 42.00 -999 1.00 0.50 "1,29" +Artiodactyla Camelidae Camelus dromedarius 434000.00 12.64 35808.46 14.63 253484.00 46.30 480 1.00 0.65 "1,11,15,23,29" +Artiodactyla Camelidae Lama glama 142500.00 11.01 12000.00 5.00 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Artiodactyla Camelidae Lama pacos 60000.00 10.79 7584.00 7.00 -999.00 16.00 -999 1.00 -999.00 "1,2" +Artiodactyla Camelidae Lama guanicoe 110000.00 11.25 11666.67 11.33 -999.00 18.00 340 1.00 0.50 "1,2,4,17" +Artiodactyla Camelidae Vicugna vicugna 50000.00 11.55 5841.67 7.00 -999.00 22.75 344 1.00 0.67 "1,2,4,17,23,27,29" +Artiodactyla Cervidae Alces alces 351000.00 7.95 13018.18 3.80 94000.00 23.38 324 1.29 0.77 "1,8,9,2,23,26" +Artiodactyla Cervidae Axis porcinus 33500.00 7.45 2365.00 6.00 -999.00 10.00 240 1.01 -999.00 "1,2,13,16" +Artiodactyla Cervidae Axis axis 55000.00 7.72 3378.50 4.00 -999.00 12.64 249 1.03 -999.00 "1,2,9,17,29" +Artiodactyla Cervidae Blastocerus dichotomus 102500.00 8.89 4200.00 -999.00 -999.00 -999.00 -999 1.00 1.00 "1,11,13,17" +Artiodactyla Cervidae Capreolus capreolus 21666.67 6.54 1214.33 3.08 8692.50 15.41 180 1.78 -999.00 "1,8,9,11,13,23" +Artiodactyla Cervidae Capreolus pygargus 39450.00 9.67 1750.00 4.50 28750.00 -999.00 -999 2.00 1.00 11 +Artiodactyla Cervidae Cervus duvaucelii 143000.00 8.21 -999.00 -999.00 -999.00 36.00 276 1.00 -999.00 "1,2,9,17" +Artiodactyla Cervidae Cervus elaphus 120333.33 8.03 8814.09 5.37 46900.00 28.36 324 1.07 0.91 "1,2,8,9,23" +Artiodactyla Cervidae Cervus albirostris 125000.00 8.33 -999.00 -999.00 -999.00 24.00 228 1.00 1.00 "1,2" +Artiodactyla Cervidae Cervus timorensis 53000.00 8.49 -999.00 7.50 -999.00 17.71 253 1.00 1.00 "1,2" +Artiodactyla Cervidae Cervus unicolor 171000.00 8.20 9890.00 7.00 -999.00 23.23 317 1.00 1.00 "1,2,9,13,29" +Artiodactyla Cervidae Cervus eldii 73000.00 7.37 5008.00 7.88 -999.00 18.78 235 1.01 1.00 "1,2,9,17" +Artiodactyla Cervidae Cervus nippon 96500.00 7.59 3734.00 5.67 28590.00 22.12 305 1.02 1.00 "1,2,9,11,23" +Artiodactyla Cervidae Dama dama 54500.00 7.75 4511.17 6.01 22570.00 18.55 300 1.14 1.00 "1,2,9,11,13,23,29" +Artiodactyla Cervidae Elaphodus cephalophus 33500.00 6.50 -999.00 -999.00 -999.00 18.00 144 1.00 -999.00 "1,2" +Artiodactyla Cervidae Elaphurus davidianus 149000.00 9.41 11412.50 5.50 -999.00 27.00 279 1.11 1.00 "1,2,9,29" +Artiodactyla Cervidae Hippocamelus bisulcus 70000.00 6.50 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 4 +Artiodactyla Cervidae Hippocamelus antisensis 68600.00 8.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,4,13,17,16" +Artiodactyla Cervidae Hydropotes inermis 14000.00 6.25 1028.33 -999.00 -999.00 7.00 167 3.32 -999.00 "1,2,9" +Artiodactyla Cervidae Mazama rufina 8200.00 7.25 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,3,4" +Artiodactyla Cervidae Mazama gouazoupira 16650.00 7.42 792.33 -999.00 -999.00 20.50 -999 1.00 -999.00 "1,4,9,29" +Artiodactyla Cervidae Mazama americana 23000.00 7.43 542.50 6.00 -999.00 12.00 166 1.00 1.00 "2,4,9,13,29" +Artiodactyla Cervidae Muntiacus muntjak 14000.00 6.12 1310.80 2.00 -999.00 8.67 204 1.33 -999.00 "1,2,9,13" +Artiodactyla Cervidae Muntiacus reevesi 12000.00 6.86 1096.67 -999.00 -999.00 6.00 236 1.00 1.50 "1,2,9,29" +Artiodactyla Cervidae Odocoileus hemionus 55766.67 6.85 2952.67 2.48 19516.67 14.24 264 1.62 0.97 "1,2,7,8,9,29" +Artiodactyla Cervidae Odocoileus virginianus 59500.00 6.84 3154.67 4.29 33631.33 9.09 276 1.71 1.00 "1,2,6,9,11,17,23" +Artiodactyla Cervidae Ozotoceros bezoarticus 35000.00 7.25 2150.00 5.50 -999.00 12.00 253 1.00 1.00 "1,2,4,11,13" +Artiodactyla Cervidae Pudu mephistophiles 9750.00 -999.00 400.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,18" +Artiodactyla Cervidae Pudu puda 8250.00 6.76 695.00 2.00 -999.00 5.73 252 1.03 -999.00 "1,2,3,9,23,29" +Artiodactyla Cervidae Rangifer tarandus 113200.00 7.24 5773.67 2.84 26900.00 23.93 242 1.20 0.91 "1,2,8,9,23,26,29" +Artiodactyla Giraffidae Giraffa camelopardalis 800000.00 14.89 59770.59 8.25 -999.00 48.71 434 1.12 0.54 "1,2,9,23,29" +Artiodactyla Giraffidae Okapia johnstoni 287500.00 14.87 17375.00 7.00 77000.00 23.86 396 1.00 0.75 "1,2,11,23" +Artiodactyla Hippopotamidae Hexaprotodon liberiensis 215000.00 6.84 5636.25 7.33 -999.00 48.00 526 1.00 0.42 "1,2,17" +Artiodactyla Hippopotamidae Hippopotamus amphibius 1258333.33 7.75 39746.67 10.13 237500.00 89.93 732 1.00 0.61 "1,2,8,9,23,25,29" +Artiodactyla Moschidae Moschus chrysogaster 11000.00 -999.00 800.00 -999.00 -999.00 21.00 -999 1.00 -999.00 "1,16" +Artiodactyla Moschidae Moschus berezovskii 10900.00 -999.00 524.00 -999.00 -999.00 -999.00 -999 1.71 -999.00 "1,2,8" +Artiodactyla Moschidae Moschus moschiferus 12500.00 5.33 458.75 3.50 -999.00 15.54 144 1.49 1.00 "1,9,13,17,23,29" +Artiodactyla Suidae Babyrousa babyrussa 100000.00 5.16 715.00 7.00 -999.00 18.00 288 1.40 2.00 "1,2,17" +Artiodactyla Suidae Hylochoerus meinertzhageni 202500.00 4.39 1250.00 2.25 -999.00 17.50 216 4.70 -999.00 "1,2,13,25,27" +Artiodactyla Suidae Phacochoerus aethiopicus 71000.00 5.53 672.78 3.49 -999.00 18.55 225 3.53 1.11 "1,8,9,13,23,25,29" +Artiodactyla Suidae Potamochoerus porcus 71000.00 3.78 762.00 3.00 -999.00 28.24 240 4.33 -999.00 "1,9,13,23,29" +Artiodactyla Suidae Sus salvanius 8150.00 3.76 191.50 -999.00 -999.00 23.00 -999 3.20 -999.00 "1,2,13" +Artiodactyla Suidae Sus barbatus 102750.00 4.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 "1,13,16" +Artiodactyla Suidae Sus scrofa 100900.00 3.95 1040.31 3.38 8726.00 9.77 252 5.76 1.36 "1,8,9,13" +Artiodactyla Tayassuidae Catagonus wagneri 35300.00 -999.00 647.00 -999.00 -999.00 39.17 -999 2.42 -999.00 "1,2,4,23" +Artiodactyla Tayassuidae Pecari tajacu 19200.00 4.66 657.18 1.70 5220.67 10.64 296 1.82 2.00 "1,2,3,4,23" +Artiodactyla Tayassuidae Tayassu pecari 33750.00 5.23 1225.00 1.63 -999.00 20.00 253 2.00 -999.00 "1,2,3,4,11,13,17,29" +Artiodactyla Tragulidae Hyemoschus aquaticus 12250.00 5.86 -999.00 5.17 -999.00 13.38 156 1.25 1.00 "1,2,23,29" +Artiodactyla Tragulidae Moschiola meminna 2450.00 4.94 319.00 -999.00 -999.00 -999.00 81 1.50 -999.00 "1,2,17" +Artiodactyla Tragulidae Tragulus javanicus 3850.00 4.61 370.00 2.92 -999.00 5.20 144 1.00 -999.00 "1,9,13,23,29" +Artiodactyla Tragulidae Tragulus napu 5900.00 5.20 373.67 3.00 -999.00 4.50 192 1.00 -999.00 "1,2,9,17,29" +Carnivora Canidae Alopex lagopus 4500.00 1.75 71.04 1.67 -999.00 9.94 194 8.12 0.92 "1,2,8,17,23,29" +Carnivora Canidae Atelocynus microtis 9500.00 -999.00 -999.00 -999.00 -999.00 -999.00 132 -999.00 -999.00 2 +Carnivora Canidae Canis simensis 12675.00 2.04 -999.00 2.50 -999.00 24.00 -999 4.00 -999.00 "2,11" +Carnivora Canidae Canis aureus 11000.00 2.05 207.50 2.28 -999.00 10.46 192 4.16 -999.00 "1,2,23,29" +Carnivora Canidae Canis rufus 26000.00 2.05 -999.00 -999.00 -999.00 -999.00 168 4.51 -999.00 "1,2,26" +Carnivora Canidae Canis lupus 34875.00 2.16 418.60 1.55 5250.00 22.04 192 4.82 0.82 "1,2,8,23" +Carnivora Canidae Canis mesomelas 9750.00 2.08 159.00 2.13 -999.00 10.80 168 3.95 1.00 "1,2,17" +Carnivora Canidae Canis latrans 11800.00 2.05 249.75 1.74 1517.00 10.29 262 5.49 1.00 "1,2,3,10,11,23,26,29" +Carnivora Canidae Canis adustus 8250.00 2.17 -999.00 1.50 -999.00 7.67 144 4.29 2.00 "1,2" +Carnivora Canidae Cerdocyon thous 6500.00 1.85 365.00 3.00 -999.00 9.07 138 4.10 1.90 "1,2,3,4,11,23,29" +Carnivora Canidae Chrysocyon brachyurus 23000.00 2.11 400.17 4.75 -999.00 24.00 188 3.09 -999.00 "1,2,4,11,13,29" +Carnivora Canidae Cuon alpinus 12760.00 2.07 273.33 1.64 2350.00 11.50 186 4.13 -999.00 "1,2,10,11,29" +Carnivora Canidae Lycaon pictus 27133.33 2.41 332.50 2.88 -999.00 25.25 204 6.99 0.93 "1,2,23,25,29" +Carnivora Canidae Nyctereutes procyonoides 4232.00 2.05 87.92 1.73 825.00 12.22 128 9.46 1.00 "1,2,11,23,29" +Carnivora Canidae Otocyon megalotis 4150.00 2.26 120.88 2.06 -999.00 12.00 165 3.74 2.00 "1,2,13,17,29" +Carnivora Canidae Pseudalopex gymnocercus 4690.00 1.95 -999.00 -999.00 -999.00 10.00 164 2.50 -999.00 "1,2,4" +Carnivora Canidae Pseudalopex griseus 3990.00 1.85 -999.00 -999.00 -999.00 -999.00 -999 4.17 -999.00 "2,4" +Carnivora Canidae Pseudalopex culpaeus 13000.00 1.99 -999.00 2.00 -999.00 12.00 -999 4.00 1.00 "1,2,4,11" +Carnivora Canidae Speothos venaticus 6000.00 2.35 152.43 3.33 -999.00 11.00 160 4.26 2.00 "1,2,3,17,29" +Carnivora Canidae Urocyon cinereoargenteus 4220.00 2.14 95.33 1.80 519.67 10.50 -999 4.17 0.98 "1,3,6,8,10,11,23,26,27,29" +Carnivora Canidae Urocyon littoralis 1890.67 1.70 -999.00 2.00 -999.00 12.00 -999 2.60 1.00 "11,26" +Carnivora Canidae Vulpes cana 1000.00 1.84 29.00 1.50 -999.00 10.50 -999 2.00 -999.00 "2,11" +Carnivora Canidae Vulpes chama 4000.00 1.72 -999.00 -999.00 -999.00 -999.00 -999 3.25 -999.00 "1,2" +Carnivora Canidae Vulpes rueppelli 2250.00 1.75 -999.00 -999.00 -999.00 12.00 -999 3.26 -999.00 "1,2" +Carnivora Canidae Vulpes ferrilata 7000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.50 -999.00 "1,2" +Carnivora Canidae Vulpes pallida 2550.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 2 +Carnivora Canidae Vulpes bengalensis 1800.00 1.69 58.50 -999.00 -999.00 -999.00 -999 4.00 -999.00 "1,2" +Carnivora Canidae Vulpes corsac 2700.00 1.77 62.50 0.93 -999.00 16.81 -999 4.71 -999.00 "1,16,23" +Carnivora Canidae Vulpes vulpes 5662.50 1.73 101.25 1.81 1236.43 9.76 144 4.34 0.91 "1,2,8,9,10,23,26,29" +Carnivora Canidae Vulpes zerda 1200.00 1.71 26.28 2.18 -999.00 9.87 175 2.45 1.00 "1,2,23" +Carnivora Canidae Vulpes velox 2766.67 1.71 39.65 1.69 -999.00 11.01 240 4.44 1.00 "1,2,6,11,13,17,23,26" +Carnivora Felidae Acinonyx jubatus 58750.00 3.35 403.96 3.67 1940.00 25.41 228 3.04 0.65 "1,2,10,23,25,29" +Carnivora Felidae Caracal caracal 14000.00 2.43 165.00 4.17 -999.00 16.51 216 3.08 -999.00 "1,2,23" +Carnivora Felidae Catopuma temminckii 11500.00 2.67 250.00 -999.00 -999.00 21.00 240 1.28 -999.00 "1,2" +Carnivora Felidae Felis chaus 10000.00 2.05 126.62 3.00 2212.50 15.82 240 3.48 2.00 "1,2,23" +Carnivora Felidae Felis margarita 2350.00 2.20 55.50 -999.00 -999.00 9.00 156 4.50 2.00 "1,2,29" +Carnivora Felidae Felis silvestris 4150.00 2.15 101.87 2.25 630.79 10.24 180 3.69 2.02 "1,2,10,23,29" +Carnivora Felidae Felis nigripes 2125.00 2.20 70.87 -999.00 -999.00 17.04 -999 1.91 2.50 "1,2,23,29" +Carnivora Felidae Herpailurus yaguarondi 6750.00 2.33 -999.00 -999.00 -999.00 26.40 180 2.34 2.00 "1,2,11,17,26" +Carnivora Felidae Leopardus wiedii 3666.67 2.67 118.00 1.83 785.10 21.65 252 1.38 -999.00 "1,2,4,11,23,26" +Carnivora Felidae Leopardus tigrinus 2250.00 2.51 -999.00 1.83 -999.00 -999.00 -999 1.50 -999.00 "1,2,3,29" +Carnivora Felidae Leopardus pardalis 8800.00 2.64 254.40 3.50 3400.00 21.80 257 1.54 0.75 "1,2,11,23,26,29" +Carnivora Felidae Leptailurus serval 13350.00 2.36 253.20 4.20 -999.00 26.75 237 2.18 2.00 "1,2,29" +Carnivora Felidae Lynx pardinus 9400.00 2.18 -999.00 -999.00 -999.00 -999.00 156 2.50 -999.00 "1,2" +Carnivora Felidae Lynx rufus 8600.00 1.86 301.00 2.55 1190.00 17.06 388 2.82 0.94 "1,2,8,23,26" +Carnivora Felidae Lynx lynx 18026.67 2.33 269.50 3.10 1860.00 16.36 264 2.25 1.00 "1,2,10,11,23" +Carnivora Felidae Lynx canadensis 8900.00 2.18 204.00 5.00 -999.00 17.60 321 3.19 1.00 "1,2,26,29" +Carnivora Felidae Neofelis nebulosa 19500.00 3.06 215.33 4.26 5427.50 26.30 234 2.47 -999.00 "1,2,29" +Carnivora Felidae Oncifelis colocolo 2950.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 4 +Carnivora Felidae Oncifelis geoffroyi 4000.00 2.45 86.18 2.25 -999.00 -999.00 252 2.04 1.33 "1,2,4,11" +Carnivora Felidae Otocolobus manul 3500.00 2.37 89.00 -999.00 -999.00 12.00 -999 4.14 -999.00 "1,2" +Carnivora Felidae Panthera tigris 119700.00 3.51 1248.59 5.48 19556.00 41.12 315 2.57 0.40 "1,2,10,11,23,29" +Carnivora Felidae Panthera onca 81150.00 3.39 831.89 4.13 5033.50 35.56 264 2.46 0.50 "1,2,4,10,11,23,29" +Carnivora Felidae Panthera leo 139500.00 3.62 1377.45 7.22 8480.00 35.98 360 2.90 0.66 "1,2,10,23,25,29" +Carnivora Felidae Panthera pardus 42325.00 3.22 363.49 2.88 1940.00 34.10 276 2.38 0.83 "1,2,10,23,29" +Carnivora Felidae Pardofelis marmorata 3500.00 -999.00 85.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,2" +Carnivora Felidae Prionailurus viverrinus 10850.00 2.29 170.00 2.92 -999.00 -999.00 -999 2.12 -999.00 "1,2,29" +Carnivora Felidae Prionailurus rubiginosus 1350.00 2.23 -999.00 -999.00 -999.00 -999.00 192 2.13 -999.00 "1,2" +Carnivora Felidae Prionailurus bengalensis 4150.00 2.17 93.86 1.47 620.00 18.52 180 2.64 -999.00 "1,2,10,23,29" +Carnivora Felidae Profelis aurata 10650.00 -999.00 248.33 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,2" +Carnivora Felidae Puma concolor 48000.00 3.07 388.22 4.20 3500.00 26.91 240 2.85 0.47 "1,2,4,11,23,26,29" +Carnivora Felidae Uncia uncia 45625.00 3.28 463.45 2.54 7500.00 30.11 252 2.22 1.00 "1,2,11,23,29" +Carnivora Herpestidae Atilax paludinosus 3300.00 2.49 100.23 1.43 631.85 -999.00 228 2.42 -999.00 "1,2,11" +Carnivora Herpestidae Bdeogale crassicauda 1570.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Carnivora Herpestidae Crossarchus obscurus 727.00 2.25 -999.00 0.75 -999.00 9.00 108 4.00 2.50 "1,11" +Carnivora Herpestidae Cynictis penicillata 598.50 1.84 -999.00 2.00 -999.00 24.00 182 1.67 2.00 "1,2,11" +Carnivora Herpestidae Galerella pulverulenta 683.00 2.00 -999.00 1.92 -999.00 -999.00 -999 2.60 -999.00 "1,2,16" +Carnivora Herpestidae Galerella sanguinea 448.00 2.00 -999.00 1.73 -999.00 -999.00 -999 2.23 2.00 "1,16" +Carnivora Herpestidae Galidia elegans 800.00 2.61 50.00 1.94 183.00 24.22 293 1.00 1.00 "1,2,23,29" +Carnivora Herpestidae Galidictis fasciata -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 1.00 "1,2" +Carnivora Herpestidae Helogale parvula 274.80 1.80 -999.00 -999.00 -999.00 13.50 -999 3.38 2.33 "1,16,23,29" +Carnivora Herpestidae Herpestes javanicus 800.00 1.62 25.92 1.65 275.00 9.90 -999 2.24 -999.00 "1,2,16,23" +Carnivora Herpestidae Herpestes edwardsii 1008.00 1.98 -999.00 -999.00 -999.00 -999.00 -999 2.60 -999.00 "1,16,29" +Carnivora Herpestidae Herpestes ichneumon 2920.00 2.39 -999.00 2.00 800.00 24.00 -999 2.91 1.00 "1,2,16" +Carnivora Herpestidae Ichneumia albicauda 3150.00 -999.00 -999.00 9.00 -999.00 -999.00 121 2.33 -999.00 "1,2,11" +Carnivora Herpestidae Mungos mungo 1331.50 2.02 22.10 -999.00 -999.00 11.29 144 3.24 1.00 "1,2,16,23,25,29" +Carnivora Herpestidae Mungotictis decemlineata 700.00 3.27 50.00 1.29 -999.00 24.39 -999 1.00 -999.00 "1,2,23,29" +Carnivora Herpestidae Paracynictis selousi 1800.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 "1,2" +Carnivora Herpestidae Suricata suricatta 776.00 2.57 31.33 1.44 212.75 10.80 152 3.63 1.00 "1,2,10,23,29" +Carnivora Hyaenidae Crocuta crocuta 63000.00 3.45 1353.33 10.57 14500.00 33.00 493 2.00 1.00 "1,2,17,25,27" +Carnivora Hyaenidae Hyaena hyaena 40000.00 3.01 669.50 9.17 -999.00 28.11 282 2.61 -999.00 "1,2,11,23" +Carnivora Hyaenidae Parahyaena brunnea 60200.00 3.08 727.28 7.67 27400.00 36.00 348 2.28 0.40 "1,2,11" +Carnivora Hyaenidae Proteles cristatus 10000.00 2.90 -999.00 3.52 -999.00 -999.00 227 2.77 -999.00 "1,2,11" +Carnivora Mustelidae Amblonyx cinereus 3000.00 2.07 57.00 2.67 -999.00 -999.00 192 1.42 2.00 "1,2" +Carnivora Mustelidae Aonyx congicus 24000.00 -999.00 -999.00 -999.00 -999.00 14.20 -999 -999.00 -999.00 23 +Carnivora Mustelidae Aonyx capensis 11800.00 2.10 1050.00 1.75 3360.00 12.00 168 2.56 -999.00 "1,2,11" +Carnivora Mustelidae Arctonyx collaris 10500.00 1.50 58.00 3.42 -999.00 -999.00 -999 3.50 -999.00 "1,2" +Carnivora Mustelidae Conepatus leuconotus 3500.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 "1,18" +Carnivora Mustelidae Conepatus semistriatus 1200.00 2.00 -999.00 -999.00 -999.00 -999.00 -999 4.50 -999.00 "3,16" +Carnivora Mustelidae Conepatus mesoleucus 1996.67 1.70 -999.00 -999.00 -999.00 10.50 -999 3.83 1.50 "1,16,26" +Carnivora Mustelidae Eira barbara 4500.00 2.19 82.25 2.71 1707.50 -999.00 216 1.92 -999.00 "1,2,3,4" +Carnivora Mustelidae Enhydra lutris 21800.00 7.10 1909.17 5.77 12666.67 43.13 240 1.00 0.83 "1,2,11,23,26" +Carnivora Mustelidae Galictis vittata 2350.00 1.30 -999.00 -999.00 -999.00 -999.00 126 2.00 -999.00 "2,3" +Carnivora Mustelidae Gulo gulo 16333.33 1.69 90.53 2.60 -999.00 26.76 208 2.84 0.45 "1,2,11,23" +Carnivora Mustelidae Ictonyx libyca 500.00 1.68 5.00 1.25 250.00 -999.00 -999 2.00 -999.00 "1,2" +Carnivora Mustelidae Ictonyx striatus 765.00 1.20 12.50 2.60 170.00 9.26 160 2.17 1.00 "1,2,10,23" +Carnivora Mustelidae Lontra longicaudis 7500.00 1.87 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 "1,4,11" +Carnivora Mustelidae Lontra felina -999.00 2.45 -999.00 -999.00 -999.00 -999.00 -999 3.25 -999.00 "1,2,4" +Carnivora Mustelidae Lontra canadensis 6225.00 2.01 141.00 4.38 1510.00 29.97 276 2.72 0.94 "1,2,6,8,23,26,29" +Carnivora Mustelidae Lutra maculicollis 4000.00 2.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,16" +Carnivora Mustelidae Lutra lutra 6750.00 2.20 -999.00 1.90 -999.00 12.00 -999 2.06 1.00 "1,16,29" +Carnivora Mustelidae Lutrogale perspicillata 9000.00 2.07 -999.00 -999.00 -999.00 -999.00 240 5.00 -999.00 "1,2" +Carnivora Mustelidae Martes flavigula 2500.00 -999.00 -999.00 -999.00 -999.00 -999.00 168 2.50 -999.00 "1,2" +Carnivora Mustelidae Martes zibellina 1066.67 1.50 31.25 1.79 600.00 17.34 180 3.20 -999.00 "1,2,23" +Carnivora Mustelidae Martes foina 1700.00 3.19 -999.00 1.42 -999.00 18.00 217 3.79 -999.00 "1,2" +Carnivora Mustelidae Martes americana 606.67 0.93 32.67 1.50 414.00 17.67 204 2.73 1.00 "1,2,6,23,26" +Carnivora Mustelidae Martes pennanti 2600.00 1.33 34.78 2.61 -999.00 17.33 120 2.92 1.00 "1,2,6,11,23,26" +Carnivora Mustelidae Martes martes 1300.00 1.73 30.00 1.87 680.00 24.09 204 3.80 1.00 "1,2,23,29" +Carnivora Mustelidae Meles meles 13000.00 1.89 84.25 3.18 -999.00 13.25 194 3.11 0.75 "1,6,23,29" +Carnivora Mustelidae Mellivora capensis 10000.00 5.86 210.00 -999.00 -999.00 -999.00 317 2.33 2.00 "1,2,6" +Carnivora Mustelidae Melogale personata 2000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 "1,16" +Carnivora Mustelidae Mephitis macroura 965.00 2.00 -999.00 -999.00 -999.00 -999.00 -999 5.33 -999.00 "1,11" +Carnivora Mustelidae Mephitis mephitis 1821.25 1.63 28.10 2.08 493.50 11.17 60 5.10 1.21 "1,6,8,10,11,23,26,29" +Carnivora Mustelidae Mustela nigripes 809.00 1.44 -999.00 -999.00 -999.00 12.00 144 3.43 -999.00 "1,2" +Carnivora Mustelidae Mustela lutreola 440.00 3.32 7.50 1.88 -999.00 10.67 120 4.50 -999.00 "1,2" +Carnivora Mustelidae Mustela altaica 171.00 1.25 -999.00 1.63 -999.00 -999.00 -999 6.10 -999.00 "1,2" +Carnivora Mustelidae Mustela sibirica 405.00 1.06 -999.00 2.00 -999.00 -999.00 106 7.00 -999.00 "1,2" +Carnivora Mustelidae Mustela vison 899.75 1.19 8.64 1.60 110.00 8.59 120 4.76 1.00 "1,2,6,10,23" +Carnivora Mustelidae Mustela frenata 150.60 0.82 3.10 1.22 34.60 5.33 -999 6.22 1.00 "1,2,6,11,23,26,29" +Carnivora Mustelidae Mustela erminea 110.33 1.43 2.30 1.49 26.57 3.12 84 6.77 1.00 "1,2,10,11,23,26" +Carnivora Mustelidae Mustela eversmannii 1350.00 1.20 5.73 1.67 -999.00 10.50 -999 9.41 1.00 "1,2" +Carnivora Mustelidae Mustela putorius 588.67 1.05 9.26 1.64 -999.00 10.00 168 7.68 1.26 "1,2,8,29" +Carnivora Mustelidae Mustela nivalis 49.75 1.32 2.61 1.39 36.00 3.73 120 5.37 1.67 "1,2,10,23,26,29" +Carnivora Mustelidae Poecilogale albinucha 257.50 1.05 4.00 2.14 50.00 14.43 -999 2.20 1.25 "1,2,10,11,23" +Carnivora Mustelidae Pteronura brasiliensis 24000.00 2.26 202.83 3.67 -999.00 24.00 174 1.94 1.00 "1,2" +Carnivora Mustelidae Spilogale pygmaea 260.00 1.57 6.90 -999.00 -999.00 -999.00 -999 3.67 1.00 "1,11" +Carnivora Mustelidae Spilogale putorius 511.50 2.19 13.80 1.64 160.00 7.50 118 4.73 1.50 "1,2,6,10,11,29" +Carnivora Mustelidae Taxidea taxus 6050.00 1.83 101.88 1.68 3000.00 7.35 312 3.07 0.74 "1,2,8,23,29" +Carnivora Mustelidae Vormela peregusna 542.50 2.00 -999.00 1.00 -999.00 3.00 107 5.76 -999.00 "1,2" +Carnivora Odobenidae Odobenus rosmarus 650000.00 11.50 51883.33 20.37 200000.00 52.14 480 1.14 0.50 "1,2,11,23,26,29" +Carnivora Otariidae Arctocephalus galapagoensis 27000.00 7.00 3533.33 16.60 15000.00 42.00 264 1.00 0.50 "1,2" +Carnivora Otariidae Arctocephalus tropicalis 50000.00 11.75 4420.00 7.85 -999.00 -999.00 -999 1.00 1.00 "1,2,15,29" +Carnivora Otariidae Arctocephalus forsteri 55000.00 7.75 3833.33 11.00 -999.00 60.00 -999 1.00 1.00 "1,2" +Carnivora Otariidae Arctocephalus gazella 40500.00 9.00 5933.33 3.90 15800.00 34.00 240 1.00 1.00 "1,2,13" +Carnivora Otariidae Arctocephalus pusillus 77666.67 9.17 5955.56 11.57 26150.00 42.53 252 1.00 1.00 "1,2,23,29" +Carnivora Otariidae Arctocephalus australis 45000.00 7.75 4250.00 13.50 -999.00 36.00 360 1.00 1.00 "1,2,13" +Carnivora Otariidae Eumetopias jubatus 288932.50 8.75 19215.00 9.71 106610.00 56.08 360 1.00 1.00 "1,2,6,11,23,26" +Carnivora Otariidae Neophoca cinerea 79633.33 11.75 7075.00 18.75 59724.00 36.00 192 1.00 0.69 "1,2,11" +Carnivora Otariidae Otaria byronia 140000.00 12.00 12763.33 12.00 -999.00 44.28 298 1.00 1.00 "1,2,23" +Carnivora Otariidae Phocarctos hookeri -999.00 12.00 7000.00 8.67 -999.00 -999.00 276 1.00 1.00 "1,2" +Carnivora Otariidae Zalophus californianus 84666.67 11.14 6817.14 10.75 25000.00 68.00 300 1.00 1.00 "1,2,26" +Carnivora Otariidae Callorhinus ursinus 49100.00 8.37 5182.73 3.22 12920.00 48.90 312 1.00 0.89 "1,2,6,8,23,29" +Carnivora Phocidae Cystophora cristata 212000.00 8.01 15388.89 0.30 44980.00 35.88 420 1.00 1.00 "1,2,11,23,26,29" +Carnivora Phocidae Erignathus barbatus 286666.67 8.71 36950.00 1.00 72666.67 65.02 372 1.00 1.00 "1,2,23,29" +Carnivora Phocidae Halichoerus grypus 186000.00 7.87 12820.00 0.61 43077.78 50.52 552 1.00 0.93 "1,2,8,23,26,29" +Carnivora Phocidae Hydrurga leptonyx 398666.67 9.50 30875.00 1.00 -999.00 41.70 312 1.00 -999.00 "1,2,23" +Carnivora Phocidae Leptonychotes weddellii 421666.67 9.60 28394.00 1.33 117917.14 48.51 300 1.00 -999.00 "1,2,11,23,29" +Carnivora Phocidae Lobodon carcinophagus 238333.33 8.50 22333.33 1.09 120000.00 48.16 468 1.00 1.00 "1,2,23,29" +Carnivora Phocidae Mirounga leonina 579400.00 7.63 39918.89 0.76 130192.31 31.29 276 1.00 0.86 "1,2,8,23,29" +Carnivora Phocidae Mirounga angustirostris 716666.67 8.45 35250.00 0.88 138037.14 41.62 240 1.00 1.00 "1,2,11,26" +Carnivora Phocidae Monachus monachus 275000.00 10.00 19600.00 1.55 -999.00 48.00 284 1.00 -999.00 "1,2" +Carnivora Phocidae Monachus schauinslandi 173000.00 11.00 30675.00 1.24 64000.00 60.00 360 1.00 0.50 "1,2,29" +Carnivora Phocidae Ommatophoca rossii 187666.67 8.13 20266.67 1.00 -999.00 41.51 252 1.00 1.00 "1,2,23" +Carnivora Phocidae Phoca largha 80000.00 10.50 7100.00 0.78 21300.00 42.00 420 1.00 -999.00 "1,2,26" +Carnivora Phocidae Phoca caspica 86000.00 11.00 5000.00 1.00 -999.00 61.00 600 1.00 -999.00 "1,2,13" +Carnivora Phocidae Phoca hispida 86140.00 8.20 5909.09 1.60 11350.00 73.93 516 1.00 0.80 "1,2,8,23,26" +Carnivora Phocidae Phoca groenlandica 128786.67 7.63 8476.92 0.37 34377.78 49.80 -999 1.00 1.00 "1,2,23,26,29" +Carnivora Phocidae Phoca fasciata 82500.00 9.00 10250.00 0.88 30000.00 29.43 240 1.00 1.00 "1,2,26" +Carnivora Phocidae Phoca vitulina 101250.00 8.35 11083.64 1.13 23945.00 46.51 408 1.00 1.00 "1,2,23,26" +Carnivora Phocidae Phoca sibirica 81666.67 9.00 3000.00 2.14 66900.00 57.88 672 1.01 1.00 "1,2,11,23" +Carnivora Procyonidae Bassaricyon gabbii 1242.50 2.45 51.00 -999.00 -999.00 21.35 -999 1.00 -999.00 "3,18,23,29" +Carnivora Procyonidae Bassariscus sumichrasti 900.00 2.15 -999.00 -999.00 -999.00 -999.00 281 1.50 -999.00 "1,2" +Carnivora Procyonidae Bassariscus astutus 975.50 1.81 28.58 2.26 219.35 10.70 192 2.70 1.00 "1,2,6,10,11,23,26,29" +Carnivora Procyonidae Nasua nasua 4750.00 2.51 153.33 2.82 730.00 32.00 -999 3.81 -999.00 "1,10,11,23,29" +Carnivora Procyonidae Nasua narica 3750.00 2.56 140.00 4.17 -999.00 23.00 204 4.17 -999.00 "2,4,11,26" +Carnivora Procyonidae Potos flavus 3000.00 3.84 165.66 3.35 -999.00 27.65 384 1.00 1.00 "1,2,3,11,23,29" +Carnivora Procyonidae Procyon cancrivorus 6270.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.75 -999.00 "1,3,16" +Carnivora Procyonidae Procyon lotor 4400.00 2.13 76.14 2.95 1200.00 11.34 247 3.39 1.00 "1,2,3,7,10,23,26,29" +Carnivora Ursidae Ailuropoda melanoleuca 111600.00 4.31 109.29 6.70 15000.00 77.26 408 1.54 0.70 "1,2,8,10,11,23,29" +Carnivora Ursidae Ailurus fulgens 4325.00 4.30 120.17 4.00 1140.00 19.51 210 2.02 1.00 "1,2,11,10,23,29" +Carnivora Ursidae Helarctos malayanus 46000.00 3.68 275.00 3.00 -999.00 78.00 372 1.16 -999.00 "1,2,11,17,29" +Carnivora Ursidae Melursus ursinus 100000.00 6.42 -999.00 2.50 -999.00 -999.00 480 1.69 -999.00 "1,2" +Carnivora Ursidae Tremarctos ornatus 61000.00 7.33 320.00 2.96 -999.00 -999.00 464 1.65 -999.00 "1,2" +Carnivora Ursidae Ursus thibetanus 76666.67 7.00 351.67 3.25 -999.00 31.33 432 1.67 -999.00 "1,2,23" +Carnivora Ursidae Ursus maritimus 286366.67 8.11 634.25 12.68 31156.00 55.22 540 1.66 0.36 "1,2,11,23,29" +Carnivora Ursidae Ursus arctos 203500.00 6.93 494.82 13.78 26000.00 60.01 472 2.36 0.36 "1,2,11,23" +Carnivora Ursidae Ursus americanus 110560.00 6.75 294.47 6.42 14050.00 40.71 372 2.54 0.38 "1,2,8,10,23" +Carnivora Viverridae Arctictis binturong 12250.00 2.74 316.38 2.59 2100.00 30.34 311 2.63 2.00 "1,2,10,23,29" +Carnivora Viverridae Arctogalidia trivirgata 2250.00 1.50 -999.00 2.00 -999.00 36.00 193 2.50 2.00 "1,2" +Carnivora Viverridae Chrotogale owstoni 3250.00 2.00 81.50 -999.00 -999.00 -999.00 -999 2.00 1.50 2 +Carnivora Viverridae Civettictis civetta 13666.67 2.31 417.00 4.19 1955.75 14.62 336 2.26 2.25 "1,2,23,25,29" +Carnivora Viverridae Cryptoprocta ferox 9500.00 3.00 100.00 4.08 -999.00 49.17 240 3.00 -999.00 "1,2,23,29" +Carnivora Viverridae Cynogale bennettii 4000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,2" +Carnivora Viverridae Eupleres goudotii 3000.00 -999.00 150.00 2.13 -999.00 -999.00 -999 1.50 -999.00 "1,2,29" +Carnivora Viverridae Fossa fossana 1540.00 2.90 67.50 2.28 -999.00 23.92 132 1.00 -999.00 "1,2,23,29" +Carnivora Viverridae Genetta maculata 2225.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.33 -999.00 "1,18" +Carnivora Viverridae Genetta genetta 1866.67 2.50 74.20 2.75 -999.00 48.64 258 2.34 2.00 "1,2,11,23" +Carnivora Viverridae Genetta tigrina 1820.00 2.32 71.00 1.94 -999.00 -999.00 -999 2.38 2.00 "1,16,17,25,29" +Carnivora Viverridae Hemigalus derbyanus 2375.00 -999.00 125.00 2.33 -999.00 -999.00 216 2.00 -999.00 "1,2" +Carnivora Viverridae Nandinia binotata 1900.00 2.13 -999.00 2.13 -999.00 36.27 190 2.00 2.00 "1,2,23" +Carnivora Viverridae Paguma larvata 4300.00 -999.00 -999.00 -999.00 -999.00 -999.00 240 2.39 2.00 "1,2" +Carnivora Viverridae Paradoxurus zeylonensis 2380.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 "1,16" +Carnivora Viverridae Paradoxurus hermaphroditus 3100.00 1.50 87.08 -999.00 -999.00 11.22 300 3.29 2.00 "1,2,16,17,23" +Carnivora Viverridae Prionodon pardicolor 4500.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,16" +Carnivora Viverridae Prionodon linsang 698.00 -999.00 40.00 -999.00 -999.00 -999.00 128 2.00 -999.00 "1,2" +Carnivora Viverridae Viverra zibetha 10000.00 -999.00 -999.00 1.00 -999.00 -999.00 240 2.60 2.00 "1,2,16" +Carnivora Viverridae Viverricula indica 3000.00 -999.00 -999.00 4.25 -999.00 -999.00 126 3.88 -999.00 "1,2" +Cetacea Balaenidae Balaena mysticetus 80000000.00 12.37 -999.00 11.25 -999.00 210.00 1200 1.00 0.29 "1,2,23,26,29" +Cetacea Balaenidae Eubalaena australis 23000000.00 12.55 -999.00 -999.00 -999.00 108.00 -999 1.00 -999.00 "1,2" +Cetacea Balaenidae Eubalaena glacialis 23000000.00 11.50 -999.00 7.00 -999.00 110.00 804 1.00 0.29 "1,2,26" +Cetacea Balaenopteridae Balaenoptera physalus 66800000.00 10.93 1850000.00 6.50 -999.00 89.70 1368 1.01 0.36 "1,2,23,26,29" +Cetacea Balaenopteridae Balaenoptera musculus 149000000.00 10.71 2250000.00 7.08 19075000.00 72.34 1320 1.01 0.41 "1,2,23,26,29" +Cetacea Balaenopteridae Balaenoptera borealis 14766666.67 11.40 650000.00 7.56 -999.00 77.15 888 1.01 0.45 "1,2,23,26,29" +Cetacea Balaenopteridae Balaenoptera edeni 20000000.00 12.35 -999.00 9.00 -999.00 105.25 864 1.00 0.50 "1,2,16,23" +Cetacea Balaenopteridae Balaenoptera acutorostrata 16266666.67 10.15 -999.00 5.00 -999.00 98.73 564 1.01 1.00 "1,2,23,26,29" +Cetacea Balaenopteridae Megaptera novaeangliae 30000000.00 11.43 1325000.00 9.08 -999.00 64.28 924 1.01 0.50 "1,2,11,23,26,29" +Cetacea Delphinidae Cephalorhynchus heavisidii -999.00 -999.00 9500.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 1 +Cetacea Delphinidae Cephalorhynchus commersonii 72400.00 12.00 5500.00 -999.00 -999.00 78.00 216 1.00 -999.00 "1,2,16" +Cetacea Delphinidae Cephalorhynchus hectori -999.00 -999.00 -999.00 -999.00 -999.00 93.00 240 1.00 0.42 "1,2" +Cetacea Delphinidae Delphinus delphis 76365.00 9.57 7050.00 10.50 40000.00 55.02 240 1.00 0.42 "1,2,23,29" +Cetacea Delphinidae Feresa attenuata 133000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Cetacea Delphinidae Globicephala melas 1060000.00 14.80 109666.67 26.69 -999.00 81.22 720 1.00 0.20 "1,2,23,26,29" +Cetacea Delphinidae Globicephala macrorhynchus 726000.00 15.25 60000.00 48.00 -999.00 106.20 756 1.00 0.24 "1,2,16,26" +Cetacea Delphinidae Grampus griseus 425000.00 12.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 "1,2" +Cetacea Delphinidae Lagenodelphis hosei 164000.00 11.00 -999.00 -999.00 -999.00 87.00 192 1.00 -999.00 "1,2,11,26" +Cetacea Delphinidae Lagenorhynchus albirostris 180000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Cetacea Delphinidae Lagenorhynchus obliquidens 103000.00 10.00 -999.00 -999.00 -999.00 126.00 552 1.00 -999.00 "1,2,26" +Cetacea Delphinidae Lagenorhynchus acutus 182000.00 10.50 24000.00 18.00 -999.00 73.34 324 1.00 0.40 "1,2,23,26" +Cetacea Delphinidae Lagenorhynchus obscurus 110000.00 11.63 -999.00 12.00 -999.00 -999.00 -999 1.00 0.42 "2,16" +Cetacea Delphinidae Orcaella brevirostris 190000.00 14.00 12300.00 15.50 45000.00 -999.00 360 1.00 -999.00 "1,2,11" +Cetacea Delphinidae Orcinus orca 4300000.00 14.89 159333.33 15.50 -999.00 138.22 1080 1.00 0.21 "1,2,11,26" +Cetacea Delphinidae Peponocephala electra 206000.00 12.00 -999.00 -999.00 -999.00 141.00 564 -999.00 -999.00 "1,2,11" +Cetacea Delphinidae Pseudorca crassidens 1360000.00 14.92 -999.00 16.50 -999.00 114.73 750 -999.00 0.14 "1,2,23,26" +Cetacea Delphinidae Sotalia fluviatilis 46666.67 10.70 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Cetacea Delphinidae Stenella coeruleoalba 122950.00 12.10 11300.00 14.83 -999.00 94.65 684 1.50 0.31 "1,2,11,23" +Cetacea Delphinidae Stenella longirostris 70333.33 10.40 -999.00 18.00 -999.00 61.96 -999 1.00 0.33 "1,2,11,23,26" +Cetacea Delphinidae Stenella attenuata 68700.00 11.40 -999.00 17.95 -999.00 93.73 552 1.00 0.35 "1,2,11,16,23,26" +Cetacea Delphinidae Steno bredanensis 122500.00 -999.00 -999.00 -999.00 -999.00 120.00 384 -999.00 -999.00 2 +Cetacea Delphinidae Tursiops truncatus 173333.33 12.12 18920.00 18.94 -999.00 97.41 588 1.00 0.50 "1,2,23,26,29" +Cetacea Eschrichtiidae Eschrichtius robustus 25066666.67 12.36 529666.67 6.10 -999.00 79.28 840 1.00 0.50 "1,2,23,26,29" +Cetacea Monodontidae Delphinapterus leucas 665000.00 13.44 71400.00 22.60 -999.00 56.21 360 1.02 0.33 "1,2,23,26" +Cetacea Monodontidae Monodon monoceros 900000.00 14.83 80000.00 17.00 -999.00 72.00 600 1.00 0.33 "1,2,26" +Cetacea Neobalaenidae Caperea marginata 3200000.00 10.00 -999.00 5.50 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Cetacea Phocoenidae Neophocaena phocaenoides 32500.00 10.50 7066.67 10.50 24500.00 68.67 276 1.00 0.50 "1,2,23" +Cetacea Phocoenidae Phocoena sinus 45000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Cetacea Phocoenidae Phocoena phocoena 53183.33 9.66 6775.00 8.50 -999.00 34.71 156 1.00 -999.00 "1,2,11,23,26,29" +Cetacea Phocoenidae Phocoenoides dalli 101666.67 9.98 -999.00 11.43 -999.00 65.62 264 1.00 0.71 "1,2,11,23,26" +Cetacea Physeteridae Kogia simus 190233.33 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2,11" +Cetacea Physeteridae Kogia breviceps 363000.00 11.00 82000.00 -999.00 -999.00 -999.00 -999 1.00 1.00 "1,2" +Cetacea Physeteridae Physeter catodon 15400000.00 15.80 942666.67 18.40 -999.00 103.36 924 1.00 0.17 "1,2,23,26,29" +Cetacea Platanistidae Inia geoffrensis 96500.00 9.83 6800.00 -999.00 -999.00 -999.00 360 1.00 -999.00 "1,2" +Cetacea Platanistidae Lipotes vexillifer 83500.00 10.50 -999.00 -999.00 -999.00 96.00 288 1.00 0.50 "1,2" +Cetacea Platanistidae Platanista minor -999.00 10.25 7000.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 1 +Cetacea Platanistidae Platanista gangetica 21000.00 10.00 -999.00 12.00 -999.00 80.95 240 1.00 -999.00 "2,13,16,23" +Cetacea Platanistidae Pontoporia blainvillei 40333.33 10.92 7900.00 10.50 -999.00 28.03 192 1.00 0.50 "1,2,23" +Cetacea Ziphiidae Berardius arnuxii -999.00 10.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 1 +Cetacea Ziphiidae Berardius bairdii 8200000.00 14.67 -999.00 -999.00 -999.00 124.29 1008 -999.00 -999.00 "1,2,23,26" +Cetacea Ziphiidae Hyperoodon ampullatus 5266666.67 12.00 -999.00 12.00 -999.00 117.38 444 1.00 0.75 "1,2,16,23,26" +Cetacea Ziphiidae Mesoplodon carlhubbsi 1500000.00 12.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 "1,2" +Cetacea Ziphiidae Mesoplodon densirostris 1050000.00 -999.00 -999.00 -999.00 -999.00 108.00 324 -999.00 -999.00 "1,2,16" +Cetacea Ziphiidae Mesoplodon bidens 3400000.00 12.00 -999.00 12.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Cetacea Ziphiidae Ziphius cavirostris 2952500.00 12.00 -999.00 -999.00 -999.00 -999.00 432 1.00 -999.00 "1,2" +Dermoptera Cynocephalidae Cynocephalus variegatus 1000.00 2.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 1 +Dermoptera Cynocephalidae Cynocephalus volans -999.00 3.50 35.90 6.34 -999.00 -999.00 210 1.00 -999.00 "1,2" +Hyracoidea Procaviidae Dendrohyrax arboreus 2950.00 7.59 -999.00 5.00 -999.00 -999.00 147 1.35 -999.00 "1,2,18,25" +Hyracoidea Procaviidae Dendrohyrax dorsalis 3116.67 7.00 236.00 -999.00 -999.00 13.33 -999 1.50 -999.00 "1,11,23" +Hyracoidea Procaviidae Heterohyrax brucei 2456.67 7.57 225.00 3.00 -999.00 16.00 -999 1.94 -999.00 "1,16,25" +Hyracoidea Procaviidae Procavia capensis 3600.00 7.44 232.18 2.81 500.00 22.18 132 2.38 -999.00 "1,2,11,23,29" +Insectivora Chrysochloridae Amblysomus hottentotus 64.80 -999.00 4.50 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,12" +Insectivora Chrysochloridae Chrysochloris stuhlmanni 39.80 -999.00 -999.00 2.50 -999.00 -999.00 -999 -999.00 -999.00 "1,16" +Insectivora Chrysochloridae Chrysochloris asiatica 42.00 -999.00 -999.00 2.50 -999.00 -999.00 -999 2.75 -999.00 "12,13" +Insectivora Chrysochloridae Chrysospalax villosus 104.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 12 +Insectivora Chrysochloridae Eremitalpa granti 23.20 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 12 +Insectivora Erinaceidae Atelerix algirus 745.00 1.30 -999.00 1.33 -999.00 -999.00 -999 5.00 -999.00 12 +Insectivora Erinaceidae Atelerix albiventris 334.00 1.24 7.92 1.45 -999.00 2.77 -999 3.81 1.00 "1,12" +Insectivora Erinaceidae Atelerix frontalis 309.00 1.22 10.49 1.17 -999.00 12.00 -999 5.40 1.50 "1,12" +Insectivora Erinaceidae Echinosorex gymnura 956.50 1.25 14.50 -999.00 -999.00 -999.00 55 1.80 2.00 "1,2,12,29" +Insectivora Erinaceidae Erinaceus concolor 719.00 -999.00 22.00 -999.00 -999.00 7.00 49 4.50 -999.00 "1,12" +Insectivora Erinaceidae Erinaceus europaeus 771.00 1.20 15.70 1.37 203.00 10.80 96 4.64 1.58 "1,2,8,13,29" +Insectivora Erinaceidae Hemiechinus micropus 171.00 1.24 8.50 2.00 -999.00 10.00 -999 3.13 1.00 "1,2,12,13,29" +Insectivora Erinaceidae Hemiechinus hypomelas 292.00 -999.00 -999.00 2.00 -999.00 -999.00 86 3.20 1.00 "1,2,13,16" +Insectivora Erinaceidae Hemiechinus aethiopicus 358.00 -999.00 8.50 1.64 -999.00 -999.00 -999 3.75 1.00 "1,2,12" +Insectivora Erinaceidae Hemiechinus auritus 342.00 1.26 10.14 1.17 -999.00 7.00 -999 4.05 1.00 "1,2,12" +Insectivora Erinaceidae Hylomys suillus 64.00 1.08 -999.00 -999.00 -999.00 -999.00 -999 2.43 2.00 "1,12" +Insectivora Solenodontidae Solenodon cubanus 1000.00 -999.00 -999.00 -999.00 -999.00 -999.00 78 1.50 -999.00 "1,2" +Insectivora Solenodontidae Solenodon paradoxus 900.00 2.80 53.75 2.50 -999.00 -999.00 136 1.86 2.00 "1,2,12,29" +Insectivora Soricidae Blarina carolinensis 9.25 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 26 +Insectivora Soricidae Blarina hylophaga 14.50 0.75 -999.00 1.00 14.50 -999.00 24 6.50 1.50 26 +Insectivora Soricidae Blarina brevicauda 21.63 0.66 0.97 0.72 -999.00 2.21 33 5.73 3.00 "1,2,12,13,23,26,29" +Insectivora Soricidae Crocidura fuliginosa 12.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 "1,12" +Insectivora Soricidae Crocidura turba 15.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,18" +Insectivora Soricidae Crocidura canariensis 7.50 1.00 0.80 -999.00 -999.00 -999.00 -999 2.10 -999.00 12 +Insectivora Soricidae Crocidura fuscomurina 5.00 -999.00 0.82 0.57 3.20 -999.00 -999 2.80 -999.00 "1,12,29" +Insectivora Soricidae Crocidura planiceps 2.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 "1,16" +Insectivora Soricidae Crocidura crossei 7.20 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 "1,16" +Insectivora Soricidae Crocidura mariquensis 9.70 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.50 -999.00 12 +Insectivora Soricidae Crocidura viaria 17.10 -999.00 1.40 0.67 13.70 -999.00 -999 3.50 -999.00 "1,12" +Insectivora Soricidae Crocidura flavescens 22.00 0.84 2.26 -999.00 20.70 -999.00 -999 3.50 -999.00 "1,16" +Insectivora Soricidae Crocidura leucodon 9.91 0.99 0.88 0.70 -999.00 4.98 36 4.72 -999.00 "1,12,13,23,29" +Insectivora Soricidae Crocidura hirta 13.67 0.60 1.00 0.59 10.00 -999.00 -999 3.45 2.00 "1,12,25,29" +Insectivora Soricidae Crocidura russula 11.63 0.97 0.88 0.84 7.70 4.34 38 4.88 3.50 "1,12,13,29" +Insectivora Soricidae Crocidura suaveolens 7.70 0.93 0.63 0.83 4.00 5.75 48 5.61 3.50 "1,12,13,29" +Insectivora Soricidae Cryptotis parva 6.20 0.67 0.34 0.69 3.85 1.63 31 5.13 -999.00 "1,2,7,11,12,23,26,29" +Insectivora Soricidae Diplomesodon pulchellum 10.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 5.00 -999.00 "1,2" +Insectivora Soricidae Myosorex varius 11.00 -999.00 1.00 0.70 -999.00 -999.00 16 2.95 -999.00 "1,12" +Insectivora Soricidae Myosorex cafer 13.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 12 +Insectivora Soricidae Myosorex geata -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 1 +Insectivora Soricidae Neomys anomalus 16.00 0.75 0.58 0.97 -999.00 5.25 24 5.53 -999.00 "1,12,13" +Insectivora Soricidae Neomys fodiens 14.32 0.73 0.78 1.20 10.00 5.25 37 5.51 1.80 "1,2,12,13,29" +Insectivora Soricidae Notiosorex crawfordi 4.15 -999.00 0.41 1.42 3.60 -999.00 -999 3.83 2.00 "1,2,11,12,13,14,26" +Insectivora Soricidae Sorex mirabilis -999.00 -999.00 -999.00 -999.00 -999.00 11.00 -999 -999.00 -999.00 1 +Insectivora Soricidae Sorex dispar 4.90 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.50 -999.00 26 +Insectivora Soricidae Sorex pacificus 6.71 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.24 -999.00 "6,11" +Insectivora Soricidae Sorex bairdii 8.34 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.80 -999.00 6 +Insectivora Soricidae Sorex bendirii 15.88 -999.00 -999.00 -999.00 -999.00 -999.00 -999 5.00 -999.00 "6,11" +Insectivora Soricidae Sorex coronatus 9.60 0.77 0.58 1.00 8.60 -999.00 20 5.05 -999.00 "1,12" +Insectivora Soricidae Sorex merriami 4.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 6.00 -999.00 6 +Insectivora Soricidae Sorex cinereus 4.26 0.64 0.28 0.75 3.50 5.05 21 6.22 -999.00 "1,12,13,23,26,29" +Insectivora Soricidae Sorex arcticus 8.20 -999.00 -999.00 -999.00 -999.00 12.00 18 6.57 -999.00 "11,13,26" +Insectivora Soricidae Sorex ornatus 5.57 0.70 0.50 -999.00 -999.00 12.00 18 5.00 1.00 "1,11,26" +Insectivora Soricidae Sorex hoyi 4.37 -999.00 -999.00 -999.00 -999.00 -999.00 -999 5.28 1.00 "12,26,29" +Insectivora Soricidae Sorex monticolus 6.00 -999.00 -999.00 0.70 -999.00 12.00 18 5.68 1.33 "1,6,11,12,26" +Insectivora Soricidae Sorex trowbridgii 4.44 -999.00 -999.00 -999.00 -999.00 -999.00 18 4.40 1.50 "6,13,26" +Insectivora Soricidae Sorex minutus 7.25 0.77 0.25 0.84 -999.00 9.92 24 5.77 1.50 "1,12,13,23,29" +Insectivora Soricidae Sorex haydeni 3.00 0.68 -999.00 0.84 -999.00 -999.00 -999 7.00 1.50 "1,26" +Insectivora Soricidae Sorex araneus 8.98 0.69 0.47 0.85 8.50 10.71 24 6.03 1.90 "1,12,13,23,29" +Insectivora Soricidae Sorex longirostris 3.68 -999.00 -999.00 0.88 -999.00 -999.00 14 5.75 2.00 "1,11,26" +Insectivora Soricidae Sorex nanus 2.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 6.50 2.00 "1,11" +Insectivora Soricidae Sorex fumeus 8.20 0.55 -999.00 -999.00 4.00 10.00 17 5.00 2.50 "1,11,13,26" +Insectivora Soricidae Sorex vagrans 5.58 0.67 0.42 0.70 5.50 -999.00 18 5.25 2.50 "1,6,12,13,26,29" +Insectivora Soricidae Sorex palustris 12.47 0.75 -999.00 -999.00 -999.00 3.00 18 5.70 2.50 "6,11,13,26" +Insectivora Soricidae Suncus murinus 45.87 1.05 2.60 0.65 19.08 1.54 30 2.96 -999.00 "1,2,7,12,13,23,29" +Insectivora Soricidae Suncus varilla -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.30 -999.00 1 +Insectivora Soricidae Suncus etruscus 2.10 0.93 0.21 0.66 2.09 7.50 32 3.91 -999.00 "1,12,13,29" +Insectivora Soricidae Surdisorex norae -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 1 +Insectivora Soricidae Surdisorex polulus -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 1 +Insectivora Soricidae Sylvisorex granti -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 1 +Insectivora Talpidae Condylura cristata 55.33 -999.00 -999.00 0.79 30.00 10.00 -999 4.42 1.00 "1,11,12,13,26" +Insectivora Talpidae Desmana moschata 383.00 1.54 -999.00 1.17 -999.00 1.30 -999 3.86 2.00 "1,2,12" +Insectivora Talpidae Galemys pyrenaicus 61.30 1.00 -999.00 -999.00 -999.00 24.00 48 3.75 2.00 "1,2,12,13" +Insectivora Talpidae Neurotrichus gibbsii 10.00 -999.00 0.67 -999.00 -999.00 -999.00 -999 2.63 -999.00 "2,6,12" +Insectivora Talpidae Parascalops breweri 50.18 1.21 10.10 0.98 34.77 10.50 60 4.38 1.00 "1,11,12,13,26,29" +Insectivora Talpidae Scalopus aquaticus 74.60 1.35 5.36 1.17 -999.00 10.27 36 3.61 1.00 "1,2,12,13,26,29" +Insectivora Talpidae Scapanus townsendii 118.80 1.17 5.00 1.00 65.00 10.00 -999 2.86 1.00 "1,6,11,13,29" +Insectivora Talpidae Scapanus orarius 76.90 1.00 -999.00 1.00 -999.00 10.00 -999 3.25 1.00 "1,6,11,13,23,26" +Insectivora Talpidae Scapanus latimanus 52.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.58 1.00 "1,11,12,26" +Insectivora Talpidae Talpa altaica 85.00 -999.00 3.50 1.03 -999.00 -999.00 -999 4.35 0.82 "1,8" +Insectivora Talpidae Talpa europaea 133.30 1.06 3.38 1.25 44.20 10.41 72 4.09 1.15 "1,2,12,13,23" +Insectivora Talpidae Urotrichus talpoides 19.50 -999.00 -999.00 1.00 -999.00 12.00 -999 3.53 1.50 "1,12" +Insectivora Tenrecidae Echinops telfairi 180.00 1.90 7.74 0.94 50.00 8.32 156 5.01 1.00 "1,2,6,7,12,13,23,29" +Insectivora Tenrecidae Geogale aurita 6.70 2.06 0.70 1.21 -999.00 -999.00 25 3.90 2.00 "2,12" +Insectivora Tenrecidae Hemicentetes semispinosus 149.60 1.79 8.18 0.67 -999.00 1.44 32 5.02 2.00 "1,2,12,13,23,29" +Insectivora Tenrecidae Limnogale mergulus 79.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 1.00 12 +Insectivora Tenrecidae Microgale dobsoni 37.80 2.06 3.95 0.94 -999.00 22.00 67 1.99 -999.00 "1,2,12,29" +Insectivora Tenrecidae Microgale talazaci 48.10 2.03 3.65 0.97 -999.00 21.50 70 2.25 -999.00 "1,2,12,29" +Insectivora Tenrecidae Micropotamogale lamottei 69.60 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 12 +Insectivora Tenrecidae Potamogale velox 761.70 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.63 2.00 "1,2,12" +Insectivora Tenrecidae Setifer setosus 259.45 1.89 24.85 0.75 -999.00 6.48 127 3.04 1.00 "1,2,12,23,29" +Insectivora Tenrecidae Tenrec ecaudatus 884.00 2.01 21.38 1.11 225.00 6.33 76 13.89 1.50 "1,2,12,13,23,29" +Lagomorpha Leporidae Brachylagus idahoensis 421.33 0.89 -999.00 -999.00 -999.00 8.42 -999 6.00 2.50 "1,2,11,28" +Lagomorpha Leporidae Bunolagus monticularis 1250.00 -999.00 45.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Lagomorpha Leporidae Caprolagus hispidus 2500.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 2.50 "1,2" +Lagomorpha Leporidae Lepus nigricollis 2099.50 1.30 -999.00 -999.00 -999.00 5.92 -999 1.42 -999.00 "1,16,23,27,28" +Lagomorpha Leporidae Lepus callotis 1820.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.20 -999.00 11 +Lagomorpha Leporidae Lepus insularis -999.00 1.40 -999.00 -999.00 -999.00 -999.00 -999 3.50 -999.00 13 +Lagomorpha Leporidae Lepus tolai 2110.00 1.53 110.00 -999.00 -999.00 12.20 -999 3.80 -999.00 28 +Lagomorpha Leporidae Lepus othus 4506.33 1.53 102.50 1.83 2042.00 12.20 -999 6.30 1.00 "11,28" +Lagomorpha Leporidae Lepus arcticus 3766.00 1.72 105.00 2.13 -999.00 11.56 -999 5.03 1.80 "2,11,23,28" +Lagomorpha Leporidae Lepus timidus 3030.43 1.65 107.93 0.76 491.99 8.73 216 3.96 2.07 "1,2,7,11,28,29" +Lagomorpha Leporidae Lepus americanus 1489.25 1.22 61.03 0.66 362.00 10.12 -999 3.28 2.60 "1,2,6,7,23,29" +Lagomorpha Leporidae Lepus townsendii 3035.50 1.29 94.32 0.88 737.00 10.95 96 4.32 2.76 "1,6,11,13,28" +Lagomorpha Leporidae Lepus capensis 2358.00 1.42 118.40 1.08 943.33 7.48 -999 2.58 3.28 "1,16,23" +Lagomorpha Leporidae Lepus alleni 3759.67 1.50 118.10 1.75 3000.00 24.00 -999 2.21 3.50 "1,11,14,28" +Lagomorpha Leporidae Lepus californicus 2317.00 1.43 84.34 1.34 1300.00 8.00 81 2.93 3.73 "1,2,7,14,23,28,29" +Lagomorpha Leporidae Lepus europaeus 3673.33 1.42 119.67 0.94 390.00 7.77 89 2.82 3.75 "2,7,8,13,28,29" +Lagomorpha Leporidae Lepus saxatilis 2686.00 1.38 98.00 -999.00 -999.00 -999.00 -999 1.58 3.90 "1,16" +Lagomorpha Leporidae Oryctolagus cuniculus 1558.25 1.02 39.61 0.85 214.00 5.13 120 5.54 4.33 "1,2,8,13,23,28,29" +Lagomorpha Leporidae Poelagus marjorita 2500.00 1.25 -999.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 "1,2" +Lagomorpha Leporidae Pronolagus randensis 2470.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.10 -999.00 "2,16" +Lagomorpha Leporidae Pronolagus crassicaudatus 1945.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 "2,16" +Lagomorpha Leporidae Pronolagus rupestris 1700.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,16" +Lagomorpha Leporidae Romerolagus diazi 494.50 1.27 30.62 0.86 102.60 6.33 -999 2.18 -999.00 "1,2,28" +Lagomorpha Leporidae Sylvilagus brasiliensis 950.00 1.19 -999.00 0.88 -999.00 4.17 -999 3.20 4.50 "1,2,3,16" +Lagomorpha Leporidae Sylvilagus palustris 1233.00 1.11 -999.00 -999.00 -999.00 7.21 -999 2.34 -999.00 "1,2,11,16,27,28" +Lagomorpha Leporidae Sylvilagus transitionalis 902.60 0.93 30.00 0.53 -999.00 3.96 -999 4.75 2.50 "1,11,27,28" +Lagomorpha Leporidae Sylvilagus aquaticus 2120.67 1.26 57.67 0.47 160.00 6.53 -999 3.14 3.23 "1,7,11,28,29" +Lagomorpha Leporidae Sylvilagus bachmani 707.67 0.90 28.17 0.63 -999.00 5.07 -999 3.64 3.25 "1,2,11,27,28" +Lagomorpha Leporidae Sylvilagus nuttallii 759.96 0.97 -999.00 1.13 -999.00 3.97 -999 3.63 3.50 "1,6,11,28" +Lagomorpha Leporidae Sylvilagus floridanus 1269.00 0.90 34.33 0.80 118.50 4.06 108 5.13 3.89 "1,2,3,7,8,11,23,28" +Lagomorpha Leporidae Sylvilagus audubonii 909.38 0.94 34.50 0.92 -999.00 5.39 -999 2.97 5.00 "1,11,23,27,28" +Lagomorpha Ochotonidae Ochotona macrotis 167.00 -999.00 -999.00 -999.00 -999.00 12.00 -999 3.52 -999.00 "1,16" +Lagomorpha Ochotonidae Ochotona curzoniae -999.00 0.75 11.20 -999.00 -999.00 -999.00 -999 3.93 -999.00 1 +Lagomorpha Ochotonidae Ochotona collaris 129.00 1.00 -999.00 -999.00 -999.00 12.00 72 4.00 1.50 "1,13,18,26" +Lagomorpha Ochotonidae Ochotona roylei 115.00 -999.00 7.00 0.70 -999.00 0.74 -999 3.00 1.75 "1,2,16" +Lagomorpha Ochotonidae Ochotona dauurica 128.00 -999.00 -999.00 -999.00 -999.00 0.70 -999 6.50 2.00 "1,2,16" +Lagomorpha Ochotonidae Ochotona alpina -999.00 1.00 7.87 0.70 -999.00 0.92 -999 3.78 2.11 1 +Lagomorpha Ochotonidae Ochotona princeps 140.20 1.00 10.67 0.91 81.12 11.42 84 2.90 2.17 "1,2,7,8,23,28" +Lagomorpha Ochotonidae Ochotona rutila -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 2.50 1 +Lagomorpha Ochotonidae Ochotona pallasi -999.00 0.83 7.00 0.70 -999.00 0.92 -999 5.60 2.67 "1,2" +Lagomorpha Ochotonidae Ochotona pusilla -999.00 0.74 7.00 0.72 -999.00 1.02 -999 8.41 2.78 "1,2" +Lagomorpha Ochotonidae Ochotona rufescens 250.00 0.86 11.40 0.65 72.30 1.71 -999 5.75 3.33 "1,2,7,23" +Macroscelidea Macroscelididae Elephantulus rupestris 60.00 1.87 -999.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 "1,16" +Macroscelidea Macroscelididae Elephantulus fuscus -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 1 +Macroscelidea Macroscelididae Elephantulus intufi 51.95 1.70 10.00 1.25 -999.00 11.00 105 1.60 -999.00 "1,2,16" +Macroscelidea Macroscelididae Elephantulus myurus 51.94 1.80 8.10 1.00 -999.00 2.26 -999 1.91 -999.00 "1,2,13,16,23,25" +Macroscelidea Macroscelididae Elephantulus rozeti 48.00 2.50 -999.00 -999.00 -999.00 -999.00 36 2.50 2.00 "2,13,16" +Macroscelidea Macroscelididae Elephantulus rufescens 58.00 1.93 10.73 0.77 28.99 2.40 72 1.42 5.25 "1,2,11,13,29" +Macroscelidea Macroscelididae Elephantulus brachyrhynchus 44.33 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.75 5.50 "1,2,16,29" +Macroscelidea Macroscelididae Macroscelides proboscideus 40.00 2.14 7.00 0.62 -999.00 1.45 -999 1.60 -999.00 "1,2,13,29" +Macroscelidea Macroscelididae Petrodromus tetradactylus 220.00 -999.00 31.00 -999.00 -999.00 -999.00 -999 1.17 -999.00 "1,2,29" +Macroscelidea Macroscelididae Rhynchocyon chrysopygus 540.00 1.40 80.00 0.49 180.00 1.25 60 1.00 4.50 "1,2,13,29" +Perissodactyla Equidae Equus asinus 250000.00 11.97 29166.67 -999.00 -999.00 22.80 564 1.00 -999.00 "1,2,17,29" +Perissodactyla Equidae Equus kiang 275000.00 9.83 -999.00 -999.00 -999.00 -999.00 319 -999.00 0.50 "1,2" +Perissodactyla Equidae Equus grevyi 384000.00 13.32 40000.00 9.17 -999.00 48.00 345 1.00 0.50 "1,2,11" +Perissodactyla Equidae Equus zebra 296000.00 12.02 30000.00 10.00 -999.00 40.33 354 1.00 0.60 "1,2,11,17,23" +Perissodactyla Equidae Equus burchellii 257000.00 12.16 32292.00 10.76 174500.00 25.73 480 1.00 0.64 "1,2,8,23,29" +Perissodactyla Equidae Equus hemionus 230000.00 11.44 -999.00 12.50 -999.00 27.75 274 1.00 0.67 "1,2,17,29" +Perissodactyla Rhinocerotidae Ceratotherium simum 2233333.33 15.87 51166.67 12.00 -999.00 66.57 600 1.00 0.42 "1,2,11,23" +Perissodactyla Rhinocerotidae Dicerorhinus sumatrensis 1266666.67 7.75 23000.00 16.50 -999.00 90.00 392 1.00 0.29 "1,2,11,17" +Perissodactyla Rhinocerotidae Diceros bicornis 927766.67 16.12 34166.67 19.92 -999.00 59.51 550 1.00 0.39 "1,2,11,17,23,29" +Perissodactyla Rhinocerotidae Rhinoceros unicornis 1602333.33 16.44 58204.55 15.00 885812.33 72.85 564 1.00 0.30 "1,2,11" +Perissodactyla Rhinocerotidae Rhinoceros sondaicus 1750000.00 16.50 -999.00 18.00 -999.00 42.00 252 1.00 0.32 "2,17" +Perissodactyla Tapiridae Tapirus pinchaque 148950.00 13.09 4270.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,18" +Perissodactyla Tapiridae Tapirus terrestris 200000.00 13.18 5417.50 9.50 86260.00 23.00 420 1.00 -999.00 "1,2,11,17,29" +Perissodactyla Tapiridae Tapirus indicus 296250.00 12.76 7100.00 6.37 -999.00 46.00 -999 1.00 0.50 "1,2,16,29" +Perissodactyla Tapiridae Tapirus bairdii 300000.00 13.17 9400.00 -999.00 -999.00 -999.00 -999 1.00 0.71 "3,16,17,29" +Pholidota Manidae Manis gigantea 33000.00 -999.00 500.00 -999.00 6000.00 -999.00 -999 -999.00 -999.00 "1,18" +Pholidota Manidae Manis javanica 5150.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Pholidota Manidae Manis pentadactyla 2350.00 -999.00 92.50 2.87 -999.00 -999.00 -999 1.00 -999.00 "1,11" +Pholidota Manidae Manis tricuspis 1480.00 4.00 120.00 4.83 675.00 24.00 -999 1.00 -999.00 "1,16,29" +Pholidota Manidae Manis crassicaudata 3900.00 2.25 331.75 -999.00 -999.00 -999.00 240 1.00 -999.00 "1,2,11" +Pholidota Manidae Manis tetradactyla 2750.00 -999.00 -999.00 -999.00 400.00 -999.00 -999 1.05 -999.00 "1,16" +Pholidota Manidae Manis temminckii 7230.00 4.63 338.00 1.17 948.70 -999.00 -999 1.00 1.00 "1,11" +Primates Callitrichidae Callimico goeldii 558.33 5.18 49.07 2.07 215.00 17.33 215 1.00 1.17 "1,2,3,22,23,24,29" +Primates Callitrichidae Callithrix humeralifer 343.33 -999.00 34.50 3.50 -999.00 -999.00 -999 -999.00 -999.00 "1,18,22,24" +Primates Callitrichidae Callithrix argentata 357.25 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.87 -999.00 "1,16" +Primates Callitrichidae Callithrix pygmaea 116.83 4.60 16.16 3.00 70.00 20.55 216 1.98 -999.00 "1,2,11,22,23,24" +Primates Callitrichidae Callithrix penicillata 307.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 24 +Primates Callitrichidae Callithrix flaviceps 406.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 24 +Primates Callitrichidae Callithrix jacchus 309.00 4.90 27.12 5.42 97.00 16.33 144 2.24 2.00 "1,2,16,22,23,24" +Primates Callitrichidae Leontopithecus rosalia 558.00 4.35 55.07 4.30 165.00 25.01 338 1.95 1.75 "1,2,16,22,23,24,29" +Primates Callitrichidae Saguinus leucopus 490.00 -999.00 44.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 24 +Primates Callitrichidae Saguinus imperator 445.80 -999.00 35.00 -999.00 -999.00 -999.00 240 -999.00 -999.00 "1,2,13,16,24" +Primates Callitrichidae Saguinus bicolor 465.00 5.33 -999.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 "1,13,18" +Primates Callitrichidae Saguinus nigricollis 411.00 -999.00 43.70 2.70 175.00 27.96 -999 1.66 -999.00 "1,16,22,24" +Primates Callitrichidae Saguinus mystax 526.13 5.00 46.90 5.62 -999.00 -999.00 -999 1.89 -999.00 "1,16,24" +Primates Callitrichidae Saguinus geoffroyi 499.33 4.67 46.03 1.83 -999.00 18.00 -999 1.97 -999.00 "1,2,13,18,22,24" +Primates Callitrichidae Saguinus fuscicollis 370.00 4.91 39.60 3.00 -999.00 20.37 288 1.80 1.00 "1,2,13,16,22,24" +Primates Callitrichidae Saguinus oedipus 401.00 5.84 40.22 7.79 102.50 25.33 300 1.92 1.00 "1,16,22,23,24,29" +Primates Callitrichidae Saguinus labiatus 501.33 4.83 42.33 7.46 -999.00 -999.00 -999 1.91 1.20 "1,13,16,24" +Primates Callitrichidae Saguinus midas 466.75 4.60 40.00 2.34 -999.00 21.06 156 1.80 1.36 "1,13,16,22,23,24,29" +Primates Cebidae Alouatta pigra 11600.00 6.23 480.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2,24" +Primates Cebidae Alouatta seniculus 5555.29 6.37 295.00 12.30 -999.00 54.96 -999 1.20 -999.00 "1,16,22,24" +Primates Cebidae Alouatta palliata 5659.14 6.22 368.75 14.22 1100.00 42.30 240 1.00 0.60 "1,2,16,22,23,24" +Primates Cebidae Alouatta caraya 5353.00 6.23 187.50 6.42 -999.00 41.51 -999 1.00 0.98 "1,2,4,22,24" +Primates Cebidae Aotus trivirgatus 833.56 4.67 91.18 3.14 360.00 29.46 324 1.12 -999.00 "1,2,16,22,23,24" +Primates Cebidae Aotus lemurinus 874.00 4.43 98.00 2.50 -999.00 -999.00 -999 1.00 1.00 24 +Primates Cebidae Aotus azarai 1230.00 -999.00 -999.00 7.70 -999.00 -999.00 -999 1.00 1.00 24 +Primates Cebidae Ateles belzebuth 5400.00 4.63 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16,22" +Primates Cebidae Ateles geoffroyi 6265.80 7.39 447.50 23.47 2000.00 72.34 576 1.00 0.32 "1,2,16,22,24,29" +Primates Cebidae Ateles paniscus 7758.80 7.39 461.67 26.15 3790.00 54.73 -999 1.00 0.50 "1,13,16,22,24" +Primates Cebidae Ateles fusciceps 7761.80 7.47 235.00 12.90 -999.00 56.28 240 1.00 0.50 "1,18,22,23,24,29" +Primates Cebidae Brachyteles arachnoides 11142.50 7.76 -999.00 21.75 -999.00 90.00 -999 1.00 0.34 "2,22,24" +Primates Cebidae Cacajao calvus 4092.00 6.00 -999.00 21.14 -999.00 32.90 372 1.00 0.50 "1,2,18,22,24" +Primates Cebidae Callicebus torquatus 1050.00 -999.00 -999.00 5.00 -999.00 48.80 -999 1.00 -999.00 "1,13,16,22,23" +Primates Cebidae Callicebus cupreus 1120.00 4.33 74.00 6.77 -999.00 -999.00 -999 1.00 0.93 24 +Primates Cebidae Callicebus moloch 850.00 5.49 72.20 3.50 -999.00 36.00 300 1.17 1.00 "1,2,4,11,22,24" +Primates Cebidae Cebus olivaceus 2410.00 -999.00 -999.00 24.33 -999.00 72.00 -999 1.00 -999.00 "22,24" +Primates Cebidae Cebus capucinus 2602.57 5.70 237.25 17.12 1350.00 48.00 660 1.00 0.46 "1,2,16,22,23,24,29" +Primates Cebidae Cebus apella 2528.50 5.33 225.42 10.09 1000.00 57.56 540 1.00 0.55 "1,2,3,16,22,23,24" +Primates Cebidae Cebus albifrons 2539.07 5.17 232.42 8.15 -999.00 45.66 480 1.00 0.67 "1,13,16,22,24" +Primates Cebidae Chiropotes albinasus 2900.00 5.00 -999.00 -999.00 -999.00 48.00 -999 1.00 -999.00 "1,13,18" +Primates Cebidae Chiropotes satanas 2750.00 5.00 -999.00 -999.00 -999.00 48.00 216 1.00 -999.00 "2,3,16,22" +Primates Cebidae Lagothrix lagotricha 6076.25 8.35 213.96 11.57 -999.00 81.49 311 1.00 0.50 "1,2,3,16,22,24,29" +Primates Cebidae Pithecia monachus 1926.67 -999.00 120.67 -999.00 -999.00 -999.00 168 1.00 -999.00 "13,16,24" +Primates Cebidae Pithecia pithecia 1377.20 5.32 -999.00 4.00 -999.00 25.48 420 1.00 -999.00 "1,2,3,16,22,24,29" +Primates Cebidae Saimiri oerstedi 580.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 22 +Primates Cebidae Saimiri sciureus 607.80 5.71 113.25 6.40 410.50 38.71 252 1.00 1.33 "1,3,13,16,22,23,24" +Primates Cercopithecidae Allenopithecus nigroviridis 3301.67 -999.00 221.00 2.50 -999.00 -999.00 276 1.00 -999.00 "1,2,24" +Primates Cercopithecidae Cercocebus galeritus 5425.75 5.85 -999.00 12.00 2170.00 74.54 228 1.00 -999.00 "1,16,22,23,24" +Primates Cercopithecidae Cercocebus torquatus 7036.67 5.61 -999.00 -999.00 -999.00 57.60 246 1.00 -999.00 "1,2,16,22,23,24" +Primates Cercopithecidae Cercopithecus wolfi 2870.00 -999.00 435.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 "1,24" +Primates Cercopithecidae Cercopithecus lhoesti 4700.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 22 +Primates Cercopithecidae Cercopithecus mona 3833.33 -999.00 283.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2,22,24" +Primates Cercopithecidae Cercopithecus nictitans 4225.33 5.67 406.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "22,24" +Primates Cercopithecidae Cercopithecus erythrotis -999.00 -999.00 -999.00 16.00 -999.00 -999.00 -999 1.00 -999.00 22 +Primates Cercopithecidae Cercopithecus cephus 2866.25 5.67 339.00 -999.00 -999.00 60.00 -999 1.00 -999.00 "1,16,22,24" +Primates Cercopithecidae Cercopithecus pogonias 2973.67 5.67 339.00 -999.00 -999.00 60.00 -999 1.00 -999.00 "22,24" +Primates Cercopithecidae Cercopithecus ascanius 3392.60 5.00 371.00 6.00 -999.00 60.00 -999 1.00 -999.00 "1,2,22,24" +Primates Cercopithecidae Cercopithecus campbelli 3150.00 6.00 -999.00 12.00 -999.00 -999.00 351 1.00 -999.00 "2,16,22" +Primates Cercopithecidae Cercopithecus mitis 5685.71 4.50 391.65 10.37 -999.00 60.62 -999 1.00 0.50 "1,2,13,22,23,24" +Primates Cercopithecidae Cercopithecus solatus 3920.00 -999.00 -999.00 -999.00 -999.00 57.00 -999 1.00 0.67 24 +Primates Cercopithecidae Cercopithecus neglectus 4670.17 5.75 305.00 13.00 1640.00 50.80 -999 1.00 1.00 "1,2,13,22,23,24" +Primates Cercopithecidae Cercopithecus diana 4216.50 -999.00 463.00 12.00 -999.00 64.50 418 1.00 1.00 "22,24" +Primates Cercopithecidae Chlorocebus aethiops 3732.64 5.62 337.79 6.99 1036.50 47.37 372 1.00 1.00 "1,16,22,23,24" +Primates Cercopithecidae Colobus angolensis 9000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 22 +Primates Cercopithecidae Colobus satanas 9500.00 6.50 -999.00 16.00 -999.00 -999.00 -999 1.00 -999.00 22 +Primates Cercopithecidae Colobus polykomos 8508.00 6.26 573.40 8.87 1240.00 79.79 312 1.00 0.55 "1,2,13,16,22,23,24" +Primates Cercopithecidae Colobus guereza 9725.17 5.67 497.00 12.38 1600.00 53.40 288 1.00 0.59 "1,2,13,16,22,24" +Primates Cercopithecidae Erythrocebus patas 5883.40 5.56 546.50 5.33 1950.00 32.84 287 1.00 0.97 "1,2,22,23,24" +Primates Cercopithecidae Lophocebus albigena 6725.80 5.97 462.50 7.67 2170.00 57.58 392 1.00 0.36 "1,2,22,23,24,25" +Primates Cercopithecidae Macaca thibetana 10036.67 5.67 533.33 18.80 2400.00 -999.00 -999 1.00 0.50 "1,16,24" +Primates Cercopithecidae Macaca fuscata 8857.50 5.72 504.96 12.06 1767.50 55.02 -999 1.33 0.50 "1,16,22,23,24" +Primates Cercopithecidae Macaca maura 5575.00 5.43 389.50 16.67 -999.00 60.00 -999 1.00 0.55 "22,24" +Primates Cercopithecidae Macaca sylvanus 9752.60 5.49 450.00 7.00 2420.00 49.81 -999 1.50 0.55 "1,2,16,22,23,24" +Primates Cercopithecidae Macaca arctoides 7307.67 6.00 486.20 11.20 2300.00 47.76 -999 1.00 0.61 "1,2,16,24" +Primates Cercopithecidae Macaca nigra 6211.67 5.78 457.67 7.00 -999.00 63.21 216 1.00 0.67 "1,16,22,23,24" +Primates Cercopithecidae Macaca sinica 3495.00 -999.00 446.00 13.03 -999.00 54.00 420 1.00 0.69 "1,2,8,22,24" +Primates Cercopithecidae Macaca silenus 4875.00 5.94 418.00 12.00 -999.00 53.16 -999 1.00 0.70 "1,2,16,22,23,24" +Primates Cercopithecidae Macaca mulatta 5413.40 5.47 476.20 9.47 1454.00 41.08 259 1.00 0.75 "1,2,16,22,23,24" +Primates Cercopithecidae Macaca cyclopis 6316.67 5.40 401.00 6.87 -999.00 -999.00 -999 1.00 0.80 "1,16,24" +Primates Cercopithecidae Macaca nemestrina 6133.10 5.71 476.24 10.66 1416.50 43.64 316 1.00 0.85 "1,2,13,16,22,23,24" +Primates Cercopithecidae Macaca fascicularis 3456.29 5.49 407.82 9.58 990.33 43.56 445 1.00 0.93 "1,2,16,22,23,24" +Primates Cercopithecidae Macaca radiata 3735.00 5.43 391.33 10.72 2000.00 45.35 -999 1.00 1.00 "1,16,22,24" +Primates Cercopithecidae Mandrillus leucophaeus 9087.50 6.19 772.00 16.00 -999.00 56.85 343 1.00 -999.00 "1,2,22,24" +Primates Cercopithecidae Mandrillus sphinx 11916.67 6.02 751.50 11.64 3000.00 48.21 349 1.07 0.83 "1,2,22,24" +Primates Cercopithecidae Miopithecus talapoin 1093.33 5.40 187.50 5.43 450.00 53.13 332 1.00 1.00 "1,2,22,23,24" +Primates Cercopithecidae Nasalis larvatus 9462.60 5.53 452.00 7.62 2000.00 54.00 276 1.00 0.67 "1,2,22,24" +Primates Cercopithecidae Papio hamadryas 14028.57 5.94 836.97 8.59 3950.00 55.17 540 1.00 0.80 "1,2,22,23" +Primates Cercopithecidae Presbytis comata 6200.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,22" +Primates Cercopithecidae Presbytis rubicunda 6300.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 22 +Primates Cercopithecidae Presbytis potenziani 6400.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 22 +Primates Cercopithecidae Presbytis melalophos 6600.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 22 +Primates Cercopithecidae Procolobus verus 3600.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 22 +Primates Cercopithecidae Procolobus badius 6163.50 5.63 -999.00 21.88 -999.00 48.96 -999 1.00 -999.00 "1,2,13,22,24" +Primates Cercopithecidae Pygathrix bieti 9960.00 -999.00 427.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 24 +Primates Cercopithecidae Pygathrix nemaeus 8310.00 6.25 463.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "22,24" +Primates Cercopithecidae Semnopithecus entellus 11253.33 6.30 500.00 11.48 2100.00 40.64 300 1.14 0.67 "1,2,13,22,23,24" +Primates Cercopithecidae Theropithecus gelada 12242.33 5.81 464.50 15.40 3900.00 46.30 360 1.00 0.50 "1,2,22,23,24,25" +Primates Cercopithecidae Trachypithecus francoisi 7325.00 -999.00 457.00 13.10 -999.00 48.00 -999 -999.00 -999.00 24 +Primates Cercopithecidae Trachypithecus geei 8100.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 22 +Primates Cercopithecidae Trachypithecus johnii 12000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 22 +Primates Cercopithecidae Trachypithecus cristatus 6572.00 -999.00 -999.00 12.00 -999.00 48.00 -999 1.00 -999.00 "22,24" +Primates Cercopithecidae Trachypithecus vetulus 7081.75 6.95 432.33 8.23 1100.00 42.00 -999 1.00 0.37 "1,2,16,22,24" +Primates Cercopithecidae Trachypithecus obscurus 6426.00 4.92 329.83 12.00 -999.00 48.00 -999 1.00 0.50 "1,2,16,22,24" +Primates Cercopithecidae Trachypithecus phayrei 8400.00 5.50 -999.00 10.17 -999.00 -999.00 -999 1.00 0.80 24 +Primates Cheirogaleidae Cheirogaleus major 394.20 2.35 18.04 1.55 -999.00 -999.00 106 2.25 -999.00 "1,16,22,24" +Primates Cheirogaleidae Cheirogaleus medius 170.60 2.16 16.33 2.03 -999.00 13.77 230 2.14 1.00 "1,2,16,22,24" +Primates Cheirogaleidae Microcebus rufus 69.00 -999.00 6.50 1.33 -999.00 -999.00 -999 2.50 -999.00 "1,2" +Primates Cheirogaleidae Microcebus coquereli 306.67 2.95 14.50 4.54 -999.00 18.20 183 1.70 1.00 "1,2,22,24" +Primates Cheirogaleidae Microcebus murinus 71.00 1.84 5.78 1.30 -999.00 12.90 186 2.41 1.00 "1,2,22,23,24,29" +Primates Cheirogaleidae Phaner furcifer 400.00 -999.00 -999.00 -999.00 -999.00 -999.00 144 1.00 -999.00 "1,2" +Primates Daubentoniidae Daubentonia madagascariensis 2610.33 5.53 123.00 7.71 1535.00 39.00 279 1.00 1.04 "1,2,13,22,24" +Primates Galagonidae Euoticus elegantulus 280.00 4.50 -999.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 22 +Primates Galagonidae Galago alleni 289.20 4.47 24.00 -999.00 -999.00 10.11 -999 1.15 -999.00 "1,2,13,22,24" +Primates Galagonidae Galago moholi 180.00 4.10 12.10 3.07 95.00 10.62 -999 1.00 2.00 "1,2,24" +Primates Galagonidae Galago senegalensis 171.38 4.23 14.05 2.93 116.67 11.33 226 1.59 2.00 "1,2,16,22,23,24,25,29" +Primates Galagonidae Galagoides demidoff 66.00 3.12 10.58 1.50 -999.00 13.88 168 1.57 1.00 "1,2,13,22,24,29" +Primates Galagonidae Galagoides zanzibaricus 144.00 4.10 14.55 -999.00 -999.00 10.67 198 1.32 2.00 "1,2,24" +Primates Galagonidae Otolemur crassicaudatus 1143.33 4.41 51.21 4.53 500.00 22.16 216 1.57 1.00 "1,2,16,22,23,24,29" +Primates Galagonidae Otolemur garnettii 731.33 4.40 49.00 -999.00 -999.00 19.48 216 1.00 1.36 "2,24" +Primates Hominidae Gorilla gorilla 101386.11 8.47 2077.50 27.44 12595.00 89.33 472 1.01 0.26 "1,2,22,23,24,29" +Primates Hominidae Pan troglodytes 37618.18 7.36 1669.92 36.54 8500.00 131.87 726 1.10 0.20 "1,2,8,22,23,24,25" +Primates Hominidae Pan paniscus 32733.33 7.75 1411.20 20.87 8500.00 108.00 -999 1.00 0.22 "1,2,24" +Primates Hominidae Pongo pygmaeus 37115.60 8.67 1671.93 36.79 11000.00 110.12 672 1.21 0.22 "1,2,11,22,23,24" +Primates Hylobatidae Hylobates moloch 6048.40 7.50 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16,22,24" +Primates Hylobatidae Hylobates klossii 5900.00 7.00 -999.00 11.00 -999.00 -999.00 -999 1.00 -999.00 22 +Primates Hylobatidae Hylobates hoolock 6500.00 -999.00 -999.00 23.30 -999.00 84.00 -999 1.00 -999.00 "1,22" +Primates Hylobatidae Hylobates concolor 6389.67 6.84 -999.00 -999.00 -999.00 100.50 -999 1.00 -999.00 "1,22,24" +Primates Hylobatidae Hylobates agilis 5666.67 -999.00 -999.00 -999.00 -999.00 -999.00 528 1.00 -999.00 "2,16,22" +Primates Hylobatidae Hylobates syndactylus 9554.67 7.74 527.33 21.10 -999.00 89.40 300 1.17 0.36 "1,2,13,16,22,23,24" +Primates Hylobatidae Hylobates lar 5050.56 7.08 325.71 19.73 1070.00 103.27 378 1.00 0.45 "1,2,16,22,23,24,29" +Primates Indridae Avahi laniger 1094.43 4.50 -999.00 5.33 -999.00 30.96 -999 1.00 1.00 "1,2,13,22,24" +Primates Indridae Indri indri 7918.00 4.85 300.00 10.41 -999.00 96.00 -999 1.00 0.40 "1,2,11,22,24" +Primates Indridae Propithecus tattersalli 3545.00 -999.00 98.00 5.10 -999.00 54.00 -999 -999.00 -999.00 24 +Primates Indridae Propithecus diadema 6260.00 5.93 135.00 9.10 -999.00 51.06 -999 -999.00 0.48 24 +Primates Indridae Propithecus verreauxi 3657.13 4.70 77.64 6.04 -999.00 39.62 280 1.17 1.00 "1,2,16,22,23,24" +Primates Lemuridae Eulemur rubriventer 1765.33 4.28 85.50 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2,16,24" +Primates Lemuridae Eulemur macaco 2171.83 4.37 74.67 5.17 -999.00 26.14 325 1.06 1.00 "1,2,16,22,24" +Primates Lemuridae Eulemur mongoz 1666.20 4.29 58.93 5.07 -999.00 26.17 -999 1.21 1.00 "1,2,16,22,24" +Primates Lemuridae Eulemur coronatus 1389.25 4.12 59.00 -999.00 -999.00 20.00 -999 1.32 1.00 "1,21,24" +Primates Lemuridae Eulemur fulvus 2426.29 4.02 78.40 5.03 -999.00 22.59 432 1.08 2.00 "1,2,22,23,24,29" +Primates Lemuridae Hapalemur aureus 1390.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 1.00 24 +Primates Lemuridae Hapalemur griseus 1202.71 4.73 44.80 4.84 -999.00 28.93 204 1.20 1.09 "1,2,16,22,23,24" +Primates Lemuridae Lemur catta 2466.67 4.43 72.14 4.79 -999.00 24.75 396 1.11 0.93 "1,2,22,23,24" +Primates Lemuridae Varecia variegata 3431.43 3.34 91.99 3.67 2893.00 24.28 396 2.23 1.00 "1,2,22,23,24" +Primates Loridae Arctocebus calabarensis 314.14 4.46 29.69 3.69 160.00 10.36 156 1.00 1.50 "1,2,22,23,24,29" +Primates Loridae Loris tardigradus 237.00 5.56 12.34 5.92 139.00 13.37 185 1.37 1.50 "1,2,13,22,24" +Primates Loridae Nycticebus pygmaeus 307.00 6.17 21.50 -999.00 -999.00 -999.00 -999 2.00 -999.00 24 +Primates Loridae Nycticebus coucang 966.20 6.34 49.94 5.82 520.00 23.42 174 1.07 1.00 "1,2,22,24,29" +Primates Loridae Perodicticus potto 1083.50 6.44 40.51 4.34 -999.00 18.74 312 1.03 1.00 "1,2,22,23,24,29" +Primates Megaladapidae Lepilemur leucopus 700.00 -999.00 -999.00 -999.00 -999.00 11.20 -999 -999.00 -999.00 23 +Primates Megaladapidae Lepilemur ruficaudatus 779.00 -999.00 -999.00 4.00 -999.00 19.56 -999 -999.00 -999.00 24 +Primates Megaladapidae Lepilemur mustelinus 713.00 4.38 37.17 2.81 -999.00 20.84 144 1.00 1.00 "1,13,16,22,24" +Primates Tarsiidae Tarsius pumilis -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 24 +Primates Tarsiidae Tarsius dianae 107.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 24 +Primates Tarsiidae Tarsius syrichta 112.00 5.98 25.62 2.73 -999.00 -999.00 161 1.00 -999.00 "1,2,16,22,24,29" +Primates Tarsiidae Tarsius bancanus 101.20 5.93 25.42 2.02 -999.00 30.24 -999 1.00 1.49 "1,2,16,24" +Primates Tarsiidae Tarsius spectrum 179.60 5.62 25.70 2.27 -999.00 13.38 144 1.00 2.38 "1,16,22,23,24" +Proboscidea Elephantidae Elephas maximus 3178000.00 21.12 100038.90 18.00 -999.00 126.53 960 1.00 0.23 "1,2,23,29" +Proboscidea Elephantidae Loxodonta africana 3507000.00 21.46 99006.25 39.35 600000.00 147.51 840 1.02 0.21 "1,2,8,9,23,29" +Rodentia Abrocomidae Abrocoma cinerea 250.00 3.78 12.25 -999.00 -999.00 -999.00 -999 1.80 -999.00 "1,2,4,16,29" +Rodentia Abrocomidae Abrocoma bennetti 307.00 -999.00 -999.00 -999.00 -999.00 -999.00 28 3.00 2.00 "1,2" +Rodentia Agoutidae Agouti paca 9000.00 3.77 682.40 2.41 -999.00 10.50 192 1.26 1.50 "1,2,4,11,29" +Rodentia Anomaluridae Anomalurus beecrofti 389.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Rodentia Anomaluridae Anomalurus derbianus 770.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.17 2.00 "1,2" +Rodentia Anomaluridae Anomalurus pelii 1650.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 2.00 "1,2,13" +Rodentia Anomaluridae Idiurus zenkeri 15.75 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Rodentia Aplodontidae Aplodontia rufa 687.00 0.98 23.58 1.75 392.52 23.45 72 3.14 1.00 "1,2,6,23" +Rodentia Bathyergidae Bathyergus suillus 635.00 2.26 34.00 0.70 -999.00 -999.00 -999 3.13 1.50 "1,2,27" +Rodentia Bathyergidae Bathyergus janetta 332.00 -999.00 15.40 0.93 -999.00 -999.00 -999 3.50 1.50 "1,2" +Rodentia Bathyergidae Cryptomys damarensis 144.00 3.05 9.00 2.73 -999.00 2.43 -999 2.50 1.00 2 +Rodentia Bathyergidae Cryptomys hottentotus 132.50 2.67 8.63 1.50 26.05 14.78 115 2.86 1.50 "1,2" +Rodentia Bathyergidae Cryptomys ochraceocinereus 200.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 2.00 "1,2" +Rodentia Bathyergidae Georychus capensis 181.00 1.47 8.40 0.57 36.00 10.00 36 5.95 2.00 "1,2" +Rodentia Bathyergidae Heliophobius argenteocinereus 160.00 2.90 7.00 -999.00 -999.00 -999.00 -999 2.60 1.25 "1,2" +Rodentia Bathyergidae Heterocephalus glaber 35.00 2.23 1.88 1.17 11.00 7.50 192 8.95 3.50 "1,2" +Rodentia Capromyidae Capromys pilorides 4683.33 4.25 209.50 3.30 -999.00 8.38 136 2.08 -999.00 "1,2,23,29" +Rodentia Capromyidae Geocapromys ingrahami 660.00 3.85 78.00 -999.00 250.00 -999.00 -999 1.00 -999.00 "1,16,29" +Rodentia Capromyidae Geocapromys brownii 1500.00 3.23 -999.00 -999.00 -999.00 12.00 118 1.80 2.00 "1,2,11" +Rodentia Capromyidae Mysateles melanurus -999.00 6.63 -999.00 6.63 -999.00 -999.00 -999 1.75 -999.00 1 +Rodentia Capromyidae Mysateles prehensilis -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 1 +Rodentia Capromyidae Plagiodontia aedium 1267.00 4.50 105.85 -999.00 -999.00 -999.00 119 1.22 -999.00 "1,2,29" +Rodentia Castoridae Castor fiber 19000.00 3.51 537.94 2.33 4200.00 31.22 420 3.16 -999.00 "1,13,16" +Rodentia Castoridae Castor canadensis 19606.67 3.76 455.43 1.85 -999.00 21.60 -999 3.56 1.00 "1,6,11,23,29" +Rodentia Caviidae Cavia tschudii 637.50 2.11 -999.00 -999.00 -999.00 2.03 -999 1.90 -999.00 "2,4,16,23" +Rodentia Caviidae Cavia aperea 341.00 2.07 59.66 0.56 171.05 2.44 -999 2.48 -999.00 "1,2,3,16,29" +Rodentia Caviidae Cavia porcellus 728.00 2.24 85.14 0.60 228.00 2.25 -999 4.30 -999.00 "1,2,16,29" +Rodentia Caviidae Dolichotis salinicola 1600.00 2.57 196.00 -999.00 -999.00 -999.00 -999 1.25 -999.00 "4,16,29" +Rodentia Caviidae Dolichotis patagonum 12500.00 2.81 561.94 2.13 -999.00 5.00 168 1.71 3.50 "1,2,29" +Rodentia Caviidae Galea spixii 326.00 1.78 -999.00 -999.00 -999.00 -999.00 55 2.40 -999.00 "1,2,18" +Rodentia Caviidae Galea musteloides 337.85 1.78 37.99 1.27 136.75 2.18 22 2.63 -999.00 "1,2,4,23,29" +Rodentia Caviidae Kerodon rupestris 950.00 2.53 80.33 -999.00 -999.00 3.12 132 1.57 -999.00 "1,2" +Rodentia Caviidae Microcavia australis 350.00 1.80 30.40 1.28 -999.00 3.19 -999 2.36 4.00 "1,2,4,23" +Rodentia Chinchillidae Chinchilla brevicaudata 500.00 4.27 -999.00 -999.00 -999.00 8.00 240 1.45 1.50 "1,2,16" +Rodentia Chinchillidae Chinchilla lanigera 642.50 3.70 39.27 1.78 -999.00 6.45 -999 1.62 2.00 "1,4,16,23,29" +Rodentia Chinchillidae Lagidium viscacia 600.00 4.39 260.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 "1,16,29" +Rodentia Chinchillidae Lagidium peruanum 1270.00 4.04 180.00 1.94 -999.00 7.18 234 1.00 2.00 "1,2,4,18,23,29" +Rodentia Chinchillidae Lagostomus maximus 3250.00 5.14 196.00 1.78 652.25 7.40 113 2.05 1.75 "1,2,4,23" +Rodentia Ctenodactylidae Ctenodactylus vali 174.75 2.00 18.30 -999.00 -999.00 9.00 -999 2.00 -999.00 "1,2,23" +Rodentia Ctenodactylidae Ctenodactylus gundi 288.80 2.44 29.90 -999.00 -999.00 10.50 -999 1.85 1.00 "1,2" +Rodentia Ctenodactylidae Massoutiera mzabi 194.00 -999.00 20.50 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,2" +Rodentia Ctenomyidae Ctenomys torquatus 275.00 3.53 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 "1,16" +Rodentia Ctenomyidae Ctenomys haigi 164.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.60 -999.00 "4,18" +Rodentia Ctenomyidae Ctenomys peruanus 490.00 4.00 34.70 -999.00 -999.00 -999.00 -999 3.00 -999.00 "1,2,16" +Rodentia Ctenomyidae Ctenomys talarum 100.00 3.87 8.00 1.20 -999.00 8.07 -999 4.25 -999.00 "1,2,4,23,29" +Rodentia Ctenomyidae Ctenomys opimus 400.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 1.00 "1,2,16" +Rodentia Dasyproctidae Dasyprocta punctata 2675.00 2.80 22.70 -999.00 -999.00 16.00 -999 1.64 -999.00 "1,4,16" +Rodentia Dasyproctidae Dasyprocta cristata 2650.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,18" +Rodentia Dasyproctidae Dasyprocta leporina 3265.00 3.47 -999.00 -999.00 -999.00 6.36 213 2.10 -999.00 "1,2,16,23" +Rodentia Dasyproctidae Myoprocta acouchy 775.00 3.30 76.80 1.75 350.00 8.22 -999 1.75 -999.00 "1,16,23" +Rodentia Dinomyidae Dinomys branickii 12500.00 8.42 730.54 0.50 -999.00 -999.00 156 1.85 -999.00 "1,2,11,29" +Rodentia Dipodidae Allactaga tetradactyla 52.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 2 +Rodentia Dipodidae Allactaga euphratica 35.90 -999.00 -999.00 -999.00 -999.00 -999.00 50 5.00 -999.00 "1,2,16" +Rodentia Dipodidae Allactaga sibirica 117.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 1.00 "1,2" +Rodentia Dipodidae Allactaga elater 58.67 -999.00 -999.00 1.09 -999.00 4.67 -999 4.55 2.00 "1,2,23" +Rodentia Dipodidae Dipus sagitta 87.00 0.92 -999.00 -999.00 -999.00 2.75 -999 3.38 2.00 "1,2,23" +Rodentia Dipodidae Eremodipus lichtensteini 51.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 1.00 "1,16" +Rodentia Dipodidae Jaculus orientalis 134.00 1.15 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 "1,2,29" +Rodentia Dipodidae Jaculus jaculus 55.00 1.28 2.00 1.67 20.00 10.74 75 4.33 1.50 "1,2,7" +Rodentia Dipodidae Jaculus turcmenicus -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.50 3.00 2 +Rodentia Dipodidae Napaeozapus insignis 21.33 0.77 0.96 1.19 8.90 8.40 48 4.42 1.33 "1,2,11,23" +Rodentia Dipodidae Pygeretmus platyurus -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 6.00 -999.00 1 +Rodentia Dipodidae Pygeretmus pumilio 52.33 0.92 -999.00 -999.00 -999.00 5.18 -999 3.00 2.00 "1,2,23" +Rodentia Dipodidae Salpingotus crassicauda -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.57 2.00 1 +Rodentia Dipodidae Sicista napaea -999.00 0.69 -999.00 -999.00 -999.00 -999.00 -999 3.50 1.00 "1,2" +Rodentia Dipodidae Sicista betulina 8.00 0.97 -999.00 1.25 -999.00 11.61 40 4.86 1.00 "1,2,13,23,29" +Rodentia Dipodidae Stylodipus telum 55.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 1.00 "1,2" +Rodentia Dipodidae Zapus princeps 28.75 0.60 0.80 0.98 -999.00 -999.00 48 4.89 0.90 "1,2,6,8,26" +Rodentia Dipodidae Zapus trinotatus 24.00 0.69 0.81 1.00 -999.00 12.00 -999 5.50 1.00 "1,6,8,11" +Rodentia Dipodidae Zapus hudsonius 18.25 0.63 0.82 0.92 7.80 1.59 60 5.17 2.07 "1,2,8,13,23" +Rodentia Echimyidae Echimys chrysurus 640.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "3,16" +Rodentia Echimyidae Hoplomys gymnurus 504.00 -999.00 24.30 -999.00 -999.00 -999.00 -999 2.10 -999.00 "1,2,3" +Rodentia Echimyidae Kannabateomys amblyonyx 460.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Rodentia Echimyidae Makalata armata 276.00 -999.00 -999.00 -999.00 -999.00 -999.00 37 1.33 -999.00 "1,2" +Rodentia Echimyidae Proechimys cayennensis 356.50 2.10 24.70 0.94 -999.00 4.85 42 2.40 -999.00 "1,2,16,23" +Rodentia Echimyidae Proechimys semispinosus 500.00 2.01 23.00 0.70 -999.00 6.57 -999 2.67 4.04 "1,2,3,23,27,29" +Rodentia Echimyidae Proechimys guairae 350.00 2.09 21.63 0.73 -999.00 2.80 84 2.83 4.40 "1,2,16,23,29" +Rodentia Echimyidae Thrichomys apereoides 373.50 3.10 21.10 1.50 -999.00 5.85 -999 3.15 2.50 "1,2,4" +Rodentia Erethizontidae Coendou prehensilis 3900.00 6.67 407.90 3.13 -999.00 19.00 208 1.00 -999.00 "1,2,4,16" +Rodentia Erethizontidae Erethizon dorsatum 9000.00 6.78 678.20 1.28 936.84 24.74 120 1.00 1.00 "1,2,6,11,23,29" +Rodentia Erethizontidae Sphiggurus villosus 1750.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Rodentia Erethizontidae Sphiggurus mexicanus 2000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,20" +Rodentia Geomyidae Geomys bursarius 176.67 0.88 5.51 1.11 22.50 3.93 86 3.39 1.00 "1,2,16,23" +Rodentia Geomyidae Geomys pinetis 142.50 0.93 5.80 1.00 45.00 5.87 -999 1.86 1.73 "1,2,7,11,23,26,29" +Rodentia Geomyidae Geomys personatus 397.00 -999.00 -999.00 -999.00 -999.00 -999.00 24 3.30 2.00 "2,11,18" +Rodentia Geomyidae Geomys arenarius 210.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 5.00 2.00 26 +Rodentia Geomyidae Orthogeomys hispidus 650.00 -999.00 -999.00 -999.00 -999.00 2.77 -999 2.00 -999.00 "1,2,23" +Rodentia Geomyidae Orthogeomys cherriei 225.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 2.00 2 +Rodentia Geomyidae Pappogeomys castanops 266.00 -999.00 6.07 -999.00 68.80 10.20 -999 2.00 -999.00 "1,11,23,26" +Rodentia Geomyidae Thomomys clusius -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 6.50 -999.00 1 +Rodentia Geomyidae Thomomys monticola 80.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.50 1.00 "1,18" +Rodentia Geomyidae Thomomys umbrinus 100.00 -999.00 -999.00 -999.00 -999.00 7.97 -999 3.90 1.00 "1,2,14,16,23,26" +Rodentia Geomyidae Thomomys talpoides 91.40 0.87 3.12 1.32 -999.00 11.70 72 5.09 1.13 "1,2,6,11,23,26,27" +Rodentia Geomyidae Thomomys bulbivorus 359.90 -999.00 6.11 1.50 86.00 -999.00 -999 5.70 1.25 "1,6,11" +Rodentia Geomyidae Thomomys bottae 103.50 0.87 3.30 -999.00 -999.00 -999.00 -999 4.33 1.50 "1,2,16,29" +Rodentia Geomyidae Thomomys townsendii 233.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 5.67 2.00 "1,26" +Rodentia Heteromyidae Chaetodipus nelsoni 14.40 1.00 -999.00 -999.00 -999.00 -999.00 31 3.68 -999.00 "1,11" +Rodentia Heteromyidae Chaetodipus penicillatus 15.23 0.84 -999.00 0.75 -999.00 -999.00 -999 3.69 -999.00 "2,14,16,26" +Rodentia Heteromyidae Chaetodipus californicus 25.50 0.83 1.75 0.76 11.00 3.00 -999 4.00 -999.00 "1,7,26,29" +Rodentia Heteromyidae Chaetodipus intermedius 16.50 -999.00 -999.00 0.80 -999.00 -999.00 -999 4.50 -999.00 "1,2,16" +Rodentia Heteromyidae Chaetodipus fallax 18.70 0.84 -999.00 -999.00 -999.00 5.53 100 -999.00 1.00 "1,2,16" +Rodentia Heteromyidae Chaetodipus formosus 19.45 1.00 1.00 0.75 8.00 12.00 -999 5.53 1.00 "1,14,16" +Rodentia Heteromyidae Chaetodipus hispidus 35.25 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.90 1.75 "1,11,26" +Rodentia Heteromyidae Dipodomys elephantinus 85.00 1.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 26 +Rodentia Heteromyidae Dipodomys nitratoides 35.50 1.13 3.18 0.89 20.00 2.90 -999 2.27 -999.00 "1,2,7,11,29" +Rodentia Heteromyidae Dipodomys panamintinus 72.40 0.99 4.50 0.93 -999.00 1.34 -999 3.50 -999.00 "1,11,29" +Rodentia Heteromyidae Dipodomys microps 55.16 1.04 4.00 0.75 21.00 -999.00 -999 2.40 1.00 "1,2,6,11" +Rodentia Heteromyidae Dipodomys agilis 60.57 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.55 1.00 "1,16,26" +Rodentia Heteromyidae Dipodomys stephensi 64.50 -999.00 4.40 0.67 27.67 -999.00 -999 2.62 1.50 "1,2,7,26" +Rodentia Heteromyidae Dipodomys venustus 82.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 1.50 26 +Rodentia Heteromyidae Dipodomys merriami 40.00 0.91 2.92 0.67 17.60 3.35 -999 2.30 1.63 "1,2,7,14,23,29" +Rodentia Heteromyidae Dipodomys spectabilis 119.60 0.78 7.75 0.81 30.30 -999.00 -999 2.65 2.00 "1,2,11" +Rodentia Heteromyidae Dipodomys californicus 84.96 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.75 2.00 "1,6,26" +Rodentia Heteromyidae Dipodomys ingens 132.00 -999.00 -999.00 1.07 -999.00 -999.00 -999 2.75 2.00 "1,11,26" +Rodentia Heteromyidae Dipodomys heermanni 65.00 1.03 3.91 1.02 28.10 -999.00 -999 3.12 2.00 "1,2,7,11,23,26" +Rodentia Heteromyidae Dipodomys ordii 54.50 0.99 -999.00 1.13 -999.00 2.59 118 3.30 2.00 "1,2,11,23,27" +Rodentia Heteromyidae Dipodomys deserti 112.00 1.01 3.04 0.67 38.00 -999.00 108 3.29 2.42 "1,2,7,11,26" +Rodentia Heteromyidae Heteromys anomalus 70.00 -999.00 3.30 -999.00 -999.00 1.67 -999 2.00 -999.00 "1,3,16" +Rodentia Heteromyidae Heteromys oresterus 81.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 "1,2,11" +Rodentia Heteromyidae Heteromys goldmani 85.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 3.50 "1,18" +Rodentia Heteromyidae Heteromys desmarestianus 77.00 0.92 3.00 -999.00 -999.00 7.61 -999 3.31 5.00 "1,2,3,16,23" +Rodentia Heteromyidae Liomys pictus 50.00 0.83 2.75 0.87 22.50 3.26 -999 3.50 -999.00 "1,7,29" +Rodentia Heteromyidae Liomys irroratus 42.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 "1,2" +Rodentia Heteromyidae Liomys adspersus 65.00 -999.00 -999.00 -999.00 -999.00 6.33 18 3.20 1.44 "1,2,18" +Rodentia Heteromyidae Liomys salvini 41.00 0.92 1.90 -999.00 -999.00 2.15 -999 3.43 1.80 "1,11,16,23" +Rodentia Heteromyidae Microdipodops pallidus 13.55 -999.00 1.00 -999.00 -999.00 -999.00 -999 3.90 -999.00 "1,11,26" +Rodentia Heteromyidae Microdipodops megacephalus 13.45 -999.00 -999.00 -999.00 -999.00 -999.00 65 3.90 -999.00 11 +Rodentia Heteromyidae Perognathus fasciatus 11.55 1.00 -999.00 -999.00 -999.00 -999.00 -999 4.50 1.00 "1,11,26" +Rodentia Heteromyidae Perognathus longimembris 9.00 0.77 0.78 0.66 4.75 4.96 100 4.33 1.33 "1,2,6,7,14,26" +Rodentia Heteromyidae Perognathus flavus 7.83 0.83 -999.00 1.00 -999.00 -999.00 60 4.43 1.33 "1,11,14,26" +Rodentia Heteromyidae Perognathus flavescens 9.00 0.85 -999.00 -999.00 -999.00 2.75 60 4.75 1.50 "1,11,26" +Rodentia Heteromyidae Perognathus parvus 20.10 0.80 1.50 0.75 -999.00 3.28 -999 4.77 1.60 "1,14,16,23,26,29" +Rodentia Heteromyidae Perognathus merriami 8.00 -999.00 -999.00 0.75 -999.00 -999.00 48 4.50 2.00 26 +Rodentia Heteromyidae Perognathus inornatus 8.65 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.67 2.00 "1,11" +Rodentia Hydrochaeridae Hydrochaeris hydrochaeris 55000.00 8.82 1537.50 3.38 8299.00 15.10 144 3.48 1.25 "1,2,4,11,23,29" +Rodentia Hystricidae Atherurus macrourus 2000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.67 -999.00 "1,16" +Rodentia Hystricidae Atherurus africanus 3180.00 3.50 148.13 -999.00 -999.00 -999.00 275 1.50 2.50 "1,2,16,25,29" +Rodentia Hystricidae Hystrix pumila 2740.00 -999.00 -999.00 -999.00 -999.00 -999.00 114 -999.00 -999.00 "2,16" +Rodentia Hystricidae Hystrix brachyura 8000.00 4.00 445.00 -999.00 -999.00 -999.00 327 -999.00 -999.00 "1,2,16" +Rodentia Hystricidae Hystrix indica 14650.00 3.73 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,16" +Rodentia Hystricidae Hystrix cristata 18333.33 2.50 1000.00 -999.00 -999.00 -999.00 -999 2.43 -999.00 "1,16,25,29" +Rodentia Hystricidae Hystrix africaeaustralis 15680.00 2.42 331.15 2.53 -999.00 15.20 -999 2.10 1.67 "1,2,16" +Rodentia Muridae Acomys percivali -999.00 1.27 -999.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 27 +Rodentia Muridae Acomys russatus 54.43 1.13 7.00 -999.00 -999.00 3.00 60 2.50 -999.00 "1,11" +Rodentia Muridae Acomys wilsoni 20.00 1.27 -999.00 -999.00 10.00 -999.00 -999 -999.00 3.50 "1,16,27" +Rodentia Muridae Acomys cahirinus 45.25 1.23 5.77 0.81 12.58 2.02 60 2.47 3.50 "1,2,16,23,25" +Rodentia Muridae Aethomys hindei 107.00 0.82 -999.00 -999.00 -999.00 -999.00 -999 1.68 -999.00 "1,2,16" +Rodentia Muridae Aethomys kaiseri 198.00 0.90 6.10 0.87 47.57 -999.00 -999 2.80 -999.00 "1,16" +Rodentia Muridae Aethomys chrysophilus 78.55 0.83 4.45 0.98 31.00 3.77 -999 3.60 -999.00 "1,16,23" +Rodentia Muridae Aethomys namaquensis 47.56 -999.00 2.50 0.80 12.50 -999.00 -999 3.75 2.00 "1,16" +Rodentia Muridae Akodon varius 37.30 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 4 +Rodentia Muridae Akodon cursor 39.70 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 4 +Rodentia Muridae Akodon boliviensis 25.95 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.50 -999.00 4 +Rodentia Muridae Akodon molinae 33.00 0.77 3.00 0.87 -999.00 -999.00 -999 3.78 -999.00 "1,16" +Rodentia Muridae Akodon dolores 50.00 -999.00 3.00 -999.00 -999.00 -999.00 -999 3.90 -999.00 "1,18" +Rodentia Muridae Akodon azarae 27.33 0.79 2.20 0.49 -999.00 2.16 -999 4.05 1.00 "1,2,4,23" +Rodentia Muridae Akodon longipilis 37.55 -999.00 3.30 -999.00 -999.00 2.25 -999 3.70 2.50 "1,4" +Rodentia Muridae Akodon olivaceus 28.03 -999.00 -999.00 -999.00 -999.00 7.00 -999 5.50 2.50 "1,4" +Rodentia Muridae Akodon urichi 50.00 -999.00 -999.00 -999.00 -999.00 2.70 -999 5.00 3.60 "1,16" +Rodentia Muridae Allocricetulus eversmanni -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 2.00 1 +Rodentia Muridae Alticola roylei 35.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.30 -999.00 "1,16" +Rodentia Muridae Alticola strelzowi 50.00 0.67 3.00 0.57 15.00 -999.00 -999 7.70 2.20 "1,2,11" +Rodentia Muridae Alticola argentatus 37.70 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.60 2.50 "2,11" +Rodentia Muridae Apodemus argenteus -999.00 -999.00 -999.00 -999.00 -999.00 2.00 -999 4.12 -999.00 1 +Rodentia Muridae Apodemus peninsulae 32.90 -999.00 2.00 -999.00 -999.00 -999.00 -999 4.67 -999.00 "1,16" +Rodentia Muridae Apodemus uralensis -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 6.40 -999.00 1 +Rodentia Muridae Apodemus mystacinus 45.60 0.77 3.00 0.88 -999.00 -999.00 -999 2.84 2.00 "1,13,16" +Rodentia Muridae Apodemus flavicollis 29.35 0.85 2.40 0.73 8.70 1.67 48 5.54 2.80 "1,8,13,23,29" +Rodentia Muridae Apodemus agrarius 21.50 0.71 1.90 0.88 -999.00 2.50 48 5.72 3.17 "1,13,16,29" +Rodentia Muridae Apodemus sylvaticus 23.38 0.77 1.50 0.68 -999.00 2.34 48 5.18 3.83 "1,13,16,23,29" +Rodentia Muridae Arborimus pomo 36.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 26 +Rodentia Muridae Arborimus longicaudus 23.00 1.15 2.57 1.01 21.00 -999.00 -999 2.57 -999.00 "1,2,7,26" +Rodentia Muridae Arborimus albipes 23.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.80 -999.00 "1,2,18" +Rodentia Muridae Arvicanthis niloticus 64.50 0.73 4.15 0.75 21.67 1.82 -999 5.03 3.50 "1,16,25" +Rodentia Muridae Arvicola sapidus 187.50 0.73 6.00 -999.00 -999.00 -999.00 -999 5.00 -999.00 13 +Rodentia Muridae Arvicola terrestris 120.00 0.71 5.86 0.51 42.00 1.69 60 5.08 3.22 "1,2,7" +Rodentia Muridae Auliscomys micropus 72.60 -999.00 -999.00 -999.00 -999.00 2.00 -999 -999.00 -999.00 "1,16" +Rodentia Muridae Baiomys taylori 7.83 0.74 1.16 0.68 3.59 1.95 43 2.67 -999.00 "1,2,11,23,26,29" +Rodentia Muridae Bandicota indica 545.00 0.69 9.99 0.92 41.00 8.39 -999 7.44 -999.00 "1,2" +Rodentia Muridae Bandicota bengalensis 166.67 0.64 4.43 0.97 22.90 2.60 -999 7.96 5.90 "1,2,16,23" +Rodentia Muridae Beamys hindei 101.67 0.83 3.20 1.38 59.20 6.85 -999 4.26 -999.00 "1,2,23" +Rodentia Muridae Bolomys lasiurus 39.93 0.74 3.45 -999.00 -999.00 2.28 -999 4.17 -999.00 "1,2,16" +Rodentia Muridae Calomys lepidus 26.60 -999.00 2.05 -999.00 -999.00 -999.00 -999 4.15 -999.00 "1,16" +Rodentia Muridae Calomys laucha 34.00 0.83 -999.00 -999.00 -999.00 -999.00 -999 4.65 -999.00 "1,2" +Rodentia Muridae Calomys hummelincki 27.00 0.83 -999.00 -999.00 -999.00 -999.00 -999 5.00 -999.00 "3,18" +Rodentia Muridae Calomys callosus 41.00 0.73 2.34 0.58 14.25 1.72 -999 5.06 -999.00 "1,4,16" +Rodentia Muridae Calomys musculinus 17.60 0.74 -999.00 -999.00 -999.00 2.41 -999 5.40 -999.00 "1,2,16" +Rodentia Muridae Calomyscus bailwardi 20.40 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.33 1.00 "1,16" +Rodentia Muridae Calomyscus mystax 20.40 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 2.00 "1,16" +Rodentia Muridae Cannomys badius 650.00 1.38 7.00 2.00 -999.00 -999.00 39 1.75 -999.00 "1,2,29" +Rodentia Muridae Chionomys nivalis 54.00 0.69 3.70 0.75 -999.00 -999.00 -999 2.67 2.00 "1,2" +Rodentia Muridae Chionomys gud -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 2.50 1 +Rodentia Muridae Chiropodomys gliroides 25.50 0.67 2.80 0.79 10.00 3.33 43 2.17 -999.00 "1,2,7,23" +Rodentia Muridae Chiruromys vates 43.40 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Rodentia Muridae Clethrionomys gapperi 20.57 0.59 1.61 0.55 10.89 4.00 -999 5.04 2.71 "1,2,16,26" +Rodentia Muridae Clethrionomys rufocanus 29.50 -999.00 -999.00 -999.00 10.00 2.03 -999 4.13 2.84 "1,16,23" +Rodentia Muridae Clethrionomys glareolus 20.77 0.69 1.82 0.72 9.40 3.10 59 4.29 3.17 "1,2,7,8,13,23,29" +Rodentia Muridae Clethrionomys californicus 23.60 0.62 -999.00 -999.00 -999.00 -999.00 -999 3.30 3.30 "6,26" +Rodentia Muridae Clethrionomys rutilus 25.00 0.77 2.95 -999.00 -999.00 4.00 -999 7.00 3.80 "1,2,16,23,27" +Rodentia Muridae Colomys goslingi 58.50 -999.00 -999.00 -999.00 -999.00 -999.00 36 2.00 -999.00 "1,2,13" +Rodentia Muridae Conilurus penicillatus 144.00 1.16 -999.00 1.02 -999.00 -999.00 60 2.00 -999.00 "1,2,15" +Rodentia Muridae Cremnomys blanfordi 14.10 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 "1,16" +Rodentia Muridae Cremnomys cutchicus 59.80 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.67 -999.00 "2,16" +Rodentia Muridae Cricetomys gambianus 1092.60 1.17 23.10 1.02 -999.00 5.32 -999 3.33 4.33 "1,16,23,25" +Rodentia Muridae Cricetulus barabensis -999.00 -999.00 2.00 0.67 14.00 -999.00 -999 5.33 -999.00 1 +Rodentia Muridae Cricetulus migratorius 30.80 0.49 -999.00 -999.00 -999.00 -999.00 -999 4.10 2.00 "1,13,16" +Rodentia Muridae Cricetus cricetus 506.67 0.71 5.05 0.83 105.05 3.34 48 7.73 2.00 "1,2,13,23" +Rodentia Muridae Dasymys incomtus 106.18 -999.00 -999.00 1.00 30.00 2.34 -999 2.50 -999.00 "1,16" +Rodentia Muridae Dendromus messorius -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 1 +Rodentia Muridae Dendromus kahuziensis -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.50 -999.00 1 +Rodentia Muridae Dendromus mystacalis 7.20 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.29 -999.00 "1,16" +Rodentia Muridae Dendromus mesomelas 10.60 -999.00 -999.00 -999.00 -999.00 -999.00 39 4.44 -999.00 "1,2,16" +Rodentia Muridae Dendromus melanotis 7.36 0.83 -999.00 -999.00 -999.00 -999.00 -999 4.56 -999.00 "1,16,25" +Rodentia Muridae Dephomys defua 45.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.75 -999.00 "1,2" +Rodentia Muridae Desmodilliscus braueri 10.00 0.96 0.90 -999.00 -999.00 -999.00 -999 2.53 -999.00 "1,2" +Rodentia Muridae Desmodillus auricularis 54.50 0.94 3.12 1.10 -999.00 -999.00 -999 3.29 -999.00 "1,2" +Rodentia Muridae Dicrostonyx unalascensis -999.00 0.70 5.20 -999.00 -999.00 -999.00 -999 2.80 -999.00 1 +Rodentia Muridae Dicrostonyx richardsoni 55.00 0.68 4.00 0.63 -999.00 3.00 24 3.50 -999.00 26 +Rodentia Muridae Dicrostonyx hudsonius 57.00 0.67 -999.00 -999.00 -999.00 -999.00 -999 -999.00 1.50 "1,18" +Rodentia Muridae Dicrostonyx torquatus 85.00 0.60 2.97 1.00 25.50 3.00 45 4.07 2.00 "1,13" +Rodentia Muridae Dicrostonyx groenlandicus 55.05 0.71 4.35 0.53 23.00 1.32 -999 3.27 2.50 "1,2,16,23" +Rodentia Muridae Dinaromys bogdanovi 56.00 1.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 1.50 "1,2" +Rodentia Muridae Eligmodontia typus 21.40 -999.00 1.73 0.60 -999.00 1.75 -999 4.00 -999.00 "1,16" +Rodentia Muridae Ellobius fuscocapillus 80.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.67 -999.00 "1,13" +Rodentia Muridae Ellobius talpinus 38.00 0.87 -999.00 2.00 -999.00 3.15 -999 3.60 4.75 "1,16,23" +Rodentia Muridae Eolagurus luteus 26.00 -999.00 -999.00 -999.00 -999.00 0.97 -999 7.50 3.50 "1,23" +Rodentia Muridae Gerbillurus setzeri 38.60 0.70 2.30 0.85 20.15 -999.00 -999 3.00 -999.00 11 +Rodentia Muridae Gerbillurus paeba 28.50 0.79 2.10 0.82 13.50 2.49 -999 3.63 -999.00 "1,2,11" +Rodentia Muridae Gerbillurus tytonis 24.00 -999.00 1.90 0.97 13.00 -999.00 -999 4.40 -999.00 "1,11" +Rodentia Muridae Gerbillus gleadowi 26.10 0.67 1.90 -999.00 -999.00 -999.00 -999 3.50 -999.00 "1,16" +Rodentia Muridae Gerbillus andersoni 22.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.90 -999.00 "1,16" +Rodentia Muridae Gerbillus henleyi 11.70 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 "1,16" +Rodentia Muridae Gerbillus gerbillus 25.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.10 -999.00 "1,13" +Rodentia Muridae Gerbillus dasyurus 24.40 0.84 -999.00 -999.00 -999.00 -999.00 -999 4.40 -999.00 "1,16" +Rodentia Muridae Gerbillus perpallidus -999.00 0.67 2.24 -999.00 17.23 -999.00 -999 4.46 -999.00 1 +Rodentia Muridae Gerbillus simoni -999.00 -999.00 -999.00 0.88 -999.00 3.06 -999 4.68 -999.00 1 +Rodentia Muridae Gerbillus cheesmani 43.35 -999.00 -999.00 -999.00 -999.00 -999.00 -999 8.00 -999.00 "1,16" +Rodentia Muridae Gerbillus nanus 18.50 0.72 -999.00 -999.00 -999.00 -999.00 -999 5.00 3.00 "1,16,29" +Rodentia Muridae Gerbillus pyramidum 37.00 0.95 2.55 0.92 11.00 2.59 98 3.47 5.00 "1,2,16,29" +Rodentia Muridae Golunda ellioti 65.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.50 -999.00 "1,2" +Rodentia Muridae Grammomys rutilans 53.00 0.83 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,18" +Rodentia Muridae Grammomys dolichurus 43.70 0.80 4.20 0.82 -999.00 2.40 53 2.74 -999.00 "1,2,16" +Rodentia Muridae Grammomys cometes -999.00 -999.00 -999.00 0.75 -999.00 -999.00 -999 -999.00 3.00 1 +Rodentia Muridae Graomys griseoflavus 66.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 7.05 -999.00 "1,2" +Rodentia Muridae Hodomys alleni 368.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,2" +Rodentia Muridae Holochilus brasiliensis 155.00 0.94 5.00 0.75 -999.00 3.25 -999 3.00 -999.00 "1,2,16" +Rodentia Muridae Hybomys univittatus 51.80 1.00 4.40 -999.00 -999.00 2.93 -999 2.50 -999.00 "1,16,23,25" +Rodentia Muridae Hydromys chrysogaster 606.00 1.17 24.39 1.05 150.00 5.36 -999 3.80 2.12 "1,13,15,23" +Rodentia Muridae Hylomyscus alleni 20.00 0.97 1.50 -999.00 -999.00 -999.00 -999 3.00 -999.00 "1,16" +Rodentia Muridae Hylomyscus stella 16.70 0.97 1.49 -999.00 -999.00 1.27 -999 3.13 -999.00 "1,2,16" +Rodentia Muridae Hyomys goliath 882.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Rodentia Muridae Hyperacrius fertilis -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 2.50 1 +Rodentia Muridae Hyperacrius wynnei 52.60 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.67 2.50 "2,16" +Rodentia Muridae Hypogeomys antimena 1250.00 4.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Rodentia Muridae Lagurus lagurus 20.30 0.66 1.35 -999.00 5.75 1.24 -999 4.50 5.00 "1,16" +Rodentia Muridae Lasiopodomys brandtii -999.00 -999.00 1.90 -999.00 -999.00 2.00 -999 6.00 2.67 1 +Rodentia Muridae Leggadina lakedownensis 17.50 1.05 -999.00 1.00 -999.00 3.00 -999 3.00 -999.00 "1,2" +Rodentia Muridae Leggadina forresti 20.00 -999.00 -999.00 1.00 -999.00 3.00 -999 3.50 -999.00 "1,2" +Rodentia Muridae Lemmiscus curtatus 27.17 0.82 1.16 0.70 -999.00 1.89 -999 6.11 3.00 "1,2,6,11,23" +Rodentia Muridae Lemmus lemmus 51.67 0.68 3.92 0.50 -999.00 1.29 24 5.12 2.50 "1,13,16,23" +Rodentia Muridae Lemmus sibiricus 59.20 0.70 3.78 -999.00 27.00 1.86 -999 5.15 3.00 "1,16,26" +Rodentia Muridae Lemniscomys griselda 59.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.25 -999.00 "1,16" +Rodentia Muridae Lemniscomys striatus 42.30 0.83 1.70 1.00 15.00 5.51 30 4.54 2.00 "1,2,16,23,25" +Rodentia Muridae Leporillus conditor 332.50 1.24 -999.00 1.17 -999.00 7.47 -999 2.17 -999.00 "1,2,15,23" +Rodentia Muridae Lophiomys imhausi 755.00 -999.00 -999.00 1.33 -999.00 -999.00 90 2.00 -999.00 "1,2" +Rodentia Muridae Lophuromys woosnami -999.00 1.07 9.50 -999.00 -999.00 -999.00 -999 1.50 -999.00 "1,2" +Rodentia Muridae Lophuromys luteogaster -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 1 +Rodentia Muridae Lophuromys flavopunctatus 55.00 1.01 6.50 1.67 15.33 2.00 -999 2.31 -999.00 "1,2,16,25,27" +Rodentia Muridae Lophuromys sikapusi 44.50 1.00 7.50 0.40 13.61 -999.00 -999 3.50 -999.00 "1,16,27" +Rodentia Muridae Macrotarsomys bastardi -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.48 -999.00 "1,2" +Rodentia Muridae Malacothrix typica 12.33 0.88 1.20 1.07 -999.00 2.12 -999 4.10 -999.00 "1,2,23" +Rodentia Muridae Mastomys erythroleucus 37.77 0.70 -999.00 -999.00 22.50 4.50 -999 6.50 -999.00 "1,16" +Rodentia Muridae Mastomys natalensis 44.97 0.77 2.07 0.69 13.28 2.77 -999 14.18 2.00 "1,2,16,23,25" +Rodentia Muridae Megadontomys thomasi 111.00 -999.00 4.50 1.00 -999.00 -999.00 -999 2.70 -999.00 "1,16" +Rodentia Muridae Melomys levipes 81.60 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 "1,16" +Rodentia Muridae Melomys rubex 45.90 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,16" +Rodentia Muridae Melomys rufescens 57.40 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,16" +Rodentia Muridae Melomys moncktoni 89.80 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,16" +Rodentia Muridae Melomys leucogaster 96.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,16" +Rodentia Muridae Melomys capensis 65.00 -999.00 6.50 -999.00 -999.00 -999.00 -999 2.00 -999.00 15 +Rodentia Muridae Melomys burtoni 62.00 -999.00 -999.00 0.75 30.50 -999.00 -999 2.40 -999.00 "1,15" +Rodentia Muridae Melomys cervinipes 94.00 1.30 -999.00 1.08 17.50 6.42 -999 2.50 1.30 "1,15,23" +Rodentia Muridae Meriones persicus 100.00 0.84 5.00 0.64 -999.00 -999.00 -999 4.33 -999.00 "1,29" +Rodentia Muridae Meriones tristrami 105.00 0.85 3.00 -999.00 -999.00 -999.00 -999 4.60 -999.00 "1,13,16,29" +Rodentia Muridae Meriones libycus 77.00 0.84 5.33 1.00 45.00 3.00 -999 4.97 -999.00 "1,16,29" +Rodentia Muridae Meriones shawi 185.00 0.86 4.46 0.75 25.00 3.36 -999 5.41 -999.00 "1,16,29" +Rodentia Muridae Meriones vinogradovi 150.00 0.72 3.00 -999.00 -999.00 -999.00 -999 7.00 -999.00 "1,16" +Rodentia Muridae Meriones crassus 48.30 0.82 3.40 0.67 -999.00 3.00 67 3.83 2.00 "1,2,11,29" +Rodentia Muridae Meriones tamariscinus -999.00 -999.00 3.03 0.56 15.75 -999.00 -999 4.21 2.00 1 +Rodentia Muridae Meriones meridianus 53.00 0.77 -999.00 0.70 -999.00 -999.00 -999 5.56 3.00 "1,16" +Rodentia Muridae Meriones hurrianae 70.00 0.97 3.50 0.82 20.50 3.61 -999 4.46 3.50 "1,2,7,23" +Rodentia Muridae Meriones unguiculatus 53.20 0.84 2.90 0.87 14.95 2.64 24 4.89 3.84 "1,2,7,11,13,23,29" +Rodentia Muridae Mesembriomys macrurus 268.50 1.57 -999.00 1.63 -999.00 -999.00 -999 2.00 -999.00 "1,2,15" +Rodentia Muridae Mesembriomys gouldii 900.00 1.46 34.90 1.56 440.50 2.32 47 1.96 4.00 "1,2,7,23,29" +Rodentia Muridae Mesocricetus brandti 197.50 0.50 -999.00 -999.00 -999.00 1.17 -999 6.49 -999.00 "1,2" +Rodentia Muridae Mesocricetus raddei -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 2.00 1 +Rodentia Muridae Mesocricetus auratus 105.00 0.54 2.31 0.74 22.93 1.54 36 8.59 3.75 "1,2,13,23,29" +Rodentia Muridae Micromys minutus 6.00 0.65 0.90 0.59 -999.00 1.41 60 5.15 2.60 "1,2,13,23,29" +Rodentia Muridae Microtus lusitanicus -999.00 0.67 1.70 -999.00 -999.00 1.25 -999 2.00 -999.00 1 +Rodentia Muridae Microtus transcaspicus -999.00 -999.00 2.80 -999.00 -999.00 -999.00 -999 2.10 -999.00 1 +Rodentia Muridae Microtus duodecimcostatus -999.00 -999.00 2.21 -999.00 -999.00 -999.00 33 2.53 -999.00 "1,2" +Rodentia Muridae Microtus abbreviatus 50.00 0.70 3.45 0.50 -999.00 -999.00 -999 2.57 -999.00 "1,16,26" +Rodentia Muridae Microtus mexicanus 35.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.72 -999.00 "1,2,16" +Rodentia Muridae Microtus juldaschi -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.53 -999.00 1 +Rodentia Muridae Microtus breweri 54.00 0.73 3.50 0.50 -999.00 -999.00 -999 3.98 -999.00 "1,26" +Rodentia Muridae Microtus montebelli 39.85 0.97 2.45 0.67 17.60 2.00 -999 4.30 -999.00 "1,16" +Rodentia Muridae Microtus townsendii 54.80 0.75 -999.00 0.53 15.10 -999.00 -999 5.28 -999.00 "1,6,11" +Rodentia Muridae Microtus miurus 39.50 0.70 2.60 -999.00 -999.00 -999.00 -999 5.96 -999.00 "1,2,18,26" +Rodentia Muridae Microtus longicaudus 36.70 -999.00 -999.00 -999.00 -999.00 -999.00 14 5.22 1.90 "1,11,16" +Rodentia Muridae Microtus chrotorrhinus 39.00 0.67 -999.00 -999.00 -999.00 -999.00 -999 3.56 2.00 "1,11" +Rodentia Muridae Microtus canicaudus 35.30 0.73 2.43 0.60 13.98 1.83 -999 4.33 2.00 "1,6,11" +Rodentia Muridae Microtus richardsoni 106.20 0.90 5.05 0.70 31.09 -999.00 -999 5.80 2.00 "1,2,6,11" +Rodentia Muridae Microtus xanthognathus 141.50 -999.00 3.50 1.00 -999.00 -999.00 -999 8.25 2.00 "1,2,26" +Rodentia Muridae Microtus pennsylvanicus 43.67 0.70 2.46 0.48 13.60 0.94 16 4.96 2.58 "1,7,11,13,23" +Rodentia Muridae Microtus pinetorum 25.50 0.75 2.32 0.68 9.63 3.21 -999 2.89 2.74 "1,2,7,11,23" +Rodentia Muridae Microtus gregalis 47.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 3.00 "1,16" +Rodentia Muridae Microtus guentheri 51.60 0.70 3.00 0.59 15.00 6.17 47 5.96 3.33 "1,2,16" +Rodentia Muridae Microtus oeconomus 93.33 0.71 2.43 0.71 15.90 0.94 21 5.76 3.38 "1,13,23,26" +Rodentia Muridae Microtus agrestis 46.00 0.68 2.30 0.44 8.94 1.17 39 4.42 3.61 "1,13,23,29" +Rodentia Muridae Microtus subterraneus 19.50 0.71 1.60 0.79 9.44 3.17 34 2.68 4.00 "1,13" +Rodentia Muridae Microtus ochrogaster 40.00 0.74 3.02 0.67 16.68 1.56 35 3.80 4.00 "1,2,11,23,27" +Rodentia Muridae Microtus oregoni 20.50 0.78 1.63 0.46 10.00 1.05 -999 3.28 4.40 "1,6,7,23,26" +Rodentia Muridae Microtus montanus 49.50 0.70 3.05 0.54 9.33 0.82 -999 4.82 4.50 "1,6,14,23" +Rodentia Muridae Microtus californicus 53.50 0.71 2.83 0.60 17.67 2.18 -999 4.54 4.83 "1,6,7,23,26" +Rodentia Muridae Microtus socialis 48.00 0.65 2.10 -999.00 -999.00 1.10 -999 4.96 5.00 "1,16" +Rodentia Muridae Microtus arvalis 27.50 0.69 1.85 0.58 8.87 1.57 36 5.11 5.50 "1,7,13,29" +Rodentia Muridae Microtus fortis 63.00 -999.00 -999.00 -999.00 -999.00 3.75 -999 5.00 6.00 "1,16" +Rodentia Muridae Millardia meltada 70.00 0.62 -999.00 -999.00 -999.00 2.96 -999 5.62 4.50 "1,2,23" +Rodentia Muridae Mus caroli 11.25 0.69 1.20 -999.00 -999.00 -999.00 -999 -999.00 -999.00 "1,16" +Rodentia Muridae Mus spretus 12.80 -999.00 -999.00 -999.00 -999.00 1.34 -999 -999.00 -999.00 "1,16" +Rodentia Muridae Mus mayori -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 1 +Rodentia Muridae Mus cervicolor 17.70 0.65 1.50 -999.00 -999.00 -999.00 -999 4.13 -999.00 "1,2,16" +Rodentia Muridae Mus musculoides 6.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.50 -999.00 "1,16" +Rodentia Muridae Mus platythrix 28.20 -999.00 -999.00 -999.00 -999.00 -999.00 -999 5.70 -999.00 "1,16" +Rodentia Muridae Mus booduga 9.22 -999.00 -999.00 -999.00 -999.00 -999.00 -999 6.72 -999.00 "1,16" +Rodentia Muridae Mus triton 12.45 0.67 1.30 0.92 4.50 1.67 -999 6.00 3.00 "1,16,27" +Rodentia Muridae Mus minutoides 7.25 0.67 0.97 0.69 3.34 1.98 37 3.83 4.00 "1,2" +Rodentia Muridae Mus musculus 20.50 0.69 1.25 0.72 8.95 2.37 72 6.07 4.57 "1,2,7,23,29" +Rodentia Muridae Myomys fumatus 30.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 "2,18" +Rodentia Muridae Myomys derooi 32.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.50 -999.00 "2,18" +Rodentia Muridae Myomys daltoni 33.50 0.97 1.50 -999.00 8.00 4.54 -999 5.64 -999.00 "1,2,18,23" +Rodentia Muridae Myopus schisticolor 25.00 0.71 3.20 0.67 15.65 1.07 12 4.63 2.00 "1,2,13,23" +Rodentia Muridae Myospalax myospalax -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 1.00 1 +Rodentia Muridae Mystromys albicaudatus 106.00 1.26 6.25 1.07 39.00 3.28 72 3.18 -999.00 "1,2,7,13,23,29" +Rodentia Muridae Nannospalax leucodon 178.00 -999.00 5.00 1.50 -999.00 -999.00 -999 3.50 1.00 "1,16" +Rodentia Muridae Neacomys tenuipes 19.00 -999.00 -999.00 -999.00 -999.00 1.00 -999 3.80 6.10 "1,16" +Rodentia Muridae Nectomys squamipes 290.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.13 -999.00 "1,11" +Rodentia Muridae Nectomys parvipes 257.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.50 -999.00 "3,4" +Rodentia Muridae Neofiber alleni 269.00 0.93 11.08 0.75 -999.00 2.98 -999 2.34 4.53 "1,2,11,13,23" +Rodentia Muridae Neotoma devia 96.70 1.20 10.00 0.70 -999.00 2.50 -999 2.10 -999.00 26 +Rodentia Muridae Neotoma fuscipes 233.58 1.02 12.10 0.88 -999.00 6.00 -999 2.65 1.17 "1,6,11,26,29" +Rodentia Muridae Neotoma stephensi 142.00 1.03 10.60 1.31 35.00 9.50 -999 1.08 1.95 "1,11,14,16" +Rodentia Muridae Neotoma cinerea 335.50 0.98 13.50 0.90 107.03 11.59 36 3.68 2.00 "1,7,11,23,29" +Rodentia Muridae Neotoma phenax 227.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 2.00 "1,11" +Rodentia Muridae Neotoma mexicana 203.00 1.09 10.40 -999.00 -999.00 2.00 -999 2.10 2.00 "1,16" +Rodentia Muridae Neotoma albigula 198.00 1.19 11.35 0.96 78.15 5.00 92 2.15 2.00 "1,2,7,14,11,29" +Rodentia Muridae Neotoma lepida 125.33 1.10 8.96 0.95 34.63 4.21 67 2.92 2.00 "1,2,7,11,14,23" +Rodentia Muridae Neotoma micropus 236.33 1.14 11.70 0.87 35.60 4.48 40 2.51 2.40 "1,2,11,23" +Rodentia Muridae Neotoma floridana 370.50 1.20 13.28 0.73 50.45 4.71 36 3.10 2.50 "1,2,7,13,23" +Rodentia Muridae Neotomodon alstoni 50.00 0.91 3.40 -999.00 -999.00 3.99 -999 3.25 2.00 "1,2,23" +Rodentia Muridae Nesokia indica 143.50 0.57 -999.00 -999.00 -999.00 -999.00 -999 4.09 -999.00 "1,2" +Rodentia Muridae Niviventer niviventer 66.40 -999.00 3.75 -999.00 -999.00 -999.00 -999 -999.00 -999.00 "1,16" +Rodentia Muridae Notomys cervinus 35.00 1.40 3.00 1.09 -999.00 5.30 -999 2.83 -999.00 "1,2,15,23" +Rodentia Muridae Notomys fuscus 35.00 1.14 -999.00 1.00 -999.00 2.70 -999 2.90 -999.00 "1,2,15,23" +Rodentia Muridae Notomys aquilo 39.00 1.75 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 15 +Rodentia Muridae Notomys mitchellii 52.00 1.21 -999.00 1.00 -999.00 2.40 -999 3.27 -999.00 "1,2,15,23" +Rodentia Muridae Notomys alexis 35.00 1.16 2.83 0.98 12.50 2.50 62 3.89 -999.00 "1,2,15,23" +Rodentia Muridae Nyctomys sumichrasti 53.33 1.09 5.20 0.70 40.00 -999.00 62 2.00 -999.00 "1,2,7,29" +Rodentia Muridae Ochrotomys nuttalli 22.00 0.95 2.63 0.63 10.90 -999.00 101 2.55 -999.00 "1,2,7,26,29" +Rodentia Muridae Oecomys concolor 60.67 -999.00 -999.00 -999.00 -999.00 3.00 -999 3.60 4.20 "1,2,4" +Rodentia Muridae Oenomys hypoxanthus 85.50 -999.00 -999.00 1.00 30.00 3.83 -999 3.92 -999.00 "1,2" +Rodentia Muridae Oligoryzomys nigripes 22.65 0.83 3.30 0.49 -999.00 1.93 -999 3.30 -999.00 "1,4" +Rodentia Muridae Oligoryzomys flavescens 21.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.40 -999.00 "1,18" +Rodentia Muridae Oligoryzomys longicaudatus 27.75 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 4 +Rodentia Muridae Ondatra zibethicus 1135.80 0.91 21.92 0.84 152.10 4.96 120 6.28 2.68 "1,2,7,23,29" +Rodentia Muridae Onychomys leucogaster 40.00 1.08 2.65 0.91 13.20 4.06 60 3.63 2.50 "1,2,7,14,13,23,29" +Rodentia Muridae Onychomys torridus 19.00 0.97 2.32 0.69 9.35 2.10 55 3.58 2.60 "1,2,7,13,23" +Rodentia Muridae Oryzomys subflavus 7.50 -999.00 -999.00 1.00 -999.00 -999.00 -999 4.80 -999.00 "1,16" +Rodentia Muridae Oryzomys palustris 47.67 0.80 3.42 0.50 22.25 1.78 -999 3.77 5.50 "1,2,3,11,23" +Rodentia Muridae Oryzomys capito 63.15 0.88 3.85 -999.00 -999.00 1.45 -999 3.33 5.93 "1,2,4,23,27" +Rodentia Muridae Otomys sloggetti 121.00 1.27 11.40 0.60 27.50 2.75 -999 1.44 -999.00 "1,16" +Rodentia Muridae Otomys typus -999.00 -999.00 12.50 -999.00 -999.00 -999.00 -999 1.50 -999.00 1 +Rodentia Muridae Otomys denti -999.00 -999.00 20.00 -999.00 -999.00 -999.00 -999 1.79 -999.00 1 +Rodentia Muridae Otomys angoniensis 150.95 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.92 -999.00 "1,2,11" +Rodentia Muridae Otomys irroratus 146.85 1.30 14.50 0.42 30.00 2.70 22 1.78 4.25 "1,2,11,23" +Rodentia Muridae Ototylomys phyllotis 101.00 1.81 10.20 1.08 -999.00 0.86 -999 2.30 -999.00 "1,2,23,29" +Rodentia Muridae Oxymycterus rufus 85.50 -999.00 -999.00 0.47 -999.00 3.54 -999 3.02 -999.00 "2,4" +Rodentia Muridae Pachyuromys duprasi 32.50 0.71 -999.00 0.97 -999.00 -999.00 53 4.06 -999.00 "1,2,13,29" +Rodentia Muridae Parotomys brantsii 120.00 -999.00 -999.00 -999.00 -999.00 4.07 -999 -999.00 -999.00 23 +Rodentia Muridae Pelomys minor 50.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 "1,18" +Rodentia Muridae Pelomys fallax 118.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.67 -999.00 "1,16" +Rodentia Muridae Peromyscus hooperi 36.00 1.12 2.62 0.76 10.07 2.30 -999 -999.00 -999.00 "1,18" +Rodentia Muridae Peromyscus megalops 71.00 -999.00 3.90 0.74 16.00 1.57 -999 1.80 -999.00 "1,7" +Rodentia Muridae Peromyscus melanocarpus 59.00 1.12 4.50 0.73 -999.00 -999.00 -999 1.90 -999.00 "1,2,11" +Rodentia Muridae Peromyscus mexicanus 60.50 1.09 4.40 -999.00 -999.00 -999.00 -999 2.27 -999.00 "1,3,16" +Rodentia Muridae Peromyscus interparietalis -999.00 -999.00 2.74 0.62 -999.00 -999.00 -999 2.40 -999.00 1 +Rodentia Muridae Peromyscus perfulvus 40.00 1.44 3.00 -999.00 -999.00 -999.00 -999 2.60 -999.00 "1,18" +Rodentia Muridae Peromyscus melanophrys 40.00 0.82 -999.00 1.05 -999.00 -999.00 -999 2.95 -999.00 "1,18" +Rodentia Muridae Peromyscus pectoralis 31.50 0.77 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 26 +Rodentia Muridae Peromyscus gratus 26.90 0.87 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 26 +Rodentia Muridae Peromyscus boylii 28.70 0.82 2.20 0.88 -999.00 1.62 -999 3.19 -999.00 "1,16,23,26,27" +Rodentia Muridae Peromyscus yucatanicus 26.30 1.03 2.50 -999.00 13.10 -999.00 -999 3.50 -999.00 "1,16,29" +Rodentia Muridae Peromyscus gossypinus 29.00 0.83 2.20 0.81 13.69 1.68 -999 3.60 -999.00 "1,7,11,23,27" +Rodentia Muridae Peromyscus difficilis 28.00 -999.00 -999.00 0.87 -999.00 -999.00 -999 3.90 -999.00 "1,16" +Rodentia Muridae Peromyscus attwateri 30.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 26 +Rodentia Muridae Peromyscus nasutus 28.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 5.00 -999.00 26 +Rodentia Muridae Peromyscus sitkensis 28.30 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 2.00 "1,16" +Rodentia Muridae Peromyscus crinitus 16.33 0.82 2.20 0.87 13.87 3.77 -999 3.08 2.05 "1,6,7,14,23,29" +Rodentia Muridae Peromyscus polionotus 14.00 0.79 1.63 0.76 6.77 0.99 -999 3.60 2.70 "1,2,7,23,26,27,29" +Rodentia Muridae Peromyscus truei 27.00 0.99 2.32 0.85 10.50 1.18 -999 3.50 3.40 "1,6,7,11,23,29" +Rodentia Muridae Peromyscus maniculatus 20.50 0.88 1.83 0.84 8.95 2.58 100 4.73 3.40 "1,2,7,8,23" +Rodentia Muridae Peromyscus eremicus 25.00 0.85 2.33 0.82 -999.00 4.23 -999 2.63 3.50 "1,2,11,14,23,29" +Rodentia Muridae Peromyscus leucopus 23.00 0.83 1.89 0.77 9.58 2.33 -999 4.42 3.90 "1,7,8,13,23,27,29" +Rodentia Muridae Peromyscus californicus 42.00 0.97 4.46 0.98 18.65 1.50 -999 2.02 4.56 "1,7,11,23,26,29" +Rodentia Muridae Peromyscus melanotis 39.60 0.84 1.67 -999.00 -999.00 -999.00 -999 4.26 7.50 "1,16" +Rodentia Muridae Petromyscus collinus 21.00 -999.00 2.10 1.05 -999.00 -999.00 -999 2.56 1.00 "1,16" +Rodentia Muridae Phenacomys ungava 27.00 0.75 2.40 0.68 10.00 1.25 48 4.90 -999.00 "7,26" +Rodentia Muridae Phenacomys intermedius 33.00 0.71 2.18 0.63 15.28 1.21 48 4.58 2.30 "1,2,6,11,23" +Rodentia Muridae Phodopus campbelli 23.40 -999.00 -999.00 -999.00 -999.00 1.50 -999 -999.00 3.50 2 +Rodentia Muridae Phodopus sungorus 23.40 0.65 1.77 0.65 14.80 3.95 38 5.00 3.50 "1,2,11,13" +Rodentia Muridae Phodopus roborovskii -999.00 0.70 1.45 0.63 18.10 8.00 -999 6.00 3.50 "1,2,11" +Rodentia Muridae Phyllotis darwini 50.83 1.12 -999.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 "1,16" +Rodentia Muridae Pithecheir parvus 104.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,16" +Rodentia Muridae Podomys floridanus 31.25 0.77 2.40 0.84 11.50 -999.00 89 2.74 -999.00 "1,2,7,26" +Rodentia Muridae Pogonomelomys sevia 60.90 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Rodentia Muridae Pogonomys sylvestris 39.10 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.67 -999.00 "2,16" +Rodentia Muridae Pogonomys loriae 95.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.67 -999.00 2 +Rodentia Muridae Pogonomys macrourus 45.10 -999.00 -999.00 -999.00 -999.00 -999.00 29 2.33 -999.00 "2,16" +Rodentia Muridae Praomys jacksoni 40.00 1.18 -999.00 1.00 20.00 2.37 -999 3.20 -999.00 "1,16,23,25,27" +Rodentia Muridae Praomys morio 21.00 1.04 2.70 0.94 -999.00 3.04 -999 3.33 -999.00 "1,16,23,25" +Rodentia Muridae Praomys tullbergi 36.97 0.80 2.70 0.82 10.50 2.69 62 3.50 -999.00 "1,2,16" +Rodentia Muridae Praomys delectorum 27.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 6.00 -999.00 "1,16" +Rodentia Muridae Psammomys obesus 177.33 0.88 6.25 0.89 40.00 5.49 -999 3.53 -999.00 "1,13,23,27,29" +Rodentia Muridae Pseudomys fuscus 148.00 1.28 7.25 1.29 -999.00 -999.00 -999 1.78 -999.00 "1,2,15" +Rodentia Muridae Pseudomys oralis 95.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 15 +Rodentia Muridae Pseudomys hermannsburgensis 12.00 1.06 -999.00 1.00 -999.00 2.51 -999 2.75 -999.00 "1,15,23" +Rodentia Muridae Pseudomys pilligaensis 11.00 0.93 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 15 +Rodentia Muridae Pseudomys delicatulus 11.00 0.99 1.00 1.00 -999.00 -999.00 -999 3.00 -999.00 "1,15" +Rodentia Muridae Pseudomys gracilicaudatus 63.00 0.90 4.35 0.94 24.00 -999.00 -999 3.00 -999.00 "1,15" +Rodentia Muridae Pseudomys desertor 25.00 0.98 -999.00 0.84 -999.00 2.50 -999 3.00 -999.00 "1,15,23" +Rodentia Muridae Pseudomys nanus 34.00 0.80 -999.00 0.77 -999.00 3.33 -999 3.00 -999.00 "1,15" +Rodentia Muridae Pseudomys australis 65.00 1.02 4.00 0.87 12.50 3.59 67 3.15 -999.00 "1,2,15,23" +Rodentia Muridae Pseudomys fieldi 45.00 0.82 -999.00 1.00 -999.00 -999.00 -999 3.50 -999.00 15 +Rodentia Muridae Pseudomys praeconis 45.00 1.00 -999.00 1.00 -999.00 -999.00 -999 3.50 -999.00 "1,16" +Rodentia Muridae Pseudomys shortridgei 64.00 -999.00 -999.00 -999.00 -999.00 11.00 -999 3.00 1.00 "1,15,23" +Rodentia Muridae Pseudomys albocinereus 26.00 1.27 -999.00 1.00 -999.00 2.50 -999 4.27 1.00 "1,15" +Rodentia Muridae Pseudomys higginsi 60.10 1.07 5.00 0.98 -999.00 9.00 48 3.20 1.50 "1,11,15" +Rodentia Muridae Pseudomys fumeus 70.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.50 1.50 15 +Rodentia Muridae Pseudomys apodemoides 20.00 1.48 -999.00 1.17 11.00 -999.00 -999 4.50 3.00 "1,16" +Rodentia Muridae Pseudomys novaehollandiae 18.00 1.06 1.80 0.91 -999.00 3.01 -999 3.67 3.50 "1,2,15,23" +Rodentia Muridae Rattus colletti 61.00 -999.00 -999.00 -999.00 -999.00 2.00 -999 -999.00 -999.00 23 +Rodentia Muridae Rattus villosissimus 200.00 -999.00 -999.00 -999.00 -999.00 2.33 -999 -999.00 -999.00 23 +Rodentia Muridae Rattus tiomanicus 127.50 0.77 4.10 -999.00 -999.00 -999.00 -999 3.35 -999.00 "1,16" +Rodentia Muridae Rattus leucopus 124.00 0.75 -999.00 0.83 -999.00 3.69 -999 3.50 -999.00 "1,15" +Rodentia Muridae Rattus steini 155.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 "1,16" +Rodentia Muridae Rattus praetor 139.35 -999.00 -999.00 -999.00 -999.00 -999.00 -999 5.00 -999.00 "1,16" +Rodentia Muridae Rattus tunneyi 113.50 0.72 -999.00 0.75 -999.00 1.24 -999 5.75 -999.00 "1,15,23" +Rodentia Muridae Rattus sordidus 125.00 0.72 3.00 -999.00 -999.00 2.07 -999 6.00 -999.00 "1,16,23" +Rodentia Muridae Rattus argentiventer 202.00 0.71 -999.00 -999.00 -999.00 1.60 -999 6.94 -999.00 "1,16" +Rodentia Muridae Rattus lutreolus 115.00 0.88 4.87 0.83 25.00 2.60 29 4.91 2.53 "1,11,23" +Rodentia Muridae Rattus fuscipes 133.00 0.86 4.50 0.97 21.28 3.51 -999 4.08 3.30 "1,11,13,15,23" +Rodentia Muridae Rattus exulans 70.00 0.73 2.62 0.78 22.76 4.08 -999 3.63 3.37 "1,2,7,23,27" +Rodentia Muridae Rattus norvegicus 280.00 0.71 5.81 0.82 63.75 2.22 -999 8.72 3.68 "1,2,23,29" +Rodentia Muridae Rattus rattus 246.50 0.74 4.55 0.86 39.68 3.82 50 5.95 4.28 "1,2,15,23" +Rodentia Muridae Reithrodon auritus 72.17 -999.00 -999.00 -999.00 -999.00 2.00 -999 4.53 -999.00 11 +Rodentia Muridae Reithrodontomys humulis 10.30 0.75 1.09 0.76 -999.00 3.44 27 2.90 -999.00 "1,11,23,26" +Rodentia Muridae Reithrodontomys megalotis 11.03 0.76 1.33 0.70 -999.00 3.53 -999 3.32 -999.00 "1,2,11,14,16,23,29" +Rodentia Muridae Reithrodontomys montanus 9.00 0.74 1.04 0.49 5.40 2.46 -999 4.14 -999.00 "1,11,14,16,23,29" +Rodentia Muridae Reithrodontomys raviventris 11.05 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.85 1.00 "1,11,13" +Rodentia Muridae Reithrodontomys fulvescens 12.50 -999.00 1.08 0.48 3.25 -999.00 -999 3.10 2.00 "1,11,26" +Rodentia Muridae Rhabdomys pumilio 51.00 0.83 2.67 0.49 8.45 1.78 35 6.56 4.00 "1,2,23" +Rodentia Muridae Rhipidomys latimanus 57.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "3,16" +Rodentia Muridae Rhipidomys mastacalis 75.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.80 3.50 "3,16" +Rodentia Muridae Rhizomys sumatrensis 3000.00 -999.00 -999.00 3.00 -999.00 -999.00 -999 -999.00 -999.00 "1,16" +Rodentia Muridae Rhizomys pruinosus 2450.00 -999.00 -999.00 4.00 -999.00 -999.00 -999 -999.00 -999.00 "1,16" +Rodentia Muridae Rhombomys opimus 143.00 0.92 4.75 0.73 -999.00 3.50 48 5.76 2.50 "1,2,16" +Rodentia Muridae Saccostomus campestris 47.38 0.69 2.60 1.00 -999.00 2.17 33 6.99 -999.00 "1,2,16" +Rodentia Muridae Scotinomys teguina 12.00 1.01 1.35 0.68 -999.00 1.13 -999 2.79 -999.00 "1,2,23,29" +Rodentia Muridae Scotinomys xerampelinus 15.00 1.09 1.35 0.79 -999.00 1.73 -999 3.03 -999.00 "1,2,23,29" +Rodentia Muridae Sekeetamys calurus 38.50 -999.00 -999.00 -999.00 -999.00 -999.00 65 2.85 -999.00 "1,2,13" +Rodentia Muridae Sigmodon leucotis 135.50 1.17 -999.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 "1,11" +Rodentia Muridae Sigmodon ochrognathus 113.67 1.15 5.55 0.50 35.55 1.36 -999 3.75 -999.00 "1,11,14,26" +Rodentia Muridae Sigmodon fulviventer 211.00 1.17 -999.00 -999.00 -999.00 1.50 -999 5.00 -999.00 26 +Rodentia Muridae Sigmodon hispidus 185.00 0.89 6.69 0.49 23.56 1.31 62 5.58 2.00 "1,2,7,13,23,26" +Rodentia Muridae Sigmodon alstoni 55.70 -999.00 -999.00 -999.00 -999.00 2.00 -999 5.00 5.00 "1,3,16" +Rodentia Muridae Spalax microphthalmus -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.61 1.00 1 +Rodentia Muridae Steatomys krebsii 24.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.40 -999.00 "1,16" +Rodentia Muridae Steatomys pratensis 25.53 -999.00 1.55 -999.00 -999.00 -999.00 -999 4.67 -999.00 "1,16" +Rodentia Muridae Stochomys longicaudatus 74.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 "1,2" +Rodentia Muridae Sundamys muelleri 334.00 -999.00 -999.00 -999.00 -999.00 -999.00 24 3.80 -999.00 "2,16" +Rodentia Muridae Synaptomys cooperi 37.05 0.77 3.46 0.75 20.00 -999.00 30 3.34 2.50 "1,11,13" +Rodentia Muridae Synaptomys borealis 21.30 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.40 2.50 "1,16,26" +Rodentia Muridae Tachyoryctes ruandae -999.00 1.58 14.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 29 +Rodentia Muridae Tachyoryctes splendens 207.50 1.36 20.00 1.30 -999.00 4.99 37 1.44 2.07 "1,2,8,23,25,27" +Rodentia Muridae Tateomys rhinogradoides 84.00 -999.00 -999.00 -999.00 82.80 -999.00 -999 -999.00 -999.00 "1,2" +Rodentia Muridae Tatera inclusa 131.00 0.77 -999.00 0.73 -999.00 3.40 -999 -999.00 -999.00 "1,16" +Rodentia Muridae Tatera leucogaster 64.86 -999.00 2.80 0.93 19.00 -999.00 -999 4.54 -999.00 "1,2,16" +Rodentia Muridae Tatera robusta 93.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 5.15 -999.00 "1,16" +Rodentia Muridae Tatera valida 113.00 -999.00 -999.00 -999.00 30.00 3.25 -999 4.33 2.00 "1,16" +Rodentia Muridae Tatera brantsii 75.00 0.75 5.13 0.83 45.00 5.50 -999 2.83 4.00 "1,2,7" +Rodentia Muridae Tatera indica 146.67 0.87 3.00 0.79 -999.00 2.86 84 5.42 4.17 "1,2,13,23,29" +Rodentia Muridae Tatera nigricauda 114.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 5.00 "1,16" +Rodentia Muridae Tatera afra 74.80 0.75 4.50 -999.00 -999.00 5.00 -999 -999.00 6.50 "1,2,16" +Rodentia Muridae Taterillus emini -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.50 -999.00 1 +Rodentia Muridae Taterillus pygargus 48.10 0.88 -999.00 0.75 -999.00 3.00 -999 4.00 -999.00 "1,16" +Rodentia Muridae Taterillus gracilis 51.85 0.87 -999.00 -999.00 -999.00 3.00 -999 4.50 -999.00 "1,16" +Rodentia Muridae Thallomys paedulcus 77.43 -999.00 2.65 0.98 -999.00 3.57 -999 3.00 -999.00 "1,16,23" +Rodentia Muridae Thamnomys venustus 65.00 0.80 -999.00 0.80 -999.00 2.74 -999 -999.00 -999.00 "23,25" +Rodentia Muridae Tylomys nudicaudus 280.00 1.32 16.77 0.87 40.00 3.15 65 2.36 -999.00 "1,2,29" +Rodentia Muridae Uranomys ruddi 47.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.58 -999.00 "1,2" +Rodentia Muridae Uromys caudimaculatus 625.00 1.29 20.00 1.33 -999.00 6.00 -999 2.06 -999.00 "1,2,15" +Rodentia Muridae Vandeleuria nolthenii 56.60 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 "1,16" +Rodentia Muridae Wiedomys pyrrhorhinos 47.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.80 -999.00 "1,18" +Rodentia Muridae Zelotomys woosnami 54.50 1.03 -999.00 -999.00 -999.00 -999.00 -999 4.68 -999.00 "1,2,16" +Rodentia Muridae Zygodontomys brevicauda 58.00 0.87 3.64 0.48 22.00 1.44 -999 4.32 5.50 "1,2,16,23" +Rodentia Muridae Zyzomys maini 94.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 15 +Rodentia Muridae Zyzomys argurus 50.00 1.00 -999.00 1.17 14.00 -999.00 -999 2.50 -999.00 "1,2,15" +Rodentia Muridae Zyzomys woodwardi 130.00 -999.00 -999.00 1.17 -999.00 -999.00 -999 -999.00 0.75 "1,2" +Rodentia Myocastoridae Myocastor coypus 7150.00 4.43 196.36 1.90 1533.33 5.25 79 4.88 2.32 "1,2,4,8,23,29" +Rodentia Myoxidae Dryomys laniger -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 1.00 1 +Rodentia Myoxidae Dryomys nitedula 25.00 0.81 1.60 1.00 -999.00 -999.00 48 3.33 1.21 "1,13,29" +Rodentia Myoxidae Eliomys quercinus 115.00 0.74 -999.00 1.00 -999.00 18.00 60 4.89 1.21 "1,13,29" +Rodentia Myoxidae Glirulus japonicus 27.00 1.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 1.50 "1,2" +Rodentia Myoxidae Graphiurus crassicaudatus -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 1 +Rodentia Myoxidae Graphiurus murinus 24.00 0.80 3.50 -999.00 -999.00 -999.00 69 3.00 2.00 "1,2" +Rodentia Myoxidae Graphiurus ocularis 68.80 -999.00 -999.00 -999.00 25.60 -999.00 -999 5.00 4.00 "1,2,16" +Rodentia Myoxidae Muscardinus avellanarius 27.33 0.79 0.80 1.27 -999.00 16.50 72 4.33 1.50 "1,2,23,29" +Rodentia Myoxidae Myoxus glis 125.00 0.94 1.50 1.07 -999.00 10.60 104 4.73 1.19 "1,2,13,23,29" +Rodentia Octodontidae Octodon degus 235.00 2.96 14.10 1.19 71.20 10.90 85 5.28 1.75 "1,2,4,11,23,29" +Rodentia Octodontidae Octodontomys gliroides 158.00 3.39 16.67 1.38 -999.00 -999.00 88 2.03 -999.00 "1,2,4,29" +Rodentia Octodontidae Spalacopus cyanus 98.05 -999.00 -999.00 -999.00 -999.00 -999.00 70 2.35 1.75 "2,4,11" +Rodentia Pedetidae Pedetes capensis 3500.00 2.53 264.50 1.64 1300.00 34.00 228 1.00 3.60 "1,2,13" +Rodentia Petromuridae Petromus typicus 200.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.88 1.00 "1,2" +Rodentia Sciuridae Ammospermophilus harrisii 126.00 0.97 3.80 1.69 45.00 10.50 -999 6.75 1.00 "1,2,7,11,26" +Rodentia Sciuridae Ammospermophilus nelsoni 154.50 0.87 4.88 -999.00 41.00 -999.00 68 8.00 1.00 "1,11" +Rodentia Sciuridae Ammospermophilus interpres 110.20 -999.00 -999.00 -999.00 27.50 -999.00 -999 9.50 1.00 "1,11" +Rodentia Sciuridae Ammospermophilus leucurus 97.50 1.04 3.36 2.20 60.00 12.00 70 8.61 1.33 "1,2,6,7,14" +Rodentia Sciuridae Callosciurus prevostii 400.00 1.57 16.35 -999.00 -999.00 -999.00 -999 1.80 -999.00 "1,2" +Rodentia Sciuridae Callosciurus caniceps 30.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.20 -999.00 "1,16" +Rodentia Sciuridae Callosciurus nigrovittatus 202.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.20 -999.00 "1,16" +Rodentia Sciuridae Callosciurus notatus 190.00 -999.00 -999.00 -999.00 -999.00 -999.00 115 3.07 -999.00 "1,13,16" +Rodentia Sciuridae Cynomys ludovicianus 863.00 1.11 15.38 1.89 140.57 26.24 102 4.00 1.00 "1,2,7,13,23,26,29" +Rodentia Sciuridae Cynomys gunnisoni 816.67 1.00 -999.00 1.50 -999.00 11.59 -999 4.27 1.00 "1,2,11,23" +Rodentia Sciuridae Cynomys parvidens 516.00 -999.00 -999.00 -999.00 -999.00 12.00 -999 4.95 1.00 "1,18,26" +Rodentia Sciuridae Cynomys leucurus 873.50 1.00 -999.00 -999.00 -999.00 23.75 -999 5.67 1.00 "1,2,11,16,23" +Rodentia Sciuridae Cynomys mexicanus 828.10 -999.00 -999.00 1.52 -999.00 -999.00 -999 6.00 1.00 "1,2,11" +Rodentia Sciuridae Dremomys lokriah 172.50 -999.00 -999.00 -999.00 -999.00 -999.00 85 3.50 -999.00 "1,2,16" +Rodentia Sciuridae Epixerus ebii 388.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,16" +Rodentia Sciuridae Exilisciurus exilis 14.60 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 "1,16" +Rodentia Sciuridae Funambulus sublineatus -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 1 +Rodentia Sciuridae Funambulus palmarum -999.00 1.13 -999.00 -999.00 -999.00 -999.00 -999 2.58 -999.00 1 +Rodentia Sciuridae Funambulus pennantii 147.65 1.33 -999.00 2.00 -999.00 7.68 -999 3.50 2.67 "1,2,16,23" +Rodentia Sciuridae Funisciurus anerythrus 218.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 "1,16" +Rodentia Sciuridae Funisciurus lemniscatus 141.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.80 -999.00 "1,16" +Rodentia Sciuridae Funisciurus pyrropus 271.67 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.80 -999.00 "1,16" +Rodentia Sciuridae Funisciurus congicus 106.00 1.73 9.96 1.67 -999.00 -999.00 114 2.00 2.00 "1,2,16" +Rodentia Sciuridae Glaucomys sabrinus 132.17 1.32 5.62 2.12 33.87 7.83 156 3.33 1.00 "1,5,7,13,23,26,29" +Rodentia Sciuridae Glaucomys volans 65.38 1.32 3.49 1.75 44.60 10.84 170 3.17 1.33 "1,2,11,23,26,29" +Rodentia Sciuridae Heliosciurus rufobrachium 326.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.80 -999.00 "1,2" +Rodentia Sciuridae Hylopetes alboniger 240.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.33 -999.00 "1,16" +Rodentia Sciuridae Hylopetes fimbriatus 510.00 -999.00 -999.00 2.50 -999.00 -999.00 -999 3.40 2.00 "1,13,16" +Rodentia Sciuridae Iomys horsfieldi 120.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.38 -999.00 "1,2,16" +Rodentia Sciuridae Marmota menzbieri -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 1 +Rodentia Sciuridae Marmota camtschatica -999.00 -999.00 33.00 -999.00 -999.00 36.00 -999 5.50 -999.00 "1,13" +Rodentia Sciuridae Marmota vancouverensis 4750.00 1.00 -999.00 -999.00 -999.00 39.00 -999 3.33 0.50 "1,11,26" +Rodentia Sciuridae Marmota olympus 6300.00 1.00 -999.00 -999.00 -999.00 32.00 -999 4.00 0.50 "2,13,18,26" +Rodentia Sciuridae Marmota caligata 6343.33 0.94 -999.00 0.92 -999.00 29.85 -999 4.20 0.50 "1,2,13,16,23" +Rodentia Sciuridae Marmota bobak -999.00 1.35 35.50 -999.00 -999.00 36.00 180 4.83 0.83 "1,13" +Rodentia Sciuridae Marmota flaviventris 2930.00 1.00 33.80 0.89 478.83 26.83 -999 4.40 0.94 "1,2,8,11,23" +Rodentia Sciuridae Marmota broweri 3180.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 1.00 26 +Rodentia Sciuridae Marmota marmota 2010.00 1.17 29.67 1.77 -999.00 30.00 180 4.38 1.00 "1,2,13,16" +Rodentia Sciuridae Marmota sibirica 8000.00 1.37 -999.00 -999.00 -999.00 -999.00 -999 4.50 1.00 "1,16" +Rodentia Sciuridae Marmota monax 3413.00 1.09 27.43 1.57 248.00 17.81 116 4.50 1.00 "1,11,23,26,29" +Rodentia Sciuridae Marmota caudata 4100.00 1.00 -999.00 -999.00 -999.00 -999.00 -999 4.73 1.00 "1,16" +Rodentia Sciuridae Marmota baibacina -999.00 1.33 -999.00 -999.00 -999.00 -999.00 -999 6.00 1.00 1 +Rodentia Sciuridae Myosciurus pumilio 16.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,2" +Rodentia Sciuridae Paraxerus flavovittis -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.33 -999.00 1 +Rodentia Sciuridae Paraxerus poensis 134.00 -999.00 9.91 -999.00 -999.00 4.20 -999 1.43 -999.00 "1,2,16" +Rodentia Sciuridae Paraxerus ochraceus -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 2 +Rodentia Sciuridae Paraxerus palliatus 295.00 2.05 15.21 -999.00 -999.00 -999.00 -999 1.58 1.00 "1,16" +Rodentia Sciuridae Paraxerus cepapi 216.00 1.88 12.88 1.33 -999.00 6.09 -999 1.97 2.00 "1,2,23" +Rodentia Sciuridae Petaurista leucogenys -999.00 -999.00 5.00 -999.00 -999.00 -999.00 -999 -999.00 -999.00 1 +Rodentia Sciuridae Petaurista elegans 1273.33 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,16" +Rodentia Sciuridae Petaurista magnificus 1780.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "2,16" +Rodentia Sciuridae Petaurista philippensis -999.00 1.50 56.00 3.00 -999.00 -999.00 -999 1.00 -999.00 2 +Rodentia Sciuridae Petaurista petaurista 1330.00 -999.00 -999.00 2.25 -999.00 -999.00 192 2.00 -999.00 "1,13,16" +Rodentia Sciuridae Petinomys genibarbis 110.00 1.77 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 2 +Rodentia Sciuridae Petinomys setosus 42.25 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 2 +Rodentia Sciuridae Petinomys vordermanni 37.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 2 +Rodentia Sciuridae Petinomys fuscocapillus 712.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,16" +Rodentia Sciuridae Pteromys volans 130.00 1.00 -999.00 1.50 -999.00 -999.00 -999 2.60 1.50 "1,2" +Rodentia Sciuridae Ratufa indica 1060.00 2.75 -999.00 -999.00 -999.00 -999.00 240 1.00 -999.00 "1,2,16" +Rodentia Sciuridae Ratufa macroura 1280.00 0.93 -999.00 2.25 -999.00 24.00 -999 3.33 1.50 "1,2,16" +Rodentia Sciuridae Ratufa bicolor 2150.00 1.05 77.00 -999.00 -999.00 35.45 -999 1.80 2.00 "1,16,23" +Rodentia Sciuridae Rhinosciurus laticaudatus 221.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.43 -999.00 "1,2" +Rodentia Sciuridae Sciurillus pusillus 39.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "3,18" +Rodentia Sciuridae Sciurus aureogaster 595.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "1,16" +Rodentia Sciuridae Sciurus yucatanensis 225.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 "1,18" +Rodentia Sciuridae Sciurus alleni 461.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 "1,11" +Rodentia Sciuridae Sciurus arizonensis 760.50 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.05 1.00 "11,14" +Rodentia Sciuridae Sciurus griseus 751.67 1.44 -999.00 2.00 -999.00 10.50 120 3.70 1.11 "1,6,11,26" +Rodentia Sciuridae Sciurus aberti 702.50 1.43 12.00 2.50 355.00 10.75 -999 3.52 1.50 "1,5,23,26" +Rodentia Sciuridae Sciurus niger 803.70 1.49 15.44 2.50 -999.00 11.81 -999 2.71 1.64 "1,6,11,23,29" +Rodentia Sciuridae Sciurus carolinensis 540.33 1.43 15.15 2.14 165.00 10.48 283 3.46 1.83 "1,2,8,13,14,23,26,29" +Rodentia Sciuridae Sciurus granatensis 374.00 -999.00 9.50 2.00 -999.00 -999.00 84 1.93 1.95 "1,2,5,11" +Rodentia Sciuridae Sciurus vulgaris 324.75 1.25 9.57 2.15 -999.00 9.52 144 5.10 2.22 "1,2,13,16,23,29" +Rodentia Sciuridae Spermophilopsis leptodactylus -999.00 1.50 -999.00 -999.00 -999.00 -999.00 -999 4.42 1.00 1 +Rodentia Sciuridae Spermophilus relictus 600.00 -999.00 -999.00 -999.00 -999.00 12.00 -999 -999.00 -999.00 23 +Rodentia Sciuridae Spermophilus parryii 751.00 0.83 -999.00 -999.00 -999.00 11.34 -999 6.30 -999.00 "1,16,23,26" +Rodentia Sciuridae Spermophilus mohavensis 190.00 0.92 4.50 1.20 30.00 -999.00 -999 6.80 -999.00 "1,7,11" +Rodentia Sciuridae Spermophilus dauricus 200.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 0.91 "1,8" +Rodentia Sciuridae Spermophilus lateralis 157.60 1.00 6.26 1.22 74.16 20.94 84 5.12 0.94 "1,5,6,7,8,11,23" +Rodentia Sciuridae Spermophilus beldingi 278.50 0.87 6.94 0.86 60.50 11.64 132 5.23 0.94 "1,2,6,8,23,26" +Rodentia Sciuridae Spermophilus armatus 308.00 0.79 -999.00 0.70 102.25 11.37 -999 5.73 0.96 "1,8,23,26" +Rodentia Sciuridae Spermophilus canus -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 1.00 26 +Rodentia Sciuridae Spermophilus erythrogenys -999.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 1.00 1 +Rodentia Sciuridae Spermophilus pygmaeus 136.00 0.88 -999.00 -999.00 -999.00 -999.00 -999 -999.00 1.00 "1,16" +Rodentia Sciuridae Spermophilus major -999.00 -999.00 -999.00 -999.00 200.00 -999.00 -999 -999.00 1.00 1 +Rodentia Sciuridae Spermophilus mollis 165.40 0.78 3.95 1.13 -999.00 12.00 -999 -999.00 1.00 "6,26" +Rodentia Sciuridae Spermophilus nayaritensis 707.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 1.00 26 +Rodentia Sciuridae Spermophilus columbianus 466.33 0.84 9.37 0.96 98.62 17.63 -999 3.43 1.00 "1,2,5,6,7,11,23,26,29" +Rodentia Sciuridae Spermophilus saturatus 275.00 0.93 5.97 1.43 113.47 12.00 48 4.16 1.00 "1,11" +Rodentia Sciuridae Spermophilus undulatus 840.00 0.92 11.08 -999.00 109.90 -999.00 -999 4.27 1.00 "1,16" +Rodentia Sciuridae Spermophilus mexicanus 130.95 0.97 4.10 3.00 -999.00 12.00 -999 5.00 1.00 "1,11,26" +Rodentia Sciuridae Spermophilus elegans 401.05 0.80 6.02 1.25 80.00 -999.00 -999 5.35 1.00 "1,6,11,26" +Rodentia Sciuridae Spermophilus tereticaudus 163.33 0.93 3.90 1.28 75.00 10.69 -999 5.40 1.00 "1,2,7,11,23,26" +Rodentia Sciuridae Spermophilus brunneus 205.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 5.50 1.00 26 +Rodentia Sciuridae Spermophilus beecheyi 609.33 0.97 10.00 1.35 89.00 11.60 -999 5.66 1.00 "1,6,7,23,26" +Rodentia Sciuridae Spermophilus fulvus 596.00 1.00 -999.00 -999.00 -999.00 -999.00 -999 6.00 1.00 "1,16" +Rodentia Sciuridae Spermophilus suslicus -999.00 0.80 -999.00 1.13 -999.00 12.00 -999 6.00 1.00 "1,13" +Rodentia Sciuridae Spermophilus richardsonii 342.50 0.78 6.35 1.17 92.75 11.26 72 6.06 1.00 "1,2,5,7,11,23" +Rodentia Sciuridae Spermophilus franklinii 459.00 0.92 -999.00 1.39 -999.00 10.74 -999 7.52 1.00 "1,2,13,16,23,26" +Rodentia Sciuridae Spermophilus townsendii 155.00 0.80 3.61 0.92 42.16 11.69 -999 7.92 1.00 "1,5,11,23" +Rodentia Sciuridae Spermophilus washingtoni 203.00 -999.00 -999.00 1.00 33.00 12.00 -999 9.00 1.00 "1,6,26" +Rodentia Sciuridae Spermophilus tridecemlineatus 172.67 0.92 3.24 1.07 16.00 11.63 -999 7.02 1.17 "1,7,13,23,29" +Rodentia Sciuridae Spermophilus citellus 217.00 0.89 -999.00 1.13 -999.00 10.33 -999 6.00 1.33 "1,13,16,29" +Rodentia Sciuridae Spermophilus variegatus 663.03 1.00 7.80 1.75 100.00 -999.00 -999 4.27 1.50 "1,5,11" +Rodentia Sciuridae Spermophilus spilosoma 119.50 0.93 -999.00 -999.00 45.00 12.00 -999 5.92 1.75 "1,16,29" +Rodentia Sciuridae Sundasciurus lowii 67.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.50 -999.00 2 +Rodentia Sciuridae Sundasciurus tenuis 75.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.00 -999.00 "1,2" +Rodentia Sciuridae Tamias ochrogenys 94.10 -999.00 -999.00 -999.00 -999.00 -999.00 -999 3.50 -999.00 26 +Rodentia Sciuridae Tamias palmeri 59.70 1.10 -999.00 1.50 22.70 -999.00 -999 3.68 -999.00 "1,11,26" +Rodentia Sciuridae Tamias siskiyou 75.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 5.00 -999.00 26 +Rodentia Sciuridae Tamias canipes 70.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 1.00 26 +Rodentia Sciuridae Tamias sonomae 75.00 -999.00 -999.00 0.75 -999.00 -999.00 -999 4.00 1.00 "11,18" +Rodentia Sciuridae Tamias ruficaudus 57.29 1.03 -999.00 -999.00 -999.00 12.00 96 4.06 1.00 "1,2,11,26,29" +Rodentia Sciuridae Tamias panamintinus 54.15 1.20 4.00 1.38 19.20 -999.00 -999 4.10 1.00 "1,11,26" +Rodentia Sciuridae Tamias speciosus 60.00 -999.00 -999.00 -999.00 -999.00 12.00 -999 4.15 1.00 "1,11,23" +Rodentia Sciuridae Tamias townsendii 84.00 0.93 3.55 1.64 34.50 11.62 123 4.33 1.00 "1,2,6,7,11,23" +Rodentia Sciuridae Tamias senex 94.81 0.93 -999.00 -999.00 -999.00 -999.00 -999 4.50 1.00 "6,26" +Rodentia Sciuridae Tamias minimus 44.15 0.97 2.30 1.46 -999.00 -999.00 -999 4.94 1.00 "1,16,26" +Rodentia Sciuridae Tamias cinereicollis 62.10 1.00 -999.00 1.33 -999.00 -999.00 -999 4.95 1.00 "1,11,14,26" +Rodentia Sciuridae Tamias quadrimaculatus 88.45 1.03 -999.00 -999.00 -999.00 11.14 -999 5.10 1.00 "1,11,23" +Rodentia Sciuridae Tamias amoenus 48.25 0.98 2.62 1.45 19.00 11.73 62 5.19 1.00 "1,6,7,23,26,29" +Rodentia Sciuridae Tamias sibiricus 85.00 1.14 4.00 1.30 -999.00 11.50 -999 4.85 1.14 "1,2,13" +Rodentia Sciuridae Tamias quadrivittatus 58.13 1.05 2.60 -999.00 -999.00 11.00 -999 4.42 1.50 "1,11" +Rodentia Sciuridae Tamias dorsalis 62.80 0.99 -999.00 -999.00 -999.00 -999.00 -999 5.16 1.50 "1,11" +Rodentia Sciuridae Tamias striatus 95.70 1.03 3.50 1.17 39.55 5.00 96 4.22 1.53 "1,2,8,13,23,29" +Rodentia Sciuridae Tamiasciurus douglasii 229.80 1.29 5.00 -999.00 -999.00 4.00 -999 9.78 1.50 "1,6,11" +Rodentia Sciuridae Tamiasciurus hudsonicus 194.50 1.22 7.00 2.06 83.75 11.24 120 4.20 1.67 "1,5,7,8,13,23,29" +Rodentia Sciuridae Trogopterus xanthipes -999.00 2.71 -999.00 3.50 -999.00 22.00 144 1.55 -999.00 "1,2" +Rodentia Sciuridae Xerus erythropus 502.00 -999.00 -999.00 1.75 -999.00 6.00 72 3.75 -999.00 "1,2,13,16" +Rodentia Sciuridae Xerus inauris 588.00 1.54 20.00 1.73 -999.00 11.32 72 2.18 1.00 "1,2,16,23" +Rodentia Thryonomyidae Thryonomys gregorianus 1880.00 3.00 -999.00 -999.00 -999.00 -999.00 -999 -999.00 2.00 "1,16" +Rodentia Thryonomyidae Thryonomys swinderianus 3687.50 3.56 105.00 1.00 -999.00 10.94 52 3.83 2.33 "1,2,16,23,29" +Scandentia Tupaiidae Tupaia montana 283.00 1.65 11.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 "1,2,16" +Scandentia Tupaiidae Tupaia minor 700.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.98 -999.00 "1,16" +Scandentia Tupaiidae Tupaia tana 797.00 -999.00 -999.00 1.02 -999.00 -999.00 -999 2.17 -999.00 "1,16" +Scandentia Tupaiidae Tupaia glis 159.00 1.52 12.94 1.17 100.00 4.53 149 2.44 -999.00 "1,2,23" +Scandentia Tupaiidae Tupaia belangeri -999.00 1.50 10.00 1.17 -999.00 -999.00 -999 2.00 7.50 29 +Scandentia Tupaiidae Urogale everetti 350.00 1.85 19.98 1.25 104.40 -999.00 138 1.63 -999.00 "1,2" +Scandentia Tupaiidae Ptilocercus lowii 42.50 -999.00 10.00 -999.00 -999.00 -999.00 32 2.00 -999.00 "2,13" +Sirenia Dugongidae Dugong dugon 479500.00 12.21 27500.00 18.00 -999.00 112.93 876 1.00 0.22 "1,2,11,15,23,25" +Sirenia Dugongidae Hydrodamalis gigas 4000000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Sirenia Trichechidae Trichechus senegalensis 500000.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2" +Sirenia Trichechidae Trichechus manatus 387500.00 9.94 28633.33 18.00 -999.00 49.31 528 1.00 0.37 "1,2,11,23,29" +Sirenia Trichechidae Trichechus inunguis 480000.00 10.25 12500.00 24.00 67500.00 36.00 150 1.00 0.50 "1,2,11" +Tubulidentata Orycteropodidae Orycteropus afer 60000.00 7.08 1734.00 3.37 6250.00 26.00 288 1.03 1.00 "1,2,29" +Xenarthra Bradypodidae Bradypus torquatus 3900.00 -999.00 -999.00 -999.00 -999.00 -999.00 144 1.00 -999.00 "2,13,16" +Xenarthra Bradypodidae Bradypus variegatus 4860.00 5.37 290.00 1.05 -999.00 37.42 -999 1.00 1.00 "1,2,3,4,16,23,29" +Xenarthra Bradypodidae Bradypus tridactylus 3770.00 4.63 -999.00 1.25 -999.00 3.53 480 1.00 1.00 "1,13,16,17" +Xenarthra Dasypodidae Cabassous centralis 2750.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.00 -999.00 "1,2,3" +Xenarthra Dasypodidae Chaetophractus nationi 2150.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 1.50 -999.00 "4,16" +Xenarthra Dasypodidae Chaetophractus villosus 2020.00 2.18 131.40 1.83 -999.00 9.00 282 1.65 1.00 "1,2,4" +Xenarthra Dasypodidae Dasypus kappleri 10150.00 -999.00 -999.00 -999.00 -999.00 -999.00 -999 2.00 -999.00 "3,16" +Xenarthra Dasypodidae Dasypus sabanicola 1150.00 3.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 "1,3,18" +Xenarthra Dasypodidae Dasypus hybridus 1500.00 4.00 -999.00 -999.00 -999.00 -999.00 -999 4.00 -999.00 "1,16" +Xenarthra Dasypodidae Dasypus septemcinctus 1475.00 4.34 -999.00 -999.00 -999.00 9.00 -999 6.00 -999.00 "1,13,16" +Xenarthra Dasypodidae Dasypus novemcinctus 4300.00 4.36 66.33 4.50 -999.00 13.33 268 4.00 1.00 "1,2,3,11,13,17,23,26,29" +Xenarthra Dasypodidae Euphractus sexcinctus 4600.00 2.09 105.00 1.02 420.00 9.00 226 1.75 -999.00 "1,2,3,4,11,17,29" +Xenarthra Dasypodidae Priodontes maximus 50000.00 4.00 113.00 1.25 -999.00 10.50 156 1.50 -999.00 "1,2,4,16" +Xenarthra Dasypodidae Tolypeutes matacus 1225.00 4.75 99.00 1.72 -999.00 -999.00 -999 1.00 1.00 "1,4,13,16,29" +Xenarthra Dasypodidae Zaedyus pichiy 1500.00 2.00 105.00 1.50 -999.00 10.50 108 2.00 -999.00 "1,2,4" +Xenarthra Megalonychidae Choloepus hoffmanni 4750.00 9.41 387.25 0.69 -999.00 30.12 385 1.00 0.70 "1,2,16,23,29" +Xenarthra Megalonychidae Choloepus didactylus 6070.00 8.67 354.77 2.50 -999.00 36.00 333 1.50 1.00 "1,2,3,11,13,17,29" +Xenarthra Myrmecophagidae Cyclopes didactylus 5070.00 8.92 -999.00 5.00 -999.00 -999.00 -999 1.00 -999.00 "1,3,16" +Xenarthra Myrmecophagidae Myrmecophaga tridactyla 28500.00 6.19 1491.17 1.83 -999.00 39.00 310 1.00 1.17 "1,2,3,13,17,29" +Xenarthra Myrmecophagidae Tamandua tetradactyla 5030.00 5.22 -999.00 -999.00 -999.00 12.00 114 1.00 1.35 "1,2,3,13,16" \ No newline at end of file diff --git a/07-adv-model-infer/04-lesson/07-04-lesson.Rmd b/07-adv-model-infer/04-lesson/07-04-lesson.Rmd new file mode 100644 index 0000000..362a53f --- /dev/null +++ b/07-adv-model-infer/04-lesson/07-04-lesson.Rmd @@ -0,0 +1,502 @@ +--- +title: "Advanced Inference: 4 - Cross-Validation" +output: + learnr::tutorial: + progressive: true + allow_skip: true +runtime: shiny_prerendered +--- + +```{r setup, message=FALSE, warning=FALSE, include=FALSE} +#devtools::install_github("rundel/learnrhash") + +library(learnr) +library(tidyverse) +library(openintro) +library(grid) +library(png) +library(ggplot2) +#library(emo) + +knitr::opts_chunk$set(echo = FALSE, + fig.align = "center", + fig.height = 3, + fig.width = 5, + message = FALSE, + warning = FALSE) + +tutorial_options(exercise.eval = FALSE) + +# Hash generation helpers +# Should ideally be loaded from the imstutorials package when it exists +is_server_context <- function(.envir) { + # We are in the server context if there are the follow: + # * input - input reactive values + # * output - shiny output + # * session - shiny session + # + # Check context by examining the class of each of these. + # If any is missing then it will be a NULL which will fail. + + inherits(.envir$input, "reactivevalues") & + inherits(.envir$output, "shinyoutput") & + inherits(.envir$session, "ShinySession") +} + +check_server_context <- function(.envir) { + if (!is_server_context(.envir)) { + calling_func <- deparse(sys.calls()[[sys.nframe() - 1]]) + err <- paste0("Function `", calling_func, "`", " must be called from an Rmd chunk where `context = \"server\"`") + stop(err, call. = FALSE) + } +} +encoder_logic <- function(strip_output = FALSE) { + p <- parent.frame() + check_server_context(p) + # Make this var available within the local context below + assign("strip_output", strip_output, envir = p) + # Evaluate in parent frame to get input, output, and session + local( + { + encoded_txt <- shiny::eventReactive( + input$hash_generate, + { + # shiny::getDefaultReactiveDomain()$userData$tutorial_state + state <- learnr:::get_tutorial_state() + shiny::validate(shiny::need(length(state) > 0, "No progress yet.")) + shiny::validate(shiny::need(nchar(input$name) > 0, "No name entered.")) + shiny::validate(shiny::need(nchar(input$studentID) > 0, "Please enter your student ID")) + user_state <- purrr::map_dfr(state, identity, .id = "label") + user_state <- dplyr::group_by(user_state, label, type, correct) + user_state <- dplyr::summarize( + user_state, + answer = list(answer), + timestamp = dplyr::first(timestamp), + .groups = "drop" + ) + user_state <- dplyr::relocate(user_state, correct, .before = timestamp) + user_info <- tibble( + label = c("student_name", "student_id"), + type = "identifier", + answer = as.list(c(input$name, input$studentID)), + timestamp = format(Sys.time(), "%Y-%m-%d %H:%M:%S %Z", tz = "UTC") + ) + learnrhash::encode_obj(bind_rows(user_info, user_state)) + } + ) + output$hash_output <- shiny::renderText(encoded_txt()) + }, + envir = p + ) +} + +hash_encoder_ui <- { + shiny::div("If you have completed this tutorial and are happy with all of your", "solutions, please enter your identifying information, then click the button below to generate your hash", textInput("name", "What's your name?"), textInput("studentID", "What is your student ID?"), renderText({ + input$caption + }), ) +} +``` + +## Welcome + +In this tutorial, you'll learn about cross-validation, a set of methods for characterizing the ability of a given model to generalize to new data and perform well in practice. + +## Cross-validation on demographic data + +To start, let's go back to the academic advisor's career data from her former students. We have the following data on 16 recent graduates: + +- `income` - annual income, in tens of thousands of USD +- `experience` - years of work experience +- `gender` - factor indicating gender + +Here's what a scatterplot of the data looks like: + +```{r, echo=FALSE} +inc <- c(43, 48, 52, 70, 61, 83, 96, 100, + 36, 40, 39, 44, 46, 49, 50, 53) +exp <- c(1, 2, 4, 6, 5, 3, 8, 10, + 1, 3, 2, 5, 8, 6, 7, 10) +gen <- c("male", "male", "male", "male", "male", "male", "male", "male", + "female", "female", "female", "female", "female", "female", "female", + "female") + +data <- data.frame(inc, exp, gen) +colnames(data) <- c("income", "experience", "gender") + +ggplot(data=data, aes(y=income, x=experience, col=gender)) + + geom_point() +``` +### + +Recall that we fit two models to this dataset: one standard linear model for income vs expertise and gender, and one with an interaction term between experience and gender. Let's use cross-validation to test the performance of each model. Hopefully we should confirm our results from before that the model with interactions does best. + +### + +To perform cross-validation, we must take our original dataset of 16 graduates and choose a subset of the samples to hold out. Since we have a fairly small dataset, let's use $k=1$ for the number of holdout samples. The cross-validation procedure goes like this: + +1. From the full dataset $D$, select $k$ sample(s) to set aside in a validation set $V$ +2. Fit the models `m1` and `m2` on the set $D / V$ (D minus V) +3. Make predictions on the sample(s) in $V$ and record the model performance +4. Repeat steps 1-3 until every sample in $D$ has been used in the validation set + +For this analysis, we'll use the _cross-validation SSE_ to measure each model's performance. If $\hat y_{cv}$ is the prediction made by the model fit on the cross-validation set and $y$ is the true value, then the CV-SSE is given by + +$$\text{CV-SSE} = \sum_{i=1}^n(\hat y_{cv,i} -y_i)^2$$ + +### + +Let's write a function to do this: + +```{r, echo=TRUE} +crossVal <- function(data, k=1) { + + # Number of repetitions + K <- nrow(data) / k + + # Matrix of results + results <- matrix(nrow=K, ncol=3) + colnames(results) <- c("fold", "m1-SSE", "m2-SSE") + + for(fold in 1:K) { + # Select the row + val_idx <- fold + V <- data[c(val_idx),] # Construct the validation set + DminusV <- data[-c(val_idx),] # Construct the training set + + # Fit model 1 without interactions + m1 <- lm(data=DminusV, income ~ experience + gender) + + # Fit model 2 with interactions + m2 <- lm(data=DminusV, income ~ experience + gender + experience:gender) + + # Compute the CV-SSE: + m1_cvsse <- mean((m1$residuals)**2) + m2_cvsse <- mean((m2$residuals)**2) + + # Add the results to the dataframe + results[fold,] <- c(fold, m1_cvsse, m2_cvsse) + } + return(results) +} + +crossVal(data=data, k=1) +``` + +```{r mc1} +question("Based on the CV-SSE, which model do you think performs better?", + answer("m1, the model without interactions"), + answer("m2, the model with interactions", correct=TRUE), + answer("They have about the same performance"), + answer("Not sure")) +``` + + +## Your turn! + +We return to the ice cream consumption dataset from Lesson 7.1. Recall what the dataset looks like, for the variables + +- `cons` - ice cream consumption +- `temp` - outdoor temperature +- `income` - average neighborhood income +- `price` - ice cream price + +```{r} +icecream <- read.csv("data/icecream.csv") +head(icecream) +``` + +Recall that we first fit a model without interactions, like so: + +$y = \beta_0 + \beta_{\rm temp}x_{\rm temp} + \beta_{\rm price}x_{\rm price} + \beta_{\rm income}x_{\rm income} + residuals$ + +And then a model with an interaction term on the ice cream price and neighborhood income: + +$y = \beta_0 + \beta_{\rm temp}x_{\rm temp} + \beta_{\rm price}x_{\rm price} + \beta_{\rm income}x_{\rm income} + \beta_{\rm price:income}x_{\rm price}x_{\rm income} + residuals$ + +This time we have a few more observations (30 instead of 16), so let's try performing cross-validation with $k=3$ points in our validation set $V$. + +### + +```{r mc2} +question("For the full dataset of 30 observations and k=3 in each validation set, what will be the size of our training set D minus V?", + answer("3"), + answer("10"), + answer("27", correct=TRUE), + answer("Not sure")) +``` + +### + +```{r mc3} +question("How many times will we repeat the cross-validation process until every point has been used for validation and for training?", + answer("3"), + answer("10", correct=TRUE), + answer("27"), + answer("Not sure")) +``` + +### + +### Cross-validation on the icecream data + +Modify the following function to perform cross-validation on the icecream data, with the no-interaction and interaction models we recalled above. + +```{r ex1, exercise=TRUE} +crossValIce <- function(data, k) { + + # Number of repetitions (Hint: check the MC question above) + K <- _____ + + # Matrix of results + results <- matrix(nrow=K, ncol=3) + colnames(results) <- c("fold", "m1-SSE", "m2-SSE") + + last_idx <- 1 + + for(fold in 1:K) { + # Select the row + val_idx <- _____ + + # Hint: if you're having trouble figuring out the line above, try + # uncommenting this and playing with subsetting the indices + # print(val_idx) + # + # Hint: think about what indices you want in each fold: + # 1 2 3 + # 4 5 6 + # ... + # 28 29 30 + # + # Hint: try using last_idx + + V <- data[c(val_idx),] # Construct the validation set + DminusV <- data[-c(val_idx),] # Construct the training set + + # Fit model 1 without interactions + m1 <- _____ + + # Fit model 2 with interactions + m2 <- _____ + + # Compute the CV-SSE: + m1_cvsse <- mean((m1$residuals)**2) + m2_cvsse <- mean((m2$residuals)**2) + + # Add the results to the dataframe + results[fold,] <- c(fold, m1_cvsse, m2_cvsse) + + # Update the last index used in validation + last_idx <- last_idx + k + } + return(results) +} +``` + +```{r ex1-hint-1} +crossValIce <- function(data, k) { + + # Number of repetitions (Hint: check the MC question above) + K <- _____ + + # Matrix of results + results <- matrix(nrow=K, ncol=3) + colnames(results) <- c("fold", "m1-SSE", "m2-SSE") + + last_idx <- 1 + + for(fold in 1:K) { + # Select the row + val_idx <- _____ + + # Hint: if you're having trouble figuring out the line above, try + # uncommenting this and playing with subsetting the indices: + # print(val_idx) + + V <- data[c(val_idx),] # Construct the validation set + DminusV <- data[-c(val_idx),] # Construct the training set + + # Fit model 1 without interactions + m1 <- _____ + + # Fit model 2 with interactions + m2 <- _____ + + # Compute the CV-SSE: + m1_cvsse <- mean((m1$residuals)**2) + m2_cvsse <- mean((m2$residuals)**2) + + # Add the results to the dataframe + results[fold,] <- c(fold, m1_cvsse, m2_cvsse) + + # Update the last index used in validation + last_idx <- last_idx + k + } + return(results) +} +``` + +```{r ex1-hint-2} +crossValIce <- function(data, k) { + + # Number of repetitions (Hint: check the MC question above) + K <- _____ + + # Matrix of results + results <- matrix(nrow=K, ncol=3) + colnames(results) <- c("fold", "m1-SSE", "m2-SSE") + + last_idx <- 1 + + for(fold in 1:K) { + # Select the row + val_idx <- _____ + + # Hint: if you're having trouble figuring out the line above, try + # uncommenting this and playing with subsetting the indices + # print(val_idx) + # + # Hint: think about what indices you want in each fold: + # 1 2 3 + # 4 5 6 + # ... + # 28 29 30 + + V <- data[c(val_idx),] # Construct the validation set + DminusV <- data[-c(val_idx),] # Construct the training set + + # Fit model 1 without interactions + m1 <- _____ + + # Fit model 2 with interactions + m2 <- _____ + + # Compute the CV-SSE: + m1_cvsse <- mean((m1$residuals)**2) + m2_cvsse <- mean((m2$residuals)**2) + + # Add the results to the dataframe + results[fold,] <- c(fold, m1_cvsse, m2_cvsse) + + # Update the last index used in validation + last_idx <- last_idx + k + } + return(results) +} +``` + +```{r ex1-hint-3} +crossValIce <- function(data, k) { + + # Number of repetitions (Hint: check the MC question above) + K <- _____ + + # Matrix of results + results <- matrix(nrow=K, ncol=3) + colnames(results) <- c("fold", "m1-SSE", "m2-SSE") + + last_idx <- 1 + + for(fold in 1:K) { + # Select the row + val_idx <- _____ + + # Hint: if you're having trouble figuring out the line above, try + # uncommenting this and playing with subsetting the indices + # print(val_idx) + # + # Hint: think about what indices you want in each fold: + # 1 2 3 + # 4 5 6 + # ... + # 28 29 30 + # + # Hint: try using last_idx + + V <- data[c(val_idx),] # Construct the validation set + DminusV <- data[-c(val_idx),] # Construct the training set + + # Fit model 1 without interactions + m1 <- _____ + + # Fit model 2 with interactions + m2 <- _____ + + # Compute the CV-SSE: + m1_cvsse <- mean((m1$residuals)**2) + m2_cvsse <- mean((m2$residuals)**2) + + # Add the results to the dataframe + results[fold,] <- c(fold, m1_cvsse, m2_cvsse) + + # Update the last index used in validation + last_idx <- last_idx + k + } + return(results) +} +``` + +```{r ex1-solution} +crossValIce <- function(data, k) { + + # Number of repetitions + K <- nrow(data) / k + + # Matrix of results + results <- matrix(nrow=K, ncol=3) + colnames(results) <- c("fold", "m1-SSE", "m2-SSE") + + last_idx <- 1 + + for(fold in 1:K) { + # Select the row + val_idx <- last_idx : (last_idx+k-1) + V <- data[c(val_idx),] # Construct the validation set + DminusV <- data[-c(val_idx),] # Construct the training set + + # Fit model 1 without interactions + m1 <- lm(data=icecream, cons ~ temp + price + income) + + # Fit model 2 with interactions + m2 <- lm(data=icecream, cons ~ temp + price + income + price:income) + + # Compute the CV-SSE: + m1_cvsse <- mean((m1$residuals)**2) + m2_cvsse <- mean((m2$residuals)**2) + + # Add the results to the dataframe + results[fold,] <- c(fold, m1_cvsse, m2_cvsse) + + # Update the last index used in validation + last_idx <- last_idx + k + } + return(results) +} +``` + +Now run the function on the icecream data for $k=3$: + +```{r ex2, exercise=TRUE} +``` + +```{r ex2-solution} +crossValIce(data=icecream, k=3) +``` + +```{r mc4} +question("Based on the CV-SSE, which model do you think performs better on the icecream data?", + answer("m1, the model without interactions"), + answer("m2, the model with interactions", correct=TRUE), + answer("They have about the same performance"), + answer("Not sure")) +``` + + +## Submit + +```{r, echo=FALSE, context="server"} +encoder_logic() +``` + +```{r encode, echo=FALSE} +learnrhash::encoder_ui(ui_before = hash_encoder_ui) +``` diff --git a/07-adv-model-infer/04-lesson/data/icecream.csv b/07-adv-model-infer/04-lesson/data/icecream.csv new file mode 100644 index 0000000..eeb7f03 --- /dev/null +++ b/07-adv-model-infer/04-lesson/data/icecream.csv @@ -0,0 +1,31 @@ +rownames,cons,income,price,temp +1,0.386,78,0.27,41 +2,0.374,79,0.282,56 +3,0.393,81,0.277,63 +4,0.425,80,0.28,68 +5,0.406,76,0.272,69 +6,0.344,78,0.262,65 +7,0.327,82,0.275,61 +8,0.288,79,0.267,47 +9,0.269,76,0.265,32 +10,0.256,79,0.277,24 +11,0.286,82,0.282,28 +12,0.298,85,0.27,26 +13,0.329,86,0.272,32 +14,0.318,83,0.287,40 +15,0.381,84,0.277,55 +16,0.381,82,0.287,63 +17,0.47,80,0.28,72 +18,0.443,78,0.277,72 +19,0.386,84,0.277,67 +20,0.342,86,0.277,60 +21,0.319,85,0.292,44 +22,0.307,87,0.287,40 +23,0.284,94,0.277,32 +24,0.326,92,0.285,27 +25,0.309,95,0.282,28 +26,0.359,96,0.265,33 +27,0.376,94,0.265,41 +28,0.416,96,0.265,52 +29,0.437,91,0.268,64 +30,0.548,90,0.26,71 \ No newline at end of file diff --git a/07-adv-model-infer/05-lesson/07-05-lesson.Rmd b/07-adv-model-infer/05-lesson/07-05-lesson.Rmd new file mode 100644 index 0000000..8d73e56 --- /dev/null +++ b/07-adv-model-infer/05-lesson/07-05-lesson.Rmd @@ -0,0 +1,393 @@ +--- +title: "Advanced Inference: 5 - Case Study: Logistic Regression for Low Birthweights in Nepal" +output: + learnr::tutorial: + progressive: true + allow_skip: true +runtime: shiny_prerendered +--- + +```{r setup, message=FALSE, warning=FALSE, include=FALSE} +#devtools::install_github("rundel/learnrhash") + +library(learnr) +library(tidyverse) +library(openintro) +library(grid) +library(png) +library(ggplot2) +#library(emo) + +knitr::opts_chunk$set(echo = FALSE, + fig.align = "center", + fig.height = 3, + fig.width = 5, + message = FALSE, + warning = FALSE) + +tutorial_options(exercise.eval = FALSE) + +# Hash generation helpers +# Should ideally be loaded from the imstutorials package when it exists +is_server_context <- function(.envir) { + # We are in the server context if there are the follow: + # * input - input reactive values + # * output - shiny output + # * session - shiny session + # + # Check context by examining the class of each of these. + # If any is missing then it will be a NULL which will fail. + + inherits(.envir$input, "reactivevalues") & + inherits(.envir$output, "shinyoutput") & + inherits(.envir$session, "ShinySession") +} + +check_server_context <- function(.envir) { + if (!is_server_context(.envir)) { + calling_func <- deparse(sys.calls()[[sys.nframe() - 1]]) + err <- paste0("Function `", calling_func, "`", " must be called from an Rmd chunk where `context = \"server\"`") + stop(err, call. = FALSE) + } +} +encoder_logic <- function(strip_output = FALSE) { + p <- parent.frame() + check_server_context(p) + # Make this var available within the local context below + assign("strip_output", strip_output, envir = p) + # Evaluate in parent frame to get input, output, and session + local( + { + encoded_txt <- shiny::eventReactive( + input$hash_generate, + { + # shiny::getDefaultReactiveDomain()$userData$tutorial_state + state <- learnr:::get_tutorial_state() + shiny::validate(shiny::need(length(state) > 0, "No progress yet.")) + shiny::validate(shiny::need(nchar(input$name) > 0, "No name entered.")) + shiny::validate(shiny::need(nchar(input$studentID) > 0, "Please enter your student ID")) + user_state <- purrr::map_dfr(state, identity, .id = "label") + user_state <- dplyr::group_by(user_state, label, type, correct) + user_state <- dplyr::summarize( + user_state, + answer = list(answer), + timestamp = dplyr::first(timestamp), + .groups = "drop" + ) + user_state <- dplyr::relocate(user_state, correct, .before = timestamp) + user_info <- tibble( + label = c("student_name", "student_id"), + type = "identifier", + answer = as.list(c(input$name, input$studentID)), + timestamp = format(Sys.time(), "%Y-%m-%d %H:%M:%S %Z", tz = "UTC") + ) + learnrhash::encode_obj(bind_rows(user_info, user_state)) + } + ) + output$hash_output <- shiny::renderText(encoded_txt()) + }, + envir = p + ) +} + +hash_encoder_ui <- { + shiny::div("If you have completed this tutorial and are happy with all of your", "solutions, please enter your identifying information, then click the button below to generate your hash", textInput("name", "What's your name?"), textInput("studentID", "What is your student ID?"), renderText({ + input$caption + }), ) +} +``` + + +## Welcome + +In this tutorial, you'll learn about logistic regression through a case study. The following data contains observations of infants' birth weights from July 2018 to March 2019 at a health facility in Nepal (source: K.C. et. al., 2020). Low birth weight for an infant is defined as less than 2500 grams, and is a crucial indicator of maternal health, poverty, and future health of the child. The variables are: + +- `birthWeight` - weight of the infant at birth, in grams +- `smoking` - indicator for whether the mother smoked during pregnancy: 0 (no) or 1 (yes) +- `motherWeight2` - the mother's weight at her 2nd trimester visit to the care facility, in kg +- `motherWeight3` - the mother's weight at her 3rd trimester visit to the care facility, in kg + +You want to determine which other health factors are correlated with low birthweight. + +```{r} +# Data pre-processing: +#birthweights <- read_sav("pone.0234907.s001.sav") +#birthweights <- data.frame(birthweights$BIRTHWEI, birthweights$SMOKINGH, birthweights$WEIGHTMO_1, #birthweights$WEIGHTM1_3) +#colnames(birthweights) <- c("birthWeight", "smoking", "motherWeight2", "motherWeight3") +#write.csv(birthweights, "~/bu/grad/teaching/LCT/MA214/MA214-tutorials/07-adv-model-infer/birthweights.csv", row.names=FALSE) +``` + +```{r} +# Load data and display the first 10 rows: +birthweights <- read.csv("data/birthweights.csv", header=TRUE) +head(birthweights) +``` + + +## Processing and exploring birthweight data + +Before we proceed, we'll need to process the data and compute the variables needed for our analysis. First, let's create an indicator variable for whether the infant had a low birthweight. How would you compute this using the `birthWeight` column? + +```{r ex1, exercise=TRUE} +birthweights$low <- as.numeric(____) +``` + +```{r ex1-solution} +birthweights$low <- as.numeric(birthweights$birthWeight <= 2500) +``` + +And now compute the difference between the mother's third trimester weight and second trimester weight: + +```{r ex2, exercise=TRUE} +birthweights$weightChange <- ____ +``` + +```{r ex2-solution} +birthweights$weightChange <- birthweights$motherWeight3 - birthweights$motherWeight2 +``` + +```{r, echo=FALSE} +# need this or the document won't knit +birthweights$low <- as.numeric(birthweights$birthWeight <= 2500) +birthweights$weightChange <- birthweights$motherWeight3 - birthweights$motherWeight2 +``` +### + +Now we have what we need to explore the data. Graph the indicator variable `low` vs the mother's weight change, and color the points by whether the mother was smoking during pregnancy: + +```{r ex3, exercise=TRUE} +ggplot(data=birthweights, aes(x=____, y=____, color=____)) + + geom_point(alpha=0.6) # alpha=0.6 to make the points easier to see when they overlap +``` + +```{r ex3-solution} +ggplot(data=birthweights, aes(x=weightChange, y=low, color=as.factor(smoking))) + + geom_point(alpha=0.6) +``` + +### + +It looks like we have a binary response variable here, with one covariate. You may recall a similar setup in Tutorial 3.9, where we first covered logistic regression. We'll do a bit of review in the next section. + + +## Review: Logistic Regression + +Recall from Tutorial 3.9 that logistic regression models a binary response, specifically the probability of a "success" or "failure." In this case, if $Y_i \sim {\rm Bernoulli}(p_i)$ is the indicator for whether an infant has a low birthweight, then we have + +$$ \mathbb{P}(Y_i=1)=p_i \quad\quad\text{and}\quad\quad \mathbb{P}(Y_i=0)=1-p_i$$ +where we are careful to consider whether $p_i$ might be different for each case, given the other health, environmental, and social factors that affect pregnancy and birth. + +### + +```{r mc-1} +question("What is the expectation of Y_i as modeled above?", + answer("0"), + answer("p_i", correct=TRUE), + answer("1-p_i"), + answer("Not sure")) +``` + +### + +```{r mc-2} +question("What is the variance of Y_i as modeled above?", + answer("1"), + answer("p_i"), + answer("p_i(1-p_i)", correct=TRUE), + answer("Not sure")) +``` + + +## Odds and log-odds + +Recall that the logistic function is given by + +$$f(t) = \frac{e^t}{1+e^t}$$ + +### + +and when we perform logistic regression, we model the data as + +$$\mathbb{E}[Y_i] = p_i = \frac{e^{\beta_0 + \beta_1 X_{i,1} + \beta_2 X_{i,2}}}{1 + e^{\beta_0 + \beta_1 X_{i,1} + \beta_2 X_{i,2}}}$$ +or equivalently, + +$$ \frac{p_i}{1-p_i} = e^{\beta_0 + \beta_1 X_{i,1} + \beta_2 X_{i,2}}$$ + +### + +The quantity on the left-hand side is called "odds." In words, it indicates how much more likely an event occurring is than it not occurring. For some examples of how this works concretely, check out the table below: + + +```{r table1, echo=FALSE, message=FALSE, warnings=FALSE, results='asis'} +tabl <- " +| Odds Ratio | Interpretation | +|---------------|:----------------------------------------------------:| +| < 1 | Event is more likely to not occur than to occur | +| = 1 | p=0.5, event is equally likely to occur or not occur | +| > 1 | Event is more likely to occur than to not occur | +" +cat(tabl) # output the table +``` + +### + +While odds are a useful concept, they can be hard to work with in modeling contexts. Consider how you might interpret the coefficients $\beta_j$ from a model using the odds function above: you'd have to take into account the exponential. On the other hand, if we take the logarithm of the odds function, we get (predictably) a log-odds function: + +$$ {\rm log} \biggl( \frac{p_i}{1-p_i} \biggr) = \beta_0 + \beta_1 X_{i,1} + \beta_2 X_{i,2}$$ + +### + +Log-odds is symmetric around zero, which makes interpreting coefficients a bit more intuitive. Moreover, now we have our linear model directly on the right-hand side. Unfortunately, as we explored in Tutorial 3.9, the scale of the log-odds function is not a natural one for interpretation, so we need to take care when comparing values. + +A revised table interpreting both odds and log-odds values looks like this: + +```{r table2, echo=FALSE, message=FALSE, warnings=FALSE, results='asis'} +tabl <- " +| Odds Ratio | Log-odds | Interpretation | +|---------------|----------|:----------------------------------------------------:| +| < 1 | < 0 | Event is more likely to not occur than to occur | +| = 1 | = 0 | p=0.5, event is equally likely to occur or not occur | +| > 1 | > 0 | Event is more likely to occur than to not occur | +" +cat(tabl) # output the table +``` + +### + +And here we have a plot of the values of p, odds, and log-odds: + +```{r, echo=FALSE} +library(gridExtra) + +p <- seq(from=0.0001, to=1, length.out=100) +odds_data <- data.frame(p) +odds_data$odds <- (odds_data$p)/(1-odds_data$p) +odds_data$logOdds <- log(odds_data$odds) + +#head(odds_data) +plot1 <- ggplot(data=odds_data, aes(x=p, y=p)) + geom_line() +plot2 <- ggplot(data=odds_data, aes(x=p, y=odds)) + geom_line() +plot3 <- ggplot(data=odds_data, aes(x=p, y=logOdds)) + geom_line() + +grid.arrange(plot1, plot2, plot3) +``` + +Notice how both the odds and log-odds increase with p, but the log-odds has a more moderate curve and is symmetric around 0. + +### + +```{r mc-3} +question("For p=0.4, what are the odds?", + answer("0.67", correct=TRUE), + answer("1.5"), + answer("0.6"), + answer("Not sure")) +``` + +```{r mc-4} +question("For p=0.4, what are the log-odds?", + answer("-0.22"), + answer("0.17"), + answer("-0.17", correct=TRUE), + answer("Not sure")) +``` + + +## Modeling Low Birthweight + +Now we have the tools needed to model low birthweight outcomes with logistic regression. Using the `glm` function in R, fit a model with a Binomial link function. + +```{r ex4, exercise=TRUE} +logReg <- glm(data=birthweights, formula=____, family=____) +summary(logReg) +``` + +```{r ex4-solution} +logReg <- glm(data=birthweights, formula=low~smoking + weightChange, + family=binomial) +summary(logReg) +``` + +```{r, echo=FALSE} +# need this or the document won't knit +logReg <- glm(data=birthweights, formula=low~smoking + weightChange, + family=binomial) +``` + +### + +Let's see how we might interpret the coefficients. Recall that logistic regression is based on the log-odds function, so we still have a logarithm on the left-hand side of the equation. What happens when we take ${\rm exp}\{...\}$ of the model? + +```{r, include=TRUE, echo=TRUE} +coef(logReg) # original model coefficients, log-odds scale +exp(coef(logReg)) # take exp() to convert to odds scale +``` + +```{r mc-5} +question("According to our model, what are the odds of low birthweight for an infant whose mother smoked during pregnancy? Assume her weight change was 0 kg, so we control for that variable.", + answer("The odds of low birthweight increased by a factor of 1.5 if the mother smoked during pregnancy."), + answer("The odds of low birthweight decreased by a factor of 0.9 if the mother smoked during pregnancy."), + answer("The odds of low birthweight increased by a factor of 4.5 if the mother smoked during pregnancy.", correct=TRUE), + answer("Not sure")) +``` + +### + +In addition to the odds and log-odds, we can also recover the estimated probabilities from our model. For example, let's say we have a mother whose weight decreased by 2 kg during pregnancy, but did not smoke. What is the estimated probability that the infant will have a low birthweight? + +### + +From our model coefficients, we have: + +$$ e^{4.53*0 - 0.94*2} = e^{-1.88} = \frac{p}{1-p} $$ +Solving for p gives us: + +$$ e^{-1.88}(1-p) = p $$ +$$ e^{-1.88} - pe^{-1.88} = p $$ + +$$ \frac{e^{-1.88}}{1+e^{-1.88}} = p = 0.13$$ + +So according to our model, a moderate loss of weight between the 2nd and 3rd trimesters, barring other factors, is correlated with a low probability of low birthweight of the infant. + +## Taking Care with Model Interpretations + +For reasons we'll see more clearly below, we should be careful when interpreting our model results. + +### + +First, let's examine the relationship between smoking during pregnancy and low birthweight. It turns out that the dataset used did not have many examples of mothers who smoked during pregnancy: just 8 out of 369 did - and of those, 6 of the infants had a low birthweight: + +```{r, echo=TRUE, include=TRUE} +# Count the number of rows where the smoking indicator variable = 1: +sum(birthweights$smoking) + +# Let's see those rows: +birthweights[birthweights$smoking==1,] +``` + +This small segment of outcomes is likely skewing the results. + +### + +On the other hand, what about the weight change variable? Our model says that for each +1 kg gained (weightChange$>0$), the infant's odds of a low birthweight increased by a factor of 0.9. But that doesn't sound quite right: gestating mothers are usually told that weight gain during pregnancy is healthy and aids in the fetus' development during gestation ([CDC, May 2024](https://www.cdc.gov/maternal-infant-health/pregnancy-weight/index.html)). What else might be going on? + +### + +It's a bit of a trick question. The `birthweights` data we've analyzed here is actually a subset of a larger dataset which included several other variables. The source study, published in PLoS One, found that three other factors were significant predictors of low birthweight: having a firewood or kerosene kitchen in the home, low iron intake during pregnancy, and pre-term birth (K.C. et. al., 2020). In short, there are other factors affecting low birthweight that we did not measure in this case study. + +### + +Reference for the birthweights data and study results: + +K. C. A., Basel P. L., Singh S. Low birth weight and its associated risk factors: Health facility-based case-control study. PLoS One. 2020 Jun 22;15(6):e0234907. doi: 10.1371/journal.pone.0234907. PMID: 32569281; PMCID: PMC7307746. + + +## Submit + +```{r, echo=FALSE, context="server"} +encoder_logic() +``` + +```{r encode, echo=FALSE} +learnrhash::encoder_ui(ui_before = hash_encoder_ui) +``` diff --git a/07-adv-model-infer/05-lesson/data/birthweights.csv b/07-adv-model-infer/05-lesson/data/birthweights.csv new file mode 100644 index 0000000..4d2048b --- /dev/null +++ b/07-adv-model-infer/05-lesson/data/birthweights.csv @@ -0,0 +1,370 @@ +"birthWeight","smoking","motherWeight2","motherWeight3" +2300,0,50.3070175438597,48 +2100,0,50,56 +2700,0,53,55 +2800,0,53,57 +3000,0,40,50 +2400,0,43,47 +2250,0,45,48 +2300,0,50.3070175438597,47 +2400,0,55,65 +3200,0,50.3070175438597,56.6442307692308 +2300,0,50.3070175438597,44 +3000,0,50.3070175438597,56.6442307692308 +1700,0,52,55 +2600,0,48,52 +2750,0,53,60 +2250,0,50,52 +2700,0,50.3070175438597,56.6442307692308 +3400,0,47,55 +2750,0,32,45 +2800,0,40,55 +3000,0,39,56.6442307692308 +3250,0,56,66 +3700,0,45,53 +3200,0,54,64 +2300,0,51,56.6442307692308 +2800,0,48,56 +3300,0,45,48 +3150,0,56,68 +2100,0,51,51 +3500,0,53,62 +2900,0,57,55 +3000,0,58,62 +2200,0,49,53 +2300,0,43,47 +2600,0,41,49 +2700,0,44,56.6442307692308 +3150,0,52,59 +2750,0,51,57 +2800,0,50,56 +2800,0,55,67 +2800,0,42,56.6442307692308 +2000,0,40,45 +2900,0,42,45 +2800,0,39,44 +3000,0,45,53 +2750,0,51,55 +2700,0,48,55 +3000,0,42,47 +2400,0,44,47 +2600,0,42,47 +3100,0,45,56.6442307692308 +3400,0,45,56.6442307692308 +2500,0,45,53 +3200,0,54,59 +3100,0,55,60 +3000,0,45,55 +3000,0,45,53 +2750,0,47,56.6442307692308 +3200,0,49,56.6442307692308 +3200,0,45,55 +2700,0,45,53 +2500,0,48,51 +3000,0,39,47 +2700,0,50,60 +2500,0,45,46 +2400,0,42,46 +2300,0,44,56.6442307692308 +2500,0,51,57 +2300,1,48,53 +2300,1,53,55 +2000,0,52,54 +1700,0,47,51 +2000,0,43,56.6442307692308 +2250,0,38,43 +2400,0,43,48 +2400,0,42,50 +2000,0,36,41 +2000,0,42,56.6442307692308 +2500,0,51,58 +2400,0,37,43 +2200,0,42,46 +2200,0,62,71 +2350,0,52,57 +3900,0,45,60 +2000,0,45,49 +2200,0,45,50 +2200,0,40,45 +2700,0,52,58 +3000,0,41,47 +2400,0,52,57 +2250,0,45,56.6442307692308 +2000,0,50.3070175438597,56.6442307692308 +2400,0,42,50 +2250,0,51,54 +3000,0,44,56.6442307692308 +3200,0,44,53 +3200,0,46,53 +1800,0,52,58 +3500,0,47,56.6442307692308 +3100,0,55,61 +2400,0,47,56.6442307692308 +2800,0,48,52 +2500,0,48,55 +2700,0,58,68 +2400,0,42,47 +2200,1,50.3070175438597,56.6442307692308 +2200,0,62,68 +2800,0,55,56.6442307692308 +2200,0,50.3070175438597,56.6442307692308 +2400,0,56,60 +2000,0,46,54 +2200,0,50,55 +3300,0,50,50 +3000,0,44,53 +2250,0,53,56.6442307692308 +2300,0,45,47 +2000,0,54,56.6442307692308 +2200,0,52,59 +3500,0,55,65 +2500,0,50,56 +3500,0,48,56.6442307692308 +2400,0,50.3070175438597,56.6442307692308 +3200,0,54,61 +2300,0,54,61 +2400,0,41,56.6442307692308 +2400,0,43,56.6442307692308 +1700,0,50.3070175438597,56.6442307692308 +3100,0,45,55 +3000,0,50,52 +2800,0,45,52 +3600,0,56,63 +2200,0,56,61 +2300,0,56,61 +2300,0,61,66 +2400,0,48,52 +2300,0,45,52 +3200,0,53,61 +3550,0,48,54 +2700,0,40,55 +2700,0,53,60 +2600,0,43,48 +2500,0,46,51 +2500,0,62,71 +3000,0,45,51 +2500,0,41,52 +2500,0,45,55 +3400,0,52,60 +3800,0,61,65 +2900,0,57,62 +2400,0,60,66 +2250,0,58,56.6442307692308 +2400,0,50.3070175438597,56.6442307692308 +2200,0,50.3070175438597,54 +3200,0,52,68 +2700,0,57,64 +2600,0,49,58 +3000,0,41,55 +3700,0,57,65 +3000,0,62,68 +2700,0,54,63 +2250,0,48,53 +3200,0,48,54 +3000,0,61,67 +3500,0,57,64 +2500,0,51,60 +3300,0,45,50 +3500,0,47,53 +2700,0,55,59 +2400,0,42,55 +3900,0,52,63 +3000,0,50,56 +3000,0,55,61 +2700,0,50,57 +3300,0,47,54 +2300,0,37,50 +3500,0,50,57 +3300,0,52,65 +2500,0,46,55 +3300,0,53,60 +3500,0,42,52 +3000,0,45,52 +2500,0,53,65 +2200,0,54,61 +2700,0,55,60 +3000,0,54,57 +3000,0,44,56.6442307692308 +2750,0,50,55 +3600,0,69,65 +2300,0,40,46 +3400,0,55,60 +3150,0,53,65 +3000,0,67,56.6442307692308 +2300,0,48,56.6442307692308 +2100,0,45,51 +3000,1,45,51 +3300,0,52,61 +3200,0,54,61 +3700,0,53,55 +3000,0,44,52 +3200,0,44,50 +2750,0,45,56 +2500,0,45,50 +2600,0,63,68 +2900,0,41,47 +2000,0,50,56 +2900,0,35,45 +2800,0,50,55 +3500,0,46,55 +3100,0,50,50 +2750,0,45,49 +2800,0,50,56 +3600,0,51,66 +2250,0,50.3070175438597,47 +2200,0,48,53 +2400,0,50,55 +2000,0,52,62 +3000,0,50,60 +3500,0,50,50 +3000,0,62,72 +2500,0,51,62 +3250,0,64,70 +2800,0,61,56.6442307692308 +2800,0,57,61 +3100,0,46,54 +3750,0,50,60 +2500,0,44,53 +3150,0,57,64 +3000,0,56,64 +2000,0,49,58 +2350,0,54,60 +2400,0,55,65 +1850,0,53,59 +3200,0,51,58 +4000,0,49,55 +3500,0,60,65 +3300,0,60,50 +2500,0,48,60 +3500,0,45,50 +2200,0,39,45 +3000,0,50.3070175438597,56.6442307692308 +2800,0,53,56 +2600,0,56,63 +3100,0,50,57 +3500,0,44,55 +2100,0,49,57 +2400,0,55,60 +3100,1,50.3070175438597,56.6442307692308 +3400,0,62,67 +3200,0,50.3070175438597,56.6442307692308 +3000,0,50,52 +3100,0,55,56.6442307692308 +3200,0,50,59 +3800,0,60,71 +3000,0,48,56 +3500,0,48,57 +3600,0,52,54 +2700,0,52,63 +3000,0,48,53 +3000,0,55,62 +3200,0,61,66 +3000,0,40,49 +3000,0,50,57 +3000,0,50,57 +2600,0,49,56.6442307692308 +2700,0,47,56.6442307692308 +2750,0,55,70 +3250,0,60,65 +2750,0,62,67 +3200,0,63,69 +3500,0,61,56.6442307692308 +3550,0,45,49 +3500,0,52,58 +3400,0,57,61 +2500,0,53,57 +2500,0,54,57 +3000,0,65,70 +3100,0,68,66 +3500,0,56,62 +2500,0,50,55 +3000,0,53,56 +3000,0,55,59 +2150,0,48,58 +3800,0,54,65 +3100,0,48,55 +2000,0,54,59 +2500,0,48,52 +2230,0,40,50 +3000,0,54,56.6442307692308 +3000,0,51,61 +3500,0,50.3070175438597,56.6442307692308 +2000,0,51,59 +3100,0,53,66 +3000,0,55,64 +2700,0,50,60 +3000,0,55,57 +2800,0,50,54 +2400,0,53,56 +3300,0,40,43 +3000,0,62,70 +2400,0,50.3070175438597,56.6442307692308 +3100,0,47,50 +2700,0,43,45 +2200,0,48,53 +2750,0,54,56.6442307692308 +2100,0,46,49 +2300,0,53,59 +2250,0,47,56.6442307692308 +3600,0,51,56.6442307692308 +3100,0,52,60 +2250,0,38,43 +3700,0,53,61 +2250,0,50.3070175438597,54 +3050,0,56,56.6442307692308 +2900,0,50,48 +2000,0,50.3070175438597,56 +2000,0,55,58 +3500,0,52,60 +2200,0,43,50 +2750,0,48,56 +2800,0,58,62 +2800,0,51,58 +3500,0,51,65 +2250,0,48,52 +2200,0,45,50 +3500,0,50,60 +2600,0,49,54 +3500,0,52,61 +3400,0,62,68 +2200,0,57,64 +3500,0,54,66 +2500,0,46,52 +2400,0,40,45 +2000,0,53,56.6442307692308 +1900,0,52,56.6442307692308 +2100,0,42,47 +2500,0,48,52 +2250,0,50.3070175438597,54 +3800,0,48,50 +2350,0,41,44 +2400,1,62,66 +2250,0,45,47 +2300,0,55,61 +2200,0,58,64 +2600,0,57,62 +3000,0,49,55 +2000,0,62,56.6442307692308 +3100,0,51,68 +2000,0,62,70 +3650,0,68,75 +2200,0,63,65 +2000,0,54,56.6442307692308 +2600,0,50.3070175438597,56.6442307692308 +2800,0,50.3070175438597,56.6442307692308 +3000,0,50,51 +3100,0,50.3070175438597,56.6442307692308 +2400,1,61,67 +2800,0,51,58 +3700,0,55,66 +3400,0,60,60 +3100,0,61,69 +2900,0,57,62 +3000,0,48,52 +2200,0,57,63 +2100,0,50.3070175438597,56.6442307692308 +2000,0,58,64 +2400,1,50.3070175438597,60 +3000,0,56,57 +2400,0,44,52 +3200,0,55,62 diff --git a/07-adv-model-infer/index.Rmd b/07-adv-model-infer/index.Rmd new file mode 100644 index 0000000..5a1446a --- /dev/null +++ b/07-adv-model-infer/index.Rmd @@ -0,0 +1,45 @@ +--- +title: "Advanced Inferential Modeling" +output: html_document +--- + +```{r setup, include=FALSE} +knitr::opts_chunk$set(echo = TRUE) +``` + +Tutorial illustration + +## Tutorial description + +***TODO: write*** + +## Learning objectives + +***TODO: write*** + +## Lessons + +### 1 - [Interactions](https://openintro.shinyapps.io/ims-07-adv-model-infer-01/) + +***TODO: write*** + +### 2 - [Nonlinear Regression](https://openintro.shinyapps.io/ims-07-adv-model-infer-02/) + +***TODO: write*** + +### 3 - [Inference and Prediction](https://openintro.shinyapps.io/ims-07-adv-model-infer-03/) + +***TODO: write*** + +### 4 - [Cross-Validation](https://openintro.shinyapps.io/ims-07-adv-model-infer-04/) + +***TODO: write*** + +### 5 - [Case Study: Logistic Regression for Low Birthweights in Nepal](https://openintro.shinyapps.io/ims-07-adv-model-infer-05/) + +***TODO: write*** + + +## Instructor + +***TODO: write*** \ No newline at end of file