# load in libraries
library(ggplot2)
library(tidyr)
library(dplyr)## 
## Attaching package: 'dplyr'## The following objects are masked from 'package:stats':
## 
##     filter, lag## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, unionlibrary(lubridate)## 
## Attaching package: 'lubridate'## The following objects are masked from 'package:base':
## 
##     date, intersect, setdiff, unionlibrary(broom)
library(MASS)## 
## Attaching package: 'MASS'## The following object is masked from 'package:dplyr':
## 
##     selectlibrary(profileModel)## Warning: package 'profileModel' was built under R version 4.0.3library(brms)## Warning: package 'brms' was built under R version 4.0.3## Loading required package: Rcpp## Loading 'brms' package (version 2.14.0). Useful instructions
## can be found by typing help('brms'). A more detailed introduction
## to the package is available through vignette('brms_overview').## 
## Attaching package: 'brms'## The following object is masked from 'package:stats':
## 
##     arlibrary(bayesplot)## Warning: package 'bayesplot' was built under R version 4.0.3## This is bayesplot version 1.7.2## - Online documentation and vignettes at mc-stan.org/bayesplot## - bayesplot theme set to bayesplot::theme_default()##    * Does _not_ affect other ggplot2 plots##    * See ?bayesplot_theme_set for details on theme settinglibrary(MASS)
library(bbmle)## Warning: package 'bbmle' was built under R version 4.0.3## Loading required package: stats4## 
## Attaching package: 'bbmle'## The following object is masked from 'package:brms':
## 
##     parnames## The following object is masked from 'package:dplyr':
## 
##     slicelibrary(ggdist)## Warning: package 'ggdist' was built under R version 4.0.3## 
## Attaching package: 'ggdist'## The following objects are masked from 'package:brms':
## 
##     dstudent_t, pstudent_t, qstudent_t, rstudent_tlibrary(tidybayes)## Warning: package 'tidybayes' was built under R version 4.0.3## 
## Attaching package: 'tidybayes'
## 
## The following objects are masked from 'package:brms':
## 
##     dstudent_t, pstudent_t, qstudent_t, rstudent_tlibrary(purrr)
library(rsample)## Warning: package 'rsample' was built under R version 4.0.3## 
## Attaching package: 'rsample'## The following object is masked from 'package:Rcpp':
## 
##     populatelibrary(boot)
library(modelr)## 
## Attaching package: 'modelr'## The following object is masked from 'package:broom':
## 
##     bootstraplibrary(tidyverse)## -- Attaching packages --------------------------------------- tidyverse 1.3.0 --## v tibble  3.0.3     v stringr 1.4.0
## v readr   1.3.1     v forcats 0.5.0## -- Conflicts ------------------------------------------ tidyverse_conflicts() --
## x lubridate::as.difftime() masks base::as.difftime()
## x modelr::bootstrap()      masks broom::bootstrap()
## x lubridate::date()        masks base::date()
## x dplyr::filter()          masks stats::filter()
## x lubridate::intersect()   masks base::intersect()
## x dplyr::lag()             masks stats::lag()
## x MASS::select()           masks dplyr::select()
## x lubridate::setdiff()     masks base::setdiff()
## x bbmle::slice()           masks dplyr::slice()
## x lubridate::union()       masks base::union()library(rlang)## 
## Attaching package: 'rlang'## The following objects are masked from 'package:purrr':
## 
##     %@%, as_function, flatten, flatten_chr, flatten_dbl, flatten_int,
##     flatten_lgl, flatten_raw, invoke, list_along, modify, prepend,
##     splicelibrary(gganimate)
library(animation)## Warning: package 'animation' was built under R version 4.0.3Welcome to your mid-term! I hope you enjoy. Note, in all of the questions below, there are easy not so code intensive ways of doing it, and there are longer more involved, yet still workable ways to answer them. I would suggest that before you dive into analyses, you do the following.
First, breathe.
Second, think about the steps you need to execute to get answer the question. Write them down.
Third, for those parts of problems that require code, put those steps, in sequence, in comments in your script file. Use those as signposts to step-by-step walk through the things you need to do.
Fourth, go over these steps, and see if there are any that could be easily abstracted into functions, could be vectorized, or otherwise done so that you can expend the minimum amount of effort on the problem to get the correct answer.
You will be graded on 1. Correct answers 2. Showing how you arrived at that answer 3. Well formatted and documented code 4. Thoughtful answers
The exam will be due on Nov 13th, 5pm.
1) Sampling your system (10 points)
Each of you has a study system your work in and a question of interest. Give an example of one variable that you would sample in order to get a sense of its variation in nature. Describe, in detail, how you would sample for the population of that variable in order to understand its distribution. Questions to consider include, but are not limited to: Just what is your sample versus your population? What would your sampling design be? Why would you design it that particular way? What are potential confounding influences of both sampling technique and sample design that you need to be careful to avoid? What statistical distribution might the variable take, and why?
Answer
So my study system is quite complex and I will probably drift away from familiar territory a bit. Unlike other systems that might require a phenotype first approach, mine will involved sampling of genotype data in order to predict phenotype. I am currently organizing my research to understand the genetic diversity in African rice species - O.glaberrima with respect to identifying signatures of positive selection and adaptation. My samples for this study will include nuclear genomes of O. glaberrima accessions derived from natural populations grown in Niger-Benin lowlands in Western Africa.
Most cultivated rice species have complex population structures due to self-pollination giving rise to multiple sub-populations, posing quite a challenge in selecting sampling procedures. Since my study variable relies solely on population genetic data, sample selection must be compatible for a GWAS analysis panel. Most GWAS panels requires samples with high levels of genetic diversity and low population structure as this will allow more precise identification of loci associated with phenotypic trait and also reduce false positives. Therefore, strategic sampling methods must be followed in selecting varieties with the characteristics required for GWAS analysis.
Rice accessions have fixed or rare alleles in their sub-populations making them unreliable candidates for GWAS analysis even with the utilization of large sample sizes. For this reason, methods involving the construction of recombinant populations have been developed to tackle this problem, one of which is the Multi-parent Advanced Generation Inter-cross (MAGIC) populations. This population is formed through multiple inter-crosses among diverse, followed by several generations of selfing by single-seed descent (SSD) - a method of having a single seed from each plant.
With my ideal population in place, I still need a suitable sample size and an appropriate sampling method to identify the most genetically diverse accessions for my study. For most population genetic studies, sample size (n), close to population size (N) can be quite problematic when it comes to sequence interpretation and statistical power. Therefore, I’ll be sampling between 10 -30% of the most genetically diverse accessions in the MAGIC population.
I will be employing a sampling method called the D-Method(DM). This is a three stage method that includes;
A classification clustering
Selecting fractions of accessions which are defined proportionally to cluster diversity. The cluster diversity is measured by the group’s Modified Rogers’ distance (mrd) values, a key evaluation metric for determining genetic distances between accessions in each cluster.
Selection of the most diverse sample out of all candidate samples generated by stratified random sampling process.
For my sampling statistical distribution, I believe normality is the standard for every test statistics. Although my sampling distribution might not follow normality due to large data points, the central limit theorem (CLT) can still be applied which allows sums or averages to approximately follow a normal distribution even if non-normal.
2) Data Reshaping and visualization
Johns Hopkins has been maintaining one of the best Covid-19 timseries data sets out there. The data on the US can be found here with information about what is in the data at https://github.com/CSSEGISandData/COVID-19/tree/master/csse_covid_19_data
2a) Access (5 points)
Download and read in the data. Can you do this without downloading, but read directly from the archive (+1).
# download and read data directly from archive
covid <- readr::read_csv('https://github.com/CSSEGISandData/COVID-19/raw/master/csse_covid_19_data/csse_covid_19_time_series/time_series_covid19_confirmed_US.csv')## Parsed with column specification:
## cols(
##   .default = col_double(),
##   iso2 = col_character(),
##   iso3 = col_character(),
##   Admin2 = col_character(),
##   Province_State = col_character(),
##   Country_Region = col_character(),
##   Combined_Key = col_character()
## )## See spec(...) for full column specifications.# view the head of the data
head(covid)## # A tibble: 6 x 307
##      UID iso2  iso3  code3  FIPS Admin2 Province_State Country_Region   Lat
##    <dbl> <chr> <chr> <dbl> <dbl> <chr>  <chr>          <chr>          <dbl>
## 1 8.40e7 US    USA     840  1001 Autau~ Alabama        US              32.5
## 2 8.40e7 US    USA     840  1003 Baldw~ Alabama        US              30.7
## 3 8.40e7 US    USA     840  1005 Barbo~ Alabama        US              31.9
## 4 8.40e7 US    USA     840  1007 Bibb   Alabama        US              33.0
## 5 8.40e7 US    USA     840  1009 Blount Alabama        US              34.0
## 6 8.40e7 US    USA     840  1011 Bullo~ Alabama        US              32.1
## # ... with 298 more variables: Long_ <dbl>, Combined_Key <chr>,
## #   `1/22/20` <dbl>, `1/23/20` <dbl>, `1/24/20` <dbl>, `1/25/20` <dbl>,
## #   `1/26/20` <dbl>, `1/27/20` <dbl>, `1/28/20` <dbl>, `1/29/20` <dbl>,
## #   `1/30/20` <dbl>, `1/31/20` <dbl>, `2/1/20` <dbl>, `2/2/20` <dbl>,
## #   `2/3/20` <dbl>, `2/4/20` <dbl>, `2/5/20` <dbl>, `2/6/20` <dbl>,
## #   `2/7/20` <dbl>, `2/8/20` <dbl>, `2/9/20` <dbl>, `2/10/20` <dbl>,
## #   `2/11/20` <dbl>, `2/12/20` <dbl>, `2/13/20` <dbl>, `2/14/20` <dbl>,
## #   `2/15/20` <dbl>, `2/16/20` <dbl>, `2/17/20` <dbl>, `2/18/20` <dbl>,
## #   `2/19/20` <dbl>, `2/20/20` <dbl>, `2/21/20` <dbl>, `2/22/20` <dbl>,
## #   `2/23/20` <dbl>, `2/24/20` <dbl>, `2/25/20` <dbl>, `2/26/20` <dbl>,
## #   `2/27/20` <dbl>, `2/28/20` <dbl>, `2/29/20` <dbl>, `3/1/20` <dbl>,
## #   `3/2/20` <dbl>, `3/3/20` <dbl>, `3/4/20` <dbl>, `3/5/20` <dbl>,
## #   `3/6/20` <dbl>, `3/7/20` <dbl>, `3/8/20` <dbl>, `3/9/20` <dbl>,
## #   `3/10/20` <dbl>, `3/11/20` <dbl>, `3/12/20` <dbl>, `3/13/20` <dbl>,
## #   `3/14/20` <dbl>, `3/15/20` <dbl>, `3/16/20` <dbl>, `3/17/20` <dbl>,
## #   `3/18/20` <dbl>, `3/19/20` <dbl>, `3/20/20` <dbl>, `3/21/20` <dbl>,
## #   `3/22/20` <dbl>, `3/23/20` <dbl>, `3/24/20` <dbl>, `3/25/20` <dbl>,
## #   `3/26/20` <dbl>, `3/27/20` <dbl>, `3/28/20` <dbl>, `3/29/20` <dbl>,
## #   `3/30/20` <dbl>, `3/31/20` <dbl>, `4/1/20` <dbl>, `4/2/20` <dbl>,
## #   `4/3/20` <dbl>, `4/4/20` <dbl>, `4/5/20` <dbl>, `4/6/20` <dbl>,
## #   `4/7/20` <dbl>, `4/8/20` <dbl>, `4/9/20` <dbl>, `4/10/20` <dbl>,
## #   `4/11/20` <dbl>, `4/12/20` <dbl>, `4/13/20` <dbl>, `4/14/20` <dbl>,
## #   `4/15/20` <dbl>, `4/16/20` <dbl>, `4/17/20` <dbl>, `4/18/20` <dbl>,
## #   `4/19/20` <dbl>, `4/20/20` <dbl>, `4/21/20` <dbl>, `4/22/20` <dbl>,
## #   `4/23/20` <dbl>, `4/24/20` <dbl>, `4/25/20` <dbl>, `4/26/20` <dbl>,
## #   `4/27/20` <dbl>, `4/28/20` <dbl>, ...2b) It’s big and wide! (10 Points)
The data is, well, huge. It’s also wide, with dates as columns. Write a function that, given a state, will output a time series (long data where every row is a day) of cumulative cases in that state as well as new daily cases.
Note, let’s make the date column that emerges a true date object. Let’s say you’ve called it date_col. If you mutate it, mutate(date_col = lubridate::mdy(date_col)), it will be turned into a date object that will have a recognized order. {lubridate} is da bomb, and I’m hoping we have some time to cover it in the future.
+5 extra credit for merging it with some other data source to also return cases per 100,000 people.
# a function that given a state will output a time series
time_Series_fun <- function(us_state, ...){
# using the rlang::enexprs(...) function to capture multiple arguments in my function
  args <- rlang::enexprs(...)
# subset Province_state and all date columns in Covid dataset    
state_date <- covid[, c(7, 12:ncol(covid))]
# create a new dataframe containing all Province_states and a column for daily and cummulative cases
  us_state <- state_date %>%
    # change to long data
    pivot_longer(cols = -Province_State,
               names_to = "Date_col",
               values_to = "New_cases") %>%
    filter(Province_State == args) %>%
    # make a true date column using lubridates
    mutate(Dates = mdy(Date_col), Cummulative_cases = cumsum(New_cases))
  
  # return output
  return(us_state)
}
# test function
time_Series_fun(us_states, Massachusetts)## # A tibble: 5,032 x 5
##    Province_State Date_col New_cases Dates      Cummulative_cases
##    <chr>          <chr>        <dbl> <date>                 <dbl>
##  1 Massachusetts  1/22/20          0 2020-01-22                 0
##  2 Massachusetts  1/23/20          0 2020-01-23                 0
##  3 Massachusetts  1/24/20          0 2020-01-24                 0
##  4 Massachusetts  1/25/20          0 2020-01-25                 0
##  5 Massachusetts  1/26/20          0 2020-01-26                 0
##  6 Massachusetts  1/27/20          0 2020-01-27                 0
##  7 Massachusetts  1/28/20          0 2020-01-28                 0
##  8 Massachusetts  1/29/20          0 2020-01-29                 0
##  9 Massachusetts  1/30/20          0 2020-01-30                 0
## 10 Massachusetts  1/31/20          0 2020-01-31                 0
## # ... with 5,022 more rows2c) Let’s get visual! (10 Points)
Great! Make a compelling plot of the timeseries for Massachusetts! Points for style, class, ease of understanding major trends, etc. Note, 10/10 only for the most killer figures. Don’t phone it in! Also, note what the data from JHU is. Do you want the cumulative, or daily, or what?
# use function created in 2b to filter cumulative cases for Massachusetts
mass_time_series <- time_Series_fun(us_states, Massachusetts)
# create a plot object
plot <- mass_time_series %>%
  summarise(Dates, New_cases) %>%
  ggplot(aes(Dates), color = "blue") +
  # use stat_count to show cummulative increase in plot
  stat_count(aes(y=cumsum(..count..)),geom="step",bins=30) +
  # add some gganimate features 
  transition_manual(Dates) +
  view_follow() +
  transition_reveal(Dates) +
  ease_aes()+
  labs(title = "Cummulative COVID-19 Plot",
           y = "Cummulative cases",
           x = "Dates") ## Warning: Ignoring unknown parameters: bins# animate plot 
animate(plot, fps = 5)2c) At our fingertips (10 Points)
Cool. Now, write a function that will take what you did above, and create a plot for any state - so, I enter Alaska and I get the plot for Alaska! +2 if it can do daily or cumulative cases - or cases per 100,000 if you did that above. +3 EC if you highlight points of interest - but dynamically using the data. Note, you might need to do some funky stuff to make things fit well in the plot for this one. Or, meh.
# create a function for ploting state cummulatives
state_cumm_fun <- function(us_state, ...) {
# using the rlang::enexprs(...) function to capture multiple arguments in my function    
args <- rlang::enexprs(...)
# use previous time series function to subset state of interest
Dataset <- time_Series_fun(us_state, ...)
# create a plot object for function output
  plot <- Dataset %>%
  ggplot(aes(Dates), color = "blue") +
  stat_count(aes(y=cumsum(..count..)),geom="step",bins=30) +
  # add animation parameters
  transition_manual(Dates) +
  view_follow() +
  transition_reveal(Dates) +
  ease_aes() +
  labs(title = "Cummulative COVID-19 Plot",
           y = "Cummulative cases",
           x = "Dates") 
# animate final plot to show trend of cummulative increase
animate(plot, fps = 5)
  
 
}
# test function
state_cumm_fun(plot, Arizona)## Warning: Ignoring unknown parameters: bins2d Extra Credit) Go wild on data viz (5 Points each)
Use what you’ve done - or even new things (data sets, etc) so make compelling informative world-shaking visualizations that compare between states. Feel free to bring in outside information, aggregate things, or do whatever you would like. +5 per awesome viz (and Michael will be grading hard - if you don’t knock his socks off, it might only be +1) and +3 if you accompany it with a function that lets us play around and make new viz.
# Making cumulative visualizations for 5 neighboring states
Dataset <- time_Series_fun(us_state, Massachusetts, "New York", Connecticut, Vermont, "Rhode Island", Delaware)## Warning in Province_State == args: longer object length is not a multiple of
## shorter object length# subset dataset and select states of interest
plot <- ggplot(Dataset,aes(x=Dates,color=Province_State)) +
  stat_bin(data=subset(Dataset,Province_State=="Massachusetts"),aes(y=cumsum(..count..)),geom="step")+
  stat_bin(data=subset(Dataset,Province_State=="New York"),aes(y=cumsum(..count..)),geom="step")+
  stat_bin(data=subset(Dataset,Province_State=="Connecticut"),aes(y=cumsum(..count..)),geom="step")+
  stat_bin(data=subset(Dataset,Province_State=="Vermont"),aes(y=cumsum(..count..)),geom="step")+
  stat_bin(data=subset(Dataset,Province_State=="Rhode Island"),aes(y=cumsum(..count..)),geom="step") +
  stat_bin(data=subset(Dataset,Province_State=="Delaware"),aes(y=cumsum(..count..)),geom="step")
  
# view plot
plot## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.# use facet_wrap to view individual plot for each state
facet_wrap <- plot + 
  facet_wrap( ~ Province_State ) +
  labs(title = "Cummulative COVID-19 Plot",
           y = "Cummulative cases",
           x = "Dates") +
  theme_bw(base_size = 15) 
# view facet wrap
facet_wrap## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.3) Let’s get philosophical. (10 points)
We have discussed multiple inferential frameworks this semester. Frequentist NHST, Likelihood and model comparison, Bayesian probabilistic thinking, Assessment of Predictive Ability (which spans frameworks!), and more. We’ve talked about Popper and Lakatos. Put these pieces of the puzzle together and look deep within yourself.
What do you feel is the inferential framework that you adopt as a scientist? Why? Include in your answer why you prefer the inferential tools (e.g. confidence intervals, test statistics, out-of-sample prediction, posterior probabilities, etc.) of your chosen worldview and why you do not like the ones of the other one. This includes defining just what those different tools mean, as well as relating them to the things you study. extra credit for citing and discussing outside sources - one point per source/point.
As a scientist, I feel I am more inclined to adopt the inductive inferential framework because I easily gravitate towards making conclusions from patterns before assuming any form of hypothesis. I therefore view Inductive reasoning as a realistic form of thinking that mimics real life scenarios where conclusions can be drawn based on arguments and premise evaluations, rather than from one singular observation.
“A given fact is explained scientifically only if a new fact is predicted with it….The idea of growth and the concept of empirical character are soldered into one.” (Imre Lakotos, 1978 - The Methodology of Scientific Research Programmes). With an inductive inferential framework, the growth of a scientific theorem assumes many sources where generalizations can be made through patterns of observations.
Most population genetics research have followed the inductive inferential framework. Advances in technology platforms are engendering an inimitable increase of big data coupled with accelerated increase in both the size and complexity of datasets (Lowe et al. 2017). This has led to the development and testing of statistical approaches for modeling phenotypic data that can effectively identify variation at both inter and intra- specific scales.
Normality, which is a fundamental assumption in statistical testing, has proven to be quite valuable due to its power to accommodate a wide range of statistical methods. Nevertheless, this assumption can only be reasonable when a distribution or data is continuous. However, with the central limit theorem (CLT), non-normal data can follow a normal distribution by calculating the averages or sum of data points. This theorem creates validity that allows the implementation of familiar and uncomplicated statistical tools like the t test, ANOVA, and linear regression modeling. Despite the ease showcased by the CLT, alternative distributions will always exist in population genetic studies that might not be compatible with this approach (Mar, 2019).
Most quantitative genetics and breeding experiments have utilized mainly restricted maximum likelihood (REML) and Bayesian methods. REML has emerged as an important method in plant breeding for analyzing agronomic performance through variance component estimation. More flexible approaches like Bayesian analysis are gradually replacing most classical statistical testing due to its comprehensive assumptions in solving a host of biological problems (Zaabza et al. 2017)
Bayesian statistics works on the idea of combining existing or previous statistics obtained before data observation (prior probability), with information derived from data observation to get a posterior distribution in order to make inferences using fundamental probability techniques. Recent plant breeding and population genetics experiments have utilized Bayesian methods like Markov chain Monte Carlo (MCMC) for estimating genetic parameters in the linear mixed effect model. This has led to a significant reduction in unjustified inferences drawn from other interval estimates like Confidence Intervals (CIs) which do not always identify the precision of an estimate. Casella (1992) strongly established that a procedure in which its Bayesian properties have not been explored should not be considered for any post-data inference (Morey et al. 2016)
Reference
Lakatos, I. (1978). The Methodology of Scientific Research Programmes: Philosophical Papers Volume 1. Cambridge: Cambridge University Press
Lowe, R. et al (2017). Transcriptomics technologies. PLoS Compututational Biology Biology 13(5):e1005457.
Mar, J.c. (2019). The rise of the distributions: why non-normality is importantfor understanding the transcriptome and beyond. Biophysical Reviews 11:89–94 [https://doi.org/10.1007/s12551-018-0494-4]
Zaabza, H.B., Gara, A.B. and Rekik, B. (2017). Bayesian Modeling in Genetics and Genomics. [http://dx.doi.org/10.5772/intechopen.70167]
Casella, G. (1992). Conditional inference from confidence sets. Lecture Notes-Monograph Series, 17, 1–12.
Morey, R.D·, Hoekstra, R., Rouder, J.N., Lee, M.D. and Wagenmakers, E. (2016). The fallacy of placing confidence in confidence intervals. Psychonomic Bulletin and Review 23:103–123
*4) Bayes Theorem (10 points)
I’ve referenced the following figure a few times. I’d like you to demonstrate your understanding of Bayes Theorem by hand (e.g. calculate it out and show your work - you can do this all in R, I’m not a monster) showing what is the probability of the sun exploding is given that the device said yes. Assume that your prior probability that the sun explodes is p(Sun Explodes) = 0.0001 (I’ll leave it to you to get p(Sun Doesn’t Explode). The rest of the information you need - and some you don’t - is in the cartoon - p(Yes | Explodes), p(Yes | Doesn’t Explode), p(No | Explodes), p(No | Doesn’t Explode).
#Bayes theorem allows the use of existing knowledge or belief (called prior) to calculate the probability of a related event. The mathematical notation of Bayes theorem can be given as p(A/B) = p(B/A)p(A)/p(B). 
#where A and B are events, P(A|B) is the conditional probability that event A occurs given that event B has already occurred. This is also known as the posterior probability.
#(P(B|A) has the same meaning but with the roles of A and B reversed
#P(A) and P(B) are the marginal probabilities of event A and event B occurring respectively.
#p(Yes | Explodes), p(Yes | Doesn’t Explode), p(No | Explodes), p(No | Doesn’t Explode).
# For this question, the marginal probabilities are p(Sun Explodes) and p(Yes) which equates to p(A) and p(B) respectively.
# While our likelihood is given as p(B/A) which is either p(Yes | Doesn’t Explode) or p(No | Explodes).
#p(Sun Explodes) = p(A) = 0.0001
#p(Yes) = p(B) = 0.027
#p(Yes | Doesn’t Explode) = p(B/A) = (0.027 * 0.0001) + (1 - 0.027) * (1- 0.0001) = 0.0973
#p(Yes | Explodes) = p(A/B)
#Bayes theorem;
#p(A/B) = p(B/A)p(A)/p(B)
(0.0973) * (0.0001)/0.027## [1] 0.0003603704probability of the sun exploding given that the device said yes is 0.0003603704
4a Extra Credit (10 Points)
Why is this a bad parody of frequentist statistics?
5) Quailing at the Prospect of Linear Models
I’d like us to walk through the three different ‘engines’ that we have learned about to fit linear models. To motivate this, we’ll look at Burness et al.’s 2012 study "Post-hatch heat warms adult beaks: irreversible physiological plasticity in Japanese quail http://rspb.royalsocietypublishing.org/content/280/1767/20131436.short the data for which they have made available at Data Dryad at http://datadryad.org/resource/doi:10.5061/dryad.gs661. We’ll be looking at the morphology data.
5a) Three fits (10 points)
To begin with, I’d like you to fit the relationship that describes how Tarsus (leg) length predicts upper beak (Culmen) length. Fit this relationship using least squares, likelihood, and Bayesian techniques. For each fit, demonstrate that the necessary assumptions have been met. Note, functions used to fit with likelihood and Bayes may or may not behave well when fed NAs. So look out for those errors.
# read in morph data
morph <- read.csv("./raw_data/Morphology data.csv") %>%
  # remove NAs
  na.omit()
# view morph data
head(morph)##   Bird.. Sex Age..days. Exp..Temp...degree.C. Mass..g. Tarsus..mm. Culmen..mm.
## 1      1              5                    15    16.09       19.38        7.64
## 2      2   m          5                    15    19.22       20.38        7.49
## 3      3   f          5                    15    17.51       19.04        7.31
## 4      4   m          5                    15    14.36       20.11        7.34
## 5      5   f          5                    15    17.43       21.82        8.24
## 6      6   m          5                    15    15.66       19.83        6.82
##   Depth..mm. Width..mm. NOTES
## 1       4.23       4.49      
## 2       4.46       4.44      
## 3       3.92       4.01      
## 4       3.85       4.22      
## 5       4.42       4.56      
## 6       3.65       3.73# fit the relationship that describes how Tarsus (leg) length predicts upper beak (Culmen) length
# fit relationship using least squares regression
#initial visualization to determine if lm is appropriate
morph_plot <- ggplot(data = morph, aes(x = Tarsus..mm., y = Culmen..mm.)) +
  geom_point()
morph_plotmorph_mod <- lm(Culmen..mm. ~ Tarsus..mm., data = morph)
#assumptions
simulate(morph_mod, nsim = 100) %>%
  pivot_longer(cols = everything(),
               names_to = "sim", values_to = "Culmen..mm.") %>%
  ggplot(aes(x = Culmen..mm.)) +
  geom_density(aes(group = sim), size = 0.2) +
  geom_density(data = morph, color = "blue", size = 2)plot(morph_mod, which = 1)plot(morph_mod, which = 2)#f-tests of model
anova(morph_mod) %>%
tidy()## # A tibble: 2 x 6
##   term           df sumsq  meansq statistic    p.value
##   <chr>       <int> <dbl>   <dbl>     <dbl>      <dbl>
## 1 Tarsus..mm.     1 4829. 4829.       3149.  3.24e-273
## 2 Residuals     764 1172.    1.53       NA  NA#t-tests of parameters
tidy(morph_mod)## # A tibble: 2 x 5
##   term        estimate std.error statistic   p.value
##   <chr>          <dbl>     <dbl>     <dbl>     <dbl>
## 1 (Intercept)  -0.0987   0.215      -0.458 6.47e-  1
## 2 Tarsus..mm.   0.373    0.00665    56.1   3.24e-273#plot with line
morph_plot +
  stat_smooth(method = lm, formula = y~x)# if we want to be 'strict', we'll use glm
morph_mle <- glm(Culmen..mm. ~ Tarsus..mm., 
                data = morph,
                family = gaussian(link = "identity"))
# assumptions!
plot(morph_mle, which = 1)plot(morph_mle, which = 2)hist(residuals(morph_mle))# The new thing - make sure our profiles are well behaved!
library(MASS)
library(profileModel)
prof <- profileModel(morph_mle,
                     objective = "ordinaryDeviance")## Profiling for parameter (Intercept) ... Done
## Profiling for parameter Tarsus..mm. ... Doneplot(prof)plot(prof, print.grid.points = TRUE)prof <- profileModel(morph_mle,
                     objective = "ordinaryDeviance",
                     quantile = qchisq(0.95, 1))## Preliminary iteration .. Done
## 
## Profiling for parameter (Intercept) ... Done
## Profiling for parameter Tarsus..mm. ... Doneplot(prof)#----
#let's do this with MASS
# tau is the signed square root of the deviance
# so, a parabaola should become a straight line
# if it's not, you have a problem!
prof_mass <- profile(morph_mle)
plot(prof_mass)prof_mass## $`(Intercept)`
##           tau par.vals.(Intercept) par.vals.Tarsus..mm.
## 1  -2.5822797          -0.65505818           0.38971354
## 2  -2.0658238          -0.54378797           0.38635619
## 3  -1.5493678          -0.43251776           0.38299883
## 4  -1.0329119          -0.32124755           0.37964148
## 5  -0.5164559          -0.20997733           0.37628413
## 6   0.0000000          -0.09870712           0.37292677
## 7   0.5164559           0.01256309           0.36956942
## 8   1.0329119           0.12383330           0.36621206
## 9   1.5493678           0.23510351           0.36285471
## 10  2.0658238           0.34637372           0.35949735
## 11  2.5822797           0.45764393           0.35614000
## 12  3.0987357           0.56891414           0.35278264
## 
## $Tarsus..mm.
##           tau par.vals.(Intercept) par.vals.Tarsus..mm.
## 1  -3.0987357           0.55435785           0.35233365
## 2  -2.5822797           0.44551369           0.35576583
## 3  -2.0658238           0.33666952           0.35919802
## 4  -1.5493678           0.22782536           0.36263021
## 5  -1.0329119           0.11898120           0.36606240
## 6  -0.5164559           0.01013704           0.36949458
## 7   0.0000000          -0.09870712           0.37292677
## 8   0.5164559          -0.20755129           0.37635896
## 9   1.0329119          -0.31639545           0.37979115
## 10  1.5493678          -0.42523961           0.38322333
## 11  2.0658238          -0.53408377           0.38665552
## 12  2.5822797          -0.64292793           0.39008771
## 
## attr(,"original.fit")
## 
## Call:  glm(formula = Culmen..mm. ~ Tarsus..mm., family = gaussian(link = "identity"), 
##     data = morph)
## 
## Coefficients:
## (Intercept)  Tarsus..mm.  
##    -0.09871      0.37293  
## 
## Degrees of Freedom: 765 Total (i.e. Null);  764 Residual
## Null Deviance:       6001 
## Residual Deviance: 1172  AIC: 2505
## attr(,"summary")
## 
## Call:
## glm(formula = Culmen..mm. ~ Tarsus..mm., family = gaussian(link = "identity"), 
##     data = morph)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -4.4081  -0.7029  -0.0328   0.7263   3.5970  
## 
## Coefficients:
##              Estimate Std. Error t value Pr(>|t|)    
## (Intercept) -0.098707   0.215450  -0.458    0.647    
## Tarsus..mm.  0.372927   0.006646  56.116   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for gaussian family taken to be 1.533593)
## 
##     Null deviance: 6000.9  on 765  degrees of freedom
## Residual deviance: 1171.7  on 764  degrees of freedom
## AIC: 2505.4
## 
## Number of Fisher Scoring iterations: 2
## 
## attr(,"class")
## [1] "profile.glm" "profile"confint(prof_mass)##                  2.5 %    97.5 %
## (Intercept) -0.5209805 0.3235663
## Tarsus..mm.  0.3599015 0.3859520# Model evaluation
tidy(morph_mle) #dispersion parameter for gaussian = variance## # A tibble: 2 x 5
##   term        estimate std.error statistic   p.value
##   <chr>          <dbl>     <dbl>     <dbl>     <dbl>
## 1 (Intercept)  -0.0987   0.215      -0.458 6.47e-  1
## 2 Tarsus..mm.   0.373    0.00665    56.1   3.24e-273# Fit the model
# Assess convergence of chains
# Evaluate posterior distributions
# Check for model misspecification (fit v. residual, qq plot)
# Evaluate simulated residual distributions
# Evaluate simulated fit versus observed values
# Compare posterior predictive simulations to observed values
# Visualize fit and uncertainty
set.seed(607)
morph_lm_bayes <- brm(Culmen..mm. ~ Tarsus..mm.,
                         data = morph,
                         family=gaussian())## Compiling Stan program...## Start sampling## 
## SAMPLING FOR MODEL '672d07b872276181c1cfe3d97b92855a' NOW (CHAIN 1).
## Chain 1: 
## Chain 1: Gradient evaluation took 0 seconds
## Chain 1: 1000 transitions using 10 leapfrog steps per transition would take 0 seconds.
## Chain 1: Adjust your expectations accordingly!
## Chain 1: 
## Chain 1: 
## Chain 1: Iteration:    1 / 2000 [  0%]  (Warmup)
## Chain 1: Iteration:  200 / 2000 [ 10%]  (Warmup)
## Chain 1: Iteration:  400 / 2000 [ 20%]  (Warmup)
## Chain 1: Iteration:  600 / 2000 [ 30%]  (Warmup)
## Chain 1: Iteration:  800 / 2000 [ 40%]  (Warmup)
## Chain 1: Iteration: 1000 / 2000 [ 50%]  (Warmup)
## Chain 1: Iteration: 1001 / 2000 [ 50%]  (Sampling)
## Chain 1: Iteration: 1200 / 2000 [ 60%]  (Sampling)
## Chain 1: Iteration: 1400 / 2000 [ 70%]  (Sampling)
## Chain 1: Iteration: 1600 / 2000 [ 80%]  (Sampling)
## Chain 1: Iteration: 1800 / 2000 [ 90%]  (Sampling)
## Chain 1: Iteration: 2000 / 2000 [100%]  (Sampling)
## Chain 1: 
## Chain 1:  Elapsed Time: 0.142 seconds (Warm-up)
## Chain 1:                0.061 seconds (Sampling)
## Chain 1:                0.203 seconds (Total)
## Chain 1: 
## 
## SAMPLING FOR MODEL '672d07b872276181c1cfe3d97b92855a' NOW (CHAIN 2).
## Chain 2: 
## Chain 2: Gradient evaluation took 0 seconds
## Chain 2: 1000 transitions using 10 leapfrog steps per transition would take 0 seconds.
## Chain 2: Adjust your expectations accordingly!
## Chain 2: 
## Chain 2: 
## Chain 2: Iteration:    1 / 2000 [  0%]  (Warmup)
## Chain 2: Iteration:  200 / 2000 [ 10%]  (Warmup)
## Chain 2: Iteration:  400 / 2000 [ 20%]  (Warmup)
## Chain 2: Iteration:  600 / 2000 [ 30%]  (Warmup)
## Chain 2: Iteration:  800 / 2000 [ 40%]  (Warmup)
## Chain 2: Iteration: 1000 / 2000 [ 50%]  (Warmup)
## Chain 2: Iteration: 1001 / 2000 [ 50%]  (Sampling)
## Chain 2: Iteration: 1200 / 2000 [ 60%]  (Sampling)
## Chain 2: Iteration: 1400 / 2000 [ 70%]  (Sampling)
## Chain 2: Iteration: 1600 / 2000 [ 80%]  (Sampling)
## Chain 2: Iteration: 1800 / 2000 [ 90%]  (Sampling)
## Chain 2: Iteration: 2000 / 2000 [100%]  (Sampling)
## Chain 2: 
## Chain 2:  Elapsed Time: 0.114 seconds (Warm-up)
## Chain 2:                0.059 seconds (Sampling)
## Chain 2:                0.173 seconds (Total)
## Chain 2: 
## 
## SAMPLING FOR MODEL '672d07b872276181c1cfe3d97b92855a' NOW (CHAIN 3).
## Chain 3: 
## Chain 3: Gradient evaluation took 0 seconds
## Chain 3: 1000 transitions using 10 leapfrog steps per transition would take 0 seconds.
## Chain 3: Adjust your expectations accordingly!
## Chain 3: 
## Chain 3: 
## Chain 3: Iteration:    1 / 2000 [  0%]  (Warmup)
## Chain 3: Iteration:  200 / 2000 [ 10%]  (Warmup)
## Chain 3: Iteration:  400 / 2000 [ 20%]  (Warmup)
## Chain 3: Iteration:  600 / 2000 [ 30%]  (Warmup)
## Chain 3: Iteration:  800 / 2000 [ 40%]  (Warmup)
## Chain 3: Iteration: 1000 / 2000 [ 50%]  (Warmup)
## Chain 3: Iteration: 1001 / 2000 [ 50%]  (Sampling)
## Chain 3: Iteration: 1200 / 2000 [ 60%]  (Sampling)
## Chain 3: Iteration: 1400 / 2000 [ 70%]  (Sampling)
## Chain 3: Iteration: 1600 / 2000 [ 80%]  (Sampling)
## Chain 3: Iteration: 1800 / 2000 [ 90%]  (Sampling)
## Chain 3: Iteration: 2000 / 2000 [100%]  (Sampling)
## Chain 3: 
## Chain 3:  Elapsed Time: 0.149 seconds (Warm-up)
## Chain 3:                0.086 seconds (Sampling)
## Chain 3:                0.235 seconds (Total)
## Chain 3: 
## 
## SAMPLING FOR MODEL '672d07b872276181c1cfe3d97b92855a' NOW (CHAIN 4).
## Chain 4: 
## Chain 4: Gradient evaluation took 0 seconds
## Chain 4: 1000 transitions using 10 leapfrog steps per transition would take 0 seconds.
## Chain 4: Adjust your expectations accordingly!
## Chain 4: 
## Chain 4: 
## Chain 4: Iteration:    1 / 2000 [  0%]  (Warmup)
## Chain 4: Iteration:  200 / 2000 [ 10%]  (Warmup)
## Chain 4: Iteration:  400 / 2000 [ 20%]  (Warmup)
## Chain 4: Iteration:  600 / 2000 [ 30%]  (Warmup)
## Chain 4: Iteration:  800 / 2000 [ 40%]  (Warmup)
## Chain 4: Iteration: 1000 / 2000 [ 50%]  (Warmup)
## Chain 4: Iteration: 1001 / 2000 [ 50%]  (Sampling)
## Chain 4: Iteration: 1200 / 2000 [ 60%]  (Sampling)
## Chain 4: Iteration: 1400 / 2000 [ 70%]  (Sampling)
## Chain 4: Iteration: 1600 / 2000 [ 80%]  (Sampling)
## Chain 4: Iteration: 1800 / 2000 [ 90%]  (Sampling)
## Chain 4: Iteration: 2000 / 2000 [100%]  (Sampling)
## Chain 4: 
## Chain 4:  Elapsed Time: 0.177 seconds (Warm-up)
## Chain 4:                0.078 seconds (Sampling)
## Chain 4:                0.255 seconds (Total)
## Chain 4:# Inspect chains and posteriors
plot(morph_lm_bayes)#Inspect rhat
rhat(morph_lm_bayes)##   b_Intercept b_Tarsus..mm.         sigma          lp__ 
##     0.9998033     0.9997146     1.0003314     1.0000234mcmc_rhat(rhat(morph_lm_bayes))#Inspect Autocorrelation
mcmc_acf(as.data.frame(morph_lm_bayes))#model assumptions
# did we miss normality?
morph_fit <- predict(morph_lm_bayes) %>% as_tibble
morph_res <- residuals(morph_lm_bayes)%>% as_tibble
qplot(morph_res$Estimate, morph_fit$Estimate)#fit
pp_check(morph_lm_bayes, "dens_overlay")## Using 10 posterior samples for ppc type 'dens_overlay' by default.#normality
qqnorm(morph_res$Estimate)
qqline(morph_res$Estimate)pp_check(morph_lm_bayes, type="error_hist", bins=8)## Using 10 posterior samples for ppc type 'error_hist' by default.## Warning: The following arguments were unrecognized and ignored: bins## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.pp_check(morph_lm_bayes, "error_scatter_avg")## Using all posterior samples for ppc type 'error_scatter_avg' by default.##match to posterior
pp_check(morph_lm_bayes, type="stat_2d", test=c("mean", "sd"))## Using all posterior samples for ppc type 'stat_2d' by default.## Warning: The following arguments were unrecognized and ignored: testpp_check(morph_lm_bayes)## Using 10 posterior samples for ppc type 'dens_overlay' by default.#coefficients
summary(morph_lm_bayes, digits=5)##  Family: gaussian 
##   Links: mu = identity; sigma = identity 
## Formula: Culmen..mm. ~ Tarsus..mm. 
##    Data: morph (Number of observations: 766) 
## Samples: 4 chains, each with iter = 2000; warmup = 1000; thin = 1;
##          total post-warmup samples = 4000
## 
## Population-Level Effects: 
##             Estimate Est.Error l-95% CI u-95% CI Rhat Bulk_ESS Tail_ESS
## Intercept      -0.10      0.21    -0.52     0.31 1.00     5079     3309
## Tarsus..mm.     0.37      0.01     0.36     0.39 1.00     5188     3247
## 
## Family Specific Parameters: 
##       Estimate Est.Error l-95% CI u-95% CI Rhat Bulk_ESS Tail_ESS
## sigma     1.24      0.03     1.18     1.30 1.00     3738     3071
## 
## Samples were drawn using sampling(NUTS). For each parameter, Bulk_ESS
## and Tail_ESS are effective sample size measures, and Rhat is the potential
## scale reduction factor on split chains (at convergence, Rhat = 1).#confidence intervals
posterior_interval(morph_lm_bayes)##                        2.5%         97.5%
## b_Intercept      -0.5226288     0.3091852
## b_Tarsus..mm.     0.3600444     0.3860947
## sigma             1.1805658     1.3049372
## lp__          -1257.9169051 -1253.4367708#visualize
morph_chains <- as.data.frame(morph_lm_bayes)
# Visualize our posteriors ####
#library(tidybayes) #extractions and tidying
#library(ggdist) #visualization
morph_plot +
  geom_abline(intercept=morph_chains[,1], slope = morph_chains[,2], alpha=0.1, color="lightgrey") 5b) Three interpretations (10 points)
OK, now that we have fits, take a look! Do the coefficients and their associated measures of error in their estimation match? How would we interpret the results from these different analyses differently? Or would we? Note, confint works on lm objects as well.
# fit a glm model to test with confint
morph_glm <- glm(Culmen..mm. ~ Tarsus..mm.,
                 data = morph,
                 family = gaussian(link = "identity"))
# profile the glm and likelihood model 
prof_mass_glm <- profile(morph_glm)
prof_mass_mle <- profile(morph_mle)
# check co-efficients at different confidence intervals for all models
confint(prof_mass_glm)##                  2.5 %    97.5 %
## (Intercept) -0.5209805 0.3235663
## Tarsus..mm.  0.3599015 0.3859520confint(prof_mass_mle)##                  2.5 %    97.5 %
## (Intercept) -0.5209805 0.3235663
## Tarsus..mm.  0.3599015 0.3859520# use posterior interval to check coefficients for bayes lm
posterior_interval(morph_lm_bayes)##                        2.5%         97.5%
## b_Intercept      -0.5226288     0.3091852
## b_Tarsus..mm.     0.3600444     0.3860947
## sigma             1.1805658     1.3049372
## lp__          -1257.9169051 -1253.4367708The coefficient estimates and associated errors for the linear and likelihood models are the same at both confidence intervals while the estimate for the bayes model is slightly higher. The bayes coefficient estimates would slightly differ because it is based on probabilistic inferences.
5c) Everyday I’m Profilin’ (10 points)
For your likelihood fit, are your profiles well behaved? For just the slope, use grid sampling to create a profile. You’ll need to write functions for this, sampling the whole grid of slope and intercept, and then take out the relevant slices as we have done before. Use the results from the fit above to provide the reasonable bounds of what you should be profiling over (3SE should do). Is it well behaved? Plot the profile and give the 80% and 95% CI (remember how we use the chisq here!). Verify your results with profileModel.
# slope(b0) = 0.3859520
# intercept(b1) = 0.3235663
# SD(sigma) = 1.238383
#create a Negative log likelihood function using grid sampling to create a profile for slope and intercept
Neg_log_lik <- function(slope = seq(0.1, 0.4, by = 0.1), 
                    int = seq(0.1, 0.4, by = 0.1), 
                    resid_sd = seq(0.9, 1.3, by = 0.1)){
#in case of non-possible SD value, NaN
if(resid_sd <= 0) return(NaN)
#fitted values as means
morph_fit <- slope * morph$Tarsus..mm. + int
-sum(dnorm(morph$Culmen..mm., mean = morph_fit, sd = resid_sd, log=T))
}
# 95% CI - that the points that are 1.92 away from the MLE's loglik
# remember, we want the quantile of the chisq divided by 2 so we
# get both tails
# calculate maximum likelihood using the mle2 function 
morph_mle2 <- mle2(Neg_log_lik, start=list(slope=0.1, int=0.1, resid_sd=0.9))
# plot the profile of the calculated mle over three standard errors
prof <- profile(morph_mle2,
                     objective = "ordinaryDeviance",
                     quantile = qchisq(0.95, 80),
                     stdErrors = 3)
# view plot
plot(prof)These profiles are well behaved. The convergence on each plot corresponds the calculated estimates in the mle model.
5d) The Power of the Prior (10 points)
This data set is pretty big. After excluding NAs in the variables we’re interested in, it’s over 766 lines of data! Now, a lot of data can overwhelm a strong prior. But only to a point. Show first that there is enough data here that a prior for the slope with an estimate of 0.7 and a sd of 0.01 is overwhelmed and produces similar results to the default prior. How different are the results from the original?
Second, randomly sample 10, 100, 300, and 500 data points. At which level is our prior overwhelmed (e.g., the prior slope becomes highly unlikely)? Communicate that visually in the best way you feel gets the point across, and explain your reasoning.
+4 for a function that means you don’t have to copy and paste the model over and over. + 4 more if you use map() in combination with a tibble to make this as code-efficient as possible. This will also make visualization easier.
# show an estimate of 0.7 and a sd of 0.01 is overwhelmed and produces similar results to the default prior
Neg_log_lik <- function(slope, int, resid_sd){
#in case of non-possible SD value, NaN
if(resid_sd <= 0) return(NaN)
#fitted values as means
morph_fit <- slope * morph$Tarsus..mm. + int
-sum(dnorm(morph$Culmen..mm., mean = morph_fit, sd = resid_sd, log=T))
}
morph_mle <- mle2(Neg_log_lik, start=list(slope=0.7, resid_sd=0.01, int=0.2))
prof <- profile(morph_mle,
                     objective = "ordinaryDeviance",
                     quantile = qchisq(0.95, 80),
                     stdErrors = 3)
plot(prof)# create objects for each datapoints to sample
a <- morph$Tarsus..mm.[1:10]
b <- morph$Culmen..mm.[1:10]
c <- morph$Tarsus..mm.[1:100]
d <- morph$Culmen..mm.[1:100]
e <- morph$Tarsus..mm.[1:300]
f <- morph$Culmen..mm.[1:300]
g <- morph$Tarsus..mm.[1:500]
h <- morph$Culmen..mm.[1:500]
# create negative log functions using each data point 
# I created four functions. I couldn't find my around making my functions code efficient.
# I made 4 Negative log functions for each data point
Neg_log_lik_1 <- function(slope, int, resid_sd){
#in case of non-possible SD value, NaN
if(resid_sd <= 0) return(NaN)
#fitted values as means
morph_fit <- slope * a + int
-sum(dnorm(b, mean = morph_fit, sd = resid_sd, log=T))
}
Neg_log_lik_2 <- function(slope, int, resid_sd){
#in case of non-possible SD value, NaN
if(resid_sd <= 0) return(NaN)
#fitted values as means
morph_fit <- slope * c + int
-sum(dnorm(d, mean = morph_fit, sd = resid_sd, log=T))
}
Neg_log_lik_3 <- function(slope, int, resid_sd) {
#in case of non-possible SD value, NaN
if(resid_sd <= 0) return(NaN)
#fitted values as means
morph_fit <- slope * e + int
-sum(dnorm(f, mean = morph_fit, sd = resid_sd, log=T))
}
Neg_log_lik_4 <- function(slope, int, resid_sd){
#in case of non-possible SD value, NaN
if(resid_sd <= 0) return(NaN)
#fitted values as means
morph_fit <- slope * g + int
-sum(dnorm(h, mean = morph_fit, sd = resid_sd, log=T))
}
# I used mle2 function and profiling to plot the slope and residual sd of each data point 
morph_mle1 <- mle2(Neg_log_lik_1, start=list(slope=0.7, resid_sd=0.01), fixed = list(int=0.2))
prof_1 <- profile(morph_mle1,
                     objective = "ordinaryDeviance",
                     quantile = qchisq(0.95, 80),
                     stdErrors = 3)
plot(prof_1)morph_mle2 <- mle2(Neg_log_lik_2, start=list(slope=0.7, resid_sd=0.01), fixed = list(int=0.2))
prof_2 <- profile(morph_mle2,
                     objective = "ordinaryDeviance",
                     quantile = qchisq(0.95, 80),
                     stdErrors = 3)
plot(prof_2)morph_mle3 <- mle2(Neg_log_lik_3, start=list(slope=0.7, resid_sd=0.01), fixed = list(int=0.2))
prof_3 <- profile(morph_mle3,
                     objective = "ordinaryDeviance",
                     quantile = qchisq(0.95, 80),
                     stdErrors = 3)
plot(prof_3)morph_mle4 <- mle2(Neg_log_lik_4, start=list(slope=0.7, resid_sd=0.01), fixed = list(int=0.2))
prof_4 <- profile(morph_mle4,
                     objective = "ordinaryDeviance",
                     quantile = qchisq(0.95, 80),
                     stdErrors = 3)
plot(prof_4) A slope estimate of 0.7 and sd of 0.01 produces the same results as the prior.
Secondly, the slope becomes less unlikely as data points increase. At smaller data points, the residual sd is close to zero which means that the slope estimate is close to the true value.
6) Cross-Validation and Priors (15 points)
There is some interesting curvature in the culmen-tarsus relationship. Is the relationship really linear? Squared? Cubic? Exponential? Use one of the cross-validation techniques we explored to show which model is more predictive. Justify your choice of technique. Do you get a clear answer? What does it say?
# 5-Fold Cross-Validation
# make a folded data set object using tidyr::crossing()
tarsus <- morph$Tarsus..mm.
culmen <- morph$Culmen..mm.
morph_data <- data.frame(tarsus, culmen)
morph_five_fold <- vfold_cv(morph_data, v = 5)
# Fit a model to each fold
# start with our tibble
set.seed(2020)
morph_five_fold <- morph_five_fold %>%
# start with our tibble
 mutate(linear_mod = map(splits,
                         # fit a linear model
                          ~lm(morph$Culmen..mm. ~ morph$Tarsus..mm.,
                              data = analysis(.x))),
         
         #create a new column
         #using map to iterate over all splits
         sqrd_mod = map(splits,
                       #fit a square model
                       ~lm(morph$Culmen..mm.~ poly(morph$Tarsus..mm., 2),
                           #fit that model on the training
                           #data from each split
                           data = analysis(.x))),
        cubic_mod = map(splits,
                       #fit a cubic
                       ~lm(morph$Culmen..mm.~ poly(morph$Tarsus..mm., 3),
                           #fit that model on the training
                           #data from each split
                           data = analysis(.x))),
        exp_mod = map(splits,
                       #fit an exponential model
                       ~lm(log(morph$Culmen..mm.)~ morph$Tarsus..mm.,
                           #fit that model on the training
                           #data from each split
                           data = analysis(.x))))
# view data
morph_five_fold## #  5-fold cross-validation 
## # A tibble: 5 x 6
##   splits            id    linear_mod sqrd_mod cubic_mod exp_mod
##   <list>            <chr> <list>     <list>   <list>    <list> 
## 1 <split [612/154]> Fold1 <lm>       <lm>     <lm>      <lm>   
## 2 <split [613/153]> Fold2 <lm>       <lm>     <lm>      <lm>   
## 3 <split [613/153]> Fold3 <lm>       <lm>     <lm>      <lm>   
## 4 <split [613/153]> Fold4 <lm>       <lm>     <lm>      <lm>   
## 5 <split [613/153]> Fold5 <lm>       <lm>     <lm>      <lm># Get the RMSE of each model and each model TYPE
# for each LOO split
# start with a tibble
morph_five_fold_rmse <- morph_five_fold %>%
  # pivot to put ALL models in one column
  pivot_longer(cols = c(linear_mod, sqrd_mod, cubic_mod, exp_mod),
               names_to = "model_name",
               values_to = "fit_model") %>%
  
  # get our rmse just like before with map2!
  mutate(rmse = map2_dbl(.x = splits, .y = fit_model, # what 
                     ~rmse(data = assessment(.x),
                           mod = .y)))## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 154 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 154 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 154 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 154 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 154 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 154 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 154 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 154 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows## Warning: Problem with `mutate()` input `rmse`.
## i 'newdata' had 153 rows but variables found have 766 rows
## i Input `rmse` is `map2_dbl(...)`.## Warning: 'newdata' had 153 rows but variables found have 766 rows# the answer
morph_five_fold_rmse  %>%
  group_by(model_name) %>%
  summarise(rmse = mean(rmse))## `summarise()` ungrouping output (override with `.groups` argument)## # A tibble: 4 x 2
##   model_name  rmse
##   <chr>      <dbl>
## 1 cubic_mod  1.21 
## 2 exp_mod    0.106
## 3 linear_mod 1.24 
## 4 sqrd_mod   1.24ggplot(data = morph_five_fold_rmse,
       mapping = aes(x = id, y = rmse, color = model_name)) +
  geom_point() +
  scale_x_discrete(labels = NULL)The exponential model is more predictive because it has the lowest rmse value compared to the other models. I used the k-fold cross-validation because of the size of the data. Using the alternative loo cross-validation will be computational intensive for large datasets.